Processing math: 100%
napkin-api-2.0.0
Safe HaskellNone
LanguageGHC2024

Napkin.Backends.Redshift

Synopsis

Documentation

data Hook b #

Constructors

Hook 

Instances

Instances details
Generic (Hook b) 
Instance details

Defined in Napkin.Run.Effects.Types

Associated Types

type Rep (Hook b) 
Instance details

Defined in Napkin.Run.Effects.Types

type Rep (Hook b) = D1 ('MetaData "Hook" "Napkin.Run.Effects.Types" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "Hook" 'PrefixI 'True) (S1 ('MetaSel ('Just "async") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 HookSyncOrAsync) :*: S1 ('MetaSel ('Just "hookProgram") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (HookProgram b))))

Methods

from :: Hook b -> Rep (Hook b) x #

to :: Rep (Hook b) x -> Hook b #

type Rep (Hook b) 
Instance details

Defined in Napkin.Run.Effects.Types

type Rep (Hook b) = D1 ('MetaData "Hook" "Napkin.Run.Effects.Types" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "Hook" 'PrefixI 'True) (S1 ('MetaSel ('Just "async") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 HookSyncOrAsync) :*: S1 ('MetaSel ('Just "hookProgram") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (HookProgram b))))

class Applicative f => Alternative (f :: Type -> Type) where #

A monoid on applicative functors.

If defined, some and many should be the least solutions of the equations:

Examples

Expand
>>> Nothing <|> Just 42
Just 42
>>> [1, 2] <|> [3, 4]
[1,2,3,4]
>>> empty <|> print (2^15)
32768

Minimal complete definition

empty, (<|>)

Methods

empty :: f a #

The identity of <|>

empty <|> a     == a
a     <|> empty == a

(<|>) :: f a -> f a -> f a infixl 3 #

An associative binary operation

some :: f a -> f [a] #

One or more.

Examples

Expand
>>> some (putStr "la")
lalalalalalalalala... * goes on forever *
>>> some Nothing
nothing
>>> take 5 <$> some (Just 1)
* hangs forever *

Note that this function can be used with Parsers based on Applicatives. In that case some parser will attempt to parse parser one or more times until it fails.

many :: f a -> f [a] #

Zero or more.

Examples

Expand
>>> many (putStr "la")
lalalalalalalalala... * goes on forever *
>>> many Nothing
Just []
>>> take 5 <$> many (Just 1)
* hangs forever *

Note that this function can be used with Parsers based on Applicatives. In that case many parser will attempt to parse parser zero or more times until it fails.

Instances

Instances details
Alternative IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

empty :: IResult a #

(<|>) :: IResult a -> IResult a -> IResult a #

some :: IResult a -> IResult [a] #

many :: IResult a -> IResult [a] #

Alternative Parser 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

empty :: Parser a #

(<|>) :: Parser a -> Parser a -> Parser a #

some :: Parser a -> Parser [a] #

many :: Parser a -> Parser [a] #

Alternative Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

empty :: Result a #

(<|>) :: Result a -> Result a -> Result a #

some :: Result a -> Result [a] #

many :: Result a -> Result [a] #

Alternative Seq

Since: containers-0.5.4

Instance details

Defined in Data.Sequence.Internal

Methods

empty :: Seq a #

(<|>) :: Seq a -> Seq a -> Seq a #

some :: Seq a -> Seq [a] #

many :: Seq a -> Seq [a] #

Alternative DList 
Instance details

Defined in Data.DList.Internal

Methods

empty :: DList a #

(<|>) :: DList a -> DList a -> DList a #

some :: DList a -> DList [a] #

many :: DList a -> DList [a] #

Alternative STM

Takes the first non-retrying STM action.

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Conc.Sync

Methods

empty :: STM a #

(<|>) :: STM a -> STM a -> STM a #

some :: STM a -> STM [a] #

many :: STM a -> STM [a] #

Alternative ZipList

@since base-4.11.0.0

Instance details

Defined in GHC.Internal.Functor.ZipList

Methods

empty :: ZipList a #

(<|>) :: ZipList a -> ZipList a -> ZipList a #

some :: ZipList a -> ZipList [a] #

many :: ZipList a -> ZipList [a] #

Alternative P

@since base-4.5.0.0

Instance details

Defined in GHC.Internal.Text.ParserCombinators.ReadP

Methods

empty :: P a #

(<|>) :: P a -> P a -> P a #

some :: P a -> P [a] #

many :: P a -> P [a] #

Alternative ReadP

@since base-4.6.0.0

Instance details

Defined in GHC.Internal.Text.ParserCombinators.ReadP

Methods

empty :: ReadP a #

(<|>) :: ReadP a -> ReadP a -> ReadP a #

some :: ReadP a -> ReadP [a] #

many :: ReadP a -> ReadP [a] #

Alternative IO

Takes the first non-throwing IO action's result. empty throws an exception.

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Base

Methods

empty :: IO a #

(<|>) :: IO a -> IO a -> IO a #

some :: IO a -> IO [a] #

many :: IO a -> IO [a] #

Alternative Deque 
Instance details

Defined in Control.Lens.Internal.Deque

Methods

empty :: Deque a #

(<|>) :: Deque a -> Deque a -> Deque a #

some :: Deque a -> Deque [a] #

many :: Deque a -> Deque [a] #

Alternative Chunk 
Instance details

Defined in Options.Applicative.Help.Chunk

Methods

empty :: Chunk a #

(<|>) :: Chunk a -> Chunk a -> Chunk a #

some :: Chunk a -> Chunk [a] #

many :: Chunk a -> Chunk [a] #

Alternative Completion 
Instance details

Defined in Options.Applicative.Internal

Alternative P 
Instance details

Defined in Options.Applicative.Internal

Methods

empty :: P a #

(<|>) :: P a -> P a -> P a #

some :: P a -> P [a] #

many :: P a -> P [a] #

Alternative Parser 
Instance details

Defined in Options.Applicative.Types

Methods

empty :: Parser a #

(<|>) :: Parser a -> Parser a -> Parser a #

some :: Parser a -> Parser [a] #

many :: Parser a -> Parser [a] #

Alternative ReadM 
Instance details

Defined in Options.Applicative.Types

Methods

empty :: ReadM a #

(<|>) :: ReadM a -> ReadM a -> ReadM a #

some :: ReadM a -> ReadM [a] #

many :: ReadM a -> ReadM [a] #

Alternative Conversion 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Alternative RowParser 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Methods

empty :: RowParser a #

(<|>) :: RowParser a -> RowParser a -> RowParser a #

some :: RowParser a -> RowParser [a] #

many :: RowParser a -> RowParser [a] #

Alternative Array 
Instance details

Defined in Data.Primitive.Array

Methods

empty :: Array a #

(<|>) :: Array a -> Array a -> Array a #

some :: Array a -> Array [a] #

many :: Array a -> Array [a] #

Alternative SmallArray 
Instance details

Defined in Data.Primitive.SmallArray

Alternative Vector 
Instance details

Defined in Data.Vector

Methods

empty :: Vector a #

(<|>) :: Vector a -> Vector a -> Vector a #

some :: Vector a -> Vector [a] #

many :: Vector a -> Vector [a] #

Alternative Maybe

Picks the leftmost Just value, or, alternatively, Nothing.

@since base-2.01

Instance details

Defined in GHC.Internal.Base

Methods

empty :: Maybe a #

(<|>) :: Maybe a -> Maybe a -> Maybe a #

some :: Maybe a -> Maybe [a] #

many :: Maybe a -> Maybe [a] #

Alternative []

Combines lists by concatenation, starting from the empty list.

@since base-2.01

Instance details

Defined in GHC.Internal.Base

Methods

empty :: [a] #

(<|>) :: [a] -> [a] -> [a] #

some :: [a] -> [[a]] #

many :: [a] -> [[a]] #

Alternative (Parser i) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

empty :: Parser i a #

(<|>) :: Parser i a -> Parser i a -> Parser i a #

some :: Parser i a -> Parser i [a] #

many :: Parser i a -> Parser i [a] #

MonadPlus m => Alternative (WrappedMonad m)

Since: base-2.1

Instance details

Defined in Control.Applicative

Methods

empty :: WrappedMonad m a #

(<|>) :: WrappedMonad m a -> WrappedMonad m a -> WrappedMonad m a #

some :: WrappedMonad m a -> WrappedMonad m [a] #

many :: WrappedMonad m a -> WrappedMonad m [a] #

Monad m => Alternative (CatchT m) 
Instance details

Defined in Control.Monad.Catch.Pure

Methods

empty :: CatchT m a #

(<|>) :: CatchT m a -> CatchT m a -> CatchT m a #

some :: CatchT m a -> CatchT m [a] #

many :: CatchT m a -> CatchT m [a] #

Alternative v => Alternative (Free v)

This violates the Alternative laws, handle with care.

Instance details

Defined in Control.Monad.Free

Methods

empty :: Free v a #

(<|>) :: Free v a -> Free v a -> Free v a #

some :: Free v a -> Free v [a] #

many :: Free v a -> Free v [a] #

ArrowPlus a => Alternative (ArrowMonad a)

@since base-4.6.0.0

Instance details

Defined in GHC.Internal.Control.Arrow

Methods

empty :: ArrowMonad a a0 #

(<|>) :: ArrowMonad a a0 -> ArrowMonad a a0 -> ArrowMonad a a0 #

some :: ArrowMonad a a0 -> ArrowMonad a [a0] #

many :: ArrowMonad a a0 -> ArrowMonad a [a0] #

Alternative (Proxy :: Type -> Type)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Proxy

Methods

empty :: Proxy a #

(<|>) :: Proxy a -> Proxy a -> Proxy a #

some :: Proxy a -> Proxy [a] #

many :: Proxy a -> Proxy [a] #

Alternative (U1 :: Type -> Type)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

empty :: U1 a #

(<|>) :: U1 a -> U1 a -> U1 a #

some :: U1 a -> U1 [a] #

many :: U1 a -> U1 [a] #

Alternative f => Alternative (Yoneda f) 
Instance details

Defined in Data.Functor.Yoneda

Methods

empty :: Yoneda f a #

(<|>) :: Yoneda f a -> Yoneda f a -> Yoneda f a #

some :: Yoneda f a -> Yoneda f [a] #

many :: Yoneda f a -> Yoneda f [a] #

Alternative m => Alternative (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Alternative m => Alternative (NoLoggingT m) 
Instance details

Defined in Katip.Monadic

Methods

empty :: NoLoggingT m a #

(<|>) :: NoLoggingT m a -> NoLoggingT m a -> NoLoggingT m a #

some :: NoLoggingT m a -> NoLoggingT m [a] #

many :: NoLoggingT m a -> NoLoggingT m [a] #

Alternative (ReifiedFold s) 
Instance details

Defined in Control.Lens.Reified

Methods

empty :: ReifiedFold s a #

(<|>) :: ReifiedFold s a -> ReifiedFold s a -> ReifiedFold s a #

some :: ReifiedFold s a -> ReifiedFold s [a] #

many :: ReifiedFold s a -> ReifiedFold s [a] #

Monad m => Alternative (ListT m) 
Instance details

Defined in Options.Applicative.Internal

Methods

empty :: ListT m a #

(<|>) :: ListT m a -> ListT m a -> ListT m a #

some :: ListT m a -> ListT m [a] #

many :: ListT m a -> ListT m [a] #

Monad m => Alternative (NondetT m) 
Instance details

Defined in Options.Applicative.Internal

Methods

empty :: NondetT m a #

(<|>) :: NondetT m a -> NondetT m a -> NondetT m a #

some :: NondetT m a -> NondetT m [a] #

many :: NondetT m a -> NondetT m [a] #

Member NonDet r => Alternative (Sem r) 
Instance details

Defined in Polysemy.Internal

Methods

empty :: Sem r a #

(<|>) :: Sem r a -> Sem r a -> Sem r a #

some :: Sem r a -> Sem r [a] #

many :: Sem r a -> Sem r [a] #

Alternative m => Alternative (ResourceT m)

Since 1.1.5

Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

empty :: ResourceT m a #

(<|>) :: ResourceT m a -> ResourceT m a -> ResourceT m a #

some :: ResourceT m a -> ResourceT m [a] #

many :: ResourceT m a -> ResourceT m [a] #

MonadUnliftIO m => Alternative (ActionT m)

empty throws ActionError AENext, whereas (<|>) catches any ActionErrors or StatusErrors in the first action and proceeds to the second one.

Instance details

Defined in Web.Scotty.Internal.Types

Methods

empty :: ActionT m a #

(<|>) :: ActionT m a -> ActionT m a -> ActionT m a #

some :: ActionT m a -> ActionT m [a] #

many :: ActionT m a -> ActionT m [a] #

Alternative f => Alternative (Lift f)

A combination is Pure only either part is.

Instance details

Defined in Control.Applicative.Lift

Methods

empty :: Lift f a #

(<|>) :: Lift f a -> Lift f a -> Lift f a #

some :: Lift f a -> Lift f [a] #

many :: Lift f a -> Lift f [a] #

(Functor m, Monad m) => Alternative (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

empty :: MaybeT m a #

(<|>) :: MaybeT m a -> MaybeT m a -> MaybeT m a #

some :: MaybeT m a -> MaybeT m [a] #

many :: MaybeT m a -> MaybeT m [a] #

MonadUnliftIO m => Alternative (Conc m)

Since: unliftio-0.2.9.0

Instance details

Defined in UnliftIO.Internals.Async

Methods

empty :: Conc m a #

(<|>) :: Conc m a -> Conc m a -> Conc m a #

some :: Conc m a -> Conc m [a] #

many :: Conc m a -> Conc m [a] #

MonadUnliftIO m => Alternative (Concurrently m)

Composing two unlifted Concurrently values using Alternative is the equivalent to using a race combinator, the asynchrounous sub-routine that returns a value first is the one that gets it's value returned, the slowest sub-routine gets cancelled and it's thread is killed.

Since: unliftio-0.1.0.0

Instance details

Defined in UnliftIO.Internals.Async

Methods

empty :: Concurrently m a #

(<|>) :: Concurrently m a -> Concurrently m a -> Concurrently m a #

some :: Concurrently m a -> Concurrently m [a] #

many :: Concurrently m a -> Concurrently m [a] #

(ArrowZero a, ArrowPlus a) => Alternative (WrappedArrow a b)

Since: base-2.1

Instance details

Defined in Control.Applicative

Methods

empty :: WrappedArrow a b a0 #

(<|>) :: WrappedArrow a b a0 -> WrappedArrow a b a0 -> WrappedArrow a b a0 #

some :: WrappedArrow a b a0 -> WrappedArrow a b [a0] #

many :: WrappedArrow a b a0 -> WrappedArrow a b [a0] #

(Functor f, MonadPlus m) => Alternative (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

empty :: FreeT f m a #

(<|>) :: FreeT f m a -> FreeT f m a -> FreeT f m a #

some :: FreeT f m a -> FreeT f m [a] #

many :: FreeT f m a -> FreeT f m [a] #

Alternative m => Alternative (Kleisli m a)

@since base-4.14.0.0

Instance details

Defined in GHC.Internal.Control.Arrow

Methods

empty :: Kleisli m a a0 #

(<|>) :: Kleisli m a a0 -> Kleisli m a a0 -> Kleisli m a a0 #

some :: Kleisli m a a0 -> Kleisli m a [a0] #

many :: Kleisli m a a0 -> Kleisli m a [a0] #

Alternative f => Alternative (Ap f)

@since base-4.12.0.0

Instance details

Defined in GHC.Internal.Data.Monoid

Methods

empty :: Ap f a #

(<|>) :: Ap f a -> Ap f a -> Ap f a #

some :: Ap f a -> Ap f [a] #

many :: Ap f a -> Ap f [a] #

Alternative f => Alternative (Alt f)

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

empty :: Alt f a #

(<|>) :: Alt f a -> Alt f a -> Alt f a #

some :: Alt f a -> Alt f [a] #

many :: Alt f a -> Alt f [a] #

(Generic1 f, Alternative (Rep1 f)) => Alternative (Generically1 f)

@since base-4.17.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

empty :: Generically1 f a #

(<|>) :: Generically1 f a -> Generically1 f a -> Generically1 f a #

some :: Generically1 f a -> Generically1 f [a] #

many :: Generically1 f a -> Generically1 f [a] #

Alternative f => Alternative (Rec1 f)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

empty :: Rec1 f a #

(<|>) :: Rec1 f a -> Rec1 f a -> Rec1 f a #

some :: Rec1 f a -> Rec1 f [a] #

many :: Rec1 f a -> Rec1 f [a] #

Alternative (NonDetC m) 
Instance details

Defined in Polysemy.NonDet

Methods

empty :: NonDetC m a #

(<|>) :: NonDetC m a -> NonDetC m a -> NonDetC m a #

some :: NonDetC m a -> NonDetC m [a] #

many :: NonDetC m a -> NonDetC m [a] #

Alternative f => Alternative (Backwards f)

Try alternatives in the same order as f.

Instance details

Defined in Control.Applicative.Backwards

Methods

empty :: Backwards f a #

(<|>) :: Backwards f a -> Backwards f a -> Backwards f a #

some :: Backwards f a -> Backwards f [a] #

many :: Backwards f a -> Backwards f [a] #

(Monoid w, Functor m, MonadPlus m) => Alternative (AccumT w m) 
Instance details

Defined in Control.Monad.Trans.Accum

Methods

empty :: AccumT w m a #

(<|>) :: AccumT w m a -> AccumT w m a -> AccumT w m a #

some :: AccumT w m a -> AccumT w m [a] #

many :: AccumT w m a -> AccumT w m [a] #

(Functor m, Monad m, Monoid e) => Alternative (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

empty :: ExceptT e m a #

(<|>) :: ExceptT e m a -> ExceptT e m a -> ExceptT e m a #

some :: ExceptT e m a -> ExceptT e m [a] #

many :: ExceptT e m a -> ExceptT e m [a] #

Alternative m => Alternative (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

empty :: IdentityT m a #

(<|>) :: IdentityT m a -> IdentityT m a -> IdentityT m a #

some :: IdentityT m a -> IdentityT m [a] #

many :: IdentityT m a -> IdentityT m [a] #

Alternative m => Alternative (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

empty :: ReaderT r m a #

(<|>) :: ReaderT r m a -> ReaderT r m a -> ReaderT r m a #

some :: ReaderT r m a -> ReaderT r m [a] #

many :: ReaderT r m a -> ReaderT r m [a] #

(Functor m, MonadPlus m) => Alternative (SelectT r m) 
Instance details

Defined in Control.Monad.Trans.Select

Methods

empty :: SelectT r m a #

(<|>) :: SelectT r m a -> SelectT r m a -> SelectT r m a #

some :: SelectT r m a -> SelectT r m [a] #

many :: SelectT r m a -> SelectT r m [a] #

(Functor m, MonadPlus m) => Alternative (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Lazy

Methods

empty :: StateT s m a #

(<|>) :: StateT s m a -> StateT s m a -> StateT s m a #

some :: StateT s m a -> StateT s m [a] #

many :: StateT s m a -> StateT s m [a] #

(Functor m, MonadPlus m) => Alternative (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

empty :: StateT s m a #

(<|>) :: StateT s m a -> StateT s m a -> StateT s m a #

some :: StateT s m a -> StateT s m [a] #

many :: StateT s m a -> StateT s m [a] #

(Functor m, MonadPlus m) => Alternative (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.CPS

Methods

empty :: WriterT w m a #

(<|>) :: WriterT w m a -> WriterT w m a -> WriterT w m a #

some :: WriterT w m a -> WriterT w m [a] #

many :: WriterT w m a -> WriterT w m [a] #

(Monoid w, Alternative m) => Alternative (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

empty :: WriterT w m a #

(<|>) :: WriterT w m a -> WriterT w m a -> WriterT w m a #

some :: WriterT w m a -> WriterT w m [a] #

many :: WriterT w m a -> WriterT w m [a] #

(Monoid w, Alternative m) => Alternative (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

empty :: WriterT w m a #

(<|>) :: WriterT w m a -> WriterT w m a -> WriterT w m a #

some :: WriterT w m a -> WriterT w m [a] #

many :: WriterT w m a -> WriterT w m [a] #

Alternative f => Alternative (Reverse f)

Derived instance.

Instance details

Defined in Data.Functor.Reverse

Methods

empty :: Reverse f a #

(<|>) :: Reverse f a -> Reverse f a -> Reverse f a #

some :: Reverse f a -> Reverse f [a] #

many :: Reverse f a -> Reverse f [a] #

(Alternative f, Alternative g) => Alternative (Product f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Product

Methods

empty :: Product f g a #

(<|>) :: Product f g a -> Product f g a -> Product f g a #

some :: Product f g a -> Product f g [a] #

many :: Product f g a -> Product f g [a] #

(Alternative f, Alternative g) => Alternative (f :*: g)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

empty :: (f :*: g) a #

(<|>) :: (f :*: g) a -> (f :*: g) a -> (f :*: g) a #

some :: (f :*: g) a -> (f :*: g) [a] #

many :: (f :*: g) a -> (f :*: g) [a] #

(Alternative f, Applicative g) => Alternative (Compose f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

empty :: Compose f g a #

(<|>) :: Compose f g a -> Compose f g a -> Compose f g a #

some :: Compose f g a -> Compose f g [a] #

many :: Compose f g a -> Compose f g [a] #

(Alternative f, Applicative g) => Alternative (f :.: g)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

empty :: (f :.: g) a #

(<|>) :: (f :.: g) a -> (f :.: g) a -> (f :.: g) a #

some :: (f :.: g) a -> (f :.: g) [a] #

many :: (f :.: g) a -> (f :.: g) [a] #

Alternative f => Alternative (M1 i c f)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

empty :: M1 i c f a #

(<|>) :: M1 i c f a -> M1 i c f a -> M1 i c f a #

some :: M1 i c f a -> M1 i c f [a] #

many :: M1 i c f a -> M1 i c f [a] #

(Functor m, MonadPlus m) => Alternative (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.CPS

Methods

empty :: RWST r w s m a #

(<|>) :: RWST r w s m a -> RWST r w s m a -> RWST r w s m a #

some :: RWST r w s m a -> RWST r w s m [a] #

many :: RWST r w s m a -> RWST r w s m [a] #

(Monoid w, Functor m, MonadPlus m) => Alternative (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.Lazy

Methods

empty :: RWST r w s m a #

(<|>) :: RWST r w s m a -> RWST r w s m a -> RWST r w s m a #

some :: RWST r w s m a -> RWST r w s m [a] #

many :: RWST r w s m a -> RWST r w s m [a] #

(Monoid w, Functor m, MonadPlus m) => Alternative (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.Strict

Methods

empty :: RWST r w s m a #

(<|>) :: RWST r w s m a -> RWST r w s m a -> RWST r w s m a #

some :: RWST r w s m a -> RWST r w s m [a] #

many :: RWST r w s m a -> RWST r w s m [a] #

void :: Functor f => f a -> f () #

void value discards or ignores the result of evaluation, such as the return value of an IO action.

Examples

Expand

Replace the contents of a Maybe Int with unit:

>>> void Nothing
Nothing
>>> void (Just 3)
Just ()

Replace the contents of an Either Int Int with unit, resulting in an Either Int ():

>>> void (Left 8675309)
Left 8675309
>>> void (Right 8675309)
Right ()

Replace every element of a list with unit:

>>> void [1,2,3]
[(),(),()]

Replace the second element of a pair with unit:

>>> void (1,2)
(1,())

Discard the result of an IO action:

>>> mapM print [1,2]
1
2
[(),()]
>>> void $ mapM print [1,2]
1
2

class MonadIO m => Katip (m :: Type -> Type) where #

Monads where katip logging actions can be performed. Katip is the most basic logging monad. You will typically use this directly if you either don't want to use namespaces/contexts heavily or if you want to pass in specific contexts and/or namespaces at each log site.

For something more powerful, look at the docs for KatipContext, which keeps a namespace and merged context. You can write simple functions that add additional namespacing and merges additional context on the fly.

localLogEnv was added to allow for lexically-scoped modifications of the log env that are reverted when the supplied monad completes. katipNoLogging, for example, uses this to temporarily pause log outputs.

Methods

getLogEnv :: m LogEnv #

localLogEnv :: (LogEnv -> LogEnv) -> m a -> m a #

Instances

Instances details
MonadIO m => Katip (KatipT m) 
Instance details

Defined in Katip.Core

Methods

getLogEnv :: KatipT m LogEnv #

localLogEnv :: (LogEnv -> LogEnv) -> KatipT m a -> KatipT m a #

MonadIO m => Katip (KatipContextT m) 
Instance details

Defined in Katip.Monadic

MonadIO m => Katip (NoLoggingT m) 
Instance details

Defined in Katip.Monadic

Katip m => Katip (ResourceT m) 
Instance details

Defined in Katip.Core

Katip m => Katip (MaybeT m) 
Instance details

Defined in Katip.Core

Methods

getLogEnv :: MaybeT m LogEnv #

localLogEnv :: (LogEnv -> LogEnv) -> MaybeT m a -> MaybeT m a #

Katip m => Katip (ExceptT s m) 
Instance details

Defined in Katip.Core

Methods

getLogEnv :: ExceptT s m LogEnv #

localLogEnv :: (LogEnv -> LogEnv) -> ExceptT s m a -> ExceptT s m a #

Katip m => Katip (ReaderT s m) 
Instance details

Defined in Katip.Core

Methods

getLogEnv :: ReaderT s m LogEnv #

localLogEnv :: (LogEnv -> LogEnv) -> ReaderT s m a -> ReaderT s m a #

Katip m => Katip (StateT s m) 
Instance details

Defined in Katip.Core

Methods

getLogEnv :: StateT s m LogEnv #

localLogEnv :: (LogEnv -> LogEnv) -> StateT s m a -> StateT s m a #

Katip m => Katip (StateT s m) 
Instance details

Defined in Katip.Core

Methods

getLogEnv :: StateT s m LogEnv #

localLogEnv :: (LogEnv -> LogEnv) -> StateT s m a -> StateT s m a #

(Katip m, Monoid s) => Katip (WriterT s m) 
Instance details

Defined in Katip.Core

Methods

getLogEnv :: WriterT s m LogEnv #

localLogEnv :: (LogEnv -> LogEnv) -> WriterT s m a -> WriterT s m a #

(Katip m, Monoid s) => Katip (WriterT s m) 
Instance details

Defined in Katip.Core

Methods

getLogEnv :: WriterT s m LogEnv #

localLogEnv :: (LogEnv -> LogEnv) -> WriterT s m a -> WriterT s m a #

(Katip m, Monoid w) => Katip (RWST r w s m) 
Instance details

Defined in Katip.Core

Methods

getLogEnv :: RWST r w s m LogEnv #

localLogEnv :: (LogEnv -> LogEnv) -> RWST r w s m a -> RWST r w s m a #

(Katip m, Monoid w) => Katip (RWST r w s m) 
Instance details

Defined in Katip.Core

Methods

getLogEnv :: RWST r w s m LogEnv #

localLogEnv :: (LogEnv -> LogEnv) -> RWST r w s m a -> RWST r w s m a #

data Verbosity #

Verbosity controls the amount of information (columns) a Scribe emits during logging.

The convention is: - V0 implies no additional payload information is included in message. - V3 implies the maximum amount of payload information. - Anything in between is left to the discretion of the developer.

Constructors

V0 
V1 
V2 
V3 

Instances

Instances details
FromJSON Verbosity 
Instance details

Defined in Katip.Core

ToJSON Verbosity 
Instance details

Defined in Katip.Core

Bounded Verbosity 
Instance details

Defined in Katip.Core

Enum Verbosity 
Instance details

Defined in Katip.Core

Generic Verbosity 
Instance details

Defined in Katip.Core

Associated Types

type Rep Verbosity 
Instance details

Defined in Katip.Core

type Rep Verbosity = D1 ('MetaData "Verbosity" "Katip.Core" "katip-0.8.8.2-6lLMmxWNR0z6aY6MiVew6C" 'False) ((C1 ('MetaCons "V0" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "V1" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "V2" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "V3" 'PrefixI 'False) (U1 :: Type -> Type)))
Read Verbosity 
Instance details

Defined in Katip.Core

Show Verbosity 
Instance details

Defined in Katip.Core

Eq Verbosity 
Instance details

Defined in Katip.Core

Ord Verbosity 
Instance details

Defined in Katip.Core

Lift Verbosity 
Instance details

Defined in Katip.Core

Methods

lift :: Quote m => Verbosity -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Verbosity -> Code m Verbosity #

type Rep Verbosity 
Instance details

Defined in Katip.Core

type Rep Verbosity = D1 ('MetaData "Verbosity" "Katip.Core" "katip-0.8.8.2-6lLMmxWNR0z6aY6MiVew6C" 'False) ((C1 ('MetaCons "V0" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "V1" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "V2" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "V3" 'PrefixI 'False) (U1 :: Type -> Type)))

data Type #

Instances

Instances details
NFData Type 
Instance details

Defined in Napkin.Types.Core

Methods

rnf :: Type -> () #

Data Type 
Instance details

Defined in Napkin.Types.Core

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Type -> c Type #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Type #

toConstr :: Type -> Constr #

dataTypeOf :: Type -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Type) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Type) #

gmapT :: (forall b. Data b => b -> b) -> Type -> Type #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Type -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Type -> r #

gmapQ :: (forall d. Data d => d -> u) -> Type -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Type -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Type -> m Type #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Type -> m Type #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Type -> m Type #

Generic Type 
Instance details

Defined in Napkin.Types.Core

Associated Types

type Rep Type 
Instance details

Defined in Napkin.Types.Core

type Rep Type = D1 ('MetaData "Type" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) ((((C1 ('MetaCons "TySmallInt" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TyInteger" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "TyBigInt" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "TyDecimal" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TyReal" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "TyDouble" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TyBool" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "TyChar" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "TyVarChar" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TyBlob" 'PrefixI 'False) (U1 :: Type -> Type))))) :+: (((C1 ('MetaCons "TyUnknown" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 OriginTypeName)) :+: C1 ('MetaCons "TyVarCharWithLen" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int))) :+: (C1 ('MetaCons "TyDate" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "TyTimestamp" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TyDatetime" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "TyInterval" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TyLimited" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int))) :+: (C1 ('MetaCons "Ty2DLimited" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int))) :+: (C1 ('MetaCons "TyArray" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Int))) :+: C1 ('MetaCons "TyStruct" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (OMap StructField Type))))))))

Methods

from :: Type -> Rep Type x #

to :: Rep Type x -> Type #

Show Type 
Instance details

Defined in Napkin.Types.Core

Methods

showsPrec :: Int -> Type -> ShowS #

show :: Type -> String #

showList :: [Type] -> ShowS #

Eq Type 
Instance details

Defined in Napkin.Types.Core

Methods

(==) :: Type -> Type -> Bool #

(/=) :: Type -> Type -> Bool #

Ord Type 
Instance details

Defined in Napkin.Types.Core

Methods

compare :: Type -> Type -> Ordering #

(<) :: Type -> Type -> Bool #

(<=) :: Type -> Type -> Bool #

(>) :: Type -> Type -> Bool #

(>=) :: Type -> Type -> Bool #

max :: Type -> Type -> Type #

min :: Type -> Type -> Type #

Lift Type 
Instance details

Defined in Napkin.Types.Core

Methods

lift :: Quote m => Type -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Type -> Code m Type #

type Rep Type 
Instance details

Defined in Napkin.Types.Core

type Rep Type = D1 ('MetaData "Type" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) ((((C1 ('MetaCons "TySmallInt" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TyInteger" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "TyBigInt" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "TyDecimal" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TyReal" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "TyDouble" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TyBool" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "TyChar" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "TyVarChar" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TyBlob" 'PrefixI 'False) (U1 :: Type -> Type))))) :+: (((C1 ('MetaCons "TyUnknown" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 OriginTypeName)) :+: C1 ('MetaCons "TyVarCharWithLen" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int))) :+: (C1 ('MetaCons "TyDate" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "TyTimestamp" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TyDatetime" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "TyInterval" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TyLimited" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int))) :+: (C1 ('MetaCons "Ty2DLimited" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int))) :+: (C1 ('MetaCons "TyArray" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Int))) :+: C1 ('MetaCons "TyStruct" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (OMap StructField Type))))))))

data TableSpec b #

Constructors

TableSpec 

Fields

Instances

Instances details
ToJSON (TableSpec b) 
Instance details

Defined in Napkin.Spec.Types.Spec

Generic (TableSpec b) 
Instance details

Defined in Napkin.Spec.Types.Spec

Associated Types

type Rep (TableSpec b) 
Instance details

Defined in Napkin.Spec.Types.Spec

Methods

from :: TableSpec b -> Rep (TableSpec b) x #

to :: Rep (TableSpec b) x -> TableSpec b #

LogItem (TableSpec b) 
Instance details

Defined in Napkin.Spec.Types.Spec

ToObject (TableSpec b) 
Instance details

Defined in Napkin.Spec.Types.Spec

Methods

toObject :: TableSpec b -> Object #

type Rep (TableSpec b) 
Instance details

Defined in Napkin.Spec.Types.Spec

data CreateTableAs b #

Constructors

CreateTableAs 

Instances

Instances details
RenderSql Query a => RenderSql (CreateTableAs a) (a :: Type) # 
Instance details

Defined in Napkin.Spec.Types.CreateTableAs

Methods

renderSql :: Proxy a -> CreateTableAs a -> ME Doc #

(Data (BackendTableMeta b), Data b, Typeable (BackendTableMeta b), Typeable b) => Data (CreateTableAs b) # 
Instance details

Defined in Napkin.Spec.Types.CreateTableAs

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> CreateTableAs b -> c (CreateTableAs b) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (CreateTableAs b) #

toConstr :: CreateTableAs b -> Constr #

dataTypeOf :: CreateTableAs b -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (CreateTableAs b)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (CreateTableAs b)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> CreateTableAs b -> CreateTableAs b #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CreateTableAs b -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CreateTableAs b -> r #

gmapQ :: (forall d. Data d => d -> u) -> CreateTableAs b -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CreateTableAs b -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CreateTableAs b -> m (CreateTableAs b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CreateTableAs b -> m (CreateTableAs b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CreateTableAs b -> m (CreateTableAs b) #

Generic (CreateTableAs b) # 
Instance details

Defined in Napkin.Spec.Types.CreateTableAs

Associated Types

type Rep (CreateTableAs b) 
Instance details

Defined in Napkin.Spec.Types.CreateTableAs

type Rep (CreateTableAs b) = D1 ('MetaData "CreateTableAs" "Napkin.Spec.Types.CreateTableAs" "napkin-api-2.0.0-GKif1wVpGtsJEy6X9JqPgn" 'False) (C1 ('MetaCons "CreateTableAs" 'PrefixI 'True) (S1 ('MetaSel ('Just "meta") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (BackendTableMeta b)) :*: (S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SpecTableName) :*: S1 ('MetaSel ('Just "query") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Query))))
Show (BackendTableMeta b) => Show (CreateTableAs b) # 
Instance details

Defined in Napkin.Spec.Types.CreateTableAs

Eq (BackendTableMeta b) => Eq (CreateTableAs b) # 
Instance details

Defined in Napkin.Spec.Types.CreateTableAs

AsRelation (CreateTableAs m) # 
Instance details

Defined in Napkin.Spec.Types.CreateTableAs

HasDefinition (CreateTableAs m) # 
Instance details

Defined in Napkin.Spec.Types.CreateTableAs

MaybeQuery (CreateTableAs m) # 
Instance details

Defined in Napkin.Spec.Types.CreateTableAs

TableRef (CreateTableAs m) # 
Instance details

Defined in Napkin.Spec.Types.CreateTableAs

HasDeps (CreateTableAs m) # 
Instance details

Defined in Napkin.Spec.Types.CreateTableAs

type Rep (CreateTableAs b) # 
Instance details

Defined in Napkin.Spec.Types.CreateTableAs

type Rep (CreateTableAs b) = D1 ('MetaData "CreateTableAs" "Napkin.Spec.Types.CreateTableAs" "napkin-api-2.0.0-GKif1wVpGtsJEy6X9JqPgn" 'False) (C1 ('MetaCons "CreateTableAs" 'PrefixI 'True) (S1 ('MetaSel ('Just "meta") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (BackendTableMeta b)) :*: (S1 ('MetaSel ('Just "name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SpecTableName) :*: S1 ('MetaSel ('Just "query") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Query))))

data Query #

Instances

Instances details
NFData Query 
Instance details

Defined in Napkin.Types.Core

Methods

rnf :: Query -> () #

Data Query 
Instance details

Defined in Napkin.Types.Core

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Query -> c Query #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Query #

toConstr :: Query -> Constr #

dataTypeOf :: Query -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Query) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Query) #

gmapT :: (forall b. Data b => b -> b) -> Query -> Query #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Query -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Query -> r #

gmapQ :: (forall d. Data d => d -> u) -> Query -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Query -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Query -> m Query #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Query -> m Query #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Query -> m Query #

Generic Query 
Instance details

Defined in Napkin.Types.Core

Associated Types

type Rep Query 
Instance details

Defined in Napkin.Types.Core

type Rep Query = D1 ('MetaData "Query" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) ((C1 ('MetaCons "Query" 'PrefixI 'True) (((S1 ('MetaSel ('Just "_queryWith") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 WithClauses) :*: (S1 ('MetaSel ('Just "_querySelect") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Alias SExp]) :*: S1 ('MetaSel ('Just "_queryComments") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [ColumnComment]))) :*: (S1 ('MetaSel ('Just "_queryFrom") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe From)) :*: (S1 ('MetaSel ('Just "_queryTableOperator") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe ParensOperator)) :*: S1 ('MetaSel ('Just "_queryWhere") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe SExp))))) :*: ((S1 ('MetaSel ('Just "_queryHaving") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe SExp)) :*: (S1 ('MetaSel ('Just "_queryGroup") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 GroupBy) :*: S1 ('MetaSel ('Just "_queryOrder") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Order))) :*: ((S1 ('MetaSel ('Just "_queryLimit") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Int)) :*: S1 ('MetaSel ('Just "_queryOffset") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Int))) :*: (S1 ('MetaSel ('Just "_queryDistinct") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Distinctness) :*: S1 ('MetaSel ('Just "_queryAs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 AsStruct))))) :+: C1 ('MetaCons "Union" 'PrefixI 'True) ((S1 ('MetaSel ('Just "_unionType") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UnionType) :*: S1 ('MetaSel ('Just "_unionQuery1") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Query)) :*: (S1 ('MetaSel ('Just "_unionQuery2") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Query) :*: S1 ('MetaSel ('Just "_unionWiths") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 WithClauses)))) :+: (C1 ('MetaCons "QueryRaw" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RawQuery)) :+: C1 ('MetaCons "NativeQuery" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 NativeQuery))))

Methods

from :: Query -> Rep Query x #

to :: Rep Query x -> Query #

Show Query 
Instance details

Defined in Napkin.Types.Core

Methods

showsPrec :: Int -> Query -> ShowS #

show :: Query -> String #

showList :: [Query] -> ShowS #

Eq Query 
Instance details

Defined in Napkin.Types.Core

Methods

(==) :: Query -> Query -> Bool #

(/=) :: Query -> Query -> Bool #

Ord Query 
Instance details

Defined in Napkin.Types.Core

Methods

compare :: Query -> Query -> Ordering #

(<) :: Query -> Query -> Bool #

(<=) :: Query -> Query -> Bool #

(>) :: Query -> Query -> Bool #

(>=) :: Query -> Query -> Bool #

max :: Query -> Query -> Query #

min :: Query -> Query -> Query #

AsRelation Query 
Instance details

Defined in Napkin.Types.Core

Methods

asRelation :: Query -> Relation #

HasDefinition Query 
Instance details

Defined in Napkin.Types.Core

MaybeQuery Query 
Instance details

Defined in Napkin.Types.Core

Methods

getQuery :: Query -> Maybe Query #

HasDeps Query 
Instance details

Defined in Napkin.Types.Deps

FunRenamer Query 
Instance details

Defined in Napkin.Types.QueryTransformer

Methods

renameFun :: (Ref Function -> Ref Function) -> Query -> Query #

TableRenamer Query 
Instance details

Defined in Napkin.Types.QueryTransformer

Methods

renameTableRef :: (Ref Table -> Ref Table) -> Query -> Query #

Lift Query 
Instance details

Defined in Napkin.Types.Core

Methods

lift :: Quote m => Query -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Query -> Code m Query #

FunRenamer (Selected Query) 
Instance details

Defined in Napkin.Types.QueryTransformer

TableRenamer (Selected Query) 
Instance details

Defined in Napkin.Types.QueryTransformer

type Rep Query 
Instance details

Defined in Napkin.Types.Core

type Rep Query = D1 ('MetaData "Query" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) ((C1 ('MetaCons "Query" 'PrefixI 'True) (((S1 ('MetaSel ('Just "_queryWith") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 WithClauses) :*: (S1 ('MetaSel ('Just "_querySelect") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Alias SExp]) :*: S1 ('MetaSel ('Just "_queryComments") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [ColumnComment]))) :*: (S1 ('MetaSel ('Just "_queryFrom") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe From)) :*: (S1 ('MetaSel ('Just "_queryTableOperator") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe ParensOperator)) :*: S1 ('MetaSel ('Just "_queryWhere") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe SExp))))) :*: ((S1 ('MetaSel ('Just "_queryHaving") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe SExp)) :*: (S1 ('MetaSel ('Just "_queryGroup") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 GroupBy) :*: S1 ('MetaSel ('Just "_queryOrder") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Order))) :*: ((S1 ('MetaSel ('Just "_queryLimit") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Int)) :*: S1 ('MetaSel ('Just "_queryOffset") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Int))) :*: (S1 ('MetaSel ('Just "_queryDistinct") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Distinctness) :*: S1 ('MetaSel ('Just "_queryAs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 AsStruct))))) :+: C1 ('MetaCons "Union" 'PrefixI 'True) ((S1 ('MetaSel ('Just "_unionType") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UnionType) :*: S1 ('MetaSel ('Just "_unionQuery1") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Query)) :*: (S1 ('MetaSel ('Just "_unionQuery2") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Query) :*: S1 ('MetaSel ('Just "_unionWiths") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 WithClauses)))) :+: (C1 ('MetaCons "QueryRaw" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RawQuery)) :+: C1 ('MetaCons "NativeQuery" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 NativeQuery))))

describe :: forall (r :: EffectRow) a. Members '[Assertion :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r => Text -> Sem r a -> Sem r a #

data Name #

Constructors

Specific 

Fields

Star 

Instances

Instances details
FromJSON Name 
Instance details

Defined in Napkin.Types.Core

ToJSON Name 
Instance details

Defined in Napkin.Types.Core

FoldCase Name 
Instance details

Defined in Napkin.Types.Core

Methods

foldCase :: Name -> Name #

foldCaseList :: [Name] -> [Name]

NFData Name 
Instance details

Defined in Napkin.Types.Core

Methods

rnf :: Name -> () #

Monoid Name 
Instance details

Defined in Napkin.Types.Core

Methods

mempty :: Name #

mappend :: Name -> Name -> Name #

mconcat :: [Name] -> Name #

Semigroup Name 
Instance details

Defined in Napkin.Types.Core

Methods

(<>) :: Name -> Name -> Name #

sconcat :: NonEmpty Name -> Name #

stimes :: Integral b => b -> Name -> Name #

Data Name 
Instance details

Defined in Napkin.Types.Core

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Name -> c Name #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Name #

toConstr :: Name -> Constr #

dataTypeOf :: Name -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Name) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Name) #

gmapT :: (forall b. Data b => b -> b) -> Name -> Name #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Name -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Name -> r #

gmapQ :: (forall d. Data d => d -> u) -> Name -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Name -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Name -> m Name #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Name -> m Name #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Name -> m Name #

IsString Name 
Instance details

Defined in Napkin.Types.Core

Methods

fromString :: String -> Name #

Generic Name 
Instance details

Defined in Napkin.Types.Core

Associated Types

type Rep Name 
Instance details

Defined in Napkin.Types.Core

type Rep Name = D1 ('MetaData "Name" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "Specific" 'PrefixI 'True) (S1 ('MetaSel ('Just "_unName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)) :+: C1 ('MetaCons "Star" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: Name -> Rep Name x #

to :: Rep Name x -> Name #

Show Name 
Instance details

Defined in Napkin.Types.Core

Methods

showsPrec :: Int -> Name -> ShowS #

show :: Name -> String #

showList :: [Name] -> ShowS #

Eq Name 
Instance details

Defined in Napkin.Types.Core

Methods

(==) :: Name -> Name -> Bool #

(/=) :: Name -> Name -> Bool #

Ord Name 
Instance details

Defined in Napkin.Types.Core

Methods

compare :: Name -> Name -> Ordering #

(<) :: Name -> Name -> Bool #

(<=) :: Name -> Name -> Bool #

(>) :: Name -> Name -> Bool #

(>=) :: Name -> Name -> Bool #

max :: Name -> Name -> Name #

min :: Name -> Name -> Name #

Hashable Name 
Instance details

Defined in Napkin.Types.Core

Methods

hashWithSalt :: Int -> Name -> Int #

hash :: Name -> Int #

IsRef Name 
Instance details

Defined in Napkin.Types.Core

Methods

ref :: forall {k} (b :: k). Name -> Ref b #

Lift Name 
Instance details

Defined in Napkin.Types.Core

Methods

lift :: Quote m => Name -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Name -> Code m Name #

Lift (NonEmpty Name) 
Instance details

Defined in Napkin.Types.Core

Methods

lift :: Quote m => NonEmpty Name -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => NonEmpty Name -> Code m (NonEmpty Name) #

Buildable [Name] 
Instance details

Defined in Napkin.Types.Core

Methods

build :: [Name] -> Builder #

IsRef (NonEmpty Name) 
Instance details

Defined in Napkin.Types.Core

Methods

ref :: forall {k} (b :: k). NonEmpty Name -> Ref b #

IsRef [Name] 
Instance details

Defined in Napkin.Types.Core

Methods

ref :: forall {k} (b :: k). [Name] -> Ref b #

HasDeps (OMap Name SExp) 
Instance details

Defined in Napkin.Types.Deps

Cons (Ref a) (Ref a) Name Name 
Instance details

Defined in Napkin.Types.Core

Methods

_Cons :: Prism (Ref a) (Ref a) (Name, Ref a) (Name, Ref a) #

Snoc (Ref a) (Ref a) Name Name 
Instance details

Defined in Napkin.Types.Core

Methods

_Snoc :: Prism (Ref a) (Ref a) (Ref a, Name) (Ref a, Name) #

type Rep Name 
Instance details

Defined in Napkin.Types.Core

type Rep Name = D1 ('MetaData "Name" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "Specific" 'PrefixI 'True) (S1 ('MetaSel ('Just "_unName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)) :+: C1 ('MetaCons "Star" 'PrefixI 'False) (U1 :: Type -> Type))

($) :: (a -> b) -> a -> b infixr 0 #

($) is the function application operator.

Applying ($) to a function f and an argument x gives the same result as applying f to x directly. The definition is akin to this:

($) :: (a -> b) -> a -> b
($) f x = f x

This is id specialized from a -> a to (a -> b) -> (a -> b) which by the associativity of (->) is the same as (a -> b) -> a -> b.

On the face of it, this may appear pointless! But it's actually one of the most useful and important operators in Haskell.

The order of operations is very different between ($) and normal function application. Normal function application has precedence 10 - higher than any operator - and associates to the left. So these two definitions are equivalent:

expr = min 5 1 + 5
expr = ((min 5) 1) + 5

($) has precedence 0 (the lowest) and associates to the right, so these are equivalent:

expr = min 5 $ 1 + 5
expr = (min 5) (1 + 5)

Examples

Expand

A common use cases of ($) is to avoid parentheses in complex expressions.

For example, instead of using nested parentheses in the following Haskell function:

-- | Sum numbers in a string: strSum "100  5 -7" == 98
strSum :: String -> Int
strSum s = sum (mapMaybe readMaybe (words s))

we can deploy the function application operator:

-- | Sum numbers in a string: strSum "100  5 -7" == 98
strSum :: String -> Int
strSum s = sum $ mapMaybe readMaybe $ words s

($) is also used as a section (a partially applied operator), in order to indicate that we wish to apply some yet-unspecified function to a given value. For example, to apply the argument 5 to a list of functions:

applyFive :: [Int]
applyFive = map ($ 5) [(+1), (2^)]
>>> [6, 32]

Technical Remark (Representation Polymorphism)

Expand

($) is fully representation-polymorphic. This allows it to also be used with arguments of unlifted and even unboxed kinds, such as unboxed integers:

fastMod :: Int -> Int -> Int
fastMod (I# x) (I# m) = I# $ remInt# x m

(++) :: [a] -> [a] -> [a] infixr 5 #

(++) appends two lists, i.e.,

[x1, ..., xm] ++ [y1, ..., yn] == [x1, ..., xm, y1, ..., yn]
[x1, ..., xm] ++ [y1, ...] == [x1, ..., xm, y1, ...]

If the first list is not finite, the result is the first list.

Performance considerations

Expand

This function takes linear time in the number of elements of the first list. Thus it is better to associate repeated applications of (++) to the right (which is the default behaviour): xs ++ (ys ++ zs) or simply xs ++ ys ++ zs, but not (xs ++ ys) ++ zs. For the same reason concat = foldr (++) [] has linear performance, while foldl (++) [] is prone to quadratic slowdown

Examples

Expand
>>> [1, 2, 3] ++ [4, 5, 6]
[1,2,3,4,5,6]
>>> [] ++ [1, 2, 3]
[1,2,3]
>>> [3, 2, 1] ++ []
[3,2,1]

(.) :: (b -> c) -> (a -> b) -> a -> c infixr 9 #

Right to left function composition.

(f . g) x = f (g x)
f . id = f = id . f

Examples

Expand
>>> map ((*2) . length) [[], [0, 1, 2], [0]]
[0,6,2]
>>> foldr (.) id [(+1), (*3), (^3)] 2
25
>>> let (...) = (.).(.) in ((*2)...(+)) 5 10
30

(=<<) :: Monad m => (a -> m b) -> m a -> m b infixr 1 #

Same as >>=, but with the arguments interchanged.

as >>= f == f =<< as

ap :: Monad m => m (a -> b) -> m a -> m b #

In many situations, the liftM operations can be replaced by uses of ap, which promotes function application.

return f `ap` x1 `ap` ... `ap` xn

is equivalent to

liftM<n> f x1 x2 ... xn

Examples

Expand
>>> pure (\x y z -> x + y * z) `ap` Just 1 `ap` Just 5 `ap` Just 10
Just 51

const :: a -> b -> a #

const x y always evaluates to x, ignoring its second argument.

const x = \_ -> x

This function might seem useless at first glance, but it can be very useful in a higher order context.

Examples

Expand
>>> const 42 "hello"
42
>>> map (const 42) [0..3]
[42,42,42,42]

flip :: (a -> b -> c) -> b -> a -> c #

flip f takes its (first) two arguments in the reverse order of f.

flip f x y = f y x
flip . flip = id

Examples

Expand
>>> flip (++) "hello" "world"
"worldhello"
>>> let (.>) = flip (.) in (+1) .> show $ 5
"6"

join :: Monad m => m (m a) -> m a #

The join function is the conventional monad join operator. It is used to remove one level of monadic structure, projecting its bound argument into the outer level.

'join bss' can be understood as the do expression

do bs <- bss
   bs

Examples

Expand
>>> join [[1, 2, 3], [4, 5, 6], [7, 8, 9]]
[1,2,3,4,5,6,7,8,9]
>>> join (Just (Just 3))
Just 3

A common use of join is to run an IO computation returned from an STM transaction, since STM transactions can't perform IO directly. Recall that

atomically :: STM a -> IO a

is used to run STM transactions atomically. So, by specializing the types of atomically and join to

atomically :: STM (IO b) -> IO (IO b)
join       :: IO (IO b)  -> IO b

we can compose them as

join . atomically :: STM (IO b) -> IO b

to run an STM transaction and the IO action it returns.

liftM :: Monad m => (a1 -> r) -> m a1 -> m r #

Promote a function to a monad. This is equivalent to fmap but specialised to Monads.

liftM2 :: Monad m => (a1 -> a2 -> r) -> m a1 -> m a2 -> m r #

Promote a function to a monad, scanning the monadic arguments from left to right.

Examples

Expand
>>> liftM2 (+) [0,1] [0,2]
[0,2,1,3]
>>> liftM2 (+) (Just 1) Nothing
Nothing
>>> liftM2 (+) (+ 3) (* 2) 5
18

map :: (a -> b) -> [a] -> [b] #

O(n). map f xs is the list obtained by applying f to each element of xs, i.e.,

map f [x1, x2, ..., xn] == [f x1, f x2, ..., f xn]
map f [x1, x2, ...] == [f x1, f x2, ...]

this means that map id == id

Examples

Expand
>>> map (+1) [1, 2, 3]
[2,3,4]
>>> map id [1, 2, 3]
[1,2,3]
>>> map (\n -> 3 * n + 1) [1, 2, 3]
[4,7,10]

when :: Applicative f => Bool -> f () -> f () #

Conditional execution of Applicative expressions. For example,

Examples

Expand
when debug (putStrLn "Debugging")

will output the string Debugging if the Boolean value debug is True, and otherwise do nothing.

>>> putStr "pi:" >> when False (print 3.14159)
pi:

filterM :: Applicative m => (a -> m Bool) -> [a] -> m [a] #

This generalizes the list-based filter function.

runIdentity (filterM (Identity . p) xs) == filter p xs

Examples

Expand
>>> filterM (\x -> do
      putStrLn ("Keep: " ++ show x ++ "?")
      answer <- getLine
      pure (answer == "y"))
    [1, 2, 3]
Keep: 1?
y
Keep: 2?
n
Keep: 3?
y
[1,3]
>>> filterM (\x -> do
      putStr (show x)
      x' <- readLn
      pure (x == x'))
    [1, 2, 3]
12
22
33
[2,3]

foldM :: (Foldable t, Monad m) => (b -> a -> m b) -> b -> t a -> m b #

The foldM function is analogous to foldl, except that its result is encapsulated in a monad. Note that foldM works from left-to-right over the list arguments. This could be an issue where (>>) and the `folded function' are not commutative.

foldM f a1 [x1, x2, ..., xm]

==

do
  a2 <- f a1 x1
  a3 <- f a2 x2
  ...
  f am xm

If right-to-left evaluation is required, the input list should be reversed.

Note: foldM is the same as foldlM

guard :: Alternative f => Bool -> f () #

Conditional failure of Alternative computations. Defined by

guard True  = pure ()
guard False = empty

Examples

Expand

Common uses of guard include conditionally signalling an error in an error monad and conditionally rejecting the current choice in an Alternative-based parser.

As an example of signalling an error in the error monad Maybe, consider a safe division function safeDiv x y that returns Nothing when the denominator y is zero and Just (x `div` y) otherwise. For example:

>>> safeDiv 4 0
Nothing
>>> safeDiv 4 2
Just 2

A definition of safeDiv using guards, but not guard:

safeDiv :: Int -> Int -> Maybe Int
safeDiv x y | y /= 0    = Just (x `div` y)
            | otherwise = Nothing

A definition of safeDiv using guard and Monad do-notation:

safeDiv :: Int -> Int -> Maybe Int
safeDiv x y = do
  guard (y /= 0)
  return (x `div` y)

unless :: Applicative f => Bool -> f () -> f () #

The reverse of when.

Examples

Expand
>>> do x <- getLine
       unless (x == "hi") (putStrLn "hi!")
comingupwithexamplesisdifficult
hi!
>>> unless (pi > exp 1) Nothing
Just ()

and :: [SExp] -> SExp #

or :: [SExp] -> SExp #

sequence_ :: (Foldable t, Monad m) => t (m a) -> m () #

Evaluate each monadic action in the structure from left to right, and ignore the results. For a version that doesn't ignore the results see sequence.

sequence_ is just like sequenceA_, but specialised to monadic actions.

(<$>) :: Functor f => (a -> b) -> f a -> f b infixl 4 #

An infix synonym for fmap.

The name of this operator is an allusion to $. Note the similarities between their types:

 ($)  ::              (a -> b) ->   a ->   b
(<$>) :: Functor f => (a -> b) -> f a -> f b

Whereas $ is function application, <$> is function application lifted over a Functor.

Examples

Expand

Convert from a Maybe Int to a Maybe String using show:

>>> show <$> Nothing
Nothing
>>> show <$> Just 3
Just "3"

Convert from an Either Int Int to an Either Int String using show:

>>> show <$> Left 17
Left 17
>>> show <$> Right 17
Right "17"

Double each element of a list:

>>> (*2) <$> [1,2,3]
[2,4,6]

Apply even to the second element of a pair:

>>> even <$> (2,2)
(2,True)

fst :: (a, b) -> a #

Extract the first component of a pair.

snd :: (a, b) -> b #

Extract the second component of a pair.

undefined :: HasCallStack => a #

A special case of error. It is expected that compilers will recognize this and insert error messages which are more appropriate to the context in which undefined appears.

zip :: [a] -> [b] -> [(a, b)] #

O(min(m,n)). zip takes two lists and returns a list of corresponding pairs.

zip is right-lazy:

>>> zip [] undefined
[]
>>> zip undefined []
*** Exception: Prelude.undefined
...

zip is capable of list fusion, but it is restricted to its first list argument and its resulting list.

Examples

Expand
>>> zip [1, 2, 3] ['a', 'b', 'c']
[(1,'a'),(2,'b'),(3,'c')]

If one input list is shorter than the other, excess elements of the longer list are discarded, even if one of the lists is infinite:

>>> zip [1] ['a', 'b']
[(1,'a')]
>>> zip [1, 2] ['a']
[(1,'a')]
>>> zip [] [1..]
[]
>>> zip [1..] []
[]

not :: SExp -> SExp #

class Functor f => Applicative (f :: Type -> Type) where #

A functor with application, providing operations to

  • embed pure expressions (pure), and
  • sequence computations and combine their results (<*> and liftA2).

A minimal complete definition must include implementations of pure and of either <*> or liftA2. If it defines both, then they must behave the same as their default definitions:

(<*>) = liftA2 id
liftA2 f x y = f <$> x <*> y

Further, any definition must satisfy the following:

Identity
pure id <*> v = v
Composition
pure (.) <*> u <*> v <*> w = u <*> (v <*> w)
Homomorphism
pure f <*> pure x = pure (f x)
Interchange
u <*> pure y = pure ($ y) <*> u

The other methods have the following default definitions, which may be overridden with equivalent specialized implementations:

As a consequence of these laws, the Functor instance for f will satisfy

It may be useful to note that supposing

forall x y. p (q x y) = f x . g y

it follows from the above that

liftA2 p (liftA2 q u v) = liftA2 f u . liftA2 g v

If f is also a Monad, it should satisfy

(which implies that pure and <*> satisfy the applicative functor laws).

Minimal complete definition

pure, ((<*>) | liftA2)

Methods

pure :: a -> f a #

Lift a value into the Structure.

Examples

Expand
>>> pure 1 :: Maybe Int
Just 1
>>> pure 'z' :: [Char]
"z"
>>> pure (pure ":D") :: Maybe [String]
Just [":D"]

(<*>) :: f (a -> b) -> f a -> f b infixl 4 #

Sequential application.

A few functors support an implementation of <*> that is more efficient than the default one.

Example

Expand

Used in combination with (<$>), (<*>) can be used to build a record.

>>> data MyState = MyState {arg1 :: Foo, arg2 :: Bar, arg3 :: Baz}
>>> produceFoo :: Applicative f => f Foo
>>> produceBar :: Applicative f => f Bar
>>> produceBaz :: Applicative f => f Baz
>>> mkState :: Applicative f => f MyState
>>> mkState = MyState <$> produceFoo <*> produceBar <*> produceBaz

liftA2 :: (a -> b -> c) -> f a -> f b -> f c #

Lift a binary function to actions.

Some functors support an implementation of liftA2 that is more efficient than the default one. In particular, if fmap is an expensive operation, it is likely better to use liftA2 than to fmap over the structure and then use <*>.

This became a typeclass method in 4.10.0.0. Prior to that, it was a function defined in terms of <*> and fmap.

Example

Expand
>>> liftA2 (,) (Just 3) (Just 5)
Just (3,5)
>>> liftA2 (+) [1, 2, 3] [4, 5, 6]
[5,6,7,6,7,8,7,8,9]

(*>) :: f a -> f b -> f b infixl 4 #

Sequence actions, discarding the value of the first argument.

Examples

Expand

If used in conjunction with the Applicative instance for Maybe, you can chain Maybe computations, with a possible "early return" in case of Nothing.

>>> Just 2 *> Just 3
Just 3
>>> Nothing *> Just 3
Nothing

Of course a more interesting use case would be to have effectful computations instead of just returning pure values.

>>> import Data.Char
>>> import GHC.Internal.Text.ParserCombinators.ReadP
>>> let p = string "my name is " *> munch1 isAlpha <* eof
>>> readP_to_S p "my name is Simon"
[("Simon","")]

(<*) :: f a -> f b -> f a infixl 4 #

Sequence actions, discarding the value of the second argument.

Instances

Instances details
Applicative IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

pure :: a -> IResult a #

(<*>) :: IResult (a -> b) -> IResult a -> IResult b #

liftA2 :: (a -> b -> c) -> IResult a -> IResult b -> IResult c #

(*>) :: IResult a -> IResult b -> IResult b #

(<*) :: IResult a -> IResult b -> IResult a #

Applicative Parser 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

pure :: a -> Parser a #

(<*>) :: Parser (a -> b) -> Parser a -> Parser b #

liftA2 :: (a -> b -> c) -> Parser a -> Parser b -> Parser c #

(*>) :: Parser a -> Parser b -> Parser b #

(<*) :: Parser a -> Parser b -> Parser a #

Applicative Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

pure :: a -> Result a #

(<*>) :: Result (a -> b) -> Result a -> Result b #

liftA2 :: (a -> b -> c) -> Result a -> Result b -> Result c #

(*>) :: Result a -> Result b -> Result b #

(<*) :: Result a -> Result b -> Result a #

Applicative Complex

Since: base-4.9.0.0

Instance details

Defined in Data.Complex

Methods

pure :: a -> Complex a #

(<*>) :: Complex (a -> b) -> Complex a -> Complex b #

liftA2 :: (a -> b -> c) -> Complex a -> Complex b -> Complex c #

(*>) :: Complex a -> Complex b -> Complex b #

(<*) :: Complex a -> Complex b -> Complex a #

Applicative First

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

pure :: a -> First a #

(<*>) :: First (a -> b) -> First a -> First b #

liftA2 :: (a -> b -> c) -> First a -> First b -> First c #

(*>) :: First a -> First b -> First b #

(<*) :: First a -> First b -> First a #

Applicative Last

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

pure :: a -> Last a #

(<*>) :: Last (a -> b) -> Last a -> Last b #

liftA2 :: (a -> b -> c) -> Last a -> Last b -> Last c #

(*>) :: Last a -> Last b -> Last b #

(<*) :: Last a -> Last b -> Last a #

Applicative Max

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

pure :: a -> Max a #

(<*>) :: Max (a -> b) -> Max a -> Max b #

liftA2 :: (a -> b -> c) -> Max a -> Max b -> Max c #

(*>) :: Max a -> Max b -> Max b #

(<*) :: Max a -> Max b -> Max a #

Applicative Min

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

pure :: a -> Min a #

(<*>) :: Min (a -> b) -> Min a -> Min b #

liftA2 :: (a -> b -> c) -> Min a -> Min b -> Min c #

(*>) :: Min a -> Min b -> Min b #

(<*) :: Min a -> Min b -> Min a #

Applicative Seq

Since: containers-0.5.4

Instance details

Defined in Data.Sequence.Internal

Methods

pure :: a -> Seq a #

(<*>) :: Seq (a -> b) -> Seq a -> Seq b #

liftA2 :: (a -> b -> c) -> Seq a -> Seq b -> Seq c #

(*>) :: Seq a -> Seq b -> Seq b #

(<*) :: Seq a -> Seq b -> Seq a #

Applicative Tree 
Instance details

Defined in Data.Tree

Methods

pure :: a -> Tree a #

(<*>) :: Tree (a -> b) -> Tree a -> Tree b #

liftA2 :: (a -> b -> c) -> Tree a -> Tree b -> Tree c #

(*>) :: Tree a -> Tree b -> Tree b #

(<*) :: Tree a -> Tree b -> Tree a #

Applicative CryptoFailable 
Instance details

Defined in Crypto.Error.Types

Applicative CryptoFailable 
Instance details

Defined in Crypto.Error.Types

Applicative DNonEmpty 
Instance details

Defined in Data.DList.DNonEmpty.Internal

Methods

pure :: a -> DNonEmpty a #

(<*>) :: DNonEmpty (a -> b) -> DNonEmpty a -> DNonEmpty b #

liftA2 :: (a -> b -> c) -> DNonEmpty a -> DNonEmpty b -> DNonEmpty c #

(*>) :: DNonEmpty a -> DNonEmpty b -> DNonEmpty b #

(<*) :: DNonEmpty a -> DNonEmpty b -> DNonEmpty a #

Applicative DList 
Instance details

Defined in Data.DList.Internal

Methods

pure :: a -> DList a #

(<*>) :: DList (a -> b) -> DList a -> DList b #

liftA2 :: (a -> b -> c) -> DList a -> DList b -> DList c #

(*>) :: DList a -> DList b -> DList b #

(<*) :: DList a -> DList b -> DList a #

Applicative MatchResult

Product is an "or" on fallibility---the combined match result is infallible only if the left and right argument match results both were.

This is useful for combining a bunch of alternatives together and then getting the overall fallibility of the entire group. See mkDataConCase for an example.

Instance details

Defined in GHC.HsToCore.Monad

Methods

pure :: a -> MatchResult a #

(<*>) :: MatchResult (a -> b) -> MatchResult a -> MatchResult b #

liftA2 :: (a -> b -> c) -> MatchResult a -> MatchResult b -> MatchResult c #

(*>) :: MatchResult a -> MatchResult b -> MatchResult b #

(<*) :: MatchResult a -> MatchResult b -> MatchResult a #

Applicative PV 
Instance details

Defined in GHC.Parser.PostProcess

Methods

pure :: a -> PV a #

(<*>) :: PV (a -> b) -> PV a -> PV b #

liftA2 :: (a -> b -> c) -> PV a -> PV b -> PV c #

(*>) :: PV a -> PV b -> PV b #

(<*) :: PV a -> PV b -> PV a #

Applicative SolverStage 
Instance details

Defined in GHC.Tc.Solver.Monad

Methods

pure :: a -> SolverStage a #

(<*>) :: SolverStage (a -> b) -> SolverStage a -> SolverStage b #

liftA2 :: (a -> b -> c) -> SolverStage a -> SolverStage b -> SolverStage c #

(*>) :: SolverStage a -> SolverStage b -> SolverStage b #

(<*) :: SolverStage a -> SolverStage b -> SolverStage a #

Applicative TcS 
Instance details

Defined in GHC.Tc.Solver.Monad

Methods

pure :: a -> TcS a #

(<*>) :: TcS (a -> b) -> TcS a -> TcS b #

liftA2 :: (a -> b -> c) -> TcS a -> TcS b -> TcS c #

(*>) :: TcS a -> TcS b -> TcS b #

(<*) :: TcS a -> TcS b -> TcS a #

Applicative NonEmpty

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Base

Methods

pure :: a -> NonEmpty a #

(<*>) :: NonEmpty (a -> b) -> NonEmpty a -> NonEmpty b #

liftA2 :: (a -> b -> c) -> NonEmpty a -> NonEmpty b -> NonEmpty c #

(*>) :: NonEmpty a -> NonEmpty b -> NonEmpty b #

(<*) :: NonEmpty a -> NonEmpty b -> NonEmpty a #

Applicative STM

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Conc.Sync

Methods

pure :: a -> STM a #

(<*>) :: STM (a -> b) -> STM a -> STM b #

liftA2 :: (a -> b -> c) -> STM a -> STM b -> STM c #

(*>) :: STM a -> STM b -> STM b #

(<*) :: STM a -> STM b -> STM a #

Applicative Identity

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Identity

Methods

pure :: a -> Identity a #

(<*>) :: Identity (a -> b) -> Identity a -> Identity b #

liftA2 :: (a -> b -> c) -> Identity a -> Identity b -> Identity c #

(*>) :: Identity a -> Identity b -> Identity b #

(<*) :: Identity a -> Identity b -> Identity a #

Applicative First

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Data.Monoid

Methods

pure :: a -> First a #

(<*>) :: First (a -> b) -> First a -> First b #

liftA2 :: (a -> b -> c) -> First a -> First b -> First c #

(*>) :: First a -> First b -> First b #

(<*) :: First a -> First b -> First a #

Applicative Last

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Data.Monoid

Methods

pure :: a -> Last a #

(<*>) :: Last (a -> b) -> Last a -> Last b #

liftA2 :: (a -> b -> c) -> Last a -> Last b -> Last c #

(*>) :: Last a -> Last b -> Last b #

(<*) :: Last a -> Last b -> Last a #

Applicative Down

@since base-4.11.0.0

Instance details

Defined in GHC.Internal.Data.Ord

Methods

pure :: a -> Down a #

(<*>) :: Down (a -> b) -> Down a -> Down b #

liftA2 :: (a -> b -> c) -> Down a -> Down b -> Down c #

(*>) :: Down a -> Down b -> Down b #

(<*) :: Down a -> Down b -> Down a #

Applicative Dual

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

pure :: a -> Dual a #

(<*>) :: Dual (a -> b) -> Dual a -> Dual b #

liftA2 :: (a -> b -> c) -> Dual a -> Dual b -> Dual c #

(*>) :: Dual a -> Dual b -> Dual b #

(<*) :: Dual a -> Dual b -> Dual a #

Applicative Product

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

pure :: a -> Product a #

(<*>) :: Product (a -> b) -> Product a -> Product b #

liftA2 :: (a -> b -> c) -> Product a -> Product b -> Product c #

(*>) :: Product a -> Product b -> Product b #

(<*) :: Product a -> Product b -> Product a #

Applicative Sum

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

pure :: a -> Sum a #

(<*>) :: Sum (a -> b) -> Sum a -> Sum b #

liftA2 :: (a -> b -> c) -> Sum a -> Sum b -> Sum c #

(*>) :: Sum a -> Sum b -> Sum b #

(<*) :: Sum a -> Sum b -> Sum a #

Applicative ZipList
f <$> ZipList xs1 <*> ... <*> ZipList xsN
    = ZipList (zipWithN f xs1 ... xsN)

where zipWithN refers to the zipWith function of the appropriate arity (zipWith, zipWith3, zipWith4, ...). For example:

(\a b c -> stimes c [a, b]) <$> ZipList "abcd" <*> ZipList "567" <*> ZipList [1..]
    = ZipList (zipWith3 (\a b c -> stimes c [a, b]) "abcd" "567" [1..])
    = ZipList {getZipList = ["a5","b6b6","c7c7c7"]}

@since base-2.01

Instance details

Defined in GHC.Internal.Functor.ZipList

Methods

pure :: a -> ZipList a #

(<*>) :: ZipList (a -> b) -> ZipList a -> ZipList b #

liftA2 :: (a -> b -> c) -> ZipList a -> ZipList b -> ZipList c #

(*>) :: ZipList a -> ZipList b -> ZipList b #

(<*) :: ZipList a -> ZipList b -> ZipList a #

Applicative Par1

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

pure :: a -> Par1 a #

(<*>) :: Par1 (a -> b) -> Par1 a -> Par1 b #

liftA2 :: (a -> b -> c) -> Par1 a -> Par1 b -> Par1 c #

(*>) :: Par1 a -> Par1 b -> Par1 b #

(<*) :: Par1 a -> Par1 b -> Par1 a #

Applicative P

@since base-4.5.0.0

Instance details

Defined in GHC.Internal.Text.ParserCombinators.ReadP

Methods

pure :: a -> P a #

(<*>) :: P (a -> b) -> P a -> P b #

liftA2 :: (a -> b -> c) -> P a -> P b -> P c #

(*>) :: P a -> P b -> P b #

(<*) :: P a -> P b -> P a #

Applicative ReadP

@since base-4.6.0.0

Instance details

Defined in GHC.Internal.Text.ParserCombinators.ReadP

Methods

pure :: a -> ReadP a #

(<*>) :: ReadP (a -> b) -> ReadP a -> ReadP b #

liftA2 :: (a -> b -> c) -> ReadP a -> ReadP b -> ReadP c #

(*>) :: ReadP a -> ReadP b -> ReadP b #

(<*) :: ReadP a -> ReadP b -> ReadP a #

Applicative IO

@since base-2.01

Instance details

Defined in GHC.Internal.Base

Methods

pure :: a -> IO a #

(<*>) :: IO (a -> b) -> IO a -> IO b #

liftA2 :: (a -> b -> c) -> IO a -> IO b -> IO c #

(*>) :: IO a -> IO b -> IO b #

(<*) :: IO a -> IO b -> IO a #

Applicative Deque 
Instance details

Defined in Control.Lens.Internal.Deque

Methods

pure :: a -> Deque a #

(<*>) :: Deque (a -> b) -> Deque a -> Deque b #

liftA2 :: (a -> b -> c) -> Deque a -> Deque b -> Deque c #

(*>) :: Deque a -> Deque b -> Deque b #

(<*) :: Deque a -> Deque b -> Deque a #

Applicative ME 
Instance details

Defined in Napkin.Render.PrettyPrint

Methods

pure :: a -> ME a #

(<*>) :: ME (a -> b) -> ME a -> ME b #

liftA2 :: (a -> b -> c) -> ME a -> ME b -> ME c #

(*>) :: ME a -> ME b -> ME b #

(<*) :: ME a -> ME b -> ME a #

Applicative Q 
Instance details

Defined in Napkin.Untyped.Monad

Methods

pure :: a -> Q a #

(<*>) :: Q (a -> b) -> Q a -> Q b #

liftA2 :: (a -> b -> c) -> Q a -> Q b -> Q c #

(*>) :: Q a -> Q b -> Q b #

(<*) :: Q a -> Q b -> Q a #

Applicative U 
Instance details

Defined in Napkin.Untyped.Monad

Methods

pure :: a -> U a #

(<*>) :: U (a -> b) -> U a -> U b #

liftA2 :: (a -> b -> c) -> U a -> U b -> U c #

(*>) :: U a -> U b -> U b #

(<*) :: U a -> U b -> U a #

Applicative Chunk 
Instance details

Defined in Options.Applicative.Help.Chunk

Methods

pure :: a -> Chunk a #

(<*>) :: Chunk (a -> b) -> Chunk a -> Chunk b #

liftA2 :: (a -> b -> c) -> Chunk a -> Chunk b -> Chunk c #

(*>) :: Chunk a -> Chunk b -> Chunk b #

(<*) :: Chunk a -> Chunk b -> Chunk a #

Applicative ComplResult 
Instance details

Defined in Options.Applicative.Internal

Methods

pure :: a -> ComplResult a #

(<*>) :: ComplResult (a -> b) -> ComplResult a -> ComplResult b #

liftA2 :: (a -> b -> c) -> ComplResult a -> ComplResult b -> ComplResult c #

(*>) :: ComplResult a -> ComplResult b -> ComplResult b #

(<*) :: ComplResult a -> ComplResult b -> ComplResult a #

Applicative Completion 
Instance details

Defined in Options.Applicative.Internal

Methods

pure :: a -> Completion a #

(<*>) :: Completion (a -> b) -> Completion a -> Completion b #

liftA2 :: (a -> b -> c) -> Completion a -> Completion b -> Completion c #

(*>) :: Completion a -> Completion b -> Completion b #

(<*) :: Completion a -> Completion b -> Completion a #

Applicative P 
Instance details

Defined in Options.Applicative.Internal

Methods

pure :: a -> P a #

(<*>) :: P (a -> b) -> P a -> P b #

liftA2 :: (a -> b -> c) -> P a -> P b -> P c #

(*>) :: P a -> P b -> P b #

(<*) :: P a -> P b -> P a #

Applicative Parser 
Instance details

Defined in Options.Applicative.Types

Methods

pure :: a -> Parser a #

(<*>) :: Parser (a -> b) -> Parser a -> Parser b #

liftA2 :: (a -> b -> c) -> Parser a -> Parser b -> Parser c #

(*>) :: Parser a -> Parser b -> Parser b #

(<*) :: Parser a -> Parser b -> Parser a #

Applicative ParserM 
Instance details

Defined in Options.Applicative.Types

Methods

pure :: a -> ParserM a #

(<*>) :: ParserM (a -> b) -> ParserM a -> ParserM b #

liftA2 :: (a -> b -> c) -> ParserM a -> ParserM b -> ParserM c #

(*>) :: ParserM a -> ParserM b -> ParserM b #

(<*) :: ParserM a -> ParserM b -> ParserM a #

Applicative ParserResult 
Instance details

Defined in Options.Applicative.Types

Applicative ReadM 
Instance details

Defined in Options.Applicative.Types

Methods

pure :: a -> ReadM a #

(<*>) :: ReadM (a -> b) -> ReadM a -> ReadM b #

liftA2 :: (a -> b -> c) -> ReadM a -> ReadM b -> ReadM c #

(*>) :: ReadM a -> ReadM b -> ReadM b #

(<*) :: ReadM a -> ReadM b -> ReadM a #

Applicative Conversion 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Methods

pure :: a -> Conversion a #

(<*>) :: Conversion (a -> b) -> Conversion a -> Conversion b #

liftA2 :: (a -> b -> c) -> Conversion a -> Conversion b -> Conversion c #

(*>) :: Conversion a -> Conversion b -> Conversion b #

(<*) :: Conversion a -> Conversion b -> Conversion a #

Applicative RowParser 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Methods

pure :: a -> RowParser a #

(<*>) :: RowParser (a -> b) -> RowParser a -> RowParser b #

liftA2 :: (a -> b -> c) -> RowParser a -> RowParser b -> RowParser c #

(*>) :: RowParser a -> RowParser b -> RowParser b #

(<*) :: RowParser a -> RowParser b -> RowParser a #

Applicative Array 
Instance details

Defined in Data.Primitive.Array

Methods

pure :: a -> Array a #

(<*>) :: Array (a -> b) -> Array a -> Array b #

liftA2 :: (a -> b -> c) -> Array a -> Array b -> Array c #

(*>) :: Array a -> Array b -> Array b #

(<*) :: Array a -> Array b -> Array a #

Applicative SmallArray 
Instance details

Defined in Data.Primitive.SmallArray

Methods

pure :: a -> SmallArray a #

(<*>) :: SmallArray (a -> b) -> SmallArray a -> SmallArray b #

liftA2 :: (a -> b -> c) -> SmallArray a -> SmallArray b -> SmallArray c #

(*>) :: SmallArray a -> SmallArray b -> SmallArray b #

(<*) :: SmallArray a -> SmallArray b -> SmallArray a #

Applicative I 
Instance details

Defined in Data.SOP.BasicFunctors

Methods

pure :: a -> I a #

(<*>) :: I (a -> b) -> I a -> I b #

liftA2 :: (a -> b -> c) -> I a -> I b -> I c #

(*>) :: I a -> I b -> I b #

(<*) :: I a -> I b -> I a #

Applicative Q 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

pure :: a -> Q a #

(<*>) :: Q (a -> b) -> Q a -> Q b #

liftA2 :: (a -> b -> c) -> Q a -> Q b -> Q c #

(*>) :: Q a -> Q b -> Q b #

(<*) :: Q a -> Q b -> Q a #

Applicative Flat 
Instance details

Defined in UnliftIO.Internals.Async

Methods

pure :: a -> Flat a #

(<*>) :: Flat (a -> b) -> Flat a -> Flat b #

liftA2 :: (a -> b -> c) -> Flat a -> Flat b -> Flat c #

(*>) :: Flat a -> Flat b -> Flat b #

(<*) :: Flat a -> Flat b -> Flat a #

Applicative FlatApp 
Instance details

Defined in UnliftIO.Internals.Async

Methods

pure :: a -> FlatApp a #

(<*>) :: FlatApp (a -> b) -> FlatApp a -> FlatApp b #

liftA2 :: (a -> b -> c) -> FlatApp a -> FlatApp b -> FlatApp c #

(*>) :: FlatApp a -> FlatApp b -> FlatApp b #

(<*) :: FlatApp a -> FlatApp b -> FlatApp a #

Applicative Vector 
Instance details

Defined in Data.Vector

Methods

pure :: a -> Vector a #

(<*>) :: Vector (a -> b) -> Vector a -> Vector b #

liftA2 :: (a -> b -> c) -> Vector a -> Vector b -> Vector c #

(*>) :: Vector a -> Vector b -> Vector b #

(<*) :: Vector a -> Vector b -> Vector a #

Applicative Stream 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

pure :: a -> Stream a #

(<*>) :: Stream (a -> b) -> Stream a -> Stream b #

liftA2 :: (a -> b -> c) -> Stream a -> Stream b -> Stream c #

(*>) :: Stream a -> Stream b -> Stream b #

(<*) :: Stream a -> Stream b -> Stream a #

Applicative Maybe

@since base-2.01

Instance details

Defined in GHC.Internal.Base

Methods

pure :: a -> Maybe a #

(<*>) :: Maybe (a -> b) -> Maybe a -> Maybe b #

liftA2 :: (a -> b -> c) -> Maybe a -> Maybe b -> Maybe c #

(*>) :: Maybe a -> Maybe b -> Maybe b #

(<*) :: Maybe a -> Maybe b -> Maybe a #

Applicative Solo

@since base-4.15

Instance details

Defined in GHC.Internal.Base

Methods

pure :: a -> Solo a #

(<*>) :: Solo (a -> b) -> Solo a -> Solo b #

liftA2 :: (a -> b -> c) -> Solo a -> Solo b -> Solo c #

(*>) :: Solo a -> Solo b -> Solo b #

(<*) :: Solo a -> Solo b -> Solo a #

Applicative []

@since base-2.01

Instance details

Defined in GHC.Internal.Base

Methods

pure :: a -> [a] #

(<*>) :: [a -> b] -> [a] -> [b] #

liftA2 :: (a -> b -> c) -> [a] -> [b] -> [c] #

(*>) :: [a] -> [b] -> [b] #

(<*) :: [a] -> [b] -> [a] #

Representable f => Applicative (Co f) 
Instance details

Defined in Data.Functor.Rep

Methods

pure :: a -> Co f a #

(<*>) :: Co f (a -> b) -> Co f a -> Co f b #

liftA2 :: (a -> b -> c) -> Co f a -> Co f b -> Co f c #

(*>) :: Co f a -> Co f b -> Co f b #

(<*) :: Co f a -> Co f b -> Co f a #

Applicative (Parser i) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

pure :: a -> Parser i a #

(<*>) :: Parser i (a -> b) -> Parser i a -> Parser i b #

liftA2 :: (a -> b -> c) -> Parser i a -> Parser i b -> Parser i c #

(*>) :: Parser i a -> Parser i b -> Parser i b #

(<*) :: Parser i a -> Parser i b -> Parser i a #

Monad m => Applicative (WrappedMonad m)

Since: base-2.1

Instance details

Defined in Control.Applicative

Methods

pure :: a -> WrappedMonad m a #

(<*>) :: WrappedMonad m (a -> b) -> WrappedMonad m a -> WrappedMonad m b #

liftA2 :: (a -> b -> c) -> WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m c #

(*>) :: WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m b #

(<*) :: WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m a #

Monad m => Applicative (ZipSource m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

pure :: a -> ZipSource m a #

(<*>) :: ZipSource m (a -> b) -> ZipSource m a -> ZipSource m b #

liftA2 :: (a -> b -> c) -> ZipSource m a -> ZipSource m b -> ZipSource m c #

(*>) :: ZipSource m a -> ZipSource m b -> ZipSource m b #

(<*) :: ZipSource m a -> ZipSource m b -> ZipSource m a #

Applicative (SetM s) 
Instance details

Defined in Data.Graph

Methods

pure :: a -> SetM s a #

(<*>) :: SetM s (a -> b) -> SetM s a -> SetM s b #

liftA2 :: (a -> b -> c) -> SetM s a -> SetM s b -> SetM s c #

(*>) :: SetM s a -> SetM s b -> SetM s b #

(<*) :: SetM s a -> SetM s b -> SetM s a #

Monad m => Applicative (CatchT m) 
Instance details

Defined in Control.Monad.Catch.Pure

Methods

pure :: a -> CatchT m a #

(<*>) :: CatchT m (a -> b) -> CatchT m a -> CatchT m b #

liftA2 :: (a -> b -> c) -> CatchT m a -> CatchT m b -> CatchT m c #

(*>) :: CatchT m a -> CatchT m b -> CatchT m b #

(<*) :: CatchT m a -> CatchT m b -> CatchT m a #

Alternative f => Applicative (Cofree f) 
Instance details

Defined in Control.Comonad.Cofree

Methods

pure :: a -> Cofree f a #

(<*>) :: Cofree f (a -> b) -> Cofree f a -> Cofree f b #

liftA2 :: (a -> b -> c) -> Cofree f a -> Cofree f b -> Cofree f c #

(*>) :: Cofree f a -> Cofree f b -> Cofree f b #

(<*) :: Cofree f a -> Cofree f b -> Cofree f a #

Functor f => Applicative (Free f) 
Instance details

Defined in Control.Monad.Free

Methods

pure :: a -> Free f a #

(<*>) :: Free f (a -> b) -> Free f a -> Free f b #

liftA2 :: (a -> b -> c) -> Free f a -> Free f b -> Free f c #

(*>) :: Free f a -> Free f b -> Free f b #

(<*) :: Free f a -> Free f b -> Free f a #

Arrow a => Applicative (ArrowMonad a)

@since base-4.6.0.0

Instance details

Defined in GHC.Internal.Control.Arrow

Methods

pure :: a0 -> ArrowMonad a a0 #

(<*>) :: ArrowMonad a (a0 -> b) -> ArrowMonad a a0 -> ArrowMonad a b #

liftA2 :: (a0 -> b -> c) -> ArrowMonad a a0 -> ArrowMonad a b -> ArrowMonad a c #

(*>) :: ArrowMonad a a0 -> ArrowMonad a b -> ArrowMonad a b #

(<*) :: ArrowMonad a a0 -> ArrowMonad a b -> ArrowMonad a a0 #

Applicative (Either e)

@since base-3.0

Instance details

Defined in GHC.Internal.Data.Either

Methods

pure :: a -> Either e a #

(<*>) :: Either e (a -> b) -> Either e a -> Either e b #

liftA2 :: (a -> b -> c) -> Either e a -> Either e b -> Either e c #

(*>) :: Either e a -> Either e b -> Either e b #

(<*) :: Either e a -> Either e b -> Either e a #

Applicative (Proxy :: Type -> Type)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Data.Proxy

Methods

pure :: a -> Proxy a #

(<*>) :: Proxy (a -> b) -> Proxy a -> Proxy b #

liftA2 :: (a -> b -> c) -> Proxy a -> Proxy b -> Proxy c #

(*>) :: Proxy a -> Proxy b -> Proxy b #

(<*) :: Proxy a -> Proxy b -> Proxy a #

Applicative (U1 :: Type -> Type)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

pure :: a -> U1 a #

(<*>) :: U1 (a -> b) -> U1 a -> U1 b #

liftA2 :: (a -> b -> c) -> U1 a -> U1 b -> U1 c #

(*>) :: U1 a -> U1 b -> U1 b #

(<*) :: U1 a -> U1 b -> U1 a #

Applicative f => Applicative (Yoneda f) 
Instance details

Defined in Data.Functor.Yoneda

Methods

pure :: a -> Yoneda f a #

(<*>) :: Yoneda f (a -> b) -> Yoneda f a -> Yoneda f b #

liftA2 :: (a -> b -> c) -> Yoneda f a -> Yoneda f b -> Yoneda f c #

(*>) :: Yoneda f a -> Yoneda f b -> Yoneda f b #

(<*) :: Yoneda f a -> Yoneda f b -> Yoneda f a #

Applicative m => Applicative (KatipT m) 
Instance details

Defined in Katip.Core

Methods

pure :: a -> KatipT m a #

(<*>) :: KatipT m (a -> b) -> KatipT m a -> KatipT m b #

liftA2 :: (a -> b -> c) -> KatipT m a -> KatipT m b -> KatipT m c #

(*>) :: KatipT m a -> KatipT m b -> KatipT m b #

(<*) :: KatipT m a -> KatipT m b -> KatipT m a #

Applicative m => Applicative (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

pure :: a -> KatipContextT m a #

(<*>) :: KatipContextT m (a -> b) -> KatipContextT m a -> KatipContextT m b #

liftA2 :: (a -> b -> c) -> KatipContextT m a -> KatipContextT m b -> KatipContextT m c #

(*>) :: KatipContextT m a -> KatipContextT m b -> KatipContextT m b #

(<*) :: KatipContextT m a -> KatipContextT m b -> KatipContextT m a #

Applicative m => Applicative (NoLoggingT m) 
Instance details

Defined in Katip.Monadic

Methods

pure :: a -> NoLoggingT m a #

(<*>) :: NoLoggingT m (a -> b) -> NoLoggingT m a -> NoLoggingT m b #

liftA2 :: (a -> b -> c) -> NoLoggingT m a -> NoLoggingT m b -> NoLoggingT m c #

(*>) :: NoLoggingT m a -> NoLoggingT m b -> NoLoggingT m b #

(<*) :: NoLoggingT m a -> NoLoggingT m b -> NoLoggingT m a #

Applicative f => Applicative (Indexing f) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

pure :: a -> Indexing f a #

(<*>) :: Indexing f (a -> b) -> Indexing f a -> Indexing f b #

liftA2 :: (a -> b -> c) -> Indexing f a -> Indexing f b -> Indexing f c #

(*>) :: Indexing f a -> Indexing f b -> Indexing f b #

(<*) :: Indexing f a -> Indexing f b -> Indexing f a #

Applicative f => Applicative (Indexing64 f) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

pure :: a -> Indexing64 f a #

(<*>) :: Indexing64 f (a -> b) -> Indexing64 f a -> Indexing64 f b #

liftA2 :: (a -> b -> c) -> Indexing64 f a -> Indexing64 f b -> Indexing64 f c #

(*>) :: Indexing64 f a -> Indexing64 f b -> Indexing64 f b #

(<*) :: Indexing64 f a -> Indexing64 f b -> Indexing64 f a #

Applicative (ReifiedFold s) 
Instance details

Defined in Control.Lens.Reified

Methods

pure :: a -> ReifiedFold s a #

(<*>) :: ReifiedFold s (a -> b) -> ReifiedFold s a -> ReifiedFold s b #

liftA2 :: (a -> b -> c) -> ReifiedFold s a -> ReifiedFold s b -> ReifiedFold s c #

(*>) :: ReifiedFold s a -> ReifiedFold s b -> ReifiedFold s b #

(<*) :: ReifiedFold s a -> ReifiedFold s b -> ReifiedFold s a #

Applicative (ReifiedGetter s) 
Instance details

Defined in Control.Lens.Reified

Methods

pure :: a -> ReifiedGetter s a #

(<*>) :: ReifiedGetter s (a -> b) -> ReifiedGetter s a -> ReifiedGetter s b #

liftA2 :: (a -> b -> c) -> ReifiedGetter s a -> ReifiedGetter s b -> ReifiedGetter s c #

(*>) :: ReifiedGetter s a -> ReifiedGetter s b -> ReifiedGetter s b #

(<*) :: ReifiedGetter s a -> ReifiedGetter s b -> ReifiedGetter s a #

Applicative f => Applicative (WrappedPoly f) 
Instance details

Defined in Data.MonoTraversable

Methods

pure :: a -> WrappedPoly f a #

(<*>) :: WrappedPoly f (a -> b) -> WrappedPoly f a -> WrappedPoly f b #

liftA2 :: (a -> b -> c) -> WrappedPoly f a -> WrappedPoly f b -> WrappedPoly f c #

(*>) :: WrappedPoly f a -> WrappedPoly f b -> WrappedPoly f b #

(<*) :: WrappedPoly f a -> WrappedPoly f b -> WrappedPoly f a #

Applicative (Spec b) 
Instance details

Defined in Napkin.Spec.Types.Spec

Methods

pure :: a -> Spec b a #

(<*>) :: Spec b (a -> b0) -> Spec b a -> Spec b b0 #

liftA2 :: (a -> b0 -> c) -> Spec b a -> Spec b b0 -> Spec b c #

(*>) :: Spec b a -> Spec b b0 -> Spec b b0 #

(<*) :: Spec b a -> Spec b b0 -> Spec b a #

Monad m => Applicative (ListT m) 
Instance details

Defined in Options.Applicative.Internal

Methods

pure :: a -> ListT m a #

(<*>) :: ListT m (a -> b) -> ListT m a -> ListT m b #

liftA2 :: (a -> b -> c) -> ListT m a -> ListT m b -> ListT m c #

(*>) :: ListT m a -> ListT m b -> ListT m b #

(<*) :: ListT m a -> ListT m b -> ListT m a #

Monad m => Applicative (NondetT m) 
Instance details

Defined in Options.Applicative.Internal

Methods

pure :: a -> NondetT m a #

(<*>) :: NondetT m (a -> b) -> NondetT m a -> NondetT m b #

liftA2 :: (a -> b -> c) -> NondetT m a -> NondetT m b -> NondetT m c #

(*>) :: NondetT m a -> NondetT m b -> NondetT m b #

(<*) :: NondetT m a -> NondetT m b -> NondetT m a #

Applicative (Sem f) 
Instance details

Defined in Polysemy.Internal

Methods

pure :: a -> Sem f a #

(<*>) :: Sem f (a -> b) -> Sem f a -> Sem f b #

liftA2 :: (a -> b -> c) -> Sem f a -> Sem f b -> Sem f c #

(*>) :: Sem f a -> Sem f b -> Sem f b #

(<*) :: Sem f a -> Sem f b -> Sem f a #

Applicative m => Applicative (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

pure :: a -> ResourceT m a #

(<*>) :: ResourceT m (a -> b) -> ResourceT m a -> ResourceT m b #

liftA2 :: (a -> b -> c) -> ResourceT m a -> ResourceT m b -> ResourceT m c #

(*>) :: ResourceT m a -> ResourceT m b -> ResourceT m b #

(<*) :: ResourceT m a -> ResourceT m b -> ResourceT m a #

Applicative (RIO env) 
Instance details

Defined in RIO.Prelude.RIO

Methods

pure :: a -> RIO env a #

(<*>) :: RIO env (a -> b) -> RIO env a -> RIO env b #

liftA2 :: (a -> b -> c) -> RIO env a -> RIO env b -> RIO env c #

(*>) :: RIO env a -> RIO env b -> RIO env b #

(<*) :: RIO env a -> RIO env b -> RIO env a #

Applicative m => Applicative (ActionT m) 
Instance details

Defined in Web.Scotty.Internal.Types

Methods

pure :: a -> ActionT m a #

(<*>) :: ActionT m (a -> b) -> ActionT m a -> ActionT m b #

liftA2 :: (a -> b -> c) -> ActionT m a -> ActionT m b -> ActionT m c #

(*>) :: ActionT m a -> ActionT m b -> ActionT m b #

(<*) :: ActionT m a -> ActionT m b -> ActionT m a #

Applicative (ScottyT m) 
Instance details

Defined in Web.Scotty.Internal.Types

Methods

pure :: a -> ScottyT m a #

(<*>) :: ScottyT m (a -> b) -> ScottyT m a -> ScottyT m b #

liftA2 :: (a -> b -> c) -> ScottyT m a -> ScottyT m b -> ScottyT m c #

(*>) :: ScottyT m a -> ScottyT m b -> ScottyT m b #

(<*) :: ScottyT m a -> ScottyT m b -> ScottyT m a #

Semigroup a => Applicative (These a) 
Instance details

Defined in Data.Strict.These

Methods

pure :: a0 -> These a a0 #

(<*>) :: These a (a0 -> b) -> These a a0 -> These a b #

liftA2 :: (a0 -> b -> c) -> These a a0 -> These a b -> These a c #

(*>) :: These a a0 -> These a b -> These a b #

(<*) :: These a a0 -> These a b -> These a a0 #

Applicative (IParser t) 
Instance details

Defined in Data.Text.Internal.Read

Methods

pure :: a -> IParser t a #

(<*>) :: IParser t (a -> b) -> IParser t a -> IParser t b #

liftA2 :: (a -> b -> c) -> IParser t a -> IParser t b -> IParser t c #

(*>) :: IParser t a -> IParser t b -> IParser t b #

(<*) :: IParser t a -> IParser t b -> IParser t a #

Semigroup a => Applicative (These a) 
Instance details

Defined in Data.These

Methods

pure :: a0 -> These a a0 #

(<*>) :: These a (a0 -> b) -> These a a0 -> These a b #

liftA2 :: (a0 -> b -> c) -> These a a0 -> These a b -> These a c #

(*>) :: These a a0 -> These a b -> These a b #

(<*) :: These a a0 -> These a b -> These a a0 #

Applicative f => Applicative (Lift f)

A combination is Pure only if both parts are.

Instance details

Defined in Control.Applicative.Lift

Methods

pure :: a -> Lift f a #

(<*>) :: Lift f (a -> b) -> Lift f a -> Lift f b #

liftA2 :: (a -> b -> c) -> Lift f a -> Lift f b -> Lift f c #

(*>) :: Lift f a -> Lift f b -> Lift f b #

(<*) :: Lift f a -> Lift f b -> Lift f a #

(Functor m, Monad m) => Applicative (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

pure :: a -> MaybeT m a #

(<*>) :: MaybeT m (a -> b) -> MaybeT m a -> MaybeT m b #

liftA2 :: (a -> b -> c) -> MaybeT m a -> MaybeT m b -> MaybeT m c #

(*>) :: MaybeT m a -> MaybeT m b -> MaybeT m b #

(<*) :: MaybeT m a -> MaybeT m b -> MaybeT m a #

MonadUnliftIO m => Applicative (Conc m)

Since: unliftio-0.2.9.0

Instance details

Defined in UnliftIO.Internals.Async

Methods

pure :: a -> Conc m a #

(<*>) :: Conc m (a -> b) -> Conc m a -> Conc m b #

liftA2 :: (a -> b -> c) -> Conc m a -> Conc m b -> Conc m c #

(*>) :: Conc m a -> Conc m b -> Conc m b #

(<*) :: Conc m a -> Conc m b -> Conc m a #

MonadUnliftIO m => Applicative (Concurrently m)

Since: unliftio-0.1.0.0

Instance details

Defined in UnliftIO.Internals.Async

Methods

pure :: a -> Concurrently m a #

(<*>) :: Concurrently m (a -> b) -> Concurrently m a -> Concurrently m b #

liftA2 :: (a -> b -> c) -> Concurrently m a -> Concurrently m b -> Concurrently m c #

(*>) :: Concurrently m a -> Concurrently m b -> Concurrently m b #

(<*) :: Concurrently m a -> Concurrently m b -> Concurrently m a #

Monoid a => Applicative ((,) a)

For tuples, the Monoid constraint on a determines how the first values merge. For example, Strings concatenate:

("hello ", (+15)) <*> ("world!", 2002)
("hello world!",2017)

@since base-2.01

Instance details

Defined in GHC.Internal.Base

Methods

pure :: a0 -> (a, a0) #

(<*>) :: (a, a0 -> b) -> (a, a0) -> (a, b) #

liftA2 :: (a0 -> b -> c) -> (a, a0) -> (a, b) -> (a, c) #

(*>) :: (a, a0) -> (a, b) -> (a, b) #

(<*) :: (a, a0) -> (a, b) -> (a, a0) #

Arrow a => Applicative (WrappedArrow a b)

Since: base-2.1

Instance details

Defined in Control.Applicative

Methods

pure :: a0 -> WrappedArrow a b a0 #

(<*>) :: WrappedArrow a b (a0 -> b0) -> WrappedArrow a b a0 -> WrappedArrow a b b0 #

liftA2 :: (a0 -> b0 -> c) -> WrappedArrow a b a0 -> WrappedArrow a b b0 -> WrappedArrow a b c #

(*>) :: WrappedArrow a b a0 -> WrappedArrow a b b0 -> WrappedArrow a b b0 #

(<*) :: WrappedArrow a b a0 -> WrappedArrow a b b0 -> WrappedArrow a b a0 #

Biapplicative p => Applicative (Fix p) 
Instance details

Defined in Data.Bifunctor.Fix

Methods

pure :: a -> Fix p a #

(<*>) :: Fix p (a -> b) -> Fix p a -> Fix p b #

liftA2 :: (a -> b -> c) -> Fix p a -> Fix p b -> Fix p c #

(*>) :: Fix p a -> Fix p b -> Fix p b #

(<*) :: Fix p a -> Fix p b -> Fix p a #

Biapplicative p => Applicative (Join p) 
Instance details

Defined in Data.Bifunctor.Join

Methods

pure :: a -> Join p a #

(<*>) :: Join p (a -> b) -> Join p a -> Join p b #

liftA2 :: (a -> b -> c) -> Join p a -> Join p b -> Join p c #

(*>) :: Join p a -> Join p b -> Join p b #

(<*) :: Join p a -> Join p b -> Join p a #

Monad m => Applicative (ZipSink i m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

pure :: a -> ZipSink i m a #

(<*>) :: ZipSink i m (a -> b) -> ZipSink i m a -> ZipSink i m b #

liftA2 :: (a -> b -> c) -> ZipSink i m a -> ZipSink i m b -> ZipSink i m c #

(*>) :: ZipSink i m a -> ZipSink i m b -> ZipSink i m b #

(<*) :: ZipSink i m a -> ZipSink i m b -> ZipSink i m a #

(Applicative f, Monad f) => Applicative (WhenMissing f x)

Equivalent to ReaderT k (ReaderT x (MaybeT f)).

Since: containers-0.5.9

Instance details

Defined in Data.IntMap.Internal

Methods

pure :: a -> WhenMissing f x a #

(<*>) :: WhenMissing f x (a -> b) -> WhenMissing f x a -> WhenMissing f x b #

liftA2 :: (a -> b -> c) -> WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x c #

(*>) :: WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x b #

(<*) :: WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x a #

(Alternative f, Applicative w) => Applicative (CofreeT f w) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

pure :: a -> CofreeT f w a #

(<*>) :: CofreeT f w (a -> b) -> CofreeT f w a -> CofreeT f w b #

liftA2 :: (a -> b -> c) -> CofreeT f w a -> CofreeT f w b -> CofreeT f w c #

(*>) :: CofreeT f w a -> CofreeT f w b -> CofreeT f w b #

(<*) :: CofreeT f w a -> CofreeT f w b -> CofreeT f w a #

(Functor f, Monad m) => Applicative (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

pure :: a -> FreeT f m a #

(<*>) :: FreeT f m (a -> b) -> FreeT f m a -> FreeT f m b #

liftA2 :: (a -> b -> c) -> FreeT f m a -> FreeT f m b -> FreeT f m c #

(*>) :: FreeT f m a -> FreeT f m b -> FreeT f m b #

(<*) :: FreeT f m a -> FreeT f m b -> FreeT f m a #

(Applicative f, Monad f) => Applicative (WhenMissing f x)

Equivalent to ReaderT k (ReaderT x (MaybeT f)).

Since: ghc-0.5.9

Instance details

Defined in GHC.Data.Word64Map.Internal

Methods

pure :: a -> WhenMissing f x a #

(<*>) :: WhenMissing f x (a -> b) -> WhenMissing f x a -> WhenMissing f x b #

liftA2 :: (a -> b -> c) -> WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x c #

(*>) :: WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x b #

(<*) :: WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x a #

Applicative m => Applicative (Kleisli m a)

@since base-4.14.0.0

Instance details

Defined in GHC.Internal.Control.Arrow

Methods

pure :: a0 -> Kleisli m a a0 #

(<*>) :: Kleisli m a (a0 -> b) -> Kleisli m a a0 -> Kleisli m a b #

liftA2 :: (a0 -> b -> c) -> Kleisli m a a0 -> Kleisli m a b -> Kleisli m a c #

(*>) :: Kleisli m a a0 -> Kleisli m a b -> Kleisli m a b #

(<*) :: Kleisli m a a0 -> Kleisli m a b -> Kleisli m a a0 #

Monoid m => Applicative (Const m :: Type -> Type)

@since base-2.0.1

Instance details

Defined in GHC.Internal.Data.Functor.Const

Methods

pure :: a -> Const m a #

(<*>) :: Const m (a -> b) -> Const m a -> Const m b #

liftA2 :: (a -> b -> c) -> Const m a -> Const m b -> Const m c #

(*>) :: Const m a -> Const m b -> Const m b #

(<*) :: Const m a -> Const m b -> Const m a #

Applicative f => Applicative (Ap f)

@since base-4.12.0.0

Instance details

Defined in GHC.Internal.Data.Monoid

Methods

pure :: a -> Ap f a #

(<*>) :: Ap f (a -> b) -> Ap f a -> Ap f b #

liftA2 :: (a -> b -> c) -> Ap f a -> Ap f b -> Ap f c #

(*>) :: Ap f a -> Ap f b -> Ap f b #

(<*) :: Ap f a -> Ap f b -> Ap f a #

Applicative f => Applicative (Alt f)

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

pure :: a -> Alt f a #

(<*>) :: Alt f (a -> b) -> Alt f a -> Alt f b #

liftA2 :: (a -> b -> c) -> Alt f a -> Alt f b -> Alt f c #

(*>) :: Alt f a -> Alt f b -> Alt f b #

(<*) :: Alt f a -> Alt f b -> Alt f a #

(Generic1 f, Applicative (Rep1 f)) => Applicative (Generically1 f)

@since base-4.17.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

pure :: a -> Generically1 f a #

(<*>) :: Generically1 f (a -> b) -> Generically1 f a -> Generically1 f b #

liftA2 :: (a -> b -> c) -> Generically1 f a -> Generically1 f b -> Generically1 f c #

(*>) :: Generically1 f a -> Generically1 f b -> Generically1 f b #

(<*) :: Generically1 f a -> Generically1 f b -> Generically1 f a #

Applicative f => Applicative (Rec1 f)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

pure :: a -> Rec1 f a #

(<*>) :: Rec1 f (a -> b) -> Rec1 f a -> Rec1 f b #

liftA2 :: (a -> b -> c) -> Rec1 f a -> Rec1 f b -> Rec1 f c #

(*>) :: Rec1 f a -> Rec1 f b -> Rec1 f b #

(<*) :: Rec1 f a -> Rec1 f b -> Rec1 f a #

Applicative f => Applicative (Indexing f) 
Instance details

Defined in WithIndex

Methods

pure :: a -> Indexing f a #

(<*>) :: Indexing f (a -> b) -> Indexing f a -> Indexing f b #

liftA2 :: (a -> b -> c) -> Indexing f a -> Indexing f b -> Indexing f c #

(*>) :: Indexing f a -> Indexing f b -> Indexing f b #

(<*) :: Indexing f a -> Indexing f b -> Indexing f a #

(Applicative f, Applicative g) => Applicative (Day f g) 
Instance details

Defined in Data.Functor.Day

Methods

pure :: a -> Day f g a #

(<*>) :: Day f g (a -> b) -> Day f g a -> Day f g b #

liftA2 :: (a -> b -> c) -> Day f g a -> Day f g b -> Day f g c #

(*>) :: Day f g a -> Day f g b -> Day f g b #

(<*) :: Day f g a -> Day f g b -> Day f g a #

Applicative (Indexed i a) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

pure :: a0 -> Indexed i a a0 #

(<*>) :: Indexed i a (a0 -> b) -> Indexed i a a0 -> Indexed i a b #

liftA2 :: (a0 -> b -> c) -> Indexed i a a0 -> Indexed i a b -> Indexed i a c #

(*>) :: Indexed i a a0 -> Indexed i a b -> Indexed i a b #

(<*) :: Indexed i a a0 -> Indexed i a b -> Indexed i a a0 #

Applicative (Flows i b)

This is an illegal Applicative.

Instance details

Defined in Control.Lens.Internal.Level

Methods

pure :: a -> Flows i b a #

(<*>) :: Flows i b (a -> b0) -> Flows i b a -> Flows i b b0 #

liftA2 :: (a -> b0 -> c) -> Flows i b a -> Flows i b b0 -> Flows i b c #

(*>) :: Flows i b a -> Flows i b b0 -> Flows i b b0 #

(<*) :: Flows i b a -> Flows i b b0 -> Flows i b a #

Applicative (Mafic a b) 
Instance details

Defined in Control.Lens.Internal.Magma

Methods

pure :: a0 -> Mafic a b a0 #

(<*>) :: Mafic a b (a0 -> b0) -> Mafic a b a0 -> Mafic a b b0 #

liftA2 :: (a0 -> b0 -> c) -> Mafic a b a0 -> Mafic a b b0 -> Mafic a b c #

(*>) :: Mafic a b a0 -> Mafic a b b0 -> Mafic a b b0 #

(<*) :: Mafic a b a0 -> Mafic a b b0 -> Mafic a b a0 #

(Monad m, Monoid r) => Applicative (Effect m r) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

pure :: a -> Effect m r a #

(<*>) :: Effect m r (a -> b) -> Effect m r a -> Effect m r b #

liftA2 :: (a -> b -> c) -> Effect m r a -> Effect m r b -> Effect m r c #

(*>) :: Effect m r a -> Effect m r b -> Effect m r b #

(<*) :: Effect m r a -> Effect m r b -> Effect m r a #

(Monad m, Monoid s) => Applicative (Focusing m s) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

pure :: a -> Focusing m s a #

(<*>) :: Focusing m s (a -> b) -> Focusing m s a -> Focusing m s b #

liftA2 :: (a -> b -> c) -> Focusing m s a -> Focusing m s b -> Focusing m s c #

(*>) :: Focusing m s a -> Focusing m s b -> Focusing m s b #

(<*) :: Focusing m s a -> Focusing m s b -> Focusing m s a #

Applicative (k (May s)) => Applicative (FocusingMay k s) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

pure :: a -> FocusingMay k s a #

(<*>) :: FocusingMay k s (a -> b) -> FocusingMay k s a -> FocusingMay k s b #

liftA2 :: (a -> b -> c) -> FocusingMay k s a -> FocusingMay k s b -> FocusingMay k s c #

(*>) :: FocusingMay k s a -> FocusingMay k s b -> FocusingMay k s b #

(<*) :: FocusingMay k s a -> FocusingMay k s b -> FocusingMay k s a #

Monoid m => Applicative (Holes t m) 
Instance details

Defined in Control.Lens.Traversal

Methods

pure :: a -> Holes t m a #

(<*>) :: Holes t m (a -> b) -> Holes t m a -> Holes t m b #

liftA2 :: (a -> b -> c) -> Holes t m a -> Holes t m b -> Holes t m c #

(*>) :: Holes t m a -> Holes t m b -> Holes t m b #

(<*) :: Holes t m a -> Holes t m b -> Holes t m a #

(Monad m, Monoid r) => Applicative (Effect m r) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

pure :: a -> Effect m r a #

(<*>) :: Effect m r (a -> b) -> Effect m r a -> Effect m r b #

liftA2 :: (a -> b -> c) -> Effect m r a -> Effect m r b -> Effect m r c #

(*>) :: Effect m r a -> Effect m r b -> Effect m r b #

(<*) :: Effect m r a -> Effect m r b -> Effect m r a #

(Monad m, Monoid s) => Applicative (Focusing m s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

pure :: a -> Focusing m s a #

(<*>) :: Focusing m s (a -> b) -> Focusing m s a -> Focusing m s b #

liftA2 :: (a -> b -> c) -> Focusing m s a -> Focusing m s b -> Focusing m s c #

(*>) :: Focusing m s a -> Focusing m s b -> Focusing m s b #

(<*) :: Focusing m s a -> Focusing m s b -> Focusing m s a #

Applicative (k (May s)) => Applicative (FocusingMay k s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

pure :: a -> FocusingMay k s a #

(<*>) :: FocusingMay k s (a -> b) -> FocusingMay k s a -> FocusingMay k s b #

liftA2 :: (a -> b -> c) -> FocusingMay k s a -> FocusingMay k s b -> FocusingMay k s c #

(*>) :: FocusingMay k s a -> FocusingMay k s b -> FocusingMay k s b #

(<*) :: FocusingMay k s a -> FocusingMay k s b -> FocusingMay k s a #

Applicative (t m) => Applicative (LiftingAccum t m)

Since: mtl-2.3

Instance details

Defined in Control.Monad.Accum

Methods

pure :: a -> LiftingAccum t m a #

(<*>) :: LiftingAccum t m (a -> b) -> LiftingAccum t m a -> LiftingAccum t m b #

liftA2 :: (a -> b -> c) -> LiftingAccum t m a -> LiftingAccum t m b -> LiftingAccum t m c #

(*>) :: LiftingAccum t m a -> LiftingAccum t m b -> LiftingAccum t m b #

(<*) :: LiftingAccum t m a -> LiftingAccum t m b -> LiftingAccum t m a #

Applicative (t m) => Applicative (LiftingSelect t m)

Since: mtl-2.3

Instance details

Defined in Control.Monad.Select

Methods

pure :: a -> LiftingSelect t m a #

(<*>) :: LiftingSelect t m (a -> b) -> LiftingSelect t m a -> LiftingSelect t m b #

liftA2 :: (a -> b -> c) -> LiftingSelect t m a -> LiftingSelect t m b -> LiftingSelect t m c #

(*>) :: LiftingSelect t m a -> LiftingSelect t m b -> LiftingSelect t m b #

(<*) :: LiftingSelect t m a -> LiftingSelect t m b -> LiftingSelect t m a #

Applicative (NonDetC m) 
Instance details

Defined in Polysemy.NonDet

Methods

pure :: a -> NonDetC m a #

(<*>) :: NonDetC m (a -> b) -> NonDetC m a -> NonDetC m b #

liftA2 :: (a -> b -> c) -> NonDetC m a -> NonDetC m b -> NonDetC m c #

(*>) :: NonDetC m a -> NonDetC m b -> NonDetC m b #

(<*) :: NonDetC m a -> NonDetC m b -> NonDetC m a #

(Applicative (Rep p), Representable p) => Applicative (Prep p) 
Instance details

Defined in Data.Profunctor.Rep

Methods

pure :: a -> Prep p a #

(<*>) :: Prep p (a -> b) -> Prep p a -> Prep p b #

liftA2 :: (a -> b -> c) -> Prep p a -> Prep p b -> Prep p c #

(*>) :: Prep p a -> Prep p b -> Prep p b #

(<*) :: Prep p a -> Prep p b -> Prep p a #

Monoid a => Applicative (K a :: Type -> Type) 
Instance details

Defined in Data.SOP.BasicFunctors

Methods

pure :: a0 -> K a a0 #

(<*>) :: K a (a0 -> b) -> K a a0 -> K a b #

liftA2 :: (a0 -> b -> c) -> K a a0 -> K a b -> K a c #

(*>) :: K a a0 -> K a b -> K a b #

(<*) :: K a a0 -> K a b -> K a a0 #

Applicative (Tagged s) 
Instance details

Defined in Data.Tagged

Methods

pure :: a -> Tagged s a #

(<*>) :: Tagged s (a -> b) -> Tagged s a -> Tagged s b #

liftA2 :: (a -> b -> c) -> Tagged s a -> Tagged s b -> Tagged s c #

(*>) :: Tagged s a -> Tagged s b -> Tagged s b #

(<*) :: Tagged s a -> Tagged s b -> Tagged s a #

Applicative f => Applicative (Backwards f)

Apply f-actions in the reverse order.

Instance details

Defined in Control.Applicative.Backwards

Methods

pure :: a -> Backwards f a #

(<*>) :: Backwards f (a -> b) -> Backwards f a -> Backwards f b #

liftA2 :: (a -> b -> c) -> Backwards f a -> Backwards f b -> Backwards f c #

(*>) :: Backwards f a -> Backwards f b -> Backwards f b #

(<*) :: Backwards f a -> Backwards f b -> Backwards f a #

(Monoid w, Functor m, Monad m) => Applicative (AccumT w m) 
Instance details

Defined in Control.Monad.Trans.Accum

Methods

pure :: a -> AccumT w m a #

(<*>) :: AccumT w m (a -> b) -> AccumT w m a -> AccumT w m b #

liftA2 :: (a -> b -> c) -> AccumT w m a -> AccumT w m b -> AccumT w m c #

(*>) :: AccumT w m a -> AccumT w m b -> AccumT w m b #

(<*) :: AccumT w m a -> AccumT w m b -> AccumT w m a #

(Functor m, Monad m) => Applicative (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

pure :: a -> ExceptT e m a #

(<*>) :: ExceptT e m (a -> b) -> ExceptT e m a -> ExceptT e m b #

liftA2 :: (a -> b -> c) -> ExceptT e m a -> ExceptT e m b -> ExceptT e m c #

(*>) :: ExceptT e m a -> ExceptT e m b -> ExceptT e m b #

(<*) :: ExceptT e m a -> ExceptT e m b -> ExceptT e m a #

Applicative m => Applicative (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

pure :: a -> IdentityT m a #

(<*>) :: IdentityT m (a -> b) -> IdentityT m a -> IdentityT m b #

liftA2 :: (a -> b -> c) -> IdentityT m a -> IdentityT m b -> IdentityT m c #

(*>) :: IdentityT m a -> IdentityT m b -> IdentityT m b #

(<*) :: IdentityT m a -> IdentityT m b -> IdentityT m a #

Applicative m => Applicative (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

pure :: a -> ReaderT r m a #

(<*>) :: ReaderT r m (a -> b) -> ReaderT r m a -> ReaderT r m b #

liftA2 :: (a -> b -> c) -> ReaderT r m a -> ReaderT r m b -> ReaderT r m c #

(*>) :: ReaderT r m a -> ReaderT r m b -> ReaderT r m b #

(<*) :: ReaderT r m a -> ReaderT r m b -> ReaderT r m a #

(Functor m, Monad m) => Applicative (SelectT r m) 
Instance details

Defined in Control.Monad.Trans.Select

Methods

pure :: a -> SelectT r m a #

(<*>) :: SelectT r m (a -> b) -> SelectT r m a -> SelectT r m b #

liftA2 :: (a -> b -> c) -> SelectT r m a -> SelectT r m b -> SelectT r m c #

(*>) :: SelectT r m a -> SelectT r m b -> SelectT r m b #

(<*) :: SelectT r m a -> SelectT r m b -> SelectT r m a #

(Functor m, Monad m) => Applicative (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Lazy

Methods

pure :: a -> StateT s m a #

(<*>) :: StateT s m (a -> b) -> StateT s m a -> StateT s m b #

liftA2 :: (a -> b -> c) -> StateT s m a -> StateT s m b -> StateT s m c #

(*>) :: StateT s m a -> StateT s m b -> StateT s m b #

(<*) :: StateT s m a -> StateT s m b -> StateT s m a #

(Functor m, Monad m) => Applicative (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

pure :: a -> StateT s m a #

(<*>) :: StateT s m (a -> b) -> StateT s m a -> StateT s m b #

liftA2 :: (a -> b -> c) -> StateT s m a -> StateT s m b -> StateT s m c #

(*>) :: StateT s m a -> StateT s m b -> StateT s m b #

(<*) :: StateT s m a -> StateT s m b -> StateT s m a #

(Functor m, Monad m) => Applicative (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.CPS

Methods

pure :: a -> WriterT w m a #

(<*>) :: WriterT w m (a -> b) -> WriterT w m a -> WriterT w m b #

liftA2 :: (a -> b -> c) -> WriterT w m a -> WriterT w m b -> WriterT w m c #

(*>) :: WriterT w m a -> WriterT w m b -> WriterT w m b #

(<*) :: WriterT w m a -> WriterT w m b -> WriterT w m a #

(Monoid w, Applicative m) => Applicative (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

pure :: a -> WriterT w m a #

(<*>) :: WriterT w m (a -> b) -> WriterT w m a -> WriterT w m b #

liftA2 :: (a -> b -> c) -> WriterT w m a -> WriterT w m b -> WriterT w m c #

(*>) :: WriterT w m a -> WriterT w m b -> WriterT w m b #

(<*) :: WriterT w m a -> WriterT w m b -> WriterT w m a #

(Monoid w, Applicative m) => Applicative (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

pure :: a -> WriterT w m a #

(<*>) :: WriterT w m (a -> b) -> WriterT w m a -> WriterT w m b #

liftA2 :: (a -> b -> c) -> WriterT w m a -> WriterT w m b -> WriterT w m c #

(*>) :: WriterT w m a -> WriterT w m b -> WriterT w m b #

(<*) :: WriterT w m a -> WriterT w m b -> WriterT w m a #

Monoid a => Applicative (Constant a :: Type -> Type) 
Instance details

Defined in Data.Functor.Constant

Methods

pure :: a0 -> Constant a a0 #

(<*>) :: Constant a (a0 -> b) -> Constant a a0 -> Constant a b #

liftA2 :: (a0 -> b -> c) -> Constant a a0 -> Constant a b -> Constant a c #

(*>) :: Constant a a0 -> Constant a b -> Constant a b #

(<*) :: Constant a a0 -> Constant a b -> Constant a a0 #

Applicative f => Applicative (Reverse f)

Derived instance.

Instance details

Defined in Data.Functor.Reverse

Methods

pure :: a -> Reverse f a #

(<*>) :: Reverse f (a -> b) -> Reverse f a -> Reverse f b #

liftA2 :: (a -> b -> c) -> Reverse f a -> Reverse f b -> Reverse f c #

(*>) :: Reverse f a -> Reverse f b -> Reverse f b #

(<*) :: Reverse f a -> Reverse f b -> Reverse f a #

(Monoid a, Monoid b) => Applicative ((,,) a b)

@since base-4.14.0.0

Instance details

Defined in GHC.Internal.Base

Methods

pure :: a0 -> (a, b, a0) #

(<*>) :: (a, b, a0 -> b0) -> (a, b, a0) -> (a, b, b0) #

liftA2 :: (a0 -> b0 -> c) -> (a, b, a0) -> (a, b, b0) -> (a, b, c) #

(*>) :: (a, b, a0) -> (a, b, b0) -> (a, b, b0) #

(<*) :: (a, b, a0) -> (a, b, b0) -> (a, b, a0) #

(Applicative f, Applicative g) => Applicative (Product f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Product

Methods

pure :: a -> Product f g a #

(<*>) :: Product f g (a -> b) -> Product f g a -> Product f g b #

liftA2 :: (a -> b -> c) -> Product f g a -> Product f g b -> Product f g c #

(*>) :: Product f g a -> Product f g b -> Product f g b #

(<*) :: Product f g a -> Product f g b -> Product f g a #

Applicative (ConduitT i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

pure :: a -> ConduitT i o m a #

(<*>) :: ConduitT i o m (a -> b) -> ConduitT i o m a -> ConduitT i o m b #

liftA2 :: (a -> b -> c) -> ConduitT i o m a -> ConduitT i o m b -> ConduitT i o m c #

(*>) :: ConduitT i o m a -> ConduitT i o m b -> ConduitT i o m b #

(<*) :: ConduitT i o m a -> ConduitT i o m b -> ConduitT i o m a #

Monad m => Applicative (ZipConduit i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

pure :: a -> ZipConduit i o m a #

(<*>) :: ZipConduit i o m (a -> b) -> ZipConduit i o m a -> ZipConduit i o m b #

liftA2 :: (a -> b -> c) -> ZipConduit i o m a -> ZipConduit i o m b -> ZipConduit i o m c #

(*>) :: ZipConduit i o m a -> ZipConduit i o m b -> ZipConduit i o m b #

(<*) :: ZipConduit i o m a -> ZipConduit i o m b -> ZipConduit i o m a #

(Monad f, Applicative f) => Applicative (WhenMatched f x y)

Equivalent to ReaderT Key (ReaderT x (ReaderT y (MaybeT f)))

Since: containers-0.5.9

Instance details

Defined in Data.IntMap.Internal

Methods

pure :: a -> WhenMatched f x y a #

(<*>) :: WhenMatched f x y (a -> b) -> WhenMatched f x y a -> WhenMatched f x y b #

liftA2 :: (a -> b -> c) -> WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y c #

(*>) :: WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y b #

(<*) :: WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y a #

(Applicative f, Monad f) => Applicative (WhenMissing f k x)

Equivalent to ReaderT k (ReaderT x (MaybeT f)) .

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

pure :: a -> WhenMissing f k x a #

(<*>) :: WhenMissing f k x (a -> b) -> WhenMissing f k x a -> WhenMissing f k x b #

liftA2 :: (a -> b -> c) -> WhenMissing f k x a -> WhenMissing f k x b -> WhenMissing f k x c #

(*>) :: WhenMissing f k x a -> WhenMissing f k x b -> WhenMissing f k x b #

(<*) :: WhenMissing f k x a -> WhenMissing f k x b -> WhenMissing f k x a #

(Monad f, Applicative f) => Applicative (WhenMatched f x y)

Equivalent to ReaderT Key (ReaderT x (ReaderT y (MaybeT f)))

Since: ghc-0.5.9

Instance details

Defined in GHC.Data.Word64Map.Internal

Methods

pure :: a -> WhenMatched f x y a #

(<*>) :: WhenMatched f x y (a -> b) -> WhenMatched f x y a -> WhenMatched f x y b #

liftA2 :: (a -> b -> c) -> WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y c #

(*>) :: WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y b #

(<*) :: WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y a #

(Applicative f, Applicative g) => Applicative (f :*: g)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

pure :: a -> (f :*: g) a #

(<*>) :: (f :*: g) (a -> b) -> (f :*: g) a -> (f :*: g) b #

liftA2 :: (a -> b -> c) -> (f :*: g) a -> (f :*: g) b -> (f :*: g) c #

(*>) :: (f :*: g) a -> (f :*: g) b -> (f :*: g) b #

(<*) :: (f :*: g) a -> (f :*: g) b -> (f :*: g) a #

Monoid c => Applicative (K1 i c :: Type -> Type)

@since base-4.12.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

pure :: a -> K1 i c a #

(<*>) :: K1 i c (a -> b) -> K1 i c a -> K1 i c b #

liftA2 :: (a -> b -> c0) -> K1 i c a -> K1 i c b -> K1 i c c0 #

(*>) :: K1 i c a -> K1 i c b -> K1 i c b #

(<*) :: K1 i c a -> K1 i c b -> K1 i c a #

Applicative (Bazaar p a b) 
Instance details

Defined in Control.Lens.Internal.Bazaar

Methods

pure :: a0 -> Bazaar p a b a0 #

(<*>) :: Bazaar p a b (a0 -> b0) -> Bazaar p a b a0 -> Bazaar p a b b0 #

liftA2 :: (a0 -> b0 -> c) -> Bazaar p a b a0 -> Bazaar p a b b0 -> Bazaar p a b c #

(*>) :: Bazaar p a b a0 -> Bazaar p a b b0 -> Bazaar p a b b0 #

(<*) :: Bazaar p a b a0 -> Bazaar p a b b0 -> Bazaar p a b a0 #

Applicative (Molten i a b) 
Instance details

Defined in Control.Lens.Internal.Magma

Methods

pure :: a0 -> Molten i a b a0 #

(<*>) :: Molten i a b (a0 -> b0) -> Molten i a b a0 -> Molten i a b b0 #

liftA2 :: (a0 -> b0 -> c) -> Molten i a b a0 -> Molten i a b b0 -> Molten i a b c #

(*>) :: Molten i a b a0 -> Molten i a b b0 -> Molten i a b b0 #

(<*) :: Molten i a b a0 -> Molten i a b b0 -> Molten i a b a0 #

Applicative (k (Err e s)) => Applicative (FocusingErr e k s) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

pure :: a -> FocusingErr e k s a #

(<*>) :: FocusingErr e k s (a -> b) -> FocusingErr e k s a -> FocusingErr e k s b #

liftA2 :: (a -> b -> c) -> FocusingErr e k s a -> FocusingErr e k s b -> FocusingErr e k s c #

(*>) :: FocusingErr e k s a -> FocusingErr e k s b -> FocusingErr e k s b #

(<*) :: FocusingErr e k s a -> FocusingErr e k s b -> FocusingErr e k s a #

Applicative (k (f s)) => Applicative (FocusingOn f k s) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

pure :: a -> FocusingOn f k s a #

(<*>) :: FocusingOn f k s (a -> b) -> FocusingOn f k s a -> FocusingOn f k s b #

liftA2 :: (a -> b -> c) -> FocusingOn f k s a -> FocusingOn f k s b -> FocusingOn f k s c #

(*>) :: FocusingOn f k s a -> FocusingOn f k s b -> FocusingOn f k s b #

(<*) :: FocusingOn f k s a -> FocusingOn f k s b -> FocusingOn f k s a #

Applicative (k (s, w)) => Applicative (FocusingPlus w k s) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

pure :: a -> FocusingPlus w k s a #

(<*>) :: FocusingPlus w k s (a -> b) -> FocusingPlus w k s a -> FocusingPlus w k s b #

liftA2 :: (a -> b -> c) -> FocusingPlus w k s a -> FocusingPlus w k s b -> FocusingPlus w k s c #

(*>) :: FocusingPlus w k s a -> FocusingPlus w k s b -> FocusingPlus w k s b #

(<*) :: FocusingPlus w k s a -> FocusingPlus w k s b -> FocusingPlus w k s a #

(Monad m, Monoid s, Monoid w) => Applicative (FocusingWith w m s) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

pure :: a -> FocusingWith w m s a #

(<*>) :: FocusingWith w m s (a -> b) -> FocusingWith w m s a -> FocusingWith w m s b #

liftA2 :: (a -> b -> c) -> FocusingWith w m s a -> FocusingWith w m s b -> FocusingWith w m s c #

(*>) :: FocusingWith w m s a -> FocusingWith w m s b -> FocusingWith w m s b #

(<*) :: FocusingWith w m s a -> FocusingWith w m s b -> FocusingWith w m s a #

Applicative (k (Err e s)) => Applicative (FocusingErr e k s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

pure :: a -> FocusingErr e k s a #

(<*>) :: FocusingErr e k s (a -> b) -> FocusingErr e k s a -> FocusingErr e k s b #

liftA2 :: (a -> b -> c) -> FocusingErr e k s a -> FocusingErr e k s b -> FocusingErr e k s c #

(*>) :: FocusingErr e k s a -> FocusingErr e k s b -> FocusingErr e k s b #

(<*) :: FocusingErr e k s a -> FocusingErr e k s b -> FocusingErr e k s a #

Applicative (k (f s)) => Applicative (FocusingOn f k s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

pure :: a -> FocusingOn f k s a #

(<*>) :: FocusingOn f k s (a -> b) -> FocusingOn f k s a -> FocusingOn f k s b #

liftA2 :: (a -> b -> c) -> FocusingOn f k s a -> FocusingOn f k s b -> FocusingOn f k s c #

(*>) :: FocusingOn f k s a -> FocusingOn f k s b -> FocusingOn f k s b #

(<*) :: FocusingOn f k s a -> FocusingOn f k s b -> FocusingOn f k s a #

Applicative (k (s, w)) => Applicative (FocusingPlus w k s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

pure :: a -> FocusingPlus w k s a #

(<*>) :: FocusingPlus w k s (a -> b) -> FocusingPlus w k s a -> FocusingPlus w k s b #

liftA2 :: (a -> b -> c) -> FocusingPlus w k s a -> FocusingPlus w k s b -> FocusingPlus w k s c #

(*>) :: FocusingPlus w k s a -> FocusingPlus w k s b -> FocusingPlus w k s b #

(<*) :: FocusingPlus w k s a -> FocusingPlus w k s b -> FocusingPlus w k s a #

(Monad m, Monoid s, Monoid w) => Applicative (FocusingWith w m s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

pure :: a -> FocusingWith w m s a #

(<*>) :: FocusingWith w m s (a -> b) -> FocusingWith w m s a -> FocusingWith w m s b #

liftA2 :: (a -> b -> c) -> FocusingWith w m s a -> FocusingWith w m s b -> FocusingWith w m s c #

(*>) :: FocusingWith w m s a -> FocusingWith w m s b -> FocusingWith w m s b #

(<*) :: FocusingWith w m s a -> FocusingWith w m s b -> FocusingWith w m s a #

Applicative (ContT r m) 
Instance details

Defined in Control.Monad.Trans.Cont

Methods

pure :: a -> ContT r m a #

(<*>) :: ContT r m (a -> b) -> ContT r m a -> ContT r m b #

liftA2 :: (a -> b -> c) -> ContT r m a -> ContT r m b -> ContT r m c #

(*>) :: ContT r m a -> ContT r m b -> ContT r m b #

(<*) :: ContT r m a -> ContT r m b -> ContT r m a #

(Monoid a, Monoid b, Monoid c) => Applicative ((,,,) a b c)

@since base-4.14.0.0

Instance details

Defined in GHC.Internal.Base

Methods

pure :: a0 -> (a, b, c, a0) #

(<*>) :: (a, b, c, a0 -> b0) -> (a, b, c, a0) -> (a, b, c, b0) #

liftA2 :: (a0 -> b0 -> c0) -> (a, b, c, a0) -> (a, b, c, b0) -> (a, b, c, c0) #

(*>) :: (a, b, c, a0) -> (a, b, c, b0) -> (a, b, c, b0) #

(<*) :: (a, b, c, a0) -> (a, b, c, b0) -> (a, b, c, a0) #

Applicative ((->) r)

@since base-2.01

Instance details

Defined in GHC.Internal.Base

Methods

pure :: a -> r -> a #

(<*>) :: (r -> (a -> b)) -> (r -> a) -> r -> b #

liftA2 :: (a -> b -> c) -> (r -> a) -> (r -> b) -> r -> c #

(*>) :: (r -> a) -> (r -> b) -> r -> b #

(<*) :: (r -> a) -> (r -> b) -> r -> a #

(Applicative f, Applicative g) => Applicative (Compose f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

pure :: a -> Compose f g a #

(<*>) :: Compose f g (a -> b) -> Compose f g a -> Compose f g b #

liftA2 :: (a -> b -> c) -> Compose f g a -> Compose f g b -> Compose f g c #

(*>) :: Compose f g a -> Compose f g b -> Compose f g b #

(<*) :: Compose f g a -> Compose f g b -> Compose f g a #

(Monad f, Applicative f) => Applicative (WhenMatched f k x y)

Equivalent to ReaderT k (ReaderT x (ReaderT y (MaybeT f)))

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

pure :: a -> WhenMatched f k x y a #

(<*>) :: WhenMatched f k x y (a -> b) -> WhenMatched f k x y a -> WhenMatched f k x y b #

liftA2 :: (a -> b -> c) -> WhenMatched f k x y a -> WhenMatched f k x y b -> WhenMatched f k x y c #

(*>) :: WhenMatched f k x y a -> WhenMatched f k x y b -> WhenMatched f k x y b #

(<*) :: WhenMatched f k x y a -> WhenMatched f k x y b -> WhenMatched f k x y a #

(Applicative f, Applicative g) => Applicative (f :.: g)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

pure :: a -> (f :.: g) a #

(<*>) :: (f :.: g) (a -> b) -> (f :.: g) a -> (f :.: g) b #

liftA2 :: (a -> b -> c) -> (f :.: g) a -> (f :.: g) b -> (f :.: g) c #

(*>) :: (f :.: g) a -> (f :.: g) b -> (f :.: g) b #

(<*) :: (f :.: g) a -> (f :.: g) b -> (f :.: g) a #

Applicative f => Applicative (M1 i c f)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

pure :: a -> M1 i c f a #

(<*>) :: M1 i c f (a -> b) -> M1 i c f a -> M1 i c f b #

liftA2 :: (a -> b -> c0) -> M1 i c f a -> M1 i c f b -> M1 i c f c0 #

(*>) :: M1 i c f a -> M1 i c f b -> M1 i c f b #

(<*) :: M1 i c f a -> M1 i c f b -> M1 i c f a #

Applicative (BazaarT p g a b) 
Instance details

Defined in Control.Lens.Internal.Bazaar

Methods

pure :: a0 -> BazaarT p g a b a0 #

(<*>) :: BazaarT p g a b (a0 -> b0) -> BazaarT p g a b a0 -> BazaarT p g a b b0 #

liftA2 :: (a0 -> b0 -> c) -> BazaarT p g a b a0 -> BazaarT p g a b b0 -> BazaarT p g a b c #

(*>) :: BazaarT p g a b a0 -> BazaarT p g a b b0 -> BazaarT p g a b b0 #

(<*) :: BazaarT p g a b a0 -> BazaarT p g a b b0 -> BazaarT p g a b a0 #

Applicative (TakingWhile p f a b) 
Instance details

Defined in Control.Lens.Internal.Magma

Methods

pure :: a0 -> TakingWhile p f a b a0 #

(<*>) :: TakingWhile p f a b (a0 -> b0) -> TakingWhile p f a b a0 -> TakingWhile p f a b b0 #

liftA2 :: (a0 -> b0 -> c) -> TakingWhile p f a b a0 -> TakingWhile p f a b b0 -> TakingWhile p f a b c #

(*>) :: TakingWhile p f a b a0 -> TakingWhile p f a b b0 -> TakingWhile p f a b b0 #

(<*) :: TakingWhile p f a b a0 -> TakingWhile p f a b b0 -> TakingWhile p f a b a0 #

(Monoid s, Monoid w, Monad m) => Applicative (EffectRWS w st m s) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

pure :: a -> EffectRWS w st m s a #

(<*>) :: EffectRWS w st m s (a -> b) -> EffectRWS w st m s a -> EffectRWS w st m s b #

liftA2 :: (a -> b -> c) -> EffectRWS w st m s a -> EffectRWS w st m s b -> EffectRWS w st m s c #

(*>) :: EffectRWS w st m s a -> EffectRWS w st m s b -> EffectRWS w st m s b #

(<*) :: EffectRWS w st m s a -> EffectRWS w st m s b -> EffectRWS w st m s a #

Applicative (k (Freed f m s)) => Applicative (FocusingFree f m k s) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

pure :: a -> FocusingFree f m k s a #

(<*>) :: FocusingFree f m k s (a -> b) -> FocusingFree f m k s a -> FocusingFree f m k s b #

liftA2 :: (a -> b -> c) -> FocusingFree f m k s a -> FocusingFree f m k s b -> FocusingFree f m k s c #

(*>) :: FocusingFree f m k s a -> FocusingFree f m k s b -> FocusingFree f m k s b #

(<*) :: FocusingFree f m k s a -> FocusingFree f m k s b -> FocusingFree f m k s a #

(Monoid s, Monoid w, Monad m) => Applicative (EffectRWS w st m s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

pure :: a -> EffectRWS w st m s a #

(<*>) :: EffectRWS w st m s (a -> b) -> EffectRWS w st m s a -> EffectRWS w st m s b #

liftA2 :: (a -> b -> c) -> EffectRWS w st m s a -> EffectRWS w st m s b -> EffectRWS w st m s c #

(*>) :: EffectRWS w st m s a -> EffectRWS w st m s b -> EffectRWS w st m s b #

(<*) :: EffectRWS w st m s a -> EffectRWS w st m s b -> EffectRWS w st m s a #

Reifies s (ReifiedApplicative f) => Applicative (ReflectedApplicative f s) 
Instance details

Defined in Data.Reflection

(Applicative f, Applicative g) => Applicative (f :.: g)

Since: sop-core-0.2.5.0

Instance details

Defined in Data.SOP.BasicFunctors

Methods

pure :: a -> (f :.: g) a #

(<*>) :: (f :.: g) (a -> b) -> (f :.: g) a -> (f :.: g) b #

liftA2 :: (a -> b -> c) -> (f :.: g) a -> (f :.: g) b -> (f :.: g) c #

(*>) :: (f :.: g) a -> (f :.: g) b -> (f :.: g) b #

(<*) :: (f :.: g) a -> (f :.: g) b -> (f :.: g) a #

(Functor m, Monad m) => Applicative (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.CPS

Methods

pure :: a -> RWST r w s m a #

(<*>) :: RWST r w s m (a -> b) -> RWST r w s m a -> RWST r w s m b #

liftA2 :: (a -> b -> c) -> RWST r w s m a -> RWST r w s m b -> RWST r w s m c #

(*>) :: RWST r w s m a -> RWST r w s m b -> RWST r w s m b #

(<*) :: RWST r w s m a -> RWST r w s m b -> RWST r w s m a #

(Monoid w, Functor m, Monad m) => Applicative (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.Lazy

Methods

pure :: a -> RWST r w s m a #

(<*>) :: RWST r w s m (a -> b) -> RWST r w s m a -> RWST r w s m b #

liftA2 :: (a -> b -> c) -> RWST r w s m a -> RWST r w s m b -> RWST r w s m c #

(*>) :: RWST r w s m a -> RWST r w s m b -> RWST r w s m b #

(<*) :: RWST r w s m a -> RWST r w s m b -> RWST r w s m a #

(Monoid w, Functor m, Monad m) => Applicative (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.Strict

Methods

pure :: a -> RWST r w s m a #

(<*>) :: RWST r w s m (a -> b) -> RWST r w s m a -> RWST r w s m b #

liftA2 :: (a -> b -> c) -> RWST r w s m a -> RWST r w s m b -> RWST r w s m c #

(*>) :: RWST r w s m a -> RWST r w s m b -> RWST r w s m b #

(<*) :: RWST r w s m a -> RWST r w s m b -> RWST r w s m a #

Monad state => Applicative (Builder collection mutCollection step state err) 
Instance details

Defined in Basement.MutableBuilder

Methods

pure :: a -> Builder collection mutCollection step state err a #

(<*>) :: Builder collection mutCollection step state err (a -> b) -> Builder collection mutCollection step state err a -> Builder collection mutCollection step state err b #

liftA2 :: (a -> b -> c) -> Builder collection mutCollection step state err a -> Builder collection mutCollection step state err b -> Builder collection mutCollection step state err c #

(*>) :: Builder collection mutCollection step state err a -> Builder collection mutCollection step state err b -> Builder collection mutCollection step state err b #

(<*) :: Builder collection mutCollection step state err a -> Builder collection mutCollection step state err b -> Builder collection mutCollection step state err a #

Monad m => Applicative (Pipe l i o u m) 
Instance details

Defined in Data.Conduit.Internal.Pipe

Methods

pure :: a -> Pipe l i o u m a #

(<*>) :: Pipe l i o u m (a -> b) -> Pipe l i o u m a -> Pipe l i o u m b #

liftA2 :: (a -> b -> c) -> Pipe l i o u m a -> Pipe l i o u m b -> Pipe l i o u m c #

(*>) :: Pipe l i o u m a -> Pipe l i o u m b -> Pipe l i o u m b #

(<*) :: Pipe l i o u m a -> Pipe l i o u m b -> Pipe l i o u m a #

class Functor (f :: Type -> Type) where #

A type f is a Functor if it provides a function fmap which, given any types a and b lets you apply any function from (a -> b) to turn an f a into an f b, preserving the structure of f. Furthermore f needs to adhere to the following:

Identity
fmap id == id
Composition
fmap (f . g) == fmap f . fmap g

Note, that the second law follows from the free theorem of the type fmap and the first law, so you need only check that the former condition holds. See these articles by School of Haskell or David Luposchainsky for an explanation.

Minimal complete definition

fmap

Methods

fmap :: (a -> b) -> f a -> f b #

fmap is used to apply a function of type (a -> b) to a value of type f a, where f is a functor, to produce a value of type f b. Note that for any type constructor with more than one parameter (e.g., Either), only the last type parameter can be modified with fmap (e.g., b in `Either a b`).

Some type constructors with two parameters or more have a Bifunctor instance that allows both the last and the penultimate parameters to be mapped over.

Examples

Expand

Convert from a Maybe Int to a Maybe String using show:

>>> fmap show Nothing
Nothing
>>> fmap show (Just 3)
Just "3"

Convert from an Either Int Int to an Either Int String using show:

>>> fmap show (Left 17)
Left 17
>>> fmap show (Right 17)
Right "17"

Double each element of a list:

>>> fmap (*2) [1,2,3]
[2,4,6]

Apply even to the second element of a pair:

>>> fmap even (2,2)
(2,True)

It may seem surprising that the function is only applied to the last element of the tuple compared to the list example above which applies it to every element in the list. To understand, remember that tuples are type constructors with multiple type parameters: a tuple of 3 elements (a,b,c) can also be written (,,) a b c and its Functor instance is defined for Functor ((,,) a b) (i.e., only the third parameter is free to be mapped over with fmap).

It explains why fmap can be used with tuples containing values of different types as in the following example:

>>> fmap even ("hello", 1.0, 4)
("hello",1.0,True)

(<$) :: a -> f b -> f a infixl 4 #

Replace all locations in the input with the same value. The default definition is fmap . const, but this may be overridden with a more efficient version.

Examples

Expand

Perform a computation with Maybe and replace the result with a constant value if it is Just:

>>> 'a' <$ Just 2
Just 'a'
>>> 'a' <$ Nothing
Nothing

Instances

Instances details
Functor Only 
Instance details

Defined in Data.Tuple.Only

Methods

fmap :: (a -> b) -> Only a -> Only b #

(<$) :: a -> Only b -> Only a #

Functor KeyMap 
Instance details

Defined in Data.Aeson.KeyMap

Methods

fmap :: (a -> b) -> KeyMap a -> KeyMap b #

(<$) :: a -> KeyMap b -> KeyMap a #

Functor FromJSONKeyFunction

Only law abiding up to interpretation

Instance details

Defined in Data.Aeson.Types.FromJSON

Functor IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fmap :: (a -> b) -> IResult a -> IResult b #

(<$) :: a -> IResult b -> IResult a #

Functor Parser 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fmap :: (a -> b) -> Parser a -> Parser b #

(<$) :: a -> Parser b -> Parser a #

Functor Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fmap :: (a -> b) -> Result a -> Result b #

(<$) :: a -> Result b -> Result a #

Functor WithJSONWarnings 
Instance details

Defined in Data.Aeson.WarningParser

Methods

fmap :: (a -> b) -> WithJSONWarnings a -> WithJSONWarnings b #

(<$) :: a -> WithJSONWarnings b -> WithJSONWarnings a #

Functor Complex

Since: base-4.9.0.0

Instance details

Defined in Data.Complex

Methods

fmap :: (a -> b) -> Complex a -> Complex b #

(<$) :: a -> Complex b -> Complex a #

Functor First

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

fmap :: (a -> b) -> First a -> First b #

(<$) :: a -> First b -> First a #

Functor Last

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

fmap :: (a -> b) -> Last a -> Last b #

(<$) :: a -> Last b -> Last a #

Functor Max

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

fmap :: (a -> b) -> Max a -> Max b #

(<$) :: a -> Max b -> Max a #

Functor Min

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

fmap :: (a -> b) -> Min a -> Min b #

(<$) :: a -> Min b -> Min a #

Functor ArgDescr

Since: base-4.7.0.0

Instance details

Defined in System.Console.GetOpt

Methods

fmap :: (a -> b) -> ArgDescr a -> ArgDescr b #

(<$) :: a -> ArgDescr b -> ArgDescr a #

Functor ArgOrder

Since: base-4.7.0.0

Instance details

Defined in System.Console.GetOpt

Methods

fmap :: (a -> b) -> ArgOrder a -> ArgOrder b #

(<$) :: a -> ArgOrder b -> ArgOrder a #

Functor OptDescr

Since: base-4.7.0.0

Instance details

Defined in System.Console.GetOpt

Methods

fmap :: (a -> b) -> OptDescr a -> OptDescr b #

(<$) :: a -> OptDescr b -> OptDescr a #

Functor Flush 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

fmap :: (a -> b) -> Flush a -> Flush b #

(<$) :: a -> Flush b -> Flush a #

Functor SCC

Since: containers-0.5.4

Instance details

Defined in Data.Graph

Methods

fmap :: (a -> b) -> SCC a -> SCC b #

(<$) :: a -> SCC b -> SCC a #

Functor IntMap 
Instance details

Defined in Data.IntMap.Internal

Methods

fmap :: (a -> b) -> IntMap a -> IntMap b #

(<$) :: a -> IntMap b -> IntMap a #

Functor Digit 
Instance details

Defined in Data.Sequence.Internal

Methods

fmap :: (a -> b) -> Digit a -> Digit b #

(<$) :: a -> Digit b -> Digit a #

Functor Elem 
Instance details

Defined in Data.Sequence.Internal

Methods

fmap :: (a -> b) -> Elem a -> Elem b #

(<$) :: a -> Elem b -> Elem a #

Functor FingerTree 
Instance details

Defined in Data.Sequence.Internal

Methods

fmap :: (a -> b) -> FingerTree a -> FingerTree b #

(<$) :: a -> FingerTree b -> FingerTree a #

Functor Node 
Instance details

Defined in Data.Sequence.Internal

Methods

fmap :: (a -> b) -> Node a -> Node b #

(<$) :: a -> Node b -> Node a #

Functor Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

fmap :: (a -> b) -> Seq a -> Seq b #

(<$) :: a -> Seq b -> Seq a #

Functor ViewL 
Instance details

Defined in Data.Sequence.Internal

Methods

fmap :: (a -> b) -> ViewL a -> ViewL b #

(<$) :: a -> ViewL b -> ViewL a #

Functor ViewR 
Instance details

Defined in Data.Sequence.Internal

Methods

fmap :: (a -> b) -> ViewR a -> ViewR b #

(<$) :: a -> ViewR b -> ViewR a #

Functor Tree 
Instance details

Defined in Data.Tree

Methods

fmap :: (a -> b) -> Tree a -> Tree b #

(<$) :: a -> Tree b -> Tree a #

Functor CryptoFailable 
Instance details

Defined in Crypto.Error.Types

Methods

fmap :: (a -> b) -> CryptoFailable a -> CryptoFailable b #

(<$) :: a -> CryptoFailable b -> CryptoFailable a #

Functor CryptoFailable 
Instance details

Defined in Crypto.Error.Types

Methods

fmap :: (a -> b) -> CryptoFailable a -> CryptoFailable b #

(<$) :: a -> CryptoFailable b -> CryptoFailable a #

Functor DNonEmpty 
Instance details

Defined in Data.DList.DNonEmpty.Internal

Methods

fmap :: (a -> b) -> DNonEmpty a -> DNonEmpty b #

(<$) :: a -> DNonEmpty b -> DNonEmpty a #

Functor DList 
Instance details

Defined in Data.DList.Internal

Methods

fmap :: (a -> b) -> DList a -> DList b #

(<$) :: a -> DList b -> DList a #

Functor LabelMap 
Instance details

Defined in GHC.Cmm.Dataflow.Label

Methods

fmap :: (a -> b) -> LabelMap a -> LabelMap b #

(<$) :: a -> LabelMap b -> LabelMap a #

Functor AltMap 
Instance details

Defined in GHC.Core.Map.Expr

Methods

fmap :: (a -> b) -> AltMap a -> AltMap b #

(<$) :: a -> AltMap b -> AltMap a #

Functor CoreMap 
Instance details

Defined in GHC.Core.Map.Expr

Methods

fmap :: (a -> b) -> CoreMap a -> CoreMap b #

(<$) :: a -> CoreMap b -> CoreMap a #

Functor CoreMapX 
Instance details

Defined in GHC.Core.Map.Expr

Methods

fmap :: (a -> b) -> CoreMapX a -> CoreMapX b #

(<$) :: a -> CoreMapX b -> CoreMapX a #

Functor BndrMap 
Instance details

Defined in GHC.Core.Map.Type

Methods

fmap :: (a -> b) -> BndrMap a -> BndrMap b #

(<$) :: a -> BndrMap b -> BndrMap a #

Functor CoercionMap 
Instance details

Defined in GHC.Core.Map.Type

Methods

fmap :: (a -> b) -> CoercionMap a -> CoercionMap b #

(<$) :: a -> CoercionMap b -> CoercionMap a #

Functor CoercionMapX 
Instance details

Defined in GHC.Core.Map.Type

Methods

fmap :: (a -> b) -> CoercionMapX a -> CoercionMapX b #

(<$) :: a -> CoercionMapX b -> CoercionMapX a #

Functor LooseTypeMap 
Instance details

Defined in GHC.Core.Map.Type

Methods

fmap :: (a -> b) -> LooseTypeMap a -> LooseTypeMap b #

(<$) :: a -> LooseTypeMap b -> LooseTypeMap a #

Functor TyLitMap 
Instance details

Defined in GHC.Core.Map.Type

Methods

fmap :: (a -> b) -> TyLitMap a -> TyLitMap b #

(<$) :: a -> TyLitMap b -> TyLitMap a #

Functor TypeMap 
Instance details

Defined in GHC.Core.Map.Type

Methods

fmap :: (a -> b) -> TypeMap a -> TypeMap b #

(<$) :: a -> TypeMap b -> TypeMap a #

Functor TypeMapX 
Instance details

Defined in GHC.Core.Map.Type

Methods

fmap :: (a -> b) -> TypeMapX a -> TypeMapX b #

(<$) :: a -> TypeMapX b -> TypeMapX a #

Functor VarMap 
Instance details

Defined in GHC.Core.Map.Type

Methods

fmap :: (a -> b) -> VarMap a -> VarMap b #

(<$) :: a -> VarMap b -> VarMap a #

Functor Bag 
Instance details

Defined in GHC.Data.Bag

Methods

fmap :: (a -> b) -> Bag a -> Bag b #

(<$) :: a -> Bag b -> Bag a #

Functor Word64Map 
Instance details

Defined in GHC.Data.Word64Map.Internal

Methods

fmap :: (a -> b) -> Word64Map a -> Word64Map b #

(<$) :: a -> Word64Map b -> Word64Map a #

Functor MatchResult 
Instance details

Defined in GHC.HsToCore.Monad

Methods

fmap :: (a -> b) -> MatchResult a -> MatchResult b #

(<$) :: a -> MatchResult b -> MatchResult a #

Functor EpAnn 
Instance details

Defined in GHC.Parser.Annotation

Methods

fmap :: (a -> b) -> EpAnn a -> EpAnn b #

(<$) :: a -> EpAnn b -> EpAnn a #

Functor PV 
Instance details

Defined in GHC.Parser.PostProcess

Methods

fmap :: (a -> b) -> PV a -> PV b #

(<$) :: a -> PV b -> PV a #

Functor PV_Result 
Instance details

Defined in GHC.Parser.PostProcess

Methods

fmap :: (a -> b) -> PV_Result a -> PV_Result b #

(<$) :: a -> PV_Result b -> PV_Result a #

Functor ConAppMap 
Instance details

Defined in GHC.Stg.CSE

Methods

fmap :: (a -> b) -> ConAppMap a -> ConAppMap b #

(<$) :: a -> ConAppMap b -> ConAppMap a #

Functor StgArgMap 
Instance details

Defined in GHC.Stg.CSE

Methods

fmap :: (a -> b) -> StgArgMap a -> StgArgMap b #

(<$) :: a -> StgArgMap b -> StgArgMap a #

Functor SolverStage 
Instance details

Defined in GHC.Tc.Solver.Monad

Methods

fmap :: (a -> b) -> SolverStage a -> SolverStage b #

(<$) :: a -> SolverStage b -> SolverStage a #

Functor StopOrContinue 
Instance details

Defined in GHC.Tc.Solver.Monad

Methods

fmap :: (a -> b) -> StopOrContinue a -> StopOrContinue b #

(<$) :: a -> StopOrContinue b -> StopOrContinue a #

Functor TcS 
Instance details

Defined in GHC.Tc.Solver.Monad

Methods

fmap :: (a -> b) -> TcS a -> TcS b #

(<$) :: a -> TcS b -> TcS a #

Functor TyConFlavour 
Instance details

Defined in GHC.Types.Basic

Methods

fmap :: (a -> b) -> TyConFlavour a -> TyConFlavour b #

(<$) :: a -> TyConFlavour b -> TyConFlavour a #

Functor Messages 
Instance details

Defined in GHC.Types.Error

Methods

fmap :: (a -> b) -> Messages a -> Messages b #

(<$) :: a -> Messages b -> Messages a #

Functor MsgEnvelope 
Instance details

Defined in GHC.Types.Error

Methods

fmap :: (a -> b) -> MsgEnvelope a -> MsgEnvelope b #

(<$) :: a -> MsgEnvelope b -> MsgEnvelope a #

Functor OccEnv 
Instance details

Defined in GHC.Types.Name.Occurrence

Methods

fmap :: (a -> b) -> OccEnv a -> OccEnv b #

(<$) :: a -> OccEnv b -> OccEnv a #

Functor Definite 
Instance details

Defined in GHC.Unit.Types

Methods

fmap :: (a -> b) -> Definite a -> Definite b #

(<$) :: a -> Definite b -> Definite a #

Functor GenModule 
Instance details

Defined in GHC.Unit.Types

Methods

fmap :: (a -> b) -> GenModule a -> GenModule b #

(<$) :: a -> GenModule b -> GenModule a #

Functor GenWithIsBoot 
Instance details

Defined in GHC.Unit.Types

Methods

fmap :: (a -> b) -> GenWithIsBoot a -> GenWithIsBoot b #

(<$) :: a -> GenWithIsBoot b -> GenWithIsBoot a #

Functor DataDefnCons 
Instance details

Defined in Language.Haskell.Syntax.Decls

Methods

fmap :: (a -> b) -> DataDefnCons a -> DataDefnCons b #

(<$) :: a -> DataDefnCons b -> DataDefnCons a #

Functor SizedSeq 
Instance details

Defined in GHC.Data.SizedSeq

Methods

fmap :: (a -> b) -> SizedSeq a -> SizedSeq b #

(<$) :: a -> SizedSeq b -> SizedSeq a #

Functor GenClosure 
Instance details

Defined in GHC.Exts.Heap.Closures

Methods

fmap :: (a -> b) -> GenClosure a -> GenClosure b #

(<$) :: a -> GenClosure b -> GenClosure a #

Functor GenStackField 
Instance details

Defined in GHC.Exts.Heap.Closures

Methods

fmap :: (a -> b) -> GenStackField a -> GenStackField b #

(<$) :: a -> GenStackField b -> GenStackField a #

Functor GenStackFrame 
Instance details

Defined in GHC.Exts.Heap.Closures

Methods

fmap :: (a -> b) -> GenStackFrame a -> GenStackFrame b #

(<$) :: a -> GenStackFrame b -> GenStackFrame a #

Functor GenStgStackClosure 
Instance details

Defined in GHC.Exts.Heap.Closures

Functor NonEmpty

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Base

Methods

fmap :: (a -> b) -> NonEmpty a -> NonEmpty b #

(<$) :: a -> NonEmpty b -> NonEmpty a #

Functor STM

@since base-4.3.0.0

Instance details

Defined in GHC.Internal.Conc.Sync

Methods

fmap :: (a -> b) -> STM a -> STM b #

(<$) :: a -> STM b -> STM a #

Functor Identity

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Identity

Methods

fmap :: (a -> b) -> Identity a -> Identity b #

(<$) :: a -> Identity b -> Identity a #

Functor First

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Data.Monoid

Methods

fmap :: (a -> b) -> First a -> First b #

(<$) :: a -> First b -> First a #

Functor Last

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Data.Monoid

Methods

fmap :: (a -> b) -> Last a -> Last b #

(<$) :: a -> Last b -> Last a #

Functor Down

@since base-4.11.0.0

Instance details

Defined in GHC.Internal.Data.Ord

Methods

fmap :: (a -> b) -> Down a -> Down b #

(<$) :: a -> Down b -> Down a #

Functor Dual

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

fmap :: (a -> b) -> Dual a -> Dual b #

(<$) :: a -> Dual b -> Dual a #

Functor Product

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

fmap :: (a -> b) -> Product a -> Product b #

(<$) :: a -> Product b -> Product a #

Functor Sum

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

fmap :: (a -> b) -> Sum a -> Sum b #

(<$) :: a -> Sum b -> Sum a #

Functor ZipList

@since base-2.01

Instance details

Defined in GHC.Internal.Functor.ZipList

Methods

fmap :: (a -> b) -> ZipList a -> ZipList b #

(<$) :: a -> ZipList b -> ZipList a #

Functor Par1

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

fmap :: (a -> b) -> Par1 a -> Par1 b #

(<$) :: a -> Par1 b -> Par1 a #

Functor P

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Text.ParserCombinators.ReadP

Methods

fmap :: (a -> b) -> P a -> P b #

(<$) :: a -> P b -> P a #

Functor ReadP

@since base-2.01

Instance details

Defined in GHC.Internal.Text.ParserCombinators.ReadP

Methods

fmap :: (a -> b) -> ReadP a -> ReadP b #

(<$) :: a -> ReadP b -> ReadP a #

Functor IO

@since base-2.01

Instance details

Defined in GHC.Internal.Base

Methods

fmap :: (a -> b) -> IO a -> IO b #

(<$) :: a -> IO b -> IO a #

Functor ListOf 
Instance details

Defined in Language.Haskell.Exts.Parser

Methods

fmap :: (a -> b) -> ListOf a -> ListOf b #

(<$) :: a -> ListOf b -> ListOf a #

Functor NonGreedy 
Instance details

Defined in Language.Haskell.Exts.Parser

Methods

fmap :: (a -> b) -> NonGreedy a -> NonGreedy b #

(<$) :: a -> NonGreedy b -> NonGreedy a #

Functor Activation 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Activation a -> Activation b #

(<$) :: a -> Activation b -> Activation a #

Functor Alt 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Alt a -> Alt b #

(<$) :: a -> Alt b -> Alt a #

Functor Annotation 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Annotation a -> Annotation b #

(<$) :: a -> Annotation b -> Annotation a #

Functor Assoc 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Assoc a -> Assoc b #

(<$) :: a -> Assoc b -> Assoc a #

Functor Asst 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Asst a -> Asst b #

(<$) :: a -> Asst b -> Asst a #

Functor BangType 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> BangType a -> BangType b #

(<$) :: a -> BangType b -> BangType a #

Functor Binds 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Binds a -> Binds b #

(<$) :: a -> Binds b -> Binds a #

Functor BooleanFormula 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> BooleanFormula a -> BooleanFormula b #

(<$) :: a -> BooleanFormula b -> BooleanFormula a #

Functor Bracket 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Bracket a -> Bracket b #

(<$) :: a -> Bracket b -> Bracket a #

Functor CName 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> CName a -> CName b #

(<$) :: a -> CName b -> CName a #

Functor CallConv 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> CallConv a -> CallConv b #

(<$) :: a -> CallConv b -> CallConv a #

Functor ClassDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> ClassDecl a -> ClassDecl b #

(<$) :: a -> ClassDecl b -> ClassDecl a #

Functor ConDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> ConDecl a -> ConDecl b #

(<$) :: a -> ConDecl b -> ConDecl a #

Functor Context 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Context a -> Context b #

(<$) :: a -> Context b -> Context a #

Functor DataOrNew 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> DataOrNew a -> DataOrNew b #

(<$) :: a -> DataOrNew b -> DataOrNew a #

Functor Decl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Decl a -> Decl b #

(<$) :: a -> Decl b -> Decl a #

Functor DeclHead 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> DeclHead a -> DeclHead b #

(<$) :: a -> DeclHead b -> DeclHead a #

Functor DerivStrategy 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> DerivStrategy a -> DerivStrategy b #

(<$) :: a -> DerivStrategy b -> DerivStrategy a #

Functor Deriving 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Deriving a -> Deriving b #

(<$) :: a -> Deriving b -> Deriving a #

Functor EWildcard 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> EWildcard a -> EWildcard b #

(<$) :: a -> EWildcard b -> EWildcard a #

Functor Exp 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Exp a -> Exp b #

(<$) :: a -> Exp b -> Exp a #

Functor ExportSpec 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> ExportSpec a -> ExportSpec b #

(<$) :: a -> ExportSpec b -> ExportSpec a #

Functor ExportSpecList 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> ExportSpecList a -> ExportSpecList b #

(<$) :: a -> ExportSpecList b -> ExportSpecList a #

Functor FieldDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> FieldDecl a -> FieldDecl b #

(<$) :: a -> FieldDecl b -> FieldDecl a #

Functor FieldUpdate 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> FieldUpdate a -> FieldUpdate b #

(<$) :: a -> FieldUpdate b -> FieldUpdate a #

Functor FunDep 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> FunDep a -> FunDep b #

(<$) :: a -> FunDep b -> FunDep a #

Functor GadtDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> GadtDecl a -> GadtDecl b #

(<$) :: a -> GadtDecl b -> GadtDecl a #

Functor GuardedRhs 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> GuardedRhs a -> GuardedRhs b #

(<$) :: a -> GuardedRhs b -> GuardedRhs a #

Functor IPBind 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> IPBind a -> IPBind b #

(<$) :: a -> IPBind b -> IPBind a #

Functor IPName 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> IPName a -> IPName b #

(<$) :: a -> IPName b -> IPName a #

Functor ImportDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> ImportDecl a -> ImportDecl b #

(<$) :: a -> ImportDecl b -> ImportDecl a #

Functor ImportSpec 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> ImportSpec a -> ImportSpec b #

(<$) :: a -> ImportSpec b -> ImportSpec a #

Functor ImportSpecList 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> ImportSpecList a -> ImportSpecList b #

(<$) :: a -> ImportSpecList b -> ImportSpecList a #

Functor InjectivityInfo 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> InjectivityInfo a -> InjectivityInfo b #

(<$) :: a -> InjectivityInfo b -> InjectivityInfo a #

Functor InstDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> InstDecl a -> InstDecl b #

(<$) :: a -> InstDecl b -> InstDecl a #

Functor InstHead 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> InstHead a -> InstHead b #

(<$) :: a -> InstHead b -> InstHead a #

Functor InstRule 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> InstRule a -> InstRule b #

(<$) :: a -> InstRule b -> InstRule a #

Functor Literal 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Literal a -> Literal b #

(<$) :: a -> Literal b -> Literal a #

Functor Match 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Match a -> Match b #

(<$) :: a -> Match b -> Match a #

Functor MaybePromotedName 
Instance details

Defined in Language.Haskell.Exts.Syntax

Functor Module 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Module a -> Module b #

(<$) :: a -> Module b -> Module a #

Functor ModuleHead 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> ModuleHead a -> ModuleHead b #

(<$) :: a -> ModuleHead b -> ModuleHead a #

Functor ModuleName 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> ModuleName a -> ModuleName b #

(<$) :: a -> ModuleName b -> ModuleName a #

Functor ModulePragma 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> ModulePragma a -> ModulePragma b #

(<$) :: a -> ModulePragma b -> ModulePragma a #

Functor Name 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Name a -> Name b #

(<$) :: a -> Name b -> Name a #

Functor Namespace 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Namespace a -> Namespace b #

(<$) :: a -> Namespace b -> Namespace a #

Functor Op 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Op a -> Op b #

(<$) :: a -> Op b -> Op a #

Functor Overlap 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Overlap a -> Overlap b #

(<$) :: a -> Overlap b -> Overlap a #

Functor PXAttr 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> PXAttr a -> PXAttr b #

(<$) :: a -> PXAttr b -> PXAttr a #

Functor Pat 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Pat a -> Pat b #

(<$) :: a -> Pat b -> Pat a #

Functor PatField 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> PatField a -> PatField b #

(<$) :: a -> PatField b -> PatField a #

Functor PatternSynDirection 
Instance details

Defined in Language.Haskell.Exts.Syntax

Functor Promoted 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Promoted a -> Promoted b #

(<$) :: a -> Promoted b -> Promoted a #

Functor QName 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> QName a -> QName b #

(<$) :: a -> QName b -> QName a #

Functor QOp 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> QOp a -> QOp b #

(<$) :: a -> QOp b -> QOp a #

Functor QualConDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> QualConDecl a -> QualConDecl b #

(<$) :: a -> QualConDecl b -> QualConDecl a #

Functor QualStmt 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> QualStmt a -> QualStmt b #

(<$) :: a -> QualStmt b -> QualStmt a #

Functor RPat 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> RPat a -> RPat b #

(<$) :: a -> RPat b -> RPat a #

Functor RPatOp 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> RPatOp a -> RPatOp b #

(<$) :: a -> RPatOp b -> RPatOp a #

Functor ResultSig 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> ResultSig a -> ResultSig b #

(<$) :: a -> ResultSig b -> ResultSig a #

Functor Rhs 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Rhs a -> Rhs b #

(<$) :: a -> Rhs b -> Rhs a #

Functor Role 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Role a -> Role b #

(<$) :: a -> Role b -> Role a #

Functor Rule 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Rule a -> Rule b #

(<$) :: a -> Rule b -> Rule a #

Functor RuleVar 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> RuleVar a -> RuleVar b #

(<$) :: a -> RuleVar b -> RuleVar a #

Functor Safety 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Safety a -> Safety b #

(<$) :: a -> Safety b -> Safety a #

Functor Sign 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Sign a -> Sign b #

(<$) :: a -> Sign b -> Sign a #

Functor SpecialCon 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> SpecialCon a -> SpecialCon b #

(<$) :: a -> SpecialCon b -> SpecialCon a #

Functor Splice 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Splice a -> Splice b #

(<$) :: a -> Splice b -> Splice a #

Functor Stmt 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Stmt a -> Stmt b #

(<$) :: a -> Stmt b -> Stmt a #

Functor TyVarBind 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> TyVarBind a -> TyVarBind b #

(<$) :: a -> TyVarBind b -> TyVarBind a #

Functor Type 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Type a -> Type b #

(<$) :: a -> Type b -> Type a #

Functor TypeEqn 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> TypeEqn a -> TypeEqn b #

(<$) :: a -> TypeEqn b -> TypeEqn a #

Functor Unpackedness 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Unpackedness a -> Unpackedness b #

(<$) :: a -> Unpackedness b -> Unpackedness a #

Functor WarningText 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> WarningText a -> WarningText b #

(<$) :: a -> WarningText b -> WarningText a #

Functor XAttr 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> XAttr a -> XAttr b #

(<$) :: a -> XAttr b -> XAttr a #

Functor XName 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> XName a -> XName b #

(<$) :: a -> XName b -> XName a #

Functor HistoriedResponse 
Instance details

Defined in Network.HTTP.Client

Functor Response 
Instance details

Defined in Network.HTTP.Client.Types

Methods

fmap :: (a -> b) -> Response a -> Response b #

(<$) :: a -> Response b -> Response a #

Functor Item 
Instance details

Defined in Katip.Core

Methods

fmap :: (a -> b) -> Item a -> Item b #

(<$) :: a -> Item b -> Item a #

Functor Deque 
Instance details

Defined in Control.Lens.Internal.Deque

Methods

fmap :: (a -> b) -> Deque a -> Deque b #

(<$) :: a -> Deque b -> Deque a #

Functor ErrorFancy 
Instance details

Defined in Text.Megaparsec.Error

Methods

fmap :: (a -> b) -> ErrorFancy a -> ErrorFancy b #

(<$) :: a -> ErrorFancy b -> ErrorFancy a #

Functor ErrorItem 
Instance details

Defined in Text.Megaparsec.Error

Methods

fmap :: (a -> b) -> ErrorItem a -> ErrorItem b #

(<$) :: a -> ErrorItem b -> ErrorItem a #

Functor WithSpecTable 
Instance details

Defined in Napkin.Types.Core

Methods

fmap :: (a -> b) -> WithSpecTable a -> WithSpecTable b #

(<$) :: a -> WithSpecTable b -> WithSpecTable a #

Functor ME 
Instance details

Defined in Napkin.Render.PrettyPrint

Methods

fmap :: (a -> b) -> ME a -> ME b #

(<$) :: a -> ME b -> ME a #

Functor Q 
Instance details

Defined in Napkin.Untyped.Monad

Methods

fmap :: (a -> b) -> Q a -> Q b #

(<$) :: a -> Q b -> Q a #

Functor U 
Instance details

Defined in Napkin.Untyped.Monad

Methods

fmap :: (a -> b) -> U a -> U b #

(<$) :: a -> U b -> U a #

Functor Chunk 
Instance details

Defined in Options.Applicative.Help.Chunk

Methods

fmap :: (a -> b) -> Chunk a -> Chunk b #

(<$) :: a -> Chunk b -> Chunk a #

Functor ComplResult 
Instance details

Defined in Options.Applicative.Internal

Methods

fmap :: (a -> b) -> ComplResult a -> ComplResult b #

(<$) :: a -> ComplResult b -> ComplResult a #

Functor Completion 
Instance details

Defined in Options.Applicative.Internal

Methods

fmap :: (a -> b) -> Completion a -> Completion b #

(<$) :: a -> Completion b -> Completion a #

Functor P 
Instance details

Defined in Options.Applicative.Internal

Methods

fmap :: (a -> b) -> P a -> P b #

(<$) :: a -> P b -> P a #

Functor CReader 
Instance details

Defined in Options.Applicative.Types

Methods

fmap :: (a -> b) -> CReader a -> CReader b #

(<$) :: a -> CReader b -> CReader a #

Functor OptReader 
Instance details

Defined in Options.Applicative.Types

Methods

fmap :: (a -> b) -> OptReader a -> OptReader b #

(<$) :: a -> OptReader b -> OptReader a #

Functor Option 
Instance details

Defined in Options.Applicative.Types

Methods

fmap :: (a -> b) -> Option a -> Option b #

(<$) :: a -> Option b -> Option a #

Functor Parser 
Instance details

Defined in Options.Applicative.Types

Methods

fmap :: (a -> b) -> Parser a -> Parser b #

(<$) :: a -> Parser b -> Parser a #

Functor ParserFailure 
Instance details

Defined in Options.Applicative.Types

Methods

fmap :: (a -> b) -> ParserFailure a -> ParserFailure b #

(<$) :: a -> ParserFailure b -> ParserFailure a #

Functor ParserInfo 
Instance details

Defined in Options.Applicative.Types

Methods

fmap :: (a -> b) -> ParserInfo a -> ParserInfo b #

(<$) :: a -> ParserInfo b -> ParserInfo a #

Functor ParserM 
Instance details

Defined in Options.Applicative.Types

Methods

fmap :: (a -> b) -> ParserM a -> ParserM b #

(<$) :: a -> ParserM b -> ParserM a #

Functor ParserResult 
Instance details

Defined in Options.Applicative.Types

Methods

fmap :: (a -> b) -> ParserResult a -> ParserResult b #

(<$) :: a -> ParserResult b -> ParserResult a #

Functor ReadM 
Instance details

Defined in Options.Applicative.Types

Methods

fmap :: (a -> b) -> ReadM a -> ReadM b #

(<$) :: a -> ReadM b -> ReadM a #

Functor Conversion 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Methods

fmap :: (a -> b) -> Conversion a -> Conversion b #

(<$) :: a -> Conversion b -> Conversion a #

Functor RowParser 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Methods

fmap :: (a -> b) -> RowParser a -> RowParser b #

(<$) :: a -> RowParser b -> RowParser a #

Functor AnnotDetails 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

fmap :: (a -> b) -> AnnotDetails a -> AnnotDetails b #

(<$) :: a -> AnnotDetails b -> AnnotDetails a #

Functor Doc 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

fmap :: (a -> b) -> Doc a -> Doc b #

(<$) :: a -> Doc b -> Doc a #

Functor Span 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

fmap :: (a -> b) -> Span a -> Span b #

(<$) :: a -> Span b -> Span a #

Functor Doc

Alter the document’s annotations.

This instance makes Doc more flexible (because it can be used in Functor-polymorphic values), but fmap is much less readable compared to using reAnnotate in code that only works for Doc anyway. Consider using the latter when the type does not matter.

Instance details

Defined in Prettyprinter.Internal

Methods

fmap :: (a -> b) -> Doc a -> Doc b #

(<$) :: a -> Doc b -> Doc a #

Functor FlattenResult 
Instance details

Defined in Prettyprinter.Internal

Methods

fmap :: (a -> b) -> FlattenResult a -> FlattenResult b #

(<$) :: a -> FlattenResult b -> FlattenResult a #

Functor SimpleDocStream

Alter the document’s annotations.

This instance makes SimpleDocStream more flexible (because it can be used in Functor-polymorphic values), but fmap is much less readable compared to using reAnnotateST in code that only works for SimpleDocStream anyway. Consider using the latter when the type does not matter.

Instance details

Defined in Prettyprinter.Internal

Methods

fmap :: (a -> b) -> SimpleDocStream a -> SimpleDocStream b #

(<$) :: a -> SimpleDocStream b -> SimpleDocStream a #

Functor Array 
Instance details

Defined in Data.Primitive.Array

Methods

fmap :: (a -> b) -> Array a -> Array b #

(<$) :: a -> Array b -> Array a #

Functor SmallArray 
Instance details

Defined in Data.Primitive.SmallArray

Methods

fmap :: (a -> b) -> SmallArray a -> SmallArray b #

(<$) :: a -> SmallArray b -> SmallArray a #

Functor I 
Instance details

Defined in Data.SOP.BasicFunctors

Methods

fmap :: (a -> b) -> I a -> I b #

(<$) :: a -> I b -> I a #

Functor Maybe 
Instance details

Defined in Data.Strict.Maybe

Methods

fmap :: (a -> b) -> Maybe a -> Maybe b #

(<$) :: a -> Maybe b -> Maybe a #

Functor Q 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

fmap :: (a -> b) -> Q a -> Q b #

(<$) :: a -> Q b -> Q a #

Functor TyVarBndr 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

fmap :: (a -> b) -> TyVarBndr a -> TyVarBndr b #

(<$) :: a -> TyVarBndr b -> TyVarBndr a #

Functor Flat 
Instance details

Defined in UnliftIO.Internals.Async

Methods

fmap :: (a -> b) -> Flat a -> Flat b #

(<$) :: a -> Flat b -> Flat a #

Functor FlatApp 
Instance details

Defined in UnliftIO.Internals.Async

Methods

fmap :: (a -> b) -> FlatApp a -> FlatApp b #

(<$) :: a -> FlatApp b -> FlatApp a #

Functor Vector 
Instance details

Defined in Data.Vector

Methods

fmap :: (a -> b) -> Vector a -> Vector b #

(<$) :: a -> Vector b -> Vector a #

Functor Stream 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

fmap :: (a -> b) -> Stream a -> Stream b #

(<$) :: a -> Stream b -> Stream a #

Functor Maybe

@since base-2.01

Instance details

Defined in GHC.Internal.Base

Methods

fmap :: (a -> b) -> Maybe a -> Maybe b #

(<$) :: a -> Maybe b -> Maybe a #

Functor Solo

@since base-4.15

Instance details

Defined in GHC.Internal.Base

Methods

fmap :: (a -> b) -> Solo a -> Solo b #

(<$) :: a -> Solo b -> Solo a #

Functor []

@since base-2.01

Instance details

Defined in GHC.Internal.Base

Methods

fmap :: (a -> b) -> [a] -> [b] #

(<$) :: a -> [b] -> [a] #

Functor f => Functor (Co f) 
Instance details

Defined in Data.Functor.Rep

Methods

fmap :: (a -> b) -> Co f a -> Co f b #

(<$) :: a -> Co f b -> Co f a #

Functor (TkArray k) 
Instance details

Defined in Data.Aeson.Decoding.Tokens

Methods

fmap :: (a -> b) -> TkArray k a -> TkArray k b #

(<$) :: a -> TkArray k b -> TkArray k a #

Functor (TkRecord k) 
Instance details

Defined in Data.Aeson.Decoding.Tokens

Methods

fmap :: (a -> b) -> TkRecord k a -> TkRecord k b #

(<$) :: a -> TkRecord k b -> TkRecord k a #

Functor (Tokens k) 
Instance details

Defined in Data.Aeson.Decoding.Tokens

Methods

fmap :: (a -> b) -> Tokens k a -> Tokens k b #

(<$) :: a -> Tokens k b -> Tokens k a #

Functor (IResult i) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

fmap :: (a -> b) -> IResult i a -> IResult i b #

(<$) :: a -> IResult i b -> IResult i a #

Functor (Parser i) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

fmap :: (a -> b) -> Parser i a -> Parser i b #

(<$) :: a -> Parser i b -> Parser i a #

Monad m => Functor (WrappedMonad m)

Since: base-2.1

Instance details

Defined in Control.Applicative

Methods

fmap :: (a -> b) -> WrappedMonad m a -> WrappedMonad m b #

(<$) :: a -> WrappedMonad m b -> WrappedMonad m a #

Functor (Arg a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

fmap :: (a0 -> b) -> Arg a a0 -> Arg a b #

(<$) :: a0 -> Arg a b -> Arg a a0 #

Monad m => Functor (ZipSource m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

fmap :: (a -> b) -> ZipSource m a -> ZipSource m b #

(<$) :: a -> ZipSource m b -> ZipSource m a #

Functor (SetM s) 
Instance details

Defined in Data.Graph

Methods

fmap :: (a -> b) -> SetM s a -> SetM s b #

(<$) :: a -> SetM s b -> SetM s a #

Functor (Map k) 
Instance details

Defined in Data.Map.Internal

Methods

fmap :: (a -> b) -> Map k a -> Map k b #

(<$) :: a -> Map k b -> Map k a #

Monad m => Functor (Handler m) 
Instance details

Defined in Control.Monad.Catch

Methods

fmap :: (a -> b) -> Handler m a -> Handler m b #

(<$) :: a -> Handler m b -> Handler m a #

Monad m => Functor (CatchT m) 
Instance details

Defined in Control.Monad.Catch.Pure

Methods

fmap :: (a -> b) -> CatchT m a -> CatchT m b #

(<$) :: a -> CatchT m b -> CatchT m a #

Functor f => Functor (Cofree f) 
Instance details

Defined in Control.Comonad.Cofree

Methods

fmap :: (a -> b) -> Cofree f a -> Cofree f b #

(<$) :: a -> Cofree f b -> Cofree f a #

Functor f => Functor (Free f) 
Instance details

Defined in Control.Monad.Free

Methods

fmap :: (a -> b) -> Free f a -> Free f b #

(<$) :: a -> Free f b -> Free f a #

Functor (MaybeO ex) 
Instance details

Defined in GHC.Cmm.Dataflow.Block

Methods

fmap :: (a -> b) -> MaybeO ex a -> MaybeO ex b #

(<$) :: a -> MaybeO ex b -> MaybeO ex a #

Functor (Gr a) 
Instance details

Defined in GHC.Data.Graph.Inductive.PatriciaTree

Methods

fmap :: (a0 -> b) -> Gr a a0 -> Gr a b #

(<$) :: a0 -> Gr a b -> Gr a a0 #

Functor m => Functor (GenMap m) 
Instance details

Defined in GHC.Data.TrieMap

Methods

fmap :: (a -> b) -> GenMap m a -> GenMap m b #

(<$) :: a -> GenMap m b -> GenMap m a #

Functor m => Functor (ListMap m) 
Instance details

Defined in GHC.Data.TrieMap

Methods

fmap :: (a -> b) -> ListMap m a -> ListMap m b #

(<$) :: a -> ListMap m b -> ListMap m a #

Functor m => Functor (MaybeMap m) 
Instance details

Defined in GHC.Data.TrieMap

Methods

fmap :: (a -> b) -> MaybeMap m a -> MaybeMap m b #

(<$) :: a -> MaybeMap m b -> MaybeMap m a #

Functor (GenLocated l) 
Instance details

Defined in GHC.Types.SrcLoc

Methods

fmap :: (a -> b) -> GenLocated l a -> GenLocated l b #

(<$) :: a -> GenLocated l b -> GenLocated l a #

Functor (UniqMap k) 
Instance details

Defined in GHC.Types.Unique.Map

Methods

fmap :: (a -> b) -> UniqMap k a -> UniqMap k b #

(<$) :: a -> UniqMap k b -> UniqMap k a #

Functor (HsFieldBind lhs) 
Instance details

Defined in Language.Haskell.Syntax.Pat

Methods

fmap :: (a -> b) -> HsFieldBind lhs a -> HsFieldBind lhs b #

(<$) :: a -> HsFieldBind lhs b -> HsFieldBind lhs a #

Arrow a => Functor (ArrowMonad a)

@since base-4.6.0.0

Instance details

Defined in GHC.Internal.Control.Arrow

Methods

fmap :: (a0 -> b) -> ArrowMonad a a0 -> ArrowMonad a b #

(<$) :: a0 -> ArrowMonad a b -> ArrowMonad a a0 #

Functor (Either a)

@since base-3.0

Instance details

Defined in GHC.Internal.Data.Either

Methods

fmap :: (a0 -> b) -> Either a a0 -> Either a b #

(<$) :: a0 -> Either a b -> Either a a0 #

Functor (Proxy :: Type -> Type)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Data.Proxy

Methods

fmap :: (a -> b) -> Proxy a -> Proxy b #

(<$) :: a -> Proxy b -> Proxy a #

Functor (U1 :: Type -> Type)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

fmap :: (a -> b) -> U1 a -> U1 b #

(<$) :: a -> U1 b -> U1 a #

Functor (V1 :: Type -> Type)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

fmap :: (a -> b) -> V1 a -> V1 b #

(<$) :: a -> V1 b -> V1 a #

Functor (Yoneda f) 
Instance details

Defined in Data.Functor.Yoneda

Methods

fmap :: (a -> b) -> Yoneda f a -> Yoneda f b #

(<$) :: a -> Yoneda f b -> Yoneda f a #

Functor m => Functor (KatipT m) 
Instance details

Defined in Katip.Core

Methods

fmap :: (a -> b) -> KatipT m a -> KatipT m b #

(<$) :: a -> KatipT m b -> KatipT m a #

Functor m => Functor (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

fmap :: (a -> b) -> KatipContextT m a -> KatipContextT m b #

(<$) :: a -> KatipContextT m b -> KatipContextT m a #

Functor m => Functor (NoLoggingT m) 
Instance details

Defined in Katip.Monadic

Methods

fmap :: (a -> b) -> NoLoggingT m a -> NoLoggingT m b #

(<$) :: a -> NoLoggingT m b -> NoLoggingT m a #

Functor f => Functor (Indexing f) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

fmap :: (a -> b) -> Indexing f a -> Indexing f b #

(<$) :: a -> Indexing f b -> Indexing f a #

Functor f => Functor (Indexing64 f) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

fmap :: (a -> b) -> Indexing64 f a -> Indexing64 f b #

(<$) :: a -> Indexing64 f b -> Indexing64 f a #

Functor (Level i) 
Instance details

Defined in Control.Lens.Internal.Level

Methods

fmap :: (a -> b) -> Level i a -> Level i b #

(<$) :: a -> Level i b -> Level i a #

Functor f => Functor (First1 f) 
Instance details

Defined in Control.Lens.Lens

Methods

fmap :: (a -> b) -> First1 f a -> First1 f b #

(<$) :: a -> First1 f b -> First1 f a #

Functor (ReifiedFold s) 
Instance details

Defined in Control.Lens.Reified

Methods

fmap :: (a -> b) -> ReifiedFold s a -> ReifiedFold s b #

(<$) :: a -> ReifiedFold s b -> ReifiedFold s a #

Functor (ReifiedGetter s) 
Instance details

Defined in Control.Lens.Reified

Methods

fmap :: (a -> b) -> ReifiedGetter s a -> ReifiedGetter s b #

(<$) :: a -> ReifiedGetter s b -> ReifiedGetter s a #

Functor f => Functor (WrappedPoly f) 
Instance details

Defined in Data.MonoTraversable

Methods

fmap :: (a -> b) -> WrappedPoly f a -> WrappedPoly f b #

(<$) :: a -> WrappedPoly f b -> WrappedPoly f a #

Functor (Spec b) 
Instance details

Defined in Napkin.Spec.Types.Spec

Methods

fmap :: (a -> b0) -> Spec b a -> Spec b b0 #

(<$) :: a -> Spec b b0 -> Spec b a #

Monad m => Functor (ListT m) 
Instance details

Defined in Options.Applicative.Internal

Methods

fmap :: (a -> b) -> ListT m a -> ListT m b #

(<$) :: a -> ListT m b -> ListT m a #

Monad m => Functor (NondetT m) 
Instance details

Defined in Options.Applicative.Internal

Methods

fmap :: (a -> b) -> NondetT m a -> NondetT m b #

(<$) :: a -> NondetT m b -> NondetT m a #

Functor (OMap k)

Since: ordered-containers-0.2

Instance details

Defined in Data.Map.Ordered.Internal

Methods

fmap :: (a -> b) -> OMap k a -> OMap k b #

(<$) :: a -> OMap k b -> OMap k a #

Functor (Sem f) 
Instance details

Defined in Polysemy.Internal

Methods

fmap :: (a -> b) -> Sem f a -> Sem f b #

(<$) :: a -> Sem f b -> Sem f a #

Functor m => Functor (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

fmap :: (a -> b) -> ResourceT m a -> ResourceT m b #

(<$) :: a -> ResourceT m b -> ResourceT m a #

Functor (RIO env) 
Instance details

Defined in RIO.Prelude.RIO

Methods

fmap :: (a -> b) -> RIO env a -> RIO env b #

(<$) :: a -> RIO env b -> RIO env a #

Functor m => Functor (ActionT m) 
Instance details

Defined in Web.Scotty.Internal.Types

Methods

fmap :: (a -> b) -> ActionT m a -> ActionT m b #

(<$) :: a -> ActionT m b -> ActionT m a #

Functor (ScottyT m) 
Instance details

Defined in Web.Scotty.Internal.Types

Methods

fmap :: (a -> b) -> ScottyT m a -> ScottyT m b #

(<$) :: a -> ScottyT m b -> ScottyT m a #

Functor (Either a) 
Instance details

Defined in Data.Strict.Either

Methods

fmap :: (a0 -> b) -> Either a a0 -> Either a b #

(<$) :: a0 -> Either a b -> Either a a0 #

Functor (These a) 
Instance details

Defined in Data.Strict.These

Methods

fmap :: (a0 -> b) -> These a a0 -> These a b #

(<$) :: a0 -> These a b -> These a a0 #

Functor (Pair e) 
Instance details

Defined in Data.Strict.Tuple

Methods

fmap :: (a -> b) -> Pair e a -> Pair e b #

(<$) :: a -> Pair e b -> Pair e a #

Functor (IParser t) 
Instance details

Defined in Data.Text.Internal.Read

Methods

fmap :: (a -> b) -> IParser t a -> IParser t b #

(<$) :: a -> IParser t b -> IParser t a #

Functor (These a) 
Instance details

Defined in Data.These

Methods

fmap :: (a0 -> b) -> These a a0 -> These a b #

(<$) :: a0 -> These a b -> These a a0 #

Functor f => Functor (Lift f) 
Instance details

Defined in Control.Applicative.Lift

Methods

fmap :: (a -> b) -> Lift f a -> Lift f b #

(<$) :: a -> Lift f b -> Lift f a #

Functor m => Functor (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

fmap :: (a -> b) -> MaybeT m a -> MaybeT m b #

(<$) :: a -> MaybeT m b -> MaybeT m a #

Functor m => Functor (Conc m) 
Instance details

Defined in UnliftIO.Internals.Async

Methods

fmap :: (a -> b) -> Conc m a -> Conc m b #

(<$) :: a -> Conc m b -> Conc m a #

Monad m => Functor (Concurrently m)

Since: unliftio-0.1.0.0

Instance details

Defined in UnliftIO.Internals.Async

Methods

fmap :: (a -> b) -> Concurrently m a -> Concurrently m b #

(<$) :: a -> Concurrently m b -> Concurrently m a #

Functor (HashMap k) 
Instance details

Defined in Data.HashMap.Internal

Methods

fmap :: (a -> b) -> HashMap k a -> HashMap k b #

(<$) :: a -> HashMap k b -> HashMap k a #

Functor ((,) a)

@since base-2.01

Instance details

Defined in GHC.Internal.Base

Methods

fmap :: (a0 -> b) -> (a, a0) -> (a, b) #

(<$) :: a0 -> (a, b) -> (a, a0) #

Arrow a => Functor (WrappedArrow a b)

Since: base-2.1

Instance details

Defined in Control.Applicative

Methods

fmap :: (a0 -> b0) -> WrappedArrow a b a0 -> WrappedArrow a b b0 #

(<$) :: a0 -> WrappedArrow a b b0 -> WrappedArrow a b a0 #

Bifunctor p => Functor (Fix p) 
Instance details

Defined in Data.Bifunctor.Fix

Methods

fmap :: (a -> b) -> Fix p a -> Fix p b #

(<$) :: a -> Fix p b -> Fix p a #

Bifunctor p => Functor (Join p) 
Instance details

Defined in Data.Bifunctor.Join

Methods

fmap :: (a -> b) -> Join p a -> Join p b #

(<$) :: a -> Join p b -> Join p a #

Monad m => Functor (ZipSink i m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

fmap :: (a -> b) -> ZipSink i m a -> ZipSink i m b #

(<$) :: a -> ZipSink i m b -> ZipSink i m a #

(Applicative f, Monad f) => Functor (WhenMissing f x)

Since: containers-0.5.9

Instance details

Defined in Data.IntMap.Internal

Methods

fmap :: (a -> b) -> WhenMissing f x a -> WhenMissing f x b #

(<$) :: a -> WhenMissing f x b -> WhenMissing f x a #

Functor f => Functor (CofreeF f a) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

fmap :: (a0 -> b) -> CofreeF f a a0 -> CofreeF f a b #

(<$) :: a0 -> CofreeF f a b -> CofreeF f a a0 #

(Functor f, Functor w) => Functor (CofreeT f w) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

fmap :: (a -> b) -> CofreeT f w a -> CofreeT f w b #

(<$) :: a -> CofreeT f w b -> CofreeT f w a #

Functor f => Functor (FreeF f a) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

fmap :: (a0 -> b) -> FreeF f a a0 -> FreeF f a b #

(<$) :: a0 -> FreeF f a b -> FreeF f a a0 #

(Functor f, Functor m) => Functor (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

fmap :: (a -> b) -> FreeT f m a -> FreeT f m b #

(<$) :: a -> FreeT f m b -> FreeT f m a #

(Applicative f, Monad f) => Functor (WhenMissing f x)

Since: ghc-0.5.9

Instance details

Defined in GHC.Data.Word64Map.Internal

Methods

fmap :: (a -> b) -> WhenMissing f x a -> WhenMissing f x b #

(<$) :: a -> WhenMissing f x b -> WhenMissing f x a #

Functor m => Functor (Kleisli m a)

@since base-4.14.0.0

Instance details

Defined in GHC.Internal.Control.Arrow

Methods

fmap :: (a0 -> b) -> Kleisli m a a0 -> Kleisli m a b #

(<$) :: a0 -> Kleisli m a b -> Kleisli m a a0 #

Functor (Const m :: Type -> Type)

@since base-2.01

Instance details

Defined in GHC.Internal.Data.Functor.Const

Methods

fmap :: (a -> b) -> Const m a -> Const m b #

(<$) :: a -> Const m b -> Const m a #

Functor f => Functor (Ap f)

@since base-4.12.0.0

Instance details

Defined in GHC.Internal.Data.Monoid

Methods

fmap :: (a -> b) -> Ap f a -> Ap f b #

(<$) :: a -> Ap f b -> Ap f a #

Functor f => Functor (Alt f)

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

fmap :: (a -> b) -> Alt f a -> Alt f b #

(<$) :: a -> Alt f b -> Alt f a #

(Generic1 f, Functor (Rep1 f)) => Functor (Generically1 f)

@since base-4.17.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

fmap :: (a -> b) -> Generically1 f a -> Generically1 f b #

(<$) :: a -> Generically1 f b -> Generically1 f a #

Functor f => Functor (Rec1 f)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

fmap :: (a -> b) -> Rec1 f a -> Rec1 f b #

(<$) :: a -> Rec1 f b -> Rec1 f a #

Functor (URec (Ptr ()) :: Type -> Type)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

fmap :: (a -> b) -> URec (Ptr ()) a -> URec (Ptr ()) b #

(<$) :: a -> URec (Ptr ()) b -> URec (Ptr ()) a #

Functor (URec Char :: Type -> Type)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

fmap :: (a -> b) -> URec Char a -> URec Char b #

(<$) :: a -> URec Char b -> URec Char a #

Functor (URec Double :: Type -> Type)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

fmap :: (a -> b) -> URec Double a -> URec Double b #

(<$) :: a -> URec Double b -> URec Double a #

Functor (URec Float :: Type -> Type)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

fmap :: (a -> b) -> URec Float a -> URec Float b #

(<$) :: a -> URec Float b -> URec Float a #

Functor (URec Int :: Type -> Type)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

fmap :: (a -> b) -> URec Int a -> URec Int b #

(<$) :: a -> URec Int b -> URec Int a #

Functor (URec Word :: Type -> Type)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

fmap :: (a -> b) -> URec Word a -> URec Word b #

(<$) :: a -> URec Word b -> URec Word a #

Functor f => Functor (Indexing f) 
Instance details

Defined in WithIndex

Methods

fmap :: (a -> b) -> Indexing f a -> Indexing f b #

(<$) :: a -> Indexing f b -> Indexing f a #

Functor (Day f g) 
Instance details

Defined in Data.Functor.Day

Methods

fmap :: (a -> b) -> Day f g a -> Day f g b #

(<$) :: a -> Day f g b -> Day f g a #

Functor (Context a b) 
Instance details

Defined in Control.Lens.Internal.Context

Methods

fmap :: (a0 -> b0) -> Context a b a0 -> Context a b b0 #

(<$) :: a0 -> Context a b b0 -> Context a b a0 #

Functor f => Functor (AlongsideLeft f b) 
Instance details

Defined in Control.Lens.Internal.Getter

Methods

fmap :: (a -> b0) -> AlongsideLeft f b a -> AlongsideLeft f b b0 #

(<$) :: a -> AlongsideLeft f b b0 -> AlongsideLeft f b a #

Functor f => Functor (AlongsideRight f a) 
Instance details

Defined in Control.Lens.Internal.Getter

Methods

fmap :: (a0 -> b) -> AlongsideRight f a a0 -> AlongsideRight f a b #

(<$) :: a0 -> AlongsideRight f a b -> AlongsideRight f a a0 #

Functor (Indexed i a) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

fmap :: (a0 -> b) -> Indexed i a a0 -> Indexed i a b #

(<$) :: a0 -> Indexed i a b -> Indexed i a a0 #

Functor (Flows i b) 
Instance details

Defined in Control.Lens.Internal.Level

Methods

fmap :: (a -> b0) -> Flows i b a -> Flows i b b0 #

(<$) :: a -> Flows i b b0 -> Flows i b a #

Functor (Mafic a b) 
Instance details

Defined in Control.Lens.Internal.Magma

Methods

fmap :: (a0 -> b0) -> Mafic a b a0 -> Mafic a b b0 #

(<$) :: a0 -> Mafic a b b0 -> Mafic a b a0 #

Functor (Effect m r) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

fmap :: (a -> b) -> Effect m r a -> Effect m r b #

(<$) :: a -> Effect m r b -> Effect m r a #

Monad m => Functor (Focusing m s) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

fmap :: (a -> b) -> Focusing m s a -> Focusing m s b #

(<$) :: a -> Focusing m s b -> Focusing m s a #

Functor (k (May s)) => Functor (FocusingMay k s) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

fmap :: (a -> b) -> FocusingMay k s a -> FocusingMay k s b #

(<$) :: a -> FocusingMay k s b -> FocusingMay k s a #

Functor (ReifiedIndexedFold i s) 
Instance details

Defined in Control.Lens.Reified

Methods

fmap :: (a -> b) -> ReifiedIndexedFold i s a -> ReifiedIndexedFold i s b #

(<$) :: a -> ReifiedIndexedFold i s b -> ReifiedIndexedFold i s a #

Functor (ReifiedIndexedGetter i s) 
Instance details

Defined in Control.Lens.Reified

Methods

fmap :: (a -> b) -> ReifiedIndexedGetter i s a -> ReifiedIndexedGetter i s b #

(<$) :: a -> ReifiedIndexedGetter i s b -> ReifiedIndexedGetter i s a #

Functor (Holes t m) 
Instance details

Defined in Control.Lens.Traversal

Methods

fmap :: (a -> b) -> Holes t m a -> Holes t m b #

(<$) :: a -> Holes t m b -> Holes t m a #

Monad m => Functor (Handler e m) 
Instance details

Defined in Control.Monad.Error.Lens

Methods

fmap :: (a -> b) -> Handler e m a -> Handler e m b #

(<$) :: a -> Handler e m b -> Handler e m a #

Functor (Effect m r) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

fmap :: (a -> b) -> Effect m r a -> Effect m r b #

(<$) :: a -> Effect m r b -> Effect m r a #

Monad m => Functor (Focusing m s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

fmap :: (a -> b) -> Focusing m s a -> Focusing m s b #

(<$) :: a -> Focusing m s b -> Focusing m s a #

Functor (k (May s)) => Functor (FocusingMay k s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

fmap :: (a -> b) -> FocusingMay k s a -> FocusingMay k s b #

(<$) :: a -> FocusingMay k s b -> FocusingMay k s a #

Functor (t m) => Functor (LiftingAccum t m)

Since: mtl-2.3

Instance details

Defined in Control.Monad.Accum

Methods

fmap :: (a -> b) -> LiftingAccum t m a -> LiftingAccum t m b #

(<$) :: a -> LiftingAccum t m b -> LiftingAccum t m a #

Functor (t m) => Functor (LiftingSelect t m)

Since: mtl-2.3

Instance details

Defined in Control.Monad.Select

Methods

fmap :: (a -> b) -> LiftingSelect t m a -> LiftingSelect t m b #

(<$) :: a -> LiftingSelect t m b -> LiftingSelect t m a #

Functor (Union r mWoven) 
Instance details

Defined in Polysemy.Internal.Union

Methods

fmap :: (a -> b) -> Union r mWoven a -> Union r mWoven b #

(<$) :: a -> Union r mWoven b -> Union r mWoven a #

Functor (Weaving e m) 
Instance details

Defined in Polysemy.Internal.Union

Methods

fmap :: (a -> b) -> Weaving e m a -> Weaving e m b #

(<$) :: a -> Weaving e m b -> Weaving e m a #

Functor (NonDetC m) 
Instance details

Defined in Polysemy.NonDet

Methods

fmap :: (a -> b) -> NonDetC m a -> NonDetC m b #

(<$) :: a -> NonDetC m b -> NonDetC m a #

Functor (CopastroSum p a) 
Instance details

Defined in Data.Profunctor.Choice

Methods

fmap :: (a0 -> b) -> CopastroSum p a a0 -> CopastroSum p a b #

(<$) :: a0 -> CopastroSum p a b -> CopastroSum p a a0 #

Functor (CotambaraSum p a) 
Instance details

Defined in Data.Profunctor.Choice

Methods

fmap :: (a0 -> b) -> CotambaraSum p a a0 -> CotambaraSum p a b #

(<$) :: a0 -> CotambaraSum p a b -> CotambaraSum p a a0 #

Functor (PastroSum p a) 
Instance details

Defined in Data.Profunctor.Choice

Methods

fmap :: (a0 -> b) -> PastroSum p a a0 -> PastroSum p a b #

(<$) :: a0 -> PastroSum p a b -> PastroSum p a a0 #

Profunctor p => Functor (TambaraSum p a) 
Instance details

Defined in Data.Profunctor.Choice

Methods

fmap :: (a0 -> b) -> TambaraSum p a a0 -> TambaraSum p a b #

(<$) :: a0 -> TambaraSum p a b -> TambaraSum p a a0 #

Profunctor p => Functor (Coprep p) 
Instance details

Defined in Data.Profunctor.Rep

Methods

fmap :: (a -> b) -> Coprep p a -> Coprep p b #

(<$) :: a -> Coprep p b -> Coprep p a #

Profunctor p => Functor (Prep p) 
Instance details

Defined in Data.Profunctor.Rep

Methods

fmap :: (a -> b) -> Prep p a -> Prep p b #

(<$) :: a -> Prep p b -> Prep p a #

Functor (K a :: Type -> Type) 
Instance details

Defined in Data.SOP.BasicFunctors

Methods

fmap :: (a0 -> b) -> K a a0 -> K a b #

(<$) :: a0 -> K a b -> K a a0 #

Functor (Tagged s) 
Instance details

Defined in Data.Tagged

Methods

fmap :: (a -> b) -> Tagged s a -> Tagged s b #

(<$) :: a -> Tagged s b -> Tagged s a #

(Functor f, Functor g) => Functor (These1 f g) 
Instance details

Defined in Data.Functor.These

Methods

fmap :: (a -> b) -> These1 f g a -> These1 f g b #

(<$) :: a -> These1 f g b -> These1 f g a #

Functor f => Functor (Backwards f)

Derived instance.

Instance details

Defined in Control.Applicative.Backwards

Methods

fmap :: (a -> b) -> Backwards f a -> Backwards f b #

(<$) :: a -> Backwards f b -> Backwards f a #

Functor m => Functor (AccumT w m) 
Instance details

Defined in Control.Monad.Trans.Accum

Methods

fmap :: (a -> b) -> AccumT w m a -> AccumT w m b #

(<$) :: a -> AccumT w m b -> AccumT w m a #

Functor m => Functor (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

fmap :: (a -> b) -> ExceptT e m a -> ExceptT e m b #

(<$) :: a -> ExceptT e m b -> ExceptT e m a #

Functor m => Functor (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

fmap :: (a -> b) -> IdentityT m a -> IdentityT m b #

(<$) :: a -> IdentityT m b -> IdentityT m a #

Functor m => Functor (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

fmap :: (a -> b) -> ReaderT r m a -> ReaderT r m b #

(<$) :: a -> ReaderT r m b -> ReaderT r m a #

Functor m => Functor (SelectT r m) 
Instance details

Defined in Control.Monad.Trans.Select

Methods

fmap :: (a -> b) -> SelectT r m a -> SelectT r m b #

(<$) :: a -> SelectT r m b -> SelectT r m a #

Functor m => Functor (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Lazy

Methods

fmap :: (a -> b) -> StateT s m a -> StateT s m b #

(<$) :: a -> StateT s m b -> StateT s m a #

Functor m => Functor (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

fmap :: (a -> b) -> StateT s m a -> StateT s m b #

(<$) :: a -> StateT s m b -> StateT s m a #

Functor m => Functor (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.CPS

Methods

fmap :: (a -> b) -> WriterT w m a -> WriterT w m b #

(<$) :: a -> WriterT w m b -> WriterT w m a #

Functor m => Functor (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

fmap :: (a -> b) -> WriterT w m a -> WriterT w m b #

(<$) :: a -> WriterT w m b -> WriterT w m a #

Functor m => Functor (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

fmap :: (a -> b) -> WriterT w m a -> WriterT w m b #

(<$) :: a -> WriterT w m b -> WriterT w m a #

Functor (Constant a :: Type -> Type) 
Instance details

Defined in Data.Functor.Constant

Methods

fmap :: (a0 -> b) -> Constant a a0 -> Constant a b #

(<$) :: a0 -> Constant a b -> Constant a a0 #

Functor f => Functor (Reverse f)

Derived instance.

Instance details

Defined in Data.Functor.Reverse

Methods

fmap :: (a -> b) -> Reverse f a -> Reverse f b #

(<$) :: a -> Reverse f b -> Reverse f a #

Functor ((,,) a b)

@since base-4.14.0.0

Instance details

Defined in GHC.Internal.Base

Methods

fmap :: (a0 -> b0) -> (a, b, a0) -> (a, b, b0) #

(<$) :: a0 -> (a, b, b0) -> (a, b, a0) #

(Functor f, Functor g) => Functor (Product f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Product

Methods

fmap :: (a -> b) -> Product f g a -> Product f g b #

(<$) :: a -> Product f g b -> Product f g a #

(Functor f, Functor g) => Functor (Sum f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Sum

Methods

fmap :: (a -> b) -> Sum f g a -> Sum f g b #

(<$) :: a -> Sum f g b -> Sum f g a #

Functor (ConduitT i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

fmap :: (a -> b) -> ConduitT i o m a -> ConduitT i o m b #

(<$) :: a -> ConduitT i o m b -> ConduitT i o m a #

Functor (ZipConduit i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

fmap :: (a -> b) -> ZipConduit i o m a -> ZipConduit i o m b #

(<$) :: a -> ZipConduit i o m b -> ZipConduit i o m a #

Functor f => Functor (WhenMatched f x y)

Since: containers-0.5.9

Instance details

Defined in Data.IntMap.Internal

Methods

fmap :: (a -> b) -> WhenMatched f x y a -> WhenMatched f x y b #

(<$) :: a -> WhenMatched f x y b -> WhenMatched f x y a #

(Applicative f, Monad f) => Functor (WhenMissing f k x)

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

fmap :: (a -> b) -> WhenMissing f k x a -> WhenMissing f k x b #

(<$) :: a -> WhenMissing f k x b -> WhenMissing f k x a #

Functor (Exchange a b s) 
Instance details

Defined in Data.Generics.Internal.VL.Iso

Methods

fmap :: (a0 -> b0) -> Exchange a b s a0 -> Exchange a b s b0 #

(<$) :: a0 -> Exchange a b s b0 -> Exchange a b s a0 #

Functor (Market a b s) 
Instance details

Defined in Data.Generics.Internal.VL.Prism

Methods

fmap :: (a0 -> b0) -> Market a b s a0 -> Market a b s b0 #

(<$) :: a0 -> Market a b s b0 -> Market a b s a0 #

Functor f => Functor (WhenMatched f x y)

Since: ghc-0.5.9

Instance details

Defined in GHC.Data.Word64Map.Internal

Methods

fmap :: (a -> b) -> WhenMatched f x y a -> WhenMatched f x y b #

(<$) :: a -> WhenMatched f x y b -> WhenMatched f x y a #

(Functor f, Functor g) => Functor (f :*: g)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

fmap :: (a -> b) -> (f :*: g) a -> (f :*: g) b #

(<$) :: a -> (f :*: g) b -> (f :*: g) a #

(Functor f, Functor g) => Functor (f :+: g)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

fmap :: (a -> b) -> (f :+: g) a -> (f :+: g) b #

(<$) :: a -> (f :+: g) b -> (f :+: g) a #

Functor (K1 i c :: Type -> Type)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

fmap :: (a -> b) -> K1 i c a -> K1 i c b #

(<$) :: a -> K1 i c b -> K1 i c a #

Functor (Bazaar p a b) 
Instance details

Defined in Control.Lens.Internal.Bazaar

Methods

fmap :: (a0 -> b0) -> Bazaar p a b a0 -> Bazaar p a b b0 #

(<$) :: a0 -> Bazaar p a b b0 -> Bazaar p a b a0 #

Functor (Bazaar1 p a b) 
Instance details

Defined in Control.Lens.Internal.Bazaar

Methods

fmap :: (a0 -> b0) -> Bazaar1 p a b a0 -> Bazaar1 p a b b0 #

(<$) :: a0 -> Bazaar1 p a b b0 -> Bazaar1 p a b a0 #

Functor (Pretext p a b) 
Instance details

Defined in Control.Lens.Internal.Context

Methods

fmap :: (a0 -> b0) -> Pretext p a b a0 -> Pretext p a b b0 #

(<$) :: a0 -> Pretext p a b b0 -> Pretext p a b a0 #

Functor (Exchange a b s) 
Instance details

Defined in Control.Lens.Internal.Iso

Methods

fmap :: (a0 -> b0) -> Exchange a b s a0 -> Exchange a b s b0 #

(<$) :: a0 -> Exchange a b s b0 -> Exchange a b s a0 #

Functor (Magma i t b) 
Instance details

Defined in Control.Lens.Internal.Magma

Methods

fmap :: (a -> b0) -> Magma i t b a -> Magma i t b b0 #

(<$) :: a -> Magma i t b b0 -> Magma i t b a #

Functor (Molten i a b) 
Instance details

Defined in Control.Lens.Internal.Magma

Methods

fmap :: (a0 -> b0) -> Molten i a b a0 -> Molten i a b b0 #

(<$) :: a0 -> Molten i a b b0 -> Molten i a b a0 #

Functor (Market a b s) 
Instance details

Defined in Control.Lens.Internal.Prism

Methods

fmap :: (a0 -> b0) -> Market a b s a0 -> Market a b s b0 #

(<$) :: a0 -> Market a b s b0 -> Market a b s a0 #

Functor (k (Err e s)) => Functor (FocusingErr e k s) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

fmap :: (a -> b) -> FocusingErr e k s a -> FocusingErr e k s b #

(<$) :: a -> FocusingErr e k s b -> FocusingErr e k s a #

Functor (k (f s)) => Functor (FocusingOn f k s) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

fmap :: (a -> b) -> FocusingOn f k s a -> FocusingOn f k s b #

(<$) :: a -> FocusingOn f k s b -> FocusingOn f k s a #

Functor (k (s, w)) => Functor (FocusingPlus w k s) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

fmap :: (a -> b) -> FocusingPlus w k s a -> FocusingPlus w k s b #

(<$) :: a -> FocusingPlus w k s b -> FocusingPlus w k s a #

Monad m => Functor (FocusingWith w m s) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

fmap :: (a -> b) -> FocusingWith w m s a -> FocusingWith w m s b #

(<$) :: a -> FocusingWith w m s b -> FocusingWith w m s a #

Functor (k (Err e s)) => Functor (FocusingErr e k s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

fmap :: (a -> b) -> FocusingErr e k s a -> FocusingErr e k s b #

(<$) :: a -> FocusingErr e k s b -> FocusingErr e k s a #

Functor (k (f s)) => Functor (FocusingOn f k s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

fmap :: (a -> b) -> FocusingOn f k s a -> FocusingOn f k s b #

(<$) :: a -> FocusingOn f k s b -> FocusingOn f k s a #

Functor (k (s, w)) => Functor (FocusingPlus w k s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

fmap :: (a -> b) -> FocusingPlus w k s a -> FocusingPlus w k s b #

(<$) :: a -> FocusingPlus w k s b -> FocusingPlus w k s a #

Monad m => Functor (FocusingWith w m s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

fmap :: (a -> b) -> FocusingWith w m s a -> FocusingWith w m s b #

(<$) :: a -> FocusingWith w m s b -> FocusingWith w m s a #

Functor (ContT r m) 
Instance details

Defined in Control.Monad.Trans.Cont

Methods

fmap :: (a -> b) -> ContT r m a -> ContT r m b #

(<$) :: a -> ContT r m b -> ContT r m a #

Functor ((,,,) a b c)

@since base-4.14.0.0

Instance details

Defined in GHC.Internal.Base

Methods

fmap :: (a0 -> b0) -> (a, b, c, a0) -> (a, b, c, b0) #

(<$) :: a0 -> (a, b, c, b0) -> (a, b, c, a0) #

Functor ((->) r)

@since base-2.01

Instance details

Defined in GHC.Internal.Base

Methods

fmap :: (a -> b) -> (r -> a) -> r -> b #

(<$) :: a -> (r -> b) -> r -> a #

(Functor f, Functor g) => Functor (Compose f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Compose

Methods

fmap :: (a -> b) -> Compose f g a -> Compose f g b #

(<$) :: a -> Compose f g b -> Compose f g a #

Functor (Clown f a :: Type -> Type) 
Instance details

Defined in Data.Bifunctor.Clown

Methods

fmap :: (a0 -> b) -> Clown f a a0 -> Clown f a b #

(<$) :: a0 -> Clown f a b -> Clown f a a0 #

Bifunctor p => Functor (Flip p a) 
Instance details

Defined in Data.Bifunctor.Flip

Methods

fmap :: (a0 -> b) -> Flip p a a0 -> Flip p a b #

(<$) :: a0 -> Flip p a b -> Flip p a a0 #

Functor g => Functor (Joker g a) 
Instance details

Defined in Data.Bifunctor.Joker

Methods

fmap :: (a0 -> b) -> Joker g a a0 -> Joker g a b #

(<$) :: a0 -> Joker g a b -> Joker g a a0 #

Bifunctor p => Functor (WrappedBifunctor p a) 
Instance details

Defined in Data.Bifunctor.Wrapped

Methods

fmap :: (a0 -> b) -> WrappedBifunctor p a a0 -> WrappedBifunctor p a b #

(<$) :: a0 -> WrappedBifunctor p a b -> WrappedBifunctor p a a0 #

Functor f => Functor (WhenMatched f k x y)

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

fmap :: (a -> b) -> WhenMatched f k x y a -> WhenMatched f k x y b #

(<$) :: a -> WhenMatched f k x y b -> WhenMatched f k x y a #

(Functor f, Functor g) => Functor (f :.: g)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

fmap :: (a -> b) -> (f :.: g) a -> (f :.: g) b #

(<$) :: a -> (f :.: g) b -> (f :.: g) a #

Functor f => Functor (M1 i c f)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

fmap :: (a -> b) -> M1 i c f a -> M1 i c f b #

(<$) :: a -> M1 i c f b -> M1 i c f a #

Functor (BazaarT p g a b) 
Instance details

Defined in Control.Lens.Internal.Bazaar

Methods

fmap :: (a0 -> b0) -> BazaarT p g a b a0 -> BazaarT p g a b b0 #

(<$) :: a0 -> BazaarT p g a b b0 -> BazaarT p g a b a0 #

Functor (BazaarT1 p g a b) 
Instance details

Defined in Control.Lens.Internal.Bazaar

Methods

fmap :: (a0 -> b0) -> BazaarT1 p g a b a0 -> BazaarT1 p g a b b0 #

(<$) :: a0 -> BazaarT1 p g a b b0 -> BazaarT1 p g a b a0 #

Functor (PretextT p g a b) 
Instance details

Defined in Control.Lens.Internal.Context

Methods

fmap :: (a0 -> b0) -> PretextT p g a b a0 -> PretextT p g a b b0 #

(<$) :: a0 -> PretextT p g a b b0 -> PretextT p g a b a0 #

Functor (TakingWhile p f a b) 
Instance details

Defined in Control.Lens.Internal.Magma

Methods

fmap :: (a0 -> b0) -> TakingWhile p f a b a0 -> TakingWhile p f a b b0 #

(<$) :: a0 -> TakingWhile p f a b b0 -> TakingWhile p f a b a0 #

Functor (EffectRWS w st m s) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

fmap :: (a -> b) -> EffectRWS w st m s a -> EffectRWS w st m s b #

(<$) :: a -> EffectRWS w st m s b -> EffectRWS w st m s a #

Functor (k (Freed f m s)) => Functor (FocusingFree f m k s) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

fmap :: (a -> b) -> FocusingFree f m k s a -> FocusingFree f m k s b #

(<$) :: a -> FocusingFree f m k s b -> FocusingFree f m k s a #

Functor (EffectRWS w st m s) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

fmap :: (a -> b) -> EffectRWS w st m s a -> EffectRWS w st m s b #

(<$) :: a -> EffectRWS w st m s b -> EffectRWS w st m s a #

Reifies s (ReifiedApplicative f) => Functor (ReflectedApplicative f s) 
Instance details

Defined in Data.Reflection

Methods

fmap :: (a -> b) -> ReflectedApplicative f s a -> ReflectedApplicative f s b #

(<$) :: a -> ReflectedApplicative f s b -> ReflectedApplicative f s a #

(Functor f, Functor g) => Functor (f :.: g) 
Instance details

Defined in Data.SOP.BasicFunctors

Methods

fmap :: (a -> b) -> (f :.: g) a -> (f :.: g) b #

(<$) :: a -> (f :.: g) b -> (f :.: g) a #

Functor m => Functor (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.CPS

Methods

fmap :: (a -> b) -> RWST r w s m a -> RWST r w s m b #

(<$) :: a -> RWST r w s m b -> RWST r w s m a #

Functor m => Functor (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.Lazy

Methods

fmap :: (a -> b) -> RWST r w s m a -> RWST r w s m b #

(<$) :: a -> RWST r w s m b -> RWST r w s m a #

Functor m => Functor (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.Strict

Methods

fmap :: (a -> b) -> RWST r w s m a -> RWST r w s m b #

(<$) :: a -> RWST r w s m b -> RWST r w s m a #

Functor ((,,,,) a b c d)

@since base-4.18.0.0

Instance details

Defined in GHC.Internal.Base

Methods

fmap :: (a0 -> b0) -> (a, b, c, d, a0) -> (a, b, c, d, b0) #

(<$) :: a0 -> (a, b, c, d, b0) -> (a, b, c, d, a0) #

Monad state => Functor (Builder collection mutCollection step state err) 
Instance details

Defined in Basement.MutableBuilder

Methods

fmap :: (a -> b) -> Builder collection mutCollection step state err a -> Builder collection mutCollection step state err b #

(<$) :: a -> Builder collection mutCollection step state err b -> Builder collection mutCollection step state err a #

(Functor (f a), Functor (g a)) => Functor (Product f g a) 
Instance details

Defined in Data.Bifunctor.Product

Methods

fmap :: (a0 -> b) -> Product f g a a0 -> Product f g a b #

(<$) :: a0 -> Product f g a b -> Product f g a a0 #

(Functor (f a), Functor (g a)) => Functor (Sum f g a) 
Instance details

Defined in Data.Bifunctor.Sum

Methods

fmap :: (a0 -> b) -> Sum f g a a0 -> Sum f g a b #

(<$) :: a0 -> Sum f g a b -> Sum f g a a0 #

Monad m => Functor (Pipe l i o u m) 
Instance details

Defined in Data.Conduit.Internal.Pipe

Methods

fmap :: (a -> b) -> Pipe l i o u m a -> Pipe l i o u m b #

(<$) :: a -> Pipe l i o u m b -> Pipe l i o u m a #

Functor ((,,,,,) a b c d e)

@since base-4.18.0.0

Instance details

Defined in GHC.Internal.Base

Methods

fmap :: (a0 -> b0) -> (a, b, c, d, e, a0) -> (a, b, c, d, e, b0) #

(<$) :: a0 -> (a, b, c, d, e, b0) -> (a, b, c, d, e, a0) #

(Functor f, Bifunctor p) => Functor (Tannen f p a) 
Instance details

Defined in Data.Bifunctor.Tannen

Methods

fmap :: (a0 -> b) -> Tannen f p a a0 -> Tannen f p a b #

(<$) :: a0 -> Tannen f p a b -> Tannen f p a a0 #

Profunctor p => Functor (Procompose p q a) 
Instance details

Defined in Data.Profunctor.Composition

Methods

fmap :: (a0 -> b) -> Procompose p q a a0 -> Procompose p q a b #

(<$) :: a0 -> Procompose p q a b -> Procompose p q a a0 #

Profunctor p => Functor (Rift p q a) 
Instance details

Defined in Data.Profunctor.Composition

Methods

fmap :: (a0 -> b) -> Rift p q a a0 -> Rift p q a b #

(<$) :: a0 -> Rift p q a b -> Rift p q a a0 #

Functor ((,,,,,,) a b c d e f)

@since base-4.18.0.0

Instance details

Defined in GHC.Internal.Base

Methods

fmap :: (a0 -> b0) -> (a, b, c, d, e, f, a0) -> (a, b, c, d, e, f, b0) #

(<$) :: a0 -> (a, b, c, d, e, f, b0) -> (a, b, c, d, e, f, a0) #

(Bifunctor p, Functor g) => Functor (Biff p f g a) 
Instance details

Defined in Data.Bifunctor.Biff

Methods

fmap :: (a0 -> b) -> Biff p f g a a0 -> Biff p f g a b #

(<$) :: a0 -> Biff p f g a b -> Biff p f g a a0 #

class Applicative m => Monad (m :: Type -> Type) where #

The Monad class defines the basic operations over a monad, a concept from a branch of mathematics known as category theory. From the perspective of a Haskell programmer, however, it is best to think of a monad as an abstract datatype of actions. Haskell's do expressions provide a convenient syntax for writing monadic expressions.

Instances of Monad should satisfy the following:

Left identity
return a >>= k = k a
Right identity
m >>= return = m
Associativity
m >>= (\x -> k x >>= h) = (m >>= k) >>= h

Furthermore, the Monad and Applicative operations should relate as follows:

The above laws imply:

and that pure and (<*>) satisfy the applicative functor laws.

The instances of Monad for List, Maybe and IO defined in the Prelude satisfy these laws.

Minimal complete definition

(>>=)

Methods

(>>=) :: m a -> (a -> m b) -> m b infixl 1 #

Sequentially compose two actions, passing any value produced by the first as an argument to the second.

'as >>= bs' can be understood as the do expression

do a <- as
   bs a

An alternative name for this function is 'bind', but some people may refer to it as 'flatMap', which results from it being equivialent to

\x f -> join (fmap f x) :: Monad m => m a -> (a -> m b) -> m b

which can be seen as mapping a value with Monad m => m a -> m (m b) and then 'flattening' m (m b) to m b using join.

(>>) :: m a -> m b -> m b infixl 1 #

Sequentially compose two actions, discarding any value produced by the first, like sequencing operators (such as the semicolon) in imperative languages.

'as >> bs' can be understood as the do expression

do as
   bs

or in terms of (>>=) as

as >>= const bs

return :: a -> m a #

Inject a value into the monadic type. This function should not be different from its default implementation as pure. The justification for the existence of this function is merely historic.

Instances

Instances details
Monad IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

(>>=) :: IResult a -> (a -> IResult b) -> IResult b #

(>>) :: IResult a -> IResult b -> IResult b #

return :: a -> IResult a #

Monad Parser 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

(>>=) :: Parser a -> (a -> Parser b) -> Parser b #

(>>) :: Parser a -> Parser b -> Parser b #

return :: a -> Parser a #

Monad Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

(>>=) :: Result a -> (a -> Result b) -> Result b #

(>>) :: Result a -> Result b -> Result b #

return :: a -> Result a #

Monad Complex

Since: base-4.9.0.0

Instance details

Defined in Data.Complex

Methods

(>>=) :: Complex a -> (a -> Complex b) -> Complex b #

(>>) :: Complex a -> Complex b -> Complex b #

return :: a -> Complex a #

Monad First

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(>>=) :: First a -> (a -> First b) -> First b #

(>>) :: First a -> First b -> First b #

return :: a -> First a #

Monad Last

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(>>=) :: Last a -> (a -> Last b) -> Last b #

(>>) :: Last a -> Last b -> Last b #

return :: a -> Last a #

Monad Max

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(>>=) :: Max a -> (a -> Max b) -> Max b #

(>>) :: Max a -> Max b -> Max b #

return :: a -> Max a #

Monad Min

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(>>=) :: Min a -> (a -> Min b) -> Min b #

(>>) :: Min a -> Min b -> Min b #

return :: a -> Min a #

Monad Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

(>>=) :: Seq a -> (a -> Seq b) -> Seq b #

(>>) :: Seq a -> Seq b -> Seq b #

return :: a -> Seq a #

Monad Tree 
Instance details

Defined in Data.Tree

Methods

(>>=) :: Tree a -> (a -> Tree b) -> Tree b #

(>>) :: Tree a -> Tree b -> Tree b #

return :: a -> Tree a #

Monad CryptoFailable 
Instance details

Defined in Crypto.Error.Types

Monad CryptoFailable 
Instance details

Defined in Crypto.Error.Types

Monad DNonEmpty 
Instance details

Defined in Data.DList.DNonEmpty.Internal

Methods

(>>=) :: DNonEmpty a -> (a -> DNonEmpty b) -> DNonEmpty b #

(>>) :: DNonEmpty a -> DNonEmpty b -> DNonEmpty b #

return :: a -> DNonEmpty a #

Monad DList 
Instance details

Defined in Data.DList.Internal

Methods

(>>=) :: DList a -> (a -> DList b) -> DList b #

(>>) :: DList a -> DList b -> DList b #

return :: a -> DList a #

Monad PV 
Instance details

Defined in GHC.Parser.PostProcess

Methods

(>>=) :: PV a -> (a -> PV b) -> PV b #

(>>) :: PV a -> PV b -> PV b #

return :: a -> PV a #

Monad SolverStage 
Instance details

Defined in GHC.Tc.Solver.Monad

Methods

(>>=) :: SolverStage a -> (a -> SolverStage b) -> SolverStage b #

(>>) :: SolverStage a -> SolverStage b -> SolverStage b #

return :: a -> SolverStage a #

Monad TcS 
Instance details

Defined in GHC.Tc.Solver.Monad

Methods

(>>=) :: TcS a -> (a -> TcS b) -> TcS b #

(>>) :: TcS a -> TcS b -> TcS b #

return :: a -> TcS a #

Monad NonEmpty

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Base

Methods

(>>=) :: NonEmpty a -> (a -> NonEmpty b) -> NonEmpty b #

(>>) :: NonEmpty a -> NonEmpty b -> NonEmpty b #

return :: a -> NonEmpty a #

Monad STM

@since base-4.3.0.0

Instance details

Defined in GHC.Internal.Conc.Sync

Methods

(>>=) :: STM a -> (a -> STM b) -> STM b #

(>>) :: STM a -> STM b -> STM b #

return :: a -> STM a #

Monad Identity

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Identity

Methods

(>>=) :: Identity a -> (a -> Identity b) -> Identity b #

(>>) :: Identity a -> Identity b -> Identity b #

return :: a -> Identity a #

Monad First

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Data.Monoid

Methods

(>>=) :: First a -> (a -> First b) -> First b #

(>>) :: First a -> First b -> First b #

return :: a -> First a #

Monad Last

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Data.Monoid

Methods

(>>=) :: Last a -> (a -> Last b) -> Last b #

(>>) :: Last a -> Last b -> Last b #

return :: a -> Last a #

Monad Down

@since base-4.11.0.0

Instance details

Defined in GHC.Internal.Data.Ord

Methods

(>>=) :: Down a -> (a -> Down b) -> Down b #

(>>) :: Down a -> Down b -> Down b #

return :: a -> Down a #

Monad Dual

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

(>>=) :: Dual a -> (a -> Dual b) -> Dual b #

(>>) :: Dual a -> Dual b -> Dual b #

return :: a -> Dual a #

Monad Product

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

(>>=) :: Product a -> (a -> Product b) -> Product b #

(>>) :: Product a -> Product b -> Product b #

return :: a -> Product a #

Monad Sum

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

(>>=) :: Sum a -> (a -> Sum b) -> Sum b #

(>>) :: Sum a -> Sum b -> Sum b #

return :: a -> Sum a #

Monad Par1

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

(>>=) :: Par1 a -> (a -> Par1 b) -> Par1 b #

(>>) :: Par1 a -> Par1 b -> Par1 b #

return :: a -> Par1 a #

Monad P

@since base-2.01

Instance details

Defined in GHC.Internal.Text.ParserCombinators.ReadP

Methods

(>>=) :: P a -> (a -> P b) -> P b #

(>>) :: P a -> P b -> P b #

return :: a -> P a #

Monad ReadP

@since base-2.01

Instance details

Defined in GHC.Internal.Text.ParserCombinators.ReadP

Methods

(>>=) :: ReadP a -> (a -> ReadP b) -> ReadP b #

(>>) :: ReadP a -> ReadP b -> ReadP b #

return :: a -> ReadP a #

Monad IO

@since base-2.01

Instance details

Defined in GHC.Internal.Base

Methods

(>>=) :: IO a -> (a -> IO b) -> IO b #

(>>) :: IO a -> IO b -> IO b #

return :: a -> IO a #

Monad Deque 
Instance details

Defined in Control.Lens.Internal.Deque

Methods

(>>=) :: Deque a -> (a -> Deque b) -> Deque b #

(>>) :: Deque a -> Deque b -> Deque b #

return :: a -> Deque a #

Monad ME 
Instance details

Defined in Napkin.Render.PrettyPrint

Methods

(>>=) :: ME a -> (a -> ME b) -> ME b #

(>>) :: ME a -> ME b -> ME b #

return :: a -> ME a #

Monad Q 
Instance details

Defined in Napkin.Untyped.Monad

Methods

(>>=) :: Q a -> (a -> Q b) -> Q b #

(>>) :: Q a -> Q b -> Q b #

return :: a -> Q a #

Monad U 
Instance details

Defined in Napkin.Untyped.Monad

Methods

(>>=) :: U a -> (a -> U b) -> U b #

(>>) :: U a -> U b -> U b #

return :: a -> U a #

Monad Chunk 
Instance details

Defined in Options.Applicative.Help.Chunk

Methods

(>>=) :: Chunk a -> (a -> Chunk b) -> Chunk b #

(>>) :: Chunk a -> Chunk b -> Chunk b #

return :: a -> Chunk a #

Monad ComplResult 
Instance details

Defined in Options.Applicative.Internal

Methods

(>>=) :: ComplResult a -> (a -> ComplResult b) -> ComplResult b #

(>>) :: ComplResult a -> ComplResult b -> ComplResult b #

return :: a -> ComplResult a #

Monad Completion 
Instance details

Defined in Options.Applicative.Internal

Methods

(>>=) :: Completion a -> (a -> Completion b) -> Completion b #

(>>) :: Completion a -> Completion b -> Completion b #

return :: a -> Completion a #

Monad P 
Instance details

Defined in Options.Applicative.Internal

Methods

(>>=) :: P a -> (a -> P b) -> P b #

(>>) :: P a -> P b -> P b #

return :: a -> P a #

Monad ParserM 
Instance details

Defined in Options.Applicative.Types

Methods

(>>=) :: ParserM a -> (a -> ParserM b) -> ParserM b #

(>>) :: ParserM a -> ParserM b -> ParserM b #

return :: a -> ParserM a #

Monad ParserResult 
Instance details

Defined in Options.Applicative.Types

Monad ReadM 
Instance details

Defined in Options.Applicative.Types

Methods

(>>=) :: ReadM a -> (a -> ReadM b) -> ReadM b #

(>>) :: ReadM a -> ReadM b -> ReadM b #

return :: a -> ReadM a #

Monad Conversion 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Methods

(>>=) :: Conversion a -> (a -> Conversion b) -> Conversion b #

(>>) :: Conversion a -> Conversion b -> Conversion b #

return :: a -> Conversion a #

Monad RowParser 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Methods

(>>=) :: RowParser a -> (a -> RowParser b) -> RowParser b #

(>>) :: RowParser a -> RowParser b -> RowParser b #

return :: a -> RowParser a #

Monad Array 
Instance details

Defined in Data.Primitive.Array

Methods

(>>=) :: Array a -> (a -> Array b) -> Array b #

(>>) :: Array a -> Array b -> Array b #

return :: a -> Array a #

Monad SmallArray 
Instance details

Defined in Data.Primitive.SmallArray

Methods

(>>=) :: SmallArray a -> (a -> SmallArray b) -> SmallArray b #

(>>) :: SmallArray a -> SmallArray b -> SmallArray b #

return :: a -> SmallArray a #

Monad I 
Instance details

Defined in Data.SOP.BasicFunctors

Methods

(>>=) :: I a -> (a -> I b) -> I b #

(>>) :: I a -> I b -> I b #

return :: a -> I a #

Monad Q 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(>>=) :: Q a -> (a -> Q b) -> Q b #

(>>) :: Q a -> Q b -> Q b #

return :: a -> Q a #

Monad Vector 
Instance details

Defined in Data.Vector

Methods

(>>=) :: Vector a -> (a -> Vector b) -> Vector b #

(>>) :: Vector a -> Vector b -> Vector b #

return :: a -> Vector a #

Monad Stream 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

(>>=) :: Stream a -> (a -> Stream b) -> Stream b #

(>>) :: Stream a -> Stream b -> Stream b #

return :: a -> Stream a #

Monad Maybe

@since base-2.01

Instance details

Defined in GHC.Internal.Base

Methods

(>>=) :: Maybe a -> (a -> Maybe b) -> Maybe b #

(>>) :: Maybe a -> Maybe b -> Maybe b #

return :: a -> Maybe a #

Monad Solo

@since base-4.15

Instance details

Defined in GHC.Internal.Base

Methods

(>>=) :: Solo a -> (a -> Solo b) -> Solo b #

(>>) :: Solo a -> Solo b -> Solo b #

return :: a -> Solo a #

Monad []

@since base-2.01

Instance details

Defined in GHC.Internal.Base

Methods

(>>=) :: [a] -> (a -> [b]) -> [b] #

(>>) :: [a] -> [b] -> [b] #

return :: a -> [a] #

Representable f => Monad (Co f) 
Instance details

Defined in Data.Functor.Rep

Methods

(>>=) :: Co f a -> (a -> Co f b) -> Co f b #

(>>) :: Co f a -> Co f b -> Co f b #

return :: a -> Co f a #

Monad (Parser i) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

(>>=) :: Parser i a -> (a -> Parser i b) -> Parser i b #

(>>) :: Parser i a -> Parser i b -> Parser i b #

return :: a -> Parser i a #

Monad m => Monad (WrappedMonad m)

Since: base-4.7.0.0

Instance details

Defined in Control.Applicative

Methods

(>>=) :: WrappedMonad m a -> (a -> WrappedMonad m b) -> WrappedMonad m b #

(>>) :: WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m b #

return :: a -> WrappedMonad m a #

Monad (SetM s) 
Instance details

Defined in Data.Graph

Methods

(>>=) :: SetM s a -> (a -> SetM s b) -> SetM s b #

(>>) :: SetM s a -> SetM s b -> SetM s b #

return :: a -> SetM s a #

Monad m => Monad (CatchT m) 
Instance details

Defined in Control.Monad.Catch.Pure

Methods

(>>=) :: CatchT m a -> (a -> CatchT m b) -> CatchT m b #

(>>) :: CatchT m a -> CatchT m b -> CatchT m b #

return :: a -> CatchT m a #

Alternative f => Monad (Cofree f) 
Instance details

Defined in Control.Comonad.Cofree

Methods

(>>=) :: Cofree f a -> (a -> Cofree f b) -> Cofree f b #

(>>) :: Cofree f a -> Cofree f b -> Cofree f b #

return :: a -> Cofree f a #

Functor f => Monad (Free f) 
Instance details

Defined in Control.Monad.Free

Methods

(>>=) :: Free f a -> (a -> Free f b) -> Free f b #

(>>) :: Free f a -> Free f b -> Free f b #

return :: a -> Free f a #

ArrowApply a => Monad (ArrowMonad a)

@since base-2.01

Instance details

Defined in GHC.Internal.Control.Arrow

Methods

(>>=) :: ArrowMonad a a0 -> (a0 -> ArrowMonad a b) -> ArrowMonad a b #

(>>) :: ArrowMonad a a0 -> ArrowMonad a b -> ArrowMonad a b #

return :: a0 -> ArrowMonad a a0 #

Monad (Either e)

@since base-4.4.0.0

Instance details

Defined in GHC.Internal.Data.Either

Methods

(>>=) :: Either e a -> (a -> Either e b) -> Either e b #

(>>) :: Either e a -> Either e b -> Either e b #

return :: a -> Either e a #

Monad (Proxy :: Type -> Type)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Data.Proxy

Methods

(>>=) :: Proxy a -> (a -> Proxy b) -> Proxy b #

(>>) :: Proxy a -> Proxy b -> Proxy b #

return :: a -> Proxy a #

Monad (U1 :: Type -> Type)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

(>>=) :: U1 a -> (a -> U1 b) -> U1 b #

(>>) :: U1 a -> U1 b -> U1 b #

return :: a -> U1 a #

Monad m => Monad (Yoneda m) 
Instance details

Defined in Data.Functor.Yoneda

Methods

(>>=) :: Yoneda m a -> (a -> Yoneda m b) -> Yoneda m b #

(>>) :: Yoneda m a -> Yoneda m b -> Yoneda m b #

return :: a -> Yoneda m a #

Monad m => Monad (KatipT m) 
Instance details

Defined in Katip.Core

Methods

(>>=) :: KatipT m a -> (a -> KatipT m b) -> KatipT m b #

(>>) :: KatipT m a -> KatipT m b -> KatipT m b #

return :: a -> KatipT m a #

Monad m => Monad (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

(>>=) :: KatipContextT m a -> (a -> KatipContextT m b) -> KatipContextT m b #

(>>) :: KatipContextT m a -> KatipContextT m b -> KatipContextT m b #

return :: a -> KatipContextT m a #

Monad m => Monad (NoLoggingT m) 
Instance details

Defined in Katip.Monadic

Methods

(>>=) :: NoLoggingT m a -> (a -> NoLoggingT m b) -> NoLoggingT m b #

(>>) :: NoLoggingT m a -> NoLoggingT m b -> NoLoggingT m b #

return :: a -> NoLoggingT m a #

Monad (ReifiedFold s) 
Instance details

Defined in Control.Lens.Reified

Methods

(>>=) :: ReifiedFold s a -> (a -> ReifiedFold s b) -> ReifiedFold s b #

(>>) :: ReifiedFold s a -> ReifiedFold s b -> ReifiedFold s b #

return :: a -> ReifiedFold s a #

Monad (ReifiedGetter s) 
Instance details

Defined in Control.Lens.Reified

Methods

(>>=) :: ReifiedGetter s a -> (a -> ReifiedGetter s b) -> ReifiedGetter s b #

(>>) :: ReifiedGetter s a -> ReifiedGetter s b -> ReifiedGetter s b #

return :: a -> ReifiedGetter s a #

Monad f => Monad (WrappedPoly f) 
Instance details

Defined in Data.MonoTraversable

Methods

(>>=) :: WrappedPoly f a -> (a -> WrappedPoly f b) -> WrappedPoly f b #

(>>) :: WrappedPoly f a -> WrappedPoly f b -> WrappedPoly f b #

return :: a -> WrappedPoly f a #

Monad (Spec b) 
Instance details

Defined in Napkin.Spec.Types.Spec

Methods

(>>=) :: Spec b a -> (a -> Spec b b0) -> Spec b b0 #

(>>) :: Spec b a -> Spec b b0 -> Spec b b0 #

return :: a -> Spec b a #

Monad m => Monad (ListT m) 
Instance details

Defined in Options.Applicative.Internal

Methods

(>>=) :: ListT m a -> (a -> ListT m b) -> ListT m b #

(>>) :: ListT m a -> ListT m b -> ListT m b #

return :: a -> ListT m a #

Monad m => Monad (NondetT m) 
Instance details

Defined in Options.Applicative.Internal

Methods

(>>=) :: NondetT m a -> (a -> NondetT m b) -> NondetT m b #

(>>) :: NondetT m a -> NondetT m b -> NondetT m b #

return :: a -> NondetT m a #

Monad (Sem f) 
Instance details

Defined in Polysemy.Internal

Methods

(>>=) :: Sem f a -> (a -> Sem f b) -> Sem f b #

(>>) :: Sem f a -> Sem f b -> Sem f b #

return :: a -> Sem f a #

Monad m => Monad (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

(>>=) :: ResourceT m a -> (a -> ResourceT m b) -> ResourceT m b #

(>>) :: ResourceT m a -> ResourceT m b -> ResourceT m b #

return :: a -> ResourceT m a #

Monad (RIO env) 
Instance details

Defined in RIO.Prelude.RIO

Methods

(>>=) :: RIO env a -> (a -> RIO env b) -> RIO env b #

(>>) :: RIO env a -> RIO env b -> RIO env b #

return :: a -> RIO env a #

Monad m => Monad (ActionT m) 
Instance details

Defined in Web.Scotty.Internal.Types

Methods

(>>=) :: ActionT m a -> (a -> ActionT m b) -> ActionT m b #

(>>) :: ActionT m a -> ActionT m b -> ActionT m b #

return :: a -> ActionT m a #

Monad (ScottyT m) 
Instance details

Defined in Web.Scotty.Internal.Types

Methods

(>>=) :: ScottyT m a -> (a -> ScottyT m b) -> ScottyT m b #

(>>) :: ScottyT m a -> ScottyT m b -> ScottyT m b #

return :: a -> ScottyT m a #

Semigroup a => Monad (These a) 
Instance details

Defined in Data.Strict.These

Methods

(>>=) :: These a a0 -> (a0 -> These a b) -> These a b #

(>>) :: These a a0 -> These a b -> These a b #

return :: a0 -> These a a0 #

Monad (IParser t) 
Instance details

Defined in Data.Text.Internal.Read

Methods

(>>=) :: IParser t a -> (a -> IParser t b) -> IParser t b #

(>>) :: IParser t a -> IParser t b -> IParser t b #

return :: a -> IParser t a #

Semigroup a => Monad (These a) 
Instance details

Defined in Data.These

Methods

(>>=) :: These a a0 -> (a0 -> These a b) -> These a b #

(>>) :: These a a0 -> These a b -> These a b #

return :: a0 -> These a a0 #

Monad m => Monad (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

(>>=) :: MaybeT m a -> (a -> MaybeT m b) -> MaybeT m b #

(>>) :: MaybeT m a -> MaybeT m b -> MaybeT m b #

return :: a -> MaybeT m a #

Monoid a => Monad ((,) a)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Base

Methods

(>>=) :: (a, a0) -> (a0 -> (a, b)) -> (a, b) #

(>>) :: (a, a0) -> (a, b) -> (a, b) #

return :: a0 -> (a, a0) #

(Applicative f, Monad f) => Monad (WhenMissing f x)

Equivalent to ReaderT k (ReaderT x (MaybeT f)).

Since: containers-0.5.9

Instance details

Defined in Data.IntMap.Internal

Methods

(>>=) :: WhenMissing f x a -> (a -> WhenMissing f x b) -> WhenMissing f x b #

(>>) :: WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x b #

return :: a -> WhenMissing f x a #

(Alternative f, Monad w) => Monad (CofreeT f w) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

(>>=) :: CofreeT f w a -> (a -> CofreeT f w b) -> CofreeT f w b #

(>>) :: CofreeT f w a -> CofreeT f w b -> CofreeT f w b #

return :: a -> CofreeT f w a #

(Functor f, Monad m) => Monad (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

(>>=) :: FreeT f m a -> (a -> FreeT f m b) -> FreeT f m b #

(>>) :: FreeT f m a -> FreeT f m b -> FreeT f m b #

return :: a -> FreeT f m a #

(Applicative f, Monad f) => Monad (WhenMissing f x)

Equivalent to ReaderT k (ReaderT x (MaybeT f)).

Since: ghc-0.5.9

Instance details

Defined in GHC.Data.Word64Map.Internal

Methods

(>>=) :: WhenMissing f x a -> (a -> WhenMissing f x b) -> WhenMissing f x b #

(>>) :: WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x b #

return :: a -> WhenMissing f x a #

Monad m => Monad (Kleisli m a)

@since base-4.14.0.0

Instance details

Defined in GHC.Internal.Control.Arrow

Methods

(>>=) :: Kleisli m a a0 -> (a0 -> Kleisli m a b) -> Kleisli m a b #

(>>) :: Kleisli m a a0 -> Kleisli m a b -> Kleisli m a b #

return :: a0 -> Kleisli m a a0 #

Monad f => Monad (Ap f)

@since base-4.12.0.0

Instance details

Defined in GHC.Internal.Data.Monoid

Methods

(>>=) :: Ap f a -> (a -> Ap f b) -> Ap f b #

(>>) :: Ap f a -> Ap f b -> Ap f b #

return :: a -> Ap f a #

Monad f => Monad (Alt f)

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

(>>=) :: Alt f a -> (a -> Alt f b) -> Alt f b #

(>>) :: Alt f a -> Alt f b -> Alt f b #

return :: a -> Alt f a #

Monad f => Monad (Rec1 f)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

(>>=) :: Rec1 f a -> (a -> Rec1 f b) -> Rec1 f b #

(>>) :: Rec1 f a -> Rec1 f b -> Rec1 f b #

return :: a -> Rec1 f a #

Monad (Indexed i a) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

(>>=) :: Indexed i a a0 -> (a0 -> Indexed i a b) -> Indexed i a b #

(>>) :: Indexed i a a0 -> Indexed i a b -> Indexed i a b #

return :: a0 -> Indexed i a a0 #

Monad (t m) => Monad (LiftingAccum t m)

Since: mtl-2.3

Instance details

Defined in Control.Monad.Accum

Methods

(>>=) :: LiftingAccum t m a -> (a -> LiftingAccum t m b) -> LiftingAccum t m b #

(>>) :: LiftingAccum t m a -> LiftingAccum t m b -> LiftingAccum t m b #

return :: a -> LiftingAccum t m a #

Monad (t m) => Monad (LiftingSelect t m)

Since: mtl-2.3

Instance details

Defined in Control.Monad.Select

Methods

(>>=) :: LiftingSelect t m a -> (a -> LiftingSelect t m b) -> LiftingSelect t m b #

(>>) :: LiftingSelect t m a -> LiftingSelect t m b -> LiftingSelect t m b #

return :: a -> LiftingSelect t m a #

Monad (NonDetC m) 
Instance details

Defined in Polysemy.NonDet

Methods

(>>=) :: NonDetC m a -> (a -> NonDetC m b) -> NonDetC m b #

(>>) :: NonDetC m a -> NonDetC m b -> NonDetC m b #

return :: a -> NonDetC m a #

(Monad (Rep p), Representable p) => Monad (Prep p) 
Instance details

Defined in Data.Profunctor.Rep

Methods

(>>=) :: Prep p a -> (a -> Prep p b) -> Prep p b #

(>>) :: Prep p a -> Prep p b -> Prep p b #

return :: a -> Prep p a #

Monad (Tagged s) 
Instance details

Defined in Data.Tagged

Methods

(>>=) :: Tagged s a -> (a -> Tagged s b) -> Tagged s b #

(>>) :: Tagged s a -> Tagged s b -> Tagged s b #

return :: a -> Tagged s a #

(Monoid w, Functor m, Monad m) => Monad (AccumT w m) 
Instance details

Defined in Control.Monad.Trans.Accum

Methods

(>>=) :: AccumT w m a -> (a -> AccumT w m b) -> AccumT w m b #

(>>) :: AccumT w m a -> AccumT w m b -> AccumT w m b #

return :: a -> AccumT w m a #

Monad m => Monad (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

(>>=) :: ExceptT e m a -> (a -> ExceptT e m b) -> ExceptT e m b #

(>>) :: ExceptT e m a -> ExceptT e m b -> ExceptT e m b #

return :: a -> ExceptT e m a #

Monad m => Monad (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

(>>=) :: IdentityT m a -> (a -> IdentityT m b) -> IdentityT m b #

(>>) :: IdentityT m a -> IdentityT m b -> IdentityT m b #

return :: a -> IdentityT m a #

Monad m => Monad (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

(>>=) :: ReaderT r m a -> (a -> ReaderT r m b) -> ReaderT r m b #

(>>) :: ReaderT r m a -> ReaderT r m b -> ReaderT r m b #

return :: a -> ReaderT r m a #

Monad m => Monad (SelectT r m) 
Instance details

Defined in Control.Monad.Trans.Select

Methods

(>>=) :: SelectT r m a -> (a -> SelectT r m b) -> SelectT r m b #

(>>) :: SelectT r m a -> SelectT r m b -> SelectT r m b #

return :: a -> SelectT r m a #

Monad m => Monad (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Lazy

Methods

(>>=) :: StateT s m a -> (a -> StateT s m b) -> StateT s m b #

(>>) :: StateT s m a -> StateT s m b -> StateT s m b #

return :: a -> StateT s m a #

Monad m => Monad (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

(>>=) :: StateT s m a -> (a -> StateT s m b) -> StateT s m b #

(>>) :: StateT s m a -> StateT s m b -> StateT s m b #

return :: a -> StateT s m a #

Monad m => Monad (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.CPS

Methods

(>>=) :: WriterT w m a -> (a -> WriterT w m b) -> WriterT w m b #

(>>) :: WriterT w m a -> WriterT w m b -> WriterT w m b #

return :: a -> WriterT w m a #

(Monoid w, Monad m) => Monad (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

(>>=) :: WriterT w m a -> (a -> WriterT w m b) -> WriterT w m b #

(>>) :: WriterT w m a -> WriterT w m b -> WriterT w m b #

return :: a -> WriterT w m a #

(Monoid w, Monad m) => Monad (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

(>>=) :: WriterT w m a -> (a -> WriterT w m b) -> WriterT w m b #

(>>) :: WriterT w m a -> WriterT w m b -> WriterT w m b #

return :: a -> WriterT w m a #

Monad m => Monad (Reverse m)

Derived instance.

Instance details

Defined in Data.Functor.Reverse

Methods

(>>=) :: Reverse m a -> (a -> Reverse m b) -> Reverse m b #

(>>) :: Reverse m a -> Reverse m b -> Reverse m b #

return :: a -> Reverse m a #

(Monoid a, Monoid b) => Monad ((,,) a b)

@since base-4.14.0.0

Instance details

Defined in GHC.Internal.Base

Methods

(>>=) :: (a, b, a0) -> (a0 -> (a, b, b0)) -> (a, b, b0) #

(>>) :: (a, b, a0) -> (a, b, b0) -> (a, b, b0) #

return :: a0 -> (a, b, a0) #

(Monad f, Monad g) => Monad (Product f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Product

Methods

(>>=) :: Product f g a -> (a -> Product f g b) -> Product f g b #

(>>) :: Product f g a -> Product f g b -> Product f g b #

return :: a -> Product f g a #

Monad (ConduitT i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

(>>=) :: ConduitT i o m a -> (a -> ConduitT i o m b) -> ConduitT i o m b #

(>>) :: ConduitT i o m a -> ConduitT i o m b -> ConduitT i o m b #

return :: a -> ConduitT i o m a #

(Monad f, Applicative f) => Monad (WhenMatched f x y)

Equivalent to ReaderT Key (ReaderT x (ReaderT y (MaybeT f)))

Since: containers-0.5.9

Instance details

Defined in Data.IntMap.Internal

Methods

(>>=) :: WhenMatched f x y a -> (a -> WhenMatched f x y b) -> WhenMatched f x y b #

(>>) :: WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y b #

return :: a -> WhenMatched f x y a #

(Applicative f, Monad f) => Monad (WhenMissing f k x)

Equivalent to ReaderT k (ReaderT x (MaybeT f)) .

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

(>>=) :: WhenMissing f k x a -> (a -> WhenMissing f k x b) -> WhenMissing f k x b #

(>>) :: WhenMissing f k x a -> WhenMissing f k x b -> WhenMissing f k x b #

return :: a -> WhenMissing f k x a #

(Monad f, Applicative f) => Monad (WhenMatched f x y)

Equivalent to ReaderT Key (ReaderT x (ReaderT y (MaybeT f)))

Since: ghc-0.5.9

Instance details

Defined in GHC.Data.Word64Map.Internal

Methods

(>>=) :: WhenMatched f x y a -> (a -> WhenMatched f x y b) -> WhenMatched f x y b #

(>>) :: WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y b #

return :: a -> WhenMatched f x y a #

(Monad f, Monad g) => Monad (f :*: g)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

(>>=) :: (f :*: g) a -> (a -> (f :*: g) b) -> (f :*: g) b #

(>>) :: (f :*: g) a -> (f :*: g) b -> (f :*: g) b #

return :: a -> (f :*: g) a #

Monad (ContT r m) 
Instance details

Defined in Control.Monad.Trans.Cont

Methods

(>>=) :: ContT r m a -> (a -> ContT r m b) -> ContT r m b #

(>>) :: ContT r m a -> ContT r m b -> ContT r m b #

return :: a -> ContT r m a #

(Monoid a, Monoid b, Monoid c) => Monad ((,,,) a b c)

@since base-4.14.0.0

Instance details

Defined in GHC.Internal.Base

Methods

(>>=) :: (a, b, c, a0) -> (a0 -> (a, b, c, b0)) -> (a, b, c, b0) #

(>>) :: (a, b, c, a0) -> (a, b, c, b0) -> (a, b, c, b0) #

return :: a0 -> (a, b, c, a0) #

Monad ((->) r)

@since base-2.01

Instance details

Defined in GHC.Internal.Base

Methods

(>>=) :: (r -> a) -> (a -> r -> b) -> r -> b #

(>>) :: (r -> a) -> (r -> b) -> r -> b #

return :: a -> r -> a #

(Monad f, Applicative f) => Monad (WhenMatched f k x y)

Equivalent to ReaderT k (ReaderT x (ReaderT y (MaybeT f)))

Since: containers-0.5.9

Instance details

Defined in Data.Map.Internal

Methods

(>>=) :: WhenMatched f k x y a -> (a -> WhenMatched f k x y b) -> WhenMatched f k x y b #

(>>) :: WhenMatched f k x y a -> WhenMatched f k x y b -> WhenMatched f k x y b #

return :: a -> WhenMatched f k x y a #

Monad f => Monad (M1 i c f)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

(>>=) :: M1 i c f a -> (a -> M1 i c f b) -> M1 i c f b #

(>>) :: M1 i c f a -> M1 i c f b -> M1 i c f b #

return :: a -> M1 i c f a #

Monad m => Monad (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.CPS

Methods

(>>=) :: RWST r w s m a -> (a -> RWST r w s m b) -> RWST r w s m b #

(>>) :: RWST r w s m a -> RWST r w s m b -> RWST r w s m b #

return :: a -> RWST r w s m a #

(Monoid w, Monad m) => Monad (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.Lazy

Methods

(>>=) :: RWST r w s m a -> (a -> RWST r w s m b) -> RWST r w s m b #

(>>) :: RWST r w s m a -> RWST r w s m b -> RWST r w s m b #

return :: a -> RWST r w s m a #

(Monoid w, Monad m) => Monad (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.Strict

Methods

(>>=) :: RWST r w s m a -> (a -> RWST r w s m b) -> RWST r w s m b #

(>>) :: RWST r w s m a -> RWST r w s m b -> RWST r w s m b #

return :: a -> RWST r w s m a #

Monad state => Monad (Builder collection mutCollection step state err) 
Instance details

Defined in Basement.MutableBuilder

Methods

(>>=) :: Builder collection mutCollection step state err a -> (a -> Builder collection mutCollection step state err b) -> Builder collection mutCollection step state err b #

(>>) :: Builder collection mutCollection step state err a -> Builder collection mutCollection step state err b -> Builder collection mutCollection step state err b #

return :: a -> Builder collection mutCollection step state err a #

Monad m => Monad (Pipe l i o u m) 
Instance details

Defined in Data.Conduit.Internal.Pipe

Methods

(>>=) :: Pipe l i o u m a -> (a -> Pipe l i o u m b) -> Pipe l i o u m b #

(>>) :: Pipe l i o u m a -> Pipe l i o u m b -> Pipe l i o u m b #

return :: a -> Pipe l i o u m a #

class (Alternative m, Monad m) => MonadPlus (m :: Type -> Type) where #

Monads that also support choice and failure.

Minimal complete definition

Nothing

Methods

mzero :: m a #

The identity of mplus. It should also satisfy the equations

mzero >>= f  =  mzero
v >> mzero   =  mzero

The default definition is

mzero = empty

mplus :: m a -> m a -> m a #

An associative operation. The default definition is

mplus = (<|>)

Instances

Instances details
MonadPlus IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

mzero :: IResult a #

mplus :: IResult a -> IResult a -> IResult a #

MonadPlus Parser 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

mzero :: Parser a #

mplus :: Parser a -> Parser a -> Parser a #

MonadPlus Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

mzero :: Result a #

mplus :: Result a -> Result a -> Result a #

MonadPlus Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

mzero :: Seq a #

mplus :: Seq a -> Seq a -> Seq a #

MonadPlus DList 
Instance details

Defined in Data.DList.Internal

Methods

mzero :: DList a #

mplus :: DList a -> DList a -> DList a #

MonadPlus STM

Takes the first non-retrying STM action.

@since base-4.3.0.0

Instance details

Defined in GHC.Internal.Conc.Sync

Methods

mzero :: STM a #

mplus :: STM a -> STM a -> STM a #

MonadPlus P

@since base-2.01

Instance details

Defined in GHC.Internal.Text.ParserCombinators.ReadP

Methods

mzero :: P a #

mplus :: P a -> P a -> P a #

MonadPlus ReadP

@since base-2.01

Instance details

Defined in GHC.Internal.Text.ParserCombinators.ReadP

Methods

mzero :: ReadP a #

mplus :: ReadP a -> ReadP a -> ReadP a #

MonadPlus IO

Takes the first non-throwing IO action's result. mzero throws an exception.

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Base

Methods

mzero :: IO a #

mplus :: IO a -> IO a -> IO a #

MonadPlus Deque 
Instance details

Defined in Control.Lens.Internal.Deque

Methods

mzero :: Deque a #

mplus :: Deque a -> Deque a -> Deque a #

MonadPlus Chunk 
Instance details

Defined in Options.Applicative.Help.Chunk

Methods

mzero :: Chunk a #

mplus :: Chunk a -> Chunk a -> Chunk a #

MonadPlus Completion 
Instance details

Defined in Options.Applicative.Internal

MonadPlus P 
Instance details

Defined in Options.Applicative.Internal

Methods

mzero :: P a #

mplus :: P a -> P a -> P a #

MonadPlus ReadM 
Instance details

Defined in Options.Applicative.Types

Methods

mzero :: ReadM a #

mplus :: ReadM a -> ReadM a -> ReadM a #

MonadPlus Conversion 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

MonadPlus Array 
Instance details

Defined in Data.Primitive.Array

Methods

mzero :: Array a #

mplus :: Array a -> Array a -> Array a #

MonadPlus SmallArray 
Instance details

Defined in Data.Primitive.SmallArray

MonadPlus Vector 
Instance details

Defined in Data.Vector

Methods

mzero :: Vector a #

mplus :: Vector a -> Vector a -> Vector a #

MonadPlus Maybe

Picks the leftmost Just value, or, alternatively, Nothing.

@since base-2.01

Instance details

Defined in GHC.Internal.Base

Methods

mzero :: Maybe a #

mplus :: Maybe a -> Maybe a -> Maybe a #

MonadPlus []

Combines lists by concatenation, starting from the empty list.

@since base-2.01

Instance details

Defined in GHC.Internal.Base

Methods

mzero :: [a] #

mplus :: [a] -> [a] -> [a] #

MonadPlus (Parser i) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

mzero :: Parser i a #

mplus :: Parser i a -> Parser i a -> Parser i a #

Monad m => MonadPlus (CatchT m) 
Instance details

Defined in Control.Monad.Catch.Pure

Methods

mzero :: CatchT m a #

mplus :: CatchT m a -> CatchT m a -> CatchT m a #

MonadPlus v => MonadPlus (Free v)

This violates the MonadPlus laws, handle with care.

Instance details

Defined in Control.Monad.Free

Methods

mzero :: Free v a #

mplus :: Free v a -> Free v a -> Free v a #

(ArrowApply a, ArrowPlus a) => MonadPlus (ArrowMonad a)

@since base-4.6.0.0

Instance details

Defined in GHC.Internal.Control.Arrow

Methods

mzero :: ArrowMonad a a0 #

mplus :: ArrowMonad a a0 -> ArrowMonad a a0 -> ArrowMonad a a0 #

MonadPlus (Proxy :: Type -> Type)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Proxy

Methods

mzero :: Proxy a #

mplus :: Proxy a -> Proxy a -> Proxy a #

MonadPlus (U1 :: Type -> Type)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

mzero :: U1 a #

mplus :: U1 a -> U1 a -> U1 a #

MonadPlus m => MonadPlus (Yoneda m) 
Instance details

Defined in Data.Functor.Yoneda

Methods

mzero :: Yoneda m a #

mplus :: Yoneda m a -> Yoneda m a -> Yoneda m a #

MonadPlus m => MonadPlus (KatipContextT m) 
Instance details

Defined in Katip.Monadic

MonadPlus m => MonadPlus (NoLoggingT m) 
Instance details

Defined in Katip.Monadic

Methods

mzero :: NoLoggingT m a #

mplus :: NoLoggingT m a -> NoLoggingT m a -> NoLoggingT m a #

MonadPlus (ReifiedFold s) 
Instance details

Defined in Control.Lens.Reified

Methods

mzero :: ReifiedFold s a #

mplus :: ReifiedFold s a -> ReifiedFold s a -> ReifiedFold s a #

Monad m => MonadPlus (ListT m) 
Instance details

Defined in Options.Applicative.Internal

Methods

mzero :: ListT m a #

mplus :: ListT m a -> ListT m a -> ListT m a #

Monad m => MonadPlus (NondetT m) 
Instance details

Defined in Options.Applicative.Internal

Methods

mzero :: NondetT m a #

mplus :: NondetT m a -> NondetT m a -> NondetT m a #

Member NonDet r => MonadPlus (Sem r)

Since: polysemy-0.2.1.0

Instance details

Defined in Polysemy.Internal

Methods

mzero :: Sem r a #

mplus :: Sem r a -> Sem r a -> Sem r a #

MonadPlus m => MonadPlus (ResourceT m)

Since 1.1.5

Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

mzero :: ResourceT m a #

mplus :: ResourceT m a -> ResourceT m a -> ResourceT m a #

MonadUnliftIO m => MonadPlus (ActionT m) 
Instance details

Defined in Web.Scotty.Internal.Types

Methods

mzero :: ActionT m a #

mplus :: ActionT m a -> ActionT m a -> ActionT m a #

Monad m => MonadPlus (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

mzero :: MaybeT m a #

mplus :: MaybeT m a -> MaybeT m a -> MaybeT m a #

(Functor f, MonadPlus m) => MonadPlus (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

mzero :: FreeT f m a #

mplus :: FreeT f m a -> FreeT f m a -> FreeT f m a #

MonadPlus m => MonadPlus (Kleisli m a)

@since base-4.14.0.0

Instance details

Defined in GHC.Internal.Control.Arrow

Methods

mzero :: Kleisli m a a0 #

mplus :: Kleisli m a a0 -> Kleisli m a a0 -> Kleisli m a a0 #

MonadPlus f => MonadPlus (Ap f)

@since base-4.12.0.0

Instance details

Defined in GHC.Internal.Data.Monoid

Methods

mzero :: Ap f a #

mplus :: Ap f a -> Ap f a -> Ap f a #

MonadPlus f => MonadPlus (Alt f)

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

mzero :: Alt f a #

mplus :: Alt f a -> Alt f a -> Alt f a #

MonadPlus f => MonadPlus (Rec1 f)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

mzero :: Rec1 f a #

mplus :: Rec1 f a -> Rec1 f a -> Rec1 f a #

(Monoid w, Functor m, MonadPlus m) => MonadPlus (AccumT w m) 
Instance details

Defined in Control.Monad.Trans.Accum

Methods

mzero :: AccumT w m a #

mplus :: AccumT w m a -> AccumT w m a -> AccumT w m a #

(Monad m, Monoid e) => MonadPlus (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

mzero :: ExceptT e m a #

mplus :: ExceptT e m a -> ExceptT e m a -> ExceptT e m a #

MonadPlus m => MonadPlus (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

mzero :: IdentityT m a #

mplus :: IdentityT m a -> IdentityT m a -> IdentityT m a #

MonadPlus m => MonadPlus (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

mzero :: ReaderT r m a #

mplus :: ReaderT r m a -> ReaderT r m a -> ReaderT r m a #

MonadPlus m => MonadPlus (SelectT r m) 
Instance details

Defined in Control.Monad.Trans.Select

Methods

mzero :: SelectT r m a #

mplus :: SelectT r m a -> SelectT r m a -> SelectT r m a #

MonadPlus m => MonadPlus (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Lazy

Methods

mzero :: StateT s m a #

mplus :: StateT s m a -> StateT s m a -> StateT s m a #

MonadPlus m => MonadPlus (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

mzero :: StateT s m a #

mplus :: StateT s m a -> StateT s m a -> StateT s m a #

(Functor m, MonadPlus m) => MonadPlus (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.CPS

Methods

mzero :: WriterT w m a #

mplus :: WriterT w m a -> WriterT w m a -> WriterT w m a #

(Monoid w, MonadPlus m) => MonadPlus (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

mzero :: WriterT w m a #

mplus :: WriterT w m a -> WriterT w m a -> WriterT w m a #

(Monoid w, MonadPlus m) => MonadPlus (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

mzero :: WriterT w m a #

mplus :: WriterT w m a -> WriterT w m a -> WriterT w m a #

MonadPlus m => MonadPlus (Reverse m)

Derived instance.

Instance details

Defined in Data.Functor.Reverse

Methods

mzero :: Reverse m a #

mplus :: Reverse m a -> Reverse m a -> Reverse m a #

(MonadPlus f, MonadPlus g) => MonadPlus (Product f g)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Product

Methods

mzero :: Product f g a #

mplus :: Product f g a -> Product f g a -> Product f g a #

(MonadPlus f, MonadPlus g) => MonadPlus (f :*: g)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

mzero :: (f :*: g) a #

mplus :: (f :*: g) a -> (f :*: g) a -> (f :*: g) a #

MonadPlus f => MonadPlus (M1 i c f)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

mzero :: M1 i c f a #

mplus :: M1 i c f a -> M1 i c f a -> M1 i c f a #

(Functor m, MonadPlus m) => MonadPlus (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.CPS

Methods

mzero :: RWST r w s m a #

mplus :: RWST r w s m a -> RWST r w s m a -> RWST r w s m a #

(Monoid w, MonadPlus m) => MonadPlus (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.Lazy

Methods

mzero :: RWST r w s m a #

mplus :: RWST r w s m a -> RWST r w s m a -> RWST r w s m a #

(Monoid w, MonadPlus m) => MonadPlus (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.Strict

Methods

mzero :: RWST r w s m a #

mplus :: RWST r w s m a -> RWST r w s m a -> RWST r w s m a #

class Semigroup a => Monoid a where #

The class of monoids (types with an associative binary operation that has an identity). Instances should satisfy the following:

Right identity
x <> mempty = x
Left identity
mempty <> x = x
Associativity
x <> (y <> z) = (x <> y) <> z (Semigroup law)
Concatenation
mconcat = foldr (<>) mempty

You can alternatively define mconcat instead of mempty, in which case the laws are:

Unit
mconcat (pure x) = x
Multiplication
mconcat (join xss) = mconcat (fmap mconcat xss)
Subclass
mconcat (toList xs) = sconcat xs

The method names refer to the monoid of lists under concatenation, but there are many other instances.

Some types can be viewed as a monoid in more than one way, e.g. both addition and multiplication on numbers. In such cases we often define newtypes and make those instances of Monoid, e.g. Sum and Product.

NOTE: Semigroup is a superclass of Monoid since base-4.11.0.0.

Minimal complete definition

mempty | mconcat

Methods

mempty :: a #

Identity of mappend

Examples

Expand
>>> "Hello world" <> mempty
"Hello world"
>>> mempty <> [1, 2, 3]
[1,2,3]

mappend :: a -> a -> a #

An associative operation

NOTE: This method is redundant and has the default implementation mappend = (<>) since base-4.11.0.0. Should it be implemented manually, since mappend is a synonym for (<>), it is expected that the two functions are defined the same way. In a future GHC release mappend will be removed from Monoid.

mconcat :: [a] -> a #

Fold a list using the monoid.

For most types, the default definition for mconcat will be used, but the function is included in the class definition so that an optimized version can be provided for specific types.

>>> mconcat ["Hello", " ", "Haskell", "!"]
"Hello Haskell!"

Instances

Instances details
Monoid Series 
Instance details

Defined in Data.Aeson.Encoding.Internal

Monoid Key 
Instance details

Defined in Data.Aeson.Key

Methods

mempty :: Key #

mappend :: Key -> Key -> Key #

mconcat :: [Key] -> Key #

Monoid Patch 
Instance details

Defined in Data.Aeson.Patch

Methods

mempty :: Patch #

mappend :: Patch -> Patch -> Patch #

mconcat :: [Patch] -> Patch #

Monoid Pointer 
Instance details

Defined in Data.Aeson.Pointer

Monoid WarningParserMonoid 
Instance details

Defined in Data.Aeson.WarningParser

Methods

mempty :: WarningParserMonoid #

mappend :: WarningParserMonoid -> WarningParserMonoid -> WarningParserMonoid #

mconcat :: [WarningParserMonoid] -> WarningParserMonoid #

Monoid More 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

mempty :: More #

mappend :: More -> More -> More #

mconcat :: [More] -> More #

Monoid ByteArray

Since: base-4.17.0.0

Instance details

Defined in Data.Array.Byte

Monoid String 
Instance details

Defined in Basement.UTF8.Base

Monoid ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

Monoid ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Monoid ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Monoid IntSet 
Instance details

Defined in Data.IntSet.Internal

Monoid Format 
Instance details

Defined in Fmt.Internal.Template

Monoid LabelSet 
Instance details

Defined in GHC.Cmm.Dataflow.Label

Monoid FastString 
Instance details

Defined in GHC.Data.FastString

Monoid Word64Set 
Instance details

Defined in GHC.Data.Word64Set.Internal

Monoid PluginRecompile 
Instance details

Defined in GHC.Driver.Plugins

Monoid Nablas 
Instance details

Defined in GHC.HsToCore.Pmc.Solver.Types

Monoid JStgStat 
Instance details

Defined in GHC.JS.JStg.Syntax

Monoid JStat 
Instance details

Defined in GHC.JS.Syntax

Methods

mempty :: JStat #

mappend :: JStat -> JStat -> JStat #

mconcat :: [JStat] -> JStat #

Monoid InsideLam 
Instance details

Defined in GHC.Types.Basic

Monoid InterestingCxt 
Instance details

Defined in GHC.Types.Basic

Monoid ShadowedFieldGREs 
Instance details

Defined in GHC.Types.Name.Reader

Methods

mempty :: ShadowedFieldGREs #

mappend :: ShadowedFieldGREs -> ShadowedFieldGREs -> ShadowedFieldGREs #

mconcat :: [ShadowedFieldGREs] -> ShadowedFieldGREs #

Monoid ShadowedGREs 
Instance details

Defined in GHC.Types.Name.Reader

Methods

mempty :: ShadowedGREs #

mappend :: ShadowedGREs -> ShadowedGREs -> ShadowedGREs #

mconcat :: [ShadowedGREs] -> ShadowedGREs #

Monoid ModuleOrigin 
Instance details

Defined in GHC.Unit.State

Monoid UnitVisibility 
Instance details

Defined in GHC.Unit.State

Methods

mempty :: UnitVisibility #

mappend :: UnitVisibility -> UnitVisibility -> UnitVisibility #

mconcat :: [UnitVisibility] -> UnitVisibility #

Monoid All

@since base-2.01

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

mempty :: All #

mappend :: All -> All -> All #

mconcat :: [All] -> All #

Monoid Any

@since base-2.01

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

mempty :: Any #

mappend :: Any -> Any -> Any #

mconcat :: [Any] -> Any #

Monoid Ordering

@since base-2.01

Instance details

Defined in GHC.Internal.Base

Monoid Request 
Instance details

Defined in Gogol.Types

Monoid Form 
Instance details

Defined in Web.Internal.FormUrlEncoded

Methods

mempty :: Form #

mappend :: Form -> Form -> Form #

mconcat :: [Form] -> Form #

Monoid CookieJar

Since 1.9

Instance details

Defined in Network.HTTP.Client.Types

Monoid RequestBody 
Instance details

Defined in Network.HTTP.Client.Types

Monoid LogStr 
Instance details

Defined in Katip.Core

Monoid Namespace 
Instance details

Defined in Katip.Core

Monoid PayloadSelection 
Instance details

Defined in Katip.Core

Monoid Scribe 
Instance details

Defined in Katip.Core

Monoid SimpleLogPayload 
Instance details

Defined in Katip.Core

Monoid LogContexts 
Instance details

Defined in Katip.Monadic

Monoid Name 
Instance details

Defined in Napkin.Types.Core

Methods

mempty :: Name #

mappend :: Name -> Name -> Name #

mconcat :: [Name] -> Name #

Monoid DefinedCTEs 
Instance details

Defined in Napkin.Types.RewriteCollectDeps

Methods

mempty :: DefinedCTEs #

mappend :: DefinedCTEs -> DefinedCTEs -> DefinedCTEs #

mconcat :: [DefinedCTEs] -> DefinedCTEs #

Monoid Dependencies 
Instance details

Defined in Napkin.Types.RewriteCollectDeps

Methods

mempty :: Dependencies #

mappend :: Dependencies -> Dependencies -> Dependencies #

mconcat :: [Dependencies] -> Dependencies #

Monoid SqlTemplateVariables 
Instance details

Defined in Napkin.Parse.Interpolation.Types

Monoid Artifacts 
Instance details

Defined in Napkin.Run.Effects.Interceptors.DiscoverDependencies.Types

Monoid Dependencies 
Instance details

Defined in Napkin.Run.Effects.Interceptors.DiscoverDependencies.Types

Monoid AssertionGroup 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

Monoid AssertionLog 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

Monoid ExtraDependencies 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

Monoid HiddenArtifacts 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

Monoid HiddenDependencies 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

Monoid MetaArguments 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

Monoid TableMemo 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

Monoid TableMemos 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

Monoid Query 
Instance details

Defined in Database.ODBC.SQLServer

Methods

mempty :: Query #

mappend :: Query -> Query -> Query #

mconcat :: [Query] -> Query #

Monoid PrefsMod 
Instance details

Defined in Options.Applicative.Builder

Monoid ParserHelp 
Instance details

Defined in Options.Applicative.Help.Types

Monoid Completer 
Instance details

Defined in Options.Applicative.Types

Monoid ParseError 
Instance details

Defined in Options.Applicative.Types

Monoid OsString

"String-Concatenation" for OsString. This is not the same as (</>).

Instance details

Defined in System.OsString.Internal.Types

Monoid PosixString 
Instance details

Defined in System.OsString.Internal.Types

Monoid WindowsString 
Instance details

Defined in System.OsString.Internal.Types

Monoid Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Methods

mempty :: Doc #

mappend :: Doc -> Doc -> Doc #

mconcat :: [Doc] -> Doc #

Monoid AnsiStyle

mempty does nothing, which is equivalent to inheriting the style of the surrounding doc, or the terminal’s default if no style has been set yet.

Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Monoid LogFunc

mempty peforms no logging.

Since: rio-0.0.0.0

Instance details

Defined in RIO.Prelude.Logger

Monoid Key 
Instance details

Defined in Text.Mustache.Type

Methods

mempty :: Key #

mappend :: Key -> Key -> Key #

mconcat :: [Key] -> Key #

Monoid Builder 
Instance details

Defined in Data.Text.Internal.Builder

Monoid StrictBuilder 
Instance details

Defined in Data.Text.Internal.StrictBuilder

Monoid ShortText 
Instance details

Defined in Data.Text.Short.Internal

Monoid CalendarDiffDays

Additive

Instance details

Defined in Data.Time.Calendar.CalendarDiffDays

Monoid CalendarDiffTime

Additive

Instance details

Defined in Data.Time.LocalTime.Internal.CalendarDiffTime

Monoid Query 
Instance details

Defined in URI.ByteString.Types

Methods

mempty :: Query #

mappend :: Query -> Query -> Query #

mconcat :: [Query] -> Query #

Monoid ()

@since base-2.01

Instance details

Defined in GHC.Internal.Base

Methods

mempty :: () #

mappend :: () -> () -> () #

mconcat :: [()] -> () #

Monoid (KeyMap v) 
Instance details

Defined in Data.Aeson.KeyMap

Methods

mempty :: KeyMap v #

mappend :: KeyMap v -> KeyMap v -> KeyMap v #

mconcat :: [KeyMap v] -> KeyMap v #

Monoid (IResult a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

mempty :: IResult a #

mappend :: IResult a -> IResult a -> IResult a #

mconcat :: [IResult a] -> IResult a #

Monoid (Parser a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

mempty :: Parser a #

mappend :: Parser a -> Parser a -> Parser a #

mconcat :: [Parser a] -> Parser a #

Monoid (Result a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

mempty :: Result a #

mappend :: Result a -> Result a -> Result a #

mconcat :: [Result a] -> Result a #

Monoid a => Monoid (WithJSONWarnings a) 
Instance details

Defined in Data.Aeson.WarningParser

Monoid (Comparison a)

mempty on comparisons always returns EQ. Without newtypes this equals pure (pure EQ).

mempty :: Comparison a
mempty = Comparison _ _ -> EQ
Instance details

Defined in Data.Functor.Contravariant

Monoid (Equivalence a)

mempty on equivalences always returns True. Without newtypes this equals pure (pure True).

mempty :: Equivalence a
mempty = Equivalence _ _ -> True
Instance details

Defined in Data.Functor.Contravariant

Monoid (Predicate a)

mempty on predicates always returns True. Without newtypes this equals pure True.

mempty :: Predicate a
mempty = _ -> True
Instance details

Defined in Data.Functor.Contravariant

(Ord a, Bounded a) => Monoid (Max a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

mempty :: Max a #

mappend :: Max a -> Max a -> Max a #

mconcat :: [Max a] -> Max a #

(Ord a, Bounded a) => Monoid (Min a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

mempty :: Min a #

mappend :: Min a -> Min a -> Min a #

mconcat :: [Min a] -> Min a #

Monoid m => Monoid (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

PrimType ty => Monoid (Block ty) 
Instance details

Defined in Basement.Block.Base

Methods

mempty :: Block ty #

mappend :: Block ty -> Block ty -> Block ty #

mconcat :: [Block ty] -> Block ty #

Monoid (CountOf ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

mempty :: CountOf ty #

mappend :: CountOf ty -> CountOf ty -> CountOf ty #

mconcat :: [CountOf ty] -> CountOf ty #

PrimType ty => Monoid (UArray ty) 
Instance details

Defined in Basement.UArray.Base

Methods

mempty :: UArray ty #

mappend :: UArray ty -> UArray ty -> UArray ty #

mconcat :: [UArray ty] -> UArray ty #

Monoid (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

mempty :: IntMap a #

mappend :: IntMap a -> IntMap a -> IntMap a #

mconcat :: [IntMap a] -> IntMap a #

Monoid (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

mempty :: Seq a #

mappend :: Seq a -> Seq a -> Seq a #

mconcat :: [Seq a] -> Seq a #

Monoid (MergeSet a) 
Instance details

Defined in Data.Set.Internal

Methods

mempty :: MergeSet a #

mappend :: MergeSet a -> MergeSet a -> MergeSet a #

mconcat :: [MergeSet a] -> MergeSet a #

Ord a => Monoid (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

mempty :: Set a #

mappend :: Set a -> Set a -> Set a #

mconcat :: [Set a] -> Set a #

Monoid (DList a) 
Instance details

Defined in Data.DList.Internal

Methods

mempty :: DList a #

mappend :: DList a -> DList a -> DList a #

mconcat :: [DList a] -> DList a #

Monoid (Bag a) 
Instance details

Defined in GHC.Data.Bag

Methods

mempty :: Bag a #

mappend :: Bag a -> Bag a -> Bag a #

mconcat :: [Bag a] -> Bag a #

Monoid (Word64Map a) 
Instance details

Defined in GHC.Data.Word64Map.Internal

Monoid (AnnSortKey tag) 
Instance details

Defined in GHC.Parser.Annotation

Methods

mempty :: AnnSortKey tag #

mappend :: AnnSortKey tag -> AnnSortKey tag -> AnnSortKey tag #

mconcat :: [AnnSortKey tag] -> AnnSortKey tag #

Monoid (Messages e) 
Instance details

Defined in GHC.Types.Error

Methods

mempty :: Messages e #

mappend :: Messages e -> Messages e -> Messages e #

mconcat :: [Messages e] -> Messages e #

Monoid a => Monoid (STM a)

@since base-4.17.0.0

Instance details

Defined in GHC.Internal.Conc.Sync

Methods

mempty :: STM a #

mappend :: STM a -> STM a -> STM a #

mconcat :: [STM a] -> STM a #

Monoid a => Monoid (Identity a)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Identity

Methods

mempty :: Identity a #

mappend :: Identity a -> Identity a -> Identity a #

mconcat :: [Identity a] -> Identity a #

Monoid (First a)

@since base-2.01

Instance details

Defined in GHC.Internal.Data.Monoid

Methods

mempty :: First a #

mappend :: First a -> First a -> First a #

mconcat :: [First a] -> First a #

Monoid (Last a)

@since base-2.01

Instance details

Defined in GHC.Internal.Data.Monoid

Methods

mempty :: Last a #

mappend :: Last a -> Last a -> Last a #

mconcat :: [Last a] -> Last a #

Monoid a => Monoid (Down a)

@since base-4.11.0.0

Instance details

Defined in GHC.Internal.Data.Ord

Methods

mempty :: Down a #

mappend :: Down a -> Down a -> Down a #

mconcat :: [Down a] -> Down a #

Monoid a => Monoid (Dual a)

@since base-2.01

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

mempty :: Dual a #

mappend :: Dual a -> Dual a -> Dual a #

mconcat :: [Dual a] -> Dual a #

Monoid (Endo a)

@since base-2.01

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

mempty :: Endo a #

mappend :: Endo a -> Endo a -> Endo a #

mconcat :: [Endo a] -> Endo a #

Num a => Monoid (Product a)

@since base-2.01

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

mempty :: Product a #

mappend :: Product a -> Product a -> Product a #

mconcat :: [Product a] -> Product a #

Num a => Monoid (Sum a)

@since base-2.01

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

mempty :: Sum a #

mappend :: Sum a -> Sum a -> Sum a #

mconcat :: [Sum a] -> Sum a #

(Generic a, Monoid (Rep a ())) => Monoid (Generically a)

@since base-4.17.0.0

Instance details

Defined in GHC.Internal.Generics

Monoid p => Monoid (Par1 p)

@since base-4.12.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

mempty :: Par1 p #

mappend :: Par1 p -> Par1 p -> Par1 p #

mconcat :: [Par1 p] -> Par1 p #

Monoid a => Monoid (IO a)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Base

Methods

mempty :: IO a #

mappend :: IO a -> IO a -> IO a #

mconcat :: [IO a] -> IO a #

Monoid (Deque a) 
Instance details

Defined in Control.Lens.Internal.Deque

Methods

mempty :: Deque a #

mappend :: Deque a -> Deque a -> Deque a #

mconcat :: [Deque a] -> Deque a #

Monoid (Leftmost a) 
Instance details

Defined in Control.Lens.Internal.Fold

Methods

mempty :: Leftmost a #

mappend :: Leftmost a -> Leftmost a -> Leftmost a #

mconcat :: [Leftmost a] -> Leftmost a #

Monoid (Rightmost a) 
Instance details

Defined in Control.Lens.Internal.Fold

Monoid a => Monoid (May a) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

mempty :: May a #

mappend :: May a -> May a -> May a #

mconcat :: [May a] -> May a #

Monoid a => Monoid (May a) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

mempty :: May a #

mappend :: May a -> May a -> May a #

mconcat :: [May a] -> May a #

Ord ref => Monoid (DefinedCTEs ref) 
Instance details

Defined in Language.SQL.SimpleSQL.RewriteCollectDeps

Methods

mempty :: DefinedCTEs ref #

mappend :: DefinedCTEs ref -> DefinedCTEs ref -> DefinedCTEs ref #

mconcat :: [DefinedCTEs ref] -> DefinedCTEs ref #

Ord ref => Monoid (Dependencies ref) 
Instance details

Defined in Language.SQL.SimpleSQL.RewriteCollectDeps

Methods

mempty :: Dependencies ref #

mappend :: Dependencies ref -> Dependencies ref -> Dependencies ref #

mconcat :: [Dependencies ref] -> Dependencies ref #

Monoid (ResultCache a) 
Instance details

Defined in Polysemy.Memoize

Ord ref => Monoid (DefinedCTEs ref) 
Instance details

Defined in PostgresqlSyntax.Ast.RewriteCollectDeps

Methods

mempty :: DefinedCTEs ref #

mappend :: DefinedCTEs ref -> DefinedCTEs ref -> DefinedCTEs ref #

mconcat :: [DefinedCTEs ref] -> DefinedCTEs ref #

Ord ref => Monoid (Dependencies ref) 
Instance details

Defined in PostgresqlSyntax.Ast.RewriteCollectDeps

Methods

mempty :: Dependencies ref #

mappend :: Dependencies ref -> Dependencies ref -> Dependencies ref #

mconcat :: [Dependencies ref] -> Dependencies ref #

Monoid a => Monoid (ME a) 
Instance details

Defined in Napkin.Render.PrettyPrint

Methods

mempty :: ME a #

mappend :: ME a -> ME a -> ME a #

mconcat :: [ME a] -> ME a #

Monoid (InfoMod a) 
Instance details

Defined in Options.Applicative.Builder

Methods

mempty :: InfoMod a #

mappend :: InfoMod a -> InfoMod a -> InfoMod a #

mconcat :: [InfoMod a] -> InfoMod a #

Monoid (DefaultProp a) 
Instance details

Defined in Options.Applicative.Builder.Internal

Semigroup a => Monoid (Chunk a) 
Instance details

Defined in Options.Applicative.Help.Chunk

Methods

mempty :: Chunk a #

mappend :: Chunk a -> Chunk a -> Chunk a #

mconcat :: [Chunk a] -> Chunk a #

Monoid (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

mempty :: Doc a #

mappend :: Doc a -> Doc a -> Doc a #

mconcat :: [Doc a] -> Doc a #

Monoid (Doc ann)
mempty = emptyDoc
mconcat = hcat
>>> mappend "hello" "world" :: Doc ann
helloworld
Instance details

Defined in Prettyprinter.Internal

Methods

mempty :: Doc ann #

mappend :: Doc ann -> Doc ann -> Doc ann #

mconcat :: [Doc ann] -> Doc ann #

Monoid (Array a) 
Instance details

Defined in Data.Primitive.Array

Methods

mempty :: Array a #

mappend :: Array a -> Array a -> Array a #

mconcat :: [Array a] -> Array a #

Monoid (PrimArray a)

Since: primitive-0.6.4.0

Instance details

Defined in Data.Primitive.PrimArray

Monoid (SmallArray a) 
Instance details

Defined in Data.Primitive.SmallArray

Monad m => Monoid (RetryPolicyM m) 
Instance details

Defined in Control.Retry

Monoid (GLogFunc msg)

mempty peforms no logging.

Since: rio-0.1.13.0

Instance details

Defined in RIO.Prelude.Logger

Methods

mempty :: GLogFunc msg #

mappend :: GLogFunc msg -> GLogFunc msg -> GLogFunc msg #

mconcat :: [GLogFunc msg] -> GLogFunc msg #

(Generic a, GMonoid (Rep a)) => Monoid (GenericSemigroupMonoid a) 
Instance details

Defined in Data.Semigroup.Generic

Monoid a => Monoid (I a)

Since: sop-core-0.4.0.0

Instance details

Defined in Data.SOP.BasicFunctors

Methods

mempty :: I a #

mappend :: I a -> I a -> I a #

mconcat :: [I a] -> I a #

Semigroup a => Monoid (Maybe a) 
Instance details

Defined in Data.Strict.Maybe

Methods

mempty :: Maybe a #

mappend :: Maybe a -> Maybe a -> Maybe a #

mconcat :: [Maybe a] -> Maybe a #

Monoid a => Monoid (Q a)

Since: template-haskell-2.17.0.0

Instance details

Defined in Language.Haskell.TH.Syntax

Methods

mempty :: Q a #

mappend :: Q a -> Q a -> Q a #

mconcat :: [Q a] -> Q a #

(Hashable a, Eq a) => Monoid (HashSet a)

mempty = empty

mappend = union

O(n+m)

To obtain good performance, the smaller set must be presented as the first argument.

Examples

Expand
>>> mappend (fromList [1,2]) (fromList [2,3])
fromList [1,2,3]
Instance details

Defined in Data.HashSet.Internal

Methods

mempty :: HashSet a #

mappend :: HashSet a -> HashSet a -> HashSet a #

mconcat :: [HashSet a] -> HashSet a #

Monoid (Vector a) 
Instance details

Defined in Data.Vector

Methods

mempty :: Vector a #

mappend :: Vector a -> Vector a -> Vector a #

mconcat :: [Vector a] -> Vector a #

Prim a => Monoid (Vector a) 
Instance details

Defined in Data.Vector.Primitive

Methods

mempty :: Vector a #

mappend :: Vector a -> Vector a -> Vector a #

mconcat :: [Vector a] -> Vector a #

Storable a => Monoid (Vector a) 
Instance details

Defined in Data.Vector.Storable

Methods

mempty :: Vector a #

mappend :: Vector a -> Vector a -> Vector a #

mconcat :: [Vector a] -> Vector a #

Semigroup a => Monoid (Maybe a)

Lift a semigroup into Maybe forming a Monoid according to http://en.wikipedia.org/wiki/Monoid: "Any semigroup S may be turned into a monoid simply by adjoining an element e not in S and defining e*e = e and e*s = s = s*e for all s ∈ S."

Since 4.11.0: constraint on inner a value generalised from Monoid to Semigroup.

@since base-2.01

Instance details

Defined in GHC.Internal.Base

Methods

mempty :: Maybe a #

mappend :: Maybe a -> Maybe a -> Maybe a #

mconcat :: [Maybe a] -> Maybe a #

Monoid a => Monoid (Solo a)

@since base-4.15

Instance details

Defined in GHC.Internal.Base

Methods

mempty :: Solo a #

mappend :: Solo a -> Solo a -> Solo a #

mconcat :: [Solo a] -> Solo a #

Monoid [a]

@since base-2.01

Instance details

Defined in GHC.Internal.Base

Methods

mempty :: [a] #

mappend :: [a] -> [a] -> [a] #

mconcat :: [[a]] -> [a] #

Monoid (Parser i a) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

mempty :: Parser i a #

mappend :: Parser i a -> Parser i a -> Parser i a #

mconcat :: [Parser i a] -> Parser i a #

Monoid a => Monoid (Op a b)

mempty @(Op a b) without newtypes is mempty @(b->a) = _ -> mempty.

mempty :: Op a b
mempty = Op _ -> mempty
Instance details

Defined in Data.Functor.Contravariant

Methods

mempty :: Op a b #

mappend :: Op a b -> Op a b -> Op a b #

mconcat :: [Op a b] -> Op a b #

Ord k => Monoid (Map k v) 
Instance details

Defined in Data.Map.Internal

Methods

mempty :: Map k v #

mappend :: Map k v -> Map k v -> Map k v #

mconcat :: [Map k v] -> Map k v #

Monoid (UniqMap k a) 
Instance details

Defined in GHC.Types.Unique.Map

Methods

mempty :: UniqMap k a #

mappend :: UniqMap k a -> UniqMap k a -> UniqMap k a #

mconcat :: [UniqMap k a] -> UniqMap k a #

Monoid (Proxy s)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Data.Proxy

Methods

mempty :: Proxy s #

mappend :: Proxy s -> Proxy s -> Proxy s #

mconcat :: [Proxy s] -> Proxy s #

Monoid (U1 p)

@since base-4.12.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

mempty :: U1 p #

mappend :: U1 p -> U1 p -> U1 p #

mconcat :: [U1 p] -> U1 p #

(Contravariant f, Applicative f) => Monoid (Folding f a) 
Instance details

Defined in Control.Lens.Internal.Fold

Methods

mempty :: Folding f a #

mappend :: Folding f a -> Folding f a -> Folding f a #

mconcat :: [Folding f a] -> Folding f a #

Monad m => Monoid (Sequenced a m) 
Instance details

Defined in Control.Lens.Internal.Fold

Methods

mempty :: Sequenced a m #

mappend :: Sequenced a m -> Sequenced a m -> Sequenced a m #

mconcat :: [Sequenced a m] -> Sequenced a m #

Applicative f => Monoid (Traversed a f) 
Instance details

Defined in Control.Lens.Internal.Fold

Methods

mempty :: Traversed a f #

mappend :: Traversed a f -> Traversed a f -> Traversed a f #

mconcat :: [Traversed a f] -> Traversed a f #

(Apply f, Applicative f) => Monoid (TraversedF a f) 
Instance details

Defined in Control.Lens.Internal.Fold

Methods

mempty :: TraversedF a f #

mappend :: TraversedF a f -> TraversedF a f -> TraversedF a f #

mconcat :: [TraversedF a f] -> TraversedF a f #

Monoid (f a) => Monoid (Indexing f a)
>>> "cat" ^@.. (folded <> folded)
[(0,'c'),(1,'a'),(2,'t'),(0,'c'),(1,'a'),(2,'t')]
>>> "cat" ^@.. indexing (folded <> folded)
[(0,'c'),(1,'a'),(2,'t'),(3,'c'),(4,'a'),(5,'t')]
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

mempty :: Indexing f a #

mappend :: Indexing f a -> Indexing f a -> Indexing f a #

mconcat :: [Indexing f a] -> Indexing f a #

Monoid (Deepening i a)

This is an illegal Monoid.

Instance details

Defined in Control.Lens.Internal.Level

Methods

mempty :: Deepening i a #

mappend :: Deepening i a -> Deepening i a -> Deepening i a #

mconcat :: [Deepening i a] -> Deepening i a #

Monoid a => Monoid (Err e a) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

mempty :: Err e a #

mappend :: Err e a -> Err e a -> Err e a #

mconcat :: [Err e a] -> Err e a #

Monoid (ReifiedFold s a) 
Instance details

Defined in Control.Lens.Reified

Methods

mempty :: ReifiedFold s a #

mappend :: ReifiedFold s a -> ReifiedFold s a -> ReifiedFold s a #

mconcat :: [ReifiedFold s a] -> ReifiedFold s a #

(Stream s, Ord e) => Monoid (ParseError s e) 
Instance details

Defined in Text.Megaparsec.Error

Methods

mempty :: ParseError s e #

mappend :: ParseError s e -> ParseError s e -> ParseError s e #

mconcat :: [ParseError s e] -> ParseError s e #

Monoid a => Monoid (Err e a) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

mempty :: Err e a #

mappend :: Err e a -> Err e a -> Err e a #

mconcat :: [Err e a] -> Err e a #

Monoid (DryRunResult b) 
Instance details

Defined in Napkin.Run.Effects.Types

HasBackendQueryStats backend => Monoid (QueryStats backend) 
Instance details

Defined in Napkin.Types.QueryStats

Methods

mempty :: QueryStats backend #

mappend :: QueryStats backend -> QueryStats backend -> QueryStats backend #

mconcat :: [QueryStats backend] -> QueryStats backend #

Monoid (Mod f a) 
Instance details

Defined in Options.Applicative.Builder.Internal

Methods

mempty :: Mod f a #

mappend :: Mod f a -> Mod f a -> Mod f a #

mconcat :: [Mod f a] -> Mod f a #

(Ord k, Monoid v) => Monoid (Bias L (OMap k v))

Empty maps and map union. When combining two sets that share elements, the indices of the left argument are preferred, and the values are combined with mappend.

See the asymptotics of unionWithL. Uses the value-lazy variant.

Since: ordered-containers-0.2

Instance details

Defined in Data.Map.Ordered.Internal

Methods

mempty :: Bias L (OMap k v) #

mappend :: Bias L (OMap k v) -> Bias L (OMap k v) -> Bias L (OMap k v) #

mconcat :: [Bias L (OMap k v)] -> Bias L (OMap k v) #

Ord a => Monoid (Bias L (OSet a))

Empty sets and set union. When combining two sets that share elements, the indices of the left argument are preferred.

See the asymptotics of (|<>).

Since: ordered-containers-0.2

Instance details

Defined in Data.Set.Ordered

Methods

mempty :: Bias L (OSet a) #

mappend :: Bias L (OSet a) -> Bias L (OSet a) -> Bias L (OSet a) #

mconcat :: [Bias L (OSet a)] -> Bias L (OSet a) #

(Ord k, Monoid v) => Monoid (Bias R (OMap k v))

Empty maps and map union. When combining two sets that share elements, the indices of the right argument are preferred, and the values are combined with mappend.

See the asymptotics of unionWithR. Uses the value-lazy variant.

Since: ordered-containers-0.2

Instance details

Defined in Data.Map.Ordered.Internal

Methods

mempty :: Bias R (OMap k v) #

mappend :: Bias R (OMap k v) -> Bias R (OMap k v) -> Bias R (OMap k v) #

mconcat :: [Bias R (OMap k v)] -> Bias R (OMap k v) #

Ord a => Monoid (Bias R (OSet a))

Empty sets and set union. When combining two sets that share elements, the indices of the right argument are preferred.

See the asymptotics of (<>|).

Since: ordered-containers-0.2

Instance details

Defined in Data.Set.Ordered

Methods

mempty :: Bias R (OSet a) #

mappend :: Bias R (OSet a) -> Bias R (OSet a) -> Bias R (OSet a) #

mconcat :: [Bias R (OSet a)] -> Bias R (OSet a) #

Monoid a => Monoid (Sem f a)

Since: polysemy-1.6.0.0

Instance details

Defined in Polysemy.Internal

Methods

mempty :: Sem f a #

mappend :: Sem f a -> Sem f a -> Sem f a #

mconcat :: [Sem f a] -> Sem f a #

Monoid a => Monoid (RIO env a) 
Instance details

Defined in RIO.Prelude.RIO

Methods

mempty :: RIO env a #

mappend :: RIO env a -> RIO env a -> RIO env a #

mconcat :: [RIO env a] -> RIO env a #

(Monad m, Monoid a) => Monoid (ActionT m a) 
Instance details

Defined in Web.Scotty.Internal.Types

Methods

mempty :: ActionT m a #

mappend :: ActionT m a -> ActionT m a -> ActionT m a #

mconcat :: [ActionT m a] -> ActionT m a #

Monoid a => Monoid (ScottyT m a) 
Instance details

Defined in Web.Scotty.Internal.Types

Methods

mempty :: ScottyT m a #

mappend :: ScottyT m a -> ScottyT m a -> ScottyT m a #

mconcat :: [ScottyT m a] -> ScottyT m a #

(Monoid a, Monoid b) => Monoid (Pair a b) 
Instance details

Defined in Data.Strict.Tuple

Methods

mempty :: Pair a b #

mappend :: Pair a b -> Pair a b -> Pair a b #

mconcat :: [Pair a b] -> Pair a b #

(Monoid a, MonadUnliftIO m) => Monoid (Conc m a)

Since: unliftio-0.2.9.0

Instance details

Defined in UnliftIO.Internals.Async

Methods

mempty :: Conc m a #

mappend :: Conc m a -> Conc m a -> Conc m a #

mconcat :: [Conc m a] -> Conc m a #

(Semigroup a, Monoid a, MonadUnliftIO m) => Monoid (Concurrently m a)

Since: unliftio-0.1.0.0

Instance details

Defined in UnliftIO.Internals.Async

(Eq k, Hashable k) => Monoid (HashMap k v)

mempty = empty

mappend = union

If a key occurs in both maps, the mapping from the first will be the mapping in the result.

Examples

Expand
>>> mappend (fromList [(1,'a'),(2,'b')]) (fromList [(2,'c'),(3,'d')])
fromList [(1,'a'),(2,'b'),(3,'d')]
Instance details

Defined in Data.HashMap.Internal

Methods

mempty :: HashMap k v #

mappend :: HashMap k v -> HashMap k v -> HashMap k v #

mconcat :: [HashMap k v] -> HashMap k v #

(Monoid a, Monoid b) => Monoid (a, b)

@since base-2.01

Instance details

Defined in GHC.Internal.Base

Methods

mempty :: (a, b) #

mappend :: (a, b) -> (a, b) -> (a, b) #

mconcat :: [(a, b)] -> (a, b) #

Monoid b => Monoid (a -> b)

@since base-2.01

Instance details

Defined in GHC.Internal.Base

Methods

mempty :: a -> b #

mappend :: (a -> b) -> (a -> b) -> a -> b #

mconcat :: [a -> b] -> a -> b #

Monoid a => Monoid (Const a b)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Const

Methods

mempty :: Const a b #

mappend :: Const a b -> Const a b -> Const a b #

mconcat :: [Const a b] -> Const a b #

(Applicative f, Monoid a) => Monoid (Ap f a)

@since base-4.12.0.0

Instance details

Defined in GHC.Internal.Data.Monoid

Methods

mempty :: Ap f a #

mappend :: Ap f a -> Ap f a -> Ap f a #

mconcat :: [Ap f a] -> Ap f a #

Alternative f => Monoid (Alt f a)

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

mempty :: Alt f a #

mappend :: Alt f a -> Alt f a -> Alt f a #

mconcat :: [Alt f a] -> Alt f a #

Monoid (f p) => Monoid (Rec1 f p)

@since base-4.12.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

mempty :: Rec1 f p #

mappend :: Rec1 f p -> Rec1 f p -> Rec1 f p #

mconcat :: [Rec1 f p] -> Rec1 f p #

Monad m => Monoid (Sequenced a m) 
Instance details

Defined in WithIndex

Methods

mempty :: Sequenced a m #

mappend :: Sequenced a m -> Sequenced a m -> Sequenced a m #

mconcat :: [Sequenced a m] -> Sequenced a m #

Applicative f => Monoid (Traversed a f) 
Instance details

Defined in WithIndex

Methods

mempty :: Traversed a f #

mappend :: Traversed a f -> Traversed a f -> Traversed a f #

mconcat :: [Traversed a f] -> Traversed a f #

(Monad m, Monoid r) => Monoid (Effect m r a) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

mempty :: Effect m r a #

mappend :: Effect m r a -> Effect m r a -> Effect m r a #

mconcat :: [Effect m r a] -> Effect m r a #

(Applicative f, Monoid a, Monad m) => Monoid (Freed f m a) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

mempty :: Freed f m a #

mappend :: Freed f m a -> Freed f m a -> Freed f m a #

mconcat :: [Freed f m a] -> Freed f m a #

Monoid (ReifiedIndexedFold i s a) 
Instance details

Defined in Control.Lens.Reified

Monad m => Monoid (Handler e m a) 
Instance details

Defined in Control.Monad.Error.Lens

Methods

mempty :: Handler e m a #

mappend :: Handler e m a -> Handler e m a -> Handler e m a #

mconcat :: [Handler e m a] -> Handler e m a #

(Monad m, Monoid r) => Monoid (Effect m r a) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

mempty :: Effect m r a #

mappend :: Effect m r a -> Effect m r a -> Effect m r a #

mconcat :: [Effect m r a] -> Effect m r a #

Reifies s (ReifiedMonoid a) => Monoid (ReflectedMonoid a s) 
Instance details

Defined in Data.Reflection

Monoid a => Monoid (K a b)

Since: sop-core-0.4.0.0

Instance details

Defined in Data.SOP.BasicFunctors

Methods

mempty :: K a b #

mappend :: K a b -> K a b -> K a b #

mconcat :: [K a b] -> K a b #

(All (Compose Monoid f) xs, All (Compose Semigroup f) xs) => Monoid (NP f xs)

Since: sop-core-0.4.0.0

Instance details

Defined in Data.SOP.NP

Methods

mempty :: NP f xs #

mappend :: NP f xs -> NP f xs -> NP f xs #

mconcat :: [NP f xs] -> NP f xs #

Monoid (NP (NP f) xss) => Monoid (POP f xss)

Since: sop-core-0.4.0.0

Instance details

Defined in Data.SOP.NP

Methods

mempty :: POP f xss #

mappend :: POP f xss -> POP f xss -> POP f xss #

mconcat :: [POP f xss] -> POP f xss #

(Semigroup a, Monoid a) => Monoid (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

mempty :: Tagged s a #

mappend :: Tagged s a -> Tagged s a -> Tagged s a #

mconcat :: [Tagged s a] -> Tagged s a #

Monoid a => Monoid (Constant a b) 
Instance details

Defined in Data.Functor.Constant

Methods

mempty :: Constant a b #

mappend :: Constant a b -> Constant a b -> Constant a b #

mconcat :: [Constant a b] -> Constant a b #

(Monoid a, Monoid b, Monoid c) => Monoid (a, b, c)

@since base-2.01

Instance details

Defined in GHC.Internal.Base

Methods

mempty :: (a, b, c) #

mappend :: (a, b, c) -> (a, b, c) -> (a, b, c) #

mconcat :: [(a, b, c)] -> (a, b, c) #

(Monoid (f a), Monoid (g a)) => Monoid (Product f g a)

Since: base-4.16.0.0

Instance details

Defined in Data.Functor.Product

Methods

mempty :: Product f g a #

mappend :: Product f g a -> Product f g a -> Product f g a #

mconcat :: [Product f g a] -> Product f g a #

Monad m => Monoid (ConduitT i o m ()) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

mempty :: ConduitT i o m () #

mappend :: ConduitT i o m () -> ConduitT i o m () -> ConduitT i o m () #

mconcat :: [ConduitT i o m ()] -> ConduitT i o m () #

(Monoid (f p), Monoid (g p)) => Monoid ((f :*: g) p)

@since base-4.12.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

mempty :: (f :*: g) p #

mappend :: (f :*: g) p -> (f :*: g) p -> (f :*: g) p #

mconcat :: [(f :*: g) p] -> (f :*: g) p #

Monoid c => Monoid (K1 i c p)

@since base-4.12.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

mempty :: K1 i c p #

mappend :: K1 i c p -> K1 i c p -> K1 i c p #

mconcat :: [K1 i c p] -> K1 i c p #

(Monoid a, Monoid b, Monoid c, Monoid d) => Monoid (a, b, c, d)

@since base-2.01

Instance details

Defined in GHC.Internal.Base

Methods

mempty :: (a, b, c, d) #

mappend :: (a, b, c, d) -> (a, b, c, d) -> (a, b, c, d) #

mconcat :: [(a, b, c, d)] -> (a, b, c, d) #

Monoid (f (g a)) => Monoid (Compose f g a)

Since: base-4.16.0.0

Instance details

Defined in Data.Functor.Compose

Methods

mempty :: Compose f g a #

mappend :: Compose f g a -> Compose f g a -> Compose f g a #

mconcat :: [Compose f g a] -> Compose f g a #

Monoid (f (g p)) => Monoid ((f :.: g) p)

@since base-4.12.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

mempty :: (f :.: g) p #

mappend :: (f :.: g) p -> (f :.: g) p -> (f :.: g) p #

mconcat :: [(f :.: g) p] -> (f :.: g) p #

Monoid (f p) => Monoid (M1 i c f p)

@since base-4.12.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

mempty :: M1 i c f p #

mappend :: M1 i c f p -> M1 i c f p -> M1 i c f p #

mconcat :: [M1 i c f p] -> M1 i c f p #

Contravariant g => Monoid (BazaarT p g a b t) 
Instance details

Defined in Control.Lens.Internal.Bazaar

Methods

mempty :: BazaarT p g a b t #

mappend :: BazaarT p g a b t -> BazaarT p g a b t -> BazaarT p g a b t #

mconcat :: [BazaarT p g a b t] -> BazaarT p g a b t #

Monoid (f (g x)) => Monoid ((f :.: g) x)

Since: sop-core-0.4.0.0

Instance details

Defined in Data.SOP.BasicFunctors

Methods

mempty :: (f :.: g) x #

mappend :: (f :.: g) x -> (f :.: g) x -> (f :.: g) x #

mconcat :: [(f :.: g) x] -> (f :.: g) x #

(Monoid a, Monoid b, Monoid c, Monoid d, Monoid e) => Monoid (a, b, c, d, e)

@since base-2.01

Instance details

Defined in GHC.Internal.Base

Methods

mempty :: (a, b, c, d, e) #

mappend :: (a, b, c, d, e) -> (a, b, c, d, e) -> (a, b, c, d, e) #

mconcat :: [(a, b, c, d, e)] -> (a, b, c, d, e) #

Monad m => Monoid (Pipe l i o u m ()) 
Instance details

Defined in Data.Conduit.Internal.Pipe

Methods

mempty :: Pipe l i o u m () #

mappend :: Pipe l i o u m () -> Pipe l i o u m () -> Pipe l i o u m () #

mconcat :: [Pipe l i o u m ()] -> Pipe l i o u m () #

class Semigroup a where #

The class of semigroups (types with an associative binary operation).

Instances should satisfy the following:

Associativity
x <> (y <> z) = (x <> y) <> z

You can alternatively define sconcat instead of (<>), in which case the laws are:

Unit
sconcat (pure x) = x
Multiplication
sconcat (join xss) = sconcat (fmap sconcat xss)

@since base-4.9.0.0

Minimal complete definition

(<>) | sconcat

Methods

(<>) :: a -> a -> a infixr 6 #

An associative operation.

Examples

Expand
>>> [1,2,3] <> [4,5,6]
[1,2,3,4,5,6]
>>> Just [1, 2, 3] <> Just [4, 5, 6]
Just [1,2,3,4,5,6]
>>> putStr "Hello, " <> putStrLn "World!"
Hello, World!

sconcat :: NonEmpty a -> a #

Reduce a non-empty list with <>

The default definition should be sufficient, but this can be overridden for efficiency.

Examples

Expand

For the following examples, we will assume that we have:

>>> import Data.List.NonEmpty (NonEmpty (..))
>>> sconcat $ "Hello" :| [" ", "Haskell", "!"]
"Hello Haskell!"
>>> sconcat $ Just [1, 2, 3] :| [Nothing, Just [4, 5, 6]]
Just [1,2,3,4,5,6]
>>> sconcat $ Left 1 :| [Right 2, Left 3, Right 4]
Right 2

stimes :: Integral b => b -> a -> a #

Repeat a value n times.

The default definition will raise an exception for a multiplier that is <= 0. This may be overridden with an implementation that is total. For monoids it is preferred to use stimesMonoid.

By making this a member of the class, idempotent semigroups and monoids can upgrade this to execute in O(1) by picking stimes = stimesIdempotent or stimes = stimesIdempotentMonoid respectively.

Examples

Expand
>>> stimes 4 [1]
[1,1,1,1]
>>> stimes 5 (putStr "hi!")
hi!hi!hi!hi!hi!
>>> stimes 3 (Right ":)")
Right ":)"

Instances

Instances details
Semigroup Series 
Instance details

Defined in Data.Aeson.Encoding.Internal

Semigroup Key 
Instance details

Defined in Data.Aeson.Key

Methods

(<>) :: Key -> Key -> Key #

sconcat :: NonEmpty Key -> Key #

stimes :: Integral b => b -> Key -> Key #

Semigroup Patch 
Instance details

Defined in Data.Aeson.Patch

Methods

(<>) :: Patch -> Patch -> Patch #

sconcat :: NonEmpty Patch -> Patch #

stimes :: Integral b => b -> Patch -> Patch #

Semigroup Pointer 
Instance details

Defined in Data.Aeson.Pointer

Semigroup WarningParserMonoid 
Instance details

Defined in Data.Aeson.WarningParser

Methods

(<>) :: WarningParserMonoid -> WarningParserMonoid -> WarningParserMonoid #

sconcat :: NonEmpty WarningParserMonoid -> WarningParserMonoid #

stimes :: Integral b => b -> WarningParserMonoid -> WarningParserMonoid #

Semigroup More 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

(<>) :: More -> More -> More #

sconcat :: NonEmpty More -> More #

stimes :: Integral b => b -> More -> More #

Semigroup ByteArray

Since: base-4.17.0.0

Instance details

Defined in Data.Array.Byte

Semigroup String 
Instance details

Defined in Basement.UTF8.Base

Semigroup ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

Semigroup ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Semigroup ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Semigroup IntSet

Since: containers-0.5.7

Instance details

Defined in Data.IntSet.Internal

Semigroup Format 
Instance details

Defined in Fmt.Internal.Template

Semigroup LabelSet 
Instance details

Defined in GHC.Cmm.Dataflow.Label

Semigroup PotentialUnifiers 
Instance details

Defined in GHC.Core.InstEnv

Semigroup FastString 
Instance details

Defined in GHC.Data.FastString

Semigroup Word64Set

Since: ghc-0.5.7

Instance details

Defined in GHC.Data.Word64Set.Internal

Semigroup PluginRecompile 
Instance details

Defined in GHC.Driver.Plugins

Semigroup Nablas 
Instance details

Defined in GHC.HsToCore.Pmc.Solver.Types

Semigroup JStgStat 
Instance details

Defined in GHC.JS.JStg.Syntax

Semigroup JStat 
Instance details

Defined in GHC.JS.Syntax

Methods

(<>) :: JStat -> JStat -> JStat #

sconcat :: NonEmpty JStat -> JStat #

stimes :: Integral b => b -> JStat -> JStat #

Semigroup AnnListItem 
Instance details

Defined in GHC.Parser.Annotation

Semigroup EpAnnComments 
Instance details

Defined in GHC.Parser.Annotation

Semigroup EpaLocation 
Instance details

Defined in GHC.Parser.Annotation

Semigroup JSOptions 
Instance details

Defined in GHC.StgToJS.Object

Semigroup InsideLam

If any occurrence of an identifier is inside a lambda, then the occurrence info of that identifier marks it as occurring inside a lambda

Instance details

Defined in GHC.Types.Basic

Semigroup InterestingCxt

If there is any interesting identifier occurrence, then the aggregated occurrence info of that identifier is considered interesting.

Instance details

Defined in GHC.Types.Basic

Semigroup SuccessFlag 
Instance details

Defined in GHC.Types.Basic

Semigroup ShadowedFieldGREs 
Instance details

Defined in GHC.Types.Name.Reader

Methods

(<>) :: ShadowedFieldGREs -> ShadowedFieldGREs -> ShadowedFieldGREs #

sconcat :: NonEmpty ShadowedFieldGREs -> ShadowedFieldGREs #

stimes :: Integral b => b -> ShadowedFieldGREs -> ShadowedFieldGREs #

Semigroup ShadowedGREs 
Instance details

Defined in GHC.Types.Name.Reader

Methods

(<>) :: ShadowedGREs -> ShadowedGREs -> ShadowedGREs #

sconcat :: NonEmpty ShadowedGREs -> ShadowedGREs #

stimes :: Integral b => b -> ShadowedGREs -> ShadowedGREs #

Semigroup BufSpan 
Instance details

Defined in GHC.Types.SrcLoc

Semigroup ModuleOrigin 
Instance details

Defined in GHC.Unit.State

Semigroup UnitVisibility 
Instance details

Defined in GHC.Unit.State

Methods

(<>) :: UnitVisibility -> UnitVisibility -> UnitVisibility #

sconcat :: NonEmpty UnitVisibility -> UnitVisibility #

stimes :: Integral b => b -> UnitVisibility -> UnitVisibility #

Semigroup Void

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Base

Methods

(<>) :: Void -> Void -> Void #

sconcat :: NonEmpty Void -> Void #

stimes :: Integral b => b -> Void -> Void #

Semigroup All

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

(<>) :: All -> All -> All #

sconcat :: NonEmpty All -> All #

stimes :: Integral b => b -> All -> All #

Semigroup Any

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

(<>) :: Any -> Any -> Any #

sconcat :: NonEmpty Any -> Any #

stimes :: Integral b => b -> Any -> Any #

Semigroup Ordering

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Base

Semigroup Request 
Instance details

Defined in Gogol.Types

Semigroup Form 
Instance details

Defined in Web.Internal.FormUrlEncoded

Methods

(<>) :: Form -> Form -> Form #

sconcat :: NonEmpty Form -> Form #

stimes :: Integral b => b -> Form -> Form #

Semigroup CookieJar 
Instance details

Defined in Network.HTTP.Client.Types

Semigroup RequestBody 
Instance details

Defined in Network.HTTP.Client.Types

Semigroup LogStr 
Instance details

Defined in Katip.Core

Semigroup Namespace 
Instance details

Defined in Katip.Core

Semigroup PayloadSelection 
Instance details

Defined in Katip.Core

Semigroup Scribe

Combine two scribes. Publishes to the left scribe if the left would permit the item and to the right scribe if the right would permit the item. Finalizers are called in sequence from left to right.

Instance details

Defined in Katip.Core

Semigroup SimpleLogPayload 
Instance details

Defined in Katip.Core

Semigroup LogContexts 
Instance details

Defined in Katip.Monadic

Semigroup Pos 
Instance details

Defined in Text.Megaparsec.Pos

Methods

(<>) :: Pos -> Pos -> Pos #

sconcat :: NonEmpty Pos -> Pos #

stimes :: Integral b => b -> Pos -> Pos #

Semigroup Name 
Instance details

Defined in Napkin.Types.Core

Methods

(<>) :: Name -> Name -> Name #

sconcat :: NonEmpty Name -> Name #

stimes :: Integral b => b -> Name -> Name #

Semigroup SpecTableName 
Instance details

Defined in Napkin.Types.Core

Semigroup DefinedCTEs 
Instance details

Defined in Napkin.Types.RewriteCollectDeps

Methods

(<>) :: DefinedCTEs -> DefinedCTEs -> DefinedCTEs #

sconcat :: NonEmpty DefinedCTEs -> DefinedCTEs #

stimes :: Integral b => b -> DefinedCTEs -> DefinedCTEs #

Semigroup Dependencies 
Instance details

Defined in Napkin.Types.RewriteCollectDeps

Methods

(<>) :: Dependencies -> Dependencies -> Dependencies #

sconcat :: NonEmpty Dependencies -> Dependencies #

stimes :: Integral b => b -> Dependencies -> Dependencies #

Semigroup SqlTemplateVariables 
Instance details

Defined in Napkin.Parse.Interpolation.Types

Semigroup Artifacts 
Instance details

Defined in Napkin.Run.Effects.Interceptors.DiscoverDependencies.Types

Semigroup Dependencies 
Instance details

Defined in Napkin.Run.Effects.Interceptors.DiscoverDependencies.Types

Semigroup AssertionGroup 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

Semigroup AssertionLog 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

Semigroup ExtraDependencies 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

Semigroup HiddenArtifacts 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

Semigroup HiddenDependencies 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

Semigroup MetaArguments 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

Semigroup TableMemo 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

Semigroup TableMemos 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

Semigroup AppName 
Instance details

Defined in Napkin.Spec.Types.Runtime

Semigroup AuthSpecFile 
Instance details

Defined in Napkin.Spec.Types.Runtime

Semigroup Query 
Instance details

Defined in Database.ODBC.SQLServer

Methods

(<>) :: Query -> Query -> Query #

sconcat :: NonEmpty Query -> Query #

stimes :: Integral b => b -> Query -> Query #

Semigroup PrefsMod 
Instance details

Defined in Options.Applicative.Builder

Semigroup ParserHelp 
Instance details

Defined in Options.Applicative.Help.Types

Semigroup Completer 
Instance details

Defined in Options.Applicative.Types

Semigroup ParseError 
Instance details

Defined in Options.Applicative.Types

Semigroup OsString 
Instance details

Defined in System.OsString.Internal.Types

Semigroup PosixString 
Instance details

Defined in System.OsString.Internal.Types

Semigroup WindowsString 
Instance details

Defined in System.OsString.Internal.Types

Semigroup Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Methods

(<>) :: Doc -> Doc -> Doc #

sconcat :: NonEmpty Doc -> Doc #

stimes :: Integral b => b -> Doc -> Doc #

Semigroup AnsiStyle

Keep the first decision for each of foreground color, background color, boldness, italication, and underlining. If a certain style is not set, the terminal’s default will be used.

Example:

color Red <> color Green

is red because the first color wins, and not bold because (or if) that’s the terminal’s default.

Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Semigroup LogFunc

Perform both sets of actions per log entry.

Since: rio-0.0.0.0

Instance details

Defined in RIO.Prelude.Logger

Semigroup InLowCase 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Semigroup InSource 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Semigroup SQLTokenStream 
Instance details

Defined in Language.SQL.SimpleSQL.Lex.LexType

Semigroup Key 
Instance details

Defined in Text.Mustache.Type

Methods

(<>) :: Key -> Key -> Key #

sconcat :: NonEmpty Key -> Key #

stimes :: Integral b => b -> Key -> Key #

Semigroup Template 
Instance details

Defined in Text.Mustache.Type

Semigroup Builder 
Instance details

Defined in Data.Text.Internal.Builder

Semigroup StrictBuilder

Concatenation of StrictBuilder is right-biased: the right builder will be run first. This allows a builder to run tail-recursively when it was accumulated left-to-right.

Instance details

Defined in Data.Text.Internal.StrictBuilder

Semigroup ShortText 
Instance details

Defined in Data.Text.Short.Internal

Semigroup CalendarDiffDays

Additive

Instance details

Defined in Data.Time.Calendar.CalendarDiffDays

Semigroup CalendarDiffTime

Additive

Instance details

Defined in Data.Time.LocalTime.Internal.CalendarDiffTime

Semigroup Query 
Instance details

Defined in URI.ByteString.Types

Methods

(<>) :: Query -> Query -> Query #

sconcat :: NonEmpty Query -> Query #

stimes :: Integral b => b -> Query -> Query #

Semigroup ()

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Base

Methods

(<>) :: () -> () -> () #

sconcat :: NonEmpty () -> () #

stimes :: Integral b => b -> () -> () #

Semigroup (KeyMap v) 
Instance details

Defined in Data.Aeson.KeyMap

Methods

(<>) :: KeyMap v -> KeyMap v -> KeyMap v #

sconcat :: NonEmpty (KeyMap v) -> KeyMap v #

stimes :: Integral b => b -> KeyMap v -> KeyMap v #

Semigroup (IResult a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

(<>) :: IResult a -> IResult a -> IResult a #

sconcat :: NonEmpty (IResult a) -> IResult a #

stimes :: Integral b => b -> IResult a -> IResult a #

Semigroup (Parser a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

(<>) :: Parser a -> Parser a -> Parser a #

sconcat :: NonEmpty (Parser a) -> Parser a #

stimes :: Integral b => b -> Parser a -> Parser a #

Semigroup (Result a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

(<>) :: Result a -> Result a -> Result a #

sconcat :: NonEmpty (Result a) -> Result a #

stimes :: Integral b => b -> Result a -> Result a #

Monoid a => Semigroup (WithJSONWarnings a) 
Instance details

Defined in Data.Aeson.WarningParser

Semigroup (FromMaybe b) 
Instance details

Defined in Data.Foldable1

Methods

(<>) :: FromMaybe b -> FromMaybe b -> FromMaybe b #

sconcat :: NonEmpty (FromMaybe b) -> FromMaybe b #

stimes :: Integral b0 => b0 -> FromMaybe b -> FromMaybe b #

Semigroup a => Semigroup (JoinWith a) 
Instance details

Defined in Data.Foldable1

Methods

(<>) :: JoinWith a -> JoinWith a -> JoinWith a #

sconcat :: NonEmpty (JoinWith a) -> JoinWith a #

stimes :: Integral b => b -> JoinWith a -> JoinWith a #

Semigroup (NonEmptyDList a) 
Instance details

Defined in Data.Foldable1

Methods

(<>) :: NonEmptyDList a -> NonEmptyDList a -> NonEmptyDList a #

sconcat :: NonEmpty (NonEmptyDList a) -> NonEmptyDList a #

stimes :: Integral b => b -> NonEmptyDList a -> NonEmptyDList a #

Semigroup (Comparison a)

(<>) on comparisons combines results with (<>) @Ordering. Without newtypes this equals liftA2 (liftA2 (<>)).

(<>) :: Comparison a -> Comparison a -> Comparison a
Comparison cmp <> Comparison cmp' = Comparison a a' ->
  cmp a a' <> cmp a a'
Instance details

Defined in Data.Functor.Contravariant

Semigroup (Equivalence a)

(<>) on equivalences uses logical conjunction (&&) on the results. Without newtypes this equals liftA2 (liftA2 (&&)).

(<>) :: Equivalence a -> Equivalence a -> Equivalence a
Equivalence equiv <> Equivalence equiv' = Equivalence a b ->
  equiv a b && equiv' a b
Instance details

Defined in Data.Functor.Contravariant

Semigroup (Predicate a)

(<>) on predicates uses logical conjunction (&&) on the results. Without newtypes this equals liftA2 (&&).

(<>) :: Predicate a -> Predicate a -> Predicate a
Predicate pred <> Predicate pred' = Predicate a ->
  pred a && pred' a
Instance details

Defined in Data.Functor.Contravariant

Methods

(<>) :: Predicate a -> Predicate a -> Predicate a #

sconcat :: NonEmpty (Predicate a) -> Predicate a #

stimes :: Integral b => b -> Predicate a -> Predicate a #

Semigroup (First a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(<>) :: First a -> First a -> First a #

sconcat :: NonEmpty (First a) -> First a #

stimes :: Integral b => b -> First a -> First a #

Semigroup (Last a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(<>) :: Last a -> Last a -> Last a #

sconcat :: NonEmpty (Last a) -> Last a #

stimes :: Integral b => b -> Last a -> Last a #

Ord a => Semigroup (Max a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(<>) :: Max a -> Max a -> Max a #

sconcat :: NonEmpty (Max a) -> Max a #

stimes :: Integral b => b -> Max a -> Max a #

Ord a => Semigroup (Min a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(<>) :: Min a -> Min a -> Min a #

sconcat :: NonEmpty (Min a) -> Min a #

stimes :: Integral b => b -> Min a -> Min a #

Monoid m => Semigroup (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

PrimType ty => Semigroup (Block ty) 
Instance details

Defined in Basement.Block.Base

Methods

(<>) :: Block ty -> Block ty -> Block ty #

sconcat :: NonEmpty (Block ty) -> Block ty #

stimes :: Integral b => b -> Block ty -> Block ty #

Semigroup (CountOf ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

(<>) :: CountOf ty -> CountOf ty -> CountOf ty #

sconcat :: NonEmpty (CountOf ty) -> CountOf ty #

stimes :: Integral b => b -> CountOf ty -> CountOf ty #

PrimType ty => Semigroup (UArray ty) 
Instance details

Defined in Basement.UArray.Base

Methods

(<>) :: UArray ty -> UArray ty -> UArray ty #

sconcat :: NonEmpty (UArray ty) -> UArray ty #

stimes :: Integral b => b -> UArray ty -> UArray ty #

Semigroup (IntMap a)

Since: containers-0.5.7

Instance details

Defined in Data.IntMap.Internal

Methods

(<>) :: IntMap a -> IntMap a -> IntMap a #

sconcat :: NonEmpty (IntMap a) -> IntMap a #

stimes :: Integral b => b -> IntMap a -> IntMap a #

Semigroup (Seq a)

Since: containers-0.5.7

Instance details

Defined in Data.Sequence.Internal

Methods

(<>) :: Seq a -> Seq a -> Seq a #

sconcat :: NonEmpty (Seq a) -> Seq a #

stimes :: Integral b => b -> Seq a -> Seq a #

Ord a => Semigroup (Intersection a) 
Instance details

Defined in Data.Set.Internal

Semigroup (MergeSet a) 
Instance details

Defined in Data.Set.Internal

Methods

(<>) :: MergeSet a -> MergeSet a -> MergeSet a #

sconcat :: NonEmpty (MergeSet a) -> MergeSet a #

stimes :: Integral b => b -> MergeSet a -> MergeSet a #

Ord a => Semigroup (Set a)

Since: containers-0.5.7

Instance details

Defined in Data.Set.Internal

Methods

(<>) :: Set a -> Set a -> Set a #

sconcat :: NonEmpty (Set a) -> Set a #

stimes :: Integral b => b -> Set a -> Set a #

Semigroup (DNonEmpty a) 
Instance details

Defined in Data.DList.DNonEmpty.Internal

Methods

(<>) :: DNonEmpty a -> DNonEmpty a -> DNonEmpty a #

sconcat :: NonEmpty (DNonEmpty a) -> DNonEmpty a #

stimes :: Integral b => b -> DNonEmpty a -> DNonEmpty a #

Semigroup (DList a) 
Instance details

Defined in Data.DList.Internal

Methods

(<>) :: DList a -> DList a -> DList a #

sconcat :: NonEmpty (DList a) -> DList a #

stimes :: Integral b => b -> DList a -> DList a #

Semigroup (Bag a) 
Instance details

Defined in GHC.Data.Bag

Methods

(<>) :: Bag a -> Bag a -> Bag a #

sconcat :: NonEmpty (Bag a) -> Bag a #

stimes :: Integral b => b -> Bag a -> Bag a #

Semigroup (Word64Map a)

Since: ghc-0.5.7

Instance details

Defined in GHC.Data.Word64Map.Internal

Methods

(<>) :: Word64Map a -> Word64Map a -> Word64Map a #

sconcat :: NonEmpty (Word64Map a) -> Word64Map a #

stimes :: Integral b => b -> Word64Map a -> Word64Map a #

Semigroup (AnnSortKey tag) 
Instance details

Defined in GHC.Parser.Annotation

Methods

(<>) :: AnnSortKey tag -> AnnSortKey tag -> AnnSortKey tag #

sconcat :: NonEmpty (AnnSortKey tag) -> AnnSortKey tag #

stimes :: Integral b => b -> AnnSortKey tag -> AnnSortKey tag #

Semigroup a => Semigroup (EpAnn a) 
Instance details

Defined in GHC.Parser.Annotation

Methods

(<>) :: EpAnn a -> EpAnn a -> EpAnn a #

sconcat :: NonEmpty (EpAnn a) -> EpAnn a #

stimes :: Integral b => b -> EpAnn a -> EpAnn a #

Semigroup (Messages e) 
Instance details

Defined in GHC.Types.Error

Methods

(<>) :: Messages e -> Messages e -> Messages e #

sconcat :: NonEmpty (Messages e) -> Messages e #

stimes :: Integral b => b -> Messages e -> Messages e #

Semigroup (NonEmpty a)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Base

Methods

(<>) :: NonEmpty a -> NonEmpty a -> NonEmpty a #

sconcat :: NonEmpty (NonEmpty a) -> NonEmpty a #

stimes :: Integral b => b -> NonEmpty a -> NonEmpty a #

Semigroup a => Semigroup (STM a)

@since base-4.17.0.0

Instance details

Defined in GHC.Internal.Conc.Sync

Methods

(<>) :: STM a -> STM a -> STM a #

sconcat :: NonEmpty (STM a) -> STM a #

stimes :: Integral b => b -> STM a -> STM a #

Semigroup a => Semigroup (Identity a)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Identity

Methods

(<>) :: Identity a -> Identity a -> Identity a #

sconcat :: NonEmpty (Identity a) -> Identity a #

stimes :: Integral b => b -> Identity a -> Identity a #

Semigroup (First a)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Monoid

Methods

(<>) :: First a -> First a -> First a #

sconcat :: NonEmpty (First a) -> First a #

stimes :: Integral b => b -> First a -> First a #

Semigroup (Last a)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Monoid

Methods

(<>) :: Last a -> Last a -> Last a #

sconcat :: NonEmpty (Last a) -> Last a #

stimes :: Integral b => b -> Last a -> Last a #

Semigroup a => Semigroup (Down a)

@since base-4.11.0.0

Instance details

Defined in GHC.Internal.Data.Ord

Methods

(<>) :: Down a -> Down a -> Down a #

sconcat :: NonEmpty (Down a) -> Down a #

stimes :: Integral b => b -> Down a -> Down a #

Semigroup a => Semigroup (Dual a)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

(<>) :: Dual a -> Dual a -> Dual a #

sconcat :: NonEmpty (Dual a) -> Dual a #

stimes :: Integral b => b -> Dual a -> Dual a #

Semigroup (Endo a)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

(<>) :: Endo a -> Endo a -> Endo a #

sconcat :: NonEmpty (Endo a) -> Endo a #

stimes :: Integral b => b -> Endo a -> Endo a #

Num a => Semigroup (Product a)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

(<>) :: Product a -> Product a -> Product a #

sconcat :: NonEmpty (Product a) -> Product a #

stimes :: Integral b => b -> Product a -> Product a #

Num a => Semigroup (Sum a)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

(<>) :: Sum a -> Sum a -> Sum a #

sconcat :: NonEmpty (Sum a) -> Sum a #

stimes :: Integral b => b -> Sum a -> Sum a #

(Generic a, Semigroup (Rep a ())) => Semigroup (Generically a)

@since base-4.17.0.0

Instance details

Defined in GHC.Internal.Generics

Semigroup p => Semigroup (Par1 p)

@since base-4.12.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

(<>) :: Par1 p -> Par1 p -> Par1 p #

sconcat :: NonEmpty (Par1 p) -> Par1 p #

stimes :: Integral b => b -> Par1 p -> Par1 p #

Semigroup a => Semigroup (IO a)

@since base-4.10.0.0

Instance details

Defined in GHC.Internal.Base

Methods

(<>) :: IO a -> IO a -> IO a #

sconcat :: NonEmpty (IO a) -> IO a #

stimes :: Integral b => b -> IO a -> IO a #

Semigroup (FromMaybe b) 
Instance details

Defined in WithIndex

Methods

(<>) :: FromMaybe b -> FromMaybe b -> FromMaybe b #

sconcat :: NonEmpty (FromMaybe b) -> FromMaybe b #

stimes :: Integral b0 => b0 -> FromMaybe b -> FromMaybe b #

Semigroup (Deque a) 
Instance details

Defined in Control.Lens.Internal.Deque

Methods

(<>) :: Deque a -> Deque a -> Deque a #

sconcat :: NonEmpty (Deque a) -> Deque a #

stimes :: Integral b => b -> Deque a -> Deque a #

Semigroup (Leftmost a) 
Instance details

Defined in Control.Lens.Internal.Fold

Methods

(<>) :: Leftmost a -> Leftmost a -> Leftmost a #

sconcat :: NonEmpty (Leftmost a) -> Leftmost a #

stimes :: Integral b => b -> Leftmost a -> Leftmost a #

Semigroup (NonEmptyDList a) 
Instance details

Defined in Control.Lens.Internal.Fold

Semigroup (Rightmost a) 
Instance details

Defined in Control.Lens.Internal.Fold

Methods

(<>) :: Rightmost a -> Rightmost a -> Rightmost a #

sconcat :: NonEmpty (Rightmost a) -> Rightmost a #

stimes :: Integral b => b -> Rightmost a -> Rightmost a #

Semigroup a => Semigroup (May a) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

(<>) :: May a -> May a -> May a #

sconcat :: NonEmpty (May a) -> May a #

stimes :: Integral b => b -> May a -> May a #

Semigroup a => Semigroup (May a) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

(<>) :: May a -> May a -> May a #

sconcat :: NonEmpty (May a) -> May a #

stimes :: Integral b => b -> May a -> May a #

(Semigroup mono, GrowingAppend mono) => Semigroup (NonNull mono) 
Instance details

Defined in Data.NonNull

Methods

(<>) :: NonNull mono -> NonNull mono -> NonNull mono #

sconcat :: NonEmpty (NonNull mono) -> NonNull mono #

stimes :: Integral b => b -> NonNull mono -> NonNull mono #

Ord ref => Semigroup (DefinedCTEs ref) 
Instance details

Defined in Language.SQL.SimpleSQL.RewriteCollectDeps

Methods

(<>) :: DefinedCTEs ref -> DefinedCTEs ref -> DefinedCTEs ref #

sconcat :: NonEmpty (DefinedCTEs ref) -> DefinedCTEs ref #

stimes :: Integral b => b -> DefinedCTEs ref -> DefinedCTEs ref #

Ord ref => Semigroup (Dependencies ref) 
Instance details

Defined in Language.SQL.SimpleSQL.RewriteCollectDeps

Methods

(<>) :: Dependencies ref -> Dependencies ref -> Dependencies ref #

sconcat :: NonEmpty (Dependencies ref) -> Dependencies ref #

stimes :: Integral b => b -> Dependencies ref -> Dependencies ref #

Semigroup (ResultCache a) 
Instance details

Defined in Polysemy.Memoize

Ord ref => Semigroup (DefinedCTEs ref) 
Instance details

Defined in PostgresqlSyntax.Ast.RewriteCollectDeps

Methods

(<>) :: DefinedCTEs ref -> DefinedCTEs ref -> DefinedCTEs ref #

sconcat :: NonEmpty (DefinedCTEs ref) -> DefinedCTEs ref #

stimes :: Integral b => b -> DefinedCTEs ref -> DefinedCTEs ref #

Ord ref => Semigroup (Dependencies ref) 
Instance details

Defined in PostgresqlSyntax.Ast.RewriteCollectDeps

Methods

(<>) :: Dependencies ref -> Dependencies ref -> Dependencies ref #

sconcat :: NonEmpty (Dependencies ref) -> Dependencies ref #

stimes :: Integral b => b -> Dependencies ref -> Dependencies ref #

Semigroup a => Semigroup (ME a) 
Instance details

Defined in Napkin.Render.PrettyPrint

Methods

(<>) :: ME a -> ME a -> ME a #

sconcat :: NonEmpty (ME a) -> ME a #

stimes :: Integral b => b -> ME a -> ME a #

Semigroup (InfoMod a) 
Instance details

Defined in Options.Applicative.Builder

Methods

(<>) :: InfoMod a -> InfoMod a -> InfoMod a #

sconcat :: NonEmpty (InfoMod a) -> InfoMod a #

stimes :: Integral b => b -> InfoMod a -> InfoMod a #

Semigroup (DefaultProp a) 
Instance details

Defined in Options.Applicative.Builder.Internal

Semigroup a => Semigroup (Chunk a) 
Instance details

Defined in Options.Applicative.Help.Chunk

Methods

(<>) :: Chunk a -> Chunk a -> Chunk a #

sconcat :: NonEmpty (Chunk a) -> Chunk a #

stimes :: Integral b => b -> Chunk a -> Chunk a #

Semigroup (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

(<>) :: Doc a -> Doc a -> Doc a #

sconcat :: NonEmpty (Doc a) -> Doc a #

stimes :: Integral b => b -> Doc a -> Doc a #

Semigroup (Doc ann)
x <> y = hcat [x, y]
>>> "hello" <> "world" :: Doc ann
helloworld
Instance details

Defined in Prettyprinter.Internal

Methods

(<>) :: Doc ann -> Doc ann -> Doc ann #

sconcat :: NonEmpty (Doc ann) -> Doc ann #

stimes :: Integral b => b -> Doc ann -> Doc ann #

Semigroup (Array a)

Since: primitive-0.6.3.0

Instance details

Defined in Data.Primitive.Array

Methods

(<>) :: Array a -> Array a -> Array a #

sconcat :: NonEmpty (Array a) -> Array a #

stimes :: Integral b => b -> Array a -> Array a #

Semigroup (PrimArray a)

Since: primitive-0.6.4.0

Instance details

Defined in Data.Primitive.PrimArray

Methods

(<>) :: PrimArray a -> PrimArray a -> PrimArray a #

sconcat :: NonEmpty (PrimArray a) -> PrimArray a #

stimes :: Integral b => b -> PrimArray a -> PrimArray a #

Semigroup (SmallArray a)

Since: primitive-0.6.3.0

Instance details

Defined in Data.Primitive.SmallArray

Monad m => Semigroup (RetryPolicyM m) 
Instance details

Defined in Control.Retry

Semigroup (GLogFunc msg)

Perform both sets of actions per log entry.

Since: rio-0.1.13.0

Instance details

Defined in RIO.Prelude.Logger

Methods

(<>) :: GLogFunc msg -> GLogFunc msg -> GLogFunc msg #

sconcat :: NonEmpty (GLogFunc msg) -> GLogFunc msg #

stimes :: Integral b => b -> GLogFunc msg -> GLogFunc msg #

(Generic a, GSemigroup (Rep a)) => Semigroup (GenericSemigroupMonoid a) 
Instance details

Defined in Data.Semigroup.Generic

Semigroup a => Semigroup (I a)

Since: sop-core-0.4.0.0

Instance details

Defined in Data.SOP.BasicFunctors

Methods

(<>) :: I a -> I a -> I a #

sconcat :: NonEmpty (I a) -> I a #

stimes :: Integral b => b -> I a -> I a #

Semigroup a => Semigroup (Maybe a) 
Instance details

Defined in Data.Strict.Maybe

Methods

(<>) :: Maybe a -> Maybe a -> Maybe a #

sconcat :: NonEmpty (Maybe a) -> Maybe a #

stimes :: Integral b => b -> Maybe a -> Maybe a #

Semigroup a => Semigroup (Q a)

Since: template-haskell-2.17.0.0

Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(<>) :: Q a -> Q a -> Q a #

sconcat :: NonEmpty (Q a) -> Q a #

stimes :: Integral b => b -> Q a -> Q a #

(Hashable a, Eq a) => Semigroup (HashSet a)

<> = union

O(n+m)

To obtain good performance, the smaller set must be presented as the first argument.

Examples

Expand
>>> fromList [1,2] <> fromList [2,3]
fromList [1,2,3]
Instance details

Defined in Data.HashSet.Internal

Methods

(<>) :: HashSet a -> HashSet a -> HashSet a #

sconcat :: NonEmpty (HashSet a) -> HashSet a #

stimes :: Integral b => b -> HashSet a -> HashSet a #

Semigroup (Vector a) 
Instance details

Defined in Data.Vector

Methods

(<>) :: Vector a -> Vector a -> Vector a #

sconcat :: NonEmpty (Vector a) -> Vector a #

stimes :: Integral b => b -> Vector a -> Vector a #

Prim a => Semigroup (Vector a) 
Instance details

Defined in Data.Vector.Primitive

Methods

(<>) :: Vector a -> Vector a -> Vector a #

sconcat :: NonEmpty (Vector a) -> Vector a #

stimes :: Integral b => b -> Vector a -> Vector a #

Storable a => Semigroup (Vector a) 
Instance details

Defined in Data.Vector.Storable

Methods

(<>) :: Vector a -> Vector a -> Vector a #

sconcat :: NonEmpty (Vector a) -> Vector a #

stimes :: Integral b => b -> Vector a -> Vector a #

Semigroup a => Semigroup (Maybe a)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Base

Methods

(<>) :: Maybe a -> Maybe a -> Maybe a #

sconcat :: NonEmpty (Maybe a) -> Maybe a #

stimes :: Integral b => b -> Maybe a -> Maybe a #

Semigroup a => Semigroup (Solo a)

@since base-4.15

Instance details

Defined in GHC.Internal.Base

Methods

(<>) :: Solo a -> Solo a -> Solo a #

sconcat :: NonEmpty (Solo a) -> Solo a #

stimes :: Integral b => b -> Solo a -> Solo a #

Semigroup [a]

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Base

Methods

(<>) :: [a] -> [a] -> [a] #

sconcat :: NonEmpty [a] -> [a] #

stimes :: Integral b => b -> [a] -> [a] #

Semigroup (Parser i a) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

(<>) :: Parser i a -> Parser i a -> Parser i a #

sconcat :: NonEmpty (Parser i a) -> Parser i a #

stimes :: Integral b => b -> Parser i a -> Parser i a #

Semigroup a => Semigroup (Op a b)

(<>) @(Op a b) without newtypes is (<>) @(b->a) = liftA2 (<>). This lifts the Semigroup operation (<>) over the output of a.

(<>) :: Op a b -> Op a b -> Op a b
Op f <> Op g = Op a -> f a <> g a
Instance details

Defined in Data.Functor.Contravariant

Methods

(<>) :: Op a b -> Op a b -> Op a b #

sconcat :: NonEmpty (Op a b) -> Op a b #

stimes :: Integral b0 => b0 -> Op a b -> Op a b #

Ord k => Semigroup (Map k v) 
Instance details

Defined in Data.Map.Internal

Methods

(<>) :: Map k v -> Map k v -> Map k v #

sconcat :: NonEmpty (Map k v) -> Map k v #

stimes :: Integral b => b -> Map k v -> Map k v #

Semigroup (UniqMap k a) 
Instance details

Defined in GHC.Types.Unique.Map

Methods

(<>) :: UniqMap k a -> UniqMap k a -> UniqMap k a #

sconcat :: NonEmpty (UniqMap k a) -> UniqMap k a #

stimes :: Integral b => b -> UniqMap k a -> UniqMap k a #

Semigroup (Either a b)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Either

Methods

(<>) :: Either a b -> Either a b -> Either a b #

sconcat :: NonEmpty (Either a b) -> Either a b #

stimes :: Integral b0 => b0 -> Either a b -> Either a b #

Semigroup (Proxy s)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Proxy

Methods

(<>) :: Proxy s -> Proxy s -> Proxy s #

sconcat :: NonEmpty (Proxy s) -> Proxy s #

stimes :: Integral b => b -> Proxy s -> Proxy s #

Semigroup (U1 p)

@since base-4.12.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

(<>) :: U1 p -> U1 p -> U1 p #

sconcat :: NonEmpty (U1 p) -> U1 p #

stimes :: Integral b => b -> U1 p -> U1 p #

Semigroup (V1 p)

@since base-4.12.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

(<>) :: V1 p -> V1 p -> V1 p #

sconcat :: NonEmpty (V1 p) -> V1 p #

stimes :: Integral b => b -> V1 p -> V1 p #

(Contravariant f, Applicative f) => Semigroup (Folding f a) 
Instance details

Defined in Control.Lens.Internal.Fold

Methods

(<>) :: Folding f a -> Folding f a -> Folding f a #

sconcat :: NonEmpty (Folding f a) -> Folding f a #

stimes :: Integral b => b -> Folding f a -> Folding f a #

Monad m => Semigroup (Sequenced a m) 
Instance details

Defined in Control.Lens.Internal.Fold

Methods

(<>) :: Sequenced a m -> Sequenced a m -> Sequenced a m #

sconcat :: NonEmpty (Sequenced a m) -> Sequenced a m #

stimes :: Integral b => b -> Sequenced a m -> Sequenced a m #

Applicative f => Semigroup (Traversed a f) 
Instance details

Defined in Control.Lens.Internal.Fold

Methods

(<>) :: Traversed a f -> Traversed a f -> Traversed a f #

sconcat :: NonEmpty (Traversed a f) -> Traversed a f #

stimes :: Integral b => b -> Traversed a f -> Traversed a f #

Apply f => Semigroup (TraversedF a f) 
Instance details

Defined in Control.Lens.Internal.Fold

Methods

(<>) :: TraversedF a f -> TraversedF a f -> TraversedF a f #

sconcat :: NonEmpty (TraversedF a f) -> TraversedF a f #

stimes :: Integral b => b -> TraversedF a f -> TraversedF a f #

Semigroup (f a) => Semigroup (Indexing f a) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

(<>) :: Indexing f a -> Indexing f a -> Indexing f a #

sconcat :: NonEmpty (Indexing f a) -> Indexing f a #

stimes :: Integral b => b -> Indexing f a -> Indexing f a #

Semigroup (Deepening i a) 
Instance details

Defined in Control.Lens.Internal.Level

Methods

(<>) :: Deepening i a -> Deepening i a -> Deepening i a #

sconcat :: NonEmpty (Deepening i a) -> Deepening i a #

stimes :: Integral b => b -> Deepening i a -> Deepening i a #

Semigroup a => Semigroup (Err e a) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

(<>) :: Err e a -> Err e a -> Err e a #

sconcat :: NonEmpty (Err e a) -> Err e a #

stimes :: Integral b => b -> Err e a -> Err e a #

Semigroup (ReifiedFold s a) 
Instance details

Defined in Control.Lens.Reified

Methods

(<>) :: ReifiedFold s a -> ReifiedFold s a -> ReifiedFold s a #

sconcat :: NonEmpty (ReifiedFold s a) -> ReifiedFold s a #

stimes :: Integral b => b -> ReifiedFold s a -> ReifiedFold s a #

(Stream s, Ord e) => Semigroup (ParseError s e) 
Instance details

Defined in Text.Megaparsec.Error

Methods

(<>) :: ParseError s e -> ParseError s e -> ParseError s e #

sconcat :: NonEmpty (ParseError s e) -> ParseError s e #

stimes :: Integral b => b -> ParseError s e -> ParseError s e #

Semigroup a => Semigroup (Err e a) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

(<>) :: Err e a -> Err e a -> Err e a #

sconcat :: NonEmpty (Err e a) -> Err e a #

stimes :: Integral b => b -> Err e a -> Err e a #

Semigroup (Ref a) 
Instance details

Defined in Napkin.Types.Core

Methods

(<>) :: Ref a -> Ref a -> Ref a #

sconcat :: NonEmpty (Ref a) -> Ref a #

stimes :: Integral b => b -> Ref a -> Ref a #

Semigroup (DryRunResult b) 
Instance details

Defined in Napkin.Run.Effects.Types

HasBackendQueryStats backend => Semigroup (QueryStats backend) 
Instance details

Defined in Napkin.Types.QueryStats

Methods

(<>) :: QueryStats backend -> QueryStats backend -> QueryStats backend #

sconcat :: NonEmpty (QueryStats backend) -> QueryStats backend #

stimes :: Integral b => b -> QueryStats backend -> QueryStats backend #

Semigroup (Mod f a)

Since: optparse-applicative-0.13.0.0

Instance details

Defined in Options.Applicative.Builder.Internal

Methods

(<>) :: Mod f a -> Mod f a -> Mod f a #

sconcat :: NonEmpty (Mod f a) -> Mod f a #

stimes :: Integral b => b -> Mod f a -> Mod f a #

(Ord k, Semigroup v) => Semigroup (Bias L (OMap k v))

Uses the value-lazy variant of unionWithL.

Since: ordered-containers-0.2

Instance details

Defined in Data.Map.Ordered.Internal

Methods

(<>) :: Bias L (OMap k v) -> Bias L (OMap k v) -> Bias L (OMap k v) #

sconcat :: NonEmpty (Bias L (OMap k v)) -> Bias L (OMap k v) #

stimes :: Integral b => b -> Bias L (OMap k v) -> Bias L (OMap k v) #

Ord a => Semigroup (Bias L (OSet a))

Since: ordered-containers-0.2

Instance details

Defined in Data.Set.Ordered

Methods

(<>) :: Bias L (OSet a) -> Bias L (OSet a) -> Bias L (OSet a) #

sconcat :: NonEmpty (Bias L (OSet a)) -> Bias L (OSet a) #

stimes :: Integral b => b -> Bias L (OSet a) -> Bias L (OSet a) #

(Ord k, Semigroup v) => Semigroup (Bias R (OMap k v))

Uses the value-lazy variant of unionWithR.

Since: ordered-containers-0.2

Instance details

Defined in Data.Map.Ordered.Internal

Methods

(<>) :: Bias R (OMap k v) -> Bias R (OMap k v) -> Bias R (OMap k v) #

sconcat :: NonEmpty (Bias R (OMap k v)) -> Bias R (OMap k v) #

stimes :: Integral b => b -> Bias R (OMap k v) -> Bias R (OMap k v) #

Ord a => Semigroup (Bias R (OSet a))

Since: ordered-containers-0.2

Instance details

Defined in Data.Set.Ordered

Methods

(<>) :: Bias R (OSet a) -> Bias R (OSet a) -> Bias R (OSet a) #

sconcat :: NonEmpty (Bias R (OSet a)) -> Bias R (OSet a) #

stimes :: Integral b => b -> Bias R (OSet a) -> Bias R (OSet a) #

Semigroup a => Semigroup (Sem f a)

Since: polysemy-1.6.0.0

Instance details

Defined in Polysemy.Internal

Methods

(<>) :: Sem f a -> Sem f a -> Sem f a #

sconcat :: NonEmpty (Sem f a) -> Sem f a #

stimes :: Integral b => b -> Sem f a -> Sem f a #

Semigroup a => Semigroup (RIO env a) 
Instance details

Defined in RIO.Prelude.RIO

Methods

(<>) :: RIO env a -> RIO env a -> RIO env a #

sconcat :: NonEmpty (RIO env a) -> RIO env a #

stimes :: Integral b => b -> RIO env a -> RIO env a #

(Monad m, Semigroup a) => Semigroup (ActionT m a) 
Instance details

Defined in Web.Scotty.Internal.Types

Methods

(<>) :: ActionT m a -> ActionT m a -> ActionT m a #

sconcat :: NonEmpty (ActionT m a) -> ActionT m a #

stimes :: Integral b => b -> ActionT m a -> ActionT m a #

Semigroup a => Semigroup (ScottyT m a) 
Instance details

Defined in Web.Scotty.Internal.Types

Methods

(<>) :: ScottyT m a -> ScottyT m a -> ScottyT m a #

sconcat :: NonEmpty (ScottyT m a) -> ScottyT m a #

stimes :: Integral b => b -> ScottyT m a -> ScottyT m a #

Semigroup (Either a b) 
Instance details

Defined in Data.Strict.Either

Methods

(<>) :: Either a b -> Either a b -> Either a b #

sconcat :: NonEmpty (Either a b) -> Either a b #

stimes :: Integral b0 => b0 -> Either a b -> Either a b #

(Semigroup a, Semigroup b) => Semigroup (These a b) 
Instance details

Defined in Data.Strict.These

Methods

(<>) :: These a b -> These a b -> These a b #

sconcat :: NonEmpty (These a b) -> These a b #

stimes :: Integral b0 => b0 -> These a b -> These a b #

(Semigroup a, Semigroup b) => Semigroup (Pair a b) 
Instance details

Defined in Data.Strict.Tuple

Methods

(<>) :: Pair a b -> Pair a b -> Pair a b #

sconcat :: NonEmpty (Pair a b) -> Pair a b #

stimes :: Integral b0 => b0 -> Pair a b -> Pair a b #

(Semigroup a, Semigroup b) => Semigroup (These a b) 
Instance details

Defined in Data.These

Methods

(<>) :: These a b -> These a b -> These a b #

sconcat :: NonEmpty (These a b) -> These a b #

stimes :: Integral b0 => b0 -> These a b -> These a b #

(MonadUnliftIO m, Semigroup a) => Semigroup (Conc m a)

Since: unliftio-0.2.9.0

Instance details

Defined in UnliftIO.Internals.Async

Methods

(<>) :: Conc m a -> Conc m a -> Conc m a #

sconcat :: NonEmpty (Conc m a) -> Conc m a #

stimes :: Integral b => b -> Conc m a -> Conc m a #

(MonadUnliftIO m, Semigroup a) => Semigroup (Concurrently m a)

Only defined by async for base >= 4.9.

Since: unliftio-0.1.0.0

Instance details

Defined in UnliftIO.Internals.Async

Methods

(<>) :: Concurrently m a -> Concurrently m a -> Concurrently m a #

sconcat :: NonEmpty (Concurrently m a) -> Concurrently m a #

stimes :: Integral b => b -> Concurrently m a -> Concurrently m a #

(Eq k, Hashable k) => Semigroup (HashMap k v)

<> = union

If a key occurs in both maps, the mapping from the first will be the mapping in the result.

Examples

Expand
>>> fromList [(1,'a'),(2,'b')] <> fromList [(2,'c'),(3,'d')]
fromList [(1,'a'),(2,'b'),(3,'d')]
Instance details

Defined in Data.HashMap.Internal

Methods

(<>) :: HashMap k v -> HashMap k v -> HashMap k v #

sconcat :: NonEmpty (HashMap k v) -> HashMap k v #

stimes :: Integral b => b -> HashMap k v -> HashMap k v #

(Semigroup a, Semigroup b) => Semigroup (a, b)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Base

Methods

(<>) :: (a, b) -> (a, b) -> (a, b) #

sconcat :: NonEmpty (a, b) -> (a, b) #

stimes :: Integral b0 => b0 -> (a, b) -> (a, b) #

Semigroup b => Semigroup (a -> b)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Base

Methods

(<>) :: (a -> b) -> (a -> b) -> a -> b #

sconcat :: NonEmpty (a -> b) -> a -> b #

stimes :: Integral b0 => b0 -> (a -> b) -> a -> b #

Semigroup a => Semigroup (Const a b)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Const

Methods

(<>) :: Const a b -> Const a b -> Const a b #

sconcat :: NonEmpty (Const a b) -> Const a b #

stimes :: Integral b0 => b0 -> Const a b -> Const a b #

(Applicative f, Semigroup a) => Semigroup (Ap f a)

@since base-4.12.0.0

Instance details

Defined in GHC.Internal.Data.Monoid

Methods

(<>) :: Ap f a -> Ap f a -> Ap f a #

sconcat :: NonEmpty (Ap f a) -> Ap f a #

stimes :: Integral b => b -> Ap f a -> Ap f a #

Alternative f => Semigroup (Alt f a)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

(<>) :: Alt f a -> Alt f a -> Alt f a #

sconcat :: NonEmpty (Alt f a) -> Alt f a #

stimes :: Integral b => b -> Alt f a -> Alt f a #

Semigroup (f p) => Semigroup (Rec1 f p)

@since base-4.12.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

(<>) :: Rec1 f p -> Rec1 f p -> Rec1 f p #

sconcat :: NonEmpty (Rec1 f p) -> Rec1 f p #

stimes :: Integral b => b -> Rec1 f p -> Rec1 f p #

Monad m => Semigroup (Sequenced a m) 
Instance details

Defined in WithIndex

Methods

(<>) :: Sequenced a m -> Sequenced a m -> Sequenced a m #

sconcat :: NonEmpty (Sequenced a m) -> Sequenced a m #

stimes :: Integral b => b -> Sequenced a m -> Sequenced a m #

Applicative f => Semigroup (Traversed a f) 
Instance details

Defined in WithIndex

Methods

(<>) :: Traversed a f -> Traversed a f -> Traversed a f #

sconcat :: NonEmpty (Traversed a f) -> Traversed a f #

stimes :: Integral b => b -> Traversed a f -> Traversed a f #

(Monad m, Semigroup r) => Semigroup (Effect m r a) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

(<>) :: Effect m r a -> Effect m r a -> Effect m r a #

sconcat :: NonEmpty (Effect m r a) -> Effect m r a #

stimes :: Integral b => b -> Effect m r a -> Effect m r a #

(Applicative f, Semigroup a, Monad m) => Semigroup (Freed f m a) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

(<>) :: Freed f m a -> Freed f m a -> Freed f m a #

sconcat :: NonEmpty (Freed f m a) -> Freed f m a #

stimes :: Integral b => b -> Freed f m a -> Freed f m a #

Semigroup (ReifiedIndexedFold i s a) 
Instance details

Defined in Control.Lens.Reified

Monad m => Semigroup (Handler e m a) 
Instance details

Defined in Control.Monad.Error.Lens

Methods

(<>) :: Handler e m a -> Handler e m a -> Handler e m a #

sconcat :: NonEmpty (Handler e m a) -> Handler e m a #

stimes :: Integral b => b -> Handler e m a -> Handler e m a #

(Monad m, Semigroup r) => Semigroup (Effect m r a) 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

(<>) :: Effect m r a -> Effect m r a -> Effect m r a #

sconcat :: NonEmpty (Effect m r a) -> Effect m r a #

stimes :: Integral b => b -> Effect m r a -> Effect m r a #

Reifies s (ReifiedMonoid a) => Semigroup (ReflectedMonoid a s) 
Instance details

Defined in Data.Reflection

Semigroup a => Semigroup (K a b)

Since: sop-core-0.4.0.0

Instance details

Defined in Data.SOP.BasicFunctors

Methods

(<>) :: K a b -> K a b -> K a b #

sconcat :: NonEmpty (K a b) -> K a b #

stimes :: Integral b0 => b0 -> K a b -> K a b #

All (Compose Semigroup f) xs => Semigroup (NP f xs)

Since: sop-core-0.4.0.0

Instance details

Defined in Data.SOP.NP

Methods

(<>) :: NP f xs -> NP f xs -> NP f xs #

sconcat :: NonEmpty (NP f xs) -> NP f xs #

stimes :: Integral b => b -> NP f xs -> NP f xs #

Semigroup (NP (NP f) xss) => Semigroup (POP f xss)

Since: sop-core-0.4.0.0

Instance details

Defined in Data.SOP.NP

Methods

(<>) :: POP f xss -> POP f xss -> POP f xss #

sconcat :: NonEmpty (POP f xss) -> POP f xss #

stimes :: Integral b => b -> POP f xss -> POP f xss #

Semigroup a => Semigroup (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

(<>) :: Tagged s a -> Tagged s a -> Tagged s a #

sconcat :: NonEmpty (Tagged s a) -> Tagged s a #

stimes :: Integral b => b -> Tagged s a -> Tagged s a #

Semigroup a => Semigroup (Constant a b) 
Instance details

Defined in Data.Functor.Constant

Methods

(<>) :: Constant a b -> Constant a b -> Constant a b #

sconcat :: NonEmpty (Constant a b) -> Constant a b #

stimes :: Integral b0 => b0 -> Constant a b -> Constant a b #

(Semigroup a, Semigroup b, Semigroup c) => Semigroup (a, b, c)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Base

Methods

(<>) :: (a, b, c) -> (a, b, c) -> (a, b, c) #

sconcat :: NonEmpty (a, b, c) -> (a, b, c) #

stimes :: Integral b0 => b0 -> (a, b, c) -> (a, b, c) #

(Semigroup (f a), Semigroup (g a)) => Semigroup (Product f g a)

Since: base-4.16.0.0

Instance details

Defined in Data.Functor.Product

Methods

(<>) :: Product f g a -> Product f g a -> Product f g a #

sconcat :: NonEmpty (Product f g a) -> Product f g a #

stimes :: Integral b => b -> Product f g a -> Product f g a #

Monad m => Semigroup (ConduitT i o m ()) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

(<>) :: ConduitT i o m () -> ConduitT i o m () -> ConduitT i o m () #

sconcat :: NonEmpty (ConduitT i o m ()) -> ConduitT i o m () #

stimes :: Integral b => b -> ConduitT i o m () -> ConduitT i o m () #

(Semigroup (f p), Semigroup (g p)) => Semigroup ((f :*: g) p)

@since base-4.12.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

(<>) :: (f :*: g) p -> (f :*: g) p -> (f :*: g) p #

sconcat :: NonEmpty ((f :*: g) p) -> (f :*: g) p #

stimes :: Integral b => b -> (f :*: g) p -> (f :*: g) p #

Semigroup c => Semigroup (K1 i c p)

@since base-4.12.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

(<>) :: K1 i c p -> K1 i c p -> K1 i c p #

sconcat :: NonEmpty (K1 i c p) -> K1 i c p #

stimes :: Integral b => b -> K1 i c p -> K1 i c p #

(Semigroup a, Semigroup b, Semigroup c, Semigroup d) => Semigroup (a, b, c, d)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Base

Methods

(<>) :: (a, b, c, d) -> (a, b, c, d) -> (a, b, c, d) #

sconcat :: NonEmpty (a, b, c, d) -> (a, b, c, d) #

stimes :: Integral b0 => b0 -> (a, b, c, d) -> (a, b, c, d) #

Semigroup (f (g a)) => Semigroup (Compose f g a)

Since: base-4.16.0.0

Instance details

Defined in Data.Functor.Compose

Methods

(<>) :: Compose f g a -> Compose f g a -> Compose f g a #

sconcat :: NonEmpty (Compose f g a) -> Compose f g a #

stimes :: Integral b => b -> Compose f g a -> Compose f g a #

Semigroup (f (g p)) => Semigroup ((f :.: g) p)

@since base-4.12.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

(<>) :: (f :.: g) p -> (f :.: g) p -> (f :.: g) p #

sconcat :: NonEmpty ((f :.: g) p) -> (f :.: g) p #

stimes :: Integral b => b -> (f :.: g) p -> (f :.: g) p #

Semigroup (f p) => Semigroup (M1 i c f p)

@since base-4.12.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

(<>) :: M1 i c f p -> M1 i c f p -> M1 i c f p #

sconcat :: NonEmpty (M1 i c f p) -> M1 i c f p #

stimes :: Integral b => b -> M1 i c f p -> M1 i c f p #

Contravariant g => Semigroup (BazaarT p g a b t) 
Instance details

Defined in Control.Lens.Internal.Bazaar

Methods

(<>) :: BazaarT p g a b t -> BazaarT p g a b t -> BazaarT p g a b t #

sconcat :: NonEmpty (BazaarT p g a b t) -> BazaarT p g a b t #

stimes :: Integral b0 => b0 -> BazaarT p g a b t -> BazaarT p g a b t #

Contravariant g => Semigroup (BazaarT1 p g a b t) 
Instance details

Defined in Control.Lens.Internal.Bazaar

Methods

(<>) :: BazaarT1 p g a b t -> BazaarT1 p g a b t -> BazaarT1 p g a b t #

sconcat :: NonEmpty (BazaarT1 p g a b t) -> BazaarT1 p g a b t #

stimes :: Integral b0 => b0 -> BazaarT1 p g a b t -> BazaarT1 p g a b t #

Semigroup (f (g x)) => Semigroup ((f :.: g) x)

Since: sop-core-0.4.0.0

Instance details

Defined in Data.SOP.BasicFunctors

Methods

(<>) :: (f :.: g) x -> (f :.: g) x -> (f :.: g) x #

sconcat :: NonEmpty ((f :.: g) x) -> (f :.: g) x #

stimes :: Integral b => b -> (f :.: g) x -> (f :.: g) x #

(Semigroup a, Semigroup b, Semigroup c, Semigroup d, Semigroup e) => Semigroup (a, b, c, d, e)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Base

Methods

(<>) :: (a, b, c, d, e) -> (a, b, c, d, e) -> (a, b, c, d, e) #

sconcat :: NonEmpty (a, b, c, d, e) -> (a, b, c, d, e) #

stimes :: Integral b0 => b0 -> (a, b, c, d, e) -> (a, b, c, d, e) #

Monad m => Semigroup (Pipe l i o u m ()) 
Instance details

Defined in Data.Conduit.Internal.Pipe

Methods

(<>) :: Pipe l i o u m () -> Pipe l i o u m () -> Pipe l i o u m () #

sconcat :: NonEmpty (Pipe l i o u m ()) -> Pipe l i o u m () #

stimes :: Integral b => b -> Pipe l i o u m () -> Pipe l i o u m () #

class Monad m => MonadFail (m :: Type -> Type) where #

When a value is bound in do-notation, the pattern on the left hand side of <- might not match. In this case, this class provides a function to recover.

A Monad without a MonadFail instance may only be used in conjunction with pattern that always match, such as newtypes, tuples, data types with only a single data constructor, and irrefutable patterns (~pat).

Instances of MonadFail should satisfy the following law: fail s should be a left zero for >>=,

fail s >>= f  =  fail s

If your Monad is also MonadPlus, a popular definition is

fail _ = mzero

fail s should be an action that runs in the monad itself, not an exception (except in instances of MonadIO). In particular, fail should not be implemented in terms of error.

@since base-4.9.0.0

Methods

fail :: String -> m a #

Instances

Instances details
MonadFail IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fail :: String -> IResult a #

MonadFail Parser 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fail :: String -> Parser a #

MonadFail Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fail :: String -> Result a #

MonadFail DList 
Instance details

Defined in Data.DList.Internal

Methods

fail :: String -> DList a #

MonadFail TcS 
Instance details

Defined in GHC.Tc.Solver.Monad

Methods

fail :: String -> TcS a #

MonadFail P

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Text.ParserCombinators.ReadP

Methods

fail :: String -> P a #

MonadFail ReadP

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Text.ParserCombinators.ReadP

Methods

fail :: String -> ReadP a #

MonadFail IO

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Control.Monad.Fail

Methods

fail :: String -> IO a #

MonadFail ME 
Instance details

Defined in Napkin.Render.PrettyPrint

Methods

fail :: String -> ME a #

MonadFail ReadM 
Instance details

Defined in Options.Applicative.Types

Methods

fail :: String -> ReadM a #

MonadFail Array 
Instance details

Defined in Data.Primitive.Array

Methods

fail :: String -> Array a #

MonadFail SmallArray 
Instance details

Defined in Data.Primitive.SmallArray

Methods

fail :: String -> SmallArray a #

MonadFail Q 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

fail :: String -> Q a #

MonadFail Vector

Since: vector-0.12.1.0

Instance details

Defined in Data.Vector

Methods

fail :: String -> Vector a #

MonadFail Stream 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

fail :: String -> Stream a #

MonadFail Maybe

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Control.Monad.Fail

Methods

fail :: String -> Maybe a #

MonadFail []

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Control.Monad.Fail

Methods

fail :: String -> [a] #

MonadFail (Parser i) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

fail :: String -> Parser i a #

Monad m => MonadFail (CatchT m) 
Instance details

Defined in Control.Monad.Catch.Pure

Methods

fail :: String -> CatchT m a #

MonadFail m => MonadFail (KatipT m) 
Instance details

Defined in Katip.Core

Methods

fail :: String -> KatipT m a #

MonadFail m => MonadFail (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

fail :: String -> KatipContextT m a #

Member (Fail :: (Type -> Type) -> Type -> Type) r => MonadFail (Sem r)

Since: polysemy-1.1.0.0

Instance details

Defined in Polysemy.Internal

Methods

fail :: String -> Sem r a #

MonadFail m => MonadFail (ResourceT m)

Since: resourcet-1.2.2

Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

fail :: String -> ResourceT m a #

MonadIO m => MonadFail (ActionT m)

Modeled after the behaviour in scotty < 0.20, fail throws a StatusError with code 500 ("Server Error"), which can be caught with catch.

Instance details

Defined in Web.Scotty.Internal.Types

Methods

fail :: String -> ActionT m a #

Monad m => MonadFail (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

fail :: String -> MaybeT m a #

(Functor f, MonadFail m) => MonadFail (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

fail :: String -> FreeT f m a #

MonadFail f => MonadFail (Ap f)

@since base-4.12.0.0

Instance details

Defined in GHC.Internal.Data.Monoid

Methods

fail :: String -> Ap f a #

(Monoid w, MonadFail m) => MonadFail (AccumT w m) 
Instance details

Defined in Control.Monad.Trans.Accum

Methods

fail :: String -> AccumT w m a #

MonadFail m => MonadFail (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

fail :: String -> ExceptT e m a #

MonadFail m => MonadFail (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

fail :: String -> IdentityT m a #

MonadFail m => MonadFail (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

fail :: String -> ReaderT r m a #

MonadFail m => MonadFail (SelectT r m) 
Instance details

Defined in Control.Monad.Trans.Select

Methods

fail :: String -> SelectT r m a #

MonadFail m => MonadFail (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Lazy

Methods

fail :: String -> StateT s m a #

MonadFail m => MonadFail (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

fail :: String -> StateT s m a #

MonadFail m => MonadFail (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.CPS

Methods

fail :: String -> WriterT w m a #

(Monoid w, MonadFail m) => MonadFail (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

fail :: String -> WriterT w m a #

(Monoid w, MonadFail m) => MonadFail (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

fail :: String -> WriterT w m a #

MonadFail m => MonadFail (Reverse m) 
Instance details

Defined in Data.Functor.Reverse

Methods

fail :: String -> Reverse m a #

MonadFail m => MonadFail (ConduitT i o m)

Since: conduit-1.3.1

Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

fail :: String -> ConduitT i o m a #

MonadFail m => MonadFail (ContT r m) 
Instance details

Defined in Control.Monad.Trans.Cont

Methods

fail :: String -> ContT r m a #

MonadFail m => MonadFail (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.CPS

Methods

fail :: String -> RWST r w s m a #

(Monoid w, MonadFail m) => MonadFail (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.Lazy

Methods

fail :: String -> RWST r w s m a #

(Monoid w, MonadFail m) => MonadFail (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.Strict

Methods

fail :: String -> RWST r w s m a #

sum :: SExp -> SExp #

newtype Const a (b :: k) #

The Const functor.

Examples

Expand
>>> fmap (++ "World") (Const "Hello")
Const "Hello"

Because we ignore the second type parameter to Const, the Applicative instance, which has (<*>) :: Monoid m => Const m (a -> b) -> Const m a -> Const m b essentially turns into Monoid m => m -> m -> m, which is (<>)

>>> Const [1, 2, 3] <*> Const [4, 5, 6]
Const [1,2,3,4,5,6]

Constructors

Const 

Fields

Instances

Instances details
Generic1 (Const a :: k -> Type) 
Instance details

Defined in GHC.Internal.Data.Functor.Const

Associated Types

type Rep1 (Const a :: k -> Type)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Const

type Rep1 (Const a :: k -> Type) = D1 ('MetaData "Const" "GHC.Internal.Data.Functor.Const" "ghc-internal" 'True) (C1 ('MetaCons "Const" 'PrefixI 'True) (S1 ('MetaSel ('Just "getConst") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))

Methods

from1 :: forall (a0 :: k). Const a a0 -> Rep1 (Const a :: k -> Type) a0 #

to1 :: forall (a0 :: k). Rep1 (Const a :: k -> Type) a0 -> Const a a0 #

FoldableWithIndex Void (Const e :: Type -> Type) 
Instance details

Defined in WithIndex

Methods

ifoldMap :: Monoid m => (Void -> a -> m) -> Const e a -> m #

ifoldMap' :: Monoid m => (Void -> a -> m) -> Const e a -> m #

ifoldr :: (Void -> a -> b -> b) -> b -> Const e a -> b #

ifoldl :: (Void -> b -> a -> b) -> b -> Const e a -> b #

ifoldr' :: (Void -> a -> b -> b) -> b -> Const e a -> b #

ifoldl' :: (Void -> b -> a -> b) -> b -> Const e a -> b #

FunctorWithIndex Void (Const e :: Type -> Type) 
Instance details

Defined in WithIndex

Methods

imap :: (Void -> a -> b) -> Const e a -> Const e b #

TraversableWithIndex Void (Const e :: Type -> Type) 
Instance details

Defined in WithIndex

Methods

itraverse :: Applicative f => (Void -> a -> f b) -> Const e a -> f (Const e b) #

Unbox a => Vector Vector (Const a b) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: Mutable Vector s (Const a b) -> ST s (Vector (Const a b)) #

basicUnsafeThaw :: Vector (Const a b) -> ST s (Mutable Vector s (Const a b)) #

basicLength :: Vector (Const a b) -> Int #

basicUnsafeSlice :: Int -> Int -> Vector (Const a b) -> Vector (Const a b) #

basicUnsafeIndexM :: Vector (Const a b) -> Int -> Box (Const a b) #

basicUnsafeCopy :: Mutable Vector s (Const a b) -> Vector (Const a b) -> ST s () #

elemseq :: Vector (Const a b) -> Const a b -> b0 -> b0 #

Unbox a => MVector MVector (Const a b) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s (Const a b) -> Int #

basicUnsafeSlice :: Int -> Int -> MVector s (Const a b) -> MVector s (Const a b) #

basicOverlaps :: MVector s (Const a b) -> MVector s (Const a b) -> Bool #

basicUnsafeNew :: Int -> ST s (MVector s (Const a b)) #

basicInitialize :: MVector s (Const a b) -> ST s () #

basicUnsafeReplicate :: Int -> Const a b -> ST s (MVector s (Const a b)) #

basicUnsafeRead :: MVector s (Const a b) -> Int -> ST s (Const a b) #

basicUnsafeWrite :: MVector s (Const a b) -> Int -> Const a b -> ST s () #

basicClear :: MVector s (Const a b) -> ST s () #

basicSet :: MVector s (Const a b) -> Const a b -> ST s () #

basicUnsafeCopy :: MVector s (Const a b) -> MVector s (Const a b) -> ST s () #

basicUnsafeMove :: MVector s (Const a b) -> MVector s (Const a b) -> ST s () #

basicUnsafeGrow :: MVector s (Const a b) -> Int -> ST s (MVector s (Const a b)) #

FromJSON2 (Const :: Type -> Type -> Type) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON2 :: Maybe a -> (Value -> Parser a) -> (Value -> Parser [a]) -> Maybe b -> (Value -> Parser b) -> (Value -> Parser [b]) -> Value -> Parser (Const a b) #

liftParseJSONList2 :: Maybe a -> (Value -> Parser a) -> (Value -> Parser [a]) -> Maybe b -> (Value -> Parser b) -> (Value -> Parser [b]) -> Value -> Parser [Const a b] #

liftOmittedField2 :: Maybe a -> Maybe b -> Maybe (Const a b) #

ToJSON2 (Const :: Type -> Type -> Type) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON2 :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> (b -> Bool) -> (b -> Value) -> ([b] -> Value) -> Const a b -> Value #

liftToJSONList2 :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> (b -> Bool) -> (b -> Value) -> ([b] -> Value) -> [Const a b] -> Value #

liftToEncoding2 :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> (b -> Bool) -> (b -> Encoding) -> ([b] -> Encoding) -> Const a b -> Encoding #

liftToEncodingList2 :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> (b -> Bool) -> (b -> Encoding) -> ([b] -> Encoding) -> [Const a b] -> Encoding #

liftOmitField2 :: (a -> Bool) -> (b -> Bool) -> Const a b -> Bool #

Bifoldable (Const :: Type -> Type -> Type)

Since: base-4.10.0.0

Instance details

Defined in Data.Bifoldable

Methods

bifold :: Monoid m => Const m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> Const a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> Const a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> Const a b -> c #

Bifoldable1 (Const :: Type -> Type -> Type) 
Instance details

Defined in Data.Bifoldable1

Methods

bifold1 :: Semigroup m => Const m m -> m #

bifoldMap1 :: Semigroup m => (a -> m) -> (b -> m) -> Const a b -> m #

Bifunctor (Const :: Type -> Type -> Type)

Since: base-4.8.0.0

Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> Const a c -> Const b d #

first :: (a -> b) -> Const a c -> Const b c #

second :: (b -> c) -> Const a b -> Const a c #

Bitraversable (Const :: Type -> Type -> Type)

Since: base-4.10.0.0

Instance details

Defined in Data.Bitraversable

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> Const a b -> f (Const c d) #

Eq2 (Const :: Type -> Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftEq2 :: (a -> b -> Bool) -> (c -> d -> Bool) -> Const a c -> Const b d -> Bool #

Ord2 (Const :: Type -> Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftCompare2 :: (a -> b -> Ordering) -> (c -> d -> Ordering) -> Const a c -> Const b d -> Ordering #

Read2 (Const :: Type -> Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftReadsPrec2 :: (Int -> ReadS a) -> ReadS [a] -> (Int -> ReadS b) -> ReadS [b] -> Int -> ReadS (Const a b) #

liftReadList2 :: (Int -> ReadS a) -> ReadS [a] -> (Int -> ReadS b) -> ReadS [b] -> ReadS [Const a b] #

liftReadPrec2 :: ReadPrec a -> ReadPrec [a] -> ReadPrec b -> ReadPrec [b] -> ReadPrec (Const a b) #

liftReadListPrec2 :: ReadPrec a -> ReadPrec [a] -> ReadPrec b -> ReadPrec [b] -> ReadPrec [Const a b] #

Show2 (Const :: Type -> Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec2 :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> (Int -> b -> ShowS) -> ([b] -> ShowS) -> Int -> Const a b -> ShowS #

liftShowList2 :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> (Int -> b -> ShowS) -> ([b] -> ShowS) -> [Const a b] -> ShowS #

NFData2 (Const :: Type -> Type -> Type)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf2 :: (a -> ()) -> (b -> ()) -> Const a b -> () #

Hashable2 (Const :: Type -> Type -> Type) 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt2 :: (Int -> a -> Int) -> (Int -> b -> Int) -> Int -> Const a b -> Int #

FromJSON a => FromJSON1 (Const a :: Type -> Type) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: Maybe a0 -> (Value -> Parser a0) -> (Value -> Parser [a0]) -> Value -> Parser (Const a a0) #

liftParseJSONList :: Maybe a0 -> (Value -> Parser a0) -> (Value -> Parser [a0]) -> Value -> Parser [Const a a0] #

liftOmittedField :: Maybe a0 -> Maybe (Const a a0) #

ToJSON a => ToJSON1 (Const a :: Type -> Type) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a0 -> Bool) -> (a0 -> Value) -> ([a0] -> Value) -> Const a a0 -> Value #

liftToJSONList :: (a0 -> Bool) -> (a0 -> Value) -> ([a0] -> Value) -> [Const a a0] -> Value #

liftToEncoding :: (a0 -> Bool) -> (a0 -> Encoding) -> ([a0] -> Encoding) -> Const a a0 -> Encoding #

liftToEncodingList :: (a0 -> Bool) -> (a0 -> Encoding) -> ([a0] -> Encoding) -> [Const a a0] -> Encoding #

liftOmitField :: (a0 -> Bool) -> Const a a0 -> Bool #

Eq a => Eq1 (Const a :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftEq :: (a0 -> b -> Bool) -> Const a a0 -> Const a b -> Bool #

Ord a => Ord1 (Const a :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftCompare :: (a0 -> b -> Ordering) -> Const a a0 -> Const a b -> Ordering #

Read a => Read1 (Const a :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftReadsPrec :: (Int -> ReadS a0) -> ReadS [a0] -> Int -> ReadS (Const a a0) #

liftReadList :: (Int -> ReadS a0) -> ReadS [a0] -> ReadS [Const a a0] #

liftReadPrec :: ReadPrec a0 -> ReadPrec [a0] -> ReadPrec (Const a a0) #

liftReadListPrec :: ReadPrec a0 -> ReadPrec [a0] -> ReadPrec [Const a a0] #

Show a => Show1 (Const a :: Type -> Type)

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec :: (Int -> a0 -> ShowS) -> ([a0] -> ShowS) -> Int -> Const a a0 -> ShowS #

liftShowList :: (Int -> a0 -> ShowS) -> ([a0] -> ShowS) -> [Const a a0] -> ShowS #

Contravariant (Const a :: Type -> Type) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap :: (a' -> a0) -> Const a a0 -> Const a a' #

(>$) :: b -> Const a b -> Const a a0 #

NFData a => NFData1 (Const a :: Type -> Type)

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a0 -> ()) -> Const a a0 -> () #

Monoid m => Applicative (Const m :: Type -> Type)

@since base-2.0.1

Instance details

Defined in GHC.Internal.Data.Functor.Const

Methods

pure :: a -> Const m a #

(<*>) :: Const m (a -> b) -> Const m a -> Const m b #

liftA2 :: (a -> b -> c) -> Const m a -> Const m b -> Const m c #

(*>) :: Const m a -> Const m b -> Const m b #

(<*) :: Const m a -> Const m b -> Const m a #

Functor (Const m :: Type -> Type)

@since base-2.01

Instance details

Defined in GHC.Internal.Data.Functor.Const

Methods

fmap :: (a -> b) -> Const m a -> Const m b #

(<$) :: a -> Const m b -> Const m a #

Foldable (Const m :: Type -> Type)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Const

Methods

fold :: Monoid m0 => Const m m0 -> m0 #

foldMap :: Monoid m0 => (a -> m0) -> Const m a -> m0 #

foldMap' :: Monoid m0 => (a -> m0) -> Const m a -> m0 #

foldr :: (a -> b -> b) -> b -> Const m a -> b #

foldr' :: (a -> b -> b) -> b -> Const m a -> b #

foldl :: (b -> a -> b) -> b -> Const m a -> b #

foldl' :: (b -> a -> b) -> b -> Const m a -> b #

foldr1 :: (a -> a -> a) -> Const m a -> a #

foldl1 :: (a -> a -> a) -> Const m a -> a #

toList :: Const m a -> [a] #

null :: Const m a -> Bool #

length :: Const m a -> Int #

elem :: Eq a => a -> Const m a -> Bool #

maximum :: Ord a => Const m a -> a #

minimum :: Ord a => Const m a -> a #

sum :: Num a => Const m a -> a #

product :: Num a => Const m a -> a #

Traversable (Const m :: Type -> Type)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Const m a -> f (Const m b) #

sequenceA :: Applicative f => Const m (f a) -> f (Const m a) #

mapM :: Monad m0 => (a -> m0 b) -> Const m a -> m0 (Const m b) #

sequence :: Monad m0 => Const m (m0 a) -> m0 (Const m a) #

Hashable a => Hashable1 (Const a :: Type -> Type) 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a0 -> Int) -> Int -> Const a a0 -> Int #

FromJSON a => FromJSON (Const a b) 
Instance details

Defined in Data.Aeson.Types.FromJSON

(FromJSON a, FromJSONKey a) => FromJSONKey (Const a b) 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON a => ToJSON (Const a b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Const a b -> Value #

toEncoding :: Const a b -> Encoding #

toJSONList :: [Const a b] -> Value #

toEncodingList :: [Const a b] -> Encoding #

omitField :: Const a b -> Bool #

(ToJSON a, ToJSONKey a) => ToJSONKey (Const a b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

NFData a => NFData (Const a b)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: Const a b -> () #

Monoid a => Monoid (Const a b)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Const

Methods

mempty :: Const a b #

mappend :: Const a b -> Const a b -> Const a b #

mconcat :: [Const a b] -> Const a b #

Semigroup a => Semigroup (Const a b)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Const

Methods

(<>) :: Const a b -> Const a b -> Const a b #

sconcat :: NonEmpty (Const a b) -> Const a b #

stimes :: Integral b0 => b0 -> Const a b -> Const a b #

Bits a => Bits (Const a b)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Const

Methods

(.&.) :: Const a b -> Const a b -> Const a b #

(.|.) :: Const a b -> Const a b -> Const a b #

xor :: Const a b -> Const a b -> Const a b #

complement :: Const a b -> Const a b #

shift :: Const a b -> Int -> Const a b #

rotate :: Const a b -> Int -> Const a b #

zeroBits :: Const a b #

bit :: Int -> Const a b #

setBit :: Const a b -> Int -> Const a b #

clearBit :: Const a b -> Int -> Const a b #

complementBit :: Const a b -> Int -> Const a b #

testBit :: Const a b -> Int -> Bool #

bitSizeMaybe :: Const a b -> Maybe Int #

bitSize :: Const a b -> Int #

isSigned :: Const a b -> Bool #

shiftL :: Const a b -> Int -> Const a b #

unsafeShiftL :: Const a b -> Int -> Const a b #

shiftR :: Const a b -> Int -> Const a b #

unsafeShiftR :: Const a b -> Int -> Const a b #

rotateL :: Const a b -> Int -> Const a b #

rotateR :: Const a b -> Int -> Const a b #

popCount :: Const a b -> Int #

FiniteBits a => FiniteBits (Const a b)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Const

(Typeable k, Data a, Typeable b) => Data (Const a b)

@since base-4.10.0.0

Instance details

Defined in GHC.Internal.Data.Data

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> Const a b -> c (Const a b) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Const a b) #

toConstr :: Const a b -> Constr #

dataTypeOf :: Const a b -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Const a b)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Const a b)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> Const a b -> Const a b #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Const a b -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Const a b -> r #

gmapQ :: (forall d. Data d => d -> u) -> Const a b -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Const a b -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Const a b -> m (Const a b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Const a b -> m (Const a b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Const a b -> m (Const a b) #

IsString a => IsString (Const a b)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.String

Methods

fromString :: String -> Const a b #

Bounded a => Bounded (Const a b)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Const

Methods

minBound :: Const a b #

maxBound :: Const a b #

Enum a => Enum (Const a b)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Const

Methods

succ :: Const a b -> Const a b #

pred :: Const a b -> Const a b #

toEnum :: Int -> Const a b #

fromEnum :: Const a b -> Int #

enumFrom :: Const a b -> [Const a b] #

enumFromThen :: Const a b -> Const a b -> [Const a b] #

enumFromTo :: Const a b -> Const a b -> [Const a b] #

enumFromThenTo :: Const a b -> Const a b -> Const a b -> [Const a b] #

Floating a => Floating (Const a b)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Const

Methods

pi :: Const a b #

exp :: Const a b -> Const a b #

log :: Const a b -> Const a b #

sqrt :: Const a b -> Const a b #

(**) :: Const a b -> Const a b -> Const a b #

logBase :: Const a b -> Const a b -> Const a b #

sin :: Const a b -> Const a b #

cos :: Const a b -> Const a b #

tan :: Const a b -> Const a b #

asin :: Const a b -> Const a b #

acos :: Const a b -> Const a b #

atan :: Const a b -> Const a b #

sinh :: Const a b -> Const a b #

cosh :: Const a b -> Const a b #

tanh :: Const a b -> Const a b #

asinh :: Const a b -> Const a b #

acosh :: Const a b -> Const a b #

atanh :: Const a b -> Const a b #

log1p :: Const a b -> Const a b #

expm1 :: Const a b -> Const a b #

log1pexp :: Const a b -> Const a b #

log1mexp :: Const a b -> Const a b #

RealFloat a => RealFloat (Const a b)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Const

Methods

floatRadix :: Const a b -> Integer #

floatDigits :: Const a b -> Int #

floatRange :: Const a b -> (Int, Int) #

decodeFloat :: Const a b -> (Integer, Int) #

encodeFloat :: Integer -> Int -> Const a b #

exponent :: Const a b -> Int #

significand :: Const a b -> Const a b #

scaleFloat :: Int -> Const a b -> Const a b #

isNaN :: Const a b -> Bool #

isInfinite :: Const a b -> Bool #

isDenormalized :: Const a b -> Bool #

isNegativeZero :: Const a b -> Bool #

isIEEE :: Const a b -> Bool #

atan2 :: Const a b -> Const a b -> Const a b #

Storable a => Storable (Const a b)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Const

Methods

sizeOf :: Const a b -> Int #

alignment :: Const a b -> Int #

peekElemOff :: Ptr (Const a b) -> Int -> IO (Const a b) #

pokeElemOff :: Ptr (Const a b) -> Int -> Const a b -> IO () #

peekByteOff :: Ptr b0 -> Int -> IO (Const a b) #

pokeByteOff :: Ptr b0 -> Int -> Const a b -> IO () #

peek :: Ptr (Const a b) -> IO (Const a b) #

poke :: Ptr (Const a b) -> Const a b -> IO () #

Generic (Const a b) 
Instance details

Defined in GHC.Internal.Data.Functor.Const

Associated Types

type Rep (Const a b)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Const

type Rep (Const a b) = D1 ('MetaData "Const" "GHC.Internal.Data.Functor.Const" "ghc-internal" 'True) (C1 ('MetaCons "Const" 'PrefixI 'True) (S1 ('MetaSel ('Just "getConst") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))

Methods

from :: Const a b -> Rep (Const a b) x #

to :: Rep (Const a b) x -> Const a b #

Ix a => Ix (Const a b)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Const

Methods

range :: (Const a b, Const a b) -> [Const a b] #

index :: (Const a b, Const a b) -> Const a b -> Int #

unsafeIndex :: (Const a b, Const a b) -> Const a b -> Int #

inRange :: (Const a b, Const a b) -> Const a b -> Bool #

rangeSize :: (Const a b, Const a b) -> Int #

unsafeRangeSize :: (Const a b, Const a b) -> Int #

Num a => Num (Const a b)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Const

Methods

(+) :: Const a b -> Const a b -> Const a b #

(-) :: Const a b -> Const a b -> Const a b #

(*) :: Const a b -> Const a b -> Const a b #

negate :: Const a b -> Const a b #

abs :: Const a b -> Const a b #

signum :: Const a b -> Const a b #

fromInteger :: Integer -> Const a b #

Read a => Read (Const a b)

This instance would be equivalent to the derived instances of the Const newtype if the getConst field were removed

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Const

Fractional a => Fractional (Const a b)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Const

Methods

(/) :: Const a b -> Const a b -> Const a b #

recip :: Const a b -> Const a b #

fromRational :: Rational -> Const a b #

Integral a => Integral (Const a b)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Const

Methods

quot :: Const a b -> Const a b -> Const a b #

rem :: Const a b -> Const a b -> Const a b #

div :: Const a b -> Const a b -> Const a b #

mod :: Const a b -> Const a b -> Const a b #

quotRem :: Const a b -> Const a b -> (Const a b, Const a b) #

divMod :: Const a b -> Const a b -> (Const a b, Const a b) #

toInteger :: Const a b -> Integer #

Real a => Real (Const a b)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Const

Methods

toRational :: Const a b -> Rational #

RealFrac a => RealFrac (Const a b)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Const

Methods

properFraction :: Integral b0 => Const a b -> (b0, Const a b) #

truncate :: Integral b0 => Const a b -> b0 #

round :: Integral b0 => Const a b -> b0 #

ceiling :: Integral b0 => Const a b -> b0 #

floor :: Integral b0 => Const a b -> b0 #

Show a => Show (Const a b)

This instance would be equivalent to the derived instances of the Const newtype if the getConst field were removed

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Const

Methods

showsPrec :: Int -> Const a b -> ShowS #

show :: Const a b -> String #

showList :: [Const a b] -> ShowS #

Eq a => Eq (Const a b)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Const

Methods

(==) :: Const a b -> Const a b -> Bool #

(/=) :: Const a b -> Const a b -> Bool #

Ord a => Ord (Const a b)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Const

Methods

compare :: Const a b -> Const a b -> Ordering #

(<) :: Const a b -> Const a b -> Bool #

(<=) :: Const a b -> Const a b -> Bool #

(>) :: Const a b -> Const a b -> Bool #

(>=) :: Const a b -> Const a b -> Bool #

max :: Const a b -> Const a b -> Const a b #

min :: Const a b -> Const a b -> Const a b #

Hashable a => Hashable (Const a b) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Const a b -> Int #

hash :: Const a b -> Int #

FromFormKey a => FromFormKey (Const a b)

Since: http-api-data-0.4.2

Instance details

Defined in Web.Internal.FormUrlEncoded

Methods

parseFormKey :: Text -> Either Text (Const a b) #

ToFormKey a => ToFormKey (Const a b)

Since: http-api-data-0.4.2

Instance details

Defined in Web.Internal.FormUrlEncoded

Methods

toFormKey :: Const a b -> Text #

Wrapped (Const a x) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Const a x) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (Const a x) = a

Methods

_Wrapped' :: Iso' (Const a x) (Unwrapped (Const a x)) #

MonoFoldable (Const m a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m0 => (Element (Const m a) -> m0) -> Const m a -> m0 #

ofoldr :: (Element (Const m a) -> b -> b) -> b -> Const m a -> b #

ofoldl' :: (a0 -> Element (Const m a) -> a0) -> a0 -> Const m a -> a0 #

otoList :: Const m a -> [Element (Const m a)] #

oall :: (Element (Const m a) -> Bool) -> Const m a -> Bool #

oany :: (Element (Const m a) -> Bool) -> Const m a -> Bool #

onull :: Const m a -> Bool #

olength :: Const m a -> Int #

olength64 :: Const m a -> Int64 #

ocompareLength :: Integral i => Const m a -> i -> Ordering #

otraverse_ :: Applicative f => (Element (Const m a) -> f b) -> Const m a -> f () #

ofor_ :: Applicative f => Const m a -> (Element (Const m a) -> f b) -> f () #

omapM_ :: Applicative m0 => (Element (Const m a) -> m0 ()) -> Const m a -> m0 () #

oforM_ :: Applicative m0 => Const m a -> (Element (Const m a) -> m0 ()) -> m0 () #

ofoldlM :: Monad m0 => (a0 -> Element (Const m a) -> m0 a0) -> a0 -> Const m a -> m0 a0 #

ofoldMap1Ex :: Semigroup m0 => (Element (Const m a) -> m0) -> Const m a -> m0 #

ofoldr1Ex :: (Element (Const m a) -> Element (Const m a) -> Element (Const m a)) -> Const m a -> Element (Const m a) #

ofoldl1Ex' :: (Element (Const m a) -> Element (Const m a) -> Element (Const m a)) -> Const m a -> Element (Const m a) #

headEx :: Const m a -> Element (Const m a) #

lastEx :: Const m a -> Element (Const m a) #

unsafeHead :: Const m a -> Element (Const m a) #

unsafeLast :: Const m a -> Element (Const m a) #

maximumByEx :: (Element (Const m a) -> Element (Const m a) -> Ordering) -> Const m a -> Element (Const m a) #

minimumByEx :: (Element (Const m a) -> Element (Const m a) -> Ordering) -> Const m a -> Element (Const m a) #

oelem :: Element (Const m a) -> Const m a -> Bool #

onotElem :: Element (Const m a) -> Const m a -> Bool #

MonoFunctor (Const m a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Const m a) -> Element (Const m a)) -> Const m a -> Const m a #

Monoid m => MonoPointed (Const m a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Const m a) -> Const m a #

MonoTraversable (Const m a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (Const m a) -> f (Element (Const m a))) -> Const m a -> f (Const m a) #

omapM :: Applicative m0 => (Element (Const m a) -> m0 (Element (Const m a))) -> Const m a -> m0 (Const m a) #

Pretty a => Pretty (Const a b) 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Const a b -> Doc ann #

prettyList :: [Const a b] -> Doc ann #

Unbox a => Unbox (Const a b) 
Instance details

Defined in Data.Vector.Unboxed.Base

t ~ Const a' x' => Rewrapped (Const a x) t 
Instance details

Defined in Control.Lens.Wrapped

type Rep1 (Const a :: k -> Type)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Const

type Rep1 (Const a :: k -> Type) = D1 ('MetaData "Const" "GHC.Internal.Data.Functor.Const" "ghc-internal" 'True) (C1 ('MetaCons "Const" 'PrefixI 'True) (S1 ('MetaSel ('Just "getConst") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))
newtype MVector s (Const a b) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s (Const a b) = MV_Const (MVector s a)
type Rep (Const a b)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Const

type Rep (Const a b) = D1 ('MetaData "Const" "GHC.Internal.Data.Functor.Const" "ghc-internal" 'True) (C1 ('MetaCons "Const" 'PrefixI 'True) (S1 ('MetaSel ('Just "getConst") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))
type Unwrapped (Const a x) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (Const a x) = a
type Element (Const m a) 
Instance details

Defined in Data.MonoTraversable

type Element (Const m a) = a
newtype Vector (Const a b) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector (Const a b) = V_Const (Vector a)

class Enum a where #

Class Enum defines operations on sequentially ordered types.

The enumFrom... methods are used in Haskell's translation of arithmetic sequences.

Instances of Enum may be derived for any enumeration type (types whose constructors have no fields). The nullary constructors are assumed to be numbered left-to-right by fromEnum from 0 through n-1. See Chapter 10 of the Haskell Report for more details.

For any type that is an instance of class Bounded as well as Enum, the following should hold:

   enumFrom     x   = enumFromTo     x maxBound
   enumFromThen x y = enumFromThenTo x y bound
     where
       bound | fromEnum y >= fromEnum x = maxBound
             | otherwise                = minBound

Minimal complete definition

toEnum, fromEnum

Methods

succ :: a -> a #

Successor of a value. For numeric types, succ adds 1.

pred :: a -> a #

Predecessor of a value. For numeric types, pred subtracts 1.

toEnum :: Int -> a #

Convert from an Int.

fromEnum :: a -> Int #

Convert to an Int. It is implementation-dependent what fromEnum returns when applied to a value that is too large to fit in an Int.

enumFrom :: a -> [a] #

Used in Haskell's translation of [n..] with [n..] = enumFrom n, a possible implementation being enumFrom n = n : enumFrom (succ n).

Examples

Expand
  • enumFrom 4 :: [Integer] = [4,5,6,7,...]
  • enumFrom 6 :: [Int] = [6,7,8,9,...,maxBound :: Int]

enumFromThen :: a -> a -> [a] #

Used in Haskell's translation of [n,n'..] with [n,n'..] = enumFromThen n n', a possible implementation being enumFromThen n n' = n : n' : worker (f x) (f x n'), worker s v = v : worker s (s v), x = fromEnum n' - fromEnum n and

  f n y
    | n > 0 = f (n - 1) (succ y)
    | n < 0 = f (n + 1) (pred y)
    | otherwise = y
  

Examples

Expand
  • enumFromThen 4 6 :: [Integer] = [4,6,8,10...]
  • enumFromThen 6 2 :: [Int] = [6,2,-2,-6,...,minBound :: Int]

enumFromTo :: a -> a -> [a] #

Used in Haskell's translation of [n..m] with [n..m] = enumFromTo n m, a possible implementation being

  enumFromTo n m
     | n <= m = n : enumFromTo (succ n) m
     | otherwise = []
  

Examples

Expand
  • enumFromTo 6 10 :: [Int] = [6,7,8,9,10]
  • enumFromTo 42 1 :: [Integer] = []

enumFromThenTo :: a -> a -> a -> [a] #

Used in Haskell's translation of [n,n'..m] with [n,n'..m] = enumFromThenTo n n' m, a possible implementation being enumFromThenTo n n' m = worker (f x) (c x) n m, x = fromEnum n' - fromEnum n, c x = bool (>=) ((x 0)

  f n y
     | n > 0 = f (n - 1) (succ y)
     | n < 0 = f (n + 1) (pred y)
     | otherwise = y
  

and

  worker s c v m
     | c v m = v : worker s c (s v) m
     | otherwise = []
  

Examples

Expand
  • enumFromThenTo 4 2 -6 :: [Integer] = [4,2,0,-2,-4,-6]
  • enumFromThenTo 6 8 2 :: [Int] = []

Instances

Instances details
Enum Arity 
Instance details

Defined in Data.Aeson.TH

Methods

succ :: Arity -> Arity #

pred :: Arity -> Arity #

toEnum :: Int -> Arity #

fromEnum :: Arity -> Int #

enumFrom :: Arity -> [Arity] #

enumFromThen :: Arity -> Arity -> [Arity] #

enumFromTo :: Arity -> Arity -> [Arity] #

enumFromThenTo :: Arity -> Arity -> Arity -> [Arity] #

Enum Encoding 
Instance details

Defined in Basement.String

Enum UTF32_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF32

Methods

succ :: UTF32_Invalid -> UTF32_Invalid #

pred :: UTF32_Invalid -> UTF32_Invalid #

toEnum :: Int -> UTF32_Invalid #

fromEnum :: UTF32_Invalid -> Int #

enumFrom :: UTF32_Invalid -> [UTF32_Invalid] #

enumFromThen :: UTF32_Invalid -> UTF32_Invalid -> [UTF32_Invalid] #

enumFromTo :: UTF32_Invalid -> UTF32_Invalid -> [UTF32_Invalid] #

enumFromThenTo :: UTF32_Invalid -> UTF32_Invalid -> UTF32_Invalid -> [UTF32_Invalid] #

Enum CryptoError 
Instance details

Defined in Crypto.Error.Types

Enum CryptoError 
Instance details

Defined in Crypto.Error.Types

Enum ArgCount 
Instance details

Defined in Database.SQLite3.Bindings.Types

Enum CArgCount 
Instance details

Defined in Database.SQLite3.Bindings.Types

Enum CColumnIndex 
Instance details

Defined in Database.SQLite3.Bindings.Types

Enum CNumBytes 
Instance details

Defined in Database.SQLite3.Bindings.Types

Enum CParamIndex 
Instance details

Defined in Database.SQLite3.Bindings.Types

Enum ColumnIndex 
Instance details

Defined in Database.SQLite3.Bindings.Types

Enum ParamIndex 
Instance details

Defined in Database.SQLite3.Bindings.Types

Enum AOp 
Instance details

Defined in GHC.JS.JStg.Syntax

Methods

succ :: AOp -> AOp #

pred :: AOp -> AOp #

toEnum :: Int -> AOp #

fromEnum :: AOp -> Int #

enumFrom :: AOp -> [AOp] #

enumFromThen :: AOp -> AOp -> [AOp] #

enumFromTo :: AOp -> AOp -> [AOp] #

enumFromThenTo :: AOp -> AOp -> AOp -> [AOp] #

Enum Op 
Instance details

Defined in GHC.JS.JStg.Syntax

Methods

succ :: Op -> Op #

pred :: Op -> Op #

toEnum :: Int -> Op #

fromEnum :: Op -> Int #

enumFrom :: Op -> [Op] #

enumFromThen :: Op -> Op -> [Op] #

enumFromTo :: Op -> Op -> [Op] #

enumFromThenTo :: Op -> Op -> Op -> [Op] #

Enum UOp 
Instance details

Defined in GHC.JS.JStg.Syntax

Methods

succ :: UOp -> UOp #

pred :: UOp -> UOp #

toEnum :: Int -> UOp #

fromEnum :: UOp -> Int #

enumFrom :: UOp -> [UOp] #

enumFromThen :: UOp -> UOp -> [UOp] #

enumFromTo :: UOp -> UOp -> [UOp] #

enumFromThenTo :: UOp -> UOp -> UOp -> [UOp] #

Enum AOp 
Instance details

Defined in GHC.JS.Syntax

Methods

succ :: AOp -> AOp #

pred :: AOp -> AOp #

toEnum :: Int -> AOp #

fromEnum :: AOp -> Int #

enumFrom :: AOp -> [AOp] #

enumFromThen :: AOp -> AOp -> [AOp] #

enumFromTo :: AOp -> AOp -> [AOp] #

enumFromThenTo :: AOp -> AOp -> AOp -> [AOp] #

Enum Op 
Instance details

Defined in GHC.JS.Syntax

Methods

succ :: Op -> Op #

pred :: Op -> Op #

toEnum :: Int -> Op #

fromEnum :: Op -> Int #

enumFrom :: Op -> [Op] #

enumFromThen :: Op -> Op -> [Op] #

enumFromTo :: Op -> Op -> [Op] #

enumFromThenTo :: Op -> Op -> Op -> [Op] #

Enum UOp 
Instance details

Defined in GHC.JS.Syntax

Methods

succ :: UOp -> UOp #

pred :: UOp -> UOp #

toEnum :: Int -> UOp #

fromEnum :: UOp -> Int #

enumFrom :: UOp -> [UOp] #

enumFromThen :: UOp -> UOp -> [UOp] #

enumFromTo :: UOp -> UOp -> [UOp] #

enumFromThenTo :: UOp -> UOp -> UOp -> [UOp] #

Enum Extension 
Instance details

Defined in GHC.LanguageExtensions.Type

Enum ByteOrder

@since base-4.11.0.0

Instance details

Defined in GHC.Internal.ByteOrder

Enum ClosureType 
Instance details

Defined in GHC.Internal.ClosureTypes

Enum CBool 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum CChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum CClock 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum CDouble 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum CFloat 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum CInt 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

succ :: CInt -> CInt #

pred :: CInt -> CInt #

toEnum :: Int -> CInt #

fromEnum :: CInt -> Int #

enumFrom :: CInt -> [CInt] #

enumFromThen :: CInt -> CInt -> [CInt] #

enumFromTo :: CInt -> CInt -> [CInt] #

enumFromThenTo :: CInt -> CInt -> CInt -> [CInt] #

Enum CIntMax 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum CIntPtr 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum CLLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum CLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum CPtrdiff 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum CSChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum CSUSeconds 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum CShort 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum CSigAtomic 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum CSize 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum CTime 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum CUChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum CUInt 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum CUIntMax 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum CUIntPtr 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum CULLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum CULong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum CUSeconds 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum CUShort 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum CWchar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Enum Associativity

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Enum DecidedStrictness

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Enum SourceStrictness

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Enum SourceUnpackedness

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Enum IOMode

@since base-4.2.0.0

Instance details

Defined in GHC.Internal.IO.IOMode

Enum Int16

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Enum Int32

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Enum Int64

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Enum Int8

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Methods

succ :: Int8 -> Int8 #

pred :: Int8 -> Int8 #

toEnum :: Int -> Int8 #

fromEnum :: Int8 -> Int #

enumFrom :: Int8 -> [Int8] #

enumFromThen :: Int8 -> Int8 -> [Int8] #

enumFromTo :: Int8 -> Int8 -> [Int8] #

enumFromThenTo :: Int8 -> Int8 -> Int8 -> [Int8] #

Enum DoCostCentres

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.RTS.Flags

Enum DoHeapProfile

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.RTS.Flags

Enum DoTrace

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.RTS.Flags

Enum GiveGCStats

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.RTS.Flags

Enum IoSubSystem

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.RTS.Flags

Enum CBlkCnt 
Instance details

Defined in GHC.Internal.System.Posix.Types

Enum CBlkSize 
Instance details

Defined in GHC.Internal.System.Posix.Types

Enum CCc 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

succ :: CCc -> CCc #

pred :: CCc -> CCc #

toEnum :: Int -> CCc #

fromEnum :: CCc -> Int #

enumFrom :: CCc -> [CCc] #

enumFromThen :: CCc -> CCc -> [CCc] #

enumFromTo :: CCc -> CCc -> [CCc] #

enumFromThenTo :: CCc -> CCc -> CCc -> [CCc] #

Enum CClockId 
Instance details

Defined in GHC.Internal.System.Posix.Types

Enum CDev 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

succ :: CDev -> CDev #

pred :: CDev -> CDev #

toEnum :: Int -> CDev #

fromEnum :: CDev -> Int #

enumFrom :: CDev -> [CDev] #

enumFromThen :: CDev -> CDev -> [CDev] #

enumFromTo :: CDev -> CDev -> [CDev] #

enumFromThenTo :: CDev -> CDev -> CDev -> [CDev] #

Enum CFsBlkCnt 
Instance details

Defined in GHC.Internal.System.Posix.Types

Enum CFsFilCnt 
Instance details

Defined in GHC.Internal.System.Posix.Types

Enum CGid 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

succ :: CGid -> CGid #

pred :: CGid -> CGid #

toEnum :: Int -> CGid #

fromEnum :: CGid -> Int #

enumFrom :: CGid -> [CGid] #

enumFromThen :: CGid -> CGid -> [CGid] #

enumFromTo :: CGid -> CGid -> [CGid] #

enumFromThenTo :: CGid -> CGid -> CGid -> [CGid] #

Enum CId 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

succ :: CId -> CId #

pred :: CId -> CId #

toEnum :: Int -> CId #

fromEnum :: CId -> Int #

enumFrom :: CId -> [CId] #

enumFromThen :: CId -> CId -> [CId] #

enumFromTo :: CId -> CId -> [CId] #

enumFromThenTo :: CId -> CId -> CId -> [CId] #

Enum CIno 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

succ :: CIno -> CIno #

pred :: CIno -> CIno #

toEnum :: Int -> CIno #

fromEnum :: CIno -> Int #

enumFrom :: CIno -> [CIno] #

enumFromThen :: CIno -> CIno -> [CIno] #

enumFromTo :: CIno -> CIno -> [CIno] #

enumFromThenTo :: CIno -> CIno -> CIno -> [CIno] #

Enum CKey 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

succ :: CKey -> CKey #

pred :: CKey -> CKey #

toEnum :: Int -> CKey #

fromEnum :: CKey -> Int #

enumFrom :: CKey -> [CKey] #

enumFromThen :: CKey -> CKey -> [CKey] #

enumFromTo :: CKey -> CKey -> [CKey] #

enumFromThenTo :: CKey -> CKey -> CKey -> [CKey] #

Enum CMode 
Instance details

Defined in GHC.Internal.System.Posix.Types

Enum CNfds 
Instance details

Defined in GHC.Internal.System.Posix.Types

Enum CNlink 
Instance details

Defined in GHC.Internal.System.Posix.Types

Enum COff 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

succ :: COff -> COff #

pred :: COff -> COff #

toEnum :: Int -> COff #

fromEnum :: COff -> Int #

enumFrom :: COff -> [COff] #

enumFromThen :: COff -> COff -> [COff] #

enumFromTo :: COff -> COff -> [COff] #

enumFromThenTo :: COff -> COff -> COff -> [COff] #

Enum CPid 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

succ :: CPid -> CPid #

pred :: CPid -> CPid #

toEnum :: Int -> CPid #

fromEnum :: CPid -> Int #

enumFrom :: CPid -> [CPid] #

enumFromThen :: CPid -> CPid -> [CPid] #

enumFromTo :: CPid -> CPid -> [CPid] #

enumFromThenTo :: CPid -> CPid -> CPid -> [CPid] #

Enum CRLim 
Instance details

Defined in GHC.Internal.System.Posix.Types

Enum CSocklen 
Instance details

Defined in GHC.Internal.System.Posix.Types

Enum CSpeed 
Instance details

Defined in GHC.Internal.System.Posix.Types

Enum CSsize 
Instance details

Defined in GHC.Internal.System.Posix.Types

Enum CTcflag 
Instance details

Defined in GHC.Internal.System.Posix.Types

Enum CUid 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

succ :: CUid -> CUid #

pred :: CUid -> CUid #

toEnum :: Int -> CUid #

fromEnum :: CUid -> Int #

enumFrom :: CUid -> [CUid] #

enumFromThen :: CUid -> CUid -> [CUid] #

enumFromTo :: CUid -> CUid -> [CUid] #

enumFromThenTo :: CUid -> CUid -> CUid -> [CUid] #

Enum Fd 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

succ :: Fd -> Fd #

pred :: Fd -> Fd #

toEnum :: Int -> Fd #

fromEnum :: Fd -> Int #

enumFrom :: Fd -> [Fd] #

enumFromThen :: Fd -> Fd -> [Fd] #

enumFromTo :: Fd -> Fd -> [Fd] #

enumFromThenTo :: Fd -> Fd -> Fd -> [Fd] #

Enum GeneralCategory

@since base-2.01

Instance details

Defined in GHC.Internal.Unicode

Enum Word16

@since base-2.01

Instance details

Defined in GHC.Internal.Word

Enum Word32

@since base-2.01

Instance details

Defined in GHC.Internal.Word

Enum Word64

@since base-2.01

Instance details

Defined in GHC.Internal.Word

Enum Word8

@since base-2.01

Instance details

Defined in GHC.Internal.Word

Enum Ordering

@since base-2.01

Instance details

Defined in GHC.Internal.Enum

Enum THResultType 
Instance details

Defined in GHCi.Message

Enum Seconds 
Instance details

Defined in Gogol.Types

Enum IdpName 
Instance details

Defined in Network.OAuth2.Provider

Enum StdMethod 
Instance details

Defined in Network.HTTP.Types.Method

Enum Status

Be advised, that when using the "enumFrom*" family of methods or ranges in lists, it will generate all possible status codes.

E.g. [status100 .. status200] generates Statuses of 100, 101, 102 .. 198, 199, 200

The statuses not included in this library will have an empty message.

Since: http-types-0.7.3

Instance details

Defined in Network.HTTP.Types.Status

Enum IP 
Instance details

Defined in Data.IP.Addr

Methods

succ :: IP -> IP #

pred :: IP -> IP #

toEnum :: Int -> IP #

fromEnum :: IP -> Int #

enumFrom :: IP -> [IP] #

enumFromThen :: IP -> IP -> [IP] #

enumFromTo :: IP -> IP -> [IP] #

enumFromThenTo :: IP -> IP -> IP -> [IP] #

Enum IPv4 
Instance details

Defined in Data.IP.Addr

Methods

succ :: IPv4 -> IPv4 #

pred :: IPv4 -> IPv4 #

toEnum :: Int -> IPv4 #

fromEnum :: IPv4 -> Int #

enumFrom :: IPv4 -> [IPv4] #

enumFromThen :: IPv4 -> IPv4 -> [IPv4] #

enumFromTo :: IPv4 -> IPv4 -> [IPv4] #

enumFromThenTo :: IPv4 -> IPv4 -> IPv4 -> [IPv4] #

Enum IPv6 
Instance details

Defined in Data.IP.Addr

Methods

succ :: IPv6 -> IPv6 #

pred :: IPv6 -> IPv6 #

toEnum :: Int -> IPv6 #

fromEnum :: IPv6 -> Int #

enumFrom :: IPv6 -> [IPv6] #

enumFromThen :: IPv6 -> IPv6 -> [IPv6] #

enumFromTo :: IPv6 -> IPv6 -> [IPv6] #

enumFromThenTo :: IPv6 -> IPv6 -> IPv6 -> [IPv6] #

Enum Severity 
Instance details

Defined in Katip.Core

Enum Verbosity 
Instance details

Defined in Katip.Core

Enum SpecFileArrayMergeStrategy # 
Instance details

Defined in Napkin.Cli.Types

Enum AddedColumnPolicy # 
Instance details

Defined in Napkin.Run.Effects.Programs

Enum DroppedColumnPolicy # 
Instance details

Defined in Napkin.Run.Effects.Programs

Enum PartitionInterval 
Instance details

Defined in Napkin.Types.BigQuery

Enum TableKind 
Instance details

Defined in Napkin.Types.Core

Enum LogLineFormat 
Instance details

Defined in Napkin.Logging

Enum SimpleSQLParserDialect 
Instance details

Defined in Napkin.Parse.SimpleSqlParser.Dialect

Enum TableWriteStrategy 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlWrite

Enum RenamerSchemaOverwriteBehavior 
Instance details

Defined in Napkin.Run.Effects.Preprocessor

Enum RenamerScope 
Instance details

Defined in Napkin.Run.Effects.Preprocessor

Enum SQLCTYPE 
Instance details

Defined in Database.ODBC.Internal

Methods

succ :: SQLCTYPE -> SQLCTYPE #

pred :: SQLCTYPE -> SQLCTYPE #

toEnum :: Int -> SQLCTYPE #

fromEnum :: SQLCTYPE -> Int #

enumFrom :: SQLCTYPE -> [SQLCTYPE] #

enumFromThen :: SQLCTYPE -> SQLCTYPE -> [SQLCTYPE] #

enumFromTo :: SQLCTYPE -> SQLCTYPE -> [SQLCTYPE] #

enumFromThenTo :: SQLCTYPE -> SQLCTYPE -> SQLCTYPE -> [SQLCTYPE] #

Enum SQLSMALLINT 
Instance details

Defined in Database.ODBC.Internal

Methods

succ :: SQLSMALLINT -> SQLSMALLINT #

pred :: SQLSMALLINT -> SQLSMALLINT #

toEnum :: Int -> SQLSMALLINT #

fromEnum :: SQLSMALLINT -> Int #

enumFrom :: SQLSMALLINT -> [SQLSMALLINT] #

enumFromThen :: SQLSMALLINT -> SQLSMALLINT -> [SQLSMALLINT] #

enumFromTo :: SQLSMALLINT -> SQLSMALLINT -> [SQLSMALLINT] #

enumFromThenTo :: SQLSMALLINT -> SQLSMALLINT -> SQLSMALLINT -> [SQLSMALLINT] #

Enum SQLUINTEGER 
Instance details

Defined in Database.ODBC.Internal

Methods

succ :: SQLUINTEGER -> SQLUINTEGER #

pred :: SQLUINTEGER -> SQLUINTEGER #

toEnum :: Int -> SQLUINTEGER #

fromEnum :: SQLUINTEGER -> Int #

enumFrom :: SQLUINTEGER -> [SQLUINTEGER] #

enumFromThen :: SQLUINTEGER -> SQLUINTEGER -> [SQLUINTEGER] #

enumFromTo :: SQLUINTEGER -> SQLUINTEGER -> [SQLUINTEGER] #

enumFromThenTo :: SQLUINTEGER -> SQLUINTEGER -> SQLUINTEGER -> [SQLUINTEGER] #

Enum SQLUSMALLINT 
Instance details

Defined in Database.ODBC.Internal

Methods

succ :: SQLUSMALLINT -> SQLUSMALLINT #

pred :: SQLUSMALLINT -> SQLUSMALLINT #

toEnum :: Int -> SQLUSMALLINT #

fromEnum :: SQLUSMALLINT -> Int #

enumFrom :: SQLUSMALLINT -> [SQLUSMALLINT] #

enumFromThen :: SQLUSMALLINT -> SQLUSMALLINT -> [SQLUSMALLINT] #

enumFromTo :: SQLUSMALLINT -> SQLUSMALLINT -> [SQLUSMALLINT] #

enumFromThenTo :: SQLUSMALLINT -> SQLUSMALLINT -> SQLUSMALLINT -> [SQLUSMALLINT] #

Enum AscDesc 
Instance details

Defined in PostgresqlSyntax.Ast

Enum MathOp 
Instance details

Defined in PostgresqlSyntax.Ast

Enum NullsOrder 
Instance details

Defined in PostgresqlSyntax.Ast

Enum OverrideKind 
Instance details

Defined in PostgresqlSyntax.Ast

Enum SubType 
Instance details

Defined in PostgresqlSyntax.Ast

Enum TrimModifier 
Instance details

Defined in PostgresqlSyntax.Ast

Enum VerbalExprBinOp 
Instance details

Defined in PostgresqlSyntax.Ast

Enum Undefined 
Instance details

Defined in Relude.Debug

Enum LinkArrayElementStyle 
Instance details

Defined in Servant.Links

Enum Leniency 
Instance details

Defined in Data.String.Conv

Enum I8 
Instance details

Defined in Data.Text.Foreign

Methods

succ :: I8 -> I8 #

pred :: I8 -> I8 #

toEnum :: Int -> I8 #

fromEnum :: I8 -> Int #

enumFrom :: I8 -> [I8] #

enumFromThen :: I8 -> I8 -> [I8] #

enumFromTo :: I8 -> I8 -> [I8] #

enumFromThenTo :: I8 -> I8 -> I8 -> [I8] #

Enum FPFormat 
Instance details

Defined in Data.Text.Lazy.Builder.RealFloat

Enum Day 
Instance details

Defined in Data.Time.Calendar.Days

Methods

succ :: Day -> Day #

pred :: Day -> Day #

toEnum :: Int -> Day #

fromEnum :: Day -> Int #

enumFrom :: Day -> [Day] #

enumFromThen :: Day -> Day -> [Day] #

enumFromTo :: Day -> Day -> [Day] #

enumFromThenTo :: Day -> Day -> Day -> [Day] #

Enum Month 
Instance details

Defined in Data.Time.Calendar.Month

Enum Quarter 
Instance details

Defined in Data.Time.Calendar.Quarter

Enum QuarterOfYear

maps Q1..Q4 to 1..4

Instance details

Defined in Data.Time.Calendar.Quarter

Enum DayOfWeek

"Circular", so for example [Tuesday ..] gives an endless sequence. Also: fromEnum gives [1 .. 7] for [Monday .. Sunday], and toEnum performs mod 7 to give a cycle of days.

Instance details

Defined in Data.Time.Calendar.Week

Enum DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Enum NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Enum SchemaError 
Instance details

Defined in URI.ByteString.Types

Enum CompressionStrategy 
Instance details

Defined in Codec.Compression.Zlib.Stream

Enum Format 
Instance details

Defined in Codec.Compression.Zlib.Stream

Enum Method 
Instance details

Defined in Codec.Compression.Zlib.Stream

Enum Integer

@since base-2.01

Instance details

Defined in GHC.Internal.Enum

Enum Natural

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Enum

Enum ()

@since base-2.01

Instance details

Defined in GHC.Internal.Enum

Methods

succ :: () -> () #

pred :: () -> () #

toEnum :: Int -> () #

fromEnum :: () -> Int #

enumFrom :: () -> [()] #

enumFromThen :: () -> () -> [()] #

enumFromTo :: () -> () -> [()] #

enumFromThenTo :: () -> () -> () -> [()] #

Enum Bool

@since base-2.01

Instance details

Defined in GHC.Internal.Enum

Methods

succ :: Bool -> Bool #

pred :: Bool -> Bool #

toEnum :: Int -> Bool #

fromEnum :: Bool -> Int #

enumFrom :: Bool -> [Bool] #

enumFromThen :: Bool -> Bool -> [Bool] #

enumFromTo :: Bool -> Bool -> [Bool] #

enumFromThenTo :: Bool -> Bool -> Bool -> [Bool] #

Enum Char

@since base-2.01

Instance details

Defined in GHC.Internal.Enum

Methods

succ :: Char -> Char #

pred :: Char -> Char #

toEnum :: Int -> Char #

fromEnum :: Char -> Int #

enumFrom :: Char -> [Char] #

enumFromThen :: Char -> Char -> [Char] #

enumFromTo :: Char -> Char -> [Char] #

enumFromThenTo :: Char -> Char -> Char -> [Char] #

Enum Int

@since base-2.01

Instance details

Defined in GHC.Internal.Enum

Methods

succ :: Int -> Int #

pred :: Int -> Int #

toEnum :: Int -> Int #

fromEnum :: Int -> Int #

enumFrom :: Int -> [Int] #

enumFromThen :: Int -> Int -> [Int] #

enumFromTo :: Int -> Int -> [Int] #

enumFromThenTo :: Int -> Int -> Int -> [Int] #

Enum Levity

@since base-4.16.0.0

Instance details

Defined in GHC.Internal.Enum

Enum VecCount

@since base-4.10.0.0

Instance details

Defined in GHC.Internal.Enum

Enum VecElem

@since base-4.10.0.0

Instance details

Defined in GHC.Internal.Enum

Enum Word

@since base-2.01

Instance details

Defined in GHC.Internal.Enum

Methods

succ :: Word -> Word #

pred :: Word -> Word #

toEnum :: Int -> Word #

fromEnum :: Word -> Int #

enumFrom :: Word -> [Word] #

enumFromThen :: Word -> Word -> [Word] #

enumFromTo :: Word -> Word -> [Word] #

enumFromThenTo :: Word -> Word -> Word -> [Word] #

Enum a => Enum (First a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

succ :: First a -> First a #

pred :: First a -> First a #

toEnum :: Int -> First a #

fromEnum :: First a -> Int #

enumFrom :: First a -> [First a] #

enumFromThen :: First a -> First a -> [First a] #

enumFromTo :: First a -> First a -> [First a] #

enumFromThenTo :: First a -> First a -> First a -> [First a] #

Enum a => Enum (Last a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

succ :: Last a -> Last a #

pred :: Last a -> Last a #

toEnum :: Int -> Last a #

fromEnum :: Last a -> Int #

enumFrom :: Last a -> [Last a] #

enumFromThen :: Last a -> Last a -> [Last a] #

enumFromTo :: Last a -> Last a -> [Last a] #

enumFromThenTo :: Last a -> Last a -> Last a -> [Last a] #

Enum a => Enum (Max a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

succ :: Max a -> Max a #

pred :: Max a -> Max a #

toEnum :: Int -> Max a #

fromEnum :: Max a -> Int #

enumFrom :: Max a -> [Max a] #

enumFromThen :: Max a -> Max a -> [Max a] #

enumFromTo :: Max a -> Max a -> [Max a] #

enumFromThenTo :: Max a -> Max a -> Max a -> [Max a] #

Enum a => Enum (Min a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

succ :: Min a -> Min a #

pred :: Min a -> Min a #

toEnum :: Int -> Min a #

fromEnum :: Min a -> Int #

enumFrom :: Min a -> [Min a] #

enumFromThen :: Min a -> Min a -> [Min a] #

enumFromTo :: Min a -> Min a -> [Min a] #

enumFromThenTo :: Min a -> Min a -> Min a -> [Min a] #

Enum a => Enum (WrappedMonoid a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

SizeValid n => Enum (Bits n) 
Instance details

Defined in Basement.Bits

Methods

succ :: Bits n -> Bits n #

pred :: Bits n -> Bits n #

toEnum :: Int -> Bits n #

fromEnum :: Bits n -> Int #

enumFrom :: Bits n -> [Bits n] #

enumFromThen :: Bits n -> Bits n -> [Bits n] #

enumFromTo :: Bits n -> Bits n -> [Bits n] #

enumFromThenTo :: Bits n -> Bits n -> Bits n -> [Bits n] #

Enum (CountOf ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

succ :: CountOf ty -> CountOf ty #

pred :: CountOf ty -> CountOf ty #

toEnum :: Int -> CountOf ty #

fromEnum :: CountOf ty -> Int #

enumFrom :: CountOf ty -> [CountOf ty] #

enumFromThen :: CountOf ty -> CountOf ty -> [CountOf ty] #

enumFromTo :: CountOf ty -> CountOf ty -> [CountOf ty] #

enumFromThenTo :: CountOf ty -> CountOf ty -> CountOf ty -> [CountOf ty] #

Enum (Offset ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

succ :: Offset ty -> Offset ty #

pred :: Offset ty -> Offset ty #

toEnum :: Int -> Offset ty #

fromEnum :: Offset ty -> Int #

enumFrom :: Offset ty -> [Offset ty] #

enumFromThen :: Offset ty -> Offset ty -> [Offset ty] #

enumFromTo :: Offset ty -> Offset ty -> [Offset ty] #

enumFromThenTo :: Offset ty -> Offset ty -> Offset ty -> [Offset ty] #

Enum a => Enum (Identity a)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Identity

(Enum a, Bounded a, Eq a) => Enum (Down a)

Swaps succ and pred of the underlying type.

@since base-4.18.0.0

Instance details

Defined in GHC.Internal.Data.Ord

Methods

succ :: Down a -> Down a #

pred :: Down a -> Down a #

toEnum :: Int -> Down a #

fromEnum :: Down a -> Int #

enumFrom :: Down a -> [Down a] #

enumFromThen :: Down a -> Down a -> [Down a] #

enumFromTo :: Down a -> Down a -> [Down a] #

enumFromThenTo :: Down a -> Down a -> Down a -> [Down a] #

Integral a => Enum (Ratio a)

@since base-2.0.1

Instance details

Defined in GHC.Internal.Real

Methods

succ :: Ratio a -> Ratio a #

pred :: Ratio a -> Ratio a #

toEnum :: Int -> Ratio a #

fromEnum :: Ratio a -> Int #

enumFrom :: Ratio a -> [Ratio a] #

enumFromThen :: Ratio a -> Ratio a -> [Ratio a] #

enumFromTo :: Ratio a -> Ratio a -> [Ratio a] #

enumFromThenTo :: Ratio a -> Ratio a -> Ratio a -> [Ratio a] #

Enum a => Enum (Solo a) 
Instance details

Defined in GHC.Internal.Enum

Methods

succ :: Solo a -> Solo a #

pred :: Solo a -> Solo a #

toEnum :: Int -> Solo a #

fromEnum :: Solo a -> Int #

enumFrom :: Solo a -> [Solo a] #

enumFromThen :: Solo a -> Solo a -> [Solo a] #

enumFromTo :: Solo a -> Solo a -> [Solo a] #

enumFromThenTo :: Solo a -> Solo a -> Solo a -> [Solo a] #

Enum (Fixed a)

Recall that, for numeric types, succ and pred typically add and subtract 1, respectively. This is not true in the case of Fixed, whose successor and predecessor functions intuitively return the "next" and "previous" values in the enumeration. The results of these functions thus depend on the resolution of the Fixed value. For example, when enumerating values of resolution 10^-3 of type Milli = Fixed E3,

>>> succ (0.000 :: Milli)
0.001

and likewise

>>> pred (0.000 :: Milli)
-0.001

In other words, succ and pred increment and decrement a fixed-precision value by the least amount such that the value's resolution is unchanged. For example, 10^-12 is the smallest (positive) amount that can be added to a value of type Pico = Fixed E12 without changing its resolution, and so

>>> succ (0.000000000000 :: Pico)
0.000000000001

and similarly

>>> pred (0.000000000000 :: Pico)
-0.000000000001

This is worth bearing in mind when defining Fixed arithmetic sequences. In particular, you may be forgiven for thinking the sequence

  [1..10] :: [Pico]

evaluates to [1, 2, 3, 4, 5, 6, 7, 8, 9, 10] :: [Pico].

However, this is not true. On the contrary, similarly to the above implementations of succ and pred, enumFromTo :: Pico -> Pico -> [Pico] has a "step size" of 10^-12. Hence, the list [1..10] :: [Pico] has the form

  [1.000000000000, 1.00000000001, 1.00000000002, ..., 10.000000000000]

and contains 9 * 10^12 + 1 values.

Since: base-2.1

Instance details

Defined in Data.Fixed

Methods

succ :: Fixed a -> Fixed a #

pred :: Fixed a -> Fixed a #

toEnum :: Int -> Fixed a #

fromEnum :: Fixed a -> Int #

enumFrom :: Fixed a -> [Fixed a] #

enumFromThen :: Fixed a -> Fixed a -> [Fixed a] #

enumFromTo :: Fixed a -> Fixed a -> [Fixed a] #

enumFromThenTo :: Fixed a -> Fixed a -> Fixed a -> [Fixed a] #

Enum (Proxy s)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Data.Proxy

Methods

succ :: Proxy s -> Proxy s #

pred :: Proxy s -> Proxy s #

toEnum :: Int -> Proxy s #

fromEnum :: Proxy s -> Int #

enumFrom :: Proxy s -> [Proxy s] #

enumFromThen :: Proxy s -> Proxy s -> [Proxy s] #

enumFromTo :: Proxy s -> Proxy s -> [Proxy s] #

enumFromThenTo :: Proxy s -> Proxy s -> Proxy s -> [Proxy s] #

Enum a => Enum (Const a b)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Const

Methods

succ :: Const a b -> Const a b #

pred :: Const a b -> Const a b #

toEnum :: Int -> Const a b #

fromEnum :: Const a b -> Int #

enumFrom :: Const a b -> [Const a b] #

enumFromThen :: Const a b -> Const a b -> [Const a b] #

enumFromTo :: Const a b -> Const a b -> [Const a b] #

enumFromThenTo :: Const a b -> Const a b -> Const a b -> [Const a b] #

Enum (f a) => Enum (Ap f a)

@since base-4.12.0.0

Instance details

Defined in GHC.Internal.Data.Monoid

Methods

succ :: Ap f a -> Ap f a #

pred :: Ap f a -> Ap f a #

toEnum :: Int -> Ap f a #

fromEnum :: Ap f a -> Int #

enumFrom :: Ap f a -> [Ap f a] #

enumFromThen :: Ap f a -> Ap f a -> [Ap f a] #

enumFromTo :: Ap f a -> Ap f a -> [Ap f a] #

enumFromThenTo :: Ap f a -> Ap f a -> Ap f a -> [Ap f a] #

Enum (f a) => Enum (Alt f a)

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

succ :: Alt f a -> Alt f a #

pred :: Alt f a -> Alt f a #

toEnum :: Int -> Alt f a #

fromEnum :: Alt f a -> Int #

enumFrom :: Alt f a -> [Alt f a] #

enumFromThen :: Alt f a -> Alt f a -> [Alt f a] #

enumFromTo :: Alt f a -> Alt f a -> [Alt f a] #

enumFromThenTo :: Alt f a -> Alt f a -> Alt f a -> [Alt f a] #

a ~ b => Enum (a :~: b)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Data.Type.Equality

Methods

succ :: (a :~: b) -> a :~: b #

pred :: (a :~: b) -> a :~: b #

toEnum :: Int -> a :~: b #

fromEnum :: (a :~: b) -> Int #

enumFrom :: (a :~: b) -> [a :~: b] #

enumFromThen :: (a :~: b) -> (a :~: b) -> [a :~: b] #

enumFromTo :: (a :~: b) -> (a :~: b) -> [a :~: b] #

enumFromThenTo :: (a :~: b) -> (a :~: b) -> (a :~: b) -> [a :~: b] #

Enum a => Enum (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

succ :: Tagged s a -> Tagged s a #

pred :: Tagged s a -> Tagged s a #

toEnum :: Int -> Tagged s a #

fromEnum :: Tagged s a -> Int #

enumFrom :: Tagged s a -> [Tagged s a] #

enumFromThen :: Tagged s a -> Tagged s a -> [Tagged s a] #

enumFromTo :: Tagged s a -> Tagged s a -> [Tagged s a] #

enumFromThenTo :: Tagged s a -> Tagged s a -> Tagged s a -> [Tagged s a] #

a ~~ b => Enum (a :~~: b)

@since base-4.10.0.0

Instance details

Defined in GHC.Internal.Data.Type.Equality

Methods

succ :: (a :~~: b) -> a :~~: b #

pred :: (a :~~: b) -> a :~~: b #

toEnum :: Int -> a :~~: b #

fromEnum :: (a :~~: b) -> Int #

enumFrom :: (a :~~: b) -> [a :~~: b] #

enumFromThen :: (a :~~: b) -> (a :~~: b) -> [a :~~: b] #

enumFromTo :: (a :~~: b) -> (a :~~: b) -> [a :~~: b] #

enumFromThenTo :: (a :~~: b) -> (a :~~: b) -> (a :~~: b) -> [a :~~: b] #

Enum (f (g a)) => Enum (Compose f g a)

Since: base-4.19.0.0

Instance details

Defined in Data.Functor.Compose

Methods

succ :: Compose f g a -> Compose f g a #

pred :: Compose f g a -> Compose f g a #

toEnum :: Int -> Compose f g a #

fromEnum :: Compose f g a -> Int #

enumFrom :: Compose f g a -> [Compose f g a] #

enumFromThen :: Compose f g a -> Compose f g a -> [Compose f g a] #

enumFromTo :: Compose f g a -> Compose f g a -> [Compose f g a] #

enumFromThenTo :: Compose f g a -> Compose f g a -> Compose f g a -> [Compose f g a] #

data Int16 #

16-bit signed integer type

Instances

Instances details
FromJSON Int16 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Int16 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Int16 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Int16 
Instance details

Defined in Data.Aeson.Types.ToJSON

PrintfArg Int16

Since: base-2.1

Instance details

Defined in Text.Printf

BitOps Int16 
Instance details

Defined in Basement.Bits

FiniteBitsOps Int16 
Instance details

Defined in Basement.Bits

Subtractive Int16 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Int16 
Instance details

Defined in Basement.Numerical.Subtractive

Methods

(-) :: Int16 -> Int16 -> Difference Int16 #

PrimMemoryComparable Int16 
Instance details

Defined in Basement.PrimType

PrimType Int16 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Int16 
Instance details

Defined in Basement.PrimType

type PrimSize Int16 = 2
Default Int16 
Instance details

Defined in Data.Default.Class

Methods

def :: Int16 #

NFData Int16 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int16 -> () #

Buildable Int16 
Instance details

Defined in Formatting.Buildable

Methods

build :: Int16 -> Builder #

Outputable Int16 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Int16 -> SDoc #

Bits Int16

@since base-2.01

Instance details

Defined in GHC.Internal.Int

FiniteBits Int16

@since base-4.6.0.0

Instance details

Defined in GHC.Internal.Int

Data Int16

@since base-4.0.0.0

Instance details

Defined in GHC.Internal.Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Int16 -> c Int16 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Int16 #

toConstr :: Int16 -> Constr #

dataTypeOf :: Int16 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Int16) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Int16) #

gmapT :: (forall b. Data b => b -> b) -> Int16 -> Int16 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Int16 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Int16 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Int16 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Int16 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Int16 -> m Int16 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Int16 -> m Int16 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Int16 -> m Int16 #

Bounded Int16

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Enum Int16

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Ix Int16

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Num Int16

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Read Int16

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Integral Int16

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Real Int16

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Methods

toRational :: Int16 -> Rational #

Show Int16

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Methods

showsPrec :: Int -> Int16 -> ShowS #

show :: Int16 -> String #

showList :: [Int16] -> ShowS #

Eq Int16

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Methods

(==) :: Int16 -> Int16 -> Bool #

(/=) :: Int16 -> Int16 -> Bool #

Ord Int16

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Methods

compare :: Int16 -> Int16 -> Ordering #

(<) :: Int16 -> Int16 -> Bool #

(<=) :: Int16 -> Int16 -> Bool #

(>) :: Int16 -> Int16 -> Bool #

(>=) :: Int16 -> Int16 -> Bool #

max :: Int16 -> Int16 -> Int16 #

min :: Int16 -> Int16 -> Int16 #

Hashable Int16 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int16 -> Int #

hash :: Int16 -> Int #

FromFormKey Int16 
Instance details

Defined in Web.Internal.FormUrlEncoded

ToFormKey Int16 
Instance details

Defined in Web.Internal.FormUrlEncoded

Methods

toFormKey :: Int16 -> Text #

ToSql Int16

Corresponds to SMALLINT type of SQL Server.

Instance details

Defined in Database.ODBC.SQLServer

Methods

toSql :: Int16 -> Query #

Pretty Int16 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Int16 -> Doc ann #

prettyList :: [Int16] -> Doc ann #

Uniform Int16 
Instance details

Defined in System.Random.Internal

Methods

uniformM :: StatefulGen g m => g -> m Int16 #

UniformRange Int16 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Int16, Int16) -> g -> m Int16 #

Unbox Int16 
Instance details

Defined in Data.Vector.Unboxed.Base

IArray UArray Int16 
Instance details

Defined in Data.Array.Base

Methods

bounds :: Ix i => UArray i Int16 -> (i, i) #

numElements :: Ix i => UArray i Int16 -> Int #

unsafeArray :: Ix i => (i, i) -> [(Int, Int16)] -> UArray i Int16 #

unsafeAt :: Ix i => UArray i Int16 -> Int -> Int16 #

unsafeReplace :: Ix i => UArray i Int16 -> [(Int, Int16)] -> UArray i Int16 #

unsafeAccum :: Ix i => (Int16 -> e' -> Int16) -> UArray i Int16 -> [(Int, e')] -> UArray i Int16 #

unsafeAccumArray :: Ix i => (Int16 -> e' -> Int16) -> Int16 -> (i, i) -> [(Int, e')] -> UArray i Int16 #

Lift Int16 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Int16 -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Int16 -> Code m Int16 #

Vector Vector Int16 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Int16 
Instance details

Defined in Data.Vector.Unboxed.Base

MArray (STUArray s) Int16 (ST s) 
Instance details

Defined in Data.Array.Base

Methods

getBounds :: Ix i => STUArray s i Int16 -> ST s (i, i) #

getNumElements :: Ix i => STUArray s i Int16 -> ST s Int #

newArray :: Ix i => (i, i) -> Int16 -> ST s (STUArray s i Int16) #

newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Int16) #

unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Int16) #

unsafeRead :: Ix i => STUArray s i Int16 -> Int -> ST s Int16 #

unsafeWrite :: Ix i => STUArray s i Int16 -> Int -> Int16 -> ST s () #

type NatNumMaxBound Int16 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Int16 = 32767
type Difference Int16 
Instance details

Defined in Basement.Numerical.Subtractive

type PrimSize Int16 
Instance details

Defined in Basement.PrimType

type PrimSize Int16 = 2
newtype Vector Int16 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Int16 
Instance details

Defined in Data.Vector.Unboxed.Base

data Int32 #

32-bit signed integer type

Instances

Instances details
FromJSON Int32 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Int32 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Int32 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Int32 
Instance details

Defined in Data.Aeson.Types.ToJSON

PrintfArg Int32

Since: base-2.1

Instance details

Defined in Text.Printf

BitOps Int32 
Instance details

Defined in Basement.Bits

FiniteBitsOps Int32 
Instance details

Defined in Basement.Bits

Subtractive Int32 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Int32 
Instance details

Defined in Basement.Numerical.Subtractive

Methods

(-) :: Int32 -> Int32 -> Difference Int32 #

PrimMemoryComparable Int32 
Instance details

Defined in Basement.PrimType

PrimType Int32 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Int32 
Instance details

Defined in Basement.PrimType

type PrimSize Int32 = 4
Default Int32 
Instance details

Defined in Data.Default.Class

Methods

def :: Int32 #

NFData Int32 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int32 -> () #

Buildable Int32 
Instance details

Defined in Formatting.Buildable

Methods

build :: Int32 -> Builder #

Outputable Int32 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Int32 -> SDoc #

Bits Int32

@since base-2.01

Instance details

Defined in GHC.Internal.Int

FiniteBits Int32

@since base-4.6.0.0

Instance details

Defined in GHC.Internal.Int

Data Int32

@since base-4.0.0.0

Instance details

Defined in GHC.Internal.Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Int32 -> c Int32 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Int32 #

toConstr :: Int32 -> Constr #

dataTypeOf :: Int32 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Int32) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Int32) #

gmapT :: (forall b. Data b => b -> b) -> Int32 -> Int32 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Int32 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Int32 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Int32 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Int32 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Int32 -> m Int32 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Int32 -> m Int32 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Int32 -> m Int32 #

Bounded Int32

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Enum Int32

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Ix Int32

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Num Int32

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Read Int32

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Integral Int32

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Real Int32

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Methods

toRational :: Int32 -> Rational #

Show Int32

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Methods

showsPrec :: Int -> Int32 -> ShowS #

show :: Int32 -> String #

showList :: [Int32] -> ShowS #

Eq Int32

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Methods

(==) :: Int32 -> Int32 -> Bool #

(/=) :: Int32 -> Int32 -> Bool #

Ord Int32

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Methods

compare :: Int32 -> Int32 -> Ordering #

(<) :: Int32 -> Int32 -> Bool #

(<=) :: Int32 -> Int32 -> Bool #

(>) :: Int32 -> Int32 -> Bool #

(>=) :: Int32 -> Int32 -> Bool #

max :: Int32 -> Int32 -> Int32 #

min :: Int32 -> Int32 -> Int32 #

Hashable Int32 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int32 -> Int #

hash :: Int32 -> Int #

FromFormKey Int32 
Instance details

Defined in Web.Internal.FormUrlEncoded

ToFormKey Int32 
Instance details

Defined in Web.Internal.FormUrlEncoded

Methods

toFormKey :: Int32 -> Text #

ToSql Int32

Corresponds to INT type of SQL Server.

Instance details

Defined in Database.ODBC.SQLServer

Methods

toSql :: Int32 -> Query #

Pretty Int32 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Int32 -> Doc ann #

prettyList :: [Int32] -> Doc ann #

Uniform Int32 
Instance details

Defined in System.Random.Internal

Methods

uniformM :: StatefulGen g m => g -> m Int32 #

UniformRange Int32 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Int32, Int32) -> g -> m Int32 #

Unbox Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

IArray UArray Int32 
Instance details

Defined in Data.Array.Base

Methods

bounds :: Ix i => UArray i Int32 -> (i, i) #

numElements :: Ix i => UArray i Int32 -> Int #

unsafeArray :: Ix i => (i, i) -> [(Int, Int32)] -> UArray i Int32 #

unsafeAt :: Ix i => UArray i Int32 -> Int -> Int32 #

unsafeReplace :: Ix i => UArray i Int32 -> [(Int, Int32)] -> UArray i Int32 #

unsafeAccum :: Ix i => (Int32 -> e' -> Int32) -> UArray i Int32 -> [(Int, e')] -> UArray i Int32 #

unsafeAccumArray :: Ix i => (Int32 -> e' -> Int32) -> Int32 -> (i, i) -> [(Int, e')] -> UArray i Int32 #

Lift Int32 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Int32 -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Int32 -> Code m Int32 #

Vector Vector Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

MArray (STUArray s) Int32 (ST s) 
Instance details

Defined in Data.Array.Base

Methods

getBounds :: Ix i => STUArray s i Int32 -> ST s (i, i) #

getNumElements :: Ix i => STUArray s i Int32 -> ST s Int #

newArray :: Ix i => (i, i) -> Int32 -> ST s (STUArray s i Int32) #

newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Int32) #

unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Int32) #

unsafeRead :: Ix i => STUArray s i Int32 -> Int -> ST s Int32 #

unsafeWrite :: Ix i => STUArray s i Int32 -> Int -> Int32 -> ST s () #

type NatNumMaxBound Int32 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Int32 = 2147483647
type Difference Int32 
Instance details

Defined in Basement.Numerical.Subtractive

type PrimSize Int32 
Instance details

Defined in Basement.PrimType

type PrimSize Int32 = 4
newtype Vector Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

data Int64 #

64-bit signed integer type

Instances

Instances details
FromJSON Int64 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Int64 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Int64 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Int64 
Instance details

Defined in Data.Aeson.Types.ToJSON

PrintfArg Int64

Since: base-2.1

Instance details

Defined in Text.Printf

BitOps Int64 
Instance details

Defined in Basement.Bits

FiniteBitsOps Int64 
Instance details

Defined in Basement.Bits

Subtractive Int64 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Int64 
Instance details

Defined in Basement.Numerical.Subtractive

Methods

(-) :: Int64 -> Int64 -> Difference Int64 #

PrimMemoryComparable Int64 
Instance details

Defined in Basement.PrimType

PrimType Int64 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Int64 
Instance details

Defined in Basement.PrimType

type PrimSize Int64 = 8
Default Int64 
Instance details

Defined in Data.Default.Class

Methods

def :: Int64 #

NFData Int64 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int64 -> () #

Buildable Int64 
Instance details

Defined in Formatting.Buildable

Methods

build :: Int64 -> Builder #

Outputable Int64 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Int64 -> SDoc #

Bits Int64

@since base-2.01

Instance details

Defined in GHC.Internal.Int

FiniteBits Int64

@since base-4.6.0.0

Instance details

Defined in GHC.Internal.Int

Data Int64

@since base-4.0.0.0

Instance details

Defined in GHC.Internal.Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Int64 -> c Int64 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Int64 #

toConstr :: Int64 -> Constr #

dataTypeOf :: Int64 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Int64) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Int64) #

gmapT :: (forall b. Data b => b -> b) -> Int64 -> Int64 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Int64 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Int64 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Int64 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Int64 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Int64 -> m Int64 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Int64 -> m Int64 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Int64 -> m Int64 #

Bounded Int64

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Enum Int64

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Ix Int64

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Num Int64

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Read Int64

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Integral Int64

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Real Int64

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Methods

toRational :: Int64 -> Rational #

Show Int64

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Methods

showsPrec :: Int -> Int64 -> ShowS #

show :: Int64 -> String #

showList :: [Int64] -> ShowS #

Eq Int64

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Methods

(==) :: Int64 -> Int64 -> Bool #

(/=) :: Int64 -> Int64 -> Bool #

Ord Int64

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Methods

compare :: Int64 -> Int64 -> Ordering #

(<) :: Int64 -> Int64 -> Bool #

(<=) :: Int64 -> Int64 -> Bool #

(>) :: Int64 -> Int64 -> Bool #

(>=) :: Int64 -> Int64 -> Bool #

max :: Int64 -> Int64 -> Int64 #

min :: Int64 -> Int64 -> Int64 #

Hashable Int64 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int64 -> Int #

hash :: Int64 -> Int #

FromFormKey Int64 
Instance details

Defined in Web.Internal.FormUrlEncoded

ToFormKey Int64 
Instance details

Defined in Web.Internal.FormUrlEncoded

Methods

toFormKey :: Int64 -> Text #

Val Int64

Auto-convert from VText

Instance details

Defined in Napkin.Types.Core

Methods

val :: Prism' Value Int64 #

Pretty Int64 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Int64 -> Doc ann #

prettyList :: [Int64] -> Doc ann #

Uniform Int64 
Instance details

Defined in System.Random.Internal

Methods

uniformM :: StatefulGen g m => g -> m Int64 #

UniformRange Int64 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Int64, Int64) -> g -> m Int64 #

Unbox Int64 
Instance details

Defined in Data.Vector.Unboxed.Base

IArray UArray Int64 
Instance details

Defined in Data.Array.Base

Methods

bounds :: Ix i => UArray i Int64 -> (i, i) #

numElements :: Ix i => UArray i Int64 -> Int #

unsafeArray :: Ix i => (i, i) -> [(Int, Int64)] -> UArray i Int64 #

unsafeAt :: Ix i => UArray i Int64 -> Int -> Int64 #

unsafeReplace :: Ix i => UArray i Int64 -> [(Int, Int64)] -> UArray i Int64 #

unsafeAccum :: Ix i => (Int64 -> e' -> Int64) -> UArray i Int64 -> [(Int, e')] -> UArray i Int64 #

unsafeAccumArray :: Ix i => (Int64 -> e' -> Int64) -> Int64 -> (i, i) -> [(Int, e')] -> UArray i Int64 #

Lift Int64 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Int64 -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Int64 -> Code m Int64 #

Vector Vector Int64 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Int64 
Instance details

Defined in Data.Vector.Unboxed.Base

MArray (STUArray s) Int64 (ST s) 
Instance details

Defined in Data.Array.Base

Methods

getBounds :: Ix i => STUArray s i Int64 -> ST s (i, i) #

getNumElements :: Ix i => STUArray s i Int64 -> ST s Int #

newArray :: Ix i => (i, i) -> Int64 -> ST s (STUArray s i Int64) #

newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Int64) #

unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Int64) #

unsafeRead :: Ix i => STUArray s i Int64 -> Int -> ST s Int64 #

unsafeWrite :: Ix i => STUArray s i Int64 -> Int -> Int64 -> ST s () #

type NatNumMaxBound Int64 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Int64 = 9223372036854775807
type Difference Int64 
Instance details

Defined in Basement.Numerical.Subtractive

type PrimSize Int64 
Instance details

Defined in Basement.PrimType

type PrimSize Int64 = 8
newtype Vector Int64 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Int64 
Instance details

Defined in Data.Vector.Unboxed.Base

data Int8 #

8-bit signed integer type

Instances

Instances details
FromJSON Int8 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Int8 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Int8 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Int8 
Instance details

Defined in Data.Aeson.Types.ToJSON

PrintfArg Int8

Since: base-2.1

Instance details

Defined in Text.Printf

BitOps Int8 
Instance details

Defined in Basement.Bits

FiniteBitsOps Int8 
Instance details

Defined in Basement.Bits

Subtractive Int8 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Int8 
Instance details

Defined in Basement.Numerical.Subtractive

Methods

(-) :: Int8 -> Int8 -> Difference Int8 #

PrimMemoryComparable Int8 
Instance details

Defined in Basement.PrimType

PrimType Int8 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Int8 
Instance details

Defined in Basement.PrimType

type PrimSize Int8 = 1
Default Int8 
Instance details

Defined in Data.Default.Class

Methods

def :: Int8 #

NFData Int8 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int8 -> () #

Buildable Int8 
Instance details

Defined in Formatting.Buildable

Methods

build :: Int8 -> Builder #

Outputable Int8 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Int8 -> SDoc #

Bits Int8

@since base-2.01

Instance details

Defined in GHC.Internal.Int

FiniteBits Int8

@since base-4.6.0.0

Instance details

Defined in GHC.Internal.Int

Data Int8

@since base-4.0.0.0

Instance details

Defined in GHC.Internal.Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Int8 -> c Int8 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Int8 #

toConstr :: Int8 -> Constr #

dataTypeOf :: Int8 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Int8) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Int8) #

gmapT :: (forall b. Data b => b -> b) -> Int8 -> Int8 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Int8 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Int8 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Int8 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Int8 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Int8 -> m Int8 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Int8 -> m Int8 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Int8 -> m Int8 #

Bounded Int8

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Enum Int8

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Methods

succ :: Int8 -> Int8 #

pred :: Int8 -> Int8 #

toEnum :: Int -> Int8 #

fromEnum :: Int8 -> Int #

enumFrom :: Int8 -> [Int8] #

enumFromThen :: Int8 -> Int8 -> [Int8] #

enumFromTo :: Int8 -> Int8 -> [Int8] #

enumFromThenTo :: Int8 -> Int8 -> Int8 -> [Int8] #

Ix Int8

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Methods

range :: (Int8, Int8) -> [Int8] #

index :: (Int8, Int8) -> Int8 -> Int #

unsafeIndex :: (Int8, Int8) -> Int8 -> Int #

inRange :: (Int8, Int8) -> Int8 -> Bool #

rangeSize :: (Int8, Int8) -> Int #

unsafeRangeSize :: (Int8, Int8) -> Int #

Num Int8

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Methods

(+) :: Int8 -> Int8 -> Int8 #

(-) :: Int8 -> Int8 -> Int8 #

(*) :: Int8 -> Int8 -> Int8 #

negate :: Int8 -> Int8 #

abs :: Int8 -> Int8 #

signum :: Int8 -> Int8 #

fromInteger :: Integer -> Int8 #

Read Int8

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Integral Int8

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Methods

quot :: Int8 -> Int8 -> Int8 #

rem :: Int8 -> Int8 -> Int8 #

div :: Int8 -> Int8 -> Int8 #

mod :: Int8 -> Int8 -> Int8 #

quotRem :: Int8 -> Int8 -> (Int8, Int8) #

divMod :: Int8 -> Int8 -> (Int8, Int8) #

toInteger :: Int8 -> Integer #

Real Int8

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Methods

toRational :: Int8 -> Rational #

Show Int8

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Methods

showsPrec :: Int -> Int8 -> ShowS #

show :: Int8 -> String #

showList :: [Int8] -> ShowS #

Eq Int8

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Methods

(==) :: Int8 -> Int8 -> Bool #

(/=) :: Int8 -> Int8 -> Bool #

Ord Int8

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Methods

compare :: Int8 -> Int8 -> Ordering #

(<) :: Int8 -> Int8 -> Bool #

(<=) :: Int8 -> Int8 -> Bool #

(>) :: Int8 -> Int8 -> Bool #

(>=) :: Int8 -> Int8 -> Bool #

max :: Int8 -> Int8 -> Int8 #

min :: Int8 -> Int8 -> Int8 #

Hashable Int8 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int8 -> Int #

hash :: Int8 -> Int #

FromFormKey Int8 
Instance details

Defined in Web.Internal.FormUrlEncoded

ToFormKey Int8 
Instance details

Defined in Web.Internal.FormUrlEncoded

Methods

toFormKey :: Int8 -> Text #

Pretty Int8 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Int8 -> Doc ann #

prettyList :: [Int8] -> Doc ann #

Uniform Int8 
Instance details

Defined in System.Random.Internal

Methods

uniformM :: StatefulGen g m => g -> m Int8 #

UniformRange Int8 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Int8, Int8) -> g -> m Int8 #

Unbox Int8 
Instance details

Defined in Data.Vector.Unboxed.Base

IArray UArray Int8 
Instance details

Defined in Data.Array.Base

Methods

bounds :: Ix i => UArray i Int8 -> (i, i) #

numElements :: Ix i => UArray i Int8 -> Int #

unsafeArray :: Ix i => (i, i) -> [(Int, Int8)] -> UArray i Int8 #

unsafeAt :: Ix i => UArray i Int8 -> Int -> Int8 #

unsafeReplace :: Ix i => UArray i Int8 -> [(Int, Int8)] -> UArray i Int8 #

unsafeAccum :: Ix i => (Int8 -> e' -> Int8) -> UArray i Int8 -> [(Int, e')] -> UArray i Int8 #

unsafeAccumArray :: Ix i => (Int8 -> e' -> Int8) -> Int8 -> (i, i) -> [(Int, e')] -> UArray i Int8 #

Lift Int8 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Int8 -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Int8 -> Code m Int8 #

Vector Vector Int8 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Int8 
Instance details

Defined in Data.Vector.Unboxed.Base

MArray (STUArray s) Int8 (ST s) 
Instance details

Defined in Data.Array.Base

Methods

getBounds :: Ix i => STUArray s i Int8 -> ST s (i, i) #

getNumElements :: Ix i => STUArray s i Int8 -> ST s Int #

newArray :: Ix i => (i, i) -> Int8 -> ST s (STUArray s i Int8) #

newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Int8) #

unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Int8) #

unsafeRead :: Ix i => STUArray s i Int8 -> Int -> ST s Int8 #

unsafeWrite :: Ix i => STUArray s i Int8 -> Int -> Int8 -> ST s () #

type NatNumMaxBound Int8 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Int8 = 127
type Difference Int8 
Instance details

Defined in Basement.Numerical.Subtractive

type PrimSize Int8 
Instance details

Defined in Basement.PrimType

type PrimSize Int8 = 1
newtype Vector Int8 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Int8 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Int8 = MV_Int8 (MVector s Int8)

class Num a where #

Basic numeric class.

The Haskell Report defines no laws for Num. However, (+) and (*) are customarily expected to define a ring and have the following properties:

Associativity of (+)
(x + y) + z = x + (y + z)
Commutativity of (+)
x + y = y + x
fromInteger 0 is the additive identity
x + fromInteger 0 = x
negate gives the additive inverse
x + negate x = fromInteger 0
Associativity of (*)
(x * y) * z = x * (y * z)
fromInteger 1 is the multiplicative identity
x * fromInteger 1 = x and fromInteger 1 * x = x
Distributivity of (*) with respect to (+)
a * (b + c) = (a * b) + (a * c) and (b + c) * a = (b * a) + (c * a)
Coherence with toInteger
if the type also implements Integral, then fromInteger is a left inverse for toInteger, i.e. fromInteger (toInteger i) == i

Note that it isn't customarily expected that a type instance of both Num and Ord implement an ordered ring. Indeed, in base only Integer and Rational do.

Minimal complete definition

(+), (*), abs, signum, fromInteger, (negate | (-))

Methods

(+) :: a -> a -> a infixl 6 #

(-) :: a -> a -> a infixl 6 #

(*) :: a -> a -> a infixl 7 #

negate :: a -> a #

Unary negation.

abs :: a -> a #

Absolute value.

signum :: a -> a #

Sign of a number. The functions abs and signum should satisfy the law:

abs x * signum x == x

For real numbers, the signum is either -1 (negative), 0 (zero) or 1 (positive).

fromInteger :: Integer -> a #

Conversion from an Integer. An integer literal represents the application of the function fromInteger to the appropriate value of type Integer, so such literals have type (Num a) => a.

Instances

Instances details
Num Pos 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

(+) :: Pos -> Pos -> Pos #

(-) :: Pos -> Pos -> Pos #

(*) :: Pos -> Pos -> Pos #

negate :: Pos -> Pos #

abs :: Pos -> Pos #

signum :: Pos -> Pos #

fromInteger :: Integer -> Pos #

Num ArgCount 
Instance details

Defined in Database.SQLite3.Bindings.Types

Num CArgCount 
Instance details

Defined in Database.SQLite3.Bindings.Types

Num CColumnIndex 
Instance details

Defined in Database.SQLite3.Bindings.Types

Num CNumBytes 
Instance details

Defined in Database.SQLite3.Bindings.Types

Num CParamIndex 
Instance details

Defined in Database.SQLite3.Bindings.Types

Num ColumnIndex 
Instance details

Defined in Database.SQLite3.Bindings.Types

Num ParamIndex 
Instance details

Defined in Database.SQLite3.Bindings.Types

Num IntWithInf 
Instance details

Defined in GHC.Types.Basic

Num SaneDouble 
Instance details

Defined in GHC.Types.SaneDouble

Num CBool 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CClock 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CDouble 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CFloat 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CInt 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

(+) :: CInt -> CInt -> CInt #

(-) :: CInt -> CInt -> CInt #

(*) :: CInt -> CInt -> CInt #

negate :: CInt -> CInt #

abs :: CInt -> CInt #

signum :: CInt -> CInt #

fromInteger :: Integer -> CInt #

Num CIntMax 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CIntPtr 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CLLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CPtrdiff 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CSChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CSUSeconds 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CShort 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CSigAtomic 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CSize 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CTime 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CUChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CUInt 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CUIntMax 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CUIntPtr 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CULLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CULong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CUSeconds 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CUShort 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num CWchar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Num Int16

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Num Int32

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Num Int64

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Num Int8

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Methods

(+) :: Int8 -> Int8 -> Int8 #

(-) :: Int8 -> Int8 -> Int8 #

(*) :: Int8 -> Int8 -> Int8 #

negate :: Int8 -> Int8 #

abs :: Int8 -> Int8 #

signum :: Int8 -> Int8 #

fromInteger :: Integer -> Int8 #

Num CBlkCnt 
Instance details

Defined in GHC.Internal.System.Posix.Types

Num CBlkSize 
Instance details

Defined in GHC.Internal.System.Posix.Types

Num CCc 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

(+) :: CCc -> CCc -> CCc #

(-) :: CCc -> CCc -> CCc #

(*) :: CCc -> CCc -> CCc #

negate :: CCc -> CCc #

abs :: CCc -> CCc #

signum :: CCc -> CCc #

fromInteger :: Integer -> CCc #

Num CClockId 
Instance details

Defined in GHC.Internal.System.Posix.Types

Num CDev 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

(+) :: CDev -> CDev -> CDev #

(-) :: CDev -> CDev -> CDev #

(*) :: CDev -> CDev -> CDev #

negate :: CDev -> CDev #

abs :: CDev -> CDev #

signum :: CDev -> CDev #

fromInteger :: Integer -> CDev #

Num CFsBlkCnt 
Instance details

Defined in GHC.Internal.System.Posix.Types

Num CFsFilCnt 
Instance details

Defined in GHC.Internal.System.Posix.Types

Num CGid 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

(+) :: CGid -> CGid -> CGid #

(-) :: CGid -> CGid -> CGid #

(*) :: CGid -> CGid -> CGid #

negate :: CGid -> CGid #

abs :: CGid -> CGid #

signum :: CGid -> CGid #

fromInteger :: Integer -> CGid #

Num CId 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

(+) :: CId -> CId -> CId #

(-) :: CId -> CId -> CId #

(*) :: CId -> CId -> CId #

negate :: CId -> CId #

abs :: CId -> CId #

signum :: CId -> CId #

fromInteger :: Integer -> CId #

Num CIno 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

(+) :: CIno -> CIno -> CIno #

(-) :: CIno -> CIno -> CIno #

(*) :: CIno -> CIno -> CIno #

negate :: CIno -> CIno #

abs :: CIno -> CIno #

signum :: CIno -> CIno #

fromInteger :: Integer -> CIno #

Num CKey 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

(+) :: CKey -> CKey -> CKey #

(-) :: CKey -> CKey -> CKey #

(*) :: CKey -> CKey -> CKey #

negate :: CKey -> CKey #

abs :: CKey -> CKey #

signum :: CKey -> CKey #

fromInteger :: Integer -> CKey #

Num CMode 
Instance details

Defined in GHC.Internal.System.Posix.Types

Num CNfds 
Instance details

Defined in GHC.Internal.System.Posix.Types

Num CNlink 
Instance details

Defined in GHC.Internal.System.Posix.Types

Num COff 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

(+) :: COff -> COff -> COff #

(-) :: COff -> COff -> COff #

(*) :: COff -> COff -> COff #

negate :: COff -> COff #

abs :: COff -> COff #

signum :: COff -> COff #

fromInteger :: Integer -> COff #

Num CPid 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

(+) :: CPid -> CPid -> CPid #

(-) :: CPid -> CPid -> CPid #

(*) :: CPid -> CPid -> CPid #

negate :: CPid -> CPid #

abs :: CPid -> CPid #

signum :: CPid -> CPid #

fromInteger :: Integer -> CPid #

Num CRLim 
Instance details

Defined in GHC.Internal.System.Posix.Types

Num CSocklen 
Instance details

Defined in GHC.Internal.System.Posix.Types

Num CSpeed 
Instance details

Defined in GHC.Internal.System.Posix.Types

Num CSsize 
Instance details

Defined in GHC.Internal.System.Posix.Types

Num CTcflag 
Instance details

Defined in GHC.Internal.System.Posix.Types

Num CUid 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

(+) :: CUid -> CUid -> CUid #

(-) :: CUid -> CUid -> CUid #

(*) :: CUid -> CUid -> CUid #

negate :: CUid -> CUid #

abs :: CUid -> CUid #

signum :: CUid -> CUid #

fromInteger :: Integer -> CUid #

Num Fd 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

(+) :: Fd -> Fd -> Fd #

(-) :: Fd -> Fd -> Fd #

(*) :: Fd -> Fd -> Fd #

negate :: Fd -> Fd #

abs :: Fd -> Fd #

signum :: Fd -> Fd #

fromInteger :: Integer -> Fd #

Num Word16

@since base-2.01

Instance details

Defined in GHC.Internal.Word

Num Word32

@since base-2.01

Instance details

Defined in GHC.Internal.Word

Num Word64

@since base-2.01

Instance details

Defined in GHC.Internal.Word

Num Word8

@since base-2.01

Instance details

Defined in GHC.Internal.Word

Num Seconds 
Instance details

Defined in Gogol.Types

Num Hash 
Instance details

Defined in Trace.Hpc.Util

Methods

(+) :: Hash -> Hash -> Hash #

(-) :: Hash -> Hash -> Hash #

(*) :: Hash -> Hash -> Hash #

negate :: Hash -> Hash #

abs :: Hash -> Hash #

signum :: Hash -> Hash #

fromInteger :: Integer -> Hash #

Num IntDate 
Instance details

Defined in Jose.Types

Num Dollars 
Instance details

Defined in Napkin.Run.BigQuery

Num SQLCTYPE 
Instance details

Defined in Database.ODBC.Internal

Methods

(+) :: SQLCTYPE -> SQLCTYPE -> SQLCTYPE #

(-) :: SQLCTYPE -> SQLCTYPE -> SQLCTYPE #

(*) :: SQLCTYPE -> SQLCTYPE -> SQLCTYPE #

negate :: SQLCTYPE -> SQLCTYPE #

abs :: SQLCTYPE -> SQLCTYPE #

signum :: SQLCTYPE -> SQLCTYPE #

fromInteger :: Integer -> SQLCTYPE #

Num SQLINTEGER 
Instance details

Defined in Database.ODBC.Internal

Methods

(+) :: SQLINTEGER -> SQLINTEGER -> SQLINTEGER #

(-) :: SQLINTEGER -> SQLINTEGER -> SQLINTEGER #

(*) :: SQLINTEGER -> SQLINTEGER -> SQLINTEGER #

negate :: SQLINTEGER -> SQLINTEGER #

abs :: SQLINTEGER -> SQLINTEGER #

signum :: SQLINTEGER -> SQLINTEGER #

fromInteger :: Integer -> SQLINTEGER #

Num SQLLEN 
Instance details

Defined in Database.ODBC.Internal

Methods

(+) :: SQLLEN -> SQLLEN -> SQLLEN #

(-) :: SQLLEN -> SQLLEN -> SQLLEN #

(*) :: SQLLEN -> SQLLEN -> SQLLEN #

negate :: SQLLEN -> SQLLEN #

abs :: SQLLEN -> SQLLEN #

signum :: SQLLEN -> SQLLEN #

fromInteger :: Integer -> SQLLEN #

Num SQLSMALLINT 
Instance details

Defined in Database.ODBC.Internal

Methods

(+) :: SQLSMALLINT -> SQLSMALLINT -> SQLSMALLINT #

(-) :: SQLSMALLINT -> SQLSMALLINT -> SQLSMALLINT #

(*) :: SQLSMALLINT -> SQLSMALLINT -> SQLSMALLINT #

negate :: SQLSMALLINT -> SQLSMALLINT #

abs :: SQLSMALLINT -> SQLSMALLINT #

signum :: SQLSMALLINT -> SQLSMALLINT #

fromInteger :: Integer -> SQLSMALLINT #

Num SQLUINTEGER 
Instance details

Defined in Database.ODBC.Internal

Methods

(+) :: SQLUINTEGER -> SQLUINTEGER -> SQLUINTEGER #

(-) :: SQLUINTEGER -> SQLUINTEGER -> SQLUINTEGER #

(*) :: SQLUINTEGER -> SQLUINTEGER -> SQLUINTEGER #

negate :: SQLUINTEGER -> SQLUINTEGER #

abs :: SQLUINTEGER -> SQLUINTEGER #

signum :: SQLUINTEGER -> SQLUINTEGER #

fromInteger :: Integer -> SQLUINTEGER #

Num SQLULEN 
Instance details

Defined in Database.ODBC.Internal

Methods

(+) :: SQLULEN -> SQLULEN -> SQLULEN #

(-) :: SQLULEN -> SQLULEN -> SQLULEN #

(*) :: SQLULEN -> SQLULEN -> SQLULEN #

negate :: SQLULEN -> SQLULEN #

abs :: SQLULEN -> SQLULEN #

signum :: SQLULEN -> SQLULEN #

fromInteger :: Integer -> SQLULEN #

Num SQLUSMALLINT 
Instance details

Defined in Database.ODBC.Internal

Methods

(+) :: SQLUSMALLINT -> SQLUSMALLINT -> SQLUSMALLINT #

(-) :: SQLUSMALLINT -> SQLUSMALLINT -> SQLUSMALLINT #

(*) :: SQLUSMALLINT -> SQLUSMALLINT -> SQLUSMALLINT #

negate :: SQLUSMALLINT -> SQLUSMALLINT #

abs :: SQLUSMALLINT -> SQLUSMALLINT #

signum :: SQLUSMALLINT -> SQLUSMALLINT #

fromInteger :: Integer -> SQLUSMALLINT #

Num CompOption 
Instance details

Defined in Text.Regex.Posix.Wrap

Num ExecOption 
Instance details

Defined in Text.Regex.Posix.Wrap

Num Scientific

WARNING: + and - compute the Integer magnitude: 10^e where e is the difference between the base10Exponents of the arguments. If these methods are applied to arguments which have huge exponents this could fill up all space and crash your program! So don't apply these methods to scientific numbers coming from untrusted sources. The other methods can be used safely.

Instance details

Defined in Data.Scientific

Num I8 
Instance details

Defined in Data.Text.Foreign

Methods

(+) :: I8 -> I8 -> I8 #

(-) :: I8 -> I8 -> I8 #

(*) :: I8 -> I8 -> I8 #

negate :: I8 -> I8 #

abs :: I8 -> I8 #

signum :: I8 -> I8 #

fromInteger :: Integer -> I8 #

Num Size 
Instance details

Defined in Data.Text.Internal.Fusion.Size

Methods

(+) :: Size -> Size -> Size #

(-) :: Size -> Size -> Size #

(*) :: Size -> Size -> Size #

negate :: Size -> Size #

abs :: Size -> Size #

signum :: Size -> Size #

fromInteger :: Integer -> Size #

Num B 
Instance details

Defined in Data.Text.Short.Internal

Methods

(+) :: B -> B -> B #

(-) :: B -> B -> B #

(*) :: B -> B -> B #

negate :: B -> B #

abs :: B -> B #

signum :: B -> B #

fromInteger :: Integer -> B #

Num DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Num NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Num Integer

@since base-2.01

Instance details

Defined in GHC.Internal.Num

Num Natural

Note that Natural's Num instance isn't a ring: no element but 0 has an additive inverse. It is a semiring though.

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Num

Num Int

@since base-2.01

Instance details

Defined in GHC.Internal.Num

Methods

(+) :: Int -> Int -> Int #

(-) :: Int -> Int -> Int #

(*) :: Int -> Int -> Int #

negate :: Int -> Int #

abs :: Int -> Int #

signum :: Int -> Int #

fromInteger :: Integer -> Int #

Num Word

@since base-2.01

Instance details

Defined in GHC.Internal.Num

Methods

(+) :: Word -> Word -> Word #

(-) :: Word -> Word -> Word #

(*) :: Word -> Word -> Word #

negate :: Word -> Word #

abs :: Word -> Word #

signum :: Word -> Word #

fromInteger :: Integer -> Word #

RealFloat a => Num (Complex a)

Since: base-2.1

Instance details

Defined in Data.Complex

Methods

(+) :: Complex a -> Complex a -> Complex a #

(-) :: Complex a -> Complex a -> Complex a #

(*) :: Complex a -> Complex a -> Complex a #

negate :: Complex a -> Complex a #

abs :: Complex a -> Complex a #

signum :: Complex a -> Complex a #

fromInteger :: Integer -> Complex a #

Num a => Num (Max a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(+) :: Max a -> Max a -> Max a #

(-) :: Max a -> Max a -> Max a #

(*) :: Max a -> Max a -> Max a #

negate :: Max a -> Max a #

abs :: Max a -> Max a #

signum :: Max a -> Max a #

fromInteger :: Integer -> Max a #

Num a => Num (Min a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(+) :: Min a -> Min a -> Min a #

(-) :: Min a -> Min a -> Min a #

(*) :: Min a -> Min a -> Min a #

negate :: Min a -> Min a #

abs :: Min a -> Min a #

signum :: Min a -> Min a #

fromInteger :: Integer -> Min a #

KnownNat n => Num (Zn n) 
Instance details

Defined in Basement.Bounded

Methods

(+) :: Zn n -> Zn n -> Zn n #

(-) :: Zn n -> Zn n -> Zn n #

(*) :: Zn n -> Zn n -> Zn n #

negate :: Zn n -> Zn n #

abs :: Zn n -> Zn n #

signum :: Zn n -> Zn n #

fromInteger :: Integer -> Zn n #

(KnownNat n, NatWithinBound Word64 n) => Num (Zn64 n) 
Instance details

Defined in Basement.Bounded

Methods

(+) :: Zn64 n -> Zn64 n -> Zn64 n #

(-) :: Zn64 n -> Zn64 n -> Zn64 n #

(*) :: Zn64 n -> Zn64 n -> Zn64 n #

negate :: Zn64 n -> Zn64 n #

abs :: Zn64 n -> Zn64 n #

signum :: Zn64 n -> Zn64 n #

fromInteger :: Integer -> Zn64 n #

Num (CountOf ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

(+) :: CountOf ty -> CountOf ty -> CountOf ty #

(-) :: CountOf ty -> CountOf ty -> CountOf ty #

(*) :: CountOf ty -> CountOf ty -> CountOf ty #

negate :: CountOf ty -> CountOf ty #

abs :: CountOf ty -> CountOf ty #

signum :: CountOf ty -> CountOf ty #

fromInteger :: Integer -> CountOf ty #

Num (Offset ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

(+) :: Offset ty -> Offset ty -> Offset ty #

(-) :: Offset ty -> Offset ty -> Offset ty #

(*) :: Offset ty -> Offset ty -> Offset ty #

negate :: Offset ty -> Offset ty #

abs :: Offset ty -> Offset ty #

signum :: Offset ty -> Offset ty #

fromInteger :: Integer -> Offset ty #

Num a => Num (Identity a)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Identity

Num a => Num (Down a)

@since base-4.11.0.0

Instance details

Defined in GHC.Internal.Data.Ord

Methods

(+) :: Down a -> Down a -> Down a #

(-) :: Down a -> Down a -> Down a #

(*) :: Down a -> Down a -> Down a #

negate :: Down a -> Down a #

abs :: Down a -> Down a #

signum :: Down a -> Down a #

fromInteger :: Integer -> Down a #

Num a => Num (Product a)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

(+) :: Product a -> Product a -> Product a #

(-) :: Product a -> Product a -> Product a #

(*) :: Product a -> Product a -> Product a #

negate :: Product a -> Product a #

abs :: Product a -> Product a #

signum :: Product a -> Product a #

fromInteger :: Integer -> Product a #

Num a => Num (Sum a)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

(+) :: Sum a -> Sum a -> Sum a #

(-) :: Sum a -> Sum a -> Sum a #

(*) :: Sum a -> Sum a -> Sum a #

negate :: Sum a -> Sum a #

abs :: Sum a -> Sum a #

signum :: Sum a -> Sum a #

fromInteger :: Integer -> Sum a #

Integral a => Num (Ratio a)

@since base-2.0.1

Instance details

Defined in GHC.Internal.Real

Methods

(+) :: Ratio a -> Ratio a -> Ratio a #

(-) :: Ratio a -> Ratio a -> Ratio a #

(*) :: Ratio a -> Ratio a -> Ratio a #

negate :: Ratio a -> Ratio a #

abs :: Ratio a -> Ratio a #

signum :: Ratio a -> Ratio a #

fromInteger :: Integer -> Ratio a #

HasResolution a => Num (Fixed a)

Multiplication is not associative or distributive:

>>> (0.2 * 0.6 :: Deci) * 0.9 == 0.2 * (0.6 * 0.9)
False
>>> (0.1 + 0.1 :: Deci) * 0.5 == 0.1 * 0.5 + 0.1 * 0.5
False

Since: base-2.1

Instance details

Defined in Data.Fixed

Methods

(+) :: Fixed a -> Fixed a -> Fixed a #

(-) :: Fixed a -> Fixed a -> Fixed a #

(*) :: Fixed a -> Fixed a -> Fixed a #

negate :: Fixed a -> Fixed a #

abs :: Fixed a -> Fixed a #

signum :: Fixed a -> Fixed a #

fromInteger :: Integer -> Fixed a #

Num a => Num (Op a b) 
Instance details

Defined in Data.Functor.Contravariant

Methods

(+) :: Op a b -> Op a b -> Op a b #

(-) :: Op a b -> Op a b -> Op a b #

(*) :: Op a b -> Op a b -> Op a b #

negate :: Op a b -> Op a b #

abs :: Op a b -> Op a b #

signum :: Op a b -> Op a b #

fromInteger :: Integer -> Op a b #

Num a => Num (Const a b)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Const

Methods

(+) :: Const a b -> Const a b -> Const a b #

(-) :: Const a b -> Const a b -> Const a b #

(*) :: Const a b -> Const a b -> Const a b #

negate :: Const a b -> Const a b #

abs :: Const a b -> Const a b #

signum :: Const a b -> Const a b #

fromInteger :: Integer -> Const a b #

(Applicative f, Num a) => Num (Ap f a)

Note that even if the underlying Num and Applicative instances are lawful, for most Applicatives, this instance will not be lawful. If you use this instance with the list Applicative, the following customary laws will not hold:

Commutativity:

>>> Ap [10,20] + Ap [1,2]
Ap {getAp = [11,12,21,22]}
>>> Ap [1,2] + Ap [10,20]
Ap {getAp = [11,21,12,22]}

Additive inverse:

>>> Ap [] + negate (Ap [])
Ap {getAp = []}
>>> fromInteger 0 :: Ap [] Int
Ap {getAp = [0]}

Distributivity:

>>> Ap [1,2] * (3 + 4)
Ap {getAp = [7,14]}
>>> (Ap [1,2] * 3) + (Ap [1,2] * 4)
Ap {getAp = [7,11,10,14]}

@since base-4.12.0.0

Instance details

Defined in GHC.Internal.Data.Monoid

Methods

(+) :: Ap f a -> Ap f a -> Ap f a #

(-) :: Ap f a -> Ap f a -> Ap f a #

(*) :: Ap f a -> Ap f a -> Ap f a #

negate :: Ap f a -> Ap f a #

abs :: Ap f a -> Ap f a #

signum :: Ap f a -> Ap f a #

fromInteger :: Integer -> Ap f a #

Num (f a) => Num (Alt f a)

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

(+) :: Alt f a -> Alt f a -> Alt f a #

(-) :: Alt f a -> Alt f a -> Alt f a #

(*) :: Alt f a -> Alt f a -> Alt f a #

negate :: Alt f a -> Alt f a #

abs :: Alt f a -> Alt f a #

signum :: Alt f a -> Alt f a #

fromInteger :: Integer -> Alt f a #

Num a => Num (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

(+) :: Tagged s a -> Tagged s a -> Tagged s a #

(-) :: Tagged s a -> Tagged s a -> Tagged s a #

(*) :: Tagged s a -> Tagged s a -> Tagged s a #

negate :: Tagged s a -> Tagged s a #

abs :: Tagged s a -> Tagged s a #

signum :: Tagged s a -> Tagged s a #

fromInteger :: Integer -> Tagged s a #

Num (f (g a)) => Num (Compose f g a)

Since: base-4.19.0.0

Instance details

Defined in Data.Functor.Compose

Methods

(+) :: Compose f g a -> Compose f g a -> Compose f g a #

(-) :: Compose f g a -> Compose f g a -> Compose f g a #

(*) :: Compose f g a -> Compose f g a -> Compose f g a #

negate :: Compose f g a -> Compose f g a #

abs :: Compose f g a -> Compose f g a #

signum :: Compose f g a -> Compose f g a #

fromInteger :: Integer -> Compose f g a #

class Read a where #

Parsing of Strings, producing values.

Derived instances of Read make the following assumptions, which derived instances of Show obey:

  • If the constructor is defined to be an infix operator, then the derived Read instance will parse only infix applications of the constructor (not the prefix form).
  • Associativity is not used to reduce the occurrence of parentheses, although precedence may be.
  • If the constructor is defined using record syntax, the derived Read will parse only the record-syntax form, and furthermore, the fields must be given in the same order as the original declaration.
  • The derived Read instance allows arbitrary Haskell whitespace between tokens of the input string. Extra parentheses are also allowed.

For example, given the declarations

infixr 5 :^:
data Tree a =  Leaf a  |  Tree a :^: Tree a

the derived instance of Read in Haskell 2010 is equivalent to

instance (Read a) => Read (Tree a) where

        readsPrec d r =  readParen (d > app_prec)
                         (\r -> [(Leaf m,t) |
                                 ("Leaf",s) <- lex r,
                                 (m,t) <- readsPrec (app_prec+1) s]) r

                      ++ readParen (d > up_prec)
                         (\r -> [(u:^:v,w) |
                                 (u,s) <- readsPrec (up_prec+1) r,
                                 (":^:",t) <- lex s,
                                 (v,w) <- readsPrec (up_prec+1) t]) r

          where app_prec = 10
                up_prec = 5

Note that right-associativity of :^: is unused.

The derived instance in GHC is equivalent to

instance (Read a) => Read (Tree a) where

        readPrec = parens $ (prec app_prec $ do
                                 Ident "Leaf" <- lexP
                                 m <- step readPrec
                                 return (Leaf m))

                     +++ (prec up_prec $ do
                                 u <- step readPrec
                                 Symbol ":^:" <- lexP
                                 v <- step readPrec
                                 return (u :^: v))

          where app_prec = 10
                up_prec = 5

        readListPrec = readListPrecDefault

Why do both readsPrec and readPrec exist, and why does GHC opt to implement readPrec in derived Read instances instead of readsPrec? The reason is that readsPrec is based on the ReadS type, and although ReadS is mentioned in the Haskell 2010 Report, it is not a very efficient parser data structure.

readPrec, on the other hand, is based on a much more efficient ReadPrec datatype (a.k.a "new-style parsers"), but its definition relies on the use of the RankNTypes language extension. Therefore, readPrec (and its cousin, readListPrec) are marked as GHC-only. Nevertheless, it is recommended to use readPrec instead of readsPrec whenever possible for the efficiency improvements it brings.

As mentioned above, derived Read instances in GHC will implement readPrec instead of readsPrec. The default implementations of readsPrec (and its cousin, readList) will simply use readPrec under the hood. If you are writing a Read instance by hand, it is recommended to write it like so:

instance Read T where
  readPrec     = ...
  readListPrec = readListPrecDefault

Minimal complete definition

readsPrec | readPrec

Methods

readsPrec #

Arguments

:: Int

the operator precedence of the enclosing context (a number from 0 to 11). Function application has precedence 10.

-> ReadS a 

attempts to parse a value from the front of the string, returning a list of (parsed value, remaining string) pairs. If there is no successful parse, the returned list is empty.

Derived instances of Read and Show satisfy the following:

That is, readsPrec parses the string produced by showsPrec, and delivers the value that showsPrec started with.

readList :: ReadS [a] #

The method readList is provided to allow the programmer to give a specialised way of parsing lists of values. For example, this is used by the predefined Read instance of the Char type, where values of type String are expected to use double quotes, rather than square brackets.

Instances

Instances details
Read Key 
Instance details

Defined in Data.Aeson.Key

Read DotNetTime 
Instance details

Defined in Data.Aeson.Types.Internal

Read Value 
Instance details

Defined in Data.Aeson.Types.Internal

Read ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

Read ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Read ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Read IntSet 
Instance details

Defined in Data.IntSet.Internal

Read Word64Set 
Instance details

Defined in GHC.Data.Word64Set.Internal

Read Void

Reading a Void value is always a parse error, considering Void as a data type with no constructors.

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Read

Read ByteOrder

@since base-4.11.0.0

Instance details

Defined in GHC.Internal.ByteOrder

Read All

@since base-2.01

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Read Any

@since base-2.01

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Read Version

@since base-2.01

Instance details

Defined in GHC.Internal.Data.Version

Read CBool 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CClock 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CDouble 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CFloat 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CInt 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CIntMax 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CIntPtr 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CLLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CPtrdiff 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CSChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CSUSeconds 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CShort 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CSigAtomic 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CSize 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CTime 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CUChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CUInt 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CUIntMax 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CUIntPtr 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CULLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CULong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CUSeconds 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CUShort 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read CWchar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Read Associativity

@since base-4.6.0.0

Instance details

Defined in GHC.Internal.Generics

Read DecidedStrictness

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Read Fixity

@since base-4.6.0.0

Instance details

Defined in GHC.Internal.Generics

Read SourceStrictness

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Read SourceUnpackedness

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Read ExitCode 
Instance details

Defined in GHC.Internal.IO.Exception

Read BufferMode

@since base-4.2.0.0

Instance details

Defined in GHC.Internal.IO.Handle.Types

Read Newline

@since base-4.3.0.0

Instance details

Defined in GHC.Internal.IO.Handle.Types

Read NewlineMode

@since base-4.3.0.0

Instance details

Defined in GHC.Internal.IO.Handle.Types

Read IOMode

@since base-4.2.0.0

Instance details

Defined in GHC.Internal.IO.IOMode

Read Int16

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Read Int32

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Read Int64

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Read Int8

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Read CBlkCnt 
Instance details

Defined in GHC.Internal.System.Posix.Types

Read CBlkSize 
Instance details

Defined in GHC.Internal.System.Posix.Types

Read CCc 
Instance details

Defined in GHC.Internal.System.Posix.Types

Read CClockId 
Instance details

Defined in GHC.Internal.System.Posix.Types

Read CDev 
Instance details

Defined in GHC.Internal.System.Posix.Types

Read CFsBlkCnt 
Instance details

Defined in GHC.Internal.System.Posix.Types

Read CFsFilCnt 
Instance details

Defined in GHC.Internal.System.Posix.Types

Read CGid 
Instance details

Defined in GHC.Internal.System.Posix.Types

Read CId 
Instance details

Defined in GHC.Internal.System.Posix.Types

Read CIno 
Instance details

Defined in GHC.Internal.System.Posix.Types

Read CKey 
Instance details

Defined in GHC.Internal.System.Posix.Types

Read CMode 
Instance details

Defined in GHC.Internal.System.Posix.Types

Read CNfds 
Instance details

Defined in GHC.Internal.System.Posix.Types

Read CNlink 
Instance details

Defined in GHC.Internal.System.Posix.Types

Read COff 
Instance details

Defined in GHC.Internal.System.Posix.Types

Read CPid 
Instance details

Defined in GHC.Internal.System.Posix.Types

Read CRLim 
Instance details

Defined in GHC.Internal.System.Posix.Types

Read CSocklen 
Instance details

Defined in GHC.Internal.System.Posix.Types

Read CSpeed 
Instance details

Defined in GHC.Internal.System.Posix.Types

Read CSsize 
Instance details

Defined in GHC.Internal.System.Posix.Types

Read CTcflag 
Instance details

Defined in GHC.Internal.System.Posix.Types

Read CUid 
Instance details

Defined in GHC.Internal.System.Posix.Types

Read Fd 
Instance details

Defined in GHC.Internal.System.Posix.Types

Read Lexeme

@since base-2.01

Instance details

Defined in GHC.Internal.Read

Read SomeNat

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.TypeNats

Read GeneralCategory

@since base-2.01

Instance details

Defined in GHC.Internal.Read

Read Word16

@since base-2.01

Instance details

Defined in GHC.Internal.Read

Read Word32

@since base-2.01

Instance details

Defined in GHC.Internal.Read

Read Word64

@since base-2.01

Instance details

Defined in GHC.Internal.Read

Read Word8

@since base-2.01

Instance details

Defined in GHC.Internal.Read

Read Ordering

@since base-2.01

Instance details

Defined in GHC.Internal.Read

Read Argument_ArgumentKind 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Read Argument_Mode 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Read ArimaForecastingMetrics_SeasonalPeriodsItem 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Read ArimaModelInfo_SeasonalPeriodsItem 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Read ArimaResult_SeasonalPeriodsItem 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Read ArimaSingleModelForecastingMetrics_SeasonalPeriodsItem 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Read AuditLogConfig_LogType 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Read DatasetAccessEntry_TargetTypesItem 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Read HparamTuningTrial_Status 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Read JobsListProjection 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Read JobsListStateFilter 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Read Model_ModelType 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Read Routine_DeterminismLevel 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Read Routine_Language 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Read Routine_RoutineType 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Read StandardSqlDataType_TypeKind 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Read TablesGetView 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Read TrainingOptions_BoosterType 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Read TrainingOptions_ColorSpace 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Read TrainingOptions_DartNormalizeType 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Read TrainingOptions_DataFrequency 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Read TrainingOptions_DataSplitMethod 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Read TrainingOptions_DistanceType 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Read TrainingOptions_FeedbackType 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Read TrainingOptions_HolidayRegion 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Read TrainingOptions_HparamTuningObjectivesItem 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Read TrainingOptions_KmeansInitializationMethod 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Read TrainingOptions_LearnRateStrategy 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Read TrainingOptions_LossType 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Read TrainingOptions_OptimizationStrategy 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Read TrainingOptions_TreeMethod 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Read Base64 
Instance details

Defined in Gogol.Data.Base64

Read Date 
Instance details

Defined in Gogol.Data.Time

Read DateTime 
Instance details

Defined in Gogol.Data.Time

Read Duration 
Instance details

Defined in Gogol.Data.Time

Read Time 
Instance details

Defined in Gogol.Data.Time

Read AccessToken 
Instance details

Defined in Gogol.Types

Read AltJSON 
Instance details

Defined in Gogol.Types

Read AltMedia 
Instance details

Defined in Gogol.Types

Read ClientId 
Instance details

Defined in Gogol.Types

Read FieldMask 
Instance details

Defined in Gogol.Types

Read GSecret 
Instance details

Defined in Gogol.Types

Read Multipart 
Instance details

Defined in Gogol.Types

Read OAuthScope 
Instance details

Defined in Gogol.Types

Read RefreshToken 
Instance details

Defined in Gogol.Types

Read Seconds 
Instance details

Defined in Gogol.Types

Read ServiceId 
Instance details

Defined in Gogol.Types

Read Tix 
Instance details

Defined in Trace.Hpc.Tix

Read TixModule 
Instance details

Defined in Trace.Hpc.Tix

Read Hash 
Instance details

Defined in Trace.Hpc.Util

Read HpcPos 
Instance details

Defined in Trace.Hpc.Util

Read Form 
Instance details

Defined in Web.Internal.FormUrlEncoded

Read Cookie 
Instance details

Defined in Network.HTTP.Client.Types

Read CookieJar 
Instance details

Defined in Network.HTTP.Client.Types

Read Proxy 
Instance details

Defined in Network.HTTP.Client.Types

Read ProxySecureMode 
Instance details

Defined in Network.HTTP.Client.Types

Read StdMethod 
Instance details

Defined in Network.HTTP.Types.Method

Read IP 
Instance details

Defined in Data.IP.Addr

Read IPv4 
Instance details

Defined in Data.IP.Addr

Read IPv6 
Instance details

Defined in Data.IP.Addr

Read IPRange 
Instance details

Defined in Data.IP.Range

Read JweAlg 
Instance details

Defined in Jose.Jwa

Read JwsAlg 
Instance details

Defined in Jose.Jwa

Read Environment 
Instance details

Defined in Katip.Core

Read Namespace 
Instance details

Defined in Katip.Core

Read Severity 
Instance details

Defined in Katip.Core

Read Verbosity 
Instance details

Defined in Katip.Core

Read Pos 
Instance details

Defined in Text.Megaparsec.Pos

Read SourcePos 
Instance details

Defined in Text.Megaparsec.Pos

Read AsStruct 
Instance details

Defined in Napkin.Types.Core

Read StructField 
Instance details

Defined in Napkin.Types.Core

Read AddrInfoFlag 
Instance details

Defined in Network.Socket.Info

Read NameInfoFlag 
Instance details

Defined in Network.Socket.Info

Read ConnectInfo 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Read Undefined 
Instance details

Defined in Relude.Debug

Read RetryAction 
Instance details

Defined in Control.Retry

Read RetryStatus 
Instance details

Defined in Control.Retry

Read LogLevel 
Instance details

Defined in RIO.Prelude.Logger

Read Scientific

Supports the skipping of parentheses and whitespaces. Example:

> read " ( ((  -1.0e+3 ) ))" :: Scientific
-1000.0

(Note: This Read instance makes internal use of scientificP to parse the floating-point number.)

Instance details

Defined in Data.Scientific

Read AcceptHeader 
Instance details

Defined in Servant.API.ContentTypes

Read NoContent 
Instance details

Defined in Servant.API.ContentTypes

Read IsSecure 
Instance details

Defined in Servant.API.IsSecure

Read AlterTableOptions 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect

Read Dialect 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect

Read KeywordMode 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect

Read SetOperatorOptions 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect

Read TrieKey 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Trie

Read TrieNodeKey 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Trie

Read CaseEquality 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Read CodePointBase 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Read CodePointDigits 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Read EscMode 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Read EscapeFallBack 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Read EscapeParams 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Read InLowCase 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Read InSource 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Read KeyCharEventHandler 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Read LetterCase 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Read QuotationRuleIndex 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Read QuotePrefix 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Read QuotingChars 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Read ScapeParams 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Read ScapingRule 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Read SrcLitStr 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Read StrLitFmt 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Read StrLitId 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Read StrLitPrefix 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Read UnEscapeParams 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Read AdminOption 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read AdminOptionFor 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read Alias 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read AlterDomainAction 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read AlterTableAction 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read AnonymousStruct 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read AsStruct 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read BqStructExpr 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read CastSafe 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read CheckOption 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read ColConstraint 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read ColConstraintDef 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read ColumnDef 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read Comment 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read CompPredQuantifier 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read Corresponding 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read DefaultClause 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read Direction 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read DropBehaviour 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read Frame 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read FramePos 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read FrameRows 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read GrantOption 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read GrantOptionFor 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read GroupingExpr 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read IdentityRestart 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read IdentityWhen 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read InPredValue 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read InsertSource 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read IntervalTypeField 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read JoinCondition 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read JoinType 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read Name 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read NullsOrder 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read NullsRespect 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read ParensOperator 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read ParensOperatorArgument 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read PrecMultiplier 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read PrecUnits 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read PrivilegeAction 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read PrivilegeObject 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read QueryExpr 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read ReferenceMatch 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read ReferentialAction 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read ScalarExpr 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read SequenceGeneratorOption 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read SetClause 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read SetOperatorName 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read SetQuantifier 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read Sign 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read SortSpec 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read Statement 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read SubQueryExprType 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read TableConstraint 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read TableElement 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read TableRef 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read TypeName 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Read Leniency 
Instance details

Defined in Data.String.Conv

Read I8 
Instance details

Defined in Data.Text.Foreign

Read FPFormat 
Instance details

Defined in Data.Text.Lazy.Builder.RealFloat

Read ShortText 
Instance details

Defined in Data.Text.Short.Internal

Read DatatypeVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Read Month

Read as yyyy-mm.

Instance details

Defined in Data.Time.Calendar.Month

Read Quarter

Read as yyyy-Qn.

Instance details

Defined in Data.Time.Calendar.Quarter

Read QuarterOfYear 
Instance details

Defined in Data.Time.Calendar.Quarter

Read DayOfWeek 
Instance details

Defined in Data.Time.Calendar.Week

Read DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Read NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Read SchemaError 
Instance details

Defined in URI.ByteString.Types

Read URIParseError 
Instance details

Defined in URI.ByteString.Types

Read UUID 
Instance details

Defined in Data.UUID.Types.Internal

Read UnpackedUUID 
Instance details

Defined in Data.UUID.Types.Internal

Read DictionaryHash 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

readsPrec :: Int -> ReadS DictionaryHash #

readList :: ReadS [DictionaryHash] #

readPrec :: ReadPrec DictionaryHash #

readListPrec :: ReadPrec [DictionaryHash] #

Read Integer

@since base-2.01

Instance details

Defined in GHC.Internal.Read

Read Natural

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Read

Read ()

@since base-2.01

Instance details

Defined in GHC.Internal.Read

Methods

readsPrec :: Int -> ReadS () #

readList :: ReadS [()] #

readPrec :: ReadPrec () #

readListPrec :: ReadPrec [()] #

Read Bool

@since base-2.01

Instance details

Defined in GHC.Internal.Read

Read Char

@since base-2.01

Instance details

Defined in GHC.Internal.Read

Read Double

@since base-2.01

Instance details

Defined in GHC.Internal.Read

Read Float

@since base-2.01

Instance details

Defined in GHC.Internal.Read

Read Int

@since base-2.01

Instance details

Defined in GHC.Internal.Read

Read Word

@since base-4.5.0.0

Instance details

Defined in GHC.Internal.Read

Read a => Read (Only a) 
Instance details

Defined in Data.Tuple.Only

Read v => Read (KeyMap v) 
Instance details

Defined in Data.Aeson.KeyMap

Read a => Read (Complex a)

Since: base-2.1

Instance details

Defined in Data.Complex

Read a => Read (First a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Read a => Read (Last a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Read a => Read (Max a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Read a => Read (Min a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Read m => Read (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Read vertex => Read (SCC vertex)

Since: containers-0.5.9

Instance details

Defined in Data.Graph

Methods

readsPrec :: Int -> ReadS (SCC vertex) #

readList :: ReadS [SCC vertex] #

readPrec :: ReadPrec (SCC vertex) #

readListPrec :: ReadPrec [SCC vertex] #

Read e => Read (IntMap e) 
Instance details

Defined in Data.IntMap.Internal

Read a => Read (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Read a => Read (ViewL a) 
Instance details

Defined in Data.Sequence.Internal

Read a => Read (ViewR a) 
Instance details

Defined in Data.Sequence.Internal

(Read a, Ord a) => Read (Set a) 
Instance details

Defined in Data.Set.Internal

Read a => Read (Tree a) 
Instance details

Defined in Data.Tree

HashAlgorithm a => Read (Digest a) 
Instance details

Defined in Crypto.Hash.Types

HashAlgorithm a => Read (Digest a) 
Instance details

Defined in Crypto.Hash.Types

Read1 f => Read (Fix f) 
Instance details

Defined in Data.Fix

(Functor f, Read1 f) => Read (Mu f) 
Instance details

Defined in Data.Fix

(Functor f, Read1 f) => Read (Nu f) 
Instance details

Defined in Data.Fix

Read a => Read (DNonEmpty a) 
Instance details

Defined in Data.DList.DNonEmpty.Internal

Read a => Read (DList a) 
Instance details

Defined in Data.DList.Internal

Read a => Read (FromListCounting a) 
Instance details

Defined in GHC.Data.Graph.Inductive.PatriciaTree

Methods

readsPrec :: Int -> ReadS (FromListCounting a) #

readList :: ReadS [FromListCounting a] #

readPrec :: ReadPrec (FromListCounting a) #

readListPrec :: ReadPrec [FromListCounting a] #

Read e => Read (Word64Map e) 
Instance details

Defined in GHC.Data.Word64Map.Internal

Read a => Read (NonEmpty a)

@since base-4.11.0.0

Instance details

Defined in GHC.Internal.Read

Read a => Read (Identity a)

This instance would be equivalent to the derived instances of the Identity newtype if the runIdentity field were removed

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Identity

Read a => Read (First a)

@since base-2.01

Instance details

Defined in GHC.Internal.Data.Monoid

Read a => Read (Last a)

@since base-2.01

Instance details

Defined in GHC.Internal.Data.Monoid

Read a => Read (Down a)

This instance would be equivalent to the derived instances of the Down newtype if the getDown field were removed

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Data.Ord

Read a => Read (Dual a)

@since base-2.01

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Read a => Read (Product a)

@since base-2.01

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Read a => Read (Sum a)

@since base-2.01

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Read a => Read (ZipList a)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Functor.ZipList

Read p => Read (Par1 p)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Generics

(Integral a, Read a) => Read (Ratio a)

@since base-2.01

Instance details

Defined in GHC.Internal.Read

Read (OAuthCode s) 
Instance details

Defined in Gogol.Internal.Auth

Read (AddrRange IPv4) 
Instance details

Defined in Data.IP.Range

Read (AddrRange IPv6) 
Instance details

Defined in Data.IP.Range

Read e => Read (ErrorFancy e) 
Instance details

Defined in Text.Megaparsec.Error

Read t => Read (ErrorItem t) 
Instance details

Defined in Text.Megaparsec.Error

Read mono => Read (NonNull mono) 
Instance details

Defined in Data.NonNull

(Ord a, Read a) => Read (OSet a) 
Instance details

Defined in Data.Set.Ordered

Read a => Read (Array a) 
Instance details

Defined in Data.Primitive.Array

Read a => Read (SmallArray a) 
Instance details

Defined in Data.Primitive.SmallArray

Read a => Read (Trie a) 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Trie

Read a => Read (I a) 
Instance details

Defined in Data.SOP.BasicFunctors

Methods

readsPrec :: Int -> ReadS (I a) #

readList :: ReadS [I a] #

readPrec :: ReadPrec (I a) #

readListPrec :: ReadPrec [I a] #

Read a => Read (Maybe a) 
Instance details

Defined in Data.Strict.Maybe

(Eq a, Hashable a, Read a) => Read (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Read a => Read (Vector a) 
Instance details

Defined in Data.Vector

(Read a, Prim a) => Read (Vector a) 
Instance details

Defined in Data.Vector.Primitive

(Read a, Storable a) => Read (Vector a) 
Instance details

Defined in Data.Vector.Storable

Read a => Read (Maybe a)

@since base-2.01

Instance details

Defined in GHC.Internal.Read

Read a => Read (Solo a)

@since base-4.15

Instance details

Defined in GHC.Internal.Read

Read a => Read [a]

@since base-2.01

Instance details

Defined in GHC.Internal.Read

Methods

readsPrec :: Int -> ReadS [a] #

readList :: ReadS [[a]] #

readPrec :: ReadPrec [a] #

readListPrec :: ReadPrec [[a]] #

(Ix ix, Read ix, Read e, IArray UArray e) => Read (UArray ix e) 
Instance details

Defined in Data.Array.Base

Methods

readsPrec :: Int -> ReadS (UArray ix e) #

readList :: ReadS [UArray ix e] #

readPrec :: ReadPrec (UArray ix e) #

readListPrec :: ReadPrec [UArray ix e] #

HasResolution a => Read (Fixed a)

Since: base-4.3.0.0

Instance details

Defined in Data.Fixed

(Read a, Read b) => Read (Arg a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

readsPrec :: Int -> ReadS (Arg a b) #

readList :: ReadS [Arg a b] #

readPrec :: ReadPrec (Arg a b) #

readListPrec :: ReadPrec [Arg a b] #

(Ord k, Read k, Read e) => Read (Map k e) 
Instance details

Defined in Data.Map.Internal

Methods

readsPrec :: Int -> ReadS (Map k e) #

readList :: ReadS [Map k e] #

readPrec :: ReadPrec (Map k e) #

readListPrec :: ReadPrec [Map k e] #

(Read1 f, Read a) => Read (Cofree f a) 
Instance details

Defined in Control.Comonad.Cofree

(Read1 f, Read a) => Read (Free f a) 
Instance details

Defined in Control.Monad.Free

Methods

readsPrec :: Int -> ReadS (Free f a) #

readList :: ReadS [Free f a] #

readPrec :: ReadPrec (Free f a) #

readListPrec :: ReadPrec [Free f a] #

(Read a, Read b) => Read (Gr a b) 
Instance details

Defined in GHC.Data.Graph.Inductive.PatriciaTree

Methods

readsPrec :: Int -> ReadS (Gr a b) #

readList :: ReadS [Gr a b] #

readPrec :: ReadPrec (Gr a b) #

readListPrec :: ReadPrec [Gr a b] #

(Ix a, Read a, Read b) => Read (Array a b)

@since base-2.01

Instance details

Defined in GHC.Internal.Read

(Read a, Read b) => Read (Either a b)

@since base-3.0

Instance details

Defined in GHC.Internal.Data.Either

Read (Proxy t)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Data.Proxy

Read (U1 p)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Read (V1 p)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

(Functor f, Read (f a)) => Read (Yoneda f a) 
Instance details

Defined in Data.Functor.Yoneda

(Read i, Read a) => Read (Level i a) 
Instance details

Defined in Control.Lens.Internal.Level

(Ord k, Read k, Read v) => Read (OMap k v)

Value-lazy

Instance details

Defined in Data.Map.Ordered.Internal

Methods

readsPrec :: Int -> ReadS (OMap k v) #

readList :: ReadS [OMap k v] #

readPrec :: ReadPrec (OMap k v) #

readListPrec :: ReadPrec [OMap k v] #

(Read a, Read b) => Read (Either a b) 
Instance details

Defined in Data.Strict.Either

(Read a, Read b) => Read (These a b) 
Instance details

Defined in Data.Strict.These

(Read a, Read b) => Read (Pair a b) 
Instance details

Defined in Data.Strict.Tuple

Methods

readsPrec :: Int -> ReadS (Pair a b) #

readList :: ReadS [Pair a b] #

readPrec :: ReadPrec (Pair a b) #

readListPrec :: ReadPrec [Pair a b] #

(Read a, Read b) => Read (These a b) 
Instance details

Defined in Data.These

(Read1 f, Read a) => Read (Lift f a) 
Instance details

Defined in Control.Applicative.Lift

Methods

readsPrec :: Int -> ReadS (Lift f a) #

readList :: ReadS [Lift f a] #

readPrec :: ReadPrec (Lift f a) #

readListPrec :: ReadPrec [Lift f a] #

(Read1 m, Read a) => Read (MaybeT m a) 
Instance details

Defined in Control.Monad.Trans.Maybe

(Eq k, Hashable k, Read k, Read e) => Read (HashMap k e) 
Instance details

Defined in Data.HashMap.Internal

(Read a, Read b) => Read (a, b)

@since base-2.01

Instance details

Defined in GHC.Internal.Read

Methods

readsPrec :: Int -> ReadS (a, b) #

readList :: ReadS [(a, b)] #

readPrec :: ReadPrec (a, b) #

readListPrec :: ReadPrec [(a, b)] #

Read (p (Fix p a) a) => Read (Fix p a) 
Instance details

Defined in Data.Bifunctor.Fix

Methods

readsPrec :: Int -> ReadS (Fix p a) #

readList :: ReadS [Fix p a] #

readPrec :: ReadPrec (Fix p a) #

readListPrec :: ReadPrec [Fix p a] #

Read (p a a) => Read (Join p a) 
Instance details

Defined in Data.Bifunctor.Join

Methods

readsPrec :: Int -> ReadS (Join p a) #

readList :: ReadS [Join p a] #

readPrec :: ReadPrec (Join p a) #

readListPrec :: ReadPrec [Join p a] #

(Read a, Read (f b)) => Read (CofreeF f a b) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

readsPrec :: Int -> ReadS (CofreeF f a b) #

readList :: ReadS [CofreeF f a b] #

readPrec :: ReadPrec (CofreeF f a b) #

readListPrec :: ReadPrec [CofreeF f a b] #

Read (w (CofreeF f a (CofreeT f w a))) => Read (CofreeT f w a) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

readsPrec :: Int -> ReadS (CofreeT f w a) #

readList :: ReadS [CofreeT f w a] #

readPrec :: ReadPrec (CofreeT f w a) #

readListPrec :: ReadPrec [CofreeT f w a] #

(Read a, Read (f b)) => Read (FreeF f a b) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

readsPrec :: Int -> ReadS (FreeF f a b) #

readList :: ReadS [FreeF f a b] #

readPrec :: ReadPrec (FreeF f a b) #

readListPrec :: ReadPrec [FreeF f a b] #

(Read1 f, Read1 m, Read a) => Read (FreeT f m a) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

readsPrec :: Int -> ReadS (FreeT f m a) #

readList :: ReadS [FreeT f m a] #

readPrec :: ReadPrec (FreeT f m a) #

readListPrec :: ReadPrec [FreeT f m a] #

Read a => Read (Const a b)

This instance would be equivalent to the derived instances of the Const newtype if the getConst field were removed

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Const

Read (f a) => Read (Ap f a)

@since base-4.12.0.0

Instance details

Defined in GHC.Internal.Data.Monoid

Methods

readsPrec :: Int -> ReadS (Ap f a) #

readList :: ReadS [Ap f a] #

readPrec :: ReadPrec (Ap f a) #

readListPrec :: ReadPrec [Ap f a] #

Read (f a) => Read (Alt f a)

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

readsPrec :: Int -> ReadS (Alt f a) #

readList :: ReadS [Alt f a] #

readPrec :: ReadPrec (Alt f a) #

readListPrec :: ReadPrec [Alt f a] #

a ~ b => Read (a :~: b)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Data.Type.Equality

Methods

readsPrec :: Int -> ReadS (a :~: b) #

readList :: ReadS [a :~: b] #

readPrec :: ReadPrec (a :~: b) #

readListPrec :: ReadPrec [a :~: b] #

Read (f p) => Read (Rec1 f p)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

readsPrec :: Int -> ReadS (Rec1 f p) #

readList :: ReadS [Rec1 f p] #

readPrec :: ReadPrec (Rec1 f p) #

readListPrec :: ReadPrec [Rec1 f p] #

Read (f (a, b)) => Read (AlongsideLeft f b a) 
Instance details

Defined in Control.Lens.Internal.Getter

Read (f (a, b)) => Read (AlongsideRight f a b) 
Instance details

Defined in Control.Lens.Internal.Getter

Read a => Read (K a b) 
Instance details

Defined in Data.SOP.BasicFunctors

Methods

readsPrec :: Int -> ReadS (K a b) #

readList :: ReadS [K a b] #

readPrec :: ReadPrec (K a b) #

readListPrec :: ReadPrec [K a b] #

Read b => Read (Tagged s b) 
Instance details

Defined in Data.Tagged

(Read (f a), Read (g a), Read a) => Read (These1 f g a) 
Instance details

Defined in Data.Functor.These

Methods

readsPrec :: Int -> ReadS (These1 f g a) #

readList :: ReadS [These1 f g a] #

readPrec :: ReadPrec (These1 f g a) #

readListPrec :: ReadPrec [These1 f g a] #

(Read1 f, Read a) => Read (Backwards f a) 
Instance details

Defined in Control.Applicative.Backwards

(Read e, Read1 m, Read a) => Read (ExceptT e m a) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

readsPrec :: Int -> ReadS (ExceptT e m a) #

readList :: ReadS [ExceptT e m a] #

readPrec :: ReadPrec (ExceptT e m a) #

readListPrec :: ReadPrec [ExceptT e m a] #

(Read1 f, Read a) => Read (IdentityT f a) 
Instance details

Defined in Control.Monad.Trans.Identity

(Read w, Read1 m, Read a) => Read (WriterT w m a) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

readsPrec :: Int -> ReadS (WriterT w m a) #

readList :: ReadS [WriterT w m a] #

readPrec :: ReadPrec (WriterT w m a) #

readListPrec :: ReadPrec [WriterT w m a] #

(Read w, Read1 m, Read a) => Read (WriterT w m a) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

readsPrec :: Int -> ReadS (WriterT w m a) #

readList :: ReadS [WriterT w m a] #

readPrec :: ReadPrec (WriterT w m a) #

readListPrec :: ReadPrec [WriterT w m a] #

Read a => Read (Constant a b) 
Instance details

Defined in Data.Functor.Constant

(Read1 f, Read a) => Read (Reverse f a) 
Instance details

Defined in Data.Functor.Reverse

(Read a, Read b, Read c) => Read (a, b, c)

@since base-2.01

Instance details

Defined in GHC.Internal.Read

Methods

readsPrec :: Int -> ReadS (a, b, c) #

readList :: ReadS [(a, b, c)] #

readPrec :: ReadPrec (a, b, c) #

readListPrec :: ReadPrec [(a, b, c)] #

(Read (f a), Read (g a)) => Read (Product f g a)

Since: base-4.18.0.0

Instance details

Defined in Data.Functor.Product

Methods

readsPrec :: Int -> ReadS (Product f g a) #

readList :: ReadS [Product f g a] #

readPrec :: ReadPrec (Product f g a) #

readListPrec :: ReadPrec [Product f g a] #

(Read (f a), Read (g a)) => Read (Sum f g a)

Since: base-4.18.0.0

Instance details

Defined in Data.Functor.Sum

Methods

readsPrec :: Int -> ReadS (Sum f g a) #

readList :: ReadS [Sum f g a] #

readPrec :: ReadPrec (Sum f g a) #

readListPrec :: ReadPrec [Sum f g a] #

a ~~ b => Read (a :~~: b)

@since base-4.10.0.0

Instance details

Defined in GHC.Internal.Data.Type.Equality

Methods

readsPrec :: Int -> ReadS (a :~~: b) #

readList :: ReadS [a :~~: b] #

readPrec :: ReadPrec (a :~~: b) #

readListPrec :: ReadPrec [a :~~: b] #

(Read (f p), Read (g p)) => Read ((f :*: g) p)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

readsPrec :: Int -> ReadS ((f :*: g) p) #

readList :: ReadS [(f :*: g) p] #

readPrec :: ReadPrec ((f :*: g) p) #

readListPrec :: ReadPrec [(f :*: g) p] #

(Read (f p), Read (g p)) => Read ((f :+: g) p)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

readsPrec :: Int -> ReadS ((f :+: g) p) #

readList :: ReadS [(f :+: g) p] #

readPrec :: ReadPrec ((f :+: g) p) #

readListPrec :: ReadPrec [(f :+: g) p] #

Read c => Read (K1 i c p)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

readsPrec :: Int -> ReadS (K1 i c p) #

readList :: ReadS [K1 i c p] #

readPrec :: ReadPrec (K1 i c p) #

readListPrec :: ReadPrec [K1 i c p] #

(Read a, Read b, Read c, Read d) => Read (a, b, c, d)

@since base-2.01

Instance details

Defined in GHC.Internal.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d) #

readList :: ReadS [(a, b, c, d)] #

readPrec :: ReadPrec (a, b, c, d) #

readListPrec :: ReadPrec [(a, b, c, d)] #

Read (f (g a)) => Read (Compose f g a)

Since: base-4.18.0.0

Instance details

Defined in Data.Functor.Compose

Methods

readsPrec :: Int -> ReadS (Compose f g a) #

readList :: ReadS [Compose f g a] #

readPrec :: ReadPrec (Compose f g a) #

readListPrec :: ReadPrec [Compose f g a] #

Read (f a) => Read (Clown f a b) 
Instance details

Defined in Data.Bifunctor.Clown

Methods

readsPrec :: Int -> ReadS (Clown f a b) #

readList :: ReadS [Clown f a b] #

readPrec :: ReadPrec (Clown f a b) #

readListPrec :: ReadPrec [Clown f a b] #

Read (p b a) => Read (Flip p a b) 
Instance details

Defined in Data.Bifunctor.Flip

Methods

readsPrec :: Int -> ReadS (Flip p a b) #

readList :: ReadS [Flip p a b] #

readPrec :: ReadPrec (Flip p a b) #

readListPrec :: ReadPrec [Flip p a b] #

Read (g b) => Read (Joker g a b) 
Instance details

Defined in Data.Bifunctor.Joker

Methods

readsPrec :: Int -> ReadS (Joker g a b) #

readList :: ReadS [Joker g a b] #

readPrec :: ReadPrec (Joker g a b) #

readListPrec :: ReadPrec [Joker g a b] #

Read (p a b) => Read (WrappedBifunctor p a b) 
Instance details

Defined in Data.Bifunctor.Wrapped

Read (f (g p)) => Read ((f :.: g) p)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

readsPrec :: Int -> ReadS ((f :.: g) p) #

readList :: ReadS [(f :.: g) p] #

readPrec :: ReadPrec ((f :.: g) p) #

readListPrec :: ReadPrec [(f :.: g) p] #

Read (f p) => Read (M1 i c f p)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

readsPrec :: Int -> ReadS (M1 i c f p) #

readList :: ReadS [M1 i c f p] #

readPrec :: ReadPrec (M1 i c f p) #

readListPrec :: ReadPrec [M1 i c f p] #

(Read1 f, Read1 g, Read a) => Read ((f :.: g) a) 
Instance details

Defined in Data.SOP.BasicFunctors

Methods

readsPrec :: Int -> ReadS ((f :.: g) a) #

readList :: ReadS [(f :.: g) a] #

readPrec :: ReadPrec ((f :.: g) a) #

readListPrec :: ReadPrec [(f :.: g) a] #

(Read a, Read b, Read c, Read d, Read e) => Read (a, b, c, d, e)

@since base-2.01

Instance details

Defined in GHC.Internal.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d, e) #

readList :: ReadS [(a, b, c, d, e)] #

readPrec :: ReadPrec (a, b, c, d, e) #

readListPrec :: ReadPrec [(a, b, c, d, e)] #

(Read (f a b), Read (g a b)) => Read (Product f g a b) 
Instance details

Defined in Data.Bifunctor.Product

Methods

readsPrec :: Int -> ReadS (Product f g a b) #

readList :: ReadS [Product f g a b] #

readPrec :: ReadPrec (Product f g a b) #

readListPrec :: ReadPrec [Product f g a b] #

(Read (p a b), Read (q a b)) => Read (Sum p q a b) 
Instance details

Defined in Data.Bifunctor.Sum

Methods

readsPrec :: Int -> ReadS (Sum p q a b) #

readList :: ReadS [Sum p q a b] #

readPrec :: ReadPrec (Sum p q a b) #

readListPrec :: ReadPrec [Sum p q a b] #

(Read a, Read b, Read c, Read d, Read e, Read f) => Read (a, b, c, d, e, f)

@since base-2.01

Instance details

Defined in GHC.Internal.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d, e, f) #

readList :: ReadS [(a, b, c, d, e, f)] #

readPrec :: ReadPrec (a, b, c, d, e, f) #

readListPrec :: ReadPrec [(a, b, c, d, e, f)] #

Read (f (p a b)) => Read (Tannen f p a b) 
Instance details

Defined in Data.Bifunctor.Tannen

Methods

readsPrec :: Int -> ReadS (Tannen f p a b) #

readList :: ReadS [Tannen f p a b] #

readPrec :: ReadPrec (Tannen f p a b) #

readListPrec :: ReadPrec [Tannen f p a b] #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g) => Read (a, b, c, d, e, f, g)

@since base-2.01

Instance details

Defined in GHC.Internal.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d, e, f, g) #

readList :: ReadS [(a, b, c, d, e, f, g)] #

readPrec :: ReadPrec (a, b, c, d, e, f, g) #

readListPrec :: ReadPrec [(a, b, c, d, e, f, g)] #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h) => Read (a, b, c, d, e, f, g, h)

@since base-2.01

Instance details

Defined in GHC.Internal.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d, e, f, g, h) #

readList :: ReadS [(a, b, c, d, e, f, g, h)] #

readPrec :: ReadPrec (a, b, c, d, e, f, g, h) #

readListPrec :: ReadPrec [(a, b, c, d, e, f, g, h)] #

Read (p (f a) (g b)) => Read (Biff p f g a b) 
Instance details

Defined in Data.Bifunctor.Biff

Methods

readsPrec :: Int -> ReadS (Biff p f g a b) #

readList :: ReadS [Biff p f g a b] #

readPrec :: ReadPrec (Biff p f g a b) #

readListPrec :: ReadPrec [Biff p f g a b] #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i) => Read (a, b, c, d, e, f, g, h, i)

@since base-2.01

Instance details

Defined in GHC.Internal.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d, e, f, g, h, i) #

readList :: ReadS [(a, b, c, d, e, f, g, h, i)] #

readPrec :: ReadPrec (a, b, c, d, e, f, g, h, i) #

readListPrec :: ReadPrec [(a, b, c, d, e, f, g, h, i)] #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j) => Read (a, b, c, d, e, f, g, h, i, j)

@since base-2.01

Instance details

Defined in GHC.Internal.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d, e, f, g, h, i, j) #

readList :: ReadS [(a, b, c, d, e, f, g, h, i, j)] #

readPrec :: ReadPrec (a, b, c, d, e, f, g, h, i, j) #

readListPrec :: ReadPrec [(a, b, c, d, e, f, g, h, i, j)] #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j, Read k) => Read (a, b, c, d, e, f, g, h, i, j, k)

@since base-2.01

Instance details

Defined in GHC.Internal.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d, e, f, g, h, i, j, k) #

readList :: ReadS [(a, b, c, d, e, f, g, h, i, j, k)] #

readPrec :: ReadPrec (a, b, c, d, e, f, g, h, i, j, k) #

readListPrec :: ReadPrec [(a, b, c, d, e, f, g, h, i, j, k)] #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j, Read k, Read l) => Read (a, b, c, d, e, f, g, h, i, j, k, l)

@since base-2.01

Instance details

Defined in GHC.Internal.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d, e, f, g, h, i, j, k, l) #

readList :: ReadS [(a, b, c, d, e, f, g, h, i, j, k, l)] #

readPrec :: ReadPrec (a, b, c, d, e, f, g, h, i, j, k, l) #

readListPrec :: ReadPrec [(a, b, c, d, e, f, g, h, i, j, k, l)] #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j, Read k, Read l, Read m) => Read (a, b, c, d, e, f, g, h, i, j, k, l, m)

@since base-2.01

Instance details

Defined in GHC.Internal.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d, e, f, g, h, i, j, k, l, m) #

readList :: ReadS [(a, b, c, d, e, f, g, h, i, j, k, l, m)] #

readPrec :: ReadPrec (a, b, c, d, e, f, g, h, i, j, k, l, m) #

readListPrec :: ReadPrec [(a, b, c, d, e, f, g, h, i, j, k, l, m)] #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j, Read k, Read l, Read m, Read n) => Read (a, b, c, d, e, f, g, h, i, j, k, l, m, n)

@since base-2.01

Instance details

Defined in GHC.Internal.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d, e, f, g, h, i, j, k, l, m, n) #

readList :: ReadS [(a, b, c, d, e, f, g, h, i, j, k, l, m, n)] #

readPrec :: ReadPrec (a, b, c, d, e, f, g, h, i, j, k, l, m, n) #

readListPrec :: ReadPrec [(a, b, c, d, e, f, g, h, i, j, k, l, m, n)] #

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j, Read k, Read l, Read m, Read n, Read o) => Read (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)

@since base-2.01

Instance details

Defined in GHC.Internal.Read

Methods

readsPrec :: Int -> ReadS (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) #

readList :: ReadS [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)] #

readPrec :: ReadPrec (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) #

readListPrec :: ReadPrec [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)] #

class Num a => Fractional a where #

Fractional numbers, supporting real division.

The Haskell Report defines no laws for Fractional. However, (+) and (*) are customarily expected to define a division ring and have the following properties:

recip gives the multiplicative inverse
x * recip x = recip x * x = fromInteger 1
Totality of toRational
toRational is total
Coherence with toRational
if the type also implements Real, then fromRational is a left inverse for toRational, i.e. fromRational (toRational i) = i

Note that it isn't customarily expected that a type instance of Fractional implement a field. However, all instances in base do.

Minimal complete definition

fromRational, (recip | (/))

Methods

(/) :: a -> a -> a infixl 7 #

Fractional division.

recip :: a -> a #

Reciprocal fraction.

fromRational :: Rational -> a #

Conversion from a Rational (that is Ratio Integer). A floating literal stands for an application of fromRational to a value of type Rational, so such literals have type (Fractional a) => a.

Instances

Instances details
Fractional SaneDouble 
Instance details

Defined in GHC.Types.SaneDouble

Fractional CDouble 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Fractional CFloat 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Fractional Scientific

WARNING: recip and / will throw an error when their outputs are repeating decimals.

These methods also compute Integer magnitudes (10^e). If these methods are applied to arguments which have huge exponents this could fill up all space and crash your program! So don't apply these methods to scientific numbers coming from untrusted sources.

fromRational will throw an error when the input Rational is a repeating decimal. Consider using fromRationalRepetend for these rationals which will detect the repetition and indicate where it starts.

Instance details

Defined in Data.Scientific

Fractional DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Fractional NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

RealFloat a => Fractional (Complex a)

Since: base-2.1

Instance details

Defined in Data.Complex

Methods

(/) :: Complex a -> Complex a -> Complex a #

recip :: Complex a -> Complex a #

fromRational :: Rational -> Complex a #

Fractional a => Fractional (Identity a)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Identity

Fractional a => Fractional (Down a)

@since base-4.14.0.0

Instance details

Defined in GHC.Internal.Data.Ord

Methods

(/) :: Down a -> Down a -> Down a #

recip :: Down a -> Down a #

fromRational :: Rational -> Down a #

Integral a => Fractional (Ratio a)

@since base-2.0.1

Instance details

Defined in GHC.Internal.Real

Methods

(/) :: Ratio a -> Ratio a -> Ratio a #

recip :: Ratio a -> Ratio a #

fromRational :: Rational -> Ratio a #

HasResolution a => Fractional (Fixed a)

Since: base-2.1

Instance details

Defined in Data.Fixed

Methods

(/) :: Fixed a -> Fixed a -> Fixed a #

recip :: Fixed a -> Fixed a #

fromRational :: Rational -> Fixed a #

Fractional a => Fractional (Op a b) 
Instance details

Defined in Data.Functor.Contravariant

Methods

(/) :: Op a b -> Op a b -> Op a b #

recip :: Op a b -> Op a b #

fromRational :: Rational -> Op a b #

Fractional a => Fractional (Const a b)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Const

Methods

(/) :: Const a b -> Const a b -> Const a b #

recip :: Const a b -> Const a b #

fromRational :: Rational -> Const a b #

Fractional a => Fractional (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

(/) :: Tagged s a -> Tagged s a -> Tagged s a #

recip :: Tagged s a -> Tagged s a #

fromRational :: Rational -> Tagged s a #

Fractional (f (g a)) => Fractional (Compose f g a)

Since: base-4.20.0.0

Instance details

Defined in Data.Functor.Compose

Methods

(/) :: Compose f g a -> Compose f g a -> Compose f g a #

recip :: Compose f g a -> Compose f g a #

fromRational :: Rational -> Compose f g a #

class Show a where #

Conversion of values to readable Strings.

Derived instances of Show have the following properties, which are compatible with derived instances of Read:

  • The result of show is a syntactically correct Haskell expression containing only constants, given the fixity declarations in force at the point where the type is declared. It contains only the constructor names defined in the data type, parentheses, and spaces. When labelled constructor fields are used, braces, commas, field names, and equal signs are also used.
  • If the constructor is defined to be an infix operator, then showsPrec will produce infix applications of the constructor.
  • the representation will be enclosed in parentheses if the precedence of the top-level constructor in x is less than d (associativity is ignored). Thus, if d is 0 then the result is never surrounded in parentheses; if d is 11 it is always surrounded in parentheses, unless it is an atomic expression.
  • If the constructor is defined using record syntax, then show will produce the record-syntax form, with the fields given in the same order as the original declaration.

For example, given the declarations

infixr 5 :^:
data Tree a =  Leaf a  |  Tree a :^: Tree a

the derived instance of Show is equivalent to

instance (Show a) => Show (Tree a) where

       showsPrec d (Leaf m) = showParen (d > app_prec) $
            showString "Leaf " . showsPrec (app_prec+1) m
         where app_prec = 10

       showsPrec d (u :^: v) = showParen (d > up_prec) $
            showsPrec (up_prec+1) u .
            showString " :^: "      .
            showsPrec (up_prec+1) v
         where up_prec = 5

Note that right-associativity of :^: is ignored. For example,

  • show (Leaf 1 :^: Leaf 2 :^: Leaf 3) produces the string "Leaf 1 :^: (Leaf 2 :^: Leaf 3)".

Minimal complete definition

showsPrec | show

Methods

show :: a -> String #

A specialised variant of showsPrec, using precedence context zero, and returning an ordinary String.

Instances

Instances details
Show Lit 
Instance details

Defined in Data.Aeson.Decoding.Tokens

Methods

showsPrec :: Int -> Lit -> ShowS #

show :: Lit -> String #

showList :: [Lit] -> ShowS #

Show Number 
Instance details

Defined in Data.Aeson.Decoding.Tokens

Show Key 
Instance details

Defined in Data.Aeson.Key

Methods

showsPrec :: Int -> Key -> ShowS #

show :: Key -> String #

showList :: [Key] -> ShowS #

Show AesonException 
Instance details

Defined in Data.Aeson.Types.Internal

Show DotNetTime 
Instance details

Defined in Data.Aeson.Types.Internal

Show JSONPathElement 
Instance details

Defined in Data.Aeson.Types.Internal

Show Options 
Instance details

Defined in Data.Aeson.Types.Internal

Show SumEncoding 
Instance details

Defined in Data.Aeson.Types.Internal

Show Value

Since version 1.5.6.0 version object values are printed in lexicographic key order

>>> toJSON $ H.fromList [("a", True), ("z", False)]
Object (fromList [("a",Bool True),("z",Bool False)])
>>> toJSON $ H.fromList [("z", False), ("a", True)]
Object (fromList [("a",Bool True),("z",Bool False)])
Instance details

Defined in Data.Aeson.Types.Internal

Methods

showsPrec :: Int -> Value -> ShowS #

show :: Value -> String #

showList :: [Value] -> ShowS #

Show Operation 
Instance details

Defined in Data.Aeson.Patch

Show Patch 
Instance details

Defined in Data.Aeson.Patch

Methods

showsPrec :: Int -> Patch -> ShowS #

show :: Patch -> String #

showList :: [Patch] -> ShowS #

Show Key 
Instance details

Defined in Data.Aeson.Pointer

Methods

showsPrec :: Int -> Key -> ShowS #

show :: Key -> String #

showList :: [Key] -> ShowS #

Show Pointer 
Instance details

Defined in Data.Aeson.Pointer

Show JSONWarning 
Instance details

Defined in Data.Aeson.WarningParser

Show More 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

showsPrec :: Int -> More -> ShowS #

show :: More -> String #

showList :: [More] -> ShowS #

Show Pos 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

showsPrec :: Int -> Pos -> ShowS #

show :: Pos -> String #

showList :: [Pos] -> ShowS #

Show ByteArray

Since: base-4.17.0.0

Instance details

Defined in Data.Array.Byte

Show Timeout

Since: base-4.0

Instance details

Defined in System.Timeout

Show Encoding 
Instance details

Defined in Basement.String

Show ASCII7_Invalid 
Instance details

Defined in Basement.String.Encoding.ASCII7

Methods

showsPrec :: Int -> ASCII7_Invalid -> ShowS #

show :: ASCII7_Invalid -> String #

showList :: [ASCII7_Invalid] -> ShowS #

Show ISO_8859_1_Invalid 
Instance details

Defined in Basement.String.Encoding.ISO_8859_1

Methods

showsPrec :: Int -> ISO_8859_1_Invalid -> ShowS #

show :: ISO_8859_1_Invalid -> String #

showList :: [ISO_8859_1_Invalid] -> ShowS #

Show UTF16_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF16

Methods

showsPrec :: Int -> UTF16_Invalid -> ShowS #

show :: UTF16_Invalid -> String #

showList :: [UTF16_Invalid] -> ShowS #

Show UTF32_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF32

Methods

showsPrec :: Int -> UTF32_Invalid -> ShowS #

show :: UTF32_Invalid -> String #

showList :: [UTF32_Invalid] -> ShowS #

Show FileSize 
Instance details

Defined in Basement.Types.OffsetSize

Show String 
Instance details

Defined in Basement.UTF8.Base

Show ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

Show SizeOverflowException 
Instance details

Defined in Data.ByteString.Internal.Type

Show ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Show ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Show IntSet 
Instance details

Defined in Data.IntSet.Internal

Show BitQueue 
Instance details

Defined in Utils.Containers.Internal.BitQueue

Show BitQueueB 
Instance details

Defined in Utils.Containers.Internal.BitQueue

Show Curve_Edwards25519 
Instance details

Defined in Crypto.ECC

Show Curve_P256R1 
Instance details

Defined in Crypto.ECC

Show Curve_P384R1 
Instance details

Defined in Crypto.ECC

Show Curve_P521R1 
Instance details

Defined in Crypto.ECC

Show Curve_X25519 
Instance details

Defined in Crypto.ECC

Show Curve_X448 
Instance details

Defined in Crypto.ECC

Show CryptoError 
Instance details

Defined in Crypto.Error.Types

Show Blake2b_160 
Instance details

Defined in Crypto.Hash.Blake2b

Show Blake2b_224 
Instance details

Defined in Crypto.Hash.Blake2b

Show Blake2b_256 
Instance details

Defined in Crypto.Hash.Blake2b

Show Blake2b_384 
Instance details

Defined in Crypto.Hash.Blake2b

Show Blake2b_512 
Instance details

Defined in Crypto.Hash.Blake2b

Show Blake2bp_512 
Instance details

Defined in Crypto.Hash.Blake2bp

Show Blake2s_160 
Instance details

Defined in Crypto.Hash.Blake2s

Show Blake2s_224 
Instance details

Defined in Crypto.Hash.Blake2s

Show Blake2s_256 
Instance details

Defined in Crypto.Hash.Blake2s

Show Blake2sp_224 
Instance details

Defined in Crypto.Hash.Blake2sp

Show Blake2sp_256 
Instance details

Defined in Crypto.Hash.Blake2sp

Show Keccak_224 
Instance details

Defined in Crypto.Hash.Keccak

Show Keccak_256 
Instance details

Defined in Crypto.Hash.Keccak

Show Keccak_384 
Instance details

Defined in Crypto.Hash.Keccak

Show Keccak_512 
Instance details

Defined in Crypto.Hash.Keccak

Show MD2 
Instance details

Defined in Crypto.Hash.MD2

Methods

showsPrec :: Int -> MD2 -> ShowS #

show :: MD2 -> String #

showList :: [MD2] -> ShowS #

Show MD4 
Instance details

Defined in Crypto.Hash.MD4

Methods

showsPrec :: Int -> MD4 -> ShowS #

show :: MD4 -> String #

showList :: [MD4] -> ShowS #

Show MD5 
Instance details

Defined in Crypto.Hash.MD5

Methods

showsPrec :: Int -> MD5 -> ShowS #

show :: MD5 -> String #

showList :: [MD5] -> ShowS #

Show RIPEMD160 
Instance details

Defined in Crypto.Hash.RIPEMD160

Show SHA1 
Instance details

Defined in Crypto.Hash.SHA1

Methods

showsPrec :: Int -> SHA1 -> ShowS #

show :: SHA1 -> String #

showList :: [SHA1] -> ShowS #

Show SHA224 
Instance details

Defined in Crypto.Hash.SHA224

Show SHA256 
Instance details

Defined in Crypto.Hash.SHA256

Show SHA3_224 
Instance details

Defined in Crypto.Hash.SHA3

Show SHA3_256 
Instance details

Defined in Crypto.Hash.SHA3

Show SHA3_384 
Instance details

Defined in Crypto.Hash.SHA3

Show SHA3_512 
Instance details

Defined in Crypto.Hash.SHA3

Show SHA384 
Instance details

Defined in Crypto.Hash.SHA384

Show SHA512 
Instance details

Defined in Crypto.Hash.SHA512

Show SHA512t_224 
Instance details

Defined in Crypto.Hash.SHA512t

Show SHA512t_256 
Instance details

Defined in Crypto.Hash.SHA512t

Show Skein256_224 
Instance details

Defined in Crypto.Hash.Skein256

Show Skein256_256 
Instance details

Defined in Crypto.Hash.Skein256

Show Skein512_224 
Instance details

Defined in Crypto.Hash.Skein512

Show Skein512_256 
Instance details

Defined in Crypto.Hash.Skein512

Show Skein512_384 
Instance details

Defined in Crypto.Hash.Skein512

Show Skein512_512 
Instance details

Defined in Crypto.Hash.Skein512

Show Tiger 
Instance details

Defined in Crypto.Hash.Tiger

Methods

showsPrec :: Int -> Tiger -> ShowS #

show :: Tiger -> String #

showList :: [Tiger] -> ShowS #

Show Whirlpool 
Instance details

Defined in Crypto.Hash.Whirlpool

Show CryptoError 
Instance details

Defined in Crypto.Error.Types

Show Blake2b_160 
Instance details

Defined in Crypto.Hash.Blake2b

Show Blake2b_224 
Instance details

Defined in Crypto.Hash.Blake2b

Show Blake2b_256 
Instance details

Defined in Crypto.Hash.Blake2b

Show Blake2b_384 
Instance details

Defined in Crypto.Hash.Blake2b

Show Blake2b_512 
Instance details

Defined in Crypto.Hash.Blake2b

Show Blake2bp_512 
Instance details

Defined in Crypto.Hash.Blake2bp

Show Blake2s_160 
Instance details

Defined in Crypto.Hash.Blake2s

Show Blake2s_224 
Instance details

Defined in Crypto.Hash.Blake2s

Show Blake2s_256 
Instance details

Defined in Crypto.Hash.Blake2s

Show Blake2sp_224 
Instance details

Defined in Crypto.Hash.Blake2sp

Show Blake2sp_256 
Instance details

Defined in Crypto.Hash.Blake2sp

Show Keccak_224 
Instance details

Defined in Crypto.Hash.Keccak

Show Keccak_256 
Instance details

Defined in Crypto.Hash.Keccak

Show Keccak_384 
Instance details

Defined in Crypto.Hash.Keccak

Show Keccak_512 
Instance details

Defined in Crypto.Hash.Keccak

Show MD2 
Instance details

Defined in Crypto.Hash.MD2

Methods

showsPrec :: Int -> MD2 -> ShowS #

show :: MD2 -> String #

showList :: [MD2] -> ShowS #

Show MD4 
Instance details

Defined in Crypto.Hash.MD4

Methods

showsPrec :: Int -> MD4 -> ShowS #

show :: MD4 -> String #

showList :: [MD4] -> ShowS #

Show MD5 
Instance details

Defined in Crypto.Hash.MD5

Methods

showsPrec :: Int -> MD5 -> ShowS #

show :: MD5 -> String #

showList :: [MD5] -> ShowS #

Show RIPEMD160 
Instance details

Defined in Crypto.Hash.RIPEMD160

Show SHA1 
Instance details

Defined in Crypto.Hash.SHA1

Methods

showsPrec :: Int -> SHA1 -> ShowS #

show :: SHA1 -> String #

showList :: [SHA1] -> ShowS #

Show SHA224 
Instance details

Defined in Crypto.Hash.SHA224

Show SHA256 
Instance details

Defined in Crypto.Hash.SHA256

Show SHA3_224 
Instance details

Defined in Crypto.Hash.SHA3

Show SHA3_256 
Instance details

Defined in Crypto.Hash.SHA3

Show SHA3_384 
Instance details

Defined in Crypto.Hash.SHA3

Show SHA3_512 
Instance details

Defined in Crypto.Hash.SHA3

Show SHA384 
Instance details

Defined in Crypto.Hash.SHA384

Show SHA512 
Instance details

Defined in Crypto.Hash.SHA512

Show SHA512t_224 
Instance details

Defined in Crypto.Hash.SHA512t

Show SHA512t_256 
Instance details

Defined in Crypto.Hash.SHA512t

Show Skein256_224 
Instance details

Defined in Crypto.Hash.Skein256

Show Skein256_256 
Instance details

Defined in Crypto.Hash.Skein256

Show Skein512_224 
Instance details

Defined in Crypto.Hash.Skein512

Show Skein512_256 
Instance details

Defined in Crypto.Hash.Skein512

Show Skein512_384 
Instance details

Defined in Crypto.Hash.Skein512

Show Skein512_512 
Instance details

Defined in Crypto.Hash.Skein512

Show Tiger 
Instance details

Defined in Crypto.Hash.Tiger

Methods

showsPrec :: Int -> Tiger -> ShowS #

show :: Tiger -> String #

showList :: [Tiger] -> ShowS #

Show Whirlpool 
Instance details

Defined in Crypto.Hash.Whirlpool

Show SQLData 
Instance details

Defined in Database.SQLite3

Show SQLError 
Instance details

Defined in Database.SQLite3

Show SQLOpenFlag 
Instance details

Defined in Database.SQLite3

Show SQLVFS 
Instance details

Defined in Database.SQLite3

Show ArgCount

This just shows the underlying integer, without the data constructor.

Instance details

Defined in Database.SQLite3.Bindings.Types

Show CArgCount

This just shows the underlying integer, without the data constructor.

Instance details

Defined in Database.SQLite3.Bindings.Types

Show CColumnIndex

This just shows the underlying integer, without the data constructor.

Instance details

Defined in Database.SQLite3.Bindings.Types

Show CColumnType 
Instance details

Defined in Database.SQLite3.Bindings.Types

Show CError 
Instance details

Defined in Database.SQLite3.Bindings.Types

Show CNumBytes 
Instance details

Defined in Database.SQLite3.Bindings.Types

Show CParamIndex

This just shows the underlying integer, without the data constructor.

Instance details

Defined in Database.SQLite3.Bindings.Types

Show ColumnIndex

This just shows the underlying integer, without the data constructor.

Instance details

Defined in Database.SQLite3.Bindings.Types

Show ColumnType 
Instance details

Defined in Database.SQLite3.Bindings.Types

Show Error 
Instance details

Defined in Database.SQLite3.Bindings.Types

Methods

showsPrec :: Int -> Error -> ShowS #

show :: Error -> String #

showList :: [Error] -> ShowS #

Show ParamIndex

This just shows the underlying integer, without the data constructor.

Instance details

Defined in Database.SQLite3.Bindings.Types

Show Format 
Instance details

Defined in Fmt.Internal.Template

Show Label 
Instance details

Defined in GHC.Cmm.Dataflow.Label

Methods

showsPrec :: Int -> Label -> ShowS #

show :: Label -> String #

showList :: [Label] -> ShowS #

Show LabelSet 
Instance details

Defined in GHC.Cmm.Dataflow.Label

Show ExtMode 
Instance details

Defined in GHC.CmmToAsm.AArch64.Instr

Show Operand 
Instance details

Defined in GHC.CmmToAsm.AArch64.Instr

Show ShiftMode 
Instance details

Defined in GHC.CmmToAsm.AArch64.Instr

Show FastString 
Instance details

Defined in GHC.Data.FastString

Show LexicalFastString 
Instance details

Defined in GHC.Data.FastString

Show NonDetFastString 
Instance details

Defined in GHC.Data.FastString

Show Word64Set 
Instance details

Defined in GHC.Data.Word64Set.Internal

Show DynamicTooState 
Instance details

Defined in GHC.Driver.DynFlags

Show GhcLink 
Instance details

Defined in GHC.Driver.DynFlags

Show IncludeSpecs 
Instance details

Defined in GHC.Driver.DynFlags

Show PackageArg 
Instance details

Defined in GHC.Driver.DynFlags

Show RtsOptsEnabled 
Instance details

Defined in GHC.Driver.DynFlags

Show PmEquality 
Instance details

Defined in GHC.HsToCore.Pmc.Solver.Types

Show Ident 
Instance details

Defined in GHC.JS.Ident

Methods

showsPrec :: Int -> Ident -> ShowS #

show :: Ident -> String #

showList :: [Ident] -> ShowS #

Show AOp 
Instance details

Defined in GHC.JS.JStg.Syntax

Methods

showsPrec :: Int -> AOp -> ShowS #

show :: AOp -> String #

showList :: [AOp] -> ShowS #

Show Op 
Instance details

Defined in GHC.JS.JStg.Syntax

Methods

showsPrec :: Int -> Op -> ShowS #

show :: Op -> String #

showList :: [Op] -> ShowS #

Show UOp 
Instance details

Defined in GHC.JS.JStg.Syntax

Methods

showsPrec :: Int -> UOp -> ShowS #

show :: UOp -> String #

showList :: [UOp] -> ShowS #

Show AOp 
Instance details

Defined in GHC.JS.Syntax

Methods

showsPrec :: Int -> AOp -> ShowS #

show :: AOp -> String #

showList :: [AOp] -> ShowS #

Show Op 
Instance details

Defined in GHC.JS.Syntax

Methods

showsPrec :: Int -> Op -> ShowS #

show :: Op -> String #

showList :: [Op] -> ShowS #

Show UOp 
Instance details

Defined in GHC.JS.Syntax

Methods

showsPrec :: Int -> UOp -> ShowS #

show :: UOp -> String #

showList :: [UOp] -> ShowS #

Show AnnKeywordId 
Instance details

Defined in GHC.Parser.Annotation

Show BindTag 
Instance details

Defined in GHC.Parser.Annotation

Show DeclTag 
Instance details

Defined in GHC.Parser.Annotation

Show EpaComment 
Instance details

Defined in GHC.Parser.Annotation

Show EpaCommentTok 
Instance details

Defined in GHC.Parser.Annotation

Show HasE 
Instance details

Defined in GHC.Parser.Annotation

Methods

showsPrec :: Int -> HasE -> ShowS #

show :: HasE -> String #

showList :: [HasE] -> ShowS #

Show IsUnicodeSyntax 
Instance details

Defined in GHC.Parser.Annotation

Show ParenType 
Instance details

Defined in GHC.Parser.Annotation

Show LexErrKind 
Instance details

Defined in GHC.Parser.Errors.Types

Show NumUnderscoreReason 
Instance details

Defined in GHC.Parser.Errors.Types

Show ObjectKind 
Instance details

Defined in GHC.StgToJS.Object

Show HasKinds 
Instance details

Defined in GHC.Tc.Errors.Types

Show SuggestPartialTypeSignatures 
Instance details

Defined in GHC.Tc.Errors.Types

Show SuggestUndecidableInstances 
Instance details

Defined in GHC.Tc.Errors.Types

Show InlineSpec 
Instance details

Defined in GHC.Types.Basic

Show Levity 
Instance details

Defined in GHC.Types.Basic

Show PprPrec 
Instance details

Defined in GHC.Types.Basic

Show RuleMatchInfo 
Instance details

Defined in GHC.Types.Basic

Show DiagnosticCode 
Instance details

Defined in GHC.Types.Error

Show DiagnosticReason 
Instance details

Defined in GHC.Types.Error

Show Severity 
Instance details

Defined in GHC.Types.Error

Show DuplicateRecordFields 
Instance details

Defined in GHC.Types.FieldLabel

Show FieldSelectors 
Instance details

Defined in GHC.Types.FieldLabel

Show FieldsOrSelectors 
Instance details

Defined in GHC.Types.Name.Reader

Show SaneDouble 
Instance details

Defined in GHC.Types.SaneDouble

Show FractionalExponentBase 
Instance details

Defined in GHC.Types.SourceText

Show FractionalLit 
Instance details

Defined in GHC.Types.SourceText

Show IntegralLit 
Instance details

Defined in GHC.Types.SourceText

Show SourceText 
Instance details

Defined in GHC.Types.SourceText

Show BufPos 
Instance details

Defined in GHC.Types.SrcLoc

Show BufSpan 
Instance details

Defined in GHC.Types.SrcLoc

Show DeltaPos 
Instance details

Defined in GHC.Types.SrcLoc

Show NoComments 
Instance details

Defined in GHC.Types.SrcLoc

Show PsLoc 
Instance details

Defined in GHC.Types.SrcLoc

Methods

showsPrec :: Int -> PsLoc -> ShowS #

show :: PsLoc -> String #

showList :: [PsLoc] -> ShowS #

Show PsSpan 
Instance details

Defined in GHC.Types.SrcLoc

Show RealSrcLoc 
Instance details

Defined in GHC.Types.SrcLoc

Show RealSrcSpan 
Instance details

Defined in GHC.Types.SrcLoc

Show SrcLoc 
Instance details

Defined in GHC.Types.SrcLoc

Show SrcSpan 
Instance details

Defined in GHC.Types.SrcLoc

Show UnhelpfulSpanReason 
Instance details

Defined in GHC.Types.SrcLoc

Show TickishPlacement 
Instance details

Defined in GHC.Types.Tickish

Show ModLocation 
Instance details

Defined in GHC.Unit.Module.Location

Show WarningCategory 
Instance details

Defined in GHC.Unit.Module.Warnings

Show Unit 
Instance details

Defined in GHC.Unit.Types

Methods

showsPrec :: Int -> Unit -> ShowS #

show :: Unit -> String #

showList :: [Unit] -> ShowS #

Show Doc 
Instance details

Defined in GHC.Utils.Ppr

Methods

showsPrec :: Int -> Doc -> ShowS #

show :: Doc -> String #

showList :: [Doc] -> ShowS #

Show SpliceDecoration 
Instance details

Defined in Language.Haskell.Syntax.Decls

Show ModuleName 
Instance details

Defined in Language.Haskell.Syntax.Module.Name

Show ForeignSrcLang 
Instance details

Defined in GHC.ForeignSrcLang.Type

Show Extension 
Instance details

Defined in GHC.LanguageExtensions.Type

Show Box 
Instance details

Defined in GHC.Exts.Heap.Closures

Methods

showsPrec :: Int -> Box -> ShowS #

show :: Box -> String #

showList :: [Box] -> ShowS #

Show PrimType 
Instance details

Defined in GHC.Exts.Heap.Closures

Show TsoFlags 
Instance details

Defined in GHC.Exts.Heap.Closures

Show WhatNext 
Instance details

Defined in GHC.Exts.Heap.Closures

Show WhyBlocked 
Instance details

Defined in GHC.Exts.Heap.Closures

Show StgInfoTable 
Instance details

Defined in GHC.Exts.Heap.InfoTable.Types

Show CostCentre 
Instance details

Defined in GHC.Exts.Heap.ProfInfo.Types

Show CostCentreStack 
Instance details

Defined in GHC.Exts.Heap.ProfInfo.Types

Show IndexTable 
Instance details

Defined in GHC.Exts.Heap.ProfInfo.Types

Show StgTSOProfInfo 
Instance details

Defined in GHC.Exts.Heap.ProfInfo.Types

Show Void

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> Void -> ShowS #

show :: Void -> String #

showList :: [Void] -> ShowS #

Show ByteOrder

@since base-4.11.0.0

Instance details

Defined in GHC.Internal.ByteOrder

Show ClosureType 
Instance details

Defined in GHC.Internal.ClosureTypes

Show BlockReason

@since base-4.3.0.0

Instance details

Defined in GHC.Internal.Conc.Sync

Show ThreadId

@since base-4.2.0.0

Instance details

Defined in GHC.Internal.Conc.Sync

Show ThreadStatus

@since base-4.3.0.0

Instance details

Defined in GHC.Internal.Conc.Sync

Show Constr

@since base-4.0.0.0

Instance details

Defined in GHC.Internal.Data.Data

Show ConstrRep

@since base-4.0.0.0

Instance details

Defined in GHC.Internal.Data.Data

Show DataRep

@since base-4.0.0.0

Instance details

Defined in GHC.Internal.Data.Data

Show DataType

@since base-4.0.0.0

Instance details

Defined in GHC.Internal.Data.Data

Show Fixity

@since base-4.0.0.0

Instance details

Defined in GHC.Internal.Data.Data

Show All

@since base-2.01

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

showsPrec :: Int -> All -> ShowS #

show :: All -> String #

showList :: [All] -> ShowS #

Show Any

@since base-2.01

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

showsPrec :: Int -> Any -> ShowS #

show :: Any -> String #

showList :: [Any] -> ShowS #

Show SomeTypeRep

@since base-4.10.0.0

Instance details

Defined in GHC.Internal.Data.Typeable.Internal

Show Version

@since base-2.01

Instance details

Defined in GHC.Internal.Data.Version

Show ArithException

@since base-4.0.0.0

Instance details

Defined in GHC.Internal.Exception.Type

Show SomeException

Since: ghc-internal-3.0

Instance details

Defined in GHC.Internal.Exception.Type

Show CBool 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

showsPrec :: Int -> CBool -> ShowS #

show :: CBool -> String #

showList :: [CBool] -> ShowS #

Show CChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

showsPrec :: Int -> CChar -> ShowS #

show :: CChar -> String #

showList :: [CChar] -> ShowS #

Show CClock 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Show CDouble 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Show CFloat 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Show CInt 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

showsPrec :: Int -> CInt -> ShowS #

show :: CInt -> String #

showList :: [CInt] -> ShowS #

Show CIntMax 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Show CIntPtr 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Show CLLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Show CLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

showsPrec :: Int -> CLong -> ShowS #

show :: CLong -> String #

showList :: [CLong] -> ShowS #

Show CPtrdiff 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Show CSChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Show CSUSeconds 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Show CShort 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Show CSigAtomic 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Show CSize 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

showsPrec :: Int -> CSize -> ShowS #

show :: CSize -> String #

showList :: [CSize] -> ShowS #

Show CTime 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

showsPrec :: Int -> CTime -> ShowS #

show :: CTime -> String #

showList :: [CTime] -> ShowS #

Show CUChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Show CUInt 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

showsPrec :: Int -> CUInt -> ShowS #

show :: CUInt -> String #

showList :: [CUInt] -> ShowS #

Show CUIntMax 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Show CUIntPtr 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Show CULLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Show CULong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Show CUSeconds 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Show CUShort 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Show CWchar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Show Associativity

@since base-4.6.0.0

Instance details

Defined in GHC.Internal.Generics

Show DecidedStrictness

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Show Fixity

@since base-4.6.0.0

Instance details

Defined in GHC.Internal.Generics

Show SourceStrictness

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Show SourceUnpackedness

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Show MaskingState

@since base-4.3.0.0

Instance details

Defined in GHC.Internal.IO

Show AllocationLimitExceeded

@since base-4.7.1.0

Instance details

Defined in GHC.Internal.IO.Exception

Show ArrayException

@since base-4.1.0.0

Instance details

Defined in GHC.Internal.IO.Exception

Show AssertionFailed

@since base-4.1.0.0

Instance details

Defined in GHC.Internal.IO.Exception

Show AsyncException

@since base-4.1.0.0

Instance details

Defined in GHC.Internal.IO.Exception

Show BlockedIndefinitelyOnMVar

@since base-4.1.0.0

Instance details

Defined in GHC.Internal.IO.Exception

Show BlockedIndefinitelyOnSTM

@since base-4.1.0.0

Instance details

Defined in GHC.Internal.IO.Exception

Show CompactionFailed

@since base-4.10.0.0

Instance details

Defined in GHC.Internal.IO.Exception

Show Deadlock

@since base-4.1.0.0

Instance details

Defined in GHC.Internal.IO.Exception

Show ExitCode 
Instance details

Defined in GHC.Internal.IO.Exception

Show FixIOException

@since base-4.11.0.0

Instance details

Defined in GHC.Internal.IO.Exception

Show IOErrorType

@since base-4.1.0.0

Instance details

Defined in GHC.Internal.IO.Exception

Show IOException

@since base-4.1.0.0

Instance details

Defined in GHC.Internal.IO.Exception

Show SomeAsyncException

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.IO.Exception

Show BufferMode

@since base-4.2.0.0

Instance details

Defined in GHC.Internal.IO.Handle.Types

Show Handle

@since base-4.1.0.0

Instance details

Defined in GHC.Internal.IO.Handle.Types

Show HandleType

@since base-4.1.0.0

Instance details

Defined in GHC.Internal.IO.Handle.Types

Show Newline

@since base-4.3.0.0

Instance details

Defined in GHC.Internal.IO.Handle.Types

Show NewlineMode

@since base-4.3.0.0

Instance details

Defined in GHC.Internal.IO.Handle.Types

Show IOMode

@since base-4.2.0.0

Instance details

Defined in GHC.Internal.IO.IOMode

Show Int16

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Methods

showsPrec :: Int -> Int16 -> ShowS #

show :: Int16 -> String #

showList :: [Int16] -> ShowS #

Show Int32

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Methods

showsPrec :: Int -> Int32 -> ShowS #

show :: Int32 -> String #

showList :: [Int32] -> ShowS #

Show Int64

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Methods

showsPrec :: Int -> Int64 -> ShowS #

show :: Int64 -> String #

showList :: [Int64] -> ShowS #

Show Int8

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Methods

showsPrec :: Int -> Int8 -> ShowS #

show :: Int8 -> String #

showList :: [Int8] -> ShowS #

Show CCFlags

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.RTS.Flags

Show ConcFlags

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.RTS.Flags

Show DebugFlags

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.RTS.Flags

Show DoCostCentres

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.RTS.Flags

Show DoHeapProfile

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.RTS.Flags

Show DoTrace

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.RTS.Flags

Show GCFlags

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.RTS.Flags

Show GiveGCStats

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.RTS.Flags

Show HpcFlags

@since base-4.20.0.0

Instance details

Defined in GHC.Internal.RTS.Flags

Show IoSubSystem 
Instance details

Defined in GHC.Internal.RTS.Flags

Show MiscFlags

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.RTS.Flags

Show ParFlags

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.RTS.Flags

Show ProfFlags

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.RTS.Flags

Show RTSFlags

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.RTS.Flags

Show TickyFlags

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.RTS.Flags

Show TraceFlags

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.RTS.Flags

Show FractionalExponentBase 
Instance details

Defined in GHC.Internal.Real

Show CallStack

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Show

Show SrcLoc

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Show

Show CBlkCnt 
Instance details

Defined in GHC.Internal.System.Posix.Types

Show CBlkSize 
Instance details

Defined in GHC.Internal.System.Posix.Types

Show CCc 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

showsPrec :: Int -> CCc -> ShowS #

show :: CCc -> String #

showList :: [CCc] -> ShowS #

Show CClockId 
Instance details

Defined in GHC.Internal.System.Posix.Types

Show CDev 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

showsPrec :: Int -> CDev -> ShowS #

show :: CDev -> String #

showList :: [CDev] -> ShowS #

Show CFsBlkCnt 
Instance details

Defined in GHC.Internal.System.Posix.Types

Show CFsFilCnt 
Instance details

Defined in GHC.Internal.System.Posix.Types

Show CGid 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

showsPrec :: Int -> CGid -> ShowS #

show :: CGid -> String #

showList :: [CGid] -> ShowS #

Show CId 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

showsPrec :: Int -> CId -> ShowS #

show :: CId -> String #

showList :: [CId] -> ShowS #

Show CIno 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

showsPrec :: Int -> CIno -> ShowS #

show :: CIno -> String #

showList :: [CIno] -> ShowS #

Show CKey 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

showsPrec :: Int -> CKey -> ShowS #

show :: CKey -> String #

showList :: [CKey] -> ShowS #

Show CMode 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

showsPrec :: Int -> CMode -> ShowS #

show :: CMode -> String #

showList :: [CMode] -> ShowS #

Show CNfds 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

showsPrec :: Int -> CNfds -> ShowS #

show :: CNfds -> String #

showList :: [CNfds] -> ShowS #

Show CNlink 
Instance details

Defined in GHC.Internal.System.Posix.Types

Show COff 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

showsPrec :: Int -> COff -> ShowS #

show :: COff -> String #

showList :: [COff] -> ShowS #

Show CPid 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

showsPrec :: Int -> CPid -> ShowS #

show :: CPid -> String #

showList :: [CPid] -> ShowS #

Show CRLim 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

showsPrec :: Int -> CRLim -> ShowS #

show :: CRLim -> String #

showList :: [CRLim] -> ShowS #

Show CSocklen 
Instance details

Defined in GHC.Internal.System.Posix.Types

Show CSpeed 
Instance details

Defined in GHC.Internal.System.Posix.Types

Show CSsize 
Instance details

Defined in GHC.Internal.System.Posix.Types

Show CTcflag 
Instance details

Defined in GHC.Internal.System.Posix.Types

Show CTimer 
Instance details

Defined in GHC.Internal.System.Posix.Types

Show CUid 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

showsPrec :: Int -> CUid -> ShowS #

show :: CUid -> String #

showList :: [CUid] -> ShowS #

Show Fd 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

showsPrec :: Int -> Fd -> ShowS #

show :: Fd -> String #

showList :: [Fd] -> ShowS #

Show SomeNat

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.TypeNats

Show GeneralCategory

@since base-2.01

Instance details

Defined in GHC.Internal.Unicode

Show Word16

@since base-2.01

Instance details

Defined in GHC.Internal.Word

Show Word32

@since base-2.01

Instance details

Defined in GHC.Internal.Word

Show Word64

@since base-2.01

Instance details

Defined in GHC.Internal.Word

Show Word8

@since base-2.01

Instance details

Defined in GHC.Internal.Word

Methods

showsPrec :: Int -> Word8 -> ShowS #

show :: Word8 -> String #

showList :: [Word8] -> ShowS #

Show KindRep 
Instance details

Defined in GHC.Internal.Show

Show Module

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Show

Show Ordering

@since base-2.01

Instance details

Defined in GHC.Internal.Show

Show TrName

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Show

Show TyCon

@since base-2.01

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> TyCon -> ShowS #

show :: TyCon -> String #

showList :: [TyCon] -> ShowS #

Show TypeLitSort

@since base-4.11.0.0

Instance details

Defined in GHC.Internal.Show

Show FFIConv 
Instance details

Defined in GHCi.FFI

Show FFIType 
Instance details

Defined in GHCi.FFI

Show EvalBreakpoint 
Instance details

Defined in GHCi.Message

Show EvalOpts 
Instance details

Defined in GHCi.Message

Show QState 
Instance details

Defined in GHCi.Message

Show SerializableException 
Instance details

Defined in GHCi.Message

Show THResultType 
Instance details

Defined in GHCi.Message

Show HValue 
Instance details

Defined in GHCi.RemoteTypes

Show ResolvedBCO 
Instance details

Defined in GHCi.ResolvedBCO

Show ResolvedBCOPtr 
Instance details

Defined in GHCi.ResolvedBCO

Show AuthError 
Instance details

Defined in Gogol.Internal.Auth

Show AuthorizedUser 
Instance details

Defined in Gogol.Internal.Auth

Show OAuthClient 
Instance details

Defined in Gogol.Internal.Auth

Show ServiceAccount 
Instance details

Defined in Gogol.Internal.Auth

Show BigQueryDatasetsDelete 
Instance details

Defined in Gogol.BigQuery.Datasets.Delete

Show BigQueryDatasetsGet 
Instance details

Defined in Gogol.BigQuery.Datasets.Get

Show BigQueryDatasetsInsert 
Instance details

Defined in Gogol.BigQuery.Datasets.Insert

Show BigQueryDatasetsList 
Instance details

Defined in Gogol.BigQuery.Datasets.List

Show BigQueryDatasetsPatch 
Instance details

Defined in Gogol.BigQuery.Datasets.Patch

Show BigQueryDatasetsUpdate 
Instance details

Defined in Gogol.BigQuery.Datasets.Update

Show AggregateClassificationMetrics 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show Argument 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show ArimaCoefficients 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show ArimaFittingMetrics 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show ArimaForecastingMetrics 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show ArimaModelInfo 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show ArimaOrder 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show ArimaResult 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show ArimaSingleModelForecastingMetrics 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show AuditConfig 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show AuditLogConfig 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show AvroOptions 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show BiEngineReason 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show BiEngineStatistics 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show BigQueryModelTraining 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show BigtableColumn 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show BigtableColumnFamily 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show BigtableOptions 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show BinaryClassificationMetrics 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show BinaryConfusionMatrix 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show Binding 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show BqmlIterationResult 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show BqmlTrainingRun 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show BqmlTrainingRun_TrainingOptions 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show CategoricalValue 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show CategoryCount 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show CloneDefinition 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show Cluster 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show ClusterInfo 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show Clustering 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show ClusteringMetrics 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show ConfusionMatrix 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show ConnectionProperty 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show CsvOptions 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show DataMaskingStatistics 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show DataSplitResult 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show Dataset 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show DatasetAccessEntry 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show DatasetList 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show DatasetList_DatasetsItem 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show DatasetList_DatasetsItem_Labels 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show DatasetReference 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show Dataset_AccessItem 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show Dataset_Labels 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show Dataset_TagsItem 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show DestinationTableProperties 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show DestinationTableProperties_Labels 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show DimensionalityReductionMetrics 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show DmlStatistics 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show DoubleCandidates 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show DoubleHparamSearchSpace 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show DoubleRange 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show EncryptionConfiguration 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show Entry 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Methods

showsPrec :: Int -> Entry -> ShowS #

show :: Entry -> String #

showList :: [Entry] -> ShowS #

Show ErrorProto 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show EvaluationMetrics 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show ExplainQueryStage 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show ExplainQueryStep 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show Explanation 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show Expr 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Methods

showsPrec :: Int -> Expr -> ShowS #

show :: Expr -> String #

showList :: [Expr] -> ShowS #

Show ExternalDataConfiguration 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show FeatureValue 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show GetIamPolicyRequest 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show GetPolicyOptions 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show GetQueryResultsResponse 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show GetServiceAccountResponse 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show GlobalExplanation 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show GoogleSheetsOptions 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show HivePartitioningOptions 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show HparamSearchSpaces 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show HparamTuningTrial 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show IndexUnusedReason 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show IntArray 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show IntArrayHparamSearchSpace 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show IntCandidates 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show IntHparamSearchSpace 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show IntRange 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show IterationResult 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show Job 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Methods

showsPrec :: Int -> Job -> ShowS #

show :: Job -> String #

showList :: [Job] -> ShowS #

Show JobCancelResponse 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show JobConfiguration 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show JobConfigurationExtract 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show JobConfigurationLoad 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show JobConfigurationQuery 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show JobConfigurationQuery_TableDefinitions 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show JobConfigurationTableCopy 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show JobConfiguration_Labels 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show JobList 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show JobList_JobsItem 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show JobReference 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show JobStatistics 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show JobStatistics2 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show JobStatistics2_ReservationUsageItem 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show JobStatistics3 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show JobStatistics4 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show JobStatistics5 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show JobStatistics_ReservationUsageItem 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show JobStatus 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show JsonObject 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show ListModelsResponse 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show ListRoutinesResponse 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show ListRowAccessPoliciesResponse 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show LocationMetadata 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show MaterializedViewDefinition 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show MlStatistics 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show Model 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Methods

showsPrec :: Int -> Model -> ShowS #

show :: Model -> String #

showList :: [Model] -> ShowS #

Show ModelDefinition 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show ModelDefinition_ModelOptions 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show ModelReference 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show Model_Labels 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show MultiClassClassificationMetrics 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show ParquetOptions 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show Policy 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show PrincipalComponentInfo 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show ProjectList 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show ProjectList_ProjectsItem 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show ProjectReference 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show QueryParameter 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show QueryParameterType 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show QueryParameterType_StructTypesItem 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show QueryParameterValue 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show QueryParameterValue_StructValues 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show QueryRequest 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show QueryRequest_Labels 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show QueryResponse 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show QueryTimelineSample 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show RangePartitioning 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show RangePartitioning_Range 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show RankingMetrics 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show RegressionMetrics 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show RemoteFunctionOptions 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show RemoteFunctionOptions_UserDefinedContext 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show Routine 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show RoutineReference 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show Row 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Methods

showsPrec :: Int -> Row -> ShowS #

show :: Row -> String #

showList :: [Row] -> ShowS #

Show RowAccessPolicy 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show RowAccessPolicyReference 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show RowLevelSecurityStatistics 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show ScriptStackFrame 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show ScriptStatistics 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show SearchStatistics 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show SessionInfo 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show SetIamPolicyRequest 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show SnapshotDefinition 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show SparkLoggingInfo 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show SparkOptions 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show SparkOptions_Properties 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show SparkStatistics 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show SparkStatistics_Endpoints 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show StandardSqlDataType 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show StandardSqlField 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show StandardSqlStructType 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show StandardSqlTableType 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show Streamingbuffer 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show StringHparamSearchSpace 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show Table 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Methods

showsPrec :: Int -> Table -> ShowS #

show :: Table -> String #

showList :: [Table] -> ShowS #

Show TableCell 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show TableDataInsertAllRequest 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show TableDataInsertAllRequest_RowsItem 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show TableDataInsertAllResponse 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show TableDataInsertAllResponse_InsertErrorsItem 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show TableDataList 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show TableFieldSchema 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show TableFieldSchema_Categories 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show TableFieldSchema_PolicyTags 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show TableList 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show TableList_TablesItem 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show TableList_TablesItem_Labels 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show TableList_TablesItem_View 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show TableReference 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show TableRow 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show TableSchema 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show Table_Labels 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show TestIamPermissionsRequest 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show TestIamPermissionsResponse 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show TimePartitioning 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show TrainingOptions 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show TrainingOptions_LabelClassWeights 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show TrainingRun 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show TransactionInfo 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show UserDefinedFunctionResource 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show ViewDefinition 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Show Argument_ArgumentKind 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Show Argument_Mode 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Show ArimaForecastingMetrics_SeasonalPeriodsItem 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Show ArimaModelInfo_SeasonalPeriodsItem 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Show ArimaResult_SeasonalPeriodsItem 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Show ArimaSingleModelForecastingMetrics_SeasonalPeriodsItem 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Show AuditLogConfig_LogType 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Show DatasetAccessEntry_TargetTypesItem 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Show HparamTuningTrial_Status 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Show JobsListProjection 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Show JobsListStateFilter 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Show Model_ModelType 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Show Routine_DeterminismLevel 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Show Routine_Language 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Show Routine_RoutineType 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Show StandardSqlDataType_TypeKind 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Show TablesGetView 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Show TrainingOptions_BoosterType 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Show TrainingOptions_ColorSpace 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Show TrainingOptions_DartNormalizeType 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Show TrainingOptions_DataFrequency 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Show TrainingOptions_DataSplitMethod 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Show TrainingOptions_DistanceType 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Show TrainingOptions_FeedbackType 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Show TrainingOptions_HolidayRegion 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Show TrainingOptions_HparamTuningObjectivesItem 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Show TrainingOptions_KmeansInitializationMethod 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Show TrainingOptions_LearnRateStrategy 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Show TrainingOptions_LossType 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Show TrainingOptions_OptimizationStrategy 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Show TrainingOptions_TreeMethod 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Show BigQueryJobsCancel 
Instance details

Defined in Gogol.BigQuery.Jobs.Cancel

Show BigQueryJobsDelete 
Instance details

Defined in Gogol.BigQuery.Jobs.Delete

Show BigQueryJobsGet 
Instance details

Defined in Gogol.BigQuery.Jobs.Get

Show BigQueryJobsGetQueryResults 
Instance details

Defined in Gogol.BigQuery.Jobs.GetQueryResults

Show BigQueryJobsInsert 
Instance details

Defined in Gogol.BigQuery.Jobs.Insert

Show BigQueryJobsList 
Instance details

Defined in Gogol.BigQuery.Jobs.List

Show BigQueryJobsQuery 
Instance details

Defined in Gogol.BigQuery.Jobs.Query

Show BigQueryModelsDelete 
Instance details

Defined in Gogol.BigQuery.Models.Delete

Show BigQueryModelsGet 
Instance details

Defined in Gogol.BigQuery.Models.Get

Show BigQueryModelsList 
Instance details

Defined in Gogol.BigQuery.Models.List

Show BigQueryModelsPatch 
Instance details

Defined in Gogol.BigQuery.Models.Patch

Show BigQueryProjectsGetServiceAccount 
Instance details

Defined in Gogol.BigQuery.Projects.GetServiceAccount

Show BigQueryProjectsList 
Instance details

Defined in Gogol.BigQuery.Projects.List

Show BigQueryRoutinesDelete 
Instance details

Defined in Gogol.BigQuery.Routines.Delete

Show BigQueryRoutinesGet 
Instance details

Defined in Gogol.BigQuery.Routines.Get

Show BigQueryRoutinesInsert 
Instance details

Defined in Gogol.BigQuery.Routines.Insert

Show BigQueryRoutinesList 
Instance details

Defined in Gogol.BigQuery.Routines.List

Show BigQueryRoutinesUpdate 
Instance details

Defined in Gogol.BigQuery.Routines.Update

Show BigQueryRowAccessPoliciesGetIamPolicy 
Instance details

Defined in Gogol.BigQuery.RowAccessPolicies.GetIamPolicy

Show BigQueryRowAccessPoliciesList 
Instance details

Defined in Gogol.BigQuery.RowAccessPolicies.List

Show BigQueryRowAccessPoliciesSetIamPolicy 
Instance details

Defined in Gogol.BigQuery.RowAccessPolicies.SetIamPolicy

Show BigQueryRowAccessPoliciesTestIamPermissions 
Instance details

Defined in Gogol.BigQuery.RowAccessPolicies.TestIamPermissions

Show BigQueryTabledataInsertAll 
Instance details

Defined in Gogol.BigQuery.Tabledata.InsertAll

Show BigQueryTabledataList 
Instance details

Defined in Gogol.BigQuery.Tabledata.List

Show BigQueryTablesDelete 
Instance details

Defined in Gogol.BigQuery.Tables.Delete

Show BigQueryTablesGet 
Instance details

Defined in Gogol.BigQuery.Tables.Get

Show BigQueryTablesGetIamPolicy 
Instance details

Defined in Gogol.BigQuery.Tables.GetIamPolicy

Show BigQueryTablesInsert 
Instance details

Defined in Gogol.BigQuery.Tables.Insert

Show BigQueryTablesList 
Instance details

Defined in Gogol.BigQuery.Tables.List

Show BigQueryTablesPatch 
Instance details

Defined in Gogol.BigQuery.Tables.Patch

Show BigQueryTablesSetIamPolicy 
Instance details

Defined in Gogol.BigQuery.Tables.SetIamPolicy

Show BigQueryTablesTestIamPermissions 
Instance details

Defined in Gogol.BigQuery.Tables.TestIamPermissions

Show BigQueryTablesUpdate 
Instance details

Defined in Gogol.BigQuery.Tables.Update

Show Base64 
Instance details

Defined in Gogol.Data.Base64

Show Date 
Instance details

Defined in Gogol.Data.Time

Methods

showsPrec :: Int -> Date -> ShowS #

show :: Date -> String #

showList :: [Date] -> ShowS #

Show DateTime 
Instance details

Defined in Gogol.Data.Time

Show Duration 
Instance details

Defined in Gogol.Data.Time

Show Time 
Instance details

Defined in Gogol.Data.Time

Methods

showsPrec :: Int -> Time -> ShowS #

show :: Time -> String #

showList :: [Time] -> ShowS #

Show AccessToken 
Instance details

Defined in Gogol.Types

Show AltJSON 
Instance details

Defined in Gogol.Types

Show AltMedia 
Instance details

Defined in Gogol.Types

Show ClientId 
Instance details

Defined in Gogol.Types

Show Error 
Instance details

Defined in Gogol.Types

Methods

showsPrec :: Int -> Error -> ShowS #

show :: Error -> String #

showList :: [Error] -> ShowS #

Show FieldMask 
Instance details

Defined in Gogol.Types

Show GSecret 
Instance details

Defined in Gogol.Types

Show Multipart 
Instance details

Defined in Gogol.Types

Show OAuthScope 
Instance details

Defined in Gogol.Types

Show RefreshToken 
Instance details

Defined in Gogol.Types

Show Seconds 
Instance details

Defined in Gogol.Types

Show SerializeError 
Instance details

Defined in Gogol.Types

Show ServiceError 
Instance details

Defined in Gogol.Types

Show ServiceId 
Instance details

Defined in Gogol.Types

Show SrcLoc 
Instance details

Defined in Language.Haskell.Exts.SrcLoc

Show SrcSpan 
Instance details

Defined in Language.Haskell.Exts.SrcLoc

Show SrcSpanInfo 
Instance details

Defined in Language.Haskell.Exts.SrcLoc

Show Boxed 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Boxed -> ShowS #

show :: Boxed -> String #

showList :: [Boxed] -> ShowS #

Show Tool 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Tool -> ShowS #

show :: Tool -> String #

showList :: [Tool] -> ShowS #

Show AccessToken 
Instance details

Defined in Network.OAuth.OAuth2.Internal

Show ExchangeToken 
Instance details

Defined in Network.OAuth.OAuth2.Internal

Show IdToken 
Instance details

Defined in Network.OAuth.OAuth2.Internal

Show OAuth2 
Instance details

Defined in Network.OAuth.OAuth2.Internal

Show OAuth2Token 
Instance details

Defined in Network.OAuth.OAuth2.Internal

Show RefreshToken 
Instance details

Defined in Network.OAuth.OAuth2.Internal

Show IdpName 
Instance details

Defined in Network.OAuth2.Provider

Show GoogleUser 
Instance details

Defined in Network.OAuth2.Provider.Google

Show Tix 
Instance details

Defined in Trace.Hpc.Tix

Methods

showsPrec :: Int -> Tix -> ShowS #

show :: Tix -> String #

showList :: [Tix] -> ShowS #

Show TixModule 
Instance details

Defined in Trace.Hpc.Tix

Show Hash 
Instance details

Defined in Trace.Hpc.Util

Methods

showsPrec :: Int -> Hash -> ShowS #

show :: Hash -> String #

showList :: [Hash] -> ShowS #

Show HpcPos 
Instance details

Defined in Trace.Hpc.Util

Show Form 
Instance details

Defined in Web.Internal.FormUrlEncoded

Methods

showsPrec :: Int -> Form -> ShowS #

show :: Form -> String #

showList :: [Form] -> ShowS #

Show EncapsulatedPopperException 
Instance details

Defined in Network.HTTP.Client.Request

Methods

showsPrec :: Int -> EncapsulatedPopperException -> ShowS #

show :: EncapsulatedPopperException -> String #

showList :: [EncapsulatedPopperException] -> ShowS #

Show ConnHost 
Instance details

Defined in Network.HTTP.Client.Types

Show ConnKey 
Instance details

Defined in Network.HTTP.Client.Types

Show Cookie 
Instance details

Defined in Network.HTTP.Client.Types

Show CookieJar 
Instance details

Defined in Network.HTTP.Client.Types

Show HttpException 
Instance details

Defined in Network.HTTP.Client.Types

Show HttpExceptionContent 
Instance details

Defined in Network.HTTP.Client.Types

Show HttpExceptionContentWrapper 
Instance details

Defined in Network.HTTP.Client.Types

Methods

showsPrec :: Int -> HttpExceptionContentWrapper -> ShowS #

show :: HttpExceptionContentWrapper -> String #

showList :: [HttpExceptionContentWrapper] -> ShowS #

Show MaxHeaderLength 
Instance details

Defined in Network.HTTP.Client.Types

Show Proxy 
Instance details

Defined in Network.HTTP.Client.Types

Methods

showsPrec :: Int -> Proxy -> ShowS #

show :: Proxy -> String #

showList :: [Proxy] -> ShowS #

Show ProxySecureMode 
Instance details

Defined in Network.HTTP.Client.Types

Show Request 
Instance details

Defined in Network.HTTP.Client.Types

Show ResponseClose 
Instance details

Defined in Network.HTTP.Client.Types

Show ResponseTimeout 
Instance details

Defined in Network.HTTP.Client.Types

Show StatusHeaders 
Instance details

Defined in Network.HTTP.Client.Types

Show StreamFileStatus 
Instance details

Defined in Network.HTTP.Client.Types

Show ByteRange

Since: http-types-0.8.4

Instance details

Defined in Network.HTTP.Types.Header

Show StdMethod 
Instance details

Defined in Network.HTTP.Types.Method

Show Status 
Instance details

Defined in Network.HTTP.Types.Status

Show HttpVersion
>>> show http11
"HTTP/1.1"
Instance details

Defined in Network.HTTP.Types.Version

Show IP 
Instance details

Defined in Data.IP.Addr

Methods

showsPrec :: Int -> IP -> ShowS #

show :: IP -> String #

showList :: [IP] -> ShowS #

Show IPv4 
Instance details

Defined in Data.IP.Addr

Methods

showsPrec :: Int -> IPv4 -> ShowS #

show :: IPv4 -> String #

showList :: [IPv4] -> ShowS #

Show IPv6 
Instance details

Defined in Data.IP.Addr

Methods

showsPrec :: Int -> IPv6 -> ShowS #

show :: IPv6 -> String #

showList :: [IPv6] -> ShowS #

Show IPRange 
Instance details

Defined in Data.IP.Range

Show Alg 
Instance details

Defined in Jose.Jwa

Methods

showsPrec :: Int -> Alg -> ShowS #

show :: Alg -> String #

showList :: [Alg] -> ShowS #

Show Enc 
Instance details

Defined in Jose.Jwa

Methods

showsPrec :: Int -> Enc -> ShowS #

show :: Enc -> String #

showList :: [Enc] -> ShowS #

Show JweAlg 
Instance details

Defined in Jose.Jwa

Show JwsAlg 
Instance details

Defined in Jose.Jwa

Show EcCurve 
Instance details

Defined in Jose.Jwk

Show Jwk 
Instance details

Defined in Jose.Jwk

Methods

showsPrec :: Int -> Jwk -> ShowS #

show :: Jwk -> String #

showList :: [Jwk] -> ShowS #

Show JwkBytes 
Instance details

Defined in Jose.Jwk

Methods

showsPrec :: Int -> JwkBytes -> ShowS #

show :: JwkBytes -> String #

showList :: [JwkBytes] -> ShowS #

Show JwkSet 
Instance details

Defined in Jose.Jwk

Show KeyUse 
Instance details

Defined in Jose.Jwk

Show IntDate 
Instance details

Defined in Jose.Types

Show JweHeader 
Instance details

Defined in Jose.Types

Show JwsHeader 
Instance details

Defined in Jose.Types

Show Jwt 
Instance details

Defined in Jose.Types

Methods

showsPrec :: Int -> Jwt -> ShowS #

show :: Jwt -> String #

showList :: [Jwt] -> ShowS #

Show JwtClaims 
Instance details

Defined in Jose.Types

Show JwtContent 
Instance details

Defined in Jose.Types

Show JwtEncoding 
Instance details

Defined in Jose.Types

Show JwtError 
Instance details

Defined in Jose.Types

Show JwtHeader 
Instance details

Defined in Jose.Types

Show KeyId 
Instance details

Defined in Jose.Types

Methods

showsPrec :: Int -> KeyId -> ShowS #

show :: KeyId -> String #

showList :: [KeyId] -> ShowS #

Show Payload 
Instance details

Defined in Jose.Types

Show Environment 
Instance details

Defined in Katip.Core

Show LocShow 
Instance details

Defined in Katip.Core

Show LogStr 
Instance details

Defined in Katip.Core

Show Namespace 
Instance details

Defined in Katip.Core

Show PayloadSelection 
Instance details

Defined in Katip.Core

Show ScribeSettings 
Instance details

Defined in Katip.Core

Show Severity 
Instance details

Defined in Katip.Core

Show ThreadIdText 
Instance details

Defined in Katip.Core

Show Verbosity 
Instance details

Defined in Katip.Core

Show ColorStrategy 
Instance details

Defined in Katip.Scribes.Handle

Show HandlingException 
Instance details

Defined in Control.Lens.Internal.Exception

Show DefName 
Instance details

Defined in Control.Lens.Internal.FieldTH

Show InvalidPosException 
Instance details

Defined in Text.Megaparsec.Pos

Show Pos 
Instance details

Defined in Text.Megaparsec.Pos

Methods

showsPrec :: Int -> Pos -> ShowS #

show :: Pos -> String #

showList :: [Pos] -> ShowS #

Show SourcePos 
Instance details

Defined in Text.Megaparsec.Pos

Show NullError 
Instance details

Defined in Data.NonNull

Methods

showsPrec :: Int -> NullError -> ShowS #

show :: NullError -> String #

showList :: [NullError] -> ShowS #

Show SpecMetaArgsOpt # 
Instance details

Defined in Napkin.Cli.SpecMetaArgs

Show SpecFileArrayMergeStrategy # 
Instance details

Defined in Napkin.Cli.Types

Show SpecFileWithMergeStrategy # 
Instance details

Defined in Napkin.Cli.Types

Show SpecFilesWithOverrides # 
Instance details

Defined in Napkin.Cli.Types

Show CompareCount # 
Instance details

Defined in Napkin.Run.Effects.Hooks.Types

Show CountTolerance # 
Instance details

Defined in Napkin.Run.Effects.Hooks.Types

Show AddedColumnPolicy # 
Instance details

Defined in Napkin.Run.Effects.Programs

Show DroppedColumnPolicy # 
Instance details

Defined in Napkin.Run.Effects.Programs

Show SchemaMigrationOptions # 
Instance details

Defined in Napkin.Run.Effects.Programs

Show AuthEvalError 
Instance details

Defined in Napkin.Auth.Types

Show Dollars 
Instance details

Defined in Napkin.Run.BigQuery

Show InvalidBigQueryRef 
Instance details

Defined in Napkin.Run.BigQuery.Context

Show BQTableContext 
Instance details

Defined in Napkin.Run.BigQuery.Types

Show BigQueryRunError 
Instance details

Defined in Napkin.Run.BigQuery.Types

Show DatasetIsMissing 
Instance details

Defined in Napkin.Run.BigQuery.Types

Show StarExpansionNotSupported 
Instance details

Defined in Napkin.Run.BigQuery.Types

Show BQDataSetId 
Instance details

Defined in Napkin.Types.BigQuery

Show BQDataSetReference 
Instance details

Defined in Napkin.Types.BigQuery

Show BQProjectId 
Instance details

Defined in Napkin.Types.BigQuery

Show BQTableId 
Instance details

Defined in Napkin.Types.BigQuery

Show BigQueryType 
Instance details

Defined in Napkin.Types.BigQuery

Show MaterializedViewMeta 
Instance details

Defined in Napkin.Types.BigQuery

Show MaterializedViewRefresh 
Instance details

Defined in Napkin.Types.BigQuery

Show PartitionInterval 
Instance details

Defined in Napkin.Types.BigQuery

Show RangeWithStep 
Instance details

Defined in Napkin.Types.BigQuery

Show TableMeta 
Instance details

Defined in Napkin.Types.BigQuery

Show TablePartitioning 
Instance details

Defined in Napkin.Types.BigQuery

Show TimePartitioning 
Instance details

Defined in Napkin.Types.BigQuery

Show ViewMeta 
Instance details

Defined in Napkin.Types.BigQuery

Show WriteDisposition 
Instance details

Defined in Napkin.Types.BigQuery

Show JoinOnPredicate 
Instance details

Defined in Napkin.Types.Commands.BigQuery.Merge

Show Merge 
Instance details

Defined in Napkin.Types.Commands.BigQuery.Merge

Methods

showsPrec :: Int -> Merge -> ShowS #

show :: Merge -> String #

showList :: [Merge] -> ShowS #

Show TableAlias 
Instance details

Defined in Napkin.Types.Commands.BigQuery.Merge

Show WhenMatched 
Instance details

Defined in Napkin.Types.Commands.BigQuery.Merge

Show WhenNotMatched 
Instance details

Defined in Napkin.Types.Commands.BigQuery.Merge

Show JSONPath 
Instance details

Defined in Napkin.Untyped.Ops.BigQuery

Show MsSchemaField 
Instance details

Defined in Napkin.Types.MsSql

Show MsSqlMaterializedViewMeta 
Instance details

Defined in Napkin.Types.MsSql

Show SetTableSchema 
Instance details

Defined in Napkin.Types.MsSql

Show PGSchemaField 
Instance details

Defined in Napkin.Run.PGCommon

Show PrettySqlError 
Instance details

Defined in Napkin.Run.PGCommon

Show CreateIndex 
Instance details

Defined in Napkin.Types.Postgres

Show MaterializedViewMeta 
Instance details

Defined in Napkin.Types.Postgres

Show SetTableSchema 
Instance details

Defined in Napkin.Types.Postgres

Show TableMeta 
Instance details

Defined in Napkin.Types.Postgres

Show Index 
Instance details

Defined in Napkin.Types.Postgres.Indexes

Methods

showsPrec :: Int -> Index -> ShowS #

show :: Index -> String #

showList :: [Index] -> ShowS #

Show ContinuousAggregatePolicy 
Instance details

Defined in Napkin.Types.Postgres.Timescale

Show ContinuousViewMeta 
Instance details

Defined in Napkin.Types.Postgres.Timescale

Show RetentionPolicy 
Instance details

Defined in Napkin.Types.Postgres.Timescale

Show TimescaleViewMeta 
Instance details

Defined in Napkin.Types.Postgres.Timescale

Show DistStyle 
Instance details

Defined in Napkin.Types.Redshift

Show SortKey 
Instance details

Defined in Napkin.Types.Redshift

Show SortStyle 
Instance details

Defined in Napkin.Types.Redshift

Show TableMeta 
Instance details

Defined in Napkin.Types.Redshift

Show CaseSensitivity 
Instance details

Defined in Napkin.Untyped.Ops.Redshift

Show SqliteSchemaError 
Instance details

Defined in Napkin.Run.Sqlite

Show SqliteMaterializedViewMeta 
Instance details

Defined in Napkin.Types.Sqlite

Show AggLevel 
Instance details

Defined in Napkin.Types.Core

Show ArrayBase 
Instance details

Defined in Napkin.Types.Core

Show AsStruct 
Instance details

Defined in Napkin.Types.Core

Show CteBody 
Instance details

Defined in Napkin.Types.Core

Show DatePart 
Instance details

Defined in Napkin.Types.Core

Show Distinctness 
Instance details

Defined in Napkin.Types.Core

Show ExternFun 
Instance details

Defined in Napkin.Types.Core

Show FrameLength 
Instance details

Defined in Napkin.Types.Core

Show From 
Instance details

Defined in Napkin.Types.Core

Methods

showsPrec :: Int -> From -> ShowS #

show :: From -> String #

showList :: [From] -> ShowS #

Show FunModifier 
Instance details

Defined in Napkin.Types.Core

Show IntInterval 
Instance details

Defined in Napkin.Types.Core

Show Interval 
Instance details

Defined in Napkin.Types.Core

Show JoinType 
Instance details

Defined in Napkin.Types.Core

Show Name 
Instance details

Defined in Napkin.Types.Core

Methods

showsPrec :: Int -> Name -> ShowS #

show :: Name -> String #

showList :: [Name] -> ShowS #

Show NativeExpr 
Instance details

Defined in Napkin.Types.Core

Show NativeQuery 
Instance details

Defined in Napkin.Types.Core

Show NullOrder 
Instance details

Defined in Napkin.Types.Core

Show NullStrategy 
Instance details

Defined in Napkin.Types.Core

Show Nullability 
Instance details

Defined in Napkin.Types.Core

Show OrderDir 
Instance details

Defined in Napkin.Types.Core

Show OrderPart 
Instance details

Defined in Napkin.Types.Core

Show ParensOperator 
Instance details

Defined in Napkin.Types.Core

Show ParensOperatorArgument 
Instance details

Defined in Napkin.Types.Core

Show Query 
Instance details

Defined in Napkin.Types.Core

Methods

showsPrec :: Int -> Query -> ShowS #

show :: Query -> String #

showList :: [Query] -> ShowS #

Show RawQuery 
Instance details

Defined in Napkin.Types.Core

Show Relation 
Instance details

Defined in Napkin.Types.Core

Show SExp 
Instance details

Defined in Napkin.Types.Core

Methods

showsPrec :: Int -> SExp -> ShowS #

show :: SExp -> String #

showList :: [SExp] -> ShowS #

Show SpecDependency 
Instance details

Defined in Napkin.Types.Core

Show SpecNode 
Instance details

Defined in Napkin.Types.Core

Show SpecTableName 
Instance details

Defined in Napkin.Types.Core

Show StructField 
Instance details

Defined in Napkin.Types.Core

Show TableKind 
Instance details

Defined in Napkin.Types.Core

Show Type 
Instance details

Defined in Napkin.Types.Core

Methods

showsPrec :: Int -> Type -> ShowS #

show :: Type -> String #

showList :: [Type] -> ShowS #

Show UnionType 
Instance details

Defined in Napkin.Types.Core

Show UpdateQuery 
Instance details

Defined in Napkin.Types.Core

Show Value 
Instance details

Defined in Napkin.Types.Core

Methods

showsPrec :: Int -> Value -> ShowS #

show :: Value -> String #

showList :: [Value] -> ShowS #

Show WOver 
Instance details

Defined in Napkin.Types.Core

Methods

showsPrec :: Int -> WOver -> ShowS #

show :: WOver -> String #

showList :: [WOver] -> ShowS #

Show WindowFrame 
Instance details

Defined in Napkin.Types.Core

Show WindowFrameUnit 
Instance details

Defined in Napkin.Types.Core

Show WithClauses 
Instance details

Defined in Napkin.Types.Core

Show DefinedCTEs 
Instance details

Defined in Napkin.Types.RewriteCollectDeps

Methods

showsPrec :: Int -> DefinedCTEs -> ShowS #

show :: DefinedCTEs -> String #

showList :: [DefinedCTEs] -> ShowS #

Show Dependencies 
Instance details

Defined in Napkin.Types.RewriteCollectDeps

Methods

showsPrec :: Int -> Dependencies -> ShowS #

show :: Dependencies -> String #

showList :: [Dependencies] -> ShowS #

Show Estimate 
Instance details

Defined in Napkin.Utils.Time

Show ComBombShell 
Instance details

Defined in Napkin.Backends.MsSql.ApiGen.Types

Show GenFunctionOpt 
Instance details

Defined in Napkin.Backends.MsSql.ApiGen.Types

Show JsonNullStrategy 
Instance details

Defined in Napkin.Backends.MsSql.ApiGen.Types

Show MsSqlApiDefExpr 
Instance details

Defined in Napkin.Backends.MsSql.ApiGen.Types

Show MsSqlApiParserSt 
Instance details

Defined in Napkin.Backends.MsSql.ApiGen.Types

Show MsSqlApiUnitDef 
Instance details

Defined in Napkin.Backends.MsSql.ApiGen.Types

Show NthHtmlNode 
Instance details

Defined in Napkin.Backends.MsSql.ApiGen.Types

Show NthStmtInHtmlNode 
Instance details

Defined in Napkin.Backends.MsSql.ApiGen.Types

Show OverOrderBy 
Instance details

Defined in Napkin.Backends.MsSql.ApiGen.Types

Show OverOrderByField 
Instance details

Defined in Napkin.Backends.MsSql.ApiGen.Types

Show PartitionBy 
Instance details

Defined in Napkin.Backends.MsSql.ApiGen.Types

Show RowRange 
Instance details

Defined in Napkin.Backends.MsSql.ApiGen.Types

Show RowRangeBound 
Instance details

Defined in Napkin.Backends.MsSql.ApiGen.Types

Show SubDefMeta 
Instance details

Defined in Napkin.Backends.MsSql.ApiGen.Types

Show LogLineFormat 
Instance details

Defined in Napkin.Logging

Show LogOptions 
Instance details

Defined in Napkin.Logging

Show LogTarget 
Instance details

Defined in Napkin.Logging

Show SQLDialect 
Instance details

Defined in Napkin.Parse.Base

Show InterpolationError 
Instance details

Defined in Napkin.Parse.Interpolation.Types

Show InterpolationErrorDetails 
Instance details

Defined in Napkin.Parse.Interpolation.Types

Show InterpolationMode 
Instance details

Defined in Napkin.Parse.Interpolation.Types

Show SqlTemplateVariables 
Instance details

Defined in Napkin.Parse.Interpolation.Types

Show ParseExc 
Instance details

Defined in Napkin.Parse.SimpleSqlParser.Convert

Show SimpleSQLParserDialect 
Instance details

Defined in Napkin.Parse.SimpleSqlParser.Dialect

Show Unshow 
Instance details

Defined in Napkin.Render.Types

Show RenderingError 
Instance details

Defined in Napkin.Revert.Types

Show Artifacts 
Instance details

Defined in Napkin.Run.Effects.Interceptors.DiscoverDependencies.Types

Show Dependencies 
Instance details

Defined in Napkin.Run.Effects.Interceptors.DiscoverDependencies.Types

Show IState 
Instance details

Defined in Napkin.Run.Effects.Interpreters.FakeLocal.Types

Show AssertionEntry 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

Show AssertionGroup 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

Show AssertionLog 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

Show AssertionSeverity 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

Show AssertionStatus 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

Show ExternalCommand 
Instance details

Defined in Napkin.Run.Effects.Languages.External

Show LoadQueryError 
Instance details

Defined in Napkin.Run.Effects.Languages.LoadQuery

Show LocalFileError 
Instance details

Defined in Napkin.Run.Effects.Languages.LocalFile

Show NapkinEffectError 
Instance details

Defined in Napkin.Run.Effects.Languages.NapkinError

Show SqlParseError 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlParse

Show Cascade 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlWrite

Show InsertColumnsList 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlWrite

Show MissingBehavior 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlWrite

Show TableWriteStrategy 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlWrite

Show CreateTableDDL 
Instance details

Defined in Napkin.Run.Effects.Languages.StatementParse

Show ExtendedStatement 
Instance details

Defined in Napkin.Run.Effects.Languages.StatementParse

Show InsertStatement 
Instance details

Defined in Napkin.Run.Effects.Languages.StatementParse

Show ExtraDependencies 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

Show HiddenArtifacts 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

Show HiddenDependencies 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

Show MetaArguments 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

Show TableMemo 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

Show TemplateError 
Instance details

Defined in Napkin.Run.Effects.Languages.Template

Show RenamerSchemaOverwriteBehavior 
Instance details

Defined in Napkin.Run.Effects.Preprocessor

Show RenamerScope 
Instance details

Defined in Napkin.Run.Effects.Preprocessor

Show HookSyncOrAsync 
Instance details

Defined in Napkin.Run.Effects.Types

Show HaskellEvaluationError 
Instance details

Defined in Napkin.Run.Types.ErrorReporting

Show NapkinError 
Instance details

Defined in Napkin.Run.Types.ErrorReporting

Show ValidationError 
Instance details

Defined in Napkin.Run.Types.ErrorReporting

Show SourceLocation 
Instance details

Defined in Napkin.Run.Types.SourceLocation

Show AppName 
Instance details

Defined in Napkin.Spec.Types.Runtime

Show AuthSpecFile 
Instance details

Defined in Napkin.Spec.Types.Runtime

Show BkStatistics 
Instance details

Defined in Napkin.Spec.Types.Runtime

Show UpdateStrategy 
Instance details

Defined in Napkin.Spec.Types.Spec

Show SpecProgramArgumentDefaultValue 
Instance details

Defined in Napkin.Spec.Yaml.Types.Arguments

Show QState 
Instance details

Defined in Napkin.Untyped.Monad

Show RefStore 
Instance details

Defined in Napkin.Untyped.Monad

Show UState 
Instance details

Defined in Napkin.Untyped.Monad

Show BackendFunctionMeta 
Instance details

Defined in Napkin.Untyped.Ops

Show FileType 
Instance details

Defined in Napkin.Utils.FileSystem

Show BrowserException 
Instance details

Defined in Napkin.Utils.Web

Show AddrInfo 
Instance details

Defined in Network.Socket.Info

Show AddrInfoFlag 
Instance details

Defined in Network.Socket.Info

Show NameInfoFlag 
Instance details

Defined in Network.Socket.Info

Show URI 
Instance details

Defined in Network.URI

Methods

showsPrec :: Int -> URI -> ShowS #

show :: URI -> String #

showList :: [URI] -> ShowS #

Show URIAuth 
Instance details

Defined in Network.URI

Show Binary 
Instance details

Defined in Database.ODBC.Internal

Show Column 
Instance details

Defined in Database.ODBC.Internal

Show ODBCException 
Instance details

Defined in Database.ODBC.Internal

Show Param 
Instance details

Defined in Database.ODBC.Internal

Methods

showsPrec :: Int -> Param -> ShowS #

show :: Param -> String #

showList :: [Param] -> ShowS #

Show RETCODE 
Instance details

Defined in Database.ODBC.Internal

Methods

showsPrec :: Int -> RETCODE -> ShowS #

show :: RETCODE -> String #

showList :: [RETCODE] -> ShowS #

Show SQLCHAR 
Instance details

Defined in Database.ODBC.Internal

Methods

showsPrec :: Int -> SQLCHAR -> ShowS #

show :: SQLCHAR -> String #

showList :: [SQLCHAR] -> ShowS #

Show SQLCTYPE 
Instance details

Defined in Database.ODBC.Internal

Methods

showsPrec :: Int -> SQLCTYPE -> ShowS #

show :: SQLCTYPE -> String #

showList :: [SQLCTYPE] -> ShowS #

Show SQLINTEGER 
Instance details

Defined in Database.ODBC.Internal

Methods

showsPrec :: Int -> SQLINTEGER -> ShowS #

show :: SQLINTEGER -> String #

showList :: [SQLINTEGER] -> ShowS #

Show SQLLEN 
Instance details

Defined in Database.ODBC.Internal

Methods

showsPrec :: Int -> SQLLEN -> ShowS #

show :: SQLLEN -> String #

showList :: [SQLLEN] -> ShowS #

Show SQLSMALLINT 
Instance details

Defined in Database.ODBC.Internal

Methods

showsPrec :: Int -> SQLSMALLINT -> ShowS #

show :: SQLSMALLINT -> String #

showList :: [SQLSMALLINT] -> ShowS #

Show SQLUCHAR 
Instance details

Defined in Database.ODBC.Internal

Methods

showsPrec :: Int -> SQLUCHAR -> ShowS #

show :: SQLUCHAR -> String #

showList :: [SQLUCHAR] -> ShowS #

Show SQLUINTEGER 
Instance details

Defined in Database.ODBC.Internal

Methods

showsPrec :: Int -> SQLUINTEGER -> ShowS #

show :: SQLUINTEGER -> String #

showList :: [SQLUINTEGER] -> ShowS #

Show SQLULEN 
Instance details

Defined in Database.ODBC.Internal

Methods

showsPrec :: Int -> SQLULEN -> ShowS #

show :: SQLULEN -> String #

showList :: [SQLULEN] -> ShowS #

Show SQLUSMALLINT 
Instance details

Defined in Database.ODBC.Internal

Methods

showsPrec :: Int -> SQLUSMALLINT -> ShowS #

show :: SQLUSMALLINT -> String #

showList :: [SQLUSMALLINT] -> ShowS #

Show SQLWCHAR 
Instance details

Defined in Database.ODBC.Internal

Methods

showsPrec :: Int -> SQLWCHAR -> ShowS #

show :: SQLWCHAR -> String #

showList :: [SQLWCHAR] -> ShowS #

Show Value 
Instance details

Defined in Database.ODBC.Internal

Methods

showsPrec :: Int -> Value -> ShowS #

show :: Value -> String #

showList :: [Value] -> ShowS #

Show Datetime2 
Instance details

Defined in Database.ODBC.SQLServer

Show Datetimeoffset 
Instance details

Defined in Database.ODBC.SQLServer

Show FPart 
Instance details

Defined in Database.ODBC.SQLServer

Methods

showsPrec :: Int -> FPart -> ShowS #

show :: FPart -> String #

showList :: [FPart] -> ShowS #

Show Part 
Instance details

Defined in Database.ODBC.SQLServer

Methods

showsPrec :: Int -> Part -> ShowS #

show :: Part -> String #

showList :: [Part] -> ShowS #

Show Query 
Instance details

Defined in Database.ODBC.SQLServer

Methods

showsPrec :: Int -> Query -> ShowS #

show :: Query -> String #

showList :: [Query] -> ShowS #

Show Smalldatetime 
Instance details

Defined in Database.ODBC.SQLServer

Show Richness 
Instance details

Defined in Options.Applicative.BashCompletion

Methods

showsPrec :: Int -> Richness -> ShowS #

show :: Richness -> String #

showList :: [Richness] -> ShowS #

Show Parenthetic 
Instance details

Defined in Options.Applicative.Help.Core

Methods

showsPrec :: Int -> Parenthetic -> ShowS #

show :: Parenthetic -> String #

showList :: [Parenthetic] -> ShowS #

Show ParserHelp 
Instance details

Defined in Options.Applicative.Help.Types

Show AltNodeType 
Instance details

Defined in Options.Applicative.Types

Show ArgPolicy 
Instance details

Defined in Options.Applicative.Types

Show ArgumentReachability 
Instance details

Defined in Options.Applicative.Types

Show Backtracking 
Instance details

Defined in Options.Applicative.Types

Show CompletionResult 
Instance details

Defined in Options.Applicative.Types

Show IsCmdStart 
Instance details

Defined in Options.Applicative.Types

Show OptName 
Instance details

Defined in Options.Applicative.Types

Show OptProperties 
Instance details

Defined in Options.Applicative.Types

Show OptVisibility 
Instance details

Defined in Options.Applicative.Types

Show ParserPrefs 
Instance details

Defined in Options.Applicative.Types

Show OsChar 
Instance details

Defined in System.OsString.Internal.Types

Show OsString

On windows, decodes as UCS-2. On unix prints the raw bytes without decoding.

Instance details

Defined in System.OsString.Internal.Types

Show PosixChar 
Instance details

Defined in System.OsString.Internal.Types

Show PosixString

Prints the raw bytes without decoding.

Instance details

Defined in System.OsString.Internal.Types

Show WindowsChar 
Instance details

Defined in System.OsString.Internal.Types

Show WindowsString

Decodes as UCS-2.

Instance details

Defined in System.OsString.Internal.Types

Show WrappedExc 
Instance details

Defined in Polysemy.Error

Methods

showsPrec :: Int -> WrappedExc -> ShowS #

show :: WrappedExc -> String #

showList :: [WrappedExc] -> ShowS #

Show ConLiftInfo 
Instance details

Defined in Polysemy.Internal.TH.Common

Show ConnectInfo 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Show FormatError 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Show QueryError 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Show SomePostgreSqlException 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Show SqlError 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Show AExpr 
Instance details

Defined in PostgresqlSyntax.Ast

Methods

showsPrec :: Int -> AExpr -> ShowS #

show :: AExpr -> String #

showList :: [AExpr] -> ShowS #

Show AExprReversableOp 
Instance details

Defined in PostgresqlSyntax.Ast

Show AexprConst 
Instance details

Defined in PostgresqlSyntax.Ast

Show AliasClause 
Instance details

Defined in PostgresqlSyntax.Ast

Show AllOp 
Instance details

Defined in PostgresqlSyntax.Ast

Methods

showsPrec :: Int -> AllOp -> ShowS #

show :: AllOp -> String #

showList :: [AllOp] -> ShowS #

Show AnyName 
Instance details

Defined in PostgresqlSyntax.Ast

Show AnyOperator 
Instance details

Defined in PostgresqlSyntax.Ast

Show ArrayExpr 
Instance details

Defined in PostgresqlSyntax.Ast

Show AscDesc 
Instance details

Defined in PostgresqlSyntax.Ast

Show BExpr 
Instance details

Defined in PostgresqlSyntax.Ast

Methods

showsPrec :: Int -> BExpr -> ShowS #

show :: BExpr -> String #

showList :: [BExpr] -> ShowS #

Show BExprIsOp 
Instance details

Defined in PostgresqlSyntax.Ast

Show Bit 
Instance details

Defined in PostgresqlSyntax.Ast

Methods

showsPrec :: Int -> Bit -> ShowS #

show :: Bit -> String #

showList :: [Bit] -> ShowS #

Show CExpr 
Instance details

Defined in PostgresqlSyntax.Ast

Methods

showsPrec :: Int -> CExpr -> ShowS #

show :: CExpr -> String #

showList :: [CExpr] -> ShowS #

Show CallStmt 
Instance details

Defined in PostgresqlSyntax.Ast

Show CaseExpr 
Instance details

Defined in PostgresqlSyntax.Ast

Show Character 
Instance details

Defined in PostgresqlSyntax.Ast

Show Columnref 
Instance details

Defined in PostgresqlSyntax.Ast

Show CommonTableExpr 
Instance details

Defined in PostgresqlSyntax.Ast

Show ConfExpr 
Instance details

Defined in PostgresqlSyntax.Ast

Show ConstCharacter 
Instance details

Defined in PostgresqlSyntax.Ast

Show ConstDatetime 
Instance details

Defined in PostgresqlSyntax.Ast

Show ConstTypename 
Instance details

Defined in PostgresqlSyntax.Ast

Show DeleteStmt 
Instance details

Defined in PostgresqlSyntax.Ast

Show ExtractArg 
Instance details

Defined in PostgresqlSyntax.Ast

Show ExtractList 
Instance details

Defined in PostgresqlSyntax.Ast

Show ForLockingClause 
Instance details

Defined in PostgresqlSyntax.Ast

Show ForLockingItem 
Instance details

Defined in PostgresqlSyntax.Ast

Show ForLockingStrength 
Instance details

Defined in PostgresqlSyntax.Ast

Show FrameBound 
Instance details

Defined in PostgresqlSyntax.Ast

Show FrameClause 
Instance details

Defined in PostgresqlSyntax.Ast

Show FrameClauseMode 
Instance details

Defined in PostgresqlSyntax.Ast

Show FrameExtent 
Instance details

Defined in PostgresqlSyntax.Ast

Show FuncAliasClause 
Instance details

Defined in PostgresqlSyntax.Ast

Show FuncApplication 
Instance details

Defined in PostgresqlSyntax.Ast

Show FuncApplicationParams 
Instance details

Defined in PostgresqlSyntax.Ast

Show FuncArgExpr 
Instance details

Defined in PostgresqlSyntax.Ast

Show FuncConstArgs 
Instance details

Defined in PostgresqlSyntax.Ast

Show FuncExpr 
Instance details

Defined in PostgresqlSyntax.Ast

Show FuncExprCommonSubexpr 
Instance details

Defined in PostgresqlSyntax.Ast

Show FuncExprWindowless 
Instance details

Defined in PostgresqlSyntax.Ast

Show FuncName 
Instance details

Defined in PostgresqlSyntax.Ast

Show FuncTable 
Instance details

Defined in PostgresqlSyntax.Ast

Show GenericType 
Instance details

Defined in PostgresqlSyntax.Ast

Show GroupByItem 
Instance details

Defined in PostgresqlSyntax.Ast

Show Ident 
Instance details

Defined in PostgresqlSyntax.Ast

Methods

showsPrec :: Int -> Ident -> ShowS #

show :: Ident -> String #

showList :: [Ident] -> ShowS #

Show ImplicitRow 
Instance details

Defined in PostgresqlSyntax.Ast

Show InExpr 
Instance details

Defined in PostgresqlSyntax.Ast

Show IndexElem 
Instance details

Defined in PostgresqlSyntax.Ast

Show IndexElemDef 
Instance details

Defined in PostgresqlSyntax.Ast

Show IndirectionEl 
Instance details

Defined in PostgresqlSyntax.Ast

Show InsertColumnItem 
Instance details

Defined in PostgresqlSyntax.Ast

Show InsertRest 
Instance details

Defined in PostgresqlSyntax.Ast

Show InsertStmt 
Instance details

Defined in PostgresqlSyntax.Ast

Show InsertTarget 
Instance details

Defined in PostgresqlSyntax.Ast

Show Interval 
Instance details

Defined in PostgresqlSyntax.Ast

Show JoinMeth 
Instance details

Defined in PostgresqlSyntax.Ast

Show JoinQual 
Instance details

Defined in PostgresqlSyntax.Ast

Show JoinType 
Instance details

Defined in PostgresqlSyntax.Ast

Show JoinedTable 
Instance details

Defined in PostgresqlSyntax.Ast

Show LimitClause 
Instance details

Defined in PostgresqlSyntax.Ast

Show MathOp 
Instance details

Defined in PostgresqlSyntax.Ast

Show NullsOrder 
Instance details

Defined in PostgresqlSyntax.Ast

Show Numeric 
Instance details

Defined in PostgresqlSyntax.Ast

Show OffsetClause 
Instance details

Defined in PostgresqlSyntax.Ast

Show OnConflict 
Instance details

Defined in PostgresqlSyntax.Ast

Show OnConflictDo 
Instance details

Defined in PostgresqlSyntax.Ast

Show OptTempTableName 
Instance details

Defined in PostgresqlSyntax.Ast

Show OverClause 
Instance details

Defined in PostgresqlSyntax.Ast

Show OverlayList 
Instance details

Defined in PostgresqlSyntax.Ast

Show OverrideKind 
Instance details

Defined in PostgresqlSyntax.Ast

Show PositionList 
Instance details

Defined in PostgresqlSyntax.Ast

Show PreparableStmt 
Instance details

Defined in PostgresqlSyntax.Ast

Show QualAllOp 
Instance details

Defined in PostgresqlSyntax.Ast

Show QualOp 
Instance details

Defined in PostgresqlSyntax.Ast

Show QualifiedName 
Instance details

Defined in PostgresqlSyntax.Ast

Show RelationExpr 
Instance details

Defined in PostgresqlSyntax.Ast

Show RelationExprOptAlias 
Instance details

Defined in PostgresqlSyntax.Ast

Show Row 
Instance details

Defined in PostgresqlSyntax.Ast

Methods

showsPrec :: Int -> Row -> ShowS #

show :: Row -> String #

showList :: [Row] -> ShowS #

Show RowsfromItem 
Instance details

Defined in PostgresqlSyntax.Ast

Show SelectBinOp 
Instance details

Defined in PostgresqlSyntax.Ast

Show SelectFetchFirstValue 
Instance details

Defined in PostgresqlSyntax.Ast

Show SelectLimit 
Instance details

Defined in PostgresqlSyntax.Ast

Show SelectLimitValue 
Instance details

Defined in PostgresqlSyntax.Ast

Show SelectNoParens 
Instance details

Defined in PostgresqlSyntax.Ast

Show SelectWithParens 
Instance details

Defined in PostgresqlSyntax.Ast

Show SetClause 
Instance details

Defined in PostgresqlSyntax.Ast

Show SetTarget 
Instance details

Defined in PostgresqlSyntax.Ast

Show SimpleSelect 
Instance details

Defined in PostgresqlSyntax.Ast

Show SimpleTypename 
Instance details

Defined in PostgresqlSyntax.Ast

Show SortBy 
Instance details

Defined in PostgresqlSyntax.Ast

Show SubType 
Instance details

Defined in PostgresqlSyntax.Ast

Show SubqueryOp 
Instance details

Defined in PostgresqlSyntax.Ast

Show SubstrList 
Instance details

Defined in PostgresqlSyntax.Ast

Show SubstrListFromFor 
Instance details

Defined in PostgresqlSyntax.Ast

Show SymbolicExprBinOp 
Instance details

Defined in PostgresqlSyntax.Ast

Show TableFuncElement 
Instance details

Defined in PostgresqlSyntax.Ast

Show TableRef 
Instance details

Defined in PostgresqlSyntax.Ast

Show TablesampleClause 
Instance details

Defined in PostgresqlSyntax.Ast

Show TargetEl 
Instance details

Defined in PostgresqlSyntax.Ast

Show Targeting 
Instance details

Defined in PostgresqlSyntax.Ast

Show TrimList 
Instance details

Defined in PostgresqlSyntax.Ast

Show TrimModifier 
Instance details

Defined in PostgresqlSyntax.Ast

Show Typename 
Instance details

Defined in PostgresqlSyntax.Ast

Show TypenameArrayDimensions 
Instance details

Defined in PostgresqlSyntax.Ast

Show UpdateStmt 
Instance details

Defined in PostgresqlSyntax.Ast

Show VerbalExprBinOp 
Instance details

Defined in PostgresqlSyntax.Ast

Show WhenClause 
Instance details

Defined in PostgresqlSyntax.Ast

Show WhereOrCurrentClause 
Instance details

Defined in PostgresqlSyntax.Ast

Show WindowDefinition 
Instance details

Defined in PostgresqlSyntax.Ast

Show WindowExclusionClause 
Instance details

Defined in PostgresqlSyntax.Ast

Show WindowSpecification 
Instance details

Defined in PostgresqlSyntax.Ast

Show WithClause 
Instance details

Defined in PostgresqlSyntax.Ast

Show Mode 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

showsPrec :: Int -> Mode -> ShowS #

show :: Mode -> String #

showList :: [Mode] -> ShowS #

Show Style 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

showsPrec :: Int -> Style -> ShowS #

show :: Style -> String #

showList :: [Style] -> ShowS #

Show TextDetails 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Show Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Methods

showsPrec :: Int -> Doc -> ShowS #

show :: Doc -> String #

showList :: [Doc] -> ShowS #

Show ColorOptions 
Instance details

Defined in Text.Pretty.Simple.Internal.Color

Show Style 
Instance details

Defined in Text.Pretty.Simple.Internal.Color

Methods

showsPrec :: Int -> Style -> ShowS #

show :: Style -> String #

showList :: [Style] -> ShowS #

Show Expr 
Instance details

Defined in Text.Pretty.Simple.Internal.Expr

Methods

showsPrec :: Int -> Expr -> ShowS #

show :: Expr -> String #

showList :: [Expr] -> ShowS #

Show Annotation 
Instance details

Defined in Text.Pretty.Simple.Internal.Printer

Show CheckColorTty 
Instance details

Defined in Text.Pretty.Simple.Internal.Printer

Show OutputOptions 
Instance details

Defined in Text.Pretty.Simple.Internal.Printer

Show StringOutputStyle 
Instance details

Defined in Text.Pretty.Simple.Internal.Printer

Show FusionDepth 
Instance details

Defined in Prettyprinter.Internal

Show LayoutOptions 
Instance details

Defined in Prettyprinter.Internal

Show PageWidth 
Instance details

Defined in Prettyprinter.Internal

Show AnsiStyle 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Show Bold 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

showsPrec :: Int -> Bold -> ShowS #

show :: Bold -> String #

showList :: [Bold] -> ShowS #

Show Color 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

showsPrec :: Int -> Color -> ShowS #

show :: Color -> String #

showList :: [Color] -> ShowS #

Show Intensity 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Show Italicized 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Show Layer 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

showsPrec :: Int -> Layer -> ShowS #

show :: Layer -> String #

showList :: [Layer] -> ShowS #

Show Underlined 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Show StdGen 
Instance details

Defined in System.Random.Internal

Show CompOption 
Instance details

Defined in Text.Regex.Posix.Wrap

Show ExecOption 
Instance details

Defined in Text.Regex.Posix.Wrap

Show ReturnCode 
Instance details

Defined in Text.Regex.Posix.Wrap

Show Undefined 
Instance details

Defined in Relude.Debug

Show Bug 
Instance details

Defined in Relude.Exception

Methods

showsPrec :: Int -> Bug -> ShowS #

show :: Bug -> String #

showList :: [Bug] -> ShowS #

Show InvalidAccess 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Show ResourceCleanupException 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Show RetryAction 
Instance details

Defined in Control.Retry

Show RetryStatus 
Instance details

Defined in Control.Retry

Show LogLevel 
Instance details

Defined in RIO.Prelude.Logger

Show Scientific

See formatScientific if you need more control over the rendering.

Instance details

Defined in Data.Scientific

Show ActionError 
Instance details

Defined in Web.Scotty.Internal.Types

Show BodyPartiallyStreamed 
Instance details

Defined in Web.Scotty.Internal.Types

Show ScottyException 
Instance details

Defined in Web.Scotty.Internal.Types

Show StatusError 
Instance details

Defined in Web.Scotty.Internal.Types

Show AcceptHeader 
Instance details

Defined in Servant.API.ContentTypes

Show NoContent 
Instance details

Defined in Servant.API.ContentTypes

Show IsSecure 
Instance details

Defined in Servant.API.IsSecure

Show Escaped 
Instance details

Defined in Servant.Links

Methods

showsPrec :: Int -> Escaped -> ShowS #

show :: Escaped -> String #

showList :: [Escaped] -> ShowS #

Show Link 
Instance details

Defined in Servant.Links

Methods

showsPrec :: Int -> Link -> ShowS #

show :: Link -> String #

showList :: [Link] -> ShowS #

Show LinkArrayElementStyle 
Instance details

Defined in Servant.Links

Show Param 
Instance details

Defined in Servant.Links

Methods

showsPrec :: Int -> Param -> ShowS #

show :: Param -> String #

showList :: [Param] -> ShowS #

Show AlterTableOptions 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect

Show Dialect 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect

Show KeywordMode 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect

Show SetOperatorOptions 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect

Show TrieKey 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Trie

Show TrieNodeKey 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Trie

Show CaseEquality 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Show CodePointBase 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Show CodePointDigits 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Show EscMode 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Show EscapeFallBack 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Show EscapeParams 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Show InLowCase 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Show InSource 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Show KeyCharEventHandler 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Show LetterCase 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Show QuotationRuleIndex 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Show QuotePrefix 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Show QuotingChars 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Show ScapeParams 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Show ScapingRule 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Show SrcLitStr 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Show StrLitFmt 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Show StrLitId 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Show StrLitPrefix 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Show UnEscapeParams 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Show SQLToken 
Instance details

Defined in Language.SQL.SimpleSQL.Lex.LexType

Show SQLTokenStream 
Instance details

Defined in Language.SQL.SimpleSQL.Lex.LexType

Show SrcPos 
Instance details

Defined in Language.SQL.SimpleSQL.Lex.LexType

Show WithPos 
Instance details

Defined in Language.SQL.SimpleSQL.Lex.LexType

Show AdminOption 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show AdminOptionFor 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show Alias 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Methods

showsPrec :: Int -> Alias -> ShowS #

show :: Alias -> String #

showList :: [Alias] -> ShowS #

Show AlterDomainAction 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show AlterTableAction 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show AnonymousStruct 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show AsStruct 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show BqStructExpr 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show CastSafe 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show CheckOption 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show ColConstraint 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show ColConstraintDef 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show ColumnDef 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show Comment 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show CompPredQuantifier 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show Corresponding 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show DefaultClause 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show Direction 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show DropBehaviour 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show Frame 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Methods

showsPrec :: Int -> Frame -> ShowS #

show :: Frame -> String #

showList :: [Frame] -> ShowS #

Show FramePos 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show FrameRows 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show GrantOption 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show GrantOptionFor 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show GroupingExpr 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show IdentityRestart 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show IdentityWhen 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show InPredValue 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show InsertSource 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show IntervalTypeField 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show JoinCondition 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show JoinType 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show Name 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Methods

showsPrec :: Int -> Name -> ShowS #

show :: Name -> String #

showList :: [Name] -> ShowS #

Show NullsOrder 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show NullsRespect 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show ParensOperator 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show ParensOperatorArgument 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show PrecMultiplier 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show PrecUnits 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show PrivilegeAction 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show PrivilegeObject 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show QueryExpr 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show ReferenceMatch 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show ReferentialAction 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show ScalarExpr 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show SequenceGeneratorOption 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show SetClause 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show SetOperatorName 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show SetQuantifier 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show Sign 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Methods

showsPrec :: Int -> Sign -> ShowS #

show :: Sign -> String #

showList :: [Sign] -> ShowS #

Show SortSpec 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show Statement 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show SubQueryExprType 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show TableConstraint 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show TableElement 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show TableRef 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show TypeName 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Show Key 
Instance details

Defined in Text.Mustache.Type

Methods

showsPrec :: Int -> Key -> ShowS #

show :: Key -> String #

showList :: [Key] -> ShowS #

Show MustacheException 
Instance details

Defined in Text.Mustache.Type

Show MustacheWarning 
Instance details

Defined in Text.Mustache.Type

Show Node 
Instance details

Defined in Text.Mustache.Type

Methods

showsPrec :: Int -> Node -> ShowS #

show :: Node -> String #

showList :: [Node] -> ShowS #

Show PName 
Instance details

Defined in Text.Mustache.Type

Methods

showsPrec :: Int -> PName -> ShowS #

show :: PName -> String #

showList :: [PName] -> ShowS #

Show Template 
Instance details

Defined in Text.Mustache.Type

Show Leniency 
Instance details

Defined in Data.String.Conv

Show AnnLookup 
Instance details

Defined in Language.Haskell.TH.Syntax

Show AnnTarget 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Bang 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Bang -> ShowS #

show :: Bang -> String #

showList :: [Bang] -> ShowS #

Show BndrVis 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Body 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Body -> ShowS #

show :: Body -> String #

showList :: [Body] -> ShowS #

Show Bytes 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Bytes -> ShowS #

show :: Bytes -> String #

showList :: [Bytes] -> ShowS #

Show Callconv 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Clause 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Con 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Con -> ShowS #

show :: Con -> String #

showList :: [Con] -> ShowS #

Show Dec 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Dec -> ShowS #

show :: Dec -> String #

showList :: [Dec] -> ShowS #

Show DecidedStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Show DerivClause 
Instance details

Defined in Language.Haskell.TH.Syntax

Show DerivStrategy 
Instance details

Defined in Language.Haskell.TH.Syntax

Show DocLoc 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Exp 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Exp -> ShowS #

show :: Exp -> String #

showList :: [Exp] -> ShowS #

Show FamilyResultSig 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Fixity 
Instance details

Defined in Language.Haskell.TH.Syntax

Show FixityDirection 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Foreign 
Instance details

Defined in Language.Haskell.TH.Syntax

Show FunDep 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Guard 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Guard -> ShowS #

show :: Guard -> String #

showList :: [Guard] -> ShowS #

Show Info 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Info -> ShowS #

show :: Info -> String #

showList :: [Info] -> ShowS #

Show InjectivityAnn 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Inline 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Lit 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Lit -> ShowS #

show :: Lit -> String #

showList :: [Lit] -> ShowS #

Show Loc 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Loc -> ShowS #

show :: Loc -> String #

showList :: [Loc] -> ShowS #

Show Match 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Match -> ShowS #

show :: Match -> String #

showList :: [Match] -> ShowS #

Show ModName 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Module 
Instance details

Defined in Language.Haskell.TH.Syntax

Show ModuleInfo 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Name 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Name -> ShowS #

show :: Name -> String #

showList :: [Name] -> ShowS #

Show NameFlavour 
Instance details

Defined in Language.Haskell.TH.Syntax

Show NameSpace 
Instance details

Defined in Language.Haskell.TH.Syntax

Show NamespaceSpecifier 
Instance details

Defined in Language.Haskell.TH.Syntax

Show OccName 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Overlap 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Pat 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Pat -> ShowS #

show :: Pat -> String #

showList :: [Pat] -> ShowS #

Show PatSynArgs 
Instance details

Defined in Language.Haskell.TH.Syntax

Show PatSynDir 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Phases 
Instance details

Defined in Language.Haskell.TH.Syntax

Show PkgName 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Pragma 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Range 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Range -> ShowS #

show :: Range -> String #

showList :: [Range] -> ShowS #

Show Role 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Role -> ShowS #

show :: Role -> String #

showList :: [Role] -> ShowS #

Show RuleBndr 
Instance details

Defined in Language.Haskell.TH.Syntax

Show RuleMatch 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Safety 
Instance details

Defined in Language.Haskell.TH.Syntax

Show SourceStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Show SourceUnpackedness 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Specificity 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Stmt 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Stmt -> ShowS #

show :: Stmt -> String #

showList :: [Stmt] -> ShowS #

Show TyLit 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> TyLit -> ShowS #

show :: TyLit -> String #

showList :: [TyLit] -> ShowS #

Show TySynEqn 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Type 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Type -> ShowS #

show :: Type -> String #

showList :: [Type] -> ShowS #

Show TypeFamilyHead 
Instance details

Defined in Language.Haskell.TH.Syntax

Show Decoding 
Instance details

Defined in Data.Text.Encoding

Show UnicodeException 
Instance details

Defined in Data.Text.Encoding.Error

Show I8 
Instance details

Defined in Data.Text.Foreign

Methods

showsPrec :: Int -> I8 -> ShowS #

show :: I8 -> String #

showList :: [I8] -> ShowS #

Show Builder 
Instance details

Defined in Data.Text.Internal.Builder

Show PartialUtf8CodePoint 
Instance details

Defined in Data.Text.Internal.Encoding

Methods

showsPrec :: Int -> PartialUtf8CodePoint -> ShowS #

show :: PartialUtf8CodePoint -> String #

showList :: [PartialUtf8CodePoint] -> ShowS #

Show Utf8State 
Instance details

Defined in Data.Text.Internal.Encoding

Show DecoderState 
Instance details

Defined in Data.Text.Internal.Encoding.Utf8

Show Size 
Instance details

Defined in Data.Text.Internal.Fusion.Size

Methods

showsPrec :: Int -> Size -> ShowS #

show :: Size -> String #

showList :: [Size] -> ShowS #

Show FPFormat 
Instance details

Defined in Data.Text.Lazy.Builder.RealFloat

Show Iter 
Instance details

Defined in Data.Text.Unsafe

Methods

showsPrec :: Int -> Iter -> ShowS #

show :: Iter -> String #

showList :: [Iter] -> ShowS #

Show ShortText 
Instance details

Defined in Data.Text.Short.Internal

Show ConstructorInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Show ConstructorVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Show DatatypeInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Show DatatypeVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Show FieldStrictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Show Strictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Show Unpackedness 
Instance details

Defined in Language.Haskell.TH.Datatype

Show CalendarDiffDays 
Instance details

Defined in Data.Time.Calendar.CalendarDiffDays

Show Month

Show as yyyy-mm.

Instance details

Defined in Data.Time.Calendar.Month

Methods

showsPrec :: Int -> Month -> ShowS #

show :: Month -> String #

showList :: [Month] -> ShowS #

Show Quarter

Show as yyyy-Qn.

Instance details

Defined in Data.Time.Calendar.Quarter

Show QuarterOfYear 
Instance details

Defined in Data.Time.Calendar.Quarter

Show DayOfWeek 
Instance details

Defined in Data.Time.Calendar.Week

Show DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Show NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Show SystemTime 
Instance details

Defined in Data.Time.Clock.Internal.SystemTime

Show TimeLocale 
Instance details

Defined in Data.Time.Format.Locale

Show CalendarDiffTime 
Instance details

Defined in Data.Time.LocalTime.Internal.CalendarDiffTime

Show LocalTime 
Instance details

Defined in Data.Time.LocalTime.Internal.LocalTime

Show TimeOfDay 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeOfDay

Show TimeZone

This only shows the time zone name, or offset if the name is empty.

Instance details

Defined in Data.Time.LocalTime.Internal.TimeZone

Show ZonedTime

For the time zone, this only shows the name, or offset if the name is empty.

Instance details

Defined in Data.Time.LocalTime.Internal.ZonedTime

Show UnixDiffTime 
Instance details

Defined in Data.UnixTime.Types

Show UnixTime 
Instance details

Defined in Data.UnixTime.Types

Show ConcException 
Instance details

Defined in UnliftIO.Internals.Async

Show Authority 
Instance details

Defined in URI.ByteString.Types

Show Host 
Instance details

Defined in URI.ByteString.Types

Methods

showsPrec :: Int -> Host -> ShowS #

show :: Host -> String #

showList :: [Host] -> ShowS #

Show Port 
Instance details

Defined in URI.ByteString.Types

Methods

showsPrec :: Int -> Port -> ShowS #

show :: Port -> String #

showList :: [Port] -> ShowS #

Show Query 
Instance details

Defined in URI.ByteString.Types

Methods

showsPrec :: Int -> Query -> ShowS #

show :: Query -> String #

showList :: [Query] -> ShowS #

Show SchemaError 
Instance details

Defined in URI.ByteString.Types

Show Scheme 
Instance details

Defined in URI.ByteString.Types

Show URINormalizationOptions 
Instance details

Defined in URI.ByteString.Types

Show URIParseError 
Instance details

Defined in URI.ByteString.Types

Show UserInfo 
Instance details

Defined in URI.ByteString.Types

Show State 
Instance details

Defined in Data.UUID.V1

Methods

showsPrec :: Int -> State -> ShowS #

show :: State -> String #

showList :: [State] -> ShowS #

Show UUID

Pretty prints a UUID (without quotation marks). See also toString.

>>> show nil
"00000000-0000-0000-0000-000000000000"
Instance details

Defined in Data.UUID.Types.Internal

Methods

showsPrec :: Int -> UUID -> ShowS #

show :: UUID -> String #

showList :: [UUID] -> ShowS #

Show UnpackedUUID 
Instance details

Defined in Data.UUID.Types.Internal

Show Content 
Instance details

Defined in Data.XML.Types

Show Doctype 
Instance details

Defined in Data.XML.Types

Show Document 
Instance details

Defined in Data.XML.Types

Show Element 
Instance details

Defined in Data.XML.Types

Show Event 
Instance details

Defined in Data.XML.Types

Methods

showsPrec :: Int -> Event -> ShowS #

show :: Event -> String #

showList :: [Event] -> ShowS #

Show ExternalID 
Instance details

Defined in Data.XML.Types

Show Instruction 
Instance details

Defined in Data.XML.Types

Show Miscellaneous 
Instance details

Defined in Data.XML.Types

Show Name 
Instance details

Defined in Data.XML.Types

Methods

showsPrec :: Int -> Name -> ShowS #

show :: Name -> String #

showList :: [Name] -> ShowS #

Show Node 
Instance details

Defined in Data.XML.Types

Methods

showsPrec :: Int -> Node -> ShowS #

show :: Node -> String #

showList :: [Node] -> ShowS #

Show Prologue 
Instance details

Defined in Data.XML.Types

Show CompressionLevel 
Instance details

Defined in Codec.Compression.Zlib.Stream

Show CompressionStrategy 
Instance details

Defined in Codec.Compression.Zlib.Stream

Show DictionaryHash 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

showsPrec :: Int -> DictionaryHash -> ShowS #

show :: DictionaryHash -> String #

showList :: [DictionaryHash] -> ShowS #

Show Format 
Instance details

Defined in Codec.Compression.Zlib.Stream

Show MemoryLevel 
Instance details

Defined in Codec.Compression.Zlib.Stream

Show Method 
Instance details

Defined in Codec.Compression.Zlib.Stream

Show WindowBits 
Instance details

Defined in Codec.Compression.Zlib.Stream

Show Integer

@since base-2.01

Instance details

Defined in GHC.Internal.Show

Show Natural

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Show

Show ()

@since base-2.01

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> () -> ShowS #

show :: () -> String #

showList :: [()] -> ShowS #

Show Bool

@since base-2.01

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> Bool -> ShowS #

show :: Bool -> String #

showList :: [Bool] -> ShowS #

Show Char

@since base-2.01

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> Char -> ShowS #

show :: Char -> String #

showList :: [Char] -> ShowS #

Show Int

@since base-2.01

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> Int -> ShowS #

show :: Int -> String #

showList :: [Int] -> ShowS #

Show Levity

@since base-4.15.0.0

Instance details

Defined in GHC.Internal.Show

Show RuntimeRep

@since base-4.11.0.0

Instance details

Defined in GHC.Internal.Show

Show VecCount

@since base-4.11.0.0

Instance details

Defined in GHC.Internal.Show

Show VecElem

@since base-4.11.0.0

Instance details

Defined in GHC.Internal.Show

Show Word

@since base-2.01

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> Word -> ShowS #

show :: Word -> String #

showList :: [Word] -> ShowS #

Show a => Show (Only a) 
Instance details

Defined in Data.Tuple.Only

Methods

showsPrec :: Int -> Only a -> ShowS #

show :: Only a -> String #

showList :: [Only a] -> ShowS #

Show (Encoding' a) 
Instance details

Defined in Data.Aeson.Encoding.Internal

Show v => Show (KeyMap v) 
Instance details

Defined in Data.Aeson.KeyMap

Methods

showsPrec :: Int -> KeyMap v -> ShowS #

show :: KeyMap v -> String #

showList :: [KeyMap v] -> ShowS #

Show a => Show (IResult a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

showsPrec :: Int -> IResult a -> ShowS #

show :: IResult a -> String #

showList :: [IResult a] -> ShowS #

Show a => Show (Result a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

showsPrec :: Int -> Result a -> ShowS #

show :: Result a -> String #

showList :: [Result a] -> ShowS #

Show a => Show (WithJSONWarnings a) 
Instance details

Defined in Data.Aeson.WarningParser

Show a => Show (Complex a)

Since: base-2.1

Instance details

Defined in Data.Complex

Methods

showsPrec :: Int -> Complex a -> ShowS #

show :: Complex a -> String #

showList :: [Complex a] -> ShowS #

Show a => Show (First a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

showsPrec :: Int -> First a -> ShowS #

show :: First a -> String #

showList :: [First a] -> ShowS #

Show a => Show (Last a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

showsPrec :: Int -> Last a -> ShowS #

show :: Last a -> String #

showList :: [Last a] -> ShowS #

Show a => Show (Max a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

showsPrec :: Int -> Max a -> ShowS #

show :: Max a -> String #

showList :: [Max a] -> ShowS #

Show a => Show (Min a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

showsPrec :: Int -> Min a -> ShowS #

show :: Min a -> String #

showList :: [Min a] -> ShowS #

Show m => Show (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Show (Bits n) 
Instance details

Defined in Basement.Bits

Methods

showsPrec :: Int -> Bits n -> ShowS #

show :: Bits n -> String #

showList :: [Bits n] -> ShowS #

(PrimType ty, Show ty) => Show (Block ty) 
Instance details

Defined in Basement.Block.Base

Methods

showsPrec :: Int -> Block ty -> ShowS #

show :: Block ty -> String #

showList :: [Block ty] -> ShowS #

Show (Zn n) 
Instance details

Defined in Basement.Bounded

Methods

showsPrec :: Int -> Zn n -> ShowS #

show :: Zn n -> String #

showList :: [Zn n] -> ShowS #

Show (Zn64 n) 
Instance details

Defined in Basement.Bounded

Methods

showsPrec :: Int -> Zn64 n -> ShowS #

show :: Zn64 n -> String #

showList :: [Zn64 n] -> ShowS #

Show a => Show (NonEmpty a) 
Instance details

Defined in Basement.NonEmpty

Methods

showsPrec :: Int -> NonEmpty a -> ShowS #

show :: NonEmpty a -> String #

showList :: [NonEmpty a] -> ShowS #

Show (CountOf ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

showsPrec :: Int -> CountOf ty -> ShowS #

show :: CountOf ty -> String #

showList :: [CountOf ty] -> ShowS #

Show (Offset ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

showsPrec :: Int -> Offset ty -> ShowS #

show :: Offset ty -> String #

showList :: [Offset ty] -> ShowS #

(PrimType ty, Show ty) => Show (UArray ty) 
Instance details

Defined in Basement.UArray.Base

Methods

showsPrec :: Int -> UArray ty -> ShowS #

show :: UArray ty -> String #

showList :: [UArray ty] -> ShowS #

Show a => Show (Flush a) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

showsPrec :: Int -> Flush a -> ShowS #

show :: Flush a -> String #

showList :: [Flush a] -> ShowS #

Show vertex => Show (SCC vertex)

Since: containers-0.5.9

Instance details

Defined in Data.Graph

Methods

showsPrec :: Int -> SCC vertex -> ShowS #

show :: SCC vertex -> String #

showList :: [SCC vertex] -> ShowS #

Show a => Show (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

showsPrec :: Int -> IntMap a -> ShowS #

show :: IntMap a -> String #

showList :: [IntMap a] -> ShowS #

Show a => Show (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

showsPrec :: Int -> Seq a -> ShowS #

show :: Seq a -> String #

showList :: [Seq a] -> ShowS #

Show a => Show (ViewL a) 
Instance details

Defined in Data.Sequence.Internal

Methods

showsPrec :: Int -> ViewL a -> ShowS #

show :: ViewL a -> String #

showList :: [ViewL a] -> ShowS #

Show a => Show (ViewR a) 
Instance details

Defined in Data.Sequence.Internal

Methods

showsPrec :: Int -> ViewR a -> ShowS #

show :: ViewR a -> String #

showList :: [ViewR a] -> ShowS #

Show a => Show (Intersection a) 
Instance details

Defined in Data.Set.Internal

Show a => Show (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

showsPrec :: Int -> Set a -> ShowS #

show :: Set a -> String #

showList :: [Set a] -> ShowS #

Show a => Show (Tree a) 
Instance details

Defined in Data.Tree

Methods

showsPrec :: Int -> Tree a -> ShowS #

show :: Tree a -> String #

showList :: [Tree a] -> ShowS #

Show a => Show (CryptoFailable a) 
Instance details

Defined in Crypto.Error.Types

Show (Blake2b bitlen) 
Instance details

Defined in Crypto.Hash.Blake2

Methods

showsPrec :: Int -> Blake2b bitlen -> ShowS #

show :: Blake2b bitlen -> String #

showList :: [Blake2b bitlen] -> ShowS #

Show (Blake2bp bitlen) 
Instance details

Defined in Crypto.Hash.Blake2

Methods

showsPrec :: Int -> Blake2bp bitlen -> ShowS #

show :: Blake2bp bitlen -> String #

showList :: [Blake2bp bitlen] -> ShowS #

Show (Blake2s bitlen) 
Instance details

Defined in Crypto.Hash.Blake2

Methods

showsPrec :: Int -> Blake2s bitlen -> ShowS #

show :: Blake2s bitlen -> String #

showList :: [Blake2s bitlen] -> ShowS #

Show (Blake2sp bitlen) 
Instance details

Defined in Crypto.Hash.Blake2

Methods

showsPrec :: Int -> Blake2sp bitlen -> ShowS #

show :: Blake2sp bitlen -> String #

showList :: [Blake2sp bitlen] -> ShowS #

Show (SHAKE128 bitlen) 
Instance details

Defined in Crypto.Hash.SHAKE

Methods

showsPrec :: Int -> SHAKE128 bitlen -> ShowS #

show :: SHAKE128 bitlen -> String #

showList :: [SHAKE128 bitlen] -> ShowS #

Show (SHAKE256 bitlen) 
Instance details

Defined in Crypto.Hash.SHAKE

Methods

showsPrec :: Int -> SHAKE256 bitlen -> ShowS #

show :: SHAKE256 bitlen -> String #

showList :: [SHAKE256 bitlen] -> ShowS #

Show (Digest a) 
Instance details

Defined in Crypto.Hash.Types

Methods

showsPrec :: Int -> Digest a -> ShowS #

show :: Digest a -> String #

showList :: [Digest a] -> ShowS #

Show a => Show (CryptoFailable a) 
Instance details

Defined in Crypto.Error.Types

Show (Blake2b bitlen) 
Instance details

Defined in Crypto.Hash.Blake2

Methods

showsPrec :: Int -> Blake2b bitlen -> ShowS #

show :: Blake2b bitlen -> String #

showList :: [Blake2b bitlen] -> ShowS #

Show (Blake2bp bitlen) 
Instance details

Defined in Crypto.Hash.Blake2

Methods

showsPrec :: Int -> Blake2bp bitlen -> ShowS #

show :: Blake2bp bitlen -> String #

showList :: [Blake2bp bitlen] -> ShowS #

Show (Blake2s bitlen) 
Instance details

Defined in Crypto.Hash.Blake2

Methods

showsPrec :: Int -> Blake2s bitlen -> ShowS #

show :: Blake2s bitlen -> String #

showList :: [Blake2s bitlen] -> ShowS #

Show (Blake2sp bitlen) 
Instance details

Defined in Crypto.Hash.Blake2

Methods

showsPrec :: Int -> Blake2sp bitlen -> ShowS #

show :: Blake2sp bitlen -> String #

showList :: [Blake2sp bitlen] -> ShowS #

Show (SHAKE128 bitlen) 
Instance details

Defined in Crypto.Hash.SHAKE

Methods

showsPrec :: Int -> SHAKE128 bitlen -> ShowS #

show :: SHAKE128 bitlen -> String #

showList :: [SHAKE128 bitlen] -> ShowS #

Show (SHAKE256 bitlen) 
Instance details

Defined in Crypto.Hash.SHAKE

Methods

showsPrec :: Int -> SHAKE256 bitlen -> ShowS #

show :: SHAKE256 bitlen -> String #

showList :: [SHAKE256 bitlen] -> ShowS #

Show (Digest a) 
Instance details

Defined in Crypto.Hash.Types

Methods

showsPrec :: Int -> Digest a -> ShowS #

show :: Digest a -> String #

showList :: [Digest a] -> ShowS #

Show1 f => Show (Fix f) 
Instance details

Defined in Data.Fix

Methods

showsPrec :: Int -> Fix f -> ShowS #

show :: Fix f -> String #

showList :: [Fix f] -> ShowS #

(Functor f, Show1 f) => Show (Mu f) 
Instance details

Defined in Data.Fix

Methods

showsPrec :: Int -> Mu f -> ShowS #

show :: Mu f -> String #

showList :: [Mu f] -> ShowS #

(Functor f, Show1 f) => Show (Nu f) 
Instance details

Defined in Data.Fix

Methods

showsPrec :: Int -> Nu f -> ShowS #

show :: Nu f -> String #

showList :: [Nu f] -> ShowS #

Show a => Show (DNonEmpty a) 
Instance details

Defined in Data.DList.DNonEmpty.Internal

Show a => Show (DList a) 
Instance details

Defined in Data.DList.Internal

Methods

showsPrec :: Int -> DList a -> ShowS #

show :: DList a -> String #

showList :: [DList a] -> ShowS #

Show a => Show (ExitCase a) 
Instance details

Defined in Control.Monad.Catch

Methods

showsPrec :: Int -> ExitCase a -> ShowS #

show :: ExitCase a -> String #

showList :: [ExitCase a] -> ShowS #

Show v => Show (LabelMap v) 
Instance details

Defined in GHC.Cmm.Dataflow.Label

Methods

showsPrec :: Int -> LabelMap v -> ShowS #

show :: LabelMap v -> String #

showList :: [LabelMap v] -> ShowS #

Show a => Show (FromListCounting a) 
Instance details

Defined in GHC.Data.Graph.Inductive.PatriciaTree

Methods

showsPrec :: Int -> FromListCounting a -> ShowS #

show :: FromListCounting a -> String #

showList :: [FromListCounting a] -> ShowS #

Show a => Show (Word64Map a) 
Instance details

Defined in GHC.Data.Word64Map.Internal

Show a => Show (OnOff a) 
Instance details

Defined in GHC.Driver.DynFlags

Methods

showsPrec :: Int -> OnOff a -> ShowS #

show :: OnOff a -> String #

showList :: [OnOff a] -> ShowS #

Show (MsgEnvelope DiagnosticMessage) 
Instance details

Defined in GHC.Types.Error

Show a => Show (EpaLocation' a) 
Instance details

Defined in GHC.Types.SrcLoc

Show mod => Show (GenWithIsBoot mod) 
Instance details

Defined in GHC.Unit.Types

Show a => Show (SizedSeq a) 
Instance details

Defined in GHC.Data.SizedSeq

Methods

showsPrec :: Int -> SizedSeq a -> ShowS #

show :: SizedSeq a -> String #

showList :: [SizedSeq a] -> ShowS #

Show b => Show (GenClosure b) 
Instance details

Defined in GHC.Exts.Heap.Closures

Show b => Show (GenStackField b) 
Instance details

Defined in GHC.Exts.Heap.Closures

Show b => Show (GenStackFrame b) 
Instance details

Defined in GHC.Exts.Heap.Closures

Show b => Show (GenStgStackClosure b) 
Instance details

Defined in GHC.Exts.Heap.Closures

Show a => Show (NonEmpty a)

@since base-4.11.0.0

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> NonEmpty a -> ShowS #

show :: NonEmpty a -> String #

showList :: [NonEmpty a] -> ShowS #

Show a => Show (Identity a)

This instance would be equivalent to the derived instances of the Identity newtype if the runIdentity field were removed

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Identity

Methods

showsPrec :: Int -> Identity a -> ShowS #

show :: Identity a -> String #

showList :: [Identity a] -> ShowS #

Show a => Show (First a)

@since base-2.01

Instance details

Defined in GHC.Internal.Data.Monoid

Methods

showsPrec :: Int -> First a -> ShowS #

show :: First a -> String #

showList :: [First a] -> ShowS #

Show a => Show (Last a)

@since base-2.01

Instance details

Defined in GHC.Internal.Data.Monoid

Methods

showsPrec :: Int -> Last a -> ShowS #

show :: Last a -> String #

showList :: [Last a] -> ShowS #

Show a => Show (Down a)

This instance would be equivalent to the derived instances of the Down newtype if the getDown field were removed

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Data.Ord

Methods

showsPrec :: Int -> Down a -> ShowS #

show :: Down a -> String #

showList :: [Down a] -> ShowS #

Show a => Show (Dual a)

@since base-2.01

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

showsPrec :: Int -> Dual a -> ShowS #

show :: Dual a -> String #

showList :: [Dual a] -> ShowS #

Show a => Show (Product a)

@since base-2.01

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

showsPrec :: Int -> Product a -> ShowS #

show :: Product a -> String #

showList :: [Product a] -> ShowS #

Show a => Show (Sum a)

@since base-2.01

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

showsPrec :: Int -> Sum a -> ShowS #

show :: Sum a -> String #

showList :: [Sum a] -> ShowS #

Show a => Show (ExceptionWithContext a) 
Instance details

Defined in GHC.Internal.Exception.Type

Show e => Show (NoBacktrace e) 
Instance details

Defined in GHC.Internal.Exception.Type

Show (ForeignPtr a)

@since base-2.01

Instance details

Defined in GHC.Internal.ForeignPtr

Show a => Show (ZipList a)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Functor.ZipList

Methods

showsPrec :: Int -> ZipList a -> ShowS #

show :: ZipList a -> String #

showList :: [ZipList a] -> ShowS #

Show p => Show (Par1 p)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

showsPrec :: Int -> Par1 p -> ShowS #

show :: Par1 p -> String #

showList :: [Par1 p] -> ShowS #

Show (FunPtr a)

@since base-2.01

Instance details

Defined in GHC.Internal.Ptr

Methods

showsPrec :: Int -> FunPtr a -> ShowS #

show :: FunPtr a -> String #

showList :: [FunPtr a] -> ShowS #

Show (Ptr a)

@since base-2.01

Instance details

Defined in GHC.Internal.Ptr

Methods

showsPrec :: Int -> Ptr a -> ShowS #

show :: Ptr a -> String #

showList :: [Ptr a] -> ShowS #

Show a => Show (Ratio a)

@since base-2.0.1

Instance details

Defined in GHC.Internal.Real

Methods

showsPrec :: Int -> Ratio a -> ShowS #

show :: Ratio a -> String #

showList :: [Ratio a] -> ShowS #

Show (SNat n)

@since base-4.18.0.0

Instance details

Defined in GHC.Internal.TypeNats

Methods

showsPrec :: Int -> SNat n -> ShowS #

show :: SNat n -> String #

showList :: [SNat n] -> ShowS #

Show a => Show (EvalExpr a) 
Instance details

Defined in GHCi.Message

Methods

showsPrec :: Int -> EvalExpr a -> ShowS #

show :: EvalExpr a -> String #

showList :: [EvalExpr a] -> ShowS #

Show a => Show (EvalResult a) 
Instance details

Defined in GHCi.Message

Show (Message a) 
Instance details

Defined in GHCi.Message

Methods

showsPrec :: Int -> Message a -> ShowS #

show :: Message a -> String #

showList :: [Message a] -> ShowS #

Show a => Show (QResult a) 
Instance details

Defined in GHCi.Message

Methods

showsPrec :: Int -> QResult a -> ShowS #

show :: QResult a -> String #

showList :: [QResult a] -> ShowS #

Show (THMessage a) 
Instance details

Defined in GHCi.Message

Show a => Show (THResult a) 
Instance details

Defined in GHCi.Message

Methods

showsPrec :: Int -> THResult a -> ShowS #

show :: THResult a -> String #

showList :: [THResult a] -> ShowS #

Show (RemotePtr a) 
Instance details

Defined in GHCi.RemoteTypes

Show (RemoteRef a) 
Instance details

Defined in GHCi.RemoteTypes

Show (OAuthCode s) 
Instance details

Defined in Gogol.Internal.Auth

Show (OAuthToken s) 
Instance details

Defined in Gogol.Internal.Auth

Show a => Show (Hashed a) 
Instance details

Defined in Data.Hashable.Class

Methods

showsPrec :: Int -> Hashed a -> ShowS #

show :: Hashed a -> String #

showList :: [Hashed a] -> ShowS #

Show a => Show (ListOf a) 
Instance details

Defined in Language.Haskell.Exts.Parser

Methods

showsPrec :: Int -> ListOf a -> ShowS #

show :: ListOf a -> String #

showList :: [ListOf a] -> ShowS #

Show l => Show (ModuleHeadAndImports l) 
Instance details

Defined in Language.Haskell.Exts.Parser

Show a => Show (NonGreedy a) 
Instance details

Defined in Language.Haskell.Exts.Parser

Show l => Show (PragmasAndModuleHead l) 
Instance details

Defined in Language.Haskell.Exts.Parser

Show l => Show (PragmasAndModuleName l) 
Instance details

Defined in Language.Haskell.Exts.Parser

Show a => Show (Loc a) 
Instance details

Defined in Language.Haskell.Exts.SrcLoc

Methods

showsPrec :: Int -> Loc a -> ShowS #

show :: Loc a -> String #

showList :: [Loc a] -> ShowS #

Show l => Show (Activation l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (Alt l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Alt l -> ShowS #

show :: Alt l -> String #

showList :: [Alt l] -> ShowS #

Show l => Show (Annotation l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (Assoc l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Assoc l -> ShowS #

show :: Assoc l -> String #

showList :: [Assoc l] -> ShowS #

Show l => Show (Asst l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Asst l -> ShowS #

show :: Asst l -> String #

showList :: [Asst l] -> ShowS #

Show l => Show (BangType l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> BangType l -> ShowS #

show :: BangType l -> String #

showList :: [BangType l] -> ShowS #

Show l => Show (Binds l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Binds l -> ShowS #

show :: Binds l -> String #

showList :: [Binds l] -> ShowS #

Show l => Show (BooleanFormula l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (Bracket l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Bracket l -> ShowS #

show :: Bracket l -> String #

showList :: [Bracket l] -> ShowS #

Show l => Show (CName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> CName l -> ShowS #

show :: CName l -> String #

showList :: [CName l] -> ShowS #

Show l => Show (CallConv l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> CallConv l -> ShowS #

show :: CallConv l -> String #

showList :: [CallConv l] -> ShowS #

Show l => Show (ClassDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (ConDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> ConDecl l -> ShowS #

show :: ConDecl l -> String #

showList :: [ConDecl l] -> ShowS #

Show l => Show (Context l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Context l -> ShowS #

show :: Context l -> String #

showList :: [Context l] -> ShowS #

Show l => Show (DataOrNew l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (Decl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Decl l -> ShowS #

show :: Decl l -> String #

showList :: [Decl l] -> ShowS #

Show l => Show (DeclHead l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> DeclHead l -> ShowS #

show :: DeclHead l -> String #

showList :: [DeclHead l] -> ShowS #

Show l => Show (DerivStrategy l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (Deriving l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Deriving l -> ShowS #

show :: Deriving l -> String #

showList :: [Deriving l] -> ShowS #

Show l => Show (EWildcard l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (Exp l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Exp l -> ShowS #

show :: Exp l -> String #

showList :: [Exp l] -> ShowS #

Show l => Show (ExportSpec l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (ExportSpecList l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (FieldDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (FieldUpdate l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (FunDep l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> FunDep l -> ShowS #

show :: FunDep l -> String #

showList :: [FunDep l] -> ShowS #

Show l => Show (GadtDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> GadtDecl l -> ShowS #

show :: GadtDecl l -> String #

showList :: [GadtDecl l] -> ShowS #

Show l => Show (GuardedRhs l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (IPBind l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> IPBind l -> ShowS #

show :: IPBind l -> String #

showList :: [IPBind l] -> ShowS #

Show l => Show (IPName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> IPName l -> ShowS #

show :: IPName l -> String #

showList :: [IPName l] -> ShowS #

Show l => Show (ImportDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (ImportSpec l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (ImportSpecList l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (InjectivityInfo l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (InstDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> InstDecl l -> ShowS #

show :: InstDecl l -> String #

showList :: [InstDecl l] -> ShowS #

Show l => Show (InstHead l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> InstHead l -> ShowS #

show :: InstHead l -> String #

showList :: [InstHead l] -> ShowS #

Show l => Show (InstRule l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> InstRule l -> ShowS #

show :: InstRule l -> String #

showList :: [InstRule l] -> ShowS #

Show l => Show (Literal l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Literal l -> ShowS #

show :: Literal l -> String #

showList :: [Literal l] -> ShowS #

Show l => Show (Match l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Match l -> ShowS #

show :: Match l -> String #

showList :: [Match l] -> ShowS #

Show l => Show (MaybePromotedName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (Module l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Module l -> ShowS #

show :: Module l -> String #

showList :: [Module l] -> ShowS #

Show l => Show (ModuleHead l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (ModuleName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (ModulePragma l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (Name l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Name l -> ShowS #

show :: Name l -> String #

showList :: [Name l] -> ShowS #

Show l => Show (Namespace l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (Op l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Op l -> ShowS #

show :: Op l -> String #

showList :: [Op l] -> ShowS #

Show l => Show (Overlap l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Overlap l -> ShowS #

show :: Overlap l -> String #

showList :: [Overlap l] -> ShowS #

Show l => Show (PXAttr l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> PXAttr l -> ShowS #

show :: PXAttr l -> String #

showList :: [PXAttr l] -> ShowS #

Show l => Show (Pat l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Pat l -> ShowS #

show :: Pat l -> String #

showList :: [Pat l] -> ShowS #

Show l => Show (PatField l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> PatField l -> ShowS #

show :: PatField l -> String #

showList :: [PatField l] -> ShowS #

Show l => Show (PatternSynDirection l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (Promoted l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Promoted l -> ShowS #

show :: Promoted l -> String #

showList :: [Promoted l] -> ShowS #

Show l => Show (QName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> QName l -> ShowS #

show :: QName l -> String #

showList :: [QName l] -> ShowS #

Show l => Show (QOp l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> QOp l -> ShowS #

show :: QOp l -> String #

showList :: [QOp l] -> ShowS #

Show l => Show (QualConDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (QualStmt l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> QualStmt l -> ShowS #

show :: QualStmt l -> String #

showList :: [QualStmt l] -> ShowS #

Show l => Show (RPat l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> RPat l -> ShowS #

show :: RPat l -> String #

showList :: [RPat l] -> ShowS #

Show l => Show (RPatOp l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> RPatOp l -> ShowS #

show :: RPatOp l -> String #

showList :: [RPatOp l] -> ShowS #

Show l => Show (ResultSig l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (Rhs l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Rhs l -> ShowS #

show :: Rhs l -> String #

showList :: [Rhs l] -> ShowS #

Show l => Show (Role l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Role l -> ShowS #

show :: Role l -> String #

showList :: [Role l] -> ShowS #

Show l => Show (Rule l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Rule l -> ShowS #

show :: Rule l -> String #

showList :: [Rule l] -> ShowS #

Show l => Show (RuleVar l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> RuleVar l -> ShowS #

show :: RuleVar l -> String #

showList :: [RuleVar l] -> ShowS #

Show l => Show (Safety l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Safety l -> ShowS #

show :: Safety l -> String #

showList :: [Safety l] -> ShowS #

Show l => Show (Sign l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Sign l -> ShowS #

show :: Sign l -> String #

showList :: [Sign l] -> ShowS #

Show l => Show (SpecialCon l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (Splice l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Splice l -> ShowS #

show :: Splice l -> String #

showList :: [Splice l] -> ShowS #

Show l => Show (Stmt l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Stmt l -> ShowS #

show :: Stmt l -> String #

showList :: [Stmt l] -> ShowS #

Show l => Show (TyVarBind l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (Type l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Type l -> ShowS #

show :: Type l -> String #

showList :: [Type l] -> ShowS #

Show l => Show (TypeEqn l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> TypeEqn l -> ShowS #

show :: TypeEqn l -> String #

showList :: [TypeEqn l] -> ShowS #

Show l => Show (Unpackedness l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (WarningText l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Show l => Show (XAttr l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> XAttr l -> ShowS #

show :: XAttr l -> String #

showList :: [XAttr l] -> ShowS #

Show l => Show (XName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> XName l -> ShowS #

show :: XName l -> String #

showList :: [XName l] -> ShowS #

Show body => Show (HistoriedResponse body) 
Instance details

Defined in Network.HTTP.Client

Show body => Show (Response body) 
Instance details

Defined in Network.HTTP.Client.Types

Methods

showsPrec :: Int -> Response body -> ShowS #

show :: Response body -> String #

showList :: [Response body] -> ShowS #

Show a => Show (AddrRange a) 
Instance details

Defined in Data.IP.Range

Show a => Show (Item a) 
Instance details

Defined in Katip.Core

Methods

showsPrec :: Int -> Item a -> ShowS #

show :: Item a -> String #

showList :: [Item a] -> ShowS #

Show a => Show (Deque a) 
Instance details

Defined in Control.Lens.Internal.Deque

Methods

showsPrec :: Int -> Deque a -> ShowS #

show :: Deque a -> String #

showList :: [Deque a] -> ShowS #

Show (FieldException a) 
Instance details

Defined in Data.Data.Lens

Methods

showsPrec :: Int -> FieldException a -> ShowS #

show :: FieldException a -> String #

showList :: [FieldException a] -> ShowS #

Show e => Show (ErrorFancy e) 
Instance details

Defined in Text.Megaparsec.Error

Show t => Show (ErrorItem t) 
Instance details

Defined in Text.Megaparsec.Error

Show s => Show (PosState s) 
Instance details

Defined in Text.Megaparsec.State

Methods

showsPrec :: Int -> PosState s -> ShowS #

show :: PosState s -> String #

showList :: [PosState s] -> ShowS #

Show mono => Show (NonNull mono) 
Instance details

Defined in Data.NonNull

Methods

showsPrec :: Int -> NonNull mono -> ShowS #

show :: NonNull mono -> String #

showList :: [NonNull mono] -> ShowS #

Show a => Show (WithinSet a) # 
Instance details

Defined in Napkin.Run.Effects.Hooks.Types

Show a => Show (ColumnPolicy a) # 
Instance details

Defined in Napkin.Run.Effects.Programs

Show (BackendTableMeta b) => Show (CreateTableAs b) # 
Instance details

Defined in Napkin.Spec.Types.CreateTableAs

Show a => Show (Named a) 
Instance details

Defined in Napkin.Run.PGCommon

Methods

showsPrec :: Int -> Named a -> ShowS #

show :: Named a -> String #

showList :: [Named a] -> ShowS #

Show a => Show (BoolOrOpts a) 
Instance details

Defined in Napkin.Types.Postgres.Timescale

Show a => Show (ContinuousAggregatePolicy' a) 
Instance details

Defined in Napkin.Types.Postgres.Timescale

Show ref => Show (DefinedCTEs ref) 
Instance details

Defined in Language.SQL.SimpleSQL.RewriteCollectDeps

Methods

showsPrec :: Int -> DefinedCTEs ref -> ShowS #

show :: DefinedCTEs ref -> String #

showList :: [DefinedCTEs ref] -> ShowS #

Show ref => Show (Dependencies ref) 
Instance details

Defined in Language.SQL.SimpleSQL.RewriteCollectDeps

Methods

showsPrec :: Int -> Dependencies ref -> ShowS #

show :: Dependencies ref -> String #

showList :: [Dependencies ref] -> ShowS #

Show a => Show (Alias a) 
Instance details

Defined in Napkin.Types.Core

Methods

showsPrec :: Int -> Alias a -> ShowS #

show :: Alias a -> String #

showList :: [Alias a] -> ShowS #

Show a => Show (Selected a) 
Instance details

Defined in Napkin.Types.Core

Methods

showsPrec :: Int -> Selected a -> ShowS #

show :: Selected a -> String #

showList :: [Selected a] -> ShowS #

Show a => Show (WithSpecTable a) 
Instance details

Defined in Napkin.Types.Core

Show ref => Show (DefinedCTEs ref) 
Instance details

Defined in PostgresqlSyntax.Ast.RewriteCollectDeps

Methods

showsPrec :: Int -> DefinedCTEs ref -> ShowS #

show :: DefinedCTEs ref -> String #

showList :: [DefinedCTEs ref] -> ShowS #

Show ref => Show (Dependencies ref) 
Instance details

Defined in PostgresqlSyntax.Ast.RewriteCollectDeps

Methods

showsPrec :: Int -> Dependencies ref -> ShowS #

show :: Dependencies ref -> String #

showList :: [Dependencies ref] -> ShowS #

Show a => Show (Transformed a) 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

Show (BackendMaterializedViewMeta b) => Show (YamlBackendMaterializedViewMeta b) 
Instance details

Defined in Napkin.Spec.Yaml.Types.BackendMeta

Show (BackendTableMeta b) => Show (YamlBackendTableMeta b) 
Instance details

Defined in Napkin.Spec.Yaml.Types.BackendMeta

Show (BackendViewMeta b) => Show (YamlBackendViewMeta b) 
Instance details

Defined in Napkin.Spec.Yaml.Types.BackendMeta

Show a => Show (Step a) 
Instance details

Defined in Database.ODBC.Internal

Methods

showsPrec :: Int -> Step a -> ShowS #

show :: Step a -> String #

showList :: [Step a] -> ShowS #

Show a => Show (Chunk a) 
Instance details

Defined in Options.Applicative.Help.Chunk

Methods

showsPrec :: Int -> Chunk a -> ShowS #

show :: Chunk a -> String #

showList :: [Chunk a] -> ShowS #

Show a => Show (OptTree a) 
Instance details

Defined in Options.Applicative.Types

Methods

showsPrec :: Int -> OptTree a -> ShowS #

show :: OptTree a -> String #

showList :: [OptTree a] -> ShowS #

Show (Option a) 
Instance details

Defined in Options.Applicative.Types

Methods

showsPrec :: Int -> Option a -> ShowS #

show :: Option a -> String #

showList :: [Option a] -> ShowS #

Show h => Show (ParserFailure h) 
Instance details

Defined in Options.Applicative.Types

Show a => Show (ParserResult a) 
Instance details

Defined in Options.Applicative.Types

Show a => Show (OSet a) 
Instance details

Defined in Data.Set.Ordered

Methods

showsPrec :: Int -> OSet a -> ShowS #

show :: OSet a -> String #

showList :: [OSet a] -> ShowS #

Show a => Show (AnnotDetails a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Show (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

showsPrec :: Int -> Doc a -> ShowS #

show :: Doc a -> String #

showList :: [Doc a] -> ShowS #

Show a => Show (Span a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

showsPrec :: Int -> Span a -> ShowS #

show :: Span a -> String #

showList :: [Span a] -> ShowS #

Show a => Show (CommaSeparated a) 
Instance details

Defined in Text.Pretty.Simple.Internal.Expr

Show a => Show (Stream a) 
Instance details

Defined in Text.Pretty.Simple.Internal.Printer

Methods

showsPrec :: Int -> Stream a -> ShowS #

show :: Stream a -> String #

showList :: [Stream a] -> ShowS #

Show a => Show (Tape a) 
Instance details

Defined in Text.Pretty.Simple.Internal.Printer

Methods

showsPrec :: Int -> Tape a -> ShowS #

show :: Tape a -> String #

showList :: [Tape a] -> ShowS #

Show (Doc ann)

(show doc) prettyprints document doc with defaultLayoutOptions, ignoring all annotations.

Instance details

Defined in Prettyprinter.Internal

Methods

showsPrec :: Int -> Doc ann -> ShowS #

show :: Doc ann -> String #

showList :: [Doc ann] -> ShowS #

Show ann => Show (SimpleDocStream ann) 
Instance details

Defined in Prettyprinter.Internal

Show a => Show (Array a) 
Instance details

Defined in Data.Primitive.Array

Methods

showsPrec :: Int -> Array a -> ShowS #

show :: Array a -> String #

showList :: [Array a] -> ShowS #

(Show a, Prim a) => Show (PrimArray a)

Since: primitive-0.6.4.0

Instance details

Defined in Data.Primitive.PrimArray

Show a => Show (SmallArray a) 
Instance details

Defined in Data.Primitive.SmallArray

Show g => Show (StateGen g) 
Instance details

Defined in System.Random.Internal

Methods

showsPrec :: Int -> StateGen g -> ShowS #

show :: StateGen g -> String #

showList :: [StateGen g] -> ShowS #

Show g => Show (AtomicGen g) 
Instance details

Defined in System.Random.Stateful

Show g => Show (IOGen g) 
Instance details

Defined in System.Random.Stateful

Methods

showsPrec :: Int -> IOGen g -> ShowS #

show :: IOGen g -> String #

showList :: [IOGen g] -> ShowS #

Show g => Show (STGen g) 
Instance details

Defined in System.Random.Stateful

Methods

showsPrec :: Int -> STGen g -> ShowS #

show :: STGen g -> String #

showList :: [STGen g] -> ShowS #

Show g => Show (TGen g) 
Instance details

Defined in System.Random.Stateful

Methods

showsPrec :: Int -> TGen g -> ShowS #

show :: TGen g -> String #

showList :: [TGen g] -> ShowS #

Show a => Show (Trie a) 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Trie

Methods

showsPrec :: Int -> Trie a -> ShowS #

show :: Trie a -> String #

showList :: [Trie a] -> ShowS #

Show a => Show (I a) 
Instance details

Defined in Data.SOP.BasicFunctors

Methods

showsPrec :: Int -> I a -> ShowS #

show :: I a -> String #

showList :: [I a] -> ShowS #

Show a => Show (Maybe a) 
Instance details

Defined in Data.Strict.Maybe

Methods

showsPrec :: Int -> Maybe a -> ShowS #

show :: Maybe a -> String #

showList :: [Maybe a] -> ShowS #

Show flag => Show (TyVarBndr flag) 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> TyVarBndr flag -> ShowS #

show :: TyVarBndr flag -> String #

showList :: [TyVarBndr flag] -> ShowS #

Show a => Show (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Methods

showsPrec :: Int -> HashSet a -> ShowS #

show :: HashSet a -> String #

showList :: [HashSet a] -> ShowS #

Show (URIRef a) 
Instance details

Defined in URI.ByteString.Types

Methods

showsPrec :: Int -> URIRef a -> ShowS #

show :: URIRef a -> String #

showList :: [URIRef a] -> ShowS #

Show a => Show (Vector a) 
Instance details

Defined in Data.Vector

Methods

showsPrec :: Int -> Vector a -> ShowS #

show :: Vector a -> String #

showList :: [Vector a] -> ShowS #

(Show a, Prim a) => Show (Vector a) 
Instance details

Defined in Data.Vector.Primitive

Methods

showsPrec :: Int -> Vector a -> ShowS #

show :: Vector a -> String #

showList :: [Vector a] -> ShowS #

(Show a, Storable a) => Show (Vector a) 
Instance details

Defined in Data.Vector.Storable

Methods

showsPrec :: Int -> Vector a -> ShowS #

show :: Vector a -> String #

showList :: [Vector a] -> ShowS #

Show a => Show (Maybe a)

@since base-2.01

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> Maybe a -> ShowS #

show :: Maybe a -> String #

showList :: [Maybe a] -> ShowS #

Show a => Show (Solo a)

@since base-4.15

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> Solo a -> ShowS #

show :: Solo a -> String #

showList :: [Solo a] -> ShowS #

Show a => Show [a]

@since base-2.01

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> [a] -> ShowS #

show :: [a] -> String #

showList :: [[a]] -> ShowS #

(Show k, Show e) => Show (TkArray k e) 
Instance details

Defined in Data.Aeson.Decoding.Tokens

Methods

showsPrec :: Int -> TkArray k e -> ShowS #

show :: TkArray k e -> String #

showList :: [TkArray k e] -> ShowS #

(Show k, Show e) => Show (TkRecord k e) 
Instance details

Defined in Data.Aeson.Decoding.Tokens

Methods

showsPrec :: Int -> TkRecord k e -> ShowS #

show :: TkRecord k e -> String #

showList :: [TkRecord k e] -> ShowS #

(Show k, Show e) => Show (Tokens k e) 
Instance details

Defined in Data.Aeson.Decoding.Tokens

Methods

showsPrec :: Int -> Tokens k e -> ShowS #

show :: Tokens k e -> String #

showList :: [Tokens k e] -> ShowS #

(Ix ix, Show ix, Show e, IArray UArray e) => Show (UArray ix e) 
Instance details

Defined in Data.Array.Base

Methods

showsPrec :: Int -> UArray ix e -> ShowS #

show :: UArray ix e -> String #

showList :: [UArray ix e] -> ShowS #

(Show i, Show r) => Show (IResult i r) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

showsPrec :: Int -> IResult i r -> ShowS #

show :: IResult i r -> String #

showList :: [IResult i r] -> ShowS #

HasResolution a => Show (Fixed a)

Since: base-2.1

Instance details

Defined in Data.Fixed

Methods

showsPrec :: Int -> Fixed a -> ShowS #

show :: Fixed a -> String #

showList :: [Fixed a] -> ShowS #

(Show a, Show b) => Show (Arg a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

showsPrec :: Int -> Arg a b -> ShowS #

show :: Arg a b -> String #

showList :: [Arg a b] -> ShowS #

(Show k, Show a) => Show (Map k a) 
Instance details

Defined in Data.Map.Internal

Methods

showsPrec :: Int -> Map k a -> ShowS #

show :: Map k a -> String #

showList :: [Map k a] -> ShowS #

(Show1 f, Show a) => Show (Cofree f a) 
Instance details

Defined in Control.Comonad.Cofree

Methods

showsPrec :: Int -> Cofree f a -> ShowS #

show :: Cofree f a -> String #

showList :: [Cofree f a] -> ShowS #

(Show1 f, Show a) => Show (Free f a) 
Instance details

Defined in Control.Monad.Free

Methods

showsPrec :: Int -> Free f a -> ShowS #

show :: Free f a -> String #

showList :: [Free f a] -> ShowS #

(Show a, Show b) => Show (Gr a b) 
Instance details

Defined in GHC.Data.Graph.Inductive.PatriciaTree

Methods

showsPrec :: Int -> Gr a b -> ShowS #

show :: Gr a b -> String #

showList :: [Gr a b] -> ShowS #

(Show l, Show e) => Show (GenLocated l e) 
Instance details

Defined in GHC.Types.SrcLoc

Methods

showsPrec :: Int -> GenLocated l e -> ShowS #

show :: GenLocated l e -> String #

showList :: [GenLocated l e] -> ShowS #

(Show a, Show b) => Show (Either a b)

@since base-3.0

Instance details

Defined in GHC.Internal.Data.Either

Methods

showsPrec :: Int -> Either a b -> ShowS #

show :: Either a b -> String #

showList :: [Either a b] -> ShowS #

Show (Proxy s)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Data.Proxy

Methods

showsPrec :: Int -> Proxy s -> ShowS #

show :: Proxy s -> String #

showList :: [Proxy s] -> ShowS #

Show (TypeRep a) 
Instance details

Defined in GHC.Internal.Data.Typeable.Internal

Methods

showsPrec :: Int -> TypeRep a -> ShowS #

show :: TypeRep a -> String #

showList :: [TypeRep a] -> ShowS #

Show (U1 p)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

showsPrec :: Int -> U1 p -> ShowS #

show :: U1 p -> String #

showList :: [U1 p] -> ShowS #

Show (V1 p)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

showsPrec :: Int -> V1 p -> ShowS #

show :: V1 p -> String #

showList :: [V1 p] -> ShowS #

Show a => Show (EvalStatus_ a b) 
Instance details

Defined in GHCi.Message

Methods

showsPrec :: Int -> EvalStatus_ a b -> ShowS #

show :: EvalStatus_ a b -> String #

showList :: [EvalStatus_ a b] -> ShowS #

Show (f a) => Show (Yoneda f a) 
Instance details

Defined in Data.Functor.Yoneda

Methods

showsPrec :: Int -> Yoneda f a -> ShowS #

show :: Yoneda f a -> String #

showList :: [Yoneda f a] -> ShowS #

(Show i, Show a) => Show (Level i a) 
Instance details

Defined in Control.Lens.Internal.Level

Methods

showsPrec :: Int -> Level i a -> ShowS #

show :: Level i a -> String #

showList :: [Level i a] -> ShowS #

(Show (Token s), Show e) => Show (ParseError s e) 
Instance details

Defined in Text.Megaparsec.Error

Methods

showsPrec :: Int -> ParseError s e -> ShowS #

show :: ParseError s e -> String #

showList :: [ParseError s e] -> ShowS #

(Show s, Show (Token s), Show e) => Show (ParseErrorBundle s e) 
Instance details

Defined in Text.Megaparsec.Error

(Show (ParseError s e), Show s) => Show (State s e) 
Instance details

Defined in Text.Megaparsec.State

Methods

showsPrec :: Int -> State s e -> ShowS #

show :: State s e -> String #

showList :: [State s e] -> ShowS #

Show (Answer b a) 
Instance details

Defined in Data.Data.Oracle

Methods

showsPrec :: Int -> Answer b a -> ShowS #

show :: Answer b a -> String #

showList :: [Answer b a] -> ShowS #

Show (Ref a) 
Instance details

Defined in Napkin.Types.Core

Methods

showsPrec :: Int -> Ref a -> ShowS #

show :: Ref a -> String #

showList :: [Ref a] -> ShowS #

Show (DumpItem b) 
Instance details

Defined in Napkin.Run.Effects.Interceptors.LogProgram.Types

Methods

showsPrec :: Int -> DumpItem b -> ShowS #

show :: DumpItem b -> String #

showList :: [DumpItem b] -> ShowS #

Show (Renderable b) 
Instance details

Defined in Napkin.Run.Effects.Interceptors.LogProgram.Types

Show (DryRunResult b) 
Instance details

Defined in Napkin.Run.Effects.Types

Show (BackendQueryStats bk) => Show (QueryStats bk) 
Instance details

Defined in Napkin.Types.QueryStats

Methods

showsPrec :: Int -> QueryStats bk -> ShowS #

show :: QueryStats bk -> String #

showList :: [QueryStats bk] -> ShowS #

(Show k, Show v) => Show (OMap k v) 
Instance details

Defined in Data.Map.Ordered.Internal

Methods

showsPrec :: Int -> OMap k v -> ShowS #

show :: OMap k v -> String #

showList :: [OMap k v] -> ShowS #

Show a => Show (WithStatus k a) 
Instance details

Defined in Servant.API.UVerb

Methods

showsPrec :: Int -> WithStatus k a -> ShowS #

show :: WithStatus k a -> String #

showList :: [WithStatus k a] -> ShowS #

(Show a, Show b) => Show (Either a b) 
Instance details

Defined in Data.Strict.Either

Methods

showsPrec :: Int -> Either a b -> ShowS #

show :: Either a b -> String #

showList :: [Either a b] -> ShowS #

(Show a, Show b) => Show (These a b) 
Instance details

Defined in Data.Strict.These

Methods

showsPrec :: Int -> These a b -> ShowS #

show :: These a b -> String #

showList :: [These a b] -> ShowS #

(Show a, Show b) => Show (Pair a b) 
Instance details

Defined in Data.Strict.Tuple

Methods

showsPrec :: Int -> Pair a b -> ShowS #

show :: Pair a b -> String #

showList :: [Pair a b] -> ShowS #

Show a => Show (B dst a) 
Instance details

Defined in Data.String.Interpolate.Conversion.Classes

Methods

showsPrec :: Int -> B dst a -> ShowS #

show :: B dst a -> String #

showList :: [B dst a] -> ShowS #

(Show a, Show b) => Show (These a b) 
Instance details

Defined in Data.These

Methods

showsPrec :: Int -> These a b -> ShowS #

show :: These a b -> String #

showList :: [These a b] -> ShowS #

(Show1 f, Show a) => Show (Lift f a) 
Instance details

Defined in Control.Applicative.Lift

Methods

showsPrec :: Int -> Lift f a -> ShowS #

show :: Lift f a -> String #

showList :: [Lift f a] -> ShowS #

(Show1 m, Show a) => Show (MaybeT m a) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

showsPrec :: Int -> MaybeT m a -> ShowS #

show :: MaybeT m a -> String #

showList :: [MaybeT m a] -> ShowS #

(Show k, Show v) => Show (HashMap k v) 
Instance details

Defined in Data.HashMap.Internal

Methods

showsPrec :: Int -> HashMap k v -> ShowS #

show :: HashMap k v -> String #

showList :: [HashMap k v] -> ShowS #

(Show a, Show b) => Show (a, b)

@since base-2.01

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> (a, b) -> ShowS #

show :: (a, b) -> String #

showList :: [(a, b)] -> ShowS #

Show (p (Fix p a) a) => Show (Fix p a) 
Instance details

Defined in Data.Bifunctor.Fix

Methods

showsPrec :: Int -> Fix p a -> ShowS #

show :: Fix p a -> String #

showList :: [Fix p a] -> ShowS #

Show (p a a) => Show (Join p a) 
Instance details

Defined in Data.Bifunctor.Join

Methods

showsPrec :: Int -> Join p a -> ShowS #

show :: Join p a -> String #

showList :: [Join p a] -> ShowS #

(Show a, Show (f b)) => Show (CofreeF f a b) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

showsPrec :: Int -> CofreeF f a b -> ShowS #

show :: CofreeF f a b -> String #

showList :: [CofreeF f a b] -> ShowS #

Show (w (CofreeF f a (CofreeT f w a))) => Show (CofreeT f w a) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

showsPrec :: Int -> CofreeT f w a -> ShowS #

show :: CofreeT f w a -> String #

showList :: [CofreeT f w a] -> ShowS #

(Show a, Show (f b)) => Show (FreeF f a b) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

showsPrec :: Int -> FreeF f a b -> ShowS #

show :: FreeF f a b -> String #

showList :: [FreeF f a b] -> ShowS #

(Show1 f, Show1 m, Show a) => Show (FreeT f m a) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

showsPrec :: Int -> FreeT f m a -> ShowS #

show :: FreeT f m a -> String #

showList :: [FreeT f m a] -> ShowS #

Show a => Show (Const a b)

This instance would be equivalent to the derived instances of the Const newtype if the getConst field were removed

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Const

Methods

showsPrec :: Int -> Const a b -> ShowS #

show :: Const a b -> String #

showList :: [Const a b] -> ShowS #

Show (f a) => Show (Ap f a)

@since base-4.12.0.0

Instance details

Defined in GHC.Internal.Data.Monoid

Methods

showsPrec :: Int -> Ap f a -> ShowS #

show :: Ap f a -> String #

showList :: [Ap f a] -> ShowS #

Show (f a) => Show (Alt f a)

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

showsPrec :: Int -> Alt f a -> ShowS #

show :: Alt f a -> String #

showList :: [Alt f a] -> ShowS #

Show (a :~: b)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Data.Type.Equality

Methods

showsPrec :: Int -> (a :~: b) -> ShowS #

show :: (a :~: b) -> String #

showList :: [a :~: b] -> ShowS #

Show (OrderingI a b) 
Instance details

Defined in GHC.Internal.Data.Type.Ord

Methods

showsPrec :: Int -> OrderingI a b -> ShowS #

show :: OrderingI a b -> String #

showList :: [OrderingI a b] -> ShowS #

Show (f p) => Show (Rec1 f p)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

showsPrec :: Int -> Rec1 f p -> ShowS #

show :: Rec1 f p -> String #

showList :: [Rec1 f p] -> ShowS #

Show (URec Char p)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

showsPrec :: Int -> URec Char p -> ShowS #

show :: URec Char p -> String #

showList :: [URec Char p] -> ShowS #

Show (URec Double p)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

showsPrec :: Int -> URec Double p -> ShowS #

show :: URec Double p -> String #

showList :: [URec Double p] -> ShowS #

Show (URec Float p) 
Instance details

Defined in GHC.Internal.Generics

Methods

showsPrec :: Int -> URec Float p -> ShowS #

show :: URec Float p -> String #

showList :: [URec Float p] -> ShowS #

Show (URec Int p)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

showsPrec :: Int -> URec Int p -> ShowS #

show :: URec Int p -> String #

showList :: [URec Int p] -> ShowS #

Show (URec Word p)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

showsPrec :: Int -> URec Word p -> ShowS #

show :: URec Word p -> String #

showList :: [URec Word p] -> ShowS #

Show (f (a, b)) => Show (AlongsideLeft f b a) 
Instance details

Defined in Control.Lens.Internal.Getter

Methods

showsPrec :: Int -> AlongsideLeft f b a -> ShowS #

show :: AlongsideLeft f b a -> String #

showList :: [AlongsideLeft f b a] -> ShowS #

Show (f (a, b)) => Show (AlongsideRight f a b) 
Instance details

Defined in Control.Lens.Internal.Getter

Methods

showsPrec :: Int -> AlongsideRight f a b -> ShowS #

show :: AlongsideRight f a b -> String #

showList :: [AlongsideRight f a b] -> ShowS #

Show (Assertion a b) 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

Methods

showsPrec :: Int -> Assertion a b -> ShowS #

show :: Assertion a b -> String #

showList :: [Assertion a b] -> ShowS #

Show (External m a) 
Instance details

Defined in Napkin.Run.Effects.Languages.External

Methods

showsPrec :: Int -> External m a -> ShowS #

show :: External m a -> String #

showList :: [External m a] -> ShowS #

Show (SqlParse m a) 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlParse

Methods

showsPrec :: Int -> SqlParse m a -> ShowS #

show :: SqlParse m a -> String #

showList :: [SqlParse m a] -> ShowS #

Show (SqlRender a b) 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlRender

Methods

showsPrec :: Int -> SqlRender a b -> ShowS #

show :: SqlRender a b -> String #

showList :: [SqlRender a b] -> ShowS #

Show a => Show (K a b) 
Instance details

Defined in Data.SOP.BasicFunctors

Methods

showsPrec :: Int -> K a b -> ShowS #

show :: K a b -> String #

showList :: [K a b] -> ShowS #

All (Compose Show f) xs => Show (NP f xs) 
Instance details

Defined in Data.SOP.NP

Methods

showsPrec :: Int -> NP f xs -> ShowS #

show :: NP f xs -> String #

showList :: [NP f xs] -> ShowS #

Show (NP (NP f) xss) => Show (POP f xss) 
Instance details

Defined in Data.SOP.NP

Methods

showsPrec :: Int -> POP f xss -> ShowS #

show :: POP f xss -> String #

showList :: [POP f xss] -> ShowS #

All (Compose Show f) xs => Show (NS f xs) 
Instance details

Defined in Data.SOP.NS

Methods

showsPrec :: Int -> NS f xs -> ShowS #

show :: NS f xs -> String #

showList :: [NS f xs] -> ShowS #

Show (NS (NP f) xss) => Show (SOP f xss) 
Instance details

Defined in Data.SOP.NS

Methods

showsPrec :: Int -> SOP f xss -> ShowS #

show :: SOP f xss -> String #

showList :: [SOP f xss] -> ShowS #

Show b => Show (Tagged s b) 
Instance details

Defined in Data.Tagged

Methods

showsPrec :: Int -> Tagged s b -> ShowS #

show :: Tagged s b -> String #

showList :: [Tagged s b] -> ShowS #

(Show (f a), Show (g a), Show a) => Show (These1 f g a) 
Instance details

Defined in Data.Functor.These

Methods

showsPrec :: Int -> These1 f g a -> ShowS #

show :: These1 f g a -> String #

showList :: [These1 f g a] -> ShowS #

(Show1 f, Show a) => Show (Backwards f a) 
Instance details

Defined in Control.Applicative.Backwards

Methods

showsPrec :: Int -> Backwards f a -> ShowS #

show :: Backwards f a -> String #

showList :: [Backwards f a] -> ShowS #

(Show e, Show1 m, Show a) => Show (ExceptT e m a) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

showsPrec :: Int -> ExceptT e m a -> ShowS #

show :: ExceptT e m a -> String #

showList :: [ExceptT e m a] -> ShowS #

(Show1 f, Show a) => Show (IdentityT f a) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

showsPrec :: Int -> IdentityT f a -> ShowS #

show :: IdentityT f a -> String #

showList :: [IdentityT f a] -> ShowS #

(Show w, Show1 m, Show a) => Show (WriterT w m a) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

showsPrec :: Int -> WriterT w m a -> ShowS #

show :: WriterT w m a -> String #

showList :: [WriterT w m a] -> ShowS #

(Show w, Show1 m, Show a) => Show (WriterT w m a) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

showsPrec :: Int -> WriterT w m a -> ShowS #

show :: WriterT w m a -> String #

showList :: [WriterT w m a] -> ShowS #

Show a => Show (Constant a b) 
Instance details

Defined in Data.Functor.Constant

Methods

showsPrec :: Int -> Constant a b -> ShowS #

show :: Constant a b -> String #

showList :: [Constant a b] -> ShowS #

(Show1 f, Show a) => Show (Reverse f a) 
Instance details

Defined in Data.Functor.Reverse

Methods

showsPrec :: Int -> Reverse f a -> ShowS #

show :: Reverse f a -> String #

showList :: [Reverse f a] -> ShowS #

(Show a, Show b, Show c) => Show (a, b, c)

@since base-2.01

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> (a, b, c) -> ShowS #

show :: (a, b, c) -> String #

showList :: [(a, b, c)] -> ShowS #

(Show (f a), Show (g a)) => Show (Product f g a)

Since: base-4.18.0.0

Instance details

Defined in Data.Functor.Product

Methods

showsPrec :: Int -> Product f g a -> ShowS #

show :: Product f g a -> String #

showList :: [Product f g a] -> ShowS #

(Show (f a), Show (g a)) => Show (Sum f g a)

Since: base-4.18.0.0

Instance details

Defined in Data.Functor.Sum

Methods

showsPrec :: Int -> Sum f g a -> ShowS #

show :: Sum f g a -> String #

showList :: [Sum f g a] -> ShowS #

Show (a :~~: b)

@since base-4.10.0.0

Instance details

Defined in GHC.Internal.Data.Type.Equality

Methods

showsPrec :: Int -> (a :~~: b) -> ShowS #

show :: (a :~~: b) -> String #

showList :: [a :~~: b] -> ShowS #

(Show (f p), Show (g p)) => Show ((f :*: g) p)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

showsPrec :: Int -> (f :*: g) p -> ShowS #

show :: (f :*: g) p -> String #

showList :: [(f :*: g) p] -> ShowS #

(Show (f p), Show (g p)) => Show ((f :+: g) p)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

showsPrec :: Int -> (f :+: g) p -> ShowS #

show :: (f :+: g) p -> String #

showList :: [(f :+: g) p] -> ShowS #

Show c => Show (K1 i c p)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

showsPrec :: Int -> K1 i c p -> ShowS #

show :: K1 i c p -> String #

showList :: [K1 i c p] -> ShowS #

Show (Handling a s m) 
Instance details

Defined in Control.Lens.Internal.Exception

Methods

showsPrec :: Int -> Handling a s m -> ShowS #

show :: Handling a s m -> String #

showList :: [Handling a s m] -> ShowS #

(Show i, Show a) => Show (Magma i t b a) 
Instance details

Defined in Control.Lens.Internal.Magma

Methods

showsPrec :: Int -> Magma i t b a -> ShowS #

show :: Magma i t b a -> String #

showList :: [Magma i t b a] -> ShowS #

(Show (BackendMaterializedViewMeta b), Show (BackendTableMeta b), Show (BackendViewMeta b)) => Show (RecreateTable b a c) 
Instance details

Defined in Napkin.Run.Effects.Languages.Recreate

Methods

showsPrec :: Int -> RecreateTable b a c -> ShowS #

show :: RecreateTable b a c -> String #

showList :: [RecreateTable b a c] -> ShowS #

(Show (BackendMaterializedViewMeta bk), Show (BackendTableMeta bk), Show (BackendViewMeta bk)) => Show (SqlWrite bk a b) 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlWrite

Methods

showsPrec :: Int -> SqlWrite bk a b -> ShowS #

show :: SqlWrite bk a b -> String #

showList :: [SqlWrite bk a b] -> ShowS #

(Show a, Show b, Show c, Show d) => Show (a, b, c, d)

@since base-2.01

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> (a, b, c, d) -> ShowS #

show :: (a, b, c, d) -> String #

showList :: [(a, b, c, d)] -> ShowS #

Show (f (g a)) => Show (Compose f g a)

Since: base-4.18.0.0

Instance details

Defined in Data.Functor.Compose

Methods

showsPrec :: Int -> Compose f g a -> ShowS #

show :: Compose f g a -> String #

showList :: [Compose f g a] -> ShowS #

Show (f a) => Show (Clown f a b) 
Instance details

Defined in Data.Bifunctor.Clown

Methods

showsPrec :: Int -> Clown f a b -> ShowS #

show :: Clown f a b -> String #

showList :: [Clown f a b] -> ShowS #

Show (p b a) => Show (Flip p a b) 
Instance details

Defined in Data.Bifunctor.Flip

Methods

showsPrec :: Int -> Flip p a b -> ShowS #

show :: Flip p a b -> String #

showList :: [Flip p a b] -> ShowS #

Show (g b) => Show (Joker g a b) 
Instance details

Defined in Data.Bifunctor.Joker

Methods

showsPrec :: Int -> Joker g a b -> ShowS #

show :: Joker g a b -> String #

showList :: [Joker g a b] -> ShowS #

Show (p a b) => Show (WrappedBifunctor p a b) 
Instance details

Defined in Data.Bifunctor.Wrapped

Show (f (g p)) => Show ((f :.: g) p)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

showsPrec :: Int -> (f :.: g) p -> ShowS #

show :: (f :.: g) p -> String #

showList :: [(f :.: g) p] -> ShowS #

Show (f p) => Show (M1 i c f p)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

showsPrec :: Int -> M1 i c f p -> ShowS #

show :: M1 i c f p -> String #

showList :: [M1 i c f p] -> ShowS #

Show (AnnotateRead bk a b) 
Instance details

Defined in Napkin.Run.Effects.Languages.AnnotateRead

Methods

showsPrec :: Int -> AnnotateRead bk a b -> ShowS #

show :: AnnotateRead bk a b -> String #

showList :: [AnnotateRead bk a b] -> ShowS #

Show (AnnotateWrite bk a b) 
Instance details

Defined in Napkin.Run.Effects.Languages.AnnotateWrite

Methods

showsPrec :: Int -> AnnotateWrite bk a b -> ShowS #

show :: AnnotateWrite bk a b -> String #

showList :: [AnnotateWrite bk a b] -> ShowS #

Show (SqlRead b m a) 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlRead

Methods

showsPrec :: Int -> SqlRead b m a -> ShowS #

show :: SqlRead b m a -> String #

showList :: [SqlRead b m a] -> ShowS #

(Show1 f, Show1 g, Show a) => Show ((f :.: g) a) 
Instance details

Defined in Data.SOP.BasicFunctors

Methods

showsPrec :: Int -> (f :.: g) a -> ShowS #

show :: (f :.: g) a -> String #

showList :: [(f :.: g) a] -> ShowS #

(Show a, Show b, Show c, Show d, Show e) => Show (a, b, c, d, e)

@since base-2.01

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> (a, b, c, d, e) -> ShowS #

show :: (a, b, c, d, e) -> String #

showList :: [(a, b, c, d, e)] -> ShowS #

(Show (f a b), Show (g a b)) => Show (Product f g a b) 
Instance details

Defined in Data.Bifunctor.Product

Methods

showsPrec :: Int -> Product f g a b -> ShowS #

show :: Product f g a b -> String #

showList :: [Product f g a b] -> ShowS #

(Show (p a b), Show (q a b)) => Show (Sum p q a b) 
Instance details

Defined in Data.Bifunctor.Sum

Methods

showsPrec :: Int -> Sum p q a b -> ShowS #

show :: Sum p q a b -> String #

showList :: [Sum p q a b] -> ShowS #

(Show a, Show b, Show c, Show d, Show e, Show f) => Show (a, b, c, d, e, f)

@since base-2.01

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f) -> ShowS #

show :: (a, b, c, d, e, f) -> String #

showList :: [(a, b, c, d, e, f)] -> ShowS #

Show (f (p a b)) => Show (Tannen f p a b) 
Instance details

Defined in Data.Bifunctor.Tannen

Methods

showsPrec :: Int -> Tannen f p a b -> ShowS #

show :: Tannen f p a b -> String #

showList :: [Tannen f p a b] -> ShowS #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g) => Show (a, b, c, d, e, f, g)

@since base-2.01

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g) -> ShowS #

show :: (a, b, c, d, e, f, g) -> String #

showList :: [(a, b, c, d, e, f, g)] -> ShowS #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h) => Show (a, b, c, d, e, f, g, h)

@since base-2.01

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g, h) -> ShowS #

show :: (a, b, c, d, e, f, g, h) -> String #

showList :: [(a, b, c, d, e, f, g, h)] -> ShowS #

Show (p (f a) (g b)) => Show (Biff p f g a b) 
Instance details

Defined in Data.Bifunctor.Biff

Methods

showsPrec :: Int -> Biff p f g a b -> ShowS #

show :: Biff p f g a b -> String #

showList :: [Biff p f g a b] -> ShowS #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i) => Show (a, b, c, d, e, f, g, h, i)

@since base-2.01

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g, h, i) -> ShowS #

show :: (a, b, c, d, e, f, g, h, i) -> String #

showList :: [(a, b, c, d, e, f, g, h, i)] -> ShowS #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j) => Show (a, b, c, d, e, f, g, h, i, j)

@since base-2.01

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g, h, i, j) -> ShowS #

show :: (a, b, c, d, e, f, g, h, i, j) -> String #

showList :: [(a, b, c, d, e, f, g, h, i, j)] -> ShowS #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k) => Show (a, b, c, d, e, f, g, h, i, j, k)

@since base-2.01

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g, h, i, j, k) -> ShowS #

show :: (a, b, c, d, e, f, g, h, i, j, k) -> String #

showList :: [(a, b, c, d, e, f, g, h, i, j, k)] -> ShowS #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k, Show l) => Show (a, b, c, d, e, f, g, h, i, j, k, l)

@since base-2.01

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g, h, i, j, k, l) -> ShowS #

show :: (a, b, c, d, e, f, g, h, i, j, k, l) -> String #

showList :: [(a, b, c, d, e, f, g, h, i, j, k, l)] -> ShowS #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k, Show l, Show m) => Show (a, b, c, d, e, f, g, h, i, j, k, l, m)

@since base-2.01

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> ShowS #

show :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> String #

showList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m)] -> ShowS #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k, Show l, Show m, Show n) => Show (a, b, c, d, e, f, g, h, i, j, k, l, m, n)

@since base-2.01

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> ShowS #

show :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> String #

showList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m, n)] -> ShowS #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k, Show l, Show m, Show n, Show o) => Show (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)

@since base-2.01

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> ShowS #

show :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> String #

showList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)] -> ShowS #

class Eq a where #

The Eq class defines equality (==) and inequality (/=). All the basic datatypes exported by the Prelude are instances of Eq, and Eq may be derived for any datatype whose constituents are also instances of Eq.

The Haskell Report defines no laws for Eq. However, instances are encouraged to follow these properties:

Reflexivity
x == x = True
Symmetry
x == y = y == x
Transitivity
if x == y && y == z = True, then x == z = True
Extensionality
if x == y = True and f is a function whose return type is an instance of Eq, then f x == f y = True
Negation
x /= y = not (x == y)

Minimal complete definition

(==) | (/=)

Methods

(==) :: a -> a -> Bool infix 4 #

(/=) :: a -> a -> Bool infix 4 #

Instances

Instances details
Eq SomeKeyPair 
Instance details

Defined in OpenSSL.EVP.PKey

Eq SomePublicKey 
Instance details

Defined in OpenSSL.EVP.PKey

Eq Lit 
Instance details

Defined in Data.Aeson.Decoding.Tokens

Methods

(==) :: Lit -> Lit -> Bool #

(/=) :: Lit -> Lit -> Bool #

Eq Number 
Instance details

Defined in Data.Aeson.Decoding.Tokens

Methods

(==) :: Number -> Number -> Bool #

(/=) :: Number -> Number -> Bool #

Eq Key 
Instance details

Defined in Data.Aeson.Key

Methods

(==) :: Key -> Key -> Bool #

(/=) :: Key -> Key -> Bool #

Eq Arity 
Instance details

Defined in Data.Aeson.TH

Methods

(==) :: Arity -> Arity -> Bool #

(/=) :: Arity -> Arity -> Bool #

Eq FunArg 
Instance details

Defined in Data.Aeson.TH

Methods

(==) :: FunArg -> FunArg -> Bool #

(/=) :: FunArg -> FunArg -> Bool #

Eq StarKindStatus 
Instance details

Defined in Data.Aeson.TH

Methods

(==) :: StarKindStatus -> StarKindStatus -> Bool #

(/=) :: StarKindStatus -> StarKindStatus -> Bool #

Eq DotNetTime 
Instance details

Defined in Data.Aeson.Types.Internal

Eq JSONPathElement 
Instance details

Defined in Data.Aeson.Types.Internal

Eq SumEncoding 
Instance details

Defined in Data.Aeson.Types.Internal

Eq Value 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

(==) :: Value -> Value -> Bool #

(/=) :: Value -> Value -> Bool #

Eq Operation 
Instance details

Defined in Data.Aeson.Patch

Eq Patch 
Instance details

Defined in Data.Aeson.Patch

Methods

(==) :: Patch -> Patch -> Bool #

(/=) :: Patch -> Patch -> Bool #

Eq Key 
Instance details

Defined in Data.Aeson.Pointer

Methods

(==) :: Key -> Key -> Bool #

(/=) :: Key -> Key -> Bool #

Eq Pointer 
Instance details

Defined in Data.Aeson.Pointer

Methods

(==) :: Pointer -> Pointer -> Bool #

(/=) :: Pointer -> Pointer -> Bool #

Eq JSONWarning 
Instance details

Defined in Data.Aeson.WarningParser

Eq More 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

(==) :: More -> More -> Bool #

(/=) :: More -> More -> Bool #

Eq Pos 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

(==) :: Pos -> Pos -> Bool #

(/=) :: Pos -> Pos -> Bool #

Eq ByteArray

Since: base-4.17.0.0

Instance details

Defined in Data.Array.Byte

Eq Timeout 
Instance details

Defined in System.Timeout

Methods

(==) :: Timeout -> Timeout -> Bool #

(/=) :: Timeout -> Timeout -> Bool #

Eq Encoding 
Instance details

Defined in Basement.String

Eq ASCII7_Invalid 
Instance details

Defined in Basement.String.Encoding.ASCII7

Methods

(==) :: ASCII7_Invalid -> ASCII7_Invalid -> Bool #

(/=) :: ASCII7_Invalid -> ASCII7_Invalid -> Bool #

Eq ISO_8859_1_Invalid 
Instance details

Defined in Basement.String.Encoding.ISO_8859_1

Methods

(==) :: ISO_8859_1_Invalid -> ISO_8859_1_Invalid -> Bool #

(/=) :: ISO_8859_1_Invalid -> ISO_8859_1_Invalid -> Bool #

Eq UTF16_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF16

Methods

(==) :: UTF16_Invalid -> UTF16_Invalid -> Bool #

(/=) :: UTF16_Invalid -> UTF16_Invalid -> Bool #

Eq UTF32_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF32

Methods

(==) :: UTF32_Invalid -> UTF32_Invalid -> Bool #

(/=) :: UTF32_Invalid -> UTF32_Invalid -> Bool #

Eq FileSize 
Instance details

Defined in Basement.Types.OffsetSize

Eq String 
Instance details

Defined in Basement.UTF8.Base

Methods

(==) :: String -> String -> Bool #

(/=) :: String -> String -> Bool #

Eq ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

Eq ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Eq ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Eq IntSet 
Instance details

Defined in Data.IntSet.Internal

Methods

(==) :: IntSet -> IntSet -> Bool #

(/=) :: IntSet -> IntSet -> Bool #

Eq SharedSecret 
Instance details

Defined in Crypto.ECC

Eq CryptoError 
Instance details

Defined in Crypto.Error.Types

Eq CryptoError 
Instance details

Defined in Crypto.Error.Types

Eq SQLData 
Instance details

Defined in Database.SQLite3

Methods

(==) :: SQLData -> SQLData -> Bool #

(/=) :: SQLData -> SQLData -> Bool #

Eq SQLError 
Instance details

Defined in Database.SQLite3

Eq SQLOpenFlag 
Instance details

Defined in Database.SQLite3

Eq SQLVFS 
Instance details

Defined in Database.SQLite3

Methods

(==) :: SQLVFS -> SQLVFS -> Bool #

(/=) :: SQLVFS -> SQLVFS -> Bool #

Eq ArgCount 
Instance details

Defined in Database.SQLite3.Bindings.Types

Eq CArgCount 
Instance details

Defined in Database.SQLite3.Bindings.Types

Eq CColumnIndex 
Instance details

Defined in Database.SQLite3.Bindings.Types

Eq CColumnType 
Instance details

Defined in Database.SQLite3.Bindings.Types

Eq CError 
Instance details

Defined in Database.SQLite3.Bindings.Types

Methods

(==) :: CError -> CError -> Bool #

(/=) :: CError -> CError -> Bool #

Eq CNumBytes 
Instance details

Defined in Database.SQLite3.Bindings.Types

Eq CParamIndex 
Instance details

Defined in Database.SQLite3.Bindings.Types

Eq ColumnIndex 
Instance details

Defined in Database.SQLite3.Bindings.Types

Eq ColumnType 
Instance details

Defined in Database.SQLite3.Bindings.Types

Eq Error 
Instance details

Defined in Database.SQLite3.Bindings.Types

Methods

(==) :: Error -> Error -> Bool #

(/=) :: Error -> Error -> Bool #

Eq ParamIndex 
Instance details

Defined in Database.SQLite3.Bindings.Types

Eq Format 
Instance details

Defined in Fmt.Internal.Template

Methods

(==) :: Format -> Format -> Bool #

(/=) :: Format -> Format -> Bool #

Eq Label 
Instance details

Defined in GHC.Cmm.Dataflow.Label

Methods

(==) :: Label -> Label -> Bool #

(/=) :: Label -> Label -> Bool #

Eq LabelSet 
Instance details

Defined in GHC.Cmm.Dataflow.Label

Eq ExtMode 
Instance details

Defined in GHC.CmmToAsm.AArch64.Instr

Methods

(==) :: ExtMode -> ExtMode -> Bool #

(/=) :: ExtMode -> ExtMode -> Bool #

Eq Operand 
Instance details

Defined in GHC.CmmToAsm.AArch64.Instr

Methods

(==) :: Operand -> Operand -> Bool #

(/=) :: Operand -> Operand -> Bool #

Eq ShiftMode 
Instance details

Defined in GHC.CmmToAsm.AArch64.Instr

Eq Target 
Instance details

Defined in GHC.CmmToAsm.AArch64.Instr

Methods

(==) :: Target -> Target -> Bool #

(/=) :: Target -> Target -> Bool #

Eq AltCon 
Instance details

Defined in GHC.Core

Methods

(==) :: AltCon -> AltCon -> Bool #

(/=) :: AltCon -> AltCon -> Bool #

Eq UnfoldingCache 
Instance details

Defined in GHC.Core

Eq UnfoldingGuidance 
Instance details

Defined in GHC.Core

Eq CoAxiomRule 
Instance details

Defined in GHC.Core.Coercion.Axiom

Eq ConLike 
Instance details

Defined in GHC.Core.ConLike

Methods

(==) :: ConLike -> ConLike -> Bool #

(/=) :: ConLike -> ConLike -> Bool #

Eq DataCon 
Instance details

Defined in GHC.Core.DataCon

Methods

(==) :: DataCon -> DataCon -> Bool #

(/=) :: DataCon -> DataCon -> Bool #

Eq StrictnessMark 
Instance details

Defined in GHC.Core.DataCon

Eq CoSel 
Instance details

Defined in GHC.Core.TyCo.Rep

Methods

(==) :: CoSel -> CoSel -> Bool #

(/=) :: CoSel -> CoSel -> Bool #

Eq FunSel 
Instance details

Defined in GHC.Core.TyCo.Rep

Methods

(==) :: FunSel -> FunSel -> Bool #

(/=) :: FunSel -> FunSel -> Bool #

Eq TyLit 
Instance details

Defined in GHC.Core.TyCo.Rep

Methods

(==) :: TyLit -> TyLit -> Bool #

(/=) :: TyLit -> TyLit -> Bool #

Eq FastString 
Instance details

Defined in GHC.Data.FastString

Eq LexicalFastString 
Instance details

Defined in GHC.Data.FastString

Eq NonDetFastString 
Instance details

Defined in GHC.Data.FastString

Eq Word64Set 
Instance details

Defined in GHC.Data.Word64Set.Internal

Eq CompilerInfo 
Instance details

Defined in GHC.Driver.DynFlags

Eq DynLibLoader 
Instance details

Defined in GHC.Driver.DynFlags

Eq DynamicTooState 
Instance details

Defined in GHC.Driver.DynFlags

Eq GhcLink 
Instance details

Defined in GHC.Driver.DynFlags

Methods

(==) :: GhcLink -> GhcLink -> Bool #

(/=) :: GhcLink -> GhcLink -> Bool #

Eq GhcMode 
Instance details

Defined in GHC.Driver.DynFlags

Methods

(==) :: GhcMode -> GhcMode -> Bool #

(/=) :: GhcMode -> GhcMode -> Bool #

Eq IgnorePackageFlag 
Instance details

Defined in GHC.Driver.DynFlags

Eq LinkerInfo 
Instance details

Defined in GHC.Driver.DynFlags

Eq ModRenaming 
Instance details

Defined in GHC.Driver.DynFlags

Eq PackageArg 
Instance details

Defined in GHC.Driver.DynFlags

Eq PackageDBFlag 
Instance details

Defined in GHC.Driver.DynFlags

Eq PackageFlag 
Instance details

Defined in GHC.Driver.DynFlags

Eq PkgDbRef 
Instance details

Defined in GHC.Driver.DynFlags

Eq TrustFlag 
Instance details

Defined in GHC.Driver.DynFlags

Eq AnnsModule 
Instance details

Defined in GHC.Hs

Eq NamespaceSpecifier 
Instance details

Defined in GHC.Hs.Binds

Eq HsRuleAnn 
Instance details

Defined in GHC.Hs.Decls

Eq BotInfo 
Instance details

Defined in GHC.HsToCore.Pmc.Solver.Types

Methods

(==) :: BotInfo -> BotInfo -> Bool #

(/=) :: BotInfo -> BotInfo -> Bool #

Eq PmAltCon

Syntactic equality.

Instance details

Defined in GHC.HsToCore.Pmc.Solver.Types

Eq PmEquality 
Instance details

Defined in GHC.HsToCore.Pmc.Solver.Types

Eq PmLit

Syntactic equality.

Instance details

Defined in GHC.HsToCore.Pmc.Solver.Types

Methods

(==) :: PmLit -> PmLit -> Bool #

(/=) :: PmLit -> PmLit -> Bool #

Eq BuildingCabalPackage 
Instance details

Defined in GHC.Iface.Errors.Types

Eq Ident 
Instance details

Defined in GHC.JS.Ident

Methods

(==) :: Ident -> Ident -> Bool #

(/=) :: Ident -> Ident -> Bool #

Eq AOp 
Instance details

Defined in GHC.JS.JStg.Syntax

Methods

(==) :: AOp -> AOp -> Bool #

(/=) :: AOp -> AOp -> Bool #

Eq JStgExpr 
Instance details

Defined in GHC.JS.JStg.Syntax

Eq JStgStat 
Instance details

Defined in GHC.JS.JStg.Syntax

Eq JVal 
Instance details

Defined in GHC.JS.JStg.Syntax

Methods

(==) :: JVal -> JVal -> Bool #

(/=) :: JVal -> JVal -> Bool #

Eq Op 
Instance details

Defined in GHC.JS.JStg.Syntax

Methods

(==) :: Op -> Op -> Bool #

(/=) :: Op -> Op -> Bool #

Eq UOp 
Instance details

Defined in GHC.JS.JStg.Syntax

Methods

(==) :: UOp -> UOp -> Bool #

(/=) :: UOp -> UOp -> Bool #

Eq AOp 
Instance details

Defined in GHC.JS.Syntax

Methods

(==) :: AOp -> AOp -> Bool #

(/=) :: AOp -> AOp -> Bool #

Eq JExpr 
Instance details

Defined in GHC.JS.Syntax

Methods

(==) :: JExpr -> JExpr -> Bool #

(/=) :: JExpr -> JExpr -> Bool #

Eq JStat 
Instance details

Defined in GHC.JS.Syntax

Methods

(==) :: JStat -> JStat -> Bool #

(/=) :: JStat -> JStat -> Bool #

Eq JVal 
Instance details

Defined in GHC.JS.Syntax

Methods

(==) :: JVal -> JVal -> Bool #

(/=) :: JVal -> JVal -> Bool #

Eq Op 
Instance details

Defined in GHC.JS.Syntax

Methods

(==) :: Op -> Op -> Bool #

(/=) :: Op -> Op -> Bool #

Eq UOp 
Instance details

Defined in GHC.JS.Syntax

Methods

(==) :: UOp -> UOp -> Bool #

(/=) :: UOp -> UOp -> Bool #

Eq AddEpAnn 
Instance details

Defined in GHC.Parser.Annotation

Eq AnnKeywordId 
Instance details

Defined in GHC.Parser.Annotation

Eq AnnList 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: AnnList -> AnnList -> Bool #

(/=) :: AnnList -> AnnList -> Bool #

Eq AnnListItem 
Instance details

Defined in GHC.Parser.Annotation

Eq AnnPragma 
Instance details

Defined in GHC.Parser.Annotation

Eq BindTag 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: BindTag -> BindTag -> Bool #

(/=) :: BindTag -> BindTag -> Bool #

Eq DeclTag 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: DeclTag -> DeclTag -> Bool #

(/=) :: DeclTag -> DeclTag -> Bool #

Eq EpAnnComments 
Instance details

Defined in GHC.Parser.Annotation

Eq EpaComment 
Instance details

Defined in GHC.Parser.Annotation

Eq EpaCommentTok 
Instance details

Defined in GHC.Parser.Annotation

Eq HasE 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: HasE -> HasE -> Bool #

(/=) :: HasE -> HasE -> Bool #

Eq IsUnicodeSyntax 
Instance details

Defined in GHC.Parser.Annotation

Eq NameAdornment 
Instance details

Defined in GHC.Parser.Annotation

Eq NameAnn 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: NameAnn -> NameAnn -> Bool #

(/=) :: NameAnn -> NameAnn -> Bool #

Eq NoEpAnns 
Instance details

Defined in GHC.Parser.Annotation

Eq ParenType 
Instance details

Defined in GHC.Parser.Annotation

Eq TokenLocation 
Instance details

Defined in GHC.Parser.Annotation

Eq TrailingAnn 
Instance details

Defined in GHC.Parser.Annotation

Eq LexErrKind 
Instance details

Defined in GHC.Parser.Errors.Types

Eq NumUnderscoreReason 
Instance details

Defined in GHC.Parser.Errors.Types

Eq ParseContext 
Instance details

Defined in GHC.Parser.Errors.Types

Eq PatIncompleteDoBlock 
Instance details

Defined in GHC.Parser.Errors.Types

Eq NoExtFieldSilent 
Instance details

Defined in GHC.Stg.Syntax

Eq BlockRef 
Instance details

Defined in GHC.StgToJS.Object

Eq ExportedFun 
Instance details

Defined in GHC.StgToJS.Object

Eq JSOptions 
Instance details

Defined in GHC.StgToJS.Object

Eq ObjectKind 
Instance details

Defined in GHC.StgToJS.Object

Eq AssociatedTyLastVarInKind 
Instance details

Defined in GHC.Tc.Errors.Types

Eq AssociatedTyNotParamOverLastTyVar 
Instance details

Defined in GHC.Tc.Errors.Types

Eq DeriveAnyClassEnabled 
Instance details

Defined in GHC.Tc.Errors.Types

Eq Exported 
Instance details

Defined in GHC.Tc.Errors.Types

Eq HasAssociatedDataFamInsts 
Instance details

Defined in GHC.Tc.Errors.Types

Eq HasKinds 
Instance details

Defined in GHC.Tc.Errors.Types

Eq HasWildcard 
Instance details

Defined in GHC.Tc.Errors.Types

Eq SuggestPartialTypeSignatures 
Instance details

Defined in GHC.Tc.Errors.Types

Eq SuggestUndecidableInstances 
Instance details

Defined in GHC.Tc.Errors.Types

Eq UnsupportedCallConvention 
Instance details

Defined in GHC.Tc.Errors.Types

Eq UsingGeneralizedNewtypeDeriving 
Instance details

Defined in GHC.Tc.Errors.Types

Eq Activation 
Instance details

Defined in GHC.Types.Basic

Eq Alignment 
Instance details

Defined in GHC.Types.Basic

Eq CbvMark 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: CbvMark -> CbvMark -> Bool #

(/=) :: CbvMark -> CbvMark -> Bool #

Eq CompilerPhase 
Instance details

Defined in GHC.Types.Basic

Eq DoPmc 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: DoPmc -> DoPmc -> Bool #

(/=) :: DoPmc -> DoPmc -> Bool #

Eq FunctionOrData 
Instance details

Defined in GHC.Types.Basic

Eq GenReason 
Instance details

Defined in GHC.Types.Basic

Eq InlinePragma 
Instance details

Defined in GHC.Types.Basic

Eq InlineSpec 
Instance details

Defined in GHC.Types.Basic

Eq InsideLam 
Instance details

Defined in GHC.Types.Basic

Eq IntWithInf 
Instance details

Defined in GHC.Types.Basic

Eq InterestingCxt 
Instance details

Defined in GHC.Types.Basic

Eq LeftOrRight 
Instance details

Defined in GHC.Types.Basic

Eq Levity 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: Levity -> Levity -> Bool #

(/=) :: Levity -> Levity -> Bool #

Eq OccInfo 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: OccInfo -> OccInfo -> Bool #

(/=) :: OccInfo -> OccInfo -> Bool #

Eq OneShotInfo 
Instance details

Defined in GHC.Types.Basic

Eq Origin 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: Origin -> Origin -> Bool #

(/=) :: Origin -> Origin -> Bool #

Eq OverlapFlag 
Instance details

Defined in GHC.Types.Basic

Eq OverlapMode 
Instance details

Defined in GHC.Types.Basic

Eq PprPrec 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: PprPrec -> PprPrec -> Bool #

(/=) :: PprPrec -> PprPrec -> Bool #

Eq RecFlag 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: RecFlag -> RecFlag -> Bool #

(/=) :: RecFlag -> RecFlag -> Bool #

Eq RuleMatchInfo 
Instance details

Defined in GHC.Types.Basic

Eq TailCallInfo 
Instance details

Defined in GHC.Types.Basic

Eq TupleSort 
Instance details

Defined in GHC.Types.Basic

Eq TypeOrConstraint 
Instance details

Defined in GHC.Types.Basic

Eq TypeOrData 
Instance details

Defined in GHC.Types.Basic

Eq TypeOrKind 
Instance details

Defined in GHC.Types.Basic

Eq UnboxedTupleOrSum 
Instance details

Defined in GHC.Types.Basic

Eq DiagnosticCode 
Instance details

Defined in GHC.Types.Error

Eq DiagnosticReason 
Instance details

Defined in GHC.Types.Error

Eq Severity 
Instance details

Defined in GHC.Types.Error

Eq DuplicateRecordFields 
Instance details

Defined in GHC.Types.FieldLabel

Eq FieldLabel 
Instance details

Defined in GHC.Types.FieldLabel

Eq FieldSelectors 
Instance details

Defined in GHC.Types.FieldLabel

Eq Name

The same comments as for Name's Ord instance apply.

Instance details

Defined in GHC.Types.Name

Methods

(==) :: Name -> Name -> Bool #

(/=) :: Name -> Name -> Bool #

Eq NameSpace 
Instance details

Defined in GHC.Types.Name.Occurrence

Eq OccName 
Instance details

Defined in GHC.Types.Name.Occurrence

Methods

(==) :: OccName -> OccName -> Bool #

(/=) :: OccName -> OccName -> Bool #

Eq FieldsOrSelectors 
Instance details

Defined in GHC.Types.Name.Reader

Eq ImpDeclSpec 
Instance details

Defined in GHC.Types.Name.Reader

Eq ImpItemSpec 
Instance details

Defined in GHC.Types.Name.Reader

Eq ImportSpec 
Instance details

Defined in GHC.Types.Name.Reader

Eq Parent 
Instance details

Defined in GHC.Types.Name.Reader

Methods

(==) :: Parent -> Parent -> Bool #

(/=) :: Parent -> Parent -> Bool #

Eq RdrName 
Instance details

Defined in GHC.Types.Name.Reader

Methods

(==) :: RdrName -> RdrName -> Bool #

(/=) :: RdrName -> RdrName -> Bool #

Eq SaneDouble 
Instance details

Defined in GHC.Types.SaneDouble

Eq FractionalExponentBase 
Instance details

Defined in GHC.Types.SourceText

Eq FractionalLit

Be wary of using this instance to compare for equal *values* when exponents are large. The same value expressed in different syntactic form won't compare as equal when any of the exponents is >= 100.

Instance details

Defined in GHC.Types.SourceText

Eq IntegralLit 
Instance details

Defined in GHC.Types.SourceText

Eq SourceText 
Instance details

Defined in GHC.Types.SourceText

Eq StringLiteral 
Instance details

Defined in GHC.Types.SourceText

Eq BufPos 
Instance details

Defined in GHC.Types.SrcLoc

Methods

(==) :: BufPos -> BufPos -> Bool #

(/=) :: BufPos -> BufPos -> Bool #

Eq BufSpan 
Instance details

Defined in GHC.Types.SrcLoc

Methods

(==) :: BufSpan -> BufSpan -> Bool #

(/=) :: BufSpan -> BufSpan -> Bool #

Eq DeltaPos 
Instance details

Defined in GHC.Types.SrcLoc

Eq NoComments 
Instance details

Defined in GHC.Types.SrcLoc

Eq PsLoc 
Instance details

Defined in GHC.Types.SrcLoc

Methods

(==) :: PsLoc -> PsLoc -> Bool #

(/=) :: PsLoc -> PsLoc -> Bool #

Eq PsSpan 
Instance details

Defined in GHC.Types.SrcLoc

Methods

(==) :: PsSpan -> PsSpan -> Bool #

(/=) :: PsSpan -> PsSpan -> Bool #

Eq RealSrcLoc 
Instance details

Defined in GHC.Types.SrcLoc

Eq RealSrcSpan 
Instance details

Defined in GHC.Types.SrcLoc

Eq SrcLoc 
Instance details

Defined in GHC.Types.SrcLoc

Methods

(==) :: SrcLoc -> SrcLoc -> Bool #

(/=) :: SrcLoc -> SrcLoc -> Bool #

Eq SrcSpan 
Instance details

Defined in GHC.Types.SrcLoc

Methods

(==) :: SrcSpan -> SrcSpan -> Bool #

(/=) :: SrcSpan -> SrcSpan -> Bool #

Eq UnhelpfulSpanReason 
Instance details

Defined in GHC.Types.SrcLoc

Eq TickishPlacement 
Instance details

Defined in GHC.Types.Tickish

Eq TickishScoping 
Instance details

Defined in GHC.Types.Tickish

Eq ForAllTyFlag 
Instance details

Defined in GHC.Types.Var

Eq FunTyFlag 
Instance details

Defined in GHC.Types.Var

Eq Specificity 
Instance details

Defined in GHC.Types.Var

Eq Var 
Instance details

Defined in GHC.Types.Var

Methods

(==) :: Var -> Var -> Bool #

(/=) :: Var -> Var -> Bool #

Eq PackageId 
Instance details

Defined in GHC.Unit.Info

Eq PackageName 
Instance details

Defined in GHC.Unit.Info

Eq InWarningCategory 
Instance details

Defined in GHC.Unit.Module.Warnings

Eq WarningCategory 
Instance details

Defined in GHC.Unit.Module.Warnings

Eq UnitId 
Instance details

Defined in GHC.Unit.Types

Methods

(==) :: UnitId -> UnitId -> Bool #

(/=) :: UnitId -> UnitId -> Bool #

Eq BindingSite 
Instance details

Defined in GHC.Utils.Outputable

Eq JoinPointHood 
Instance details

Defined in GHC.Utils.Outputable

Eq Boxity 
Instance details

Defined in Language.Haskell.Syntax.Basic

Methods

(==) :: Boxity -> Boxity -> Bool #

(/=) :: Boxity -> Boxity -> Bool #

Eq FieldLabelString 
Instance details

Defined in Language.Haskell.Syntax.Basic

Eq Role 
Instance details

Defined in Language.Haskell.Syntax.Basic

Methods

(==) :: Role -> Role -> Bool #

(/=) :: Role -> Role -> Bool #

Eq SrcStrictness 
Instance details

Defined in Language.Haskell.Syntax.Basic

Eq SrcUnpackedness 
Instance details

Defined in Language.Haskell.Syntax.Basic

Eq NewOrData 
Instance details

Defined in Language.Haskell.Syntax.Decls

Eq SpliceDecoration 
Instance details

Defined in Language.Haskell.Syntax.Decls

Eq HsDoFlavour 
Instance details

Defined in Language.Haskell.Syntax.Expr

Eq HsLamVariant 
Instance details

Defined in Language.Haskell.Syntax.Expr

Eq DataConCantHappen 
Instance details

Defined in Language.Haskell.Syntax.Extension

Eq NoExtField 
Instance details

Defined in Language.Haskell.Syntax.Extension

Eq OverLitVal 
Instance details

Defined in Language.Haskell.Syntax.Lit

Eq ModuleName 
Instance details

Defined in Language.Haskell.Syntax.Module.Name

Eq RecFieldsDotDot 
Instance details

Defined in Language.Haskell.Syntax.Pat

Eq HsIPName 
Instance details

Defined in Language.Haskell.Syntax.Type

Eq PromotionFlag 
Instance details

Defined in Language.Haskell.Syntax.Type

Eq BigNat 
Instance details

Defined in GHC.Num.BigNat

Methods

(==) :: BigNat -> BigNat -> Bool #

(/=) :: BigNat -> BigNat -> Bool #

Eq ForeignSrcLang 
Instance details

Defined in GHC.ForeignSrcLang.Type

Eq Extension 
Instance details

Defined in GHC.LanguageExtensions.Type

Eq PrimType 
Instance details

Defined in GHC.Exts.Heap.Closures

Eq TsoFlags 
Instance details

Defined in GHC.Exts.Heap.Closures

Eq WhatNext 
Instance details

Defined in GHC.Exts.Heap.Closures

Eq WhyBlocked 
Instance details

Defined in GHC.Exts.Heap.Closures

Eq StgInfoTable 
Instance details

Defined in GHC.Exts.Heap.InfoTable.Types

Eq CostCentre 
Instance details

Defined in GHC.Exts.Heap.ProfInfo.Types

Eq CostCentreStack 
Instance details

Defined in GHC.Exts.Heap.ProfInfo.Types

Eq IndexTable 
Instance details

Defined in GHC.Exts.Heap.ProfInfo.Types

Eq StgTSOProfInfo 
Instance details

Defined in GHC.Exts.Heap.ProfInfo.Types

Eq Void

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Base

Methods

(==) :: Void -> Void -> Bool #

(/=) :: Void -> Void -> Bool #

Eq ByteOrder

@since base-4.11.0.0

Instance details

Defined in GHC.Internal.ByteOrder

Eq ClosureType 
Instance details

Defined in GHC.Internal.ClosureTypes

Eq BlockReason

@since base-4.3.0.0

Instance details

Defined in GHC.Internal.Conc.Sync

Eq ThreadId

@since base-4.2.0.0

Instance details

Defined in GHC.Internal.Conc.Sync

Eq ThreadStatus

@since base-4.3.0.0

Instance details

Defined in GHC.Internal.Conc.Sync

Eq Constr

Equality of constructors

@since base-4.0.0.0

Instance details

Defined in GHC.Internal.Data.Data

Methods

(==) :: Constr -> Constr -> Bool #

(/=) :: Constr -> Constr -> Bool #

Eq ConstrRep

@since base-4.0.0.0

Instance details

Defined in GHC.Internal.Data.Data

Eq DataRep

@since base-4.0.0.0

Instance details

Defined in GHC.Internal.Data.Data

Methods

(==) :: DataRep -> DataRep -> Bool #

(/=) :: DataRep -> DataRep -> Bool #

Eq Fixity

@since base-4.0.0.0

Instance details

Defined in GHC.Internal.Data.Data

Methods

(==) :: Fixity -> Fixity -> Bool #

(/=) :: Fixity -> Fixity -> Bool #

Eq All

@since base-2.01

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

(==) :: All -> All -> Bool #

(/=) :: All -> All -> Bool #

Eq Any

@since base-2.01

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

(==) :: Any -> Any -> Bool #

(/=) :: Any -> Any -> Bool #

Eq SomeTypeRep 
Instance details

Defined in GHC.Internal.Data.Typeable.Internal

Eq Version

@since base-2.01

Instance details

Defined in GHC.Internal.Data.Version

Methods

(==) :: Version -> Version -> Bool #

(/=) :: Version -> Version -> Bool #

Eq ArithException

@since base-3.0

Instance details

Defined in GHC.Internal.Exception.Type

Eq SpecConstrAnnotation

@since base-4.3.0.0

Instance details

Defined in GHC.Internal.Exts

Eq CBool 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

(==) :: CBool -> CBool -> Bool #

(/=) :: CBool -> CBool -> Bool #

Eq CChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

(==) :: CChar -> CChar -> Bool #

(/=) :: CChar -> CChar -> Bool #

Eq CClock 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

(==) :: CClock -> CClock -> Bool #

(/=) :: CClock -> CClock -> Bool #

Eq CDouble 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

(==) :: CDouble -> CDouble -> Bool #

(/=) :: CDouble -> CDouble -> Bool #

Eq CFloat 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

(==) :: CFloat -> CFloat -> Bool #

(/=) :: CFloat -> CFloat -> Bool #

Eq CInt 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

(==) :: CInt -> CInt -> Bool #

(/=) :: CInt -> CInt -> Bool #

Eq CIntMax 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

(==) :: CIntMax -> CIntMax -> Bool #

(/=) :: CIntMax -> CIntMax -> Bool #

Eq CIntPtr 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

(==) :: CIntPtr -> CIntPtr -> Bool #

(/=) :: CIntPtr -> CIntPtr -> Bool #

Eq CLLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

(==) :: CLLong -> CLLong -> Bool #

(/=) :: CLLong -> CLLong -> Bool #

Eq CLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

(==) :: CLong -> CLong -> Bool #

(/=) :: CLong -> CLong -> Bool #

Eq CPtrdiff 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Eq CSChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

(==) :: CSChar -> CSChar -> Bool #

(/=) :: CSChar -> CSChar -> Bool #

Eq CSUSeconds 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Eq CShort 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

(==) :: CShort -> CShort -> Bool #

(/=) :: CShort -> CShort -> Bool #

Eq CSigAtomic 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Eq CSize 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

(==) :: CSize -> CSize -> Bool #

(/=) :: CSize -> CSize -> Bool #

Eq CTime 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

(==) :: CTime -> CTime -> Bool #

(/=) :: CTime -> CTime -> Bool #

Eq CUChar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

(==) :: CUChar -> CUChar -> Bool #

(/=) :: CUChar -> CUChar -> Bool #

Eq CUInt 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

(==) :: CUInt -> CUInt -> Bool #

(/=) :: CUInt -> CUInt -> Bool #

Eq CUIntMax 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Eq CUIntPtr 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Eq CULLong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

(==) :: CULLong -> CULLong -> Bool #

(/=) :: CULLong -> CULLong -> Bool #

Eq CULong 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

(==) :: CULong -> CULong -> Bool #

(/=) :: CULong -> CULong -> Bool #

Eq CUSeconds 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Eq CUShort 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

(==) :: CUShort -> CUShort -> Bool #

(/=) :: CUShort -> CUShort -> Bool #

Eq CWchar 
Instance details

Defined in GHC.Internal.Foreign.C.Types

Methods

(==) :: CWchar -> CWchar -> Bool #

(/=) :: CWchar -> CWchar -> Bool #

Eq Associativity

@since base-4.6.0.0

Instance details

Defined in GHC.Internal.Generics

Eq DecidedStrictness

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Eq Fixity

@since base-4.6.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

(==) :: Fixity -> Fixity -> Bool #

(/=) :: Fixity -> Fixity -> Bool #

Eq SourceStrictness

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Eq SourceUnpackedness

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Eq MaskingState

@since base-4.3.0.0

Instance details

Defined in GHC.Internal.IO

Eq ArrayException

@since base-4.2.0.0

Instance details

Defined in GHC.Internal.IO.Exception

Eq AsyncException

@since base-4.2.0.0

Instance details

Defined in GHC.Internal.IO.Exception

Eq ExitCode 
Instance details

Defined in GHC.Internal.IO.Exception

Eq IOErrorType

@since base-4.1.0.0

Instance details

Defined in GHC.Internal.IO.Exception

Eq IOException

@since base-4.1.0.0

Instance details

Defined in GHC.Internal.IO.Exception

Eq BufferMode

@since base-4.2.0.0

Instance details

Defined in GHC.Internal.IO.Handle.Types

Eq Handle

@since base-4.1.0.0

Instance details

Defined in GHC.Internal.IO.Handle.Types

Methods

(==) :: Handle -> Handle -> Bool #

(/=) :: Handle -> Handle -> Bool #

Eq Newline

@since base-4.2.0.0

Instance details

Defined in GHC.Internal.IO.Handle.Types

Methods

(==) :: Newline -> Newline -> Bool #

(/=) :: Newline -> Newline -> Bool #

Eq NewlineMode

@since base-4.2.0.0

Instance details

Defined in GHC.Internal.IO.Handle.Types

Eq IOMode

@since base-4.2.0.0

Instance details

Defined in GHC.Internal.IO.IOMode

Methods

(==) :: IOMode -> IOMode -> Bool #

(/=) :: IOMode -> IOMode -> Bool #

Eq Int16

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Methods

(==) :: Int16 -> Int16 -> Bool #

(/=) :: Int16 -> Int16 -> Bool #

Eq Int32

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Methods

(==) :: Int32 -> Int32 -> Bool #

(/=) :: Int32 -> Int32 -> Bool #

Eq Int64

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Methods

(==) :: Int64 -> Int64 -> Bool #

(/=) :: Int64 -> Int64 -> Bool #

Eq Int8

@since base-2.01

Instance details

Defined in GHC.Internal.Int

Methods

(==) :: Int8 -> Int8 -> Bool #

(/=) :: Int8 -> Int8 -> Bool #

Eq IoSubSystem 
Instance details

Defined in GHC.Internal.RTS.Flags

Eq SrcLoc

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Stack.Types

Methods

(==) :: SrcLoc -> SrcLoc -> Bool #

(/=) :: SrcLoc -> SrcLoc -> Bool #

Eq CBlkCnt 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

(==) :: CBlkCnt -> CBlkCnt -> Bool #

(/=) :: CBlkCnt -> CBlkCnt -> Bool #

Eq CBlkSize 
Instance details

Defined in GHC.Internal.System.Posix.Types

Eq CCc 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

(==) :: CCc -> CCc -> Bool #

(/=) :: CCc -> CCc -> Bool #

Eq CClockId 
Instance details

Defined in GHC.Internal.System.Posix.Types

Eq CDev 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

(==) :: CDev -> CDev -> Bool #

(/=) :: CDev -> CDev -> Bool #

Eq CFsBlkCnt 
Instance details

Defined in GHC.Internal.System.Posix.Types

Eq CFsFilCnt 
Instance details

Defined in GHC.Internal.System.Posix.Types

Eq CGid 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

(==) :: CGid -> CGid -> Bool #

(/=) :: CGid -> CGid -> Bool #

Eq CId 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

(==) :: CId -> CId -> Bool #

(/=) :: CId -> CId -> Bool #

Eq CIno 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

(==) :: CIno -> CIno -> Bool #

(/=) :: CIno -> CIno -> Bool #

Eq CKey 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

(==) :: CKey -> CKey -> Bool #

(/=) :: CKey -> CKey -> Bool #

Eq CMode 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

(==) :: CMode -> CMode -> Bool #

(/=) :: CMode -> CMode -> Bool #

Eq CNfds 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

(==) :: CNfds -> CNfds -> Bool #

(/=) :: CNfds -> CNfds -> Bool #

Eq CNlink 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

(==) :: CNlink -> CNlink -> Bool #

(/=) :: CNlink -> CNlink -> Bool #

Eq COff 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

(==) :: COff -> COff -> Bool #

(/=) :: COff -> COff -> Bool #

Eq CPid 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

(==) :: CPid -> CPid -> Bool #

(/=) :: CPid -> CPid -> Bool #

Eq CRLim 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

(==) :: CRLim -> CRLim -> Bool #

(/=) :: CRLim -> CRLim -> Bool #

Eq CSocklen 
Instance details

Defined in GHC.Internal.System.Posix.Types

Eq CSpeed 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

(==) :: CSpeed -> CSpeed -> Bool #

(/=) :: CSpeed -> CSpeed -> Bool #

Eq CSsize 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

(==) :: CSsize -> CSsize -> Bool #

(/=) :: CSsize -> CSsize -> Bool #

Eq CTcflag 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

(==) :: CTcflag -> CTcflag -> Bool #

(/=) :: CTcflag -> CTcflag -> Bool #

Eq CTimer 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

(==) :: CTimer -> CTimer -> Bool #

(/=) :: CTimer -> CTimer -> Bool #

Eq CUid 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

(==) :: CUid -> CUid -> Bool #

(/=) :: CUid -> CUid -> Bool #

Eq Fd 
Instance details

Defined in GHC.Internal.System.Posix.Types

Methods

(==) :: Fd -> Fd -> Bool #

(/=) :: Fd -> Fd -> Bool #

Eq SomeNat

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.TypeNats

Methods

(==) :: SomeNat -> SomeNat -> Bool #

(/=) :: SomeNat -> SomeNat -> Bool #

Eq GeneralCategory

@since base-2.01

Instance details

Defined in GHC.Internal.Unicode

Eq Word16

@since base-2.01

Instance details

Defined in GHC.Internal.Word

Methods

(==) :: Word16 -> Word16 -> Bool #

(/=) :: Word16 -> Word16 -> Bool #

Eq Word32

@since base-2.01

Instance details

Defined in GHC.Internal.Word

Methods

(==) :: Word32 -> Word32 -> Bool #

(/=) :: Word32 -> Word32 -> Bool #

Eq Word64

@since base-2.01

Instance details

Defined in GHC.Internal.Word

Methods

(==) :: Word64 -> Word64 -> Bool #

(/=) :: Word64 -> Word64 -> Bool #

Eq Word8

@since base-2.01

Instance details

Defined in GHC.Internal.Word

Methods

(==) :: Word8 -> Word8 -> Bool #

(/=) :: Word8 -> Word8 -> Bool #

Eq Module 
Instance details

Defined in GHC.Classes

Methods

(==) :: Module -> Module -> Bool #

(/=) :: Module -> Module -> Bool #

Eq Ordering 
Instance details

Defined in GHC.Classes

Eq TrName 
Instance details

Defined in GHC.Classes

Methods

(==) :: TrName -> TrName -> Bool #

(/=) :: TrName -> TrName -> Bool #

Eq TyCon 
Instance details

Defined in GHC.Classes

Methods

(==) :: TyCon -> TyCon -> Bool #

(/=) :: TyCon -> TyCon -> Bool #

Eq AuthorizedUser 
Instance details

Defined in Gogol.Internal.Auth

Eq OAuthClient 
Instance details

Defined in Gogol.Internal.Auth

Eq ServiceAccount 
Instance details

Defined in Gogol.Internal.Auth

Eq BigQueryDatasetsDelete 
Instance details

Defined in Gogol.BigQuery.Datasets.Delete

Eq BigQueryDatasetsGet 
Instance details

Defined in Gogol.BigQuery.Datasets.Get

Eq BigQueryDatasetsInsert 
Instance details

Defined in Gogol.BigQuery.Datasets.Insert

Eq BigQueryDatasetsList 
Instance details

Defined in Gogol.BigQuery.Datasets.List

Eq BigQueryDatasetsPatch 
Instance details

Defined in Gogol.BigQuery.Datasets.Patch

Eq BigQueryDatasetsUpdate 
Instance details

Defined in Gogol.BigQuery.Datasets.Update

Eq AggregateClassificationMetrics 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq Argument 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq ArimaCoefficients 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq ArimaFittingMetrics 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq ArimaForecastingMetrics 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq ArimaModelInfo 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq ArimaOrder 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq ArimaResult 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq ArimaSingleModelForecastingMetrics 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq AuditConfig 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq AuditLogConfig 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq AvroOptions 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq BiEngineReason 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq BiEngineStatistics 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq BigQueryModelTraining 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq BigtableColumn 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq BigtableColumnFamily 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq BigtableOptions 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq BinaryClassificationMetrics 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq BinaryConfusionMatrix 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq Binding 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Methods

(==) :: Binding -> Binding -> Bool #

(/=) :: Binding -> Binding -> Bool #

Eq BqmlIterationResult 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq BqmlTrainingRun 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq BqmlTrainingRun_TrainingOptions 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq CategoricalValue 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq CategoryCount 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq CloneDefinition 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq Cluster 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Methods

(==) :: Cluster -> Cluster -> Bool #

(/=) :: Cluster -> Cluster -> Bool #

Eq ClusterInfo 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq Clustering 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq ClusteringMetrics 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq ConfusionMatrix 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq ConnectionProperty 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq CsvOptions 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq DataMaskingStatistics 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq DataSplitResult 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq Dataset 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Methods

(==) :: Dataset -> Dataset -> Bool #

(/=) :: Dataset -> Dataset -> Bool #

Eq DatasetAccessEntry 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq DatasetList 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq DatasetList_DatasetsItem 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq DatasetList_DatasetsItem_Labels 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq DatasetReference 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq Dataset_AccessItem 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq Dataset_Labels 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq Dataset_TagsItem 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq DestinationTableProperties 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq DestinationTableProperties_Labels 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq DimensionalityReductionMetrics 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq DmlStatistics 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq DoubleCandidates 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq DoubleHparamSearchSpace 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq DoubleRange 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq EncryptionConfiguration 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq Entry 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Methods

(==) :: Entry -> Entry -> Bool #

(/=) :: Entry -> Entry -> Bool #

Eq ErrorProto 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq EvaluationMetrics 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq ExplainQueryStage 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq ExplainQueryStep 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq Explanation 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq Expr 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Methods

(==) :: Expr -> Expr -> Bool #

(/=) :: Expr -> Expr -> Bool #

Eq ExternalDataConfiguration 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq FeatureValue 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq GetIamPolicyRequest 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq GetPolicyOptions 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq GetQueryResultsResponse 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq GetServiceAccountResponse 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq GlobalExplanation 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq GoogleSheetsOptions 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq HivePartitioningOptions 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq HparamSearchSpaces 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq HparamTuningTrial 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq IndexUnusedReason 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq IntArray 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq IntArrayHparamSearchSpace 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq IntCandidates 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq IntHparamSearchSpace 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq IntRange 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq IterationResult 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq Job 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Methods

(==) :: Job -> Job -> Bool #

(/=) :: Job -> Job -> Bool #

Eq JobCancelResponse 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq JobConfiguration 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq JobConfigurationExtract 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq JobConfigurationLoad 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq JobConfigurationQuery 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq JobConfigurationQuery_TableDefinitions 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq JobConfigurationTableCopy 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq JobConfiguration_Labels 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq JobList 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Methods

(==) :: JobList -> JobList -> Bool #

(/=) :: JobList -> JobList -> Bool #

Eq JobList_JobsItem 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq JobReference 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq JobStatistics 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq JobStatistics2 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq JobStatistics2_ReservationUsageItem 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq JobStatistics3 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq JobStatistics4 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq JobStatistics5 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq JobStatistics_ReservationUsageItem 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq JobStatus 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq JsonObject 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq ListModelsResponse 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq ListRoutinesResponse 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq ListRowAccessPoliciesResponse 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq LocationMetadata 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq MaterializedViewDefinition 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq MlStatistics 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq Model 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Methods

(==) :: Model -> Model -> Bool #

(/=) :: Model -> Model -> Bool #

Eq ModelDefinition 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq ModelDefinition_ModelOptions 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq ModelReference 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq Model_Labels 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq MultiClassClassificationMetrics 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq ParquetOptions 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq Policy 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Methods

(==) :: Policy -> Policy -> Bool #

(/=) :: Policy -> Policy -> Bool #

Eq PrincipalComponentInfo 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq ProjectList 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq ProjectList_ProjectsItem 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq ProjectReference 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq QueryParameter 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq QueryParameterType 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq QueryParameterType_StructTypesItem 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq QueryParameterValue 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq QueryParameterValue_StructValues 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq QueryRequest 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq QueryRequest_Labels 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq QueryResponse 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq QueryTimelineSample 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq RangePartitioning 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq RangePartitioning_Range 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq RankingMetrics 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq RegressionMetrics 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq RemoteFunctionOptions 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq RemoteFunctionOptions_UserDefinedContext 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq Routine 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Methods

(==) :: Routine -> Routine -> Bool #

(/=) :: Routine -> Routine -> Bool #

Eq RoutineReference 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq Row 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Methods

(==) :: Row -> Row -> Bool #

(/=) :: Row -> Row -> Bool #

Eq RowAccessPolicy 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq RowAccessPolicyReference 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq RowLevelSecurityStatistics 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq ScriptStackFrame 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq ScriptStatistics 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq SearchStatistics 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq SessionInfo 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq SetIamPolicyRequest 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq SnapshotDefinition 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq SparkLoggingInfo 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq SparkOptions 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq SparkOptions_Properties 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq SparkStatistics 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq SparkStatistics_Endpoints 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq StandardSqlDataType 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq StandardSqlField 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq StandardSqlStructType 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq StandardSqlTableType 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq Streamingbuffer 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq StringHparamSearchSpace 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq Table 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Methods

(==) :: Table -> Table -> Bool #

(/=) :: Table -> Table -> Bool #

Eq TableCell 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq TableDataInsertAllRequest 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq TableDataInsertAllRequest_RowsItem 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq TableDataInsertAllResponse 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq TableDataInsertAllResponse_InsertErrorsItem 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq TableDataList 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq TableFieldSchema 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq TableFieldSchema_Categories 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq TableFieldSchema_PolicyTags 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq TableList 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq TableList_TablesItem 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq TableList_TablesItem_Labels 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq TableList_TablesItem_View 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq TableReference 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq TableRow 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq TableSchema 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq Table_Labels 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq TestIamPermissionsRequest 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq TestIamPermissionsResponse 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq TimePartitioning 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq TrainingOptions 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq TrainingOptions_LabelClassWeights 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq TrainingRun 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq TransactionInfo 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq UserDefinedFunctionResource 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq ViewDefinition 
Instance details

Defined in Gogol.BigQuery.Internal.Product

Eq Argument_ArgumentKind 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Eq Argument_Mode 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Eq ArimaForecastingMetrics_SeasonalPeriodsItem 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Eq ArimaModelInfo_SeasonalPeriodsItem 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Eq ArimaResult_SeasonalPeriodsItem 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Eq ArimaSingleModelForecastingMetrics_SeasonalPeriodsItem 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Eq AuditLogConfig_LogType 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Eq DatasetAccessEntry_TargetTypesItem 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Eq HparamTuningTrial_Status 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Eq JobsListProjection 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Eq JobsListStateFilter 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Eq Model_ModelType 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Eq Routine_DeterminismLevel 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Eq Routine_Language 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Eq Routine_RoutineType 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Eq StandardSqlDataType_TypeKind 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Eq TablesGetView 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Eq TrainingOptions_BoosterType 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Eq TrainingOptions_ColorSpace 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Eq TrainingOptions_DartNormalizeType 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Eq TrainingOptions_DataFrequency 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Eq TrainingOptions_DataSplitMethod 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Eq TrainingOptions_DistanceType 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Eq TrainingOptions_FeedbackType 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Eq TrainingOptions_HolidayRegion 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Eq TrainingOptions_HparamTuningObjectivesItem 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Eq TrainingOptions_KmeansInitializationMethod 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Eq TrainingOptions_LearnRateStrategy 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Eq TrainingOptions_LossType 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Eq TrainingOptions_OptimizationStrategy 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Eq TrainingOptions_TreeMethod 
Instance details

Defined in Gogol.BigQuery.Internal.Sum

Eq BigQueryJobsCancel 
Instance details

Defined in Gogol.BigQuery.Jobs.Cancel

Eq BigQueryJobsDelete 
Instance details

Defined in Gogol.BigQuery.Jobs.Delete

Eq BigQueryJobsGet 
Instance details

Defined in Gogol.BigQuery.Jobs.Get

Eq BigQueryJobsGetQueryResults 
Instance details

Defined in Gogol.BigQuery.Jobs.GetQueryResults

Eq BigQueryJobsInsert 
Instance details

Defined in Gogol.BigQuery.Jobs.Insert

Eq BigQueryJobsList 
Instance details

Defined in Gogol.BigQuery.Jobs.List

Eq BigQueryJobsQuery 
Instance details

Defined in Gogol.BigQuery.Jobs.Query

Eq BigQueryModelsDelete 
Instance details

Defined in Gogol.BigQuery.Models.Delete

Eq BigQueryModelsGet 
Instance details

Defined in Gogol.BigQuery.Models.Get

Eq BigQueryModelsList 
Instance details

Defined in Gogol.BigQuery.Models.List

Eq BigQueryModelsPatch 
Instance details

Defined in Gogol.BigQuery.Models.Patch

Eq BigQueryProjectsGetServiceAccount 
Instance details

Defined in Gogol.BigQuery.Projects.GetServiceAccount

Eq BigQueryProjectsList 
Instance details

Defined in Gogol.BigQuery.Projects.List

Eq BigQueryRoutinesDelete 
Instance details

Defined in Gogol.BigQuery.Routines.Delete

Eq BigQueryRoutinesGet 
Instance details

Defined in Gogol.BigQuery.Routines.Get

Eq BigQueryRoutinesInsert 
Instance details

Defined in Gogol.BigQuery.Routines.Insert

Eq BigQueryRoutinesList 
Instance details

Defined in Gogol.BigQuery.Routines.List

Eq BigQueryRoutinesUpdate 
Instance details

Defined in Gogol.BigQuery.Routines.Update

Eq BigQueryRowAccessPoliciesGetIamPolicy 
Instance details

Defined in Gogol.BigQuery.RowAccessPolicies.GetIamPolicy

Eq BigQueryRowAccessPoliciesList 
Instance details

Defined in Gogol.BigQuery.RowAccessPolicies.List

Eq BigQueryRowAccessPoliciesSetIamPolicy 
Instance details

Defined in Gogol.BigQuery.RowAccessPolicies.SetIamPolicy

Eq BigQueryRowAccessPoliciesTestIamPermissions 
Instance details

Defined in Gogol.BigQuery.RowAccessPolicies.TestIamPermissions

Eq BigQueryTabledataInsertAll 
Instance details

Defined in Gogol.BigQuery.Tabledata.InsertAll

Eq BigQueryTabledataList 
Instance details

Defined in Gogol.BigQuery.Tabledata.List

Eq BigQueryTablesDelete 
Instance details

Defined in Gogol.BigQuery.Tables.Delete

Eq BigQueryTablesGet 
Instance details

Defined in Gogol.BigQuery.Tables.Get

Eq BigQueryTablesGetIamPolicy 
Instance details

Defined in Gogol.BigQuery.Tables.GetIamPolicy

Eq BigQueryTablesInsert 
Instance details

Defined in Gogol.BigQuery.Tables.Insert

Eq BigQueryTablesList 
Instance details

Defined in Gogol.BigQuery.Tables.List

Eq BigQueryTablesPatch 
Instance details

Defined in Gogol.BigQuery.Tables.Patch

Eq BigQueryTablesSetIamPolicy 
Instance details

Defined in Gogol.BigQuery.Tables.SetIamPolicy

Eq BigQueryTablesTestIamPermissions 
Instance details

Defined in Gogol.BigQuery.Tables.TestIamPermissions

Eq BigQueryTablesUpdate 
Instance details

Defined in Gogol.BigQuery.Tables.Update

Eq Base64 
Instance details

Defined in Gogol.Data.Base64

Methods

(==) :: Base64 -> Base64 -> Bool #

(/=) :: Base64 -> Base64 -> Bool #

Eq Date 
Instance details

Defined in Gogol.Data.Time

Methods

(==) :: Date -> Date -> Bool #

(/=) :: Date -> Date -> Bool #

Eq DateTime 
Instance details

Defined in Gogol.Data.Time

Eq Duration 
Instance details

Defined in Gogol.Data.Time

Eq Time 
Instance details

Defined in Gogol.Data.Time

Methods

(==) :: Time -> Time -> Bool #

(/=) :: Time -> Time -> Bool #

Eq AccessToken 
Instance details

Defined in Gogol.Types

Eq AltJSON 
Instance details

Defined in Gogol.Types

Methods

(==) :: AltJSON -> AltJSON -> Bool #

(/=) :: AltJSON -> AltJSON -> Bool #

Eq AltMedia 
Instance details

Defined in Gogol.Types

Eq ClientId 
Instance details

Defined in Gogol.Types

Eq FieldMask 
Instance details

Defined in Gogol.Types

Eq GSecret 
Instance details

Defined in Gogol.Types

Methods

(==) :: GSecret -> GSecret -> Bool #

(/=) :: GSecret -> GSecret -> Bool #

Eq Multipart 
Instance details

Defined in Gogol.Types

Eq OAuthScope 
Instance details

Defined in Gogol.Types

Eq RefreshToken 
Instance details

Defined in Gogol.Types

Eq Seconds 
Instance details

Defined in Gogol.Types

Methods

(==) :: Seconds -> Seconds -> Bool #

(/=) :: Seconds -> Seconds -> Bool #

Eq SerializeError 
Instance details

Defined in Gogol.Types

Eq ServiceError 
Instance details

Defined in Gogol.Types

Eq ServiceId 
Instance details

Defined in Gogol.Types

Eq SrcLoc 
Instance details

Defined in Language.Haskell.Exts.SrcLoc

Methods

(==) :: SrcLoc -> SrcLoc -> Bool #

(/=) :: SrcLoc -> SrcLoc -> Bool #

Eq SrcSpan 
Instance details

Defined in Language.Haskell.Exts.SrcLoc

Methods

(==) :: SrcSpan -> SrcSpan -> Bool #

(/=) :: SrcSpan -> SrcSpan -> Bool #

Eq SrcSpanInfo 
Instance details

Defined in Language.Haskell.Exts.SrcLoc

Eq Boxed 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Boxed -> Boxed -> Bool #

(/=) :: Boxed -> Boxed -> Bool #

Eq Tool 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Tool -> Tool -> Bool #

(/=) :: Tool -> Tool -> Bool #

Eq AccessToken 
Instance details

Defined in Network.OAuth.OAuth2.Internal

Eq ClientAuthenticationMethod 
Instance details

Defined in Network.OAuth.OAuth2.Internal

Eq IdToken 
Instance details

Defined in Network.OAuth.OAuth2.Internal

Methods

(==) :: IdToken -> IdToken -> Bool #

(/=) :: IdToken -> IdToken -> Bool #

Eq OAuth2 
Instance details

Defined in Network.OAuth.OAuth2.Internal

Methods

(==) :: OAuth2 -> OAuth2 -> Bool #

(/=) :: OAuth2 -> OAuth2 -> Bool #

Eq OAuth2Token 
Instance details

Defined in Network.OAuth.OAuth2.Internal

Eq RefreshToken 
Instance details

Defined in Network.OAuth.OAuth2.Internal

Eq IdpName 
Instance details

Defined in Network.OAuth2.Provider

Methods

(==) :: IdpName -> IdpName -> Bool #

(/=) :: IdpName -> IdpName -> Bool #

Eq Tix 
Instance details

Defined in Trace.Hpc.Tix

Methods

(==) :: Tix -> Tix -> Bool #

(/=) :: Tix -> Tix -> Bool #

Eq TixModule 
Instance details

Defined in Trace.Hpc.Tix

Eq Hash 
Instance details

Defined in Trace.Hpc.Util

Methods

(==) :: Hash -> Hash -> Bool #

(/=) :: Hash -> Hash -> Bool #

Eq HpcPos 
Instance details

Defined in Trace.Hpc.Util

Methods

(==) :: HpcPos -> HpcPos -> Bool #

(/=) :: HpcPos -> HpcPos -> Bool #

Eq Form 
Instance details

Defined in Web.Internal.FormUrlEncoded

Methods

(==) :: Form -> Form -> Bool #

(/=) :: Form -> Form -> Bool #

Eq ConnHost 
Instance details

Defined in Network.HTTP.Client.Types

Eq ConnKey 
Instance details

Defined in Network.HTTP.Client.Types

Methods

(==) :: ConnKey -> ConnKey -> Bool #

(/=) :: ConnKey -> ConnKey -> Bool #

Eq MaxHeaderLength 
Instance details

Defined in Network.HTTP.Client.Types

Eq Proxy 
Instance details

Defined in Network.HTTP.Client.Types

Methods

(==) :: Proxy -> Proxy -> Bool #

(/=) :: Proxy -> Proxy -> Bool #

Eq ProxySecureMode 
Instance details

Defined in Network.HTTP.Client.Types

Eq ResponseTimeout 
Instance details

Defined in Network.HTTP.Client.Types

Eq StatusHeaders 
Instance details

Defined in Network.HTTP.Client.Types

Eq StreamFileStatus 
Instance details

Defined in Network.HTTP.Client.Types

Eq ByteRange

Since: http-types-0.8.4

Instance details

Defined in Network.HTTP.Types.Header

Eq StdMethod 
Instance details

Defined in Network.HTTP.Types.Method

Eq Status

A Status is equal to another Status if the status codes are equal.

Instance details

Defined in Network.HTTP.Types.Status

Methods

(==) :: Status -> Status -> Bool #

(/=) :: Status -> Status -> Bool #

Eq HttpVersion 
Instance details

Defined in Network.HTTP.Types.Version

Eq IP

Equality over IP addresses. Correctly compare IPv4 and IPv4-embedded-in-IPv6 addresses.

>>> (read "2001:db8:00:00:00:00:00:01" :: IP) == (read "2001:db8:00:00:00:00:00:01" :: IP)
True
>>> (read "2001:db8:00:00:00:00:00:01" :: IP) == (read "2001:db8:00:00:00:00:00:05" :: IP)
False
>>> (read "127.0.0.1" :: IP) == (read "127.0.0.1" :: IP)
True
>>> (read "127.0.0.1" :: IP) == (read "10.0.0.1" :: IP)
False
>>> (read "::ffff:127.0.0.1" :: IP) == (read "127.0.0.1" :: IP)
True
>>> (read "::ffff:127.0.0.1" :: IP) == (read "127.0.0.9" :: IP)
False
>>> (read "::ffff:127.0.0.1" :: IP) >= (read "127.0.0.1" :: IP)
True
>>> (read "::ffff:127.0.0.1" :: IP) <= (read "127.0.0.1" :: IP)
True
Instance details

Defined in Data.IP.Addr

Methods

(==) :: IP -> IP -> Bool #

(/=) :: IP -> IP -> Bool #

Eq IPv4 
Instance details

Defined in Data.IP.Addr

Methods

(==) :: IPv4 -> IPv4 -> Bool #

(/=) :: IPv4 -> IPv4 -> Bool #

Eq IPv6 
Instance details

Defined in Data.IP.Addr

Methods

(==) :: IPv6 -> IPv6 -> Bool #

(/=) :: IPv6 -> IPv6 -> Bool #

Eq IPRange 
Instance details

Defined in Data.IP.Range

Methods

(==) :: IPRange -> IPRange -> Bool #

(/=) :: IPRange -> IPRange -> Bool #

Eq Alg 
Instance details

Defined in Jose.Jwa

Methods

(==) :: Alg -> Alg -> Bool #

(/=) :: Alg -> Alg -> Bool #

Eq Enc 
Instance details

Defined in Jose.Jwa

Methods

(==) :: Enc -> Enc -> Bool #

(/=) :: Enc -> Enc -> Bool #

Eq JweAlg 
Instance details

Defined in Jose.Jwa

Methods

(==) :: JweAlg -> JweAlg -> Bool #

(/=) :: JweAlg -> JweAlg -> Bool #

Eq JwsAlg 
Instance details

Defined in Jose.Jwa

Methods

(==) :: JwsAlg -> JwsAlg -> Bool #

(/=) :: JwsAlg -> JwsAlg -> Bool #

Eq EcCurve 
Instance details

Defined in Jose.Jwk

Methods

(==) :: EcCurve -> EcCurve -> Bool #

(/=) :: EcCurve -> EcCurve -> Bool #

Eq Jwk 
Instance details

Defined in Jose.Jwk

Methods

(==) :: Jwk -> Jwk -> Bool #

(/=) :: Jwk -> Jwk -> Bool #

Eq JwkSet 
Instance details

Defined in Jose.Jwk

Methods

(==) :: JwkSet -> JwkSet -> Bool #

(/=) :: JwkSet -> JwkSet -> Bool #

Eq KeyType 
Instance details

Defined in Jose.Jwk

Methods

(==) :: KeyType -> KeyType -> Bool #

(/=) :: KeyType -> KeyType -> Bool #

Eq KeyUse 
Instance details

Defined in Jose.Jwk

Methods

(==) :: KeyUse -> KeyUse -> Bool #

(/=) :: KeyUse -> KeyUse -> Bool #

Eq IntDate 
Instance details

Defined in Jose.Types

Methods

(==) :: IntDate -> IntDate -> Bool #

(/=) :: IntDate -> IntDate -> Bool #

Eq JweHeader 
Instance details

Defined in Jose.Types

Eq JwsHeader 
Instance details

Defined in Jose.Types

Eq Jwt 
Instance details

Defined in Jose.Types

Methods

(==) :: Jwt -> Jwt -> Bool #

(/=) :: Jwt -> Jwt -> Bool #

Eq JwtContent 
Instance details

Defined in Jose.Types

Eq JwtEncoding 
Instance details

Defined in Jose.Types

Eq JwtError 
Instance details

Defined in Jose.Types

Eq KeyId 
Instance details

Defined in Jose.Types

Methods

(==) :: KeyId -> KeyId -> Bool #

(/=) :: KeyId -> KeyId -> Bool #

Eq Payload 
Instance details

Defined in Jose.Types

Methods

(==) :: Payload -> Payload -> Bool #

(/=) :: Payload -> Payload -> Bool #

Eq Environment 
Instance details

Defined in Katip.Core

Eq LogStr 
Instance details

Defined in Katip.Core

Methods

(==) :: LogStr -> LogStr -> Bool #

(/=) :: LogStr -> LogStr -> Bool #

Eq Namespace 
Instance details

Defined in Katip.Core

Eq PayloadSelection 
Instance details

Defined in Katip.Core

Eq ScribeSettings 
Instance details

Defined in Katip.Core

Eq Severity 
Instance details

Defined in Katip.Core

Eq ThreadIdText 
Instance details

Defined in Katip.Core

Eq Verbosity 
Instance details

Defined in Katip.Core

Eq ColorStrategy 
Instance details

Defined in Katip.Scribes.Handle

Eq DefName 
Instance details

Defined in Control.Lens.Internal.FieldTH

Methods

(==) :: DefName -> DefName -> Bool #

(/=) :: DefName -> DefName -> Bool #

Eq NCon 
Instance details

Defined in Control.Lens.Internal.PrismTH

Methods

(==) :: NCon -> NCon -> Bool #

(/=) :: NCon -> NCon -> Bool #

Eq InvalidPosException 
Instance details

Defined in Text.Megaparsec.Pos

Eq Pos 
Instance details

Defined in Text.Megaparsec.Pos

Methods

(==) :: Pos -> Pos -> Bool #

(/=) :: Pos -> Pos -> Bool #

Eq SourcePos 
Instance details

Defined in Text.Megaparsec.Pos

Eq SpecMetaArgsOpt # 
Instance details

Defined in Napkin.Cli.SpecMetaArgs

Eq SpecFileArrayMergeStrategy # 
Instance details

Defined in Napkin.Cli.Types

Eq SpecFileWithMergeStrategy # 
Instance details

Defined in Napkin.Cli.Types

Eq SpecFilesWithOverrides # 
Instance details

Defined in Napkin.Cli.Types

Eq CompareCount # 
Instance details

Defined in Napkin.Run.Effects.Hooks.Types

Eq CountTolerance # 
Instance details

Defined in Napkin.Run.Effects.Hooks.Types

Eq AddedColumnPolicy # 
Instance details

Defined in Napkin.Run.Effects.Programs

Eq DroppedColumnPolicy # 
Instance details

Defined in Napkin.Run.Effects.Programs

Eq SchemaMigrationOptions # 
Instance details

Defined in Napkin.Run.Effects.Programs

Eq AuthEvalError 
Instance details

Defined in Napkin.Auth.Types

Eq Dollars 
Instance details

Defined in Napkin.Run.BigQuery

Methods

(==) :: Dollars -> Dollars -> Bool #

(/=) :: Dollars -> Dollars -> Bool #

Eq InvalidBigQueryRef 
Instance details

Defined in Napkin.Run.BigQuery.Context

Eq BigQueryRunError 
Instance details

Defined in Napkin.Run.BigQuery.Types

Eq DatasetIsMissing 
Instance details

Defined in Napkin.Run.BigQuery.Types

Eq StarExpansionNotSupported 
Instance details

Defined in Napkin.Run.BigQuery.Types

Eq BQDataSetId 
Instance details

Defined in Napkin.Types.BigQuery

Eq BQDataSetReference 
Instance details

Defined in Napkin.Types.BigQuery

Eq BQProjectId 
Instance details

Defined in Napkin.Types.BigQuery

Eq BQTableId 
Instance details

Defined in Napkin.Types.BigQuery

Eq BigQueryType 
Instance details

Defined in Napkin.Types.BigQuery

Eq JobInsertTableName 
Instance details

Defined in Napkin.Types.BigQuery

Eq MaterializedViewMeta 
Instance details

Defined in Napkin.Types.BigQuery

Eq MaterializedViewRefresh 
Instance details

Defined in Napkin.Types.BigQuery

Eq PartitionInterval 
Instance details

Defined in Napkin.Types.BigQuery

Eq RangeWithStep 
Instance details

Defined in Napkin.Types.BigQuery

Eq TableMeta 
Instance details

Defined in Napkin.Types.BigQuery

Eq TablePartitioning 
Instance details

Defined in Napkin.Types.BigQuery

Eq TimePartitioning 
Instance details

Defined in Napkin.Types.BigQuery

Eq ViewMeta 
Instance details

Defined in Napkin.Types.BigQuery

Eq WriteDisposition 
Instance details

Defined in Napkin.Types.BigQuery

Eq JoinOnPredicate 
Instance details

Defined in Napkin.Types.Commands.BigQuery.Merge

Eq Merge 
Instance details

Defined in Napkin.Types.Commands.BigQuery.Merge

Methods

(==) :: Merge -> Merge -> Bool #

(/=) :: Merge -> Merge -> Bool #

Eq TableAlias 
Instance details

Defined in Napkin.Types.Commands.BigQuery.Merge

Eq WhenMatched 
Instance details

Defined in Napkin.Types.Commands.BigQuery.Merge

Eq WhenNotMatched 
Instance details

Defined in Napkin.Types.Commands.BigQuery.Merge

Eq JSONPath 
Instance details

Defined in Napkin.Untyped.Ops.BigQuery

Eq MsSchemaField 
Instance details

Defined in Napkin.Types.MsSql

Eq MsSqlMaterializedViewMeta 
Instance details

Defined in Napkin.Types.MsSql

Eq SetTableSchema 
Instance details

Defined in Napkin.Types.MsSql

Eq PGSchemaField 
Instance details

Defined in Napkin.Run.PGCommon

Eq CreateIndex 
Instance details

Defined in Napkin.Types.Postgres

Eq MaterializedViewMeta 
Instance details

Defined in Napkin.Types.Postgres

Eq SetTableSchema 
Instance details

Defined in Napkin.Types.Postgres

Eq TableMeta 
Instance details

Defined in Napkin.Types.Postgres

Eq Index 
Instance details

Defined in Napkin.Types.Postgres.Indexes

Methods

(==) :: Index -> Index -> Bool #

(/=) :: Index -> Index -> Bool #

Eq ContinuousAggregatePolicy 
Instance details

Defined in Napkin.Types.Postgres.Timescale

Eq ContinuousViewMeta 
Instance details

Defined in Napkin.Types.Postgres.Timescale

Eq RetentionPolicy 
Instance details

Defined in Napkin.Types.Postgres.Timescale

Eq TimescaleViewMeta 
Instance details

Defined in Napkin.Types.Postgres.Timescale

Eq DistStyle 
Instance details

Defined in Napkin.Types.Redshift

Eq SortKey 
Instance details

Defined in Napkin.Types.Redshift

Methods

(==) :: SortKey -> SortKey -> Bool #

(/=) :: SortKey -> SortKey -> Bool #

Eq SortStyle 
Instance details

Defined in Napkin.Types.Redshift

Eq TableMeta 
Instance details

Defined in Napkin.Types.Redshift

Eq CaseSensitivity 
Instance details

Defined in Napkin.Untyped.Ops.Redshift

Eq SqliteSchemaError 
Instance details

Defined in Napkin.Run.Sqlite

Eq SqliteMaterializedViewMeta 
Instance details

Defined in Napkin.Types.Sqlite

Eq AggLevel 
Instance details

Defined in Napkin.Types.Core

Eq ArrayBase 
Instance details

Defined in Napkin.Types.Core

Eq AsStruct 
Instance details

Defined in Napkin.Types.Core

Eq CteBody 
Instance details

Defined in Napkin.Types.Core

Methods

(==) :: CteBody -> CteBody -> Bool #

(/=) :: CteBody -> CteBody -> Bool #

Eq DatePart 
Instance details

Defined in Napkin.Types.Core

Eq Distinctness 
Instance details

Defined in Napkin.Types.Core

Eq ExternFun 
Instance details

Defined in Napkin.Types.Core

Eq FrameLength 
Instance details

Defined in Napkin.Types.Core

Eq From 
Instance details

Defined in Napkin.Types.Core

Methods

(==) :: From -> From -> Bool #

(/=) :: From -> From -> Bool #

Eq FunModifier 
Instance details

Defined in Napkin.Types.Core

Eq IntInterval 
Instance details

Defined in Napkin.Types.Core

Eq Interval 
Instance details

Defined in Napkin.Types.Core

Eq JoinType 
Instance details

Defined in Napkin.Types.Core

Eq Name 
Instance details

Defined in Napkin.Types.Core

Methods

(==) :: Name -> Name -> Bool #

(/=) :: Name -> Name -> Bool #

Eq NativeExpr 
Instance details

Defined in Napkin.Types.Core

Eq NativeQuery 
Instance details

Defined in Napkin.Types.Core

Eq NullOrder 
Instance details

Defined in Napkin.Types.Core

Eq NullStrategy 
Instance details

Defined in Napkin.Types.Core

Eq Nullability 
Instance details

Defined in Napkin.Types.Core

Eq OrderDir 
Instance details

Defined in Napkin.Types.Core

Eq OrderPart 
Instance details

Defined in Napkin.Types.Core

Eq ParensOperator 
Instance details

Defined in Napkin.Types.Core

Eq ParensOperatorArgument 
Instance details

Defined in Napkin.Types.Core

Eq Query 
Instance details

Defined in Napkin.Types.Core

Methods

(==) :: Query -> Query -> Bool #

(/=) :: Query -> Query -> Bool #

Eq RawQuery 
Instance details

Defined in Napkin.Types.Core

Eq Relation 
Instance details

Defined in Napkin.Types.Core

Eq SExp 
Instance details

Defined in Napkin.Types.Core

Methods

(==) :: SExp -> SExp -> Bool #

(/=) :: SExp -> SExp -> Bool #

Eq SpecDependency 
Instance details

Defined in Napkin.Types.Core

Eq SpecNode 
Instance details

Defined in Napkin.Types.Core

Eq SpecTableName 
Instance details

Defined in Napkin.Types.Core

Eq StructField 
Instance details

Defined in Napkin.Types.Core

Eq TableKind 
Instance details

Defined in Napkin.Types.Core

Eq Type 
Instance details

Defined in Napkin.Types.Core

Methods

(==) :: Type -> Type -> Bool #

(/=) :: Type -> Type -> Bool #

Eq UnionType 
Instance details

Defined in Napkin.Types.Core

Eq UpdateQuery 
Instance details

Defined in Napkin.Types.Core

Eq Value 
Instance details

Defined in Napkin.Types.Core

Methods

(==) :: Value -> Value -> Bool #

(/=) :: Value -> Value -> Bool #

Eq WOver 
Instance details

Defined in Napkin.Types.Core

Methods

(==) :: WOver -> WOver -> Bool #

(/=) :: WOver -> WOver -> Bool #

Eq WindowFrame 
Instance details

Defined in Napkin.Types.Core

Eq WindowFrameUnit 
Instance details

Defined in Napkin.Types.Core

Eq WithClauses 
Instance details

Defined in Napkin.Types.Core

Eq Estimate 
Instance details

Defined in Napkin.Utils.Time

Eq ComBombShell 
Instance details

Defined in Napkin.Backends.MsSql.ApiGen.Types

Eq GenFunctionOpt 
Instance details

Defined in Napkin.Backends.MsSql.ApiGen.Types

Eq JsonNullStrategy 
Instance details

Defined in Napkin.Backends.MsSql.ApiGen.Types

Eq MsSqlApiDefExpr 
Instance details

Defined in Napkin.Backends.MsSql.ApiGen.Types

Eq MsSqlApiParserSt 
Instance details

Defined in Napkin.Backends.MsSql.ApiGen.Types

Eq MsSqlApiUnitDef 
Instance details

Defined in Napkin.Backends.MsSql.ApiGen.Types

Eq NthHtmlNode 
Instance details

Defined in Napkin.Backends.MsSql.ApiGen.Types

Eq NthStmtInHtmlNode 
Instance details

Defined in Napkin.Backends.MsSql.ApiGen.Types

Eq OverOrderBy 
Instance details

Defined in Napkin.Backends.MsSql.ApiGen.Types

Eq OverOrderByField 
Instance details

Defined in Napkin.Backends.MsSql.ApiGen.Types

Eq PartitionBy 
Instance details

Defined in Napkin.Backends.MsSql.ApiGen.Types

Eq RowRange 
Instance details

Defined in Napkin.Backends.MsSql.ApiGen.Types

Eq RowRangeBound 
Instance details

Defined in Napkin.Backends.MsSql.ApiGen.Types

Eq SubDefMeta 
Instance details

Defined in Napkin.Backends.MsSql.ApiGen.Types

Eq LogLineFormat 
Instance details

Defined in Napkin.Logging

Eq LogOptions 
Instance details

Defined in Napkin.Logging

Eq LogTarget 
Instance details

Defined in Napkin.Logging

Eq SQLDialect 
Instance details

Defined in Napkin.Parse.Base

Eq InterpolationError 
Instance details

Defined in Napkin.Parse.Interpolation.Types

Eq InterpolationErrorDetails 
Instance details

Defined in Napkin.Parse.Interpolation.Types

Eq InterpolationMode 
Instance details

Defined in Napkin.Parse.Interpolation.Types

Eq SqlTemplateVariables 
Instance details

Defined in Napkin.Parse.Interpolation.Types

Eq ParseExc 
Instance details

Defined in Napkin.Parse.SimpleSqlParser.Convert

Eq SimpleSQLParserDialect 
Instance details

Defined in Napkin.Parse.SimpleSqlParser.Dialect

Eq Artifacts 
Instance details

Defined in Napkin.Run.Effects.Interceptors.DiscoverDependencies.Types

Eq Dependencies 
Instance details

Defined in Napkin.Run.Effects.Interceptors.DiscoverDependencies.Types

Eq IState 
Instance details

Defined in Napkin.Run.Effects.Interpreters.FakeLocal.Types

Methods

(==) :: IState -> IState -> Bool #

(/=) :: IState -> IState -> Bool #

Eq AssertionEntry 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

Eq AssertionGroup 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

Eq AssertionLog 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

Eq AssertionSeverity 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

Eq AssertionStatus 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

Eq ExternalCommand 
Instance details

Defined in Napkin.Run.Effects.Languages.External

Eq LoadQueryError 
Instance details

Defined in Napkin.Run.Effects.Languages.LoadQuery

Eq LocalFileError 
Instance details

Defined in Napkin.Run.Effects.Languages.LocalFile

Eq NapkinEffectError 
Instance details

Defined in Napkin.Run.Effects.Languages.NapkinError

Eq SqlParseError 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlParse

Eq Cascade 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlWrite

Methods

(==) :: Cascade -> Cascade -> Bool #

(/=) :: Cascade -> Cascade -> Bool #

Eq InsertColumnsList 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlWrite

Eq MissingBehavior 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlWrite

Eq TableWriteStrategy 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlWrite

Eq CreateTableDDL 
Instance details

Defined in Napkin.Run.Effects.Languages.StatementParse

Eq ExtendedStatement 
Instance details

Defined in Napkin.Run.Effects.Languages.StatementParse

Eq InsertStatement 
Instance details

Defined in Napkin.Run.Effects.Languages.StatementParse

Eq ExtraDependencies 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

Eq HiddenArtifacts 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

Eq HiddenDependencies 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

Eq MetaArguments 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

Eq TableMemo 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

Eq TemplateError 
Instance details

Defined in Napkin.Run.Effects.Languages.Template

Eq RenamerSchemaOverwriteBehavior 
Instance details

Defined in Napkin.Run.Effects.Preprocessor

Eq RenamerScope 
Instance details

Defined in Napkin.Run.Effects.Preprocessor

Eq HaskellEvaluationError 
Instance details

Defined in Napkin.Run.Types.ErrorReporting

Eq ValidationError 
Instance details

Defined in Napkin.Run.Types.ErrorReporting

Eq SourceLocation 
Instance details

Defined in Napkin.Run.Types.SourceLocation

Eq AppName 
Instance details

Defined in Napkin.Spec.Types.Runtime

Methods

(==) :: AppName -> AppName -> Bool #

(/=) :: AppName -> AppName -> Bool #

Eq AuthSpecFile 
Instance details

Defined in Napkin.Spec.Types.Runtime

Eq BkStatistics 
Instance details

Defined in Napkin.Spec.Types.Runtime

Eq UpdateStrategy 
Instance details

Defined in Napkin.Spec.Types.Spec

Eq SpecProgramArgumentDefaultValue 
Instance details

Defined in Napkin.Spec.Yaml.Types.Arguments

Eq ListedTable 
Instance details

Defined in Napkin.Types.Commands

Eq ListedTableKind 
Instance details

Defined in Napkin.Types.Commands

Eq NormalizedTable 
Instance details

Defined in Napkin.Types.Commands

Eq Prefix 
Instance details

Defined in Napkin.Types.Commands

Methods

(==) :: Prefix -> Prefix -> Bool #

(/=) :: Prefix -> Prefix -> Bool #

Eq QState 
Instance details

Defined in Napkin.Untyped.Monad

Methods

(==) :: QState -> QState -> Bool #

(/=) :: QState -> QState -> Bool #

Eq RefStore 
Instance details

Defined in Napkin.Untyped.Monad

Eq UState 
Instance details

Defined in Napkin.Untyped.Monad

Methods

(==) :: UState -> UState -> Bool #

(/=) :: UState -> UState -> Bool #

Eq BackendFunctionMeta 
Instance details

Defined in Napkin.Untyped.Ops

Eq FileType 
Instance details

Defined in Napkin.Utils.FileSystem

Eq AddrInfo 
Instance details

Defined in Network.Socket.Info

Eq AddrInfoFlag 
Instance details

Defined in Network.Socket.Info

Eq NameInfoFlag 
Instance details

Defined in Network.Socket.Info

Eq URI 
Instance details

Defined in Network.URI

Methods

(==) :: URI -> URI -> Bool #

(/=) :: URI -> URI -> Bool #

Eq URIAuth 
Instance details

Defined in Network.URI

Methods

(==) :: URIAuth -> URIAuth -> Bool #

(/=) :: URIAuth -> URIAuth -> Bool #

Eq Binary 
Instance details

Defined in Database.ODBC.Internal

Methods

(==) :: Binary -> Binary -> Bool #

(/=) :: Binary -> Binary -> Bool #

Eq ODBCException 
Instance details

Defined in Database.ODBC.Internal

Eq Param 
Instance details

Defined in Database.ODBC.Internal

Methods

(==) :: Param -> Param -> Bool #

(/=) :: Param -> Param -> Bool #

Eq RETCODE 
Instance details

Defined in Database.ODBC.Internal

Methods

(==) :: RETCODE -> RETCODE -> Bool #

(/=) :: RETCODE -> RETCODE -> Bool #

Eq SQLCHAR 
Instance details

Defined in Database.ODBC.Internal

Methods

(==) :: SQLCHAR -> SQLCHAR -> Bool #

(/=) :: SQLCHAR -> SQLCHAR -> Bool #

Eq SQLCTYPE 
Instance details

Defined in Database.ODBC.Internal

Methods

(==) :: SQLCTYPE -> SQLCTYPE -> Bool #

(/=) :: SQLCTYPE -> SQLCTYPE -> Bool #

Eq SQLINTEGER 
Instance details

Defined in Database.ODBC.Internal

Methods

(==) :: SQLINTEGER -> SQLINTEGER -> Bool #

(/=) :: SQLINTEGER -> SQLINTEGER -> Bool #

Eq SQLLEN 
Instance details

Defined in Database.ODBC.Internal

Methods

(==) :: SQLLEN -> SQLLEN -> Bool #

(/=) :: SQLLEN -> SQLLEN -> Bool #

Eq SQLSMALLINT 
Instance details

Defined in Database.ODBC.Internal

Methods

(==) :: SQLSMALLINT -> SQLSMALLINT -> Bool #

(/=) :: SQLSMALLINT -> SQLSMALLINT -> Bool #

Eq SQLUCHAR 
Instance details

Defined in Database.ODBC.Internal

Methods

(==) :: SQLUCHAR -> SQLUCHAR -> Bool #

(/=) :: SQLUCHAR -> SQLUCHAR -> Bool #

Eq SQLUINTEGER 
Instance details

Defined in Database.ODBC.Internal

Methods

(==) :: SQLUINTEGER -> SQLUINTEGER -> Bool #

(/=) :: SQLUINTEGER -> SQLUINTEGER -> Bool #

Eq SQLULEN 
Instance details

Defined in Database.ODBC.Internal

Methods

(==) :: SQLULEN -> SQLULEN -> Bool #

(/=) :: SQLULEN -> SQLULEN -> Bool #

Eq SQLUSMALLINT 
Instance details

Defined in Database.ODBC.Internal

Methods

(==) :: SQLUSMALLINT -> SQLUSMALLINT -> Bool #

(/=) :: SQLUSMALLINT -> SQLUSMALLINT -> Bool #

Eq SQLWCHAR 
Instance details

Defined in Database.ODBC.Internal

Methods

(==) :: SQLWCHAR -> SQLWCHAR -> Bool #

(/=) :: SQLWCHAR -> SQLWCHAR -> Bool #

Eq Value 
Instance details

Defined in Database.ODBC.Internal

Methods

(==) :: Value -> Value -> Bool #

(/=) :: Value -> Value -> Bool #

Eq Datetime2 
Instance details

Defined in Database.ODBC.SQLServer

Eq Datetimeoffset

SQL Server considers two datetimeoffset values to be equal as long as they represent the same instant in time; i.e. they are equavalent to the same UTC time and date. This instance reproduces that behaviour.

Instance details

Defined in Database.ODBC.SQLServer

Eq FPart 
Instance details

Defined in Database.ODBC.SQLServer

Methods

(==) :: FPart -> FPart -> Bool #

(/=) :: FPart -> FPart -> Bool #

Eq Part 
Instance details

Defined in Database.ODBC.SQLServer

Methods

(==) :: Part -> Part -> Bool #

(/=) :: Part -> Part -> Bool #

Eq Query 
Instance details

Defined in Database.ODBC.SQLServer

Methods

(==) :: Query -> Query -> Bool #

(/=) :: Query -> Query -> Bool #

Eq Smalldatetime 
Instance details

Defined in Database.ODBC.SQLServer

Eq Richness 
Instance details

Defined in Options.Applicative.BashCompletion

Methods

(==) :: Richness -> Richness -> Bool #

(/=) :: Richness -> Richness -> Bool #

Eq Parenthetic 
Instance details

Defined in Options.Applicative.Help.Core

Methods

(==) :: Parenthetic -> Parenthetic -> Bool #

(/=) :: Parenthetic -> Parenthetic -> Bool #

Eq AltNodeType 
Instance details

Defined in Options.Applicative.Types

Eq ArgPolicy 
Instance details

Defined in Options.Applicative.Types

Eq ArgumentReachability 
Instance details

Defined in Options.Applicative.Types

Eq Backtracking 
Instance details

Defined in Options.Applicative.Types

Eq OptName 
Instance details

Defined in Options.Applicative.Types

Methods

(==) :: OptName -> OptName -> Bool #

(/=) :: OptName -> OptName -> Bool #

Eq OptVisibility 
Instance details

Defined in Options.Applicative.Types

Eq ParserPrefs 
Instance details

Defined in Options.Applicative.Types

Eq OsChar

Byte equality of the internal representation.

Instance details

Defined in System.OsString.Internal.Types

Methods

(==) :: OsChar -> OsChar -> Bool #

(/=) :: OsChar -> OsChar -> Bool #

Eq OsString

Byte equality of the internal representation.

Instance details

Defined in System.OsString.Internal.Types

Eq PosixChar 
Instance details

Defined in System.OsString.Internal.Types

Eq PosixString 
Instance details

Defined in System.OsString.Internal.Types

Eq WindowsChar 
Instance details

Defined in System.OsString.Internal.Types

Eq WindowsString 
Instance details

Defined in System.OsString.Internal.Types

Eq PredType' 
Instance details

Defined in Polysemy.Plugin.Fundep

Methods

(==) :: PredType' -> PredType' -> Bool #

(/=) :: PredType' -> PredType' -> Bool #

Eq OrdType 
Instance details

Defined in Polysemy.Plugin.Fundep.Unification

Methods

(==) :: OrdType -> OrdType -> Bool #

(/=) :: OrdType -> OrdType -> Bool #

Eq SolveContext 
Instance details

Defined in Polysemy.Plugin.Fundep.Unification

Eq Unification 
Instance details

Defined in Polysemy.Plugin.Fundep.Unification

Eq ConnectInfo 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Eq Connection 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Eq FormatError 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Eq QueryError 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Eq SqlError 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Eq AExpr 
Instance details

Defined in PostgresqlSyntax.Ast

Methods

(==) :: AExpr -> AExpr -> Bool #

(/=) :: AExpr -> AExpr -> Bool #

Eq AExprReversableOp 
Instance details

Defined in PostgresqlSyntax.Ast

Eq AexprConst 
Instance details

Defined in PostgresqlSyntax.Ast

Eq AliasClause 
Instance details

Defined in PostgresqlSyntax.Ast

Eq AllOp 
Instance details

Defined in PostgresqlSyntax.Ast

Methods

(==) :: AllOp -> AllOp -> Bool #

(/=) :: AllOp -> AllOp -> Bool #

Eq AnyName 
Instance details

Defined in PostgresqlSyntax.Ast

Methods

(==) :: AnyName -> AnyName -> Bool #

(/=) :: AnyName -> AnyName -> Bool #

Eq AnyOperator 
Instance details

Defined in PostgresqlSyntax.Ast

Eq ArrayExpr 
Instance details

Defined in PostgresqlSyntax.Ast

Eq AscDesc 
Instance details

Defined in PostgresqlSyntax.Ast

Methods

(==) :: AscDesc -> AscDesc -> Bool #

(/=) :: AscDesc -> AscDesc -> Bool #

Eq BExpr 
Instance details

Defined in PostgresqlSyntax.Ast

Methods

(==) :: BExpr -> BExpr -> Bool #

(/=) :: BExpr -> BExpr -> Bool #

Eq BExprIsOp 
Instance details

Defined in PostgresqlSyntax.Ast

Eq Bit 
Instance details

Defined in PostgresqlSyntax.Ast

Methods

(==) :: Bit -> Bit -> Bool #

(/=) :: Bit -> Bit -> Bool #

Eq CExpr 
Instance details

Defined in PostgresqlSyntax.Ast

Methods

(==) :: CExpr -> CExpr -> Bool #

(/=) :: CExpr -> CExpr -> Bool #

Eq CallStmt 
Instance details

Defined in PostgresqlSyntax.Ast

Eq CaseExpr 
Instance details

Defined in PostgresqlSyntax.Ast

Eq Character 
Instance details

Defined in PostgresqlSyntax.Ast

Eq Columnref 
Instance details

Defined in PostgresqlSyntax.Ast

Eq CommonTableExpr 
Instance details

Defined in PostgresqlSyntax.Ast

Eq ConfExpr 
Instance details

Defined in PostgresqlSyntax.Ast

Eq ConstCharacter 
Instance details

Defined in PostgresqlSyntax.Ast

Eq ConstDatetime 
Instance details

Defined in PostgresqlSyntax.Ast

Eq ConstTypename 
Instance details

Defined in PostgresqlSyntax.Ast

Eq DeleteStmt 
Instance details

Defined in PostgresqlSyntax.Ast

Eq ExtractArg 
Instance details

Defined in PostgresqlSyntax.Ast

Eq ExtractList 
Instance details

Defined in PostgresqlSyntax.Ast

Eq ForLockingClause 
Instance details

Defined in PostgresqlSyntax.Ast

Eq ForLockingItem 
Instance details

Defined in PostgresqlSyntax.Ast

Eq ForLockingStrength 
Instance details

Defined in PostgresqlSyntax.Ast

Eq FrameBound 
Instance details

Defined in PostgresqlSyntax.Ast

Eq FrameClause 
Instance details

Defined in PostgresqlSyntax.Ast

Eq FrameClauseMode 
Instance details

Defined in PostgresqlSyntax.Ast

Eq FrameExtent 
Instance details

Defined in PostgresqlSyntax.Ast

Eq FuncAliasClause 
Instance details

Defined in PostgresqlSyntax.Ast

Eq FuncApplication 
Instance details

Defined in PostgresqlSyntax.Ast

Eq FuncApplicationParams 
Instance details

Defined in PostgresqlSyntax.Ast

Eq FuncArgExpr 
Instance details

Defined in PostgresqlSyntax.Ast

Eq FuncConstArgs 
Instance details

Defined in PostgresqlSyntax.Ast

Eq FuncExpr 
Instance details

Defined in PostgresqlSyntax.Ast

Eq FuncExprCommonSubexpr 
Instance details

Defined in PostgresqlSyntax.Ast

Eq FuncExprWindowless 
Instance details

Defined in PostgresqlSyntax.Ast

Eq FuncName 
Instance details

Defined in PostgresqlSyntax.Ast

Eq FuncTable 
Instance details

Defined in PostgresqlSyntax.Ast

Eq GenericType 
Instance details

Defined in PostgresqlSyntax.Ast

Eq GroupByItem 
Instance details

Defined in PostgresqlSyntax.Ast

Eq Ident 
Instance details

Defined in PostgresqlSyntax.Ast

Methods

(==) :: Ident -> Ident -> Bool #

(/=) :: Ident -> Ident -> Bool #

Eq ImplicitRow 
Instance details

Defined in PostgresqlSyntax.Ast

Eq InExpr 
Instance details

Defined in PostgresqlSyntax.Ast

Methods

(==) :: InExpr -> InExpr -> Bool #

(/=) :: InExpr -> InExpr -> Bool #

Eq IndexElem 
Instance details

Defined in PostgresqlSyntax.Ast

Eq IndexElemDef 
Instance details

Defined in PostgresqlSyntax.Ast

Eq IndirectionEl 
Instance details

Defined in PostgresqlSyntax.Ast

Eq InsertColumnItem 
Instance details

Defined in PostgresqlSyntax.Ast

Eq InsertRest 
Instance details

Defined in PostgresqlSyntax.Ast

Eq InsertStmt 
Instance details

Defined in PostgresqlSyntax.Ast

Eq InsertTarget 
Instance details

Defined in PostgresqlSyntax.Ast

Eq Interval 
Instance details

Defined in PostgresqlSyntax.Ast

Eq JoinMeth 
Instance details

Defined in PostgresqlSyntax.Ast

Eq JoinQual 
Instance details

Defined in PostgresqlSyntax.Ast

Eq JoinType 
Instance details

Defined in PostgresqlSyntax.Ast

Eq JoinedTable 
Instance details

Defined in PostgresqlSyntax.Ast

Eq LimitClause 
Instance details

Defined in PostgresqlSyntax.Ast

Eq MathOp 
Instance details

Defined in PostgresqlSyntax.Ast

Methods

(==) :: MathOp -> MathOp -> Bool #

(/=) :: MathOp -> MathOp -> Bool #

Eq NullsOrder 
Instance details

Defined in PostgresqlSyntax.Ast

Eq Numeric 
Instance details

Defined in PostgresqlSyntax.Ast

Methods

(==) :: Numeric -> Numeric -> Bool #

(/=) :: Numeric -> Numeric -> Bool #

Eq OffsetClause 
Instance details

Defined in PostgresqlSyntax.Ast

Eq OnConflict 
Instance details

Defined in PostgresqlSyntax.Ast

Eq OnConflictDo 
Instance details

Defined in PostgresqlSyntax.Ast

Eq OptTempTableName 
Instance details

Defined in PostgresqlSyntax.Ast

Eq OverClause 
Instance details

Defined in PostgresqlSyntax.Ast

Eq OverlayList 
Instance details

Defined in PostgresqlSyntax.Ast

Eq OverrideKind 
Instance details

Defined in PostgresqlSyntax.Ast

Eq PositionList 
Instance details

Defined in PostgresqlSyntax.Ast

Eq PreparableStmt 
Instance details

Defined in PostgresqlSyntax.Ast

Eq QualAllOp 
Instance details

Defined in PostgresqlSyntax.Ast

Eq QualOp 
Instance details

Defined in PostgresqlSyntax.Ast

Methods

(==) :: QualOp -> QualOp -> Bool #

(/=) :: QualOp -> QualOp -> Bool #

Eq QualifiedName 
Instance details

Defined in PostgresqlSyntax.Ast

Eq RelationExpr 
Instance details

Defined in PostgresqlSyntax.Ast

Eq RelationExprOptAlias 
Instance details

Defined in PostgresqlSyntax.Ast

Eq Row 
Instance details

Defined in PostgresqlSyntax.Ast

Methods

(==) :: Row -> Row -> Bool #

(/=) :: Row -> Row -> Bool #

Eq RowsfromItem 
Instance details

Defined in PostgresqlSyntax.Ast

Eq SelectBinOp 
Instance details

Defined in PostgresqlSyntax.Ast

Eq SelectFetchFirstValue 
Instance details

Defined in PostgresqlSyntax.Ast

Eq SelectLimit 
Instance details

Defined in PostgresqlSyntax.Ast

Eq SelectLimitValue 
Instance details

Defined in PostgresqlSyntax.Ast

Eq SelectNoParens 
Instance details

Defined in PostgresqlSyntax.Ast

Eq SelectWithParens 
Instance details

Defined in PostgresqlSyntax.Ast

Eq SetClause 
Instance details

Defined in PostgresqlSyntax.Ast

Eq SetTarget 
Instance details

Defined in PostgresqlSyntax.Ast

Eq SimpleSelect 
Instance details

Defined in PostgresqlSyntax.Ast

Eq SimpleTypename 
Instance details

Defined in PostgresqlSyntax.Ast

Eq SortBy 
Instance details

Defined in PostgresqlSyntax.Ast

Methods

(==) :: SortBy -> SortBy -> Bool #

(/=) :: SortBy -> SortBy -> Bool #

Eq SubType 
Instance details

Defined in PostgresqlSyntax.Ast

Methods

(==) :: SubType -> SubType -> Bool #

(/=) :: SubType -> SubType -> Bool #

Eq SubqueryOp 
Instance details

Defined in PostgresqlSyntax.Ast

Eq SubstrList 
Instance details

Defined in PostgresqlSyntax.Ast

Eq SubstrListFromFor 
Instance details

Defined in PostgresqlSyntax.Ast

Eq SymbolicExprBinOp 
Instance details

Defined in PostgresqlSyntax.Ast

Eq TableFuncElement 
Instance details

Defined in PostgresqlSyntax.Ast

Eq TableRef 
Instance details

Defined in PostgresqlSyntax.Ast

Eq TablesampleClause 
Instance details

Defined in PostgresqlSyntax.Ast

Eq TargetEl 
Instance details

Defined in PostgresqlSyntax.Ast

Eq Targeting 
Instance details

Defined in PostgresqlSyntax.Ast

Eq TrimList 
Instance details

Defined in PostgresqlSyntax.Ast

Eq TrimModifier 
Instance details

Defined in PostgresqlSyntax.Ast

Eq Typename 
Instance details

Defined in PostgresqlSyntax.Ast

Eq TypenameArrayDimensions 
Instance details

Defined in PostgresqlSyntax.Ast

Eq UpdateStmt 
Instance details

Defined in PostgresqlSyntax.Ast

Eq VerbalExprBinOp 
Instance details

Defined in PostgresqlSyntax.Ast

Eq WhenClause 
Instance details

Defined in PostgresqlSyntax.Ast

Eq WhereOrCurrentClause 
Instance details

Defined in PostgresqlSyntax.Ast

Eq WindowDefinition 
Instance details

Defined in PostgresqlSyntax.Ast

Eq WindowExclusionClause 
Instance details

Defined in PostgresqlSyntax.Ast

Eq WindowSpecification 
Instance details

Defined in PostgresqlSyntax.Ast

Eq WithClause 
Instance details

Defined in PostgresqlSyntax.Ast

Eq Mode 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

(==) :: Mode -> Mode -> Bool #

(/=) :: Mode -> Mode -> Bool #

Eq Style 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

(==) :: Style -> Style -> Bool #

(/=) :: Style -> Style -> Bool #

Eq TextDetails 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Eq Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Methods

(==) :: Doc -> Doc -> Bool #

(/=) :: Doc -> Doc -> Bool #

Eq ColorOptions 
Instance details

Defined in Text.Pretty.Simple.Internal.Color

Eq Style 
Instance details

Defined in Text.Pretty.Simple.Internal.Color

Methods

(==) :: Style -> Style -> Bool #

(/=) :: Style -> Style -> Bool #

Eq Expr 
Instance details

Defined in Text.Pretty.Simple.Internal.Expr

Methods

(==) :: Expr -> Expr -> Bool #

(/=) :: Expr -> Expr -> Bool #

Eq Annotation 
Instance details

Defined in Text.Pretty.Simple.Internal.Printer

Eq CheckColorTty 
Instance details

Defined in Text.Pretty.Simple.Internal.Printer

Eq OutputOptions 
Instance details

Defined in Text.Pretty.Simple.Internal.Printer

Eq StringOutputStyle 
Instance details

Defined in Text.Pretty.Simple.Internal.Printer

Eq FusionDepth 
Instance details

Defined in Prettyprinter.Internal

Eq LayoutOptions 
Instance details

Defined in Prettyprinter.Internal

Eq PageWidth 
Instance details

Defined in Prettyprinter.Internal

Eq AnsiStyle 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Eq Bold 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

(==) :: Bold -> Bold -> Bool #

(/=) :: Bold -> Bold -> Bool #

Eq Color 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

(==) :: Color -> Color -> Bool #

(/=) :: Color -> Color -> Bool #

Eq Intensity 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Eq Italicized 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Eq Layer 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

(==) :: Layer -> Layer -> Bool #

(/=) :: Layer -> Layer -> Bool #

Eq Underlined 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Eq StdGen 
Instance details

Defined in System.Random.Internal

Methods

(==) :: StdGen -> StdGen -> Bool #

(/=) :: StdGen -> StdGen -> Bool #

Eq CompOption 
Instance details

Defined in Text.Regex.Posix.Wrap

Eq ExecOption 
Instance details

Defined in Text.Regex.Posix.Wrap

Eq ReturnCode 
Instance details

Defined in Text.Regex.Posix.Wrap

Eq Undefined 
Instance details

Defined in Relude.Debug

Eq RetryAction 
Instance details

Defined in Control.Retry

Eq RetryStatus 
Instance details

Defined in Control.Retry

Eq LogLevel 
Instance details

Defined in RIO.Prelude.Logger

Eq Scientific

Scientific numbers can be safely compared for equality. No magnitude 10^e is calculated so there's no risk of a blowup in space or time when comparing scientific numbers coming from untrusted sources.

Instance details

Defined in Data.Scientific

Eq AcceptHeader 
Instance details

Defined in Servant.API.ContentTypes

Eq NoContent 
Instance details

Defined in Servant.API.ContentTypes

Eq IsSecure 
Instance details

Defined in Servant.API.IsSecure

Eq LinkArrayElementStyle 
Instance details

Defined in Servant.Links

Eq AlterTableOptions 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect

Eq Dialect 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect

Methods

(==) :: Dialect -> Dialect -> Bool #

(/=) :: Dialect -> Dialect -> Bool #

Eq KeywordMode 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect

Eq SetOperatorOptions 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect

Eq TrieKey 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Trie

Methods

(==) :: TrieKey -> TrieKey -> Bool #

(/=) :: TrieKey -> TrieKey -> Bool #

Eq TrieNodeKey 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Trie

Eq CaseEquality 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Eq CodePointBase 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Eq CodePointDigits 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Eq EscMode 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Methods

(==) :: EscMode -> EscMode -> Bool #

(/=) :: EscMode -> EscMode -> Bool #

Eq EscapeFallBack 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Eq EscapeParams 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Eq InLowCase 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Eq InSource 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Eq KeyCharEventHandler 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Eq LetterCase 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Eq QuotationRuleIndex 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Eq QuotePrefix 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Eq QuotingChars 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Eq ScapeParams 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Eq ScapingRule 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Eq SrcLitStr 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Eq StrLitFmt 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Eq StrLitId 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Eq StrLitPrefix 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Eq UnEscapeParams 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Types

Eq SQLToken 
Instance details

Defined in Language.SQL.SimpleSQL.Lex.LexType

Eq SrcPos 
Instance details

Defined in Language.SQL.SimpleSQL.Lex.LexType

Methods

(==) :: SrcPos -> SrcPos -> Bool #

(/=) :: SrcPos -> SrcPos -> Bool #

Eq WithPos 
Instance details

Defined in Language.SQL.SimpleSQL.Lex.LexType

Methods

(==) :: WithPos -> WithPos -> Bool #

(/=) :: WithPos -> WithPos -> Bool #

Eq AdminOption 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq AdminOptionFor 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq Alias 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Methods

(==) :: Alias -> Alias -> Bool #

(/=) :: Alias -> Alias -> Bool #

Eq AlterDomainAction 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq AlterTableAction 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq AnonymousStruct 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq AsStruct 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq BqStructExpr 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq CastSafe 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq CheckOption 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq ColConstraint 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq ColConstraintDef 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq ColumnDef 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq Comment 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Methods

(==) :: Comment -> Comment -> Bool #

(/=) :: Comment -> Comment -> Bool #

Eq CompPredQuantifier 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq Corresponding 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq DefaultClause 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq Direction 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq DropBehaviour 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq Frame 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Methods

(==) :: Frame -> Frame -> Bool #

(/=) :: Frame -> Frame -> Bool #

Eq FramePos 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq FrameRows 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq GrantOption 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq GrantOptionFor 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq GroupingExpr 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq IdentityRestart 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq IdentityWhen 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq InPredValue 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq InsertSource 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq IntervalTypeField 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq JoinCondition 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq JoinType 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq Name 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Methods

(==) :: Name -> Name -> Bool #

(/=) :: Name -> Name -> Bool #

Eq NullsOrder 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq NullsRespect 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq ParensOperator 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq ParensOperatorArgument 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq PrecMultiplier 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq PrecUnits 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq PrivilegeAction 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq PrivilegeObject 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq QueryExpr 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq ReferenceMatch 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq ReferentialAction 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq ScalarExpr 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq SequenceGeneratorOption 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq SetClause 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq SetOperatorName 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq SetQuantifier 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq Sign 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Methods

(==) :: Sign -> Sign -> Bool #

(/=) :: Sign -> Sign -> Bool #

Eq SortSpec 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq Statement 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq SubQueryExprType 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq TableConstraint 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq TableElement 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq TableRef 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq TypeName 
Instance details

Defined in Language.SQL.SimpleSQL.Syntax

Eq Key 
Instance details

Defined in Text.Mustache.Type

Methods

(==) :: Key -> Key -> Bool #

(/=) :: Key -> Key -> Bool #

Eq MustacheException 
Instance details

Defined in Text.Mustache.Type

Eq MustacheWarning 
Instance details

Defined in Text.Mustache.Type

Eq Node 
Instance details

Defined in Text.Mustache.Type

Methods

(==) :: Node -> Node -> Bool #

(/=) :: Node -> Node -> Bool #

Eq PName 
Instance details

Defined in Text.Mustache.Type

Methods

(==) :: PName -> PName -> Bool #

(/=) :: PName -> PName -> Bool #

Eq Template 
Instance details

Defined in Text.Mustache.Type

Eq Leniency 
Instance details

Defined in Data.String.Conv

Eq AnnLookup 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq AnnTarget 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Bang 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Bang -> Bang -> Bool #

(/=) :: Bang -> Bang -> Bool #

Eq BndrVis 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: BndrVis -> BndrVis -> Bool #

(/=) :: BndrVis -> BndrVis -> Bool #

Eq Body 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Body -> Body -> Bool #

(/=) :: Body -> Body -> Bool #

Eq Bytes 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Bytes -> Bytes -> Bool #

(/=) :: Bytes -> Bytes -> Bool #

Eq Callconv 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Clause 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Clause -> Clause -> Bool #

(/=) :: Clause -> Clause -> Bool #

Eq Con 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Con -> Con -> Bool #

(/=) :: Con -> Con -> Bool #

Eq Dec 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Dec -> Dec -> Bool #

(/=) :: Dec -> Dec -> Bool #

Eq DecidedStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq DerivClause 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq DerivStrategy 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq DocLoc 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: DocLoc -> DocLoc -> Bool #

(/=) :: DocLoc -> DocLoc -> Bool #

Eq Exp 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Exp -> Exp -> Bool #

(/=) :: Exp -> Exp -> Bool #

Eq FamilyResultSig 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Fixity 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Fixity -> Fixity -> Bool #

(/=) :: Fixity -> Fixity -> Bool #

Eq FixityDirection 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Foreign 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Foreign -> Foreign -> Bool #

(/=) :: Foreign -> Foreign -> Bool #

Eq FunDep 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: FunDep -> FunDep -> Bool #

(/=) :: FunDep -> FunDep -> Bool #

Eq Guard 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Guard -> Guard -> Bool #

(/=) :: Guard -> Guard -> Bool #

Eq Info 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Info -> Info -> Bool #

(/=) :: Info -> Info -> Bool #

Eq InjectivityAnn 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Inline 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Inline -> Inline -> Bool #

(/=) :: Inline -> Inline -> Bool #

Eq Lit 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Lit -> Lit -> Bool #

(/=) :: Lit -> Lit -> Bool #

Eq Loc 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Loc -> Loc -> Bool #

(/=) :: Loc -> Loc -> Bool #

Eq Match 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Match -> Match -> Bool #

(/=) :: Match -> Match -> Bool #

Eq ModName 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: ModName -> ModName -> Bool #

(/=) :: ModName -> ModName -> Bool #

Eq Module 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Module -> Module -> Bool #

(/=) :: Module -> Module -> Bool #

Eq ModuleInfo 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Name 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Name -> Name -> Bool #

(/=) :: Name -> Name -> Bool #

Eq NameFlavour 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq NameSpace 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq NamespaceSpecifier 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq OccName 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: OccName -> OccName -> Bool #

(/=) :: OccName -> OccName -> Bool #

Eq Overlap 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Overlap -> Overlap -> Bool #

(/=) :: Overlap -> Overlap -> Bool #

Eq Pat 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Pat -> Pat -> Bool #

(/=) :: Pat -> Pat -> Bool #

Eq PatSynArgs 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq PatSynDir 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Phases 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Phases -> Phases -> Bool #

(/=) :: Phases -> Phases -> Bool #

Eq PkgName 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: PkgName -> PkgName -> Bool #

(/=) :: PkgName -> PkgName -> Bool #

Eq Pragma 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Pragma -> Pragma -> Bool #

(/=) :: Pragma -> Pragma -> Bool #

Eq Range 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Range -> Range -> Bool #

(/=) :: Range -> Range -> Bool #

Eq Role 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Role -> Role -> Bool #

(/=) :: Role -> Role -> Bool #

Eq RuleBndr 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq RuleMatch 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Safety 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Safety -> Safety -> Bool #

(/=) :: Safety -> Safety -> Bool #

Eq SourceStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq SourceUnpackedness 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Specificity 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Stmt 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Stmt -> Stmt -> Bool #

(/=) :: Stmt -> Stmt -> Bool #

Eq TyLit 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: TyLit -> TyLit -> Bool #

(/=) :: TyLit -> TyLit -> Bool #

Eq TySynEqn 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq Type 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Type -> Type -> Bool #

(/=) :: Type -> Type -> Bool #

Eq TypeFamilyHead 
Instance details

Defined in Language.Haskell.TH.Syntax

Eq UnicodeException 
Instance details

Defined in Data.Text.Encoding.Error

Eq I8 
Instance details

Defined in Data.Text.Foreign

Methods

(==) :: I8 -> I8 -> Bool #

(/=) :: I8 -> I8 -> Bool #

Eq Builder 
Instance details

Defined in Data.Text.Internal.Builder

Methods

(==) :: Builder -> Builder -> Bool #

(/=) :: Builder -> Builder -> Bool #

Eq PartialUtf8CodePoint 
Instance details

Defined in Data.Text.Internal.Encoding

Methods

(==) :: PartialUtf8CodePoint -> PartialUtf8CodePoint -> Bool #

(/=) :: PartialUtf8CodePoint -> PartialUtf8CodePoint -> Bool #

Eq Utf8State 
Instance details

Defined in Data.Text.Internal.Encoding

Eq DecoderState 
Instance details

Defined in Data.Text.Internal.Encoding.Utf8

Eq Size 
Instance details

Defined in Data.Text.Internal.Fusion.Size

Methods

(==) :: Size -> Size -> Bool #

(/=) :: Size -> Size -> Bool #

Eq B 
Instance details

Defined in Data.Text.Short.Internal

Methods

(==) :: B -> B -> Bool #

(/=) :: B -> B -> Bool #

Eq ShortText 
Instance details

Defined in Data.Text.Short.Internal

Eq ConstructorInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Eq ConstructorVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Eq DatatypeInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Eq DatatypeVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Eq FieldStrictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Eq Strictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Eq Unpackedness 
Instance details

Defined in Language.Haskell.TH.Datatype

Eq CalendarDiffDays 
Instance details

Defined in Data.Time.Calendar.CalendarDiffDays

Eq Day 
Instance details

Defined in Data.Time.Calendar.Days

Methods

(==) :: Day -> Day -> Bool #

(/=) :: Day -> Day -> Bool #

Eq Month 
Instance details

Defined in Data.Time.Calendar.Month

Methods

(==) :: Month -> Month -> Bool #

(/=) :: Month -> Month -> Bool #

Eq Quarter 
Instance details

Defined in Data.Time.Calendar.Quarter

Methods

(==) :: Quarter -> Quarter -> Bool #

(/=) :: Quarter -> Quarter -> Bool #

Eq QuarterOfYear 
Instance details

Defined in Data.Time.Calendar.Quarter

Eq DayOfWeek 
Instance details

Defined in Data.Time.Calendar.Week

Eq FirstWeekType 
Instance details

Defined in Data.Time.Calendar.WeekDate

Eq DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Eq NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Eq SystemTime 
Instance details

Defined in Data.Time.Clock.Internal.SystemTime

Eq UTCTime 
Instance details

Defined in Data.Time.Clock.Internal.UTCTime

Methods

(==) :: UTCTime -> UTCTime -> Bool #

(/=) :: UTCTime -> UTCTime -> Bool #

Eq UniversalTime 
Instance details

Defined in Data.Time.Clock.Internal.UniversalTime

Eq TimeLocale 
Instance details

Defined in Data.Time.Format.Locale

Eq CalendarDiffTime 
Instance details

Defined in Data.Time.LocalTime.Internal.CalendarDiffTime

Eq LocalTime 
Instance details

Defined in Data.Time.LocalTime.Internal.LocalTime

Eq TimeOfDay 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeOfDay

Eq TimeZone 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeZone

Eq UnixDiffTime 
Instance details

Defined in Data.UnixTime.Types

Eq UnixTime 
Instance details

Defined in Data.UnixTime.Types

Eq ConcException 
Instance details

Defined in UnliftIO.Internals.Async

Eq Authority 
Instance details

Defined in URI.ByteString.Types

Eq Host 
Instance details

Defined in URI.ByteString.Types

Methods

(==) :: Host -> Host -> Bool #

(/=) :: Host -> Host -> Bool #

Eq Port 
Instance details

Defined in URI.ByteString.Types

Methods

(==) :: Port -> Port -> Bool #

(/=) :: Port -> Port -> Bool #

Eq Query 
Instance details

Defined in URI.ByteString.Types

Methods

(==) :: Query -> Query -> Bool #

(/=) :: Query -> Query -> Bool #

Eq SchemaError 
Instance details

Defined in URI.ByteString.Types

Eq Scheme 
Instance details

Defined in URI.ByteString.Types

Methods

(==) :: Scheme -> Scheme -> Bool #

(/=) :: Scheme -> Scheme -> Bool #

Eq URINormalizationOptions 
Instance details

Defined in URI.ByteString.Types

Eq URIParseError 
Instance details

Defined in URI.ByteString.Types

Eq UserInfo 
Instance details

Defined in URI.ByteString.Types

Eq UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

(==) :: UUID -> UUID -> Bool #

(/=) :: UUID -> UUID -> Bool #

Eq UnpackedUUID 
Instance details

Defined in Data.UUID.Types.Internal

Eq Content 
Instance details

Defined in Data.XML.Types

Methods

(==) :: Content -> Content -> Bool #

(/=) :: Content -> Content -> Bool #

Eq Doctype 
Instance details

Defined in Data.XML.Types

Methods

(==) :: Doctype -> Doctype -> Bool #

(/=) :: Doctype -> Doctype -> Bool #

Eq Document 
Instance details

Defined in Data.XML.Types

Eq Element 
Instance details

Defined in Data.XML.Types

Methods

(==) :: Element -> Element -> Bool #

(/=) :: Element -> Element -> Bool #

Eq Event 
Instance details

Defined in Data.XML.Types

Methods

(==) :: Event -> Event -> Bool #

(/=) :: Event -> Event -> Bool #

Eq ExternalID 
Instance details

Defined in Data.XML.Types

Eq Instruction 
Instance details

Defined in Data.XML.Types

Eq Miscellaneous 
Instance details

Defined in Data.XML.Types

Eq Name 
Instance details

Defined in Data.XML.Types

Methods

(==) :: Name -> Name -> Bool #

(/=) :: Name -> Name -> Bool #

Eq Node 
Instance details

Defined in Data.XML.Types

Methods

(==) :: Node -> Node -> Bool #

(/=) :: Node -> Node -> Bool #

Eq Prologue 
Instance details

Defined in Data.XML.Types

Eq CompressionLevel 
Instance details

Defined in Codec.Compression.Zlib.Stream

Eq CompressionStrategy 
Instance details

Defined in Codec.Compression.Zlib.Stream

Eq DictionaryHash 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

(==) :: DictionaryHash -> DictionaryHash -> Bool #

(/=) :: DictionaryHash -> DictionaryHash -> Bool #

Eq Format 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

(==) :: Format -> Format -> Bool #

(/=) :: Format -> Format -> Bool #

Eq MemoryLevel 
Instance details

Defined in Codec.Compression.Zlib.Stream

Eq Method 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

(==) :: Method -> Method -> Bool #

(/=) :: Method -> Method -> Bool #

Eq WindowBits 
Instance details

Defined in Codec.Compression.Zlib.Stream

Eq Integer 
Instance details

Defined in GHC.Num.Integer

Methods

(==) :: Integer -> Integer -> Bool #

(/=) :: Integer -> Integer -> Bool #

Eq Natural 
Instance details

Defined in GHC.Num.Natural

Methods

(==) :: Natural -> Natural -> Bool #

(/=) :: Natural -> Natural -> Bool #

Eq () 
Instance details

Defined in GHC.Classes

Methods

(==) :: () -> () -> Bool #

(/=) :: () -> () -> Bool #

Eq Bool 
Instance details

Defined in GHC.Classes

Methods

(==) :: Bool -> Bool -> Bool #

(/=) :: Bool -> Bool -> Bool #

Eq Char 
Instance details

Defined in GHC.Classes

Methods

(==) :: Char -> Char -> Bool #

(/=) :: Char -> Char -> Bool #

Eq Double

Note that due to the presence of NaN, Double's Eq instance does not satisfy reflexivity.

>>> 0/0 == (0/0 :: Double)
False

Also note that Double's Eq instance does not satisfy substitutivity:

>>> 0 == (-0 :: Double)
True
>>> recip 0 == recip (-0 :: Double)
False
Instance details

Defined in GHC.Classes

Methods

(==) :: Double -> Double -> Bool #

(/=) :: Double -> Double -> Bool #

Eq Float

Note that due to the presence of NaN, Float's Eq instance does not satisfy reflexivity.

>>> 0/0 == (0/0 :: Float)
False

Also note that Float's Eq instance does not satisfy extensionality:

>>> 0 == (-0 :: Float)
True
>>> recip 0 == recip (-0 :: Float)
False
Instance details

Defined in GHC.Classes

Methods

(==) :: Float -> Float -> Bool #

(/=) :: Float -> Float -> Bool #

Eq Int 
Instance details

Defined in GHC.Classes

Methods

(==) :: Int -> Int -> Bool #

(/=) :: Int -> Int -> Bool #

Eq Word 
Instance details

Defined in GHC.Classes

Methods

(==) :: Word -> Word -> Bool #

(/=) :: Word -> Word -> Bool #

Eq a => Eq (Only a) 
Instance details

Defined in Data.Tuple.Only

Methods

(==) :: Only a -> Only a -> Bool #

(/=) :: Only a -> Only a -> Bool #

Eq (Encoding' a) 
Instance details

Defined in Data.Aeson.Encoding.Internal

Methods

(==) :: Encoding' a -> Encoding' a -> Bool #

(/=) :: Encoding' a -> Encoding' a -> Bool #

Eq v => Eq (KeyMap v) 
Instance details

Defined in Data.Aeson.KeyMap

Methods

(==) :: KeyMap v -> KeyMap v -> Bool #

(/=) :: KeyMap v -> KeyMap v -> Bool #

Eq a => Eq (IResult a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

(==) :: IResult a -> IResult a -> Bool #

(/=) :: IResult a -> IResult a -> Bool #

Eq a => Eq (Result a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

(==) :: Result a -> Result a -> Bool #

(/=) :: Result a -> Result a -> Bool #

Eq a => Eq (WithJSONWarnings a) 
Instance details

Defined in Data.Aeson.WarningParser

Eq (Chan a)

Since: base-4.4.0.0

Instance details

Defined in Control.Concurrent.Chan

Methods

(==) :: Chan a -> Chan a -> Bool #

(/=) :: Chan a -> Chan a -> Bool #

Eq (MutableByteArray s)

Since: base-4.17.0.0

Instance details

Defined in Data.Array.Byte

Eq a => Eq (Complex a)

Since: base-2.1

Instance details

Defined in Data.Complex

Methods

(==) :: Complex a -> Complex a -> Bool #

(/=) :: Complex a -> Complex a -> Bool #

Eq a => Eq (First a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(==) :: First a -> First a -> Bool #

(/=) :: First a -> First a -> Bool #

Eq a => Eq (Last a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(==) :: Last a -> Last a -> Bool #

(/=) :: Last a -> Last a -> Bool #

Eq a => Eq (Max a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(==) :: Max a -> Max a -> Bool #

(/=) :: Max a -> Max a -> Bool #

Eq a => Eq (Min a)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(==) :: Min a -> Min a -> Bool #

(/=) :: Min a -> Min a -> Bool #

Eq m => Eq (WrappedMonoid m)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Eq (Bits n) 
Instance details

Defined in Basement.Bits

Methods

(==) :: Bits n -> Bits n -> Bool #

(/=) :: Bits n -> Bits n -> Bool #

(PrimType ty, Eq ty) => Eq (Block ty) 
Instance details

Defined in Basement.Block.Base

Methods

(==) :: Block ty -> Block ty -> Bool #

(/=) :: Block ty -> Block ty -> Bool #

Eq (Zn n) 
Instance details

Defined in Basement.Bounded

Methods

(==) :: Zn n -> Zn n -> Bool #

(/=) :: Zn n -> Zn n -> Bool #

Eq (Zn64 n) 
Instance details

Defined in Basement.Bounded

Methods

(==) :: Zn64 n -> Zn64 n -> Bool #

(/=) :: Zn64 n -> Zn64 n -> Bool #

Eq a => Eq (NonEmpty a) 
Instance details

Defined in Basement.NonEmpty

Methods

(==) :: NonEmpty a -> NonEmpty a -> Bool #

(/=) :: NonEmpty a -> NonEmpty a -> Bool #

Eq (CountOf ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

(==) :: CountOf ty -> CountOf ty -> Bool #

(/=) :: CountOf ty -> CountOf ty -> Bool #

Eq (Offset ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

(==) :: Offset ty -> Offset ty -> Bool #

(/=) :: Offset ty -> Offset ty -> Bool #

(PrimType ty, Eq ty) => Eq (UArray ty) 
Instance details

Defined in Basement.UArray.Base

Methods

(==) :: UArray ty -> UArray ty -> Bool #

(/=) :: UArray ty -> UArray ty -> Bool #

Eq a => Eq (Flush a) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

(==) :: Flush a -> Flush a -> Bool #

(/=) :: Flush a -> Flush a -> Bool #

Eq vertex => Eq (SCC vertex)

Since: containers-0.5.9

Instance details

Defined in Data.Graph

Methods

(==) :: SCC vertex -> SCC vertex -> Bool #

(/=) :: SCC vertex -> SCC vertex -> Bool #

Eq a => Eq (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

(==) :: IntMap a -> IntMap a -> Bool #

(/=) :: IntMap a -> IntMap a -> Bool #

Eq a => Eq (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

(==) :: Seq a -> Seq a -> Bool #

(/=) :: Seq a -> Seq a -> Bool #

Eq a => Eq (ViewL a) 
Instance details

Defined in Data.Sequence.Internal

Methods

(==) :: ViewL a -> ViewL a -> Bool #

(/=) :: ViewL a -> ViewL a -> Bool #

Eq a => Eq (ViewR a) 
Instance details

Defined in Data.Sequence.Internal

Methods

(==) :: ViewR a -> ViewR a -> Bool #

(/=) :: ViewR a -> ViewR a -> Bool #

Eq a => Eq (Intersection a) 
Instance details

Defined in Data.Set.Internal

Eq a => Eq (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

(==) :: Set a -> Set a -> Bool #

(/=) :: Set a -> Set a -> Bool #

Eq a => Eq (Tree a) 
Instance details

Defined in Data.Tree

Methods

(==) :: Tree a -> Tree a -> Bool #

(/=) :: Tree a -> Tree a -> Bool #

Eq a => Eq (CryptoFailable a) 
Instance details

Defined in Crypto.Error.Types

Eq (Digest a) 
Instance details

Defined in Crypto.Hash.Types

Methods

(==) :: Digest a -> Digest a -> Bool #

(/=) :: Digest a -> Digest a -> Bool #

Eq a => Eq (CryptoFailable a) 
Instance details

Defined in Crypto.Error.Types

Eq (Digest a) 
Instance details

Defined in Crypto.Hash.Types

Methods

(==) :: Digest a -> Digest a -> Bool #

(/=) :: Digest a -> Digest a -> Bool #

Eq1 f => Eq (Fix f) 
Instance details

Defined in Data.Fix

Methods

(==) :: Fix f -> Fix f -> Bool #

(/=) :: Fix f -> Fix f -> Bool #

(Functor f, Eq1 f) => Eq (Mu f) 
Instance details

Defined in Data.Fix

Methods

(==) :: Mu f -> Mu f -> Bool #

(/=) :: Mu f -> Mu f -> Bool #

(Functor f, Eq1 f) => Eq (Nu f) 
Instance details

Defined in Data.Fix

Methods

(==) :: Nu f -> Nu f -> Bool #

(/=) :: Nu f -> Nu f -> Bool #

Eq a => Eq (DNonEmpty a) 
Instance details

Defined in Data.DList.DNonEmpty.Internal

Methods

(==) :: DNonEmpty a -> DNonEmpty a -> Bool #

(/=) :: DNonEmpty a -> DNonEmpty a -> Bool #

Eq a => Eq (DList a) 
Instance details

Defined in Data.DList.Internal

Methods

(==) :: DList a -> DList a -> Bool #

(/=) :: DList a -> DList a -> Bool #

Eq v => Eq (LabelMap v) 
Instance details

Defined in GHC.Cmm.Dataflow.Label

Methods

(==) :: LabelMap v -> LabelMap v -> Bool #

(/=) :: LabelMap v -> LabelMap v -> Bool #

Eq (CoAxiom br) 
Instance details

Defined in GHC.Core.Coercion.Axiom

Methods

(==) :: CoAxiom br -> CoAxiom br -> Bool #

(/=) :: CoAxiom br -> CoAxiom br -> Bool #

Eq (DeBruijn Coercion) 
Instance details

Defined in GHC.Core.Map.Type

Eq (DeBruijn Type) 
Instance details

Defined in GHC.Core.Map.Type

Eq (DeBruijn Var) 
Instance details

Defined in GHC.Core.Map.Type

Eq (DeBruijn a) => Eq (DeBruijn (Maybe a)) 
Instance details

Defined in GHC.Core.Map.Type

Methods

(==) :: DeBruijn (Maybe a) -> DeBruijn (Maybe a) -> Bool #

(/=) :: DeBruijn (Maybe a) -> DeBruijn (Maybe a) -> Bool #

Eq (DeBruijn a) => Eq (DeBruijn [a]) 
Instance details

Defined in GHC.Core.Map.Type

Methods

(==) :: DeBruijn [a] -> DeBruijn [a] -> Bool #

(/=) :: DeBruijn [a] -> DeBruijn [a] -> Bool #

Eq a => Eq (FromListCounting a) 
Instance details

Defined in GHC.Data.Graph.Inductive.PatriciaTree

Methods

(==) :: FromListCounting a -> FromListCounting a -> Bool #

(/=) :: FromListCounting a -> FromListCounting a -> Bool #

Eq a => Eq (Word64Map a) 
Instance details

Defined in GHC.Data.Word64Map.Internal

Methods

(==) :: Word64Map a -> Word64Map a -> Bool #

(/=) :: Word64Map a -> Word64Map a -> Bool #

Eq a => Eq (OnOff a) 
Instance details

Defined in GHC.Driver.DynFlags

Methods

(==) :: OnOff a -> OnOff a -> Bool #

(/=) :: OnOff a -> OnOff a -> Bool #

Eq tag => Eq (AnnSortKey tag) 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: AnnSortKey tag -> AnnSortKey tag -> Bool #

(/=) :: AnnSortKey tag -> AnnSortKey tag -> Bool #

Eq ann => Eq (EpAnn ann) 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: EpAnn ann -> EpAnn ann -> Bool #

(/=) :: EpAnn ann -> EpAnn ann -> Bool #

Eq (EpToken tok) 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: EpToken tok -> EpToken tok -> Bool #

(/=) :: EpToken tok -> EpToken tok -> Bool #

Eq tc => Eq (TyConFlavour tc) 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: TyConFlavour tc -> TyConFlavour tc -> Bool #

(/=) :: TyConFlavour tc -> TyConFlavour tc -> Bool #

Eq a => Eq (EpaLocation' a) 
Instance details

Defined in GHC.Types.SrcLoc

Eq (GenTickish 'TickishPassCmm) 
Instance details

Defined in GHC.Types.Tickish

Methods

(==) :: GenTickish 'TickishPassCmm -> GenTickish 'TickishPassCmm -> Bool #

(/=) :: GenTickish 'TickishPassCmm -> GenTickish 'TickishPassCmm -> Bool #

Eq (GenTickish 'TickishPassCore) 
Instance details

Defined in GHC.Types.Tickish

Methods

(==) :: GenTickish 'TickishPassCore -> GenTickish 'TickishPassCore -> Bool #

(/=) :: GenTickish 'TickishPassCore -> GenTickish 'TickishPassCore -> Bool #

Eq (IdP pass) => Eq (WarningTxt pass) 
Instance details

Defined in GHC.Unit.Module.Warnings

Methods

(==) :: WarningTxt pass -> WarningTxt pass -> Bool #

(/=) :: WarningTxt pass -> WarningTxt pass -> Bool #

Eq (IdP pass) => Eq (Warnings pass) 
Instance details

Defined in GHC.Unit.Module.Warnings

Methods

(==) :: Warnings pass -> Warnings pass -> Bool #

(/=) :: Warnings pass -> Warnings pass -> Bool #

Eq unit => Eq (Definite unit) 
Instance details

Defined in GHC.Unit.Types

Methods

(==) :: Definite unit -> Definite unit -> Bool #

(/=) :: Definite unit -> Definite unit -> Bool #

Eq (GenInstantiatedUnit unit) 
Instance details

Defined in GHC.Unit.Types

Eq unit => Eq (GenModule unit) 
Instance details

Defined in GHC.Unit.Types

Methods

(==) :: GenModule unit -> GenModule unit -> Bool #

(/=) :: GenModule unit -> GenModule unit -> Bool #

IsUnitId u => Eq (GenUnit u) 
Instance details

Defined in GHC.Unit.Types

Methods

(==) :: GenUnit u -> GenUnit u -> Bool #

(/=) :: GenUnit u -> GenUnit u -> Bool #

Eq mod => Eq (GenWithIsBoot mod) 
Instance details

Defined in GHC.Unit.Types

Methods

(==) :: GenWithIsBoot mod -> GenWithIsBoot mod -> Bool #

(/=) :: GenWithIsBoot mod -> GenWithIsBoot mod -> Bool #

Eq a => Eq (DataDefnCons a) 
Instance details

Defined in Language.Haskell.Syntax.Decls

Eq (HsLit x) 
Instance details

Defined in Language.Haskell.Syntax.Lit

Methods

(==) :: HsLit x -> HsLit x -> Bool #

(/=) :: HsLit x -> HsLit x -> Bool #

Eq (XXOverLit p) => Eq (HsOverLit p) 
Instance details

Defined in Language.Haskell.Syntax.Lit

Methods

(==) :: HsOverLit p -> HsOverLit p -> Bool #

(/=) :: HsOverLit p -> HsOverLit p -> Bool #

(Eq (XRec pass RdrName), Eq (XCFieldOcc pass), Eq (XXFieldOcc pass)) => Eq (FieldOcc pass) 
Instance details

Defined in Language.Haskell.Syntax.Type

Methods

(==) :: FieldOcc pass -> FieldOcc pass -> Bool #

(/=) :: FieldOcc pass -> FieldOcc pass -> Bool #

Eq a => Eq (NonEmpty a)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Base

Methods

(==) :: NonEmpty a -> NonEmpty a -> Bool #

(/=) :: NonEmpty a -> NonEmpty a -> Bool #

Eq (TVar a)

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Conc.Sync

Methods

(==) :: TVar a -> TVar a -> Bool #

(/=) :: TVar a -> TVar a -> Bool #

Eq a => Eq (Identity a)

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Identity

Methods

(==) :: Identity a -> Identity a -> Bool #

(/=) :: Identity a -> Identity a -> Bool #

Eq a => Eq (First a)

@since base-2.01

Instance details

Defined in GHC.Internal.Data.Monoid

Methods

(==) :: First a -> First a -> Bool #

(/=) :: First a -> First a -> Bool #

Eq a => Eq (Last a)

@since base-2.01

Instance details

Defined in GHC.Internal.Data.Monoid

Methods

(==) :: Last a -> Last a -> Bool #

(/=) :: Last a -> Last a -> Bool #

Eq a => Eq (Down a)

@since base-4.6.0.0

Instance details

Defined in GHC.Internal.Data.Ord

Methods

(==) :: Down a -> Down a -> Bool #

(/=) :: Down a -> Down a -> Bool #

Eq a => Eq (Dual a)

@since base-2.01

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

(==) :: Dual a -> Dual a -> Bool #

(/=) :: Dual a -> Dual a -> Bool #

Eq a => Eq (Product a)

@since base-2.01

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

(==) :: Product a -> Product a -> Bool #

(/=) :: Product a -> Product a -> Bool #

Eq a => Eq (Sum a)

@since base-2.01

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

(==) :: Sum a -> Sum a -> Bool #

(/=) :: Sum a -> Sum a -> Bool #

Eq (ForeignPtr a)

@since base-2.01

Instance details

Defined in GHC.Internal.ForeignPtr

Methods

(==) :: ForeignPtr a -> ForeignPtr a -> Bool #

(/=) :: ForeignPtr a -> ForeignPtr a -> Bool #

Eq a => Eq (ZipList a)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Functor.ZipList

Methods

(==) :: ZipList a -> ZipList a -> Bool #

(/=) :: ZipList a -> ZipList a -> Bool #

Eq p => Eq (Par1 p)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

(==) :: Par1 p -> Par1 p -> Bool #

(/=) :: Par1 p -> Par1 p -> Bool #

Eq (IORef a)

Pointer equality.

@since base-4.0.0.0

Instance details

Defined in GHC.Internal.IORef

Methods

(==) :: IORef a -> IORef a -> Bool #

(/=) :: IORef a -> IORef a -> Bool #

Eq (MVar a)

Compares the underlying pointers.

@since base-4.1.0.0

Instance details

Defined in GHC.Internal.MVar

Methods

(==) :: MVar a -> MVar a -> Bool #

(/=) :: MVar a -> MVar a -> Bool #

Eq (FunPtr a) 
Instance details

Defined in GHC.Internal.Ptr

Methods

(==) :: FunPtr a -> FunPtr a -> Bool #

(/=) :: FunPtr a -> FunPtr a -> Bool #

Eq (Ptr a)

@since base-2.01

Instance details

Defined in GHC.Internal.Ptr

Methods

(==) :: Ptr a -> Ptr a -> Bool #

(/=) :: Ptr a -> Ptr a -> Bool #

Eq a => Eq (Ratio a)

@since base-2.01

Instance details

Defined in GHC.Internal.Real

Methods

(==) :: Ratio a -> Ratio a -> Bool #

(/=) :: Ratio a -> Ratio a -> Bool #

Eq (SNat n)

@since base-4.19.0.0

Instance details

Defined in GHC.Internal.TypeNats

Methods

(==) :: SNat n -> SNat n -> Bool #

(/=) :: SNat n -> SNat n -> Bool #

Eq (OAuthCode s) 
Instance details

Defined in Gogol.Internal.Auth

Methods

(==) :: OAuthCode s -> OAuthCode s -> Bool #

(/=) :: OAuthCode s -> OAuthCode s -> Bool #

Eq (OAuthToken s) 
Instance details

Defined in Gogol.Internal.Auth

Methods

(==) :: OAuthToken s -> OAuthToken s -> Bool #

(/=) :: OAuthToken s -> OAuthToken s -> Bool #

Eq a => Eq (Hashed a)

Uses precomputed hash to detect inequality faster

Instance details

Defined in Data.Hashable.Class

Methods

(==) :: Hashed a -> Hashed a -> Bool #

(/=) :: Hashed a -> Hashed a -> Bool #

Eq a => Eq (ListOf a) 
Instance details

Defined in Language.Haskell.Exts.Parser

Methods

(==) :: ListOf a -> ListOf a -> Bool #

(/=) :: ListOf a -> ListOf a -> Bool #

Eq l => Eq (ModuleHeadAndImports l) 
Instance details

Defined in Language.Haskell.Exts.Parser

Eq a => Eq (NonGreedy a) 
Instance details

Defined in Language.Haskell.Exts.Parser

Methods

(==) :: NonGreedy a -> NonGreedy a -> Bool #

(/=) :: NonGreedy a -> NonGreedy a -> Bool #

Eq l => Eq (PragmasAndModuleHead l) 
Instance details

Defined in Language.Haskell.Exts.Parser

Eq l => Eq (PragmasAndModuleName l) 
Instance details

Defined in Language.Haskell.Exts.Parser

Eq a => Eq (Loc a) 
Instance details

Defined in Language.Haskell.Exts.SrcLoc

Methods

(==) :: Loc a -> Loc a -> Bool #

(/=) :: Loc a -> Loc a -> Bool #

Eq l => Eq (Activation l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Activation l -> Activation l -> Bool #

(/=) :: Activation l -> Activation l -> Bool #

Eq l => Eq (Alt l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Alt l -> Alt l -> Bool #

(/=) :: Alt l -> Alt l -> Bool #

Eq l => Eq (Annotation l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Annotation l -> Annotation l -> Bool #

(/=) :: Annotation l -> Annotation l -> Bool #

Eq l => Eq (Assoc l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Assoc l -> Assoc l -> Bool #

(/=) :: Assoc l -> Assoc l -> Bool #

Eq l => Eq (Asst l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Asst l -> Asst l -> Bool #

(/=) :: Asst l -> Asst l -> Bool #

Eq l => Eq (BangType l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: BangType l -> BangType l -> Bool #

(/=) :: BangType l -> BangType l -> Bool #

Eq l => Eq (Binds l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Binds l -> Binds l -> Bool #

(/=) :: Binds l -> Binds l -> Bool #

Eq l => Eq (BooleanFormula l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Eq l => Eq (Bracket l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Bracket l -> Bracket l -> Bool #

(/=) :: Bracket l -> Bracket l -> Bool #

Eq l => Eq (CName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: CName l -> CName l -> Bool #

(/=) :: CName l -> CName l -> Bool #

Eq l => Eq (CallConv l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: CallConv l -> CallConv l -> Bool #

(/=) :: CallConv l -> CallConv l -> Bool #

Eq l => Eq (ClassDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: ClassDecl l -> ClassDecl l -> Bool #

(/=) :: ClassDecl l -> ClassDecl l -> Bool #

Eq l => Eq (ConDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: ConDecl l -> ConDecl l -> Bool #

(/=) :: ConDecl l -> ConDecl l -> Bool #

Eq l => Eq (Context l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Context l -> Context l -> Bool #

(/=) :: Context l -> Context l -> Bool #

Eq l => Eq (DataOrNew l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: DataOrNew l -> DataOrNew l -> Bool #

(/=) :: DataOrNew l -> DataOrNew l -> Bool #

Eq l => Eq (Decl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Decl l -> Decl l -> Bool #

(/=) :: Decl l -> Decl l -> Bool #

Eq l => Eq (DeclHead l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: DeclHead l -> DeclHead l -> Bool #

(/=) :: DeclHead l -> DeclHead l -> Bool #

Eq l => Eq (DerivStrategy l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Eq l => Eq (Deriving l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Deriving l -> Deriving l -> Bool #

(/=) :: Deriving l -> Deriving l -> Bool #

Eq l => Eq (EWildcard l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: EWildcard l -> EWildcard l -> Bool #

(/=) :: EWildcard l -> EWildcard l -> Bool #

Eq l => Eq (Exp l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Exp l -> Exp l -> Bool #

(/=) :: Exp l -> Exp l -> Bool #

Eq l => Eq (ExportSpec l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: ExportSpec l -> ExportSpec l -> Bool #

(/=) :: ExportSpec l -> ExportSpec l -> Bool #

Eq l => Eq (ExportSpecList l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Eq l => Eq (FieldDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: FieldDecl l -> FieldDecl l -> Bool #

(/=) :: FieldDecl l -> FieldDecl l -> Bool #

Eq l => Eq (FieldUpdate l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Eq l => Eq (FunDep l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: FunDep l -> FunDep l -> Bool #

(/=) :: FunDep l -> FunDep l -> Bool #

Eq l => Eq (GadtDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: GadtDecl l -> GadtDecl l -> Bool #

(/=) :: GadtDecl l -> GadtDecl l -> Bool #

Eq l => Eq (GuardedRhs l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: GuardedRhs l -> GuardedRhs l -> Bool #

(/=) :: GuardedRhs l -> GuardedRhs l -> Bool #

Eq l => Eq (IPBind l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: IPBind l -> IPBind l -> Bool #

(/=) :: IPBind l -> IPBind l -> Bool #

Eq l => Eq (IPName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: IPName l -> IPName l -> Bool #

(/=) :: IPName l -> IPName l -> Bool #

Eq l => Eq (ImportDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: ImportDecl l -> ImportDecl l -> Bool #

(/=) :: ImportDecl l -> ImportDecl l -> Bool #

Eq l => Eq (ImportSpec l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: ImportSpec l -> ImportSpec l -> Bool #

(/=) :: ImportSpec l -> ImportSpec l -> Bool #

Eq l => Eq (ImportSpecList l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Eq l => Eq (InjectivityInfo l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Eq l => Eq (InstDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: InstDecl l -> InstDecl l -> Bool #

(/=) :: InstDecl l -> InstDecl l -> Bool #

Eq l => Eq (InstHead l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: InstHead l -> InstHead l -> Bool #

(/=) :: InstHead l -> InstHead l -> Bool #

Eq l => Eq (InstRule l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: InstRule l -> InstRule l -> Bool #

(/=) :: InstRule l -> InstRule l -> Bool #

Eq l => Eq (Literal l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Literal l -> Literal l -> Bool #

(/=) :: Literal l -> Literal l -> Bool #

Eq l => Eq (Match l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Match l -> Match l -> Bool #

(/=) :: Match l -> Match l -> Bool #

Eq l => Eq (MaybePromotedName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Eq l => Eq (Module l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Module l -> Module l -> Bool #

(/=) :: Module l -> Module l -> Bool #

Eq l => Eq (ModuleHead l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: ModuleHead l -> ModuleHead l -> Bool #

(/=) :: ModuleHead l -> ModuleHead l -> Bool #

Eq l => Eq (ModuleName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: ModuleName l -> ModuleName l -> Bool #

(/=) :: ModuleName l -> ModuleName l -> Bool #

Eq l => Eq (ModulePragma l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Eq l => Eq (Name l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Name l -> Name l -> Bool #

(/=) :: Name l -> Name l -> Bool #

Eq l => Eq (Namespace l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Namespace l -> Namespace l -> Bool #

(/=) :: Namespace l -> Namespace l -> Bool #

Eq l => Eq (Op l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Op l -> Op l -> Bool #

(/=) :: Op l -> Op l -> Bool #

Eq l => Eq (Overlap l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Overlap l -> Overlap l -> Bool #

(/=) :: Overlap l -> Overlap l -> Bool #

Eq l => Eq (PXAttr l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: PXAttr l -> PXAttr l -> Bool #

(/=) :: PXAttr l -> PXAttr l -> Bool #

Eq l => Eq (Pat l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Pat l -> Pat l -> Bool #

(/=) :: Pat l -> Pat l -> Bool #

Eq l => Eq (PatField l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: PatField l -> PatField l -> Bool #

(/=) :: PatField l -> PatField l -> Bool #

Eq l => Eq (PatternSynDirection l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Eq l => Eq (Promoted l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Promoted l -> Promoted l -> Bool #

(/=) :: Promoted l -> Promoted l -> Bool #

Eq l => Eq (QName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: QName l -> QName l -> Bool #

(/=) :: QName l -> QName l -> Bool #

Eq l => Eq (QOp l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: QOp l -> QOp l -> Bool #

(/=) :: QOp l -> QOp l -> Bool #

Eq l => Eq (QualConDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Eq l => Eq (QualStmt l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: QualStmt l -> QualStmt l -> Bool #

(/=) :: QualStmt l -> QualStmt l -> Bool #

Eq l => Eq (RPat l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: RPat l -> RPat l -> Bool #

(/=) :: RPat l -> RPat l -> Bool #

Eq l => Eq (RPatOp l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: RPatOp l -> RPatOp l -> Bool #

(/=) :: RPatOp l -> RPatOp l -> Bool #

Eq l => Eq (ResultSig l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: ResultSig l -> ResultSig l -> Bool #

(/=) :: ResultSig l -> ResultSig l -> Bool #

Eq l => Eq (Rhs l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Rhs l -> Rhs l -> Bool #

(/=) :: Rhs l -> Rhs l -> Bool #

Eq l => Eq (Role l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Role l -> Role l -> Bool #

(/=) :: Role l -> Role l -> Bool #

Eq l => Eq (Rule l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Rule l -> Rule l -> Bool #

(/=) :: Rule l -> Rule l -> Bool #

Eq l => Eq (RuleVar l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: RuleVar l -> RuleVar l -> Bool #

(/=) :: RuleVar l -> RuleVar l -> Bool #

Eq l => Eq (Safety l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Safety l -> Safety l -> Bool #

(/=) :: Safety l -> Safety l -> Bool #

Eq l => Eq (Sign l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Sign l -> Sign l -> Bool #

(/=) :: Sign l -> Sign l -> Bool #

Eq l => Eq (SpecialCon l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: SpecialCon l -> SpecialCon l -> Bool #

(/=) :: SpecialCon l -> SpecialCon l -> Bool #

Eq l => Eq (Splice l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Splice l -> Splice l -> Bool #

(/=) :: Splice l -> Splice l -> Bool #

Eq l => Eq (Stmt l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Stmt l -> Stmt l -> Bool #

(/=) :: Stmt l -> Stmt l -> Bool #

Eq l => Eq (TyVarBind l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: TyVarBind l -> TyVarBind l -> Bool #

(/=) :: TyVarBind l -> TyVarBind l -> Bool #

Eq l => Eq (Type l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Type l -> Type l -> Bool #

(/=) :: Type l -> Type l -> Bool #

Eq l => Eq (TypeEqn l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: TypeEqn l -> TypeEqn l -> Bool #

(/=) :: TypeEqn l -> TypeEqn l -> Bool #

Eq l => Eq (Unpackedness l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Eq l => Eq (WarningText l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Eq l => Eq (XAttr l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: XAttr l -> XAttr l -> Bool #

(/=) :: XAttr l -> XAttr l -> Bool #

Eq l => Eq (XName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: XName l -> XName l -> Bool #

(/=) :: XName l -> XName l -> Bool #

Eq a => Eq (AddrRange a) 
Instance details

Defined in Data.IP.Range

Methods

(==) :: AddrRange a -> AddrRange a -> Bool #

(/=) :: AddrRange a -> AddrRange a -> Bool #

Eq a => Eq (Item a) 
Instance details

Defined in Katip.Core

Methods

(==) :: Item a -> Item a -> Bool #

(/=) :: Item a -> Item a -> Bool #

Eq a => Eq (Deque a) 
Instance details

Defined in Control.Lens.Internal.Deque

Methods

(==) :: Deque a -> Deque a -> Bool #

(/=) :: Deque a -> Deque a -> Bool #

Eq e => Eq (ErrorFancy e) 
Instance details

Defined in Text.Megaparsec.Error

Methods

(==) :: ErrorFancy e -> ErrorFancy e -> Bool #

(/=) :: ErrorFancy e -> ErrorFancy e -> Bool #

Eq t => Eq (ErrorItem t) 
Instance details

Defined in Text.Megaparsec.Error

Methods

(==) :: ErrorItem t -> ErrorItem t -> Bool #

(/=) :: ErrorItem t -> ErrorItem t -> Bool #

Eq s => Eq (PosState s) 
Instance details

Defined in Text.Megaparsec.State

Methods

(==) :: PosState s -> PosState s -> Bool #

(/=) :: PosState s -> PosState s -> Bool #

Eq mono => Eq (NonNull mono) 
Instance details

Defined in Data.NonNull

Methods

(==) :: NonNull mono -> NonNull mono -> Bool #

(/=) :: NonNull mono -> NonNull mono -> Bool #

Eq a => Eq (WithinSet a) # 
Instance details

Defined in Napkin.Run.Effects.Hooks.Types

Methods

(==) :: WithinSet a -> WithinSet a -> Bool #

(/=) :: WithinSet a -> WithinSet a -> Bool #

Eq a => Eq (ColumnPolicy a) # 
Instance details

Defined in Napkin.Run.Effects.Programs

Eq (BackendTableMeta b) => Eq (CreateTableAs b) # 
Instance details

Defined in Napkin.Spec.Types.CreateTableAs

Eq a => Eq (Named a) 
Instance details

Defined in Napkin.Run.PGCommon

Methods

(==) :: Named a -> Named a -> Bool #

(/=) :: Named a -> Named a -> Bool #

Eq a => Eq (BoolOrOpts a) 
Instance details

Defined in Napkin.Types.Postgres.Timescale

Methods

(==) :: BoolOrOpts a -> BoolOrOpts a -> Bool #

(/=) :: BoolOrOpts a -> BoolOrOpts a -> Bool #

Eq a => Eq (ContinuousAggregatePolicy' a) 
Instance details

Defined in Napkin.Types.Postgres.Timescale

Eq a => Eq (Alias a) 
Instance details

Defined in Napkin.Types.Core

Methods

(==) :: Alias a -> Alias a -> Bool #

(/=) :: Alias a -> Alias a -> Bool #

Eq a => Eq (Selected a) 
Instance details

Defined in Napkin.Types.Core

Methods

(==) :: Selected a -> Selected a -> Bool #

(/=) :: Selected a -> Selected a -> Bool #

Eq a => Eq (WithSpecTable a) 
Instance details

Defined in Napkin.Types.Core

Eq a => Eq (ME a) 
Instance details

Defined in Napkin.Render.PrettyPrint

Methods

(==) :: ME a -> ME a -> Bool #

(/=) :: ME a -> ME a -> Bool #

Eq a => Eq (Transformed a) 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

Eq (BackendMaterializedViewMeta b) => Eq (YamlBackendMaterializedViewMeta b) 
Instance details

Defined in Napkin.Spec.Yaml.Types.BackendMeta

Eq (BackendTableMeta b) => Eq (YamlBackendTableMeta b) 
Instance details

Defined in Napkin.Spec.Yaml.Types.BackendMeta

Eq (BackendViewMeta b) => Eq (YamlBackendViewMeta b) 
Instance details

Defined in Napkin.Spec.Yaml.Types.BackendMeta

Eq a => Eq (Chunk a) 
Instance details

Defined in Options.Applicative.Help.Chunk

Methods

(==) :: Chunk a -> Chunk a -> Bool #

(/=) :: Chunk a -> Chunk a -> Bool #

Eq a => Eq (OSet a) 
Instance details

Defined in Data.Set.Ordered

Methods

(==) :: OSet a -> OSet a -> Bool #

(/=) :: OSet a -> OSet a -> Bool #

Eq a => Eq (AnnotDetails a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Eq (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

(==) :: Doc a -> Doc a -> Bool #

(/=) :: Doc a -> Doc a -> Bool #

Eq a => Eq (Span a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

(==) :: Span a -> Span a -> Bool #

(/=) :: Span a -> Span a -> Bool #

Eq a => Eq (CommaSeparated a) 
Instance details

Defined in Text.Pretty.Simple.Internal.Expr

Eq ann => Eq (SimpleDocStream ann) 
Instance details

Defined in Prettyprinter.Internal

Eq a => Eq (Array a) 
Instance details

Defined in Data.Primitive.Array

Methods

(==) :: Array a -> Array a -> Bool #

(/=) :: Array a -> Array a -> Bool #

(Eq a, Prim a) => Eq (PrimArray a)

Since: primitive-0.6.4.0

Instance details

Defined in Data.Primitive.PrimArray

Methods

(==) :: PrimArray a -> PrimArray a -> Bool #

(/=) :: PrimArray a -> PrimArray a -> Bool #

Eq a => Eq (SmallArray a) 
Instance details

Defined in Data.Primitive.SmallArray

Methods

(==) :: SmallArray a -> SmallArray a -> Bool #

(/=) :: SmallArray a -> SmallArray a -> Bool #

Eq g => Eq (StateGen g) 
Instance details

Defined in System.Random.Internal

Methods

(==) :: StateGen g -> StateGen g -> Bool #

(/=) :: StateGen g -> StateGen g -> Bool #

Eq g => Eq (AtomicGen g) 
Instance details

Defined in System.Random.Stateful

Methods

(==) :: AtomicGen g -> AtomicGen g -> Bool #

(/=) :: AtomicGen g -> AtomicGen g -> Bool #

Eq g => Eq (IOGen g) 
Instance details

Defined in System.Random.Stateful

Methods

(==) :: IOGen g -> IOGen g -> Bool #

(/=) :: IOGen g -> IOGen g -> Bool #

Eq g => Eq (STGen g) 
Instance details

Defined in System.Random.Stateful

Methods

(==) :: STGen g -> STGen g -> Bool #

(/=) :: STGen g -> STGen g -> Bool #

Eq g => Eq (TGen g) 
Instance details

Defined in System.Random.Stateful

Methods

(==) :: TGen g -> TGen g -> Bool #

(/=) :: TGen g -> TGen g -> Bool #

Eq a => Eq (Trie a) 
Instance details

Defined in Language.SQL.SimpleSQL.Dialect.Quote.Trie

Methods

(==) :: Trie a -> Trie a -> Bool #

(/=) :: Trie a -> Trie a -> Bool #

Eq a => Eq (I a) 
Instance details

Defined in Data.SOP.BasicFunctors

Methods

(==) :: I a -> I a -> Bool #

(/=) :: I a -> I a -> Bool #

Eq (TMVar a) 
Instance details

Defined in Control.Concurrent.STM.TMVar

Methods

(==) :: TMVar a -> TMVar a -> Bool #

(/=) :: TMVar a -> TMVar a -> Bool #

Eq a => Eq (Maybe a) 
Instance details

Defined in Data.Strict.Maybe

Methods

(==) :: Maybe a -> Maybe a -> Bool #

(/=) :: Maybe a -> Maybe a -> Bool #

Eq flag => Eq (TyVarBndr flag) 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: TyVarBndr flag -> TyVarBndr flag -> Bool #

(/=) :: TyVarBndr flag -> TyVarBndr flag -> Bool #

Eq a => Eq (Stream a) 
Instance details

Defined in Data.Text.Internal.Fusion.Types

Methods

(==) :: Stream a -> Stream a -> Bool #

(/=) :: Stream a -> Stream a -> Bool #

Eq a => Eq (HashSet a)

Note that, in the presence of hash collisions, equal HashSets may behave differently, i.e. extensionality may be violated:

>>> data D = A | B deriving (Eq, Show)
>>> instance Hashable D where hashWithSalt salt _d = salt
>>> x = fromList [A, B]
>>> y = fromList [B, A]
>>> x == y
True
>>> toList x
[A,B]
>>> toList y
[B,A]

In general, the lack of extensionality can be observed with any function that depends on the key ordering, such as folds and traversals.

Instance details

Defined in Data.HashSet.Internal

Methods

(==) :: HashSet a -> HashSet a -> Bool #

(/=) :: HashSet a -> HashSet a -> Bool #

Eq (URIRef a) 
Instance details

Defined in URI.ByteString.Types

Methods

(==) :: URIRef a -> URIRef a -> Bool #

(/=) :: URIRef a -> URIRef a -> Bool #

Eq a => Eq (Vector a) 
Instance details

Defined in Data.Vector

Methods

(==) :: Vector a -> Vector a -> Bool #

(/=) :: Vector a -> Vector a -> Bool #

(Prim a, Eq a) => Eq (Vector a) 
Instance details

Defined in Data.Vector.Primitive

Methods

(==) :: Vector a -> Vector a -> Bool #

(/=) :: Vector a -> Vector a -> Bool #

(Storable a, Eq a) => Eq (Vector a) 
Instance details

Defined in Data.Vector.Storable

Methods

(==) :: Vector a -> Vector a -> Bool #

(/=) :: Vector a -> Vector a -> Bool #

Eq a => Eq (Maybe a)

@since base-2.01

Instance details

Defined in GHC.Internal.Maybe

Methods

(==) :: Maybe a -> Maybe a -> Bool #

(/=) :: Maybe a -> Maybe a -> Bool #

Eq a => Eq (Solo a) 
Instance details

Defined in GHC.Classes

Methods

(==) :: Solo a -> Solo a -> Bool #

(/=) :: Solo a -> Solo a -> Bool #

Eq a => Eq [a] 
Instance details

Defined in GHC.Classes

Methods

(==) :: [a] -> [a] -> Bool #

(/=) :: [a] -> [a] -> Bool #

(Eq k, Eq e) => Eq (TkArray k e) 
Instance details

Defined in Data.Aeson.Decoding.Tokens

Methods

(==) :: TkArray k e -> TkArray k e -> Bool #

(/=) :: TkArray k e -> TkArray k e -> Bool #

(Eq k, Eq e) => Eq (TkRecord k e) 
Instance details

Defined in Data.Aeson.Decoding.Tokens

Methods

(==) :: TkRecord k e -> TkRecord k e -> Bool #

(/=) :: TkRecord k e -> TkRecord k e -> Bool #

(Eq k, Eq e) => Eq (Tokens k e) 
Instance details

Defined in Data.Aeson.Decoding.Tokens

Methods

(==) :: Tokens k e -> Tokens k e -> Bool #

(/=) :: Tokens k e -> Tokens k e -> Bool #

(Ix ix, Eq e, IArray UArray e) => Eq (UArray ix e) 
Instance details

Defined in Data.Array.Base

Methods

(==) :: UArray ix e -> UArray ix e -> Bool #

(/=) :: UArray ix e -> UArray ix e -> Bool #

Eq (Fixed a)

Since: base-2.1

Instance details

Defined in Data.Fixed

Methods

(==) :: Fixed a -> Fixed a -> Bool #

(/=) :: Fixed a -> Fixed a -> Bool #

Eq a => Eq (Arg a b)

Since: base-4.9.0.0

Instance details

Defined in Data.Semigroup

Methods

(==) :: Arg a b -> Arg a b -> Bool #

(/=) :: Arg a b -> Arg a b -> Bool #

(Eq k, Eq a) => Eq (Map k a) 
Instance details

Defined in Data.Map.Internal

Methods

(==) :: Map k a -> Map k a -> Bool #

(/=) :: Map k a -> Map k a -> Bool #

(Eq1 f, Eq a) => Eq (Cofree f a) 
Instance details

Defined in Control.Comonad.Cofree

Methods

(==) :: Cofree f a -> Cofree f a -> Bool #

(/=) :: Cofree f a -> Cofree f a -> Bool #

(Eq1 f, Eq a) => Eq (Free f a) 
Instance details

Defined in Control.Monad.Free

Methods

(==) :: Free f a -> Free f a -> Bool #

(/=) :: Free f a -> Free f a -> Bool #

(Eq a, Ord b) => Eq (Gr a b) 
Instance details

Defined in GHC.Data.Graph.Inductive.PatriciaTree

Methods

(==) :: Gr a b -> Gr a b -> Bool #

(/=) :: Gr a b -> Gr a b -> Bool #

(Eq (IdP pass), Eq a) => Eq (WithHsDocIdentifiers a pass) 
Instance details

Defined in GHC.Hs.Doc

(Eq l, Eq e) => Eq (GenLocated l e) 
Instance details

Defined in GHC.Types.SrcLoc

Methods

(==) :: GenLocated l e -> GenLocated l e -> Bool #

(/=) :: GenLocated l e -> GenLocated l e -> Bool #

(Eq k, Eq a) => Eq (UniqMap k a) 
Instance details

Defined in GHC.Types.Unique.Map

Methods

(==) :: UniqMap k a -> UniqMap k a -> Bool #

(/=) :: UniqMap k a -> UniqMap k a -> Bool #

(Eq a, Eq b) => Eq (Either a b)

@since base-2.01

Instance details

Defined in GHC.Internal.Data.Either

Methods

(==) :: Either a b -> Either a b -> Bool #

(/=) :: Either a b -> Either a b -> Bool #

Eq (Proxy s)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Data.Proxy

Methods

(==) :: Proxy s -> Proxy s -> Bool #

(/=) :: Proxy s -> Proxy s -> Bool #

Eq (TypeRep a)

@since base-2.01

Instance details

Defined in GHC.Internal.Data.Typeable.Internal

Methods

(==) :: TypeRep a -> TypeRep a -> Bool #

(/=) :: TypeRep a -> TypeRep a -> Bool #

Eq (U1 p)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

(==) :: U1 p -> U1 p -> Bool #

(/=) :: U1 p -> U1 p -> Bool #

Eq (V1 p)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

(==) :: V1 p -> V1 p -> Bool #

(/=) :: V1 p -> V1 p -> Bool #

(Eq1 f, Eq a) => Eq (Yoneda f a) 
Instance details

Defined in Data.Functor.Yoneda

Methods

(==) :: Yoneda f a -> Yoneda f a -> Bool #

(/=) :: Yoneda f a -> Yoneda f a -> Bool #

(Eq i, Eq a) => Eq (Level i a) 
Instance details

Defined in Control.Lens.Internal.Level

Methods

(==) :: Level i a -> Level i a -> Bool #

(/=) :: Level i a -> Level i a -> Bool #

(Eq (Token s), Eq e) => Eq (ParseError s e) 
Instance details

Defined in Text.Megaparsec.Error

Methods

(==) :: ParseError s e -> ParseError s e -> Bool #

(/=) :: ParseError s e -> ParseError s e -> Bool #

(Eq s, Eq (Token s), Eq e) => Eq (ParseErrorBundle s e) 
Instance details

Defined in Text.Megaparsec.Error

(Eq (ParseError s e), Eq s) => Eq (State s e) 
Instance details

Defined in Text.Megaparsec.State

Methods

(==) :: State s e -> State s e -> Bool #

(/=) :: State s e -> State s e -> Bool #

Eq (Ref a) 
Instance details

Defined in Napkin.Types.Core

Methods

(==) :: Ref a -> Ref a -> Bool #

(/=) :: Ref a -> Ref a -> Bool #

Eq (DumpItem b) 
Instance details

Defined in Napkin.Run.Effects.Interceptors.LogProgram.Types

Methods

(==) :: DumpItem b -> DumpItem b -> Bool #

(/=) :: DumpItem b -> DumpItem b -> Bool #

Eq (Renderable b) 
Instance details

Defined in Napkin.Run.Effects.Interceptors.LogProgram.Types

Methods

(==) :: Renderable b -> Renderable b -> Bool #

(/=) :: Renderable b -> Renderable b -> Bool #

Eq (DryRunResult b) 
Instance details

Defined in Napkin.Run.Effects.Types

Eq (BackendQueryStats bk) => Eq (QueryStats bk) 
Instance details

Defined in Napkin.Types.QueryStats

Methods

(==) :: QueryStats bk -> QueryStats bk -> Bool #

(/=) :: QueryStats bk -> QueryStats bk -> Bool #

(Eq k, Eq v) => Eq (OMap k v) 
Instance details

Defined in Data.Map.Ordered.Internal

Methods

(==) :: OMap k v -> OMap k v -> Bool #

(/=) :: OMap k v -> OMap k v -> Bool #

Eq (MutableArray s a) 
Instance details

Defined in Data.Primitive.Array

Methods

(==) :: MutableArray s a -> MutableArray s a -> Bool #

(/=) :: MutableArray s a -> MutableArray s a -> Bool #

Eq (MutablePrimArray s a) 
Instance details

Defined in Data.Primitive.PrimArray

Eq (SmallMutableArray s a) 
Instance details

Defined in Data.Primitive.SmallArray

Eq a => Eq (WithStatus k a) 
Instance details

Defined in Servant.API.UVerb

Methods

(==) :: WithStatus k a -> WithStatus k a -> Bool #

(/=) :: WithStatus k a -> WithStatus k a -> Bool #

(Eq a, Eq b) => Eq (Either a b) 
Instance details

Defined in Data.Strict.Either

Methods

(==) :: Either a b -> Either a b -> Bool #

(/=) :: Either a b -> Either a b -> Bool #

(Eq a, Eq b) => Eq (These a b) 
Instance details

Defined in Data.Strict.These

Methods

(==) :: These a b -> These a b -> Bool #

(/=) :: These a b -> These a b -> Bool #

(Eq a, Eq b) => Eq (Pair a b) 
Instance details

Defined in Data.Strict.Tuple

Methods

(==) :: Pair a b -> Pair a b -> Bool #

(/=) :: Pair a b -> Pair a b -> Bool #

Eq a => Eq (B dst a) 
Instance details

Defined in Data.String.Interpolate.Conversion.Classes

Methods

(==) :: B dst a -> B dst a -> Bool #

(/=) :: B dst a -> B dst a -> Bool #

(Eq a, Eq b) => Eq (These a b) 
Instance details

Defined in Data.These

Methods

(==) :: These a b -> These a b -> Bool #

(/=) :: These a b -> These a b -> Bool #

(Eq1 f, Eq a) => Eq (Lift f a) 
Instance details

Defined in Control.Applicative.Lift

Methods

(==) :: Lift f a -> Lift f a -> Bool #

(/=) :: Lift f a -> Lift f a -> Bool #

(Eq1 m, Eq a) => Eq (MaybeT m a) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

(==) :: MaybeT m a -> MaybeT m a -> Bool #

(/=) :: MaybeT m a -> MaybeT m a -> Bool #

(Eq k, Eq v) => Eq (HashMap k v)

Note that, in the presence of hash collisions, equal HashMaps may behave differently, i.e. extensionality may be violated:

>>> data D = A | B deriving (Eq, Show)
>>> instance Hashable D where hashWithSalt salt _d = salt
>>> x = fromList [(A,1), (B,2)]
>>> y = fromList [(B,2), (A,1)]
>>> x == y
True
>>> toList x
[(A,1),(B,2)]
>>> toList y
[(B,2),(A,1)]

In general, the lack of extensionality can be observed with any function that depends on the key ordering, such as folds and traversals.

Instance details

Defined in Data.HashMap.Internal

Methods

(==) :: HashMap k v -> HashMap k v -> Bool #

(/=) :: HashMap k v -> HashMap k v -> Bool #

(Eq k, Eq v) => Eq (Leaf k v) 
Instance details

Defined in Data.HashMap.Internal

Methods

(==) :: Leaf k v -> Leaf k v -> Bool #

(/=) :: Leaf k v -> Leaf k v -> Bool #

(Eq a, Eq b) => Eq (a, b) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b) -> (a, b) -> Bool #

(/=) :: (a, b) -> (a, b) -> Bool #

Eq (STUArray s i e) 
Instance details

Defined in Data.Array.Base

Methods

(==) :: STUArray s i e -> STUArray s i e -> Bool #

(/=) :: STUArray s i e -> STUArray s i e -> Bool #

Eq (p (Fix p a) a) => Eq (Fix p a) 
Instance details

Defined in Data.Bifunctor.Fix

Methods

(==) :: Fix p a -> Fix p a -> Bool #

(/=) :: Fix p a -> Fix p a -> Bool #

Eq (p a a) => Eq (Join p a) 
Instance details

Defined in Data.Bifunctor.Join

Methods

(==) :: Join p a -> Join p a -> Bool #

(/=) :: Join p a -> Join p a -> Bool #

(Eq a, Eq (f b)) => Eq (CofreeF f a b) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

(==) :: CofreeF f a b -> CofreeF f a b -> Bool #

(/=) :: CofreeF f a b -> CofreeF f a b -> Bool #

Eq (w (CofreeF f a (CofreeT f w a))) => Eq (CofreeT f w a) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

(==) :: CofreeT f w a -> CofreeT f w a -> Bool #

(/=) :: CofreeT f w a -> CofreeT f w a -> Bool #

(Eq a, Eq (f b)) => Eq (FreeF f a b) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

(==) :: FreeF f a b -> FreeF f a b -> Bool #

(/=) :: FreeF f a b -> FreeF f a b -> Bool #

(Eq1 f, Eq1 m, Eq a) => Eq (FreeT f m a) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

(==) :: FreeT f m a -> FreeT f m a -> Bool #

(/=) :: FreeT f m a -> FreeT f m a -> Bool #

Eq a => Eq (Const a b)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Functor.Const

Methods

(==) :: Const a b -> Const a b -> Bool #

(/=) :: Const a b -> Const a b -> Bool #

Eq (f a) => Eq (Ap f a)

@since base-4.12.0.0

Instance details

Defined in GHC.Internal.Data.Monoid

Methods

(==) :: Ap f a -> Ap f a -> Bool #

(/=) :: Ap f a -> Ap f a -> Bool #

Eq (f a) => Eq (Alt f a)

@since base-4.8.0.0

Instance details

Defined in GHC.Internal.Data.Semigroup.Internal

Methods

(==) :: Alt f a -> Alt f a -> Bool #

(/=) :: Alt f a -> Alt f a -> Bool #

Eq (a :~: b)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Data.Type.Equality

Methods

(==) :: (a :~: b) -> (a :~: b) -> Bool #

(/=) :: (a :~: b) -> (a :~: b) -> Bool #

Eq (OrderingI a b) 
Instance details

Defined in GHC.Internal.Data.Type.Ord

Methods

(==) :: OrderingI a b -> OrderingI a b -> Bool #

(/=) :: OrderingI a b -> OrderingI a b -> Bool #

(Generic1 f, Eq (Rep1 f a)) => Eq (Generically1 f a)

@since base-4.18.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

(==) :: Generically1 f a -> Generically1 f a -> Bool #

(/=) :: Generically1 f a -> Generically1 f a -> Bool #

Eq (f p) => Eq (Rec1 f p)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

(==) :: Rec1 f p -> Rec1 f p -> Bool #

(/=) :: Rec1 f p -> Rec1 f p -> Bool #

Eq (URec (Ptr ()) p)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

(==) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool #

(/=) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool #

Eq (URec Char p)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

(==) :: URec Char p -> URec Char p -> Bool #

(/=) :: URec Char p -> URec Char p -> Bool #

Eq (URec Double p)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

(==) :: URec Double p -> URec Double p -> Bool #

(/=) :: URec Double p -> URec Double p -> Bool #

Eq (URec Float p) 
Instance details

Defined in GHC.Internal.Generics

Methods

(==) :: URec Float p -> URec Float p -> Bool #

(/=) :: URec Float p -> URec Float p -> Bool #

Eq (URec Int p)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

(==) :: URec Int p -> URec Int p -> Bool #

(/=) :: URec Int p -> URec Int p -> Bool #

Eq (URec Word p)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

(==) :: URec Word p -> URec Word p -> Bool #

(/=) :: URec Word p -> URec Word p -> Bool #

Eq (Assertion a b) 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

Methods

(==) :: Assertion a b -> Assertion a b -> Bool #

(/=) :: Assertion a b -> Assertion a b -> Bool #

Eq (External m a) 
Instance details

Defined in Napkin.Run.Effects.Languages.External

Methods

(==) :: External m a -> External m a -> Bool #

(/=) :: External m a -> External m a -> Bool #

Eq (LoadQuery m a) 
Instance details

Defined in Napkin.Run.Effects.Languages.LoadQuery

Methods

(==) :: LoadQuery m a -> LoadQuery m a -> Bool #

(/=) :: LoadQuery m a -> LoadQuery m a -> Bool #

Eq (SqlParse m a) 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlParse

Methods

(==) :: SqlParse m a -> SqlParse m a -> Bool #

(/=) :: SqlParse m a -> SqlParse m a -> Bool #

Eq (SqlRender m a) 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlRender

Methods

(==) :: SqlRender m a -> SqlRender m a -> Bool #

(/=) :: SqlRender m a -> SqlRender m a -> Bool #

Eq a => Eq (K a b) 
Instance details

Defined in Data.SOP.BasicFunctors

Methods

(==) :: K a b -> K a b -> Bool #

(/=) :: K a b -> K a b -> Bool #

All (Compose Eq f) xs => Eq (NP f xs) 
Instance details

Defined in Data.SOP.NP

Methods

(==) :: NP f xs -> NP f xs -> Bool #

(/=) :: NP f xs -> NP f xs -> Bool #

Eq (NP (NP f) xss) => Eq (POP f xss) 
Instance details

Defined in Data.SOP.NP

Methods

(==) :: POP f xss -> POP f xss -> Bool #

(/=) :: POP f xss -> POP f xss -> Bool #

All (Compose Eq f) xs => Eq (NS f xs) 
Instance details

Defined in Data.SOP.NS

Methods

(==) :: NS f xs -> NS f xs -> Bool #

(/=) :: NS f xs -> NS f xs -> Bool #

Eq (NS (NP f) xss) => Eq (SOP f xss) 
Instance details

Defined in Data.SOP.NS

Methods

(==) :: SOP f xss -> SOP f xss -> Bool #

(/=) :: SOP f xss -> SOP f xss -> Bool #

Eq b => Eq (Tagged s b) 
Instance details

Defined in Data.Tagged

Methods

(==) :: Tagged s b -> Tagged s b -> Bool #

(/=) :: Tagged s b -> Tagged s b -> Bool #

(Eq (f a), Eq (g a), Eq a) => Eq (These1 f g a) 
Instance details

Defined in Data.Functor.These

Methods

(==) :: These1 f g a -> These1 f g a -> Bool #

(/=) :: These1 f g a -> These1 f g a -> Bool #

(Eq1 f, Eq a) => Eq (Backwards f a) 
Instance details

Defined in Control.Applicative.Backwards

Methods

(==) :: Backwards f a -> Backwards f a -> Bool #

(/=) :: Backwards f a -> Backwards f a -> Bool #

(Eq e, Eq1 m, Eq a) => Eq (ExceptT e m a) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

(==) :: ExceptT e m a -> ExceptT e m a -> Bool #

(/=) :: ExceptT e m a -> ExceptT e m a -> Bool #

(Eq1 f, Eq a) => Eq (IdentityT f a) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

(==) :: IdentityT f a -> IdentityT f a -> Bool #

(/=) :: IdentityT f a -> IdentityT f a -> Bool #

(Eq w, Eq1 m, Eq a) => Eq (WriterT w m a) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

(==) :: WriterT w m a -> WriterT w m a -> Bool #

(/=) :: WriterT w m a -> WriterT w m a -> Bool #

(Eq w, Eq1 m, Eq a) => Eq (WriterT w m a) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

(==) :: WriterT w m a -> WriterT w m a -> Bool #

(/=) :: WriterT w m a -> WriterT w m a -> Bool #

Eq a => Eq (Constant a b) 
Instance details

Defined in Data.Functor.Constant

Methods

(==) :: Constant a b -> Constant a b -> Bool #

(/=) :: Constant a b -> Constant a b -> Bool #

(Eq1 f, Eq a) => Eq (Reverse f a) 
Instance details

Defined in Data.Functor.Reverse

Methods

(==) :: Reverse f a -> Reverse f a -> Bool #

(/=) :: Reverse f a -> Reverse f a -> Bool #

(Eq a, Eq b, Eq c) => Eq (a, b, c) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c) -> (a, b, c) -> Bool #

(/=) :: (a, b, c) -> (a, b, c) -> Bool #

(Eq (f a), Eq (g a)) => Eq (Product f g a)

Since: base-4.18.0.0

Instance details

Defined in Data.Functor.Product

Methods

(==) :: Product f g a -> Product f g a -> Bool #

(/=) :: Product f g a -> Product f g a -> Bool #

(Eq (f a), Eq (g a)) => Eq (Sum f g a)

Since: base-4.18.0.0

Instance details

Defined in Data.Functor.Sum

Methods

(==) :: Sum f g a -> Sum f g a -> Bool #

(/=) :: Sum f g a -> Sum f g a -> Bool #

Eq (a :~~: b)

@since base-4.10.0.0

Instance details

Defined in GHC.Internal.Data.Type.Equality

Methods

(==) :: (a :~~: b) -> (a :~~: b) -> Bool #

(/=) :: (a :~~: b) -> (a :~~: b) -> Bool #

(Eq (f p), Eq (g p)) => Eq ((f :*: g) p)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

(==) :: (f :*: g) p -> (f :*: g) p -> Bool #

(/=) :: (f :*: g) p -> (f :*: g) p -> Bool #

(Eq (f p), Eq (g p)) => Eq ((f :+: g) p)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

(==) :: (f :+: g) p -> (f :+: g) p -> Bool #

(/=) :: (f :+: g) p -> (f :+: g) p -> Bool #

Eq c => Eq (K1 i c p)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

(==) :: K1 i c p -> K1 i c p -> Bool #

(/=) :: K1 i c p -> K1 i c p -> Bool #

(Eq (BackendMaterializedViewMeta bk), Eq (BackendTableMeta bk), Eq (BackendViewMeta bk)) => Eq (SqlWrite bk a b) 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlWrite

Methods

(==) :: SqlWrite bk a b -> SqlWrite bk a b -> Bool #

(/=) :: SqlWrite bk a b -> SqlWrite bk a b -> Bool #

(Eq a, Eq b, Eq c, Eq d) => Eq (a, b, c, d) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d) -> (a, b, c, d) -> Bool #

(/=) :: (a, b, c, d) -> (a, b, c, d) -> Bool #

Eq (f (g a)) => Eq (Compose f g a)

Since: base-4.18.0.0

Instance details

Defined in Data.Functor.Compose

Methods

(==) :: Compose f g a -> Compose f g a -> Bool #

(/=) :: Compose f g a -> Compose f g a -> Bool #

Eq (f a) => Eq (Clown f a b) 
Instance details

Defined in Data.Bifunctor.Clown

Methods

(==) :: Clown f a b -> Clown f a b -> Bool #

(/=) :: Clown f a b -> Clown f a b -> Bool #

Eq (p b a) => Eq (Flip p a b) 
Instance details

Defined in Data.Bifunctor.Flip

Methods

(==) :: Flip p a b -> Flip p a b -> Bool #

(/=) :: Flip p a b -> Flip p a b -> Bool #

Eq (g b) => Eq (Joker g a b) 
Instance details

Defined in Data.Bifunctor.Joker

Methods

(==) :: Joker g a b -> Joker g a b -> Bool #

(/=) :: Joker g a b -> Joker g a b -> Bool #

Eq (p a b) => Eq (WrappedBifunctor p a b) 
Instance details

Defined in Data.Bifunctor.Wrapped

Methods

(==) :: WrappedBifunctor p a b -> WrappedBifunctor p a b -> Bool #

(/=) :: WrappedBifunctor p a b -> WrappedBifunctor p a b -> Bool #

Eq (f (g p)) => Eq ((f :.: g) p)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

(==) :: (f :.: g) p -> (f :.: g) p -> Bool #

(/=) :: (f :.: g) p -> (f :.: g) p -> Bool #

Eq (f p) => Eq (M1 i c f p)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

(==) :: M1 i c f p -> M1 i c f p -> Bool #

(/=) :: M1 i c f p -> M1 i c f p -> Bool #

Eq (AnnotateRead bk a b) 
Instance details

Defined in Napkin.Run.Effects.Languages.AnnotateRead

Methods

(==) :: AnnotateRead bk a b -> AnnotateRead bk a b -> Bool #

(/=) :: AnnotateRead bk a b -> AnnotateRead bk a b -> Bool #

Eq (AnnotateWrite bk a b) 
Instance details

Defined in Napkin.Run.Effects.Languages.AnnotateWrite

Methods

(==) :: AnnotateWrite bk a b -> AnnotateWrite bk a b -> Bool #

(/=) :: AnnotateWrite bk a b -> AnnotateWrite bk a b -> Bool #

Eq (SqlRead b m a) 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlRead

Methods

(==) :: SqlRead b m a -> SqlRead b m a -> Bool #

(/=) :: SqlRead b m a -> SqlRead b m a -> Bool #

(Eq1 f, Eq1 g, Eq a) => Eq ((f :.: g) a) 
Instance details

Defined in Data.SOP.BasicFunctors

Methods

(==) :: (f :.: g) a -> (f :.: g) a -> Bool #

(/=) :: (f :.: g) a -> (f :.: g) a -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e) => Eq (a, b, c, d, e) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e) -> (a, b, c, d, e) -> Bool #

(/=) :: (a, b, c, d, e) -> (a, b, c, d, e) -> Bool #

(Eq (f a b), Eq (g a b)) => Eq (Product f g a b) 
Instance details

Defined in Data.Bifunctor.Product

Methods

(==) :: Product f g a b -> Product f g a b -> Bool #

(/=) :: Product f g a b -> Product f g a b -> Bool #

(Eq (p a b), Eq (q a b)) => Eq (Sum p q a b) 
Instance details

Defined in Data.Bifunctor.Sum

Methods

(==) :: Sum p q a b -> Sum p q a b -> Bool #

(/=) :: Sum p q a b -> Sum p q a b -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f) => Eq (a, b, c, d, e, f) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> Bool #

(/=) :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> Bool #

Eq (f (p a b)) => Eq (Tannen f p a b) 
Instance details

Defined in Data.Bifunctor.Tannen

Methods

(==) :: Tannen f p a b -> Tannen f p a b -> Bool #

(/=) :: Tannen f p a b -> Tannen f p a b -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g) => Eq (a, b, c, d, e, f, g) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> Bool #

(/=) :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h) => Eq (a, b, c, d, e, f, g, h) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> Bool #

(/=) :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> Bool #

Eq (p (f a) (g b)) => Eq (Biff p f g a b) 
Instance details

Defined in Data.Bifunctor.Biff

Methods

(==) :: Biff p f g a b -> Biff p f g a b -> Bool #

(/=) :: Biff p f g a b -> Biff p f g a b -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i) => Eq (a, b, c, d, e, f, g, h, i) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> Bool #

(/=) :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j) => Eq (a, b, c, d, e, f, g, h, i, j) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> Bool #

(/=) :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j, Eq k) => Eq (a, b, c, d, e, f, g, h, i, j, k) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> Bool #

(/=) :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j, Eq k, Eq l) => Eq (a, b, c, d, e, f, g, h, i, j, k, l) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> Bool #

(/=) :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j, Eq k, Eq l, Eq m) => Eq (a, b, c, d, e, f, g, h, i, j, k, l, m) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Bool #

(/=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j, Eq k, Eq l, Eq m, Eq n) => Eq (a, b, c, d, e, f, g, h, i, j, k, l, m, n) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Bool #

(/=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j, Eq k, Eq l, Eq m, Eq n, Eq o) => Eq (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Bool #

(/=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Bool #

max :: SExp -> SExp #

min :: SExp -> SExp #

type String = [Char] #

String is an alias for a list of characters.

String constants in Haskell are values of type String. That means if you write a string literal like "hello world", it will have the type [Char], which is the same as String.

Note: You can ask the compiler to automatically infer different types with the -XOverloadedStrings language extension, for example "hello world" :: Text. See IsString for more information.

Because String is just a list of characters, you can use normal list functions to do basic string manipulation. See Data.List for operations on lists.

Performance considerations

Expand

[Char] is a relatively memory-inefficient type. It is a linked list of boxed word-size characters, internally it looks something like:

╭─────┬───┬──╮  ╭─────┬───┬──╮  ╭─────┬───┬──╮  ╭────╮
│ (:) │   │ ─┼─>│ (:) │   │ ─┼─>│ (:) │   │ ─┼─>│ [] │
╰─────┴─┼─┴──╯  ╰─────┴─┼─┴──╯  ╰─────┴─┼─┴──╯  ╰────╯
        v               v               v
       'a'             'b'             'c'

The String "abc" will use 5*3+1 = 16 (in general 5n+1) words of space in memory.

Furthermore, operations like (++) (string concatenation) are O(n) (in the left argument).

For historical reasons, the base library uses String in a lot of places for the conceptual simplicity, but library code dealing with user-data should use the text package for Unicode text, or the the bytestring package for binary data.

data Maybe a #

The Maybe type encapsulates an optional value. A value of type Maybe a either contains a value of type a (represented as Just a), or it is empty (represented as Nothing). Using Maybe is a good way to deal with errors or exceptional cases without resorting to drastic measures such as error.

The Maybe type is also a monad. It is a simple kind of error monad, where all errors are represented by Nothing. A richer error monad can be built using the Either type.

Constructors

Nothing 
Just a 

Instances

Instances details
FromJSON1 Maybe 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: Maybe a -> (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (Maybe a) #

liftParseJSONList :: Maybe a -> (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [Maybe a] #

liftOmittedField :: Maybe a -> Maybe (Maybe a) #

ToJSON1 Maybe 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> Maybe a -> Value #

liftToJSONList :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> [Maybe a] -> Value #

liftToEncoding :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> Maybe a -> Encoding #

liftToEncodingList :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> [Maybe a] -> Encoding #

liftOmitField :: (a -> Bool) -> Maybe a -> Bool #

MonadZip Maybe

Since: base-4.8.0.0

Instance details

Defined in Control.Monad.Zip

Methods

mzip :: Maybe a -> Maybe b -> Maybe (a, b) #

mzipWith :: (a -> b -> c) -> Maybe a -> Maybe b -> Maybe c #

munzip :: Maybe (a, b) -> (Maybe a, Maybe b) #

Eq1 Maybe

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftEq :: (a -> b -> Bool) -> Maybe a -> Maybe b -> Bool #

Ord1 Maybe

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftCompare :: (a -> b -> Ordering) -> Maybe a -> Maybe b -> Ordering #

Read1 Maybe

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (Maybe a) #

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [Maybe a] #

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (Maybe a) #

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [Maybe a] #

Show1 Maybe

Since: base-4.9.0.0

Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Maybe a -> ShowS #

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Maybe a] -> ShowS #

MonadFailure Maybe 
Instance details

Defined in Basement.Monad

Associated Types

type Failure Maybe 
Instance details

Defined in Basement.Monad

type Failure Maybe = ()

Methods

mFail :: Failure Maybe -> Maybe () #

NFData1 Maybe

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> Maybe a -> () #

MonadThrow Maybe 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: (HasCallStack, Exception e) => e -> Maybe a #

Alternative Maybe

Picks the leftmost Just value, or, alternatively, Nothing.

@since base-2.01

Instance details

Defined in GHC.Internal.Base

Methods

empty :: Maybe a #

(<|>) :: Maybe a -> Maybe a -> Maybe a #

some :: Maybe a -> Maybe [a] #

many :: Maybe a -> Maybe [a] #

Applicative Maybe

@since base-2.01

Instance details

Defined in GHC.Internal.Base

Methods

pure :: a -> Maybe a #

(<*>) :: Maybe (a -> b) -> Maybe a -> Maybe b #

liftA2 :: (a -> b -> c) -> Maybe a -> Maybe b -> Maybe c #

(*>) :: Maybe a -> Maybe b -> Maybe b #

(<*) :: Maybe a -> Maybe b -> Maybe a #

Functor Maybe

@since base-2.01

Instance details

Defined in GHC.Internal.Base

Methods

fmap :: (a -> b) -> Maybe a -> Maybe b #

(<$) :: a -> Maybe b -> Maybe a #

Monad Maybe

@since base-2.01

Instance details

Defined in GHC.Internal.Base

Methods

(>>=) :: Maybe a -> (a -> Maybe b) -> Maybe b #

(>>) :: Maybe a -> Maybe b -> Maybe b #

return :: a -> Maybe a #

MonadPlus Maybe

Picks the leftmost Just value, or, alternatively, Nothing.

@since base-2.01

Instance details

Defined in GHC.Internal.Base

Methods

mzero :: Maybe a #

mplus :: Maybe a -> Maybe a -> Maybe a #

MonadFail Maybe

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Control.Monad.Fail

Methods

fail :: String -> Maybe a #

Foldable Maybe

@since base-2.01

Instance details

Defined in GHC.Internal.Data.Foldable

Methods

fold :: Monoid m => Maybe m -> m #

foldMap :: Monoid m => (a -> m) -> Maybe a -> m #

foldMap' :: Monoid m => (a -> m) -> Maybe a -> m #

foldr :: (a -> b -> b) -> b -> Maybe a -> b #

foldr' :: (a -> b -> b) -> b -> Maybe a -> b #

foldl :: (b -> a -> b) -> b -> Maybe a -> b #

foldl' :: (b -> a -> b) -> b -> Maybe a -> b #

foldr1 :: (a -> a -> a) -> Maybe a -> a #

foldl1 :: (a -> a -> a) -> Maybe a -> a #

toList :: Maybe a -> [a] #

null :: Maybe a -> Bool #

length :: Maybe a -> Int #

elem :: Eq a => a -> Maybe a -> Bool #

maximum :: Ord a => Maybe a -> a #

minimum :: Ord a => Maybe a -> a #

sum :: Num a => Maybe a -> a #

product :: Num a => Maybe a -> a #

Traversable Maybe

@since base-2.01

Instance details

Defined in GHC.Internal.Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Maybe a -> f (Maybe b) #

sequenceA :: Applicative f => Maybe (f a) -> f (Maybe a) #

mapM :: Monad m => (a -> m b) -> Maybe a -> m (Maybe b) #

sequence :: Monad m => Maybe (m a) -> m (Maybe a) #

Hashable1 Maybe 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> Maybe a -> Int #

Generic1 Maybe 
Instance details

Defined in GHC.Internal.Generics

Associated Types

type Rep1 Maybe

@since base-4.6.0.0

Instance details

Defined in GHC.Internal.Generics

type Rep1 Maybe = D1 ('MetaData "Maybe" "GHC.Internal.Maybe" "ghc-internal" 'False) (C1 ('MetaCons "Nothing" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Just" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1))

Methods

from1 :: Maybe a -> Rep1 Maybe a #

to1 :: Rep1 Maybe a -> Maybe a #

FoldableWithIndex () Maybe 
Instance details

Defined in WithIndex

Methods

ifoldMap :: Monoid m => (() -> a -> m) -> Maybe a -> m #

ifoldMap' :: Monoid m => (() -> a -> m) -> Maybe a -> m #

ifoldr :: (() -> a -> b -> b) -> b -> Maybe a -> b #

ifoldl :: (() -> b -> a -> b) -> b -> Maybe a -> b #

ifoldr' :: (() -> a -> b -> b) -> b -> Maybe a -> b #

ifoldl' :: (() -> b -> a -> b) -> b -> Maybe a -> b #

FunctorWithIndex () Maybe 
Instance details

Defined in WithIndex

Methods

imap :: (() -> a -> b) -> Maybe a -> Maybe b #

TraversableWithIndex () Maybe 
Instance details

Defined in WithIndex

Methods

itraverse :: Applicative f => (() -> a -> f b) -> Maybe a -> f (Maybe b) #

MonadBaseControl Maybe Maybe 
Instance details

Defined in Control.Monad.Trans.Control

Associated Types

type StM Maybe a 
Instance details

Defined in Control.Monad.Trans.Control

type StM Maybe a = a
MonadError () Maybe

Since: mtl-2.2.2

Instance details

Defined in Control.Monad.Error.Class

Methods

throwError :: () -> Maybe a #

catchError :: Maybe a -> (() -> Maybe a) -> Maybe a #

(Selector s, FromHttpApiData c) => GFromForm (t :: k) (M1 S s (K1 i (Maybe c) :: Type -> Type)) 
Instance details

Defined in Web.Internal.FormUrlEncoded

Methods

gFromForm :: Proxy t -> FormOptions -> Form -> Either Text (M1 S s (K1 i (Maybe c) :: Type -> Type) x) #

(Selector s, ToHttpApiData c) => GToForm (t :: k) (M1 S s (K1 i (Maybe c) :: Type -> Type)) 
Instance details

Defined in Web.Internal.FormUrlEncoded

Methods

gToForm :: Proxy t -> FormOptions -> M1 S s (K1 i (Maybe c) :: Type -> Type) x -> Form #

OutputableP env a => OutputableP env (Maybe a) 
Instance details

Defined in GHC.Utils.Outputable

Methods

pdoc :: env -> Maybe a -> SDoc #

Lift a => Lift (Maybe a :: Type) 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Maybe a -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Maybe a -> Code m (Maybe a) #

FromJSON a => FromJSON (Maybe a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON a => ToJSON (Maybe a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Default (Maybe a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Maybe a #

NFData a => NFData (Maybe a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Maybe a -> () #

Buildable' a => Buildable' (Maybe a) 
Instance details

Defined in Fmt.Internal.Generic

Methods

build' :: Maybe a -> Builder #

Buildable a => Buildable (Maybe a) 
Instance details

Defined in Formatting.Buildable

Methods

build :: Maybe a -> Builder #

ToHie a => ToHie (Maybe a) 
Instance details

Defined in GHC.Iface.Ext.Ast

Methods

toHie :: Maybe a -> HieM [HieAST Type]

HasLoc a => HasLoc (Maybe a) 
Instance details

Defined in GHC.Parser.Annotation

Methods

getHasLoc :: Maybe a -> SrcSpan #

NoAnn (Maybe a) 
Instance details

Defined in GHC.Parser.Annotation

Methods

noAnn :: Maybe a #

Outputable a => Outputable (Maybe a) 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Maybe a -> SDoc #

Semigroup a => Monoid (Maybe a)

Lift a semigroup into Maybe forming a Monoid according to http://en.wikipedia.org/wiki/Monoid: "Any semigroup S may be turned into a monoid simply by adjoining an element e not in S and defining e*e = e and e*s = s = s*e for all s ∈ S."

Since 4.11.0: constraint on inner a value generalised from Monoid to Semigroup.

@since base-2.01

Instance details

Defined in GHC.Internal.Base

Methods

mempty :: Maybe a #

mappend :: Maybe a -> Maybe a -> Maybe a #

mconcat :: [Maybe a] -> Maybe a #

Semigroup a => Semigroup (Maybe a)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Base

Methods

(<>) :: Maybe a -> Maybe a -> Maybe a #

sconcat :: NonEmpty (Maybe a) -> Maybe a #

stimes :: Integral b => b -> Maybe a -> Maybe a #

Data a => Data (Maybe a)

@since base-4.0.0.0

Instance details

Defined in GHC.Internal.Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Maybe a -> c (Maybe a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Maybe a) #

toConstr :: Maybe a -> Constr #

dataTypeOf :: Maybe a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Maybe a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Maybe a)) #

gmapT :: (forall b. Data b => b -> b) -> Maybe a -> Maybe a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Maybe a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Maybe a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Maybe a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Maybe a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Maybe a -> m (Maybe a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Maybe a -> m (Maybe a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Maybe a -> m (Maybe a) #

Generic (Maybe a) 
Instance details

Defined in GHC.Internal.Generics

Associated Types

type Rep (Maybe a)

@since base-4.6.0.0

Instance details

Defined in GHC.Internal.Generics

type Rep (Maybe a) = D1 ('MetaData "Maybe" "GHC.Internal.Maybe" "ghc-internal" 'False) (C1 ('MetaCons "Nothing" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Just" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))

Methods

from :: Maybe a -> Rep (Maybe a) x #

to :: Rep (Maybe a) x -> Maybe a #

SingKind a => SingKind (Maybe a)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Associated Types

type DemoteRep (Maybe a) 
Instance details

Defined in GHC.Internal.Generics

type DemoteRep (Maybe a) = Maybe (DemoteRep a)

Methods

fromSing :: forall (a0 :: Maybe a). Sing a0 -> DemoteRep (Maybe a)

Read a => Read (Maybe a)

@since base-2.01

Instance details

Defined in GHC.Internal.Read

Show a => Show (Maybe a)

@since base-2.01

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> Maybe a -> ShowS #

show :: Maybe a -> String #

showList :: [Maybe a] -> ShowS #

Eq (DeBruijn a) => Eq (DeBruijn (Maybe a)) 
Instance details

Defined in GHC.Core.Map.Type

Methods

(==) :: DeBruijn (Maybe a) -> DeBruijn (Maybe a) -> Bool #

(/=) :: DeBruijn (Maybe a) -> DeBruijn (Maybe a) -> Bool #

Eq a => Eq (Maybe a)

@since base-2.01

Instance details

Defined in GHC.Internal.Maybe

Methods

(==) :: Maybe a -> Maybe a -> Bool #

(/=) :: Maybe a -> Maybe a -> Bool #

Ord a => Ord (Maybe a)

@since base-2.01

Instance details

Defined in GHC.Internal.Maybe

Methods

compare :: Maybe a -> Maybe a -> Ordering #

(<) :: Maybe a -> Maybe a -> Bool #

(<=) :: Maybe a -> Maybe a -> Bool #

(>) :: Maybe a -> Maybe a -> Bool #

(>=) :: Maybe a -> Maybe a -> Bool #

max :: Maybe a -> Maybe a -> Maybe a #

min :: Maybe a -> Maybe a -> Maybe a #

Hashable a => Hashable (Maybe a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Maybe a -> Int #

hash :: Maybe a -> Int #

At (Maybe a) 
Instance details

Defined in Control.Lens.At

Methods

at :: Index (Maybe a) -> Lens' (Maybe a) (Maybe (IxValue (Maybe a))) #

Ixed (Maybe a) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (Maybe a) -> Traversal' (Maybe a) (IxValue (Maybe a)) #

AsEmpty (Maybe a) 
Instance details

Defined in Control.Lens.Empty

Methods

_Empty :: Prism' (Maybe a) () #

HasTypeVars t => HasTypeVars (Maybe t) 
Instance details

Defined in Language.Haskell.TH.Lens

MonoFoldable (Maybe a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (Maybe a) -> m) -> Maybe a -> m #

ofoldr :: (Element (Maybe a) -> b -> b) -> b -> Maybe a -> b #

ofoldl' :: (a0 -> Element (Maybe a) -> a0) -> a0 -> Maybe a -> a0 #

otoList :: Maybe a -> [Element (Maybe a)] #

oall :: (Element (Maybe a) -> Bool) -> Maybe a -> Bool #

oany :: (Element (Maybe a) -> Bool) -> Maybe a -> Bool #

onull :: Maybe a -> Bool #

olength :: Maybe a -> Int #

olength64 :: Maybe a -> Int64 #

ocompareLength :: Integral i => Maybe a -> i -> Ordering #

otraverse_ :: Applicative f => (Element (Maybe a) -> f b) -> Maybe a -> f () #

ofor_ :: Applicative f => Maybe a -> (Element (Maybe a) -> f b) -> f () #

omapM_ :: Applicative m => (Element (Maybe a) -> m ()) -> Maybe a -> m () #

oforM_ :: Applicative m => Maybe a -> (Element (Maybe a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (Maybe a) -> m a0) -> a0 -> Maybe a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (Maybe a) -> m) -> Maybe a -> m #

ofoldr1Ex :: (Element (Maybe a) -> Element (Maybe a) -> Element (Maybe a)) -> Maybe a -> Element (Maybe a) #

ofoldl1Ex' :: (Element (Maybe a) -> Element (Maybe a) -> Element (Maybe a)) -> Maybe a -> Element (Maybe a) #

headEx :: Maybe a -> Element (Maybe a) #

lastEx :: Maybe a -> Element (Maybe a) #

unsafeHead :: Maybe a -> Element (Maybe a) #

unsafeLast :: Maybe a -> Element (Maybe a) #

maximumByEx :: (Element (Maybe a) -> Element (Maybe a) -> Ordering) -> Maybe a -> Element (Maybe a) #

minimumByEx :: (Element (Maybe a) -> Element (Maybe a) -> Ordering) -> Maybe a -> Element (Maybe a) #

oelem :: Element (Maybe a) -> Maybe a -> Bool #

onotElem :: Element (Maybe a) -> Maybe a -> Bool #

MonoFunctor (Maybe a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Maybe a) -> Element (Maybe a)) -> Maybe a -> Maybe a #

MonoPointed (Maybe a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Maybe a) -> Maybe a #

MonoTraversable (Maybe a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (Maybe a) -> f (Element (Maybe a))) -> Maybe a -> f (Maybe a) #

omapM :: Applicative m => (Element (Maybe a) -> m (Element (Maybe a))) -> Maybe a -> m (Maybe a) #

Val a => Val (Maybe a) 
Instance details

Defined in Napkin.Types.Core

Methods

val :: Prism' Value (Maybe a) #

HasDeps a => HasDeps (Maybe a) 
Instance details

Defined in Napkin.Types.Deps

CombiBomb a => CombiBomb (Maybe a) 
Instance details

Defined in Napkin.Backends.MsSql.ApiGen.Types

ToSql a => ToSql (Maybe a) 
Instance details

Defined in Database.ODBC.SQLServer

Methods

toSql :: Maybe a -> Query #

Pretty a => Pretty (Maybe a)

Ignore Nothings, print Just contents.

>>> pretty (Just True)
True
>>> braces (pretty (Nothing :: Maybe Bool))
{}
>>> pretty [Just 1, Nothing, Just 3, Nothing]
[1, 3]
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Maybe a -> Doc ann #

prettyList :: [Maybe a] -> Doc ann #

SingI ('Nothing :: Maybe a)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

sing :: Sing ('Nothing :: Maybe a)

Each (Maybe a) (Maybe b) a b
each :: Traversal (Maybe a) (Maybe b) a b
Instance details

Defined in Control.Lens.Each

Methods

each :: Traversal (Maybe a) (Maybe b) a b #

Each (Maybe a) (Maybe b) a b 
Instance details

Defined in Lens.Micro.Internal

Methods

each :: Traversal (Maybe a) (Maybe b) a b #

SingI a2 => SingI ('Just a2 :: Maybe a1)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

sing :: Sing ('Just a2)

type Failure Maybe 
Instance details

Defined in Basement.Monad

type Failure Maybe = ()
type Rep1 Maybe

@since base-4.6.0.0

Instance details

Defined in GHC.Internal.Generics

type Rep1 Maybe = D1 ('MetaData "Maybe" "GHC.Internal.Maybe" "ghc-internal" 'False) (C1 ('MetaCons "Nothing" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Just" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1))
type StM Maybe a 
Instance details

Defined in Control.Monad.Trans.Control

type StM Maybe a = a
type Eval (FoldMap f ('Just x) :: a2 -> Type) 
Instance details

Defined in Fcf.Class.Foldable

type Eval (FoldMap f ('Just x) :: a2 -> Type) = Eval (f x)
type Eval (FoldMap f ('Nothing :: Maybe a1) :: a2 -> Type) 
Instance details

Defined in Fcf.Class.Foldable

type Eval (FoldMap f ('Nothing :: Maybe a1) :: a2 -> Type) = MEmpty :: a2
type Eval (Foldr f y ('Just x) :: a2 -> Type) 
Instance details

Defined in Fcf.Class.Foldable

type Eval (Foldr f y ('Just x) :: a2 -> Type) = Eval (f x y)
type Eval (Foldr f y ('Nothing :: Maybe a1) :: a2 -> Type) 
Instance details

Defined in Fcf.Class.Foldable

type Eval (Foldr f y ('Nothing :: Maybe a1) :: a2 -> Type) = y
type MEmpty 
Instance details

Defined in Fcf.Class.Monoid

type MEmpty = 'Nothing :: Maybe a
type Anno (Maybe Role) 
Instance details

Defined in GHC.Hs.Decls

type Anno (Maybe Role) 
Instance details

Defined in GHC.Hs.Decls

type DemoteRep (Maybe a) 
Instance details

Defined in GHC.Internal.Generics

type DemoteRep (Maybe a) = Maybe (DemoteRep a)
type Rep (Maybe a)

@since base-4.6.0.0

Instance details

Defined in GHC.Internal.Generics

type Rep (Maybe a) = D1 ('MetaData "Maybe" "GHC.Internal.Maybe" "ghc-internal" 'False) (C1 ('MetaCons "Nothing" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Just" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))
data Sing (b :: Maybe a) 
Instance details

Defined in GHC.Internal.Generics

data Sing (b :: Maybe a) where
type Index (Maybe a) 
Instance details

Defined in Control.Lens.At

type Index (Maybe a) = ()
type IxValue (Maybe a) 
Instance details

Defined in Control.Lens.At

type IxValue (Maybe a) = a
type Element (Maybe a) 
Instance details

Defined in Data.MonoTraversable

type Element (Maybe a) = a
type (a2 :: Maybe a1) <> ('Nothing :: Maybe a1) 
Instance details

Defined in Fcf.Class.Monoid

type (a2 :: Maybe a1) <> ('Nothing :: Maybe a1) = a2
type ('Nothing :: Maybe a) <> (b :: Maybe a) 
Instance details

Defined in Fcf.Class.Monoid

type ('Nothing :: Maybe a) <> (b :: Maybe a) = b
type Eval (Init ('[] :: [a]) :: Maybe [a] -> Type) 
Instance details

Defined in Fcf.Data.List

type Eval (Init ('[] :: [a]) :: Maybe [a] -> Type) = 'Nothing :: Maybe [a]
type Eval (Tail (_a ': as) :: Maybe [a] -> Type) 
Instance details

Defined in Fcf.Data.List

type Eval (Tail (_a ': as) :: Maybe [a] -> Type) = 'Just as
type Eval (Tail ('[] :: [a]) :: Maybe [a] -> Type) 
Instance details

Defined in Fcf.Data.List

type Eval (Tail ('[] :: [a]) :: Maybe [a] -> Type) = 'Nothing :: Maybe [a]
type Eval (Init (a2 ': (b ': as)) :: Maybe [a1] -> Type) 
Instance details

Defined in Fcf.Data.List

type Eval (Init (a2 ': (b ': as)) :: Maybe [a1] -> Type) = Eval ((Map (Cons a2) :: Maybe [a1] -> Maybe [a1] -> Type) =<< Init (b ': as))
type Eval (Init '[a2] :: Maybe [a1] -> Type) 
Instance details

Defined in Fcf.Data.List

type Eval (Init '[a2] :: Maybe [a1] -> Type) = 'Just ('[] :: [a1])
type Eval (Head ('[] :: [a]) :: Maybe a -> Type) 
Instance details

Defined in Fcf.Data.List

type Eval (Head ('[] :: [a]) :: Maybe a -> Type) = 'Nothing :: Maybe a
type Eval (Last ('[] :: [a]) :: Maybe a -> Type) 
Instance details

Defined in Fcf.Data.List

type Eval (Last ('[] :: [a]) :: Maybe a -> Type) = 'Nothing :: Maybe a
type Eval (Head (a2 ': _as) :: Maybe a1 -> Type) 
Instance details

Defined in Fcf.Data.List

type Eval (Head (a2 ': _as) :: Maybe a1 -> Type) = 'Just a2
type Eval (Last (a2 ': (b ': as)) :: Maybe a1 -> Type) 
Instance details

Defined in Fcf.Data.List

type Eval (Last (a2 ': (b ': as)) :: Maybe a1 -> Type) = Eval (Last (b ': as))
type Eval (Last '[a2] :: Maybe a1 -> Type) 
Instance details

Defined in Fcf.Data.List

type Eval (Last '[a2] :: Maybe a1 -> Type) = 'Just a2
type ('Just a2 :: Maybe a1) <> ('Just b :: Maybe a1) 
Instance details

Defined in Fcf.Class.Monoid

type ('Just a2 :: Maybe a1) <> ('Just b :: Maybe a1) = 'Just (a2 <> b)
type Eval (FindIndex _p ('[] :: [a]) :: Maybe Nat -> Type) 
Instance details

Defined in Fcf.Data.List

type Eval (FindIndex _p ('[] :: [a]) :: Maybe Nat -> Type) = 'Nothing :: Maybe Nat
type Eval (FindIndex p (a2 ': as) :: Maybe Nat -> Type) 
Instance details

Defined in Fcf.Data.List

type Eval (FindIndex p (a2 ': as) :: Maybe Nat -> Type) = Eval (If (Eval (p a2)) (Pure ('Just 0)) ((Map ((+) 1) :: Maybe Nat -> Maybe Nat -> Type) =<< FindIndex p as))
type Eval (NumIter a s :: Maybe (k, Nat) -> Type) 
Instance details

Defined in Fcf.Data.List

type Eval (NumIter a s :: Maybe (k, Nat) -> Type) = If (Eval (s > 0)) ('Just '(a, s - 1)) ('Nothing :: Maybe (k, Natural))
type Eval (Find _p ('[] :: [a]) :: Maybe a -> Type) 
Instance details

Defined in Fcf.Data.List

type Eval (Find _p ('[] :: [a]) :: Maybe a -> Type) = 'Nothing :: Maybe a
type Eval (Find p (a2 ': as) :: Maybe a1 -> Type) 
Instance details

Defined in Fcf.Data.List

type Eval (Find p (a2 ': as) :: Maybe a1 -> Type) = Eval (If (Eval (p a2)) (Pure ('Just a2)) (Find p as))
type Eval (Lookup a as :: Maybe b -> Type) 
Instance details

Defined in Fcf.Data.List

type Eval (Lookup a as :: Maybe b -> Type) = Eval (Map (Snd :: (k, b) -> b -> Type) (Eval (Find ((TyEq a :: k -> Bool -> Type) <=< (Fst :: (k, b) -> k -> Type)) as)))
type Eval (Map f ('Just a3) :: Maybe a2 -> Type) 
Instance details

Defined in Fcf.Class.Functor

type Eval (Map f ('Just a3) :: Maybe a2 -> Type) = 'Just (Eval (f a3))
type Eval (Map f ('Nothing :: Maybe a) :: Maybe b -> Type) 
Instance details

Defined in Fcf.Class.Functor

type Eval (Map f ('Nothing :: Maybe a) :: Maybe b -> Type) = 'Nothing :: Maybe b
type Eval (HasTotalFieldPSym sym :: (Type -> Type) -> Maybe Type -> Type) (tt :: Type -> Type) 
Instance details

Defined in Data.Generics.Product.Internal.Fields

type Eval (HasTotalFieldPSym sym :: (Type -> Type) -> Maybe Type -> Type) (tt :: Type -> Type) = HasTotalFieldP sym tt
type Eval (HasTotalPositionPSym t :: (Type -> Type) -> Maybe Type -> Type) (tt :: Type -> Type) 
Instance details

Defined in Data.Generics.Product.Internal.Positions

type Eval (HasTotalPositionPSym t :: (Type -> Type) -> Maybe Type -> Type) (tt :: Type -> Type) = HasTotalPositionP t tt
type Eval (HasTotalFieldPSym sym :: (Type -> Type) -> Maybe Type -> Type) (tt :: Type -> Type) 
Instance details

Defined in Data.Generics.Product.Internal.Subtype

type Eval (HasTotalFieldPSym sym :: (Type -> Type) -> Maybe Type -> Type) (tt :: Type -> Type) = HasTotalFieldP sym tt
type Eval (HasTotalTypePSym t :: (Type -> Type) -> Maybe Type -> Type) (tt :: Type -> Type) 
Instance details

Defined in Data.Generics.Product.Internal.Typed

type Eval (HasTotalTypePSym t :: (Type -> Type) -> Maybe Type -> Type) (tt :: Type -> Type) = HasTotalTypeP t tt

data Bool #

Constructors

False 
True 

Instances

Instances details
FromJSON Bool 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Bool 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Bool 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Bool 
Instance details

Defined in Data.Aeson.Types.ToJSON

BitOps Bool 
Instance details

Defined in Basement.Bits

FiniteBitsOps Bool 
Instance details

Defined in Basement.Bits

NFData Bool 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Bool -> () #

Buildable Bool 
Instance details

Defined in Formatting.Buildable

Methods

build :: Bool -> Builder #

ToJExpr Bool 
Instance details

Defined in GHC.JS.Make

NoAnn Bool 
Instance details

Defined in GHC.Parser.Annotation

Methods

noAnn :: Bool #

Outputable Bool 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Bool -> SDoc #

Bits Bool

Interpret Bool as 1-bit bit-field

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Bits

FiniteBits Bool

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Bits

Data Bool

@since base-4.0.0.0

Instance details

Defined in GHC.Internal.Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Bool -> c Bool #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Bool #

toConstr :: Bool -> Constr #

dataTypeOf :: Bool -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Bool) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Bool) #

gmapT :: (forall b. Data b => b -> b) -> Bool -> Bool #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Bool -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Bool -> r #

gmapQ :: (forall d. Data d => d -> u) -> Bool -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Bool -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Bool -> m Bool #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Bool -> m Bool #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Bool -> m Bool #

Bounded Bool

@since base-2.01

Instance details

Defined in GHC.Internal.Enum

Enum Bool

@since base-2.01

Instance details

Defined in GHC.Internal.Enum

Methods

succ :: Bool -> Bool #

pred :: Bool -> Bool #

toEnum :: Int -> Bool #

fromEnum :: Bool -> Int #

enumFrom :: Bool -> [Bool] #

enumFromThen :: Bool -> Bool -> [Bool] #

enumFromTo :: Bool -> Bool -> [Bool] #

enumFromThenTo :: Bool -> Bool -> Bool -> [Bool] #

Generic Bool 
Instance details

Defined in GHC.Internal.Generics

Associated Types

type Rep Bool

@since base-4.6.0.0

Instance details

Defined in GHC.Internal.Generics

type Rep Bool = D1 ('MetaData "Bool" "GHC.Types" "ghc-prim" 'False) (C1 ('MetaCons "False" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "True" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: Bool -> Rep Bool x #

to :: Rep Bool x -> Bool #

SingKind Bool

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Associated Types

type DemoteRep Bool 
Instance details

Defined in GHC.Internal.Generics

type DemoteRep Bool = Bool

Methods

fromSing :: forall (a :: Bool). Sing a -> DemoteRep Bool

Read Bool

@since base-2.01

Instance details

Defined in GHC.Internal.Read

Show Bool

@since base-2.01

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> Bool -> ShowS #

show :: Bool -> String #

showList :: [Bool] -> ShowS #

Eq Bool 
Instance details

Defined in GHC.Classes

Methods

(==) :: Bool -> Bool -> Bool #

(/=) :: Bool -> Bool -> Bool #

Ord Bool 
Instance details

Defined in GHC.Classes

Methods

compare :: Bool -> Bool -> Ordering #

(<) :: Bool -> Bool -> Bool #

(<=) :: Bool -> Bool -> Bool #

(>) :: Bool -> Bool -> Bool #

(>=) :: Bool -> Bool -> Bool #

max :: Bool -> Bool -> Bool #

min :: Bool -> Bool -> Bool #

Hashable Bool 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Bool -> Int #

hash :: Bool -> Int #

HpcHash Bool 
Instance details

Defined in Trace.Hpc.Util

Methods

toHash :: Bool -> Hash #

FromFormKey Bool 
Instance details

Defined in Web.Internal.FormUrlEncoded

ToFormKey Bool 
Instance details

Defined in Web.Internal.FormUrlEncoded

Methods

toFormKey :: Bool -> Text #

Val Bool 
Instance details

Defined in Napkin.Types.Core

Methods

val :: Prism' Value Bool #

ToSql Bool

Corresponds to BIT type of SQL Server.

Instance details

Defined in Database.ODBC.SQLServer

Methods

toSql :: Bool -> Query #

Pretty Bool
>>> pretty True
True
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Bool -> Doc ann #

prettyList :: [Bool] -> Doc ann #

Uniform Bool 
Instance details

Defined in System.Random.Internal

Methods

uniformM :: StatefulGen g m => g -> m Bool #

UniformRange Bool 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Bool, Bool) -> g -> m Bool #

Unbox Bool 
Instance details

Defined in Data.Vector.Unboxed.Base

IArray UArray Bool 
Instance details

Defined in Data.Array.Base

Methods

bounds :: Ix i => UArray i Bool -> (i, i) #

numElements :: Ix i => UArray i Bool -> Int #

unsafeArray :: Ix i => (i, i) -> [(Int, Bool)] -> UArray i Bool #

unsafeAt :: Ix i => UArray i Bool -> Int -> Bool #

unsafeReplace :: Ix i => UArray i Bool -> [(Int, Bool)] -> UArray i Bool #

unsafeAccum :: Ix i => (Bool -> e' -> Bool) -> UArray i Bool -> [(Int, e')] -> UArray i Bool #

unsafeAccumArray :: Ix i => (Bool -> e' -> Bool) -> Bool -> (i, i) -> [(Int, e')] -> UArray i Bool #

SingI 'False

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

sing :: Sing 'False

SingI 'True

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

sing :: Sing 'True

Lift Bool 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Bool -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Bool -> Code m Bool #

Vector Vector Bool 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Bool 
Instance details

Defined in Data.Vector.Unboxed.Base

MArray (STUArray s) Bool (ST s) 
Instance details

Defined in Data.Array.Base

Methods

getBounds :: Ix i => STUArray s i Bool -> ST s (i, i) #

getNumElements :: Ix i => STUArray s i Bool -> ST s Int #

newArray :: Ix i => (i, i) -> Bool -> ST s (STUArray s i Bool) #

newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Bool) #

unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Bool) #

unsafeRead :: Ix i => STUArray s i Bool -> Int -> ST s Bool #

unsafeWrite :: Ix i => STUArray s i Bool -> Int -> Bool -> ST s () #

type Anno Bool 
Instance details

Defined in GHC.Hs.Decls

type DemoteRep Bool 
Instance details

Defined in GHC.Internal.Generics

type DemoteRep Bool = Bool
type Rep Bool

@since base-4.6.0.0

Instance details

Defined in GHC.Internal.Generics

type Rep Bool = D1 ('MetaData "Bool" "GHC.Types" "ghc-prim" 'False) (C1 ('MetaCons "False" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "True" 'PrefixI 'False) (U1 :: Type -> Type))
data Sing (a :: Bool) 
Instance details

Defined in GHC.Internal.Generics

data Sing (a :: Bool) where
newtype Vector Bool 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Bool 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Bool = MV_Bool (MVector s Word8)
type Eval (Not 'False) 
Instance details

Defined in Fcf.Data.Bool

type Eval (Not 'False) = 'True
type Eval (Not 'True) 
Instance details

Defined in Fcf.Data.Bool

type Eval (Not 'True) = 'False
type Eval (And lst :: Bool -> Type) 
Instance details

Defined in Fcf.Class.Foldable

type Eval (And lst :: Bool -> Type) = Eval (Foldr (&&) 'True lst)
type Eval (Or lst :: Bool -> Type) 
Instance details

Defined in Fcf.Class.Foldable

type Eval (Or lst :: Bool -> Type) = Eval (Foldr (||) 'False lst)
type Eval ('False && b :: Bool -> Type) 
Instance details

Defined in Fcf.Data.Bool

type Eval ('False && b :: Bool -> Type) = 'False
type Eval ('True && b :: Bool -> Type) 
Instance details

Defined in Fcf.Data.Bool

type Eval ('True && b :: Bool -> Type) = b
type Eval (a && 'False :: Bool -> Type) 
Instance details

Defined in Fcf.Data.Bool

type Eval (a && 'False :: Bool -> Type) = 'False
type Eval (a && 'True :: Bool -> Type) 
Instance details

Defined in Fcf.Data.Bool

type Eval (a && 'True :: Bool -> Type) = a
type Eval ('False || b :: Bool -> Type) 
Instance details

Defined in Fcf.Data.Bool

type Eval ('False || b :: Bool -> Type) = b
type Eval ('True || b :: Bool -> Type) 
Instance details

Defined in Fcf.Data.Bool

type Eval ('True || b :: Bool -> Type) = 'True
type Eval (a || 'False :: Bool -> Type) 
Instance details

Defined in Fcf.Data.Bool

type Eval (a || 'False :: Bool -> Type) = a
type Eval (a || 'True :: Bool -> Type) 
Instance details

Defined in Fcf.Data.Bool

type Eval (a || 'True :: Bool -> Type) = 'True
type Eval (IsJust ('Just _a) :: Bool -> Type) 
Instance details

Defined in Fcf.Data.Common

type Eval (IsJust ('Just _a) :: Bool -> Type) = 'True
type Eval (IsJust ('Nothing :: Maybe a) :: Bool -> Type) 
Instance details

Defined in Fcf.Data.Common

type Eval (IsJust ('Nothing :: Maybe a) :: Bool -> Type) = 'False
type Eval (IsNothing ('Just _a) :: Bool -> Type) 
Instance details

Defined in Fcf.Data.Common

type Eval (IsNothing ('Just _a) :: Bool -> Type) = 'False
type Eval (IsNothing ('Nothing :: Maybe a) :: Bool -> Type) 
Instance details

Defined in Fcf.Data.Common

type Eval (IsNothing ('Nothing :: Maybe a) :: Bool -> Type) = 'True
type Eval (Null ('[] :: [a]) :: Bool -> Type) 
Instance details

Defined in Fcf.Data.List

type Eval (Null ('[] :: [a]) :: Bool -> Type) = 'True
type Eval (Null (a2 ': as) :: Bool -> Type) 
Instance details

Defined in Fcf.Data.List

type Eval (Null (a2 ': as) :: Bool -> Type) = 'False
type Eval (a < b :: Bool -> Type) 
Instance details

Defined in Fcf.Data.Nat

type Eval (a < b :: Bool -> Type) = Eval (Not =<< (a >= b))
type Eval (a <= b :: Bool -> Type) 
Instance details

Defined in Fcf.Data.Nat

type Eval (a <= b :: Bool -> Type) = a <=? b
type Eval (a > b :: Bool -> Type) 
Instance details

Defined in Fcf.Data.Nat

type Eval (a > b :: Bool -> Type) = Eval (Not =<< (a <= b))
type Eval (a >= b :: Bool -> Type) 
Instance details

Defined in Fcf.Data.Nat

type Eval (a >= b :: Bool -> Type) = b <=? a
type Eval (IsLeft ('Left _a :: Either a b) :: Bool -> Type) 
Instance details

Defined in Fcf.Data.Common

type Eval (IsLeft ('Left _a :: Either a b) :: Bool -> Type) = 'True
type Eval (IsLeft ('Right _a :: Either a b) :: Bool -> Type) 
Instance details

Defined in Fcf.Data.Common

type Eval (IsLeft ('Right _a :: Either a b) :: Bool -> Type) = 'False
type Eval (IsRight ('Left _a :: Either a b) :: Bool -> Type) 
Instance details

Defined in Fcf.Data.Common

type Eval (IsRight ('Left _a :: Either a b) :: Bool -> Type) = 'False
type Eval (IsRight ('Right _a :: Either a b) :: Bool -> Type) 
Instance details

Defined in Fcf.Data.Common

type Eval (IsRight ('Right _a :: Either a b) :: Bool -> Type) = 'True
type Eval (Elem a2 as :: Bool -> Type) 
Instance details

Defined in Fcf.Data.List

type Eval (Elem a2 as :: Bool -> Type) = Eval ((IsJust :: Maybe Nat -> Bool -> Type) =<< FindIndex (TyEq a2 :: a1 -> Bool -> Type) as)
type Eval (IsInfixOf xs ys :: Bool -> Type) 
Instance details

Defined in Fcf.Data.List

type Eval (IsInfixOf xs ys :: Bool -> Type) = Eval ((Any (IsPrefixOf xs) :: [[a]] -> Bool -> Type) =<< Tails ys)
type Eval (IsPrefixOf xs ys :: Bool -> Type) 
Instance details

Defined in Fcf.Data.List

type Eval (IsPrefixOf xs ys :: Bool -> Type) = IsPrefixOf_ xs ys
type Eval (IsSuffixOf xs ys :: Bool -> Type) 
Instance details

Defined in Fcf.Data.List

type Eval (IsSuffixOf xs ys :: Bool -> Type) = Eval (IsPrefixOf ((Reverse :: [a] -> [a] -> Type) @@ xs) ((Reverse :: [a] -> [a] -> Type) @@ ys))
type Eval (All p lst :: Bool -> Type) 
Instance details

Defined in Fcf.Class.Foldable

type Eval (All p lst :: Bool -> Type) = Eval (Foldr (Bicomap p (Pure :: Bool -> Bool -> Type) (&&)) 'True lst)
type Eval (Any p lst :: Bool -> Type) 
Instance details

Defined in Fcf.Class.Foldable

type Eval (Any p lst :: Bool -> Type) = Eval (Foldr (Bicomap p (Pure :: Bool -> Bool -> Type) (||)) 'False lst)
type Eval (TyEq a b :: Bool -> Type) 
Instance details

Defined in Fcf.Utils

type Eval (TyEq a b :: Bool -> Type) = TyEqImpl a b

data Char #

The character type Char represents Unicode codespace and its elements are code points as in definitions D9 and D10 of the Unicode Standard.

Character literals in Haskell are single-quoted: 'Q', 'Я' or 'Ω'. To represent a single quote itself use '\'', and to represent a backslash use '\\'. The full grammar can be found in the section 2.6 of the Haskell 2010 Language Report.

To specify a character by its code point one can use decimal, hexadecimal or octal notation: '\65', '\x41' and '\o101' are all alternative forms of 'A'. The largest code point is '\x10ffff'.

There is a special escape syntax for ASCII control characters:

EscapeAlternativesMeaning
'\NUL''\0'null character
'\SOH''\1'start of heading
'\STX''\2'start of text
'\ETX''\3'end of text
'\EOT''\4'end of transmission
'\ENQ''\5'enquiry
'\ACK''\6'acknowledge
'\BEL''\7', '\a'bell (alert)
'\BS''\8', '\b'backspace
'\HT''\9', '\t'horizontal tab
'\LF''\10', '\n'line feed (new line)
'\VT''\11', '\v'vertical tab
'\FF''\12', '\f'form feed
'\CR''\13', '\r'carriage return
'\SO''\14'shift out
'\SI''\15'shift in
'\DLE''\16'data link escape
'\DC1''\17'device control 1
'\DC2''\18'device control 2
'\DC3''\19'device control 3
'\DC4''\20'device control 4
'\NAK''\21'negative acknowledge
'\SYN''\22'synchronous idle
'\ETB''\23'end of transmission block
'\CAN''\24'cancel
'\EM''\25'end of medium
'\SUB''\26'substitute
'\ESC''\27'escape
'\FS''\28'file separator
'\GS''\29'group separator
'\RS''\30'record separator
'\US''\31'unit separator
'\SP''\32', ' 'space
'\DEL''\127'delete

Data.Char provides utilities to work with Char.

Instances

Instances details
FromJSON Char 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Char 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Char 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Char 
Instance details

Defined in Data.Aeson.Types.ToJSON

IsChar Char

Since: base-2.1

Instance details

Defined in Text.Printf

Methods

toChar :: Char -> Char #

fromChar :: Char -> Char #

PrintfArg Char

Since: base-2.1

Instance details

Defined in Text.Printf

Subtractive Char 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Char 
Instance details

Defined in Basement.Numerical.Subtractive

Methods

(-) :: Char -> Char -> Difference Char #

PrimMemoryComparable Char 
Instance details

Defined in Basement.PrimType

PrimType Char 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Char 
Instance details

Defined in Basement.PrimType

type PrimSize Char = 4
NFData Char 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Char -> () #

Buildable Char 
Instance details

Defined in Formatting.Buildable

Methods

build :: Char -> Builder #

ToJExpr Char 
Instance details

Defined in GHC.JS.Make

Data Char

@since base-4.0.0.0

Instance details

Defined in GHC.Internal.Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Char -> c Char #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Char #

toConstr :: Char -> Constr #

dataTypeOf :: Char -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Char) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Char) #

gmapT :: (forall b. Data b => b -> b) -> Char -> Char #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Char -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Char -> r #

gmapQ :: (forall d. Data d => d -> u) -> Char -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Char -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Char -> m Char #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Char -> m Char #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Char -> m Char #

Bounded Char

@since base-2.01

Instance details

Defined in GHC.Internal.Enum

Enum Char

@since base-2.01

Instance details

Defined in GHC.Internal.Enum

Methods

succ :: Char -> Char #

pred :: Char -> Char #

toEnum :: Int -> Char #

fromEnum :: Char -> Int #

enumFrom :: Char -> [Char] #

enumFromThen :: Char -> Char -> [Char] #

enumFromTo :: Char -> Char -> [Char] #

enumFromThenTo :: Char -> Char -> Char -> [Char] #

Read Char

@since base-2.01

Instance details

Defined in GHC.Internal.Read

Show Char

@since base-2.01

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> Char -> ShowS #

show :: Char -> String #

showList :: [Char] -> ShowS #

Eq Char 
Instance details

Defined in GHC.Classes

Methods

(==) :: Char -> Char -> Bool #

(/=) :: Char -> Char -> Bool #

Ord Char 
Instance details

Defined in GHC.Classes

Methods

compare :: Char -> Char -> Ordering #

(<) :: Char -> Char -> Bool #

(<=) :: Char -> Char -> Bool #

(>) :: Char -> Char -> Bool #

(>=) :: Char -> Char -> Bool #

max :: Char -> Char -> Char #

min :: Char -> Char -> Char #

Hashable Char 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Char -> Int #

hash :: Char -> Int #

HpcHash Char 
Instance details

Defined in Trace.Hpc.Util

Methods

toHash :: Char -> Hash #

FromFormKey String 
Instance details

Defined in Web.Internal.FormUrlEncoded

FromFormKey Char 
Instance details

Defined in Web.Internal.FormUrlEncoded

ToFormKey String 
Instance details

Defined in Web.Internal.FormUrlEncoded

Methods

toFormKey :: String -> Text #

ToFormKey Char 
Instance details

Defined in Web.Internal.FormUrlEncoded

Methods

toFormKey :: Char -> Text #

IsText String 
Instance details

Defined in Data.Text.Lens

AsJSON String 
Instance details

Defined in Data.Aeson.Lens

Methods

_JSON :: (FromJSON a, ToJSON b) => Prism String String a b #

AsNumber String 
Instance details

Defined in Data.Aeson.Lens

AsValue String 
Instance details

Defined in Data.Aeson.Lens

IsKey String 
Instance details

Defined in Data.Aeson.Lens

Methods

_Key :: Iso' String Key #

TraversableStream String 
Instance details

Defined in Text.Megaparsec.Stream

VisualStream String 
Instance details

Defined in Text.Megaparsec.Stream

IsRef String 
Instance details

Defined in Napkin.Types.Core

Methods

ref :: forall {k} (b :: k). String -> Ref b #

Val String 
Instance details

Defined in Napkin.Types.Core

Methods

val :: Prism' Value String #

Pretty Char

Instead of (pretty 'n'), consider using line as a more readable alternative.

>>> pretty 'f' <> pretty 'o' <> pretty 'o'
foo
>>> pretty ("string" :: String)
string
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Char -> Doc ann #

prettyList :: [Char] -> Doc ann #

Uniform Char 
Instance details

Defined in System.Random.Internal

Methods

uniformM :: StatefulGen g m => g -> m Char #

UniformRange Char 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Char, Char) -> g -> m Char #

ToLText String 
Instance details

Defined in Relude.String.Conversion

Methods

toLText :: String -> LText #

ToString String 
Instance details

Defined in Relude.String.Conversion

Methods

toString :: String -> String #

ToText String 
Instance details

Defined in Relude.String.Conversion

Methods

toText :: String -> Text #

Unbox Char 
Instance details

Defined in Data.Vector.Unboxed.Base

IArray UArray Char 
Instance details

Defined in Data.Array.Base

Methods

bounds :: Ix i => UArray i Char -> (i, i) #

numElements :: Ix i => UArray i Char -> Int #

unsafeArray :: Ix i => (i, i) -> [(Int, Char)] -> UArray i Char #

unsafeAt :: Ix i => UArray i Char -> Int -> Char #

unsafeReplace :: Ix i => UArray i Char -> [(Int, Char)] -> UArray i Char #

unsafeAccum :: Ix i => (Char -> e' -> Char) -> UArray i Char -> [(Int, e')] -> UArray i Char #

unsafeAccumArray :: Ix i => (Char -> e' -> Char) -> Char -> (i, i) -> [(Int, e')] -> UArray i Char #

ConvertUtf8 String ByteString 
Instance details

Defined in Relude.String.Conversion

ConvertUtf8 String ShortByteString

Since: relude-0.6.0.0

Instance details

Defined in Relude.String.Conversion

ConvertUtf8 String LByteString

Converting String to ByteString might be a slow operation. Consider using lazy bytestring at first place.

Instance details

Defined in Relude.String.Conversion

StringConv ByteString String 
Instance details

Defined in Data.String.Conv

StringConv ByteString String 
Instance details

Defined in Data.String.Conv

StringConv Text String 
Instance details

Defined in Data.String.Conv

Methods

strConv :: Leniency -> Text -> String #

StringConv Text String 
Instance details

Defined in Data.String.Conv

Methods

strConv :: Leniency -> Text -> String #

StringConv String ByteString 
Instance details

Defined in Data.String.Conv

StringConv String ByteString 
Instance details

Defined in Data.String.Conv

StringConv String Text 
Instance details

Defined in Data.String.Conv

Methods

strConv :: Leniency -> String -> Text #

StringConv String Text 
Instance details

Defined in Data.String.Conv

Methods

strConv :: Leniency -> String -> Text #

StringConv String String 
Instance details

Defined in Data.String.Conv

Methods

strConv :: Leniency -> String -> String #

Lift Char 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Char -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Char -> Code m Char #

Vector Vector Char 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Char 
Instance details

Defined in Data.Vector.Unboxed.Base

KnownSymbol n => Reifies (n :: Symbol) String 
Instance details

Defined in Data.Reflection

Methods

reflect :: proxy n -> String #

MimeRender PlainText String
BC.pack
Instance details

Defined in Servant.API.ContentTypes

MimeUnrender PlainText String
Right . BC.unpack
Instance details

Defined in Servant.API.ContentTypes

Cons Text Text Char Char 
Instance details

Defined in Control.Lens.Cons

Methods

_Cons :: Prism Text Text (Char, Text) (Char, Text) #

Cons Text Text Char Char 
Instance details

Defined in Control.Lens.Cons

Methods

_Cons :: Prism Text Text (Char, Text) (Char, Text) #

Snoc Text Text Char Char 
Instance details

Defined in Control.Lens.Cons

Methods

_Snoc :: Prism Text Text (Text, Char) (Text, Char) #

Snoc Text Text Char Char 
Instance details

Defined in Control.Lens.Cons

Methods

_Snoc :: Prism Text Text (Text, Char) (Text, Char) #

Selector s => GFromForm (t :: k) (M1 S s (K1 i String :: Type -> Type)) 
Instance details

Defined in Web.Internal.FormUrlEncoded

Methods

gFromForm :: Proxy t -> FormOptions -> Form -> Either Text (M1 S s (K1 i String :: Type -> Type) x) #

Selector s => GToForm (t :: k) (M1 S s (K1 i String :: Type -> Type)) 
Instance details

Defined in Web.Internal.FormUrlEncoded

Methods

gToForm :: Proxy t -> FormOptions -> M1 S s (K1 i String :: Type -> Type) x -> Form #

Generic1 (URec Char :: k -> Type) 
Instance details

Defined in GHC.Internal.Generics

Associated Types

type Rep1 (URec Char :: k -> Type)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

type Rep1 (URec Char :: k -> Type) = D1 ('MetaData "URec" "GHC.Internal.Generics" "ghc-internal" 'False) (C1 ('MetaCons "UChar" 'PrefixI 'True) (S1 ('MetaSel ('Just "uChar#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UChar :: k -> Type)))

Methods

from1 :: forall (a :: k). URec Char a -> Rep1 (URec Char :: k -> Type) a #

to1 :: forall (a :: k). Rep1 (URec Char :: k -> Type) a -> URec Char a #

Buildable' [Char] 
Instance details

Defined in Fmt.Internal.Generic

Methods

build' :: [Char] -> Builder #

Buildable [Char] 
Instance details

Defined in Formatting.Buildable

Methods

build :: [Char] -> Builder #

Foldable (UChar :: Type -> Type)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Foldable

Methods

fold :: Monoid m => UChar m -> m #

foldMap :: Monoid m => (a -> m) -> UChar a -> m #

foldMap' :: Monoid m => (a -> m) -> UChar a -> m #

foldr :: (a -> b -> b) -> b -> UChar a -> b #

foldr' :: (a -> b -> b) -> b -> UChar a -> b #

foldl :: (b -> a -> b) -> b -> UChar a -> b #

foldl' :: (b -> a -> b) -> b -> UChar a -> b #

foldr1 :: (a -> a -> a) -> UChar a -> a #

foldl1 :: (a -> a -> a) -> UChar a -> a #

toList :: UChar a -> [a] #

null :: UChar a -> Bool #

length :: UChar a -> Int #

elem :: Eq a => a -> UChar a -> Bool #

maximum :: Ord a => UChar a -> a #

minimum :: Ord a => UChar a -> a #

sum :: Num a => UChar a -> a #

product :: Num a => UChar a -> a #

Traversable (UChar :: Type -> Type)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> UChar a -> f (UChar b) #

sequenceA :: Applicative f => UChar (f a) -> f (UChar a) #

mapM :: Monad m => (a -> m b) -> UChar a -> m (UChar b) #

sequence :: Monad m => UChar (m a) -> m (UChar a) #

MArray (STUArray s) Char (ST s) 
Instance details

Defined in Data.Array.Base

Methods

getBounds :: Ix i => STUArray s i Char -> ST s (i, i) #

getNumElements :: Ix i => STUArray s i Char -> ST s Int #

newArray :: Ix i => (i, i) -> Char -> ST s (STUArray s i Char) #

newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Char) #

unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Char) #

unsafeRead :: Ix i => STUArray s i Char -> Int -> ST s Char #

unsafeWrite :: Ix i => STUArray s i Char -> Int -> Char -> ST s () #

ToJExpr a => ToJExpr (Map String a) 
Instance details

Defined in GHC.JS.Make

Functor (URec Char :: Type -> Type)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

fmap :: (a -> b) -> URec Char a -> URec Char b #

(<$) :: a -> URec Char b -> URec Char a #

Generic (URec Char p) 
Instance details

Defined in GHC.Internal.Generics

Associated Types

type Rep (URec Char p)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

type Rep (URec Char p) = D1 ('MetaData "URec" "GHC.Internal.Generics" "ghc-internal" 'False) (C1 ('MetaCons "UChar" 'PrefixI 'True) (S1 ('MetaSel ('Just "uChar#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UChar :: Type -> Type)))

Methods

from :: URec Char p -> Rep (URec Char p) x #

to :: Rep (URec Char p) x -> URec Char p #

Show (URec Char p)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

showsPrec :: Int -> URec Char p -> ShowS #

show :: URec Char p -> String #

showList :: [URec Char p] -> ShowS #

Eq (URec Char p)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

(==) :: URec Char p -> URec Char p -> Bool #

(/=) :: URec Char p -> URec Char p -> Bool #

Ord (URec Char p)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

compare :: URec Char p -> URec Char p -> Ordering #

(<) :: URec Char p -> URec Char p -> Bool #

(<=) :: URec Char p -> URec Char p -> Bool #

(>) :: URec Char p -> URec Char p -> Bool #

(>=) :: URec Char p -> URec Char p -> Bool #

max :: URec Char p -> URec Char p -> URec Char p #

min :: URec Char p -> URec Char p -> URec Char p #

type NatNumMaxBound Char 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Char = 1114111
type Difference Char 
Instance details

Defined in Basement.Numerical.Subtractive

type PrimSize Char 
Instance details

Defined in Basement.PrimType

type PrimSize Char = 4
newtype Vector Char 
Instance details

Defined in Data.Vector.Unboxed.Base

data URec Char (p :: k)

Used for marking occurrences of Char#

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

data URec Char (p :: k) = UChar {}
newtype MVector s Char 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Char = MV_Char (MVector s Char)
type Compare (a :: Char) (b :: Char) 
Instance details

Defined in GHC.Internal.Data.Type.Ord

type Compare (a :: Char) (b :: Char) = CmpChar a b
type Rep1 (URec Char :: k -> Type)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

type Rep1 (URec Char :: k -> Type) = D1 ('MetaData "URec" "GHC.Internal.Generics" "ghc-internal" 'False) (C1 ('MetaCons "UChar" 'PrefixI 'True) (S1 ('MetaSel ('Just "uChar#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UChar :: k -> Type)))
type Rep (URec Char p)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

type Rep (URec Char p) = D1 ('MetaData "URec" "GHC.Internal.Generics" "ghc-internal" 'False) (C1 ('MetaCons "UChar" 'PrefixI 'True) (S1 ('MetaSel ('Just "uChar#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UChar :: Type -> Type)))

data Double #

Double-precision floating point numbers. It is desirable that this type be at least equal in range and precision to the IEEE double-precision type.

Instances

Instances details
FromJSON Double 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Double 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Double 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Double 
Instance details

Defined in Data.Aeson.Types.ToJSON

PrintfArg Double

Since: base-2.1

Instance details

Defined in Text.Printf

Subtractive Double 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Double 
Instance details

Defined in Basement.Numerical.Subtractive

PrimType Double 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Double 
Instance details

Defined in Basement.PrimType

type PrimSize Double = 8
Default Double 
Instance details

Defined in Data.Default.Class

Methods

def :: Double #

NFData Double 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Double -> () #

Buildable Double 
Instance details

Defined in Formatting.Buildable

Methods

build :: Double -> Builder #

ToJExpr Double 
Instance details

Defined in GHC.JS.Make

Outputable Double 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Double -> SDoc #

Data Double

@since base-4.0.0.0

Instance details

Defined in GHC.Internal.Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Double -> c Double #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Double #

toConstr :: Double -> Constr #

dataTypeOf :: Double -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Double) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Double) #

gmapT :: (forall b. Data b => b -> b) -> Double -> Double #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Double -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Double -> r #

gmapQ :: (forall d. Data d => d -> u) -> Double -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Double -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Double -> m Double #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Double -> m Double #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Double -> m Double #

Floating Double

@since base-2.01

Instance details

Defined in GHC.Internal.Float

RealFloat Double

@since base-2.01

Instance details

Defined in GHC.Internal.Float

Read Double

@since base-2.01

Instance details

Defined in GHC.Internal.Read

Eq Double

Note that due to the presence of NaN, Double's Eq instance does not satisfy reflexivity.

>>> 0/0 == (0/0 :: Double)
False

Also note that Double's Eq instance does not satisfy substitutivity:

>>> 0 == (-0 :: Double)
True
>>> recip 0 == recip (-0 :: Double)
False
Instance details

Defined in GHC.Classes

Methods

(==) :: Double -> Double -> Bool #

(/=) :: Double -> Double -> Bool #

Ord Double

IEEE 754 Double-precision type includes not only numbers, but also positive and negative infinities and a special element called NaN (which can be quiet or signal).

IEEE 754-2008, section 5.11 requires that if at least one of arguments of <=, <, >, >= is NaN then the result of the comparison is False, and instance Ord Double complies with this requirement. This violates the reflexivity: both NaN <= NaN and NaN >= NaN are False.

IEEE 754-2008, section 5.10 defines totalOrder predicate. Unfortunately, compare on Doubles violates the IEEE standard and does not define a total order. More specifically, both compare NaN x and compare x NaN always return GT.

Thus, users must be extremely cautious when using instance Ord Double. For instance, one should avoid ordered containers with keys represented by Double, because data loss and corruption may happen. An IEEE-compliant compare is available in fp-ieee package as TotallyOrdered newtype.

Moving further, the behaviour of min and max with regards to NaN is also non-compliant. IEEE 754-2008, section 5.3.1 defines that quiet NaN should be treated as a missing data by minNum and maxNum functions, for example, minNum(NaN, 1) = minNum(1, NaN) = 1. Some languages such as Java deviate from the standard implementing minNum(NaN, 1) = minNum(1, NaN) = NaN. However, min / max in base are even worse: min NaN 1 is 1, but min 1 NaN is NaN.

IEEE 754-2008 compliant min / max can be found in ieee754 package under minNum / maxNum names. Implementations compliant with minimumNumber / maximumNumber from a newer IEEE 754-2019, section 9.6 are available from fp-ieee package.

Instance details

Defined in GHC.Classes

Hashable Double

Note: prior to hashable-1.3.0.0, hash 0.0 /= hash (-0.0)

The hash of NaN is not well defined.

Since: hashable-1.3.0.0

Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Double -> Int #

hash :: Double -> Int #

FromFormKey Double 
Instance details

Defined in Web.Internal.FormUrlEncoded

ToFormKey Double 
Instance details

Defined in Web.Internal.FormUrlEncoded

Methods

toFormKey :: Double -> Text #

Val Double

Auto-convert from VInt and VText

Instance details

Defined in Napkin.Types.Core

Methods

val :: Prism' Value Double #

ToSql Double

Corresponds to FLOAT type of SQL Server.

Instance details

Defined in Database.ODBC.SQLServer

Methods

toSql :: Double -> Query #

Pretty Double
>>> pretty (exp 1 :: Double)
2.71828182845904...
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Double -> Doc ann #

prettyList :: [Double] -> Doc ann #

UniformRange Double

See Floating point number caveats.

Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Double, Double) -> g -> m Double #

Unbox Double 
Instance details

Defined in Data.Vector.Unboxed.Base

IArray UArray Double 
Instance details

Defined in Data.Array.Base

Methods

bounds :: Ix i => UArray i Double -> (i, i) #

numElements :: Ix i => UArray i Double -> Int #

unsafeArray :: Ix i => (i, i) -> [(Int, Double)] -> UArray i Double #

unsafeAt :: Ix i => UArray i Double -> Int -> Double #

unsafeReplace :: Ix i => UArray i Double -> [(Int, Double)] -> UArray i Double #

unsafeAccum :: Ix i => (Double -> e' -> Double) -> UArray i Double -> [(Int, e')] -> UArray i Double #

unsafeAccumArray :: Ix i => (Double -> e' -> Double) -> Double -> (i, i) -> [(Int, e')] -> UArray i Double #

Lift Double 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Double -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Double -> Code m Double #

Vector Vector Double 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Double 
Instance details

Defined in Data.Vector.Unboxed.Base

Generic1 (URec Double :: k -> Type) 
Instance details

Defined in GHC.Internal.Generics

Associated Types

type Rep1 (URec Double :: k -> Type)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

type Rep1 (URec Double :: k -> Type) = D1 ('MetaData "URec" "GHC.Internal.Generics" "ghc-internal" 'False) (C1 ('MetaCons "UDouble" 'PrefixI 'True) (S1 ('MetaSel ('Just "uDouble#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UDouble :: k -> Type)))

Methods

from1 :: forall (a :: k). URec Double a -> Rep1 (URec Double :: k -> Type) a #

to1 :: forall (a :: k). Rep1 (URec Double :: k -> Type) a -> URec Double a #

Foldable (UDouble :: Type -> Type)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Foldable

Methods

fold :: Monoid m => UDouble m -> m #

foldMap :: Monoid m => (a -> m) -> UDouble a -> m #

foldMap' :: Monoid m => (a -> m) -> UDouble a -> m #

foldr :: (a -> b -> b) -> b -> UDouble a -> b #

foldr' :: (a -> b -> b) -> b -> UDouble a -> b #

foldl :: (b -> a -> b) -> b -> UDouble a -> b #

foldl' :: (b -> a -> b) -> b -> UDouble a -> b #

foldr1 :: (a -> a -> a) -> UDouble a -> a #

foldl1 :: (a -> a -> a) -> UDouble a -> a #

toList :: UDouble a -> [a] #

null :: UDouble a -> Bool #

length :: UDouble a -> Int #

elem :: Eq a => a -> UDouble a -> Bool #

maximum :: Ord a => UDouble a -> a #

minimum :: Ord a => UDouble a -> a #

sum :: Num a => UDouble a -> a #

product :: Num a => UDouble a -> a #

Traversable (UDouble :: Type -> Type)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> UDouble a -> f (UDouble b) #

sequenceA :: Applicative f => UDouble (f a) -> f (UDouble a) #

mapM :: Monad m => (a -> m b) -> UDouble a -> m (UDouble b) #

sequence :: Monad m => UDouble (m a) -> m (UDouble a) #

MArray (STUArray s) Double (ST s) 
Instance details

Defined in Data.Array.Base

Methods

getBounds :: Ix i => STUArray s i Double -> ST s (i, i) #

getNumElements :: Ix i => STUArray s i Double -> ST s Int #

newArray :: Ix i => (i, i) -> Double -> ST s (STUArray s i Double) #

newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Double) #

unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Double) #

unsafeRead :: Ix i => STUArray s i Double -> Int -> ST s Double #

unsafeWrite :: Ix i => STUArray s i Double -> Int -> Double -> ST s () #

Functor (URec Double :: Type -> Type)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

fmap :: (a -> b) -> URec Double a -> URec Double b #

(<$) :: a -> URec Double b -> URec Double a #

Generic (URec Double p) 
Instance details

Defined in GHC.Internal.Generics

Associated Types

type Rep (URec Double p)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

type Rep (URec Double p) = D1 ('MetaData "URec" "GHC.Internal.Generics" "ghc-internal" 'False) (C1 ('MetaCons "UDouble" 'PrefixI 'True) (S1 ('MetaSel ('Just "uDouble#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UDouble :: Type -> Type)))

Methods

from :: URec Double p -> Rep (URec Double p) x #

to :: Rep (URec Double p) x -> URec Double p #

Show (URec Double p)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

showsPrec :: Int -> URec Double p -> ShowS #

show :: URec Double p -> String #

showList :: [URec Double p] -> ShowS #

Eq (URec Double p)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

(==) :: URec Double p -> URec Double p -> Bool #

(/=) :: URec Double p -> URec Double p -> Bool #

Ord (URec Double p)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

compare :: URec Double p -> URec Double p -> Ordering #

(<) :: URec Double p -> URec Double p -> Bool #

(<=) :: URec Double p -> URec Double p -> Bool #

(>) :: URec Double p -> URec Double p -> Bool #

(>=) :: URec Double p -> URec Double p -> Bool #

max :: URec Double p -> URec Double p -> URec Double p #

min :: URec Double p -> URec Double p -> URec Double p #

type Difference Double 
Instance details

Defined in Basement.Numerical.Subtractive

type PrimSize Double 
Instance details

Defined in Basement.PrimType

type PrimSize Double = 8
type ForeignFloating Double 
Instance details

Defined in Data.Double.Conversion.Internal.FFI

type ForeignFloating Double = CDouble
newtype Vector Double 
Instance details

Defined in Data.Vector.Unboxed.Base

data URec Double (p :: k)

Used for marking occurrences of Double#

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

data URec Double (p :: k) = UDouble {}
newtype MVector s Double 
Instance details

Defined in Data.Vector.Unboxed.Base

type Rep1 (URec Double :: k -> Type)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

type Rep1 (URec Double :: k -> Type) = D1 ('MetaData "URec" "GHC.Internal.Generics" "ghc-internal" 'False) (C1 ('MetaCons "UDouble" 'PrefixI 'True) (S1 ('MetaSel ('Just "uDouble#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UDouble :: k -> Type)))
type Rep (URec Double p)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

type Rep (URec Double p) = D1 ('MetaData "URec" "GHC.Internal.Generics" "ghc-internal" 'False) (C1 ('MetaCons "UDouble" 'PrefixI 'True) (S1 ('MetaSel ('Just "uDouble#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UDouble :: Type -> Type)))

data Int #

A fixed-precision integer type with at least the range [-2^29 .. 2^29-1]. The exact range for a given implementation can be determined by using minBound and maxBound from the Bounded class.

Instances

Instances details
FromJSON Int 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Int 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Int 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Int 
Instance details

Defined in Data.Aeson.Types.ToJSON

PrintfArg Int

Since: base-2.1

Instance details

Defined in Text.Printf

Subtractive Int 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Int 
Instance details

Defined in Basement.Numerical.Subtractive

Methods

(-) :: Int -> Int -> Difference Int #

PrimMemoryComparable Int 
Instance details

Defined in Basement.PrimType

PrimType Int 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Int 
Instance details

Defined in Basement.PrimType

type PrimSize Int = 8
Default Int 
Instance details

Defined in Data.Default.Class

Methods

def :: Int #

NFData Int 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int -> () #

Buildable Int 
Instance details

Defined in Formatting.Buildable

Methods

build :: Int -> Builder #

ToJExpr Int 
Instance details

Defined in GHC.JS.Make

Outputable Int 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Int -> SDoc #

Bits Int

@since base-2.01

Instance details

Defined in GHC.Internal.Bits

Methods

(.&.) :: Int -> Int -> Int #

(.|.) :: Int -> Int -> Int #

xor :: Int -> Int -> Int #

complement :: Int -> Int #

shift :: Int -> Int -> Int #

rotate :: Int -> Int -> Int #

zeroBits :: Int #

bit :: Int -> Int #

setBit :: Int -> Int -> Int #

clearBit :: Int -> Int -> Int #

complementBit :: Int -> Int -> Int #

testBit :: Int -> Int -> Bool #

bitSizeMaybe :: Int -> Maybe Int #

bitSize :: Int -> Int #

isSigned :: Int -> Bool #

shiftL :: Int -> Int -> Int #

unsafeShiftL :: Int -> Int -> Int #

shiftR :: Int -> Int -> Int #

unsafeShiftR :: Int -> Int -> Int #

rotateL :: Int -> Int -> Int #

rotateR :: Int -> Int -> Int #

popCount :: Int -> Int #

FiniteBits Int

@since base-4.6.0.0

Instance details

Defined in GHC.Internal.Bits

Data Int

@since base-4.0.0.0

Instance details

Defined in GHC.Internal.Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Int -> c Int #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Int #

toConstr :: Int -> Constr #

dataTypeOf :: Int -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Int) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Int) #

gmapT :: (forall b. Data b => b -> b) -> Int -> Int #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Int -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Int -> r #

gmapQ :: (forall d. Data d => d -> u) -> Int -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Int -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Int -> m Int #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Int -> m Int #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Int -> m Int #

Bounded Int

@since base-2.01

Instance details

Defined in GHC.Internal.Enum

Methods

minBound :: Int #

maxBound :: Int #

Enum Int

@since base-2.01

Instance details

Defined in GHC.Internal.Enum

Methods

succ :: Int -> Int #

pred :: Int -> Int #

toEnum :: Int -> Int #

fromEnum :: Int -> Int #

enumFrom :: Int -> [Int] #

enumFromThen :: Int -> Int -> [Int] #

enumFromTo :: Int -> Int -> [Int] #

enumFromThenTo :: Int -> Int -> Int -> [Int] #

Num Int

@since base-2.01

Instance details

Defined in GHC.Internal.Num

Methods

(+) :: Int -> Int -> Int #

(-) :: Int -> Int -> Int #

(*) :: Int -> Int -> Int #

negate :: Int -> Int #

abs :: Int -> Int #

signum :: Int -> Int #

fromInteger :: Integer -> Int #

Read Int

@since base-2.01

Instance details

Defined in GHC.Internal.Read

Integral Int

@since base-2.0.1

Instance details

Defined in GHC.Internal.Real

Methods

quot :: Int -> Int -> Int #

rem :: Int -> Int -> Int #

div :: Int -> Int -> Int #

mod :: Int -> Int -> Int #

quotRem :: Int -> Int -> (Int, Int) #

divMod :: Int -> Int -> (Int, Int) #

toInteger :: Int -> Integer #

Real Int

@since base-2.0.1

Instance details

Defined in GHC.Internal.Real

Methods

toRational :: Int -> Rational #

Show Int

@since base-2.01

Instance details

Defined in GHC.Internal.Show

Methods

showsPrec :: Int -> Int -> ShowS #

show :: Int -> String #

showList :: [Int] -> ShowS #

Eq Int 
Instance details

Defined in GHC.Classes

Methods

(==) :: Int -> Int -> Bool #

(/=) :: Int -> Int -> Bool #

Ord Int 
Instance details

Defined in GHC.Classes

Methods

compare :: Int -> Int -> Ordering #

(<) :: Int -> Int -> Bool #

(<=) :: Int -> Int -> Bool #

(>) :: Int -> Int -> Bool #

(>=) :: Int -> Int -> Bool #

max :: Int -> Int -> Int #

min :: Int -> Int -> Int #

Hashable Int 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int -> Int #

hash :: Int -> Int #

HpcHash Int 
Instance details

Defined in Trace.Hpc.Util

Methods

toHash :: Int -> Hash #

FromFormKey Int 
Instance details

Defined in Web.Internal.FormUrlEncoded

ToFormKey Int 
Instance details

Defined in Web.Internal.FormUrlEncoded

Methods

toFormKey :: Int -> Text #

Val Int 
Instance details

Defined in Napkin.Types.Core

Methods

val :: Prism' Value Int #

ToSql Int

Corresponds to BIGINT type of SQL Server.

Instance details

Defined in Database.ODBC.SQLServer

Methods

toSql :: Int -> Query #

Pretty Int
>>> pretty (123 :: Int)
123
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Int -> Doc ann #

prettyList :: [Int] -> Doc ann #

Uniform Int 
Instance details

Defined in System.Random.Internal

Methods

uniformM :: StatefulGen g m => g -> m Int #

UniformRange Int 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Int, Int) -> g -> m Int #

ByteSource Int 
Instance details

Defined in Data.UUID.Types.Internal.Builder

Methods

(/-/) :: ByteSink Int g -> Int -> g

Unbox Int 
Instance details

Defined in Data.Vector.Unboxed.Base

IArray UArray Int 
Instance details

Defined in Data.Array.Base

Methods

bounds :: Ix i => UArray i Int -> (i, i) #

numElements :: Ix i => UArray i Int -> Int #

unsafeArray :: Ix i => (i, i) -> [(Int, Int)] -> UArray i Int #

unsafeAt :: Ix i => UArray i Int -> Int -> Int #

unsafeReplace :: Ix i => UArray i Int -> [(Int, Int)] -> UArray i Int #

unsafeAccum :: Ix i => (Int -> e' -> Int) -> UArray i Int -> [(Int, e')] -> UArray i Int #

unsafeAccumArray :: Ix i => (Int -> e' -> Int) -> Int -> (i, i) -> [(Int, e')] -> UArray i Int #

Foldable1WithIndex Int NonEmpty 
Instance details

Defined in WithIndex

Methods

ifoldMap1 :: Semigroup m => (Int -> a -> m) -> NonEmpty a -> m #

ifoldMap1' :: Semigroup m => (Int -> a -> m) -> NonEmpty a -> m #

ifoldrMap1 :: (Int -> a -> b) -> (Int -> a -> b -> b) -> NonEmpty a -> b #

ifoldlMap1' :: (Int -> a -> b) -> (Int -> b -> a -> b) -> NonEmpty a -> b #

ifoldlMap1 :: (Int -> a -> b) -> (Int -> b -> a -> b) -> NonEmpty a -> b #

ifoldrMap1' :: (Int -> a -> b) -> (Int -> a -> b -> b) -> NonEmpty a -> b #

FoldableWithIndex Int IntMap 
Instance details

Defined in WithIndex

Methods

ifoldMap :: Monoid m => (Int -> a -> m) -> IntMap a -> m #

ifoldMap' :: Monoid m => (Int -> a -> m) -> IntMap a -> m #

ifoldr :: (Int -> a -> b -> b) -> b -> IntMap a -> b #

ifoldl :: (Int -> b -> a -> b) -> b -> IntMap a -> b #

ifoldr' :: (Int -> a -> b -> b) -> b -> IntMap a -> b #

ifoldl' :: (Int -> b -> a -> b) -> b -> IntMap a -> b #

FoldableWithIndex Int Seq 
Instance details

Defined in WithIndex

Methods

ifoldMap :: Monoid m => (Int -> a -> m) -> Seq a -> m #

ifoldMap' :: Monoid m => (Int -> a -> m) -> Seq a -> m #

ifoldr :: (Int -> a -> b -> b) -> b -> Seq a -> b #

ifoldl :: (Int -> b -> a -> b) -> b -> Seq a -> b #

ifoldr' :: (Int -> a -> b -> b) -> b -> Seq a -> b #

ifoldl' :: (Int -> b -> a -> b) -> b -> Seq a -> b #

FoldableWithIndex Int NonEmpty 
Instance details

Defined in WithIndex

Methods

ifoldMap :: Monoid m => (Int -> a -> m) -> NonEmpty a -> m #

ifoldMap' :: Monoid m => (Int -> a -> m) -> NonEmpty a -> m #

ifoldr :: (Int -> a -> b -> b) -> b -> NonEmpty a -> b #

ifoldl :: (Int -> b -> a -> b) -> b -> NonEmpty a -> b #

ifoldr' :: (Int -> a -> b -> b) -> b -> NonEmpty a -> b #

ifoldl' :: (Int -> b -> a -> b) -> b -> NonEmpty a -> b #

FoldableWithIndex Int ZipList 
Instance details

Defined in WithIndex

Methods

ifoldMap :: Monoid m => (Int -> a -> m) -> ZipList a -> m #

ifoldMap' :: Monoid m => (Int -> a -> m) -> ZipList a -> m #

ifoldr :: (Int -> a -> b -> b) -> b -> ZipList a -> b #

ifoldl :: (Int -> b -> a -> b) -> b -> ZipList a -> b #

ifoldr' :: (Int -> a -> b -> b) -> b -> ZipList a -> b #

ifoldl' :: (Int -> b -> a -> b) -> b -> ZipList a -> b #

FoldableWithIndex Int Deque 
Instance details

Defined in Control.Lens.Internal.Deque

Methods

ifoldMap :: Monoid m => (Int -> a -> m) -> Deque a -> m #

ifoldMap' :: Monoid m => (Int -> a -> m) -> Deque a -> m #

ifoldr :: (Int -> a -> b -> b) -> b -> Deque a -> b #

ifoldl :: (Int -> b -> a -> b) -> b -> Deque a -> b #

ifoldr' :: (Int -> a -> b -> b) -> b -> Deque a -> b #

ifoldl' :: (Int -> b -> a -> b) -> b -> Deque a -> b #

FoldableWithIndex Int [] 
Instance details

Defined in WithIndex

Methods

ifoldMap :: Monoid m => (Int -> a -> m) -> [a] -> m #

ifoldMap' :: Monoid m => (Int -> a -> m) -> [a] -> m #

ifoldr :: (Int -> a -> b -> b) -> b -> [a] -> b #

ifoldl :: (Int -> b -> a -> b) -> b -> [a] -> b #

ifoldr' :: (Int -> a -> b -> b) -> b -> [a] -> b #

ifoldl' :: (Int -> b -> a -> b) -> b -> [a] -> b #

FunctorWithIndex Int IntMap 
Instance details

Defined in WithIndex

Methods

imap :: (Int -> a -> b) -> IntMap a -> IntMap b #

FunctorWithIndex Int Seq

The position in the Seq is available as the index.

Instance details

Defined in WithIndex

Methods

imap :: (Int -> a -> b) -> Seq a -> Seq b #

FunctorWithIndex Int NonEmpty 
Instance details

Defined in WithIndex

Methods

imap :: (Int -> a -> b) -> NonEmpty a -> NonEmpty b #

FunctorWithIndex Int ZipList

Same instance as for [].

Instance details

Defined in WithIndex

Methods

imap :: (Int -> a -> b) -> ZipList a -> ZipList b #

FunctorWithIndex Int Deque 
Instance details

Defined in Control.Lens.Internal.Deque

Methods

imap :: (Int -> a -> b) -> Deque a -> Deque b #

FunctorWithIndex Int []

The position in the list is available as the index.

Instance details

Defined in WithIndex

Methods

imap :: (Int -> a -> b) -> [a] -> [b] #

TraversableWithIndex Int IntMap 
Instance details

Defined in WithIndex

Methods

itraverse :: Applicative f => (Int -> a -> f b) -> IntMap a -> f (IntMap b) #

TraversableWithIndex Int Seq 
Instance details

Defined in WithIndex

Methods

itraverse :: Applicative f => (Int -> a -> f b) -> Seq a -> f (Seq b) #

TraversableWithIndex Int NonEmpty 
Instance details

Defined in WithIndex

Methods

itraverse :: Applicative f => (Int -> a -> f b) -> NonEmpty a -> f (NonEmpty b) #

TraversableWithIndex Int ZipList 
Instance details

Defined in WithIndex

Methods

itraverse :: Applicative f => (Int -> a -> f b) -> ZipList a -> f (ZipList b) #

TraversableWithIndex Int Deque 
Instance details

Defined in Control.Lens.Internal.Deque

Methods

itraverse :: Applicative f => (Int -> a -> f b) -> Deque a -> f (Deque b) #

TraversableWithIndex Int [] 
Instance details

Defined in WithIndex

Methods

itraverse :: Applicative f => (Int -> a -> f b) -> [a] -> f [b] #

TraverseMax Int IntMap 
Instance details

Defined in Control.Lens.Traversal

TraverseMin Int IntMap 
Instance details

Defined in Control.Lens.Traversal

Lift Int 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Int -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Int -> Code m Int #

Vector Vector Int 
Instance details

Defined in Data.Vector.Unboxed.Base

MVector MVector Int 
Instance details

Defined in Data.Vector.Unboxed.Base

Reifies Z Int 
Instance details

Defined in Data.Reflection

Methods

reflect :: proxy Z -> Int #

Reifies n Int => Reifies (D n :: Type) Int 
Instance details

Defined in Data.Reflection

Methods

reflect :: proxy (D n) -> Int #

Reifies n Int => Reifies (PD n :: Type) Int 
Instance details

Defined in Data.Reflection

Methods

reflect :: proxy (PD n) -> Int #

Reifies n Int => Reifies (SD n :: Type) Int 
Instance details

Defined in Data.Reflection

Methods

reflect :: proxy (SD n) -> Int #

Generic1 (URec Int :: k -> Type) 
Instance details

Defined in GHC.Internal.Generics

Associated Types

type Rep1 (URec Int :: k -> Type)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

type Rep1 (URec Int :: k -> Type) = D1 ('MetaData "URec" "GHC.Internal.Generics" "ghc-internal" 'False) (C1 ('MetaCons "UInt" 'PrefixI 'True) (S1 ('MetaSel ('Just "uInt#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UInt :: k -> Type)))

Methods

from1 :: forall (a :: k). URec Int a -> Rep1 (URec Int :: k -> Type) a #

to1 :: forall (a :: k). Rep1 (URec Int :: k -> Type) a -> URec Int a #

Foldable (UInt :: Type -> Type)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Foldable

Methods

fold :: Monoid m => UInt m -> m #

foldMap :: Monoid m => (a -> m) -> UInt a -> m #

foldMap' :: Monoid m => (a -> m) -> UInt a -> m #

foldr :: (a -> b -> b) -> b -> UInt a -> b #

foldr' :: (a -> b -> b) -> b -> UInt a -> b #

foldl :: (b -> a -> b) -> b -> UInt a -> b #

foldl' :: (b -> a -> b) -> b -> UInt a -> b #

foldr1 :: (a -> a -> a) -> UInt a -> a #

foldl1 :: (a -> a -> a) -> UInt a -> a #

toList :: UInt a -> [a] #

null :: UInt a -> Bool #

length :: UInt a -> Int #

elem :: Eq a => a -> UInt a -> Bool #

maximum :: Ord a => UInt a -> a #

minimum :: Ord a => UInt a -> a #

sum :: Num a => UInt a -> a #

product :: Num a => UInt a -> a #

Traversable (UInt :: Type -> Type)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> UInt a -> f (UInt b) #

sequenceA :: Applicative f => UInt (f a) -> f (UInt a) #

mapM :: Monad m => (a -> m b) -> UInt a -> m (UInt b) #

sequence :: Monad m => UInt (m a) -> m (UInt a) #

FoldableWithIndex [Int] Tree 
Instance details

Defined in WithIndex

Methods

ifoldMap :: Monoid m => ([Int] -> a -> m) -> Tree a -> m #

ifoldMap' :: Monoid m => ([Int] -> a -> m) -> Tree a -> m #

ifoldr :: ([Int] -> a -> b -> b) -> b -> Tree a -> b #

ifoldl :: ([Int] -> b -> a -> b) -> b -> Tree a -> b #

ifoldr' :: ([Int] -> a -> b -> b) -> b -> Tree a -> b #

ifoldl' :: ([Int] -> b -> a -> b) -> b -> Tree a -> b #

FunctorWithIndex [Int] Tree 
Instance details

Defined in WithIndex

Methods

imap :: ([Int] -> a -> b) -> Tree a -> Tree b #

TraversableWithIndex [Int] Tree 
Instance details

Defined in WithIndex

Methods

itraverse :: Applicative f => ([Int] -> a -> f b) -> Tree a -> f (Tree b) #

Bizarre (Indexed Int) Mafic 
Instance details

Defined in Control.Lens.Internal.Magma

Methods

bazaar :: Applicative f => Indexed Int a (f b) -> Mafic a b t -> f t #

MArray (STUArray s) Int (ST s) 
Instance details

Defined in Data.Array.Base

Methods

getBounds :: Ix i => STUArray s i Int -> ST s (i, i) #

getNumElements :: Ix i => STUArray s i Int -> ST s Int #

newArray :: Ix i => (i, i) -> Int -> ST s (STUArray s i Int) #

newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Int) #

unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Int) #

unsafeRead :: Ix i => STUArray s i Int -> Int -> ST s Int #

unsafeWrite :: Ix i => STUArray s i Int -> Int -> Int -> ST s () #

Functor (URec Int :: Type -> Type)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

fmap :: (a -> b) -> URec Int a -> URec Int b #

(<$) :: a -> URec Int b -> URec Int a #

Generic (URec Int p) 
Instance details

Defined in GHC.Internal.Generics

Associated Types

type Rep (URec Int p)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

type Rep (URec Int p) = D1 ('MetaData "URec" "GHC.Internal.Generics" "ghc-internal" 'False) (C1 ('MetaCons "UInt" 'PrefixI 'True) (S1 ('MetaSel ('Just "uInt#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UInt :: Type -> Type)))

Methods

from :: URec Int p -> Rep (URec Int p) x #

to :: Rep (URec Int p) x -> URec Int p #

Show (URec Int p)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

showsPrec :: Int -> URec Int p -> ShowS #

show :: URec Int p -> String #

showList :: [URec Int p] -> ShowS #

Eq (URec Int p)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

(==) :: URec Int p -> URec Int p -> Bool #

(/=) :: URec Int p -> URec Int p -> Bool #

Ord (URec Int p)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

Methods

compare :: URec Int p -> URec Int p -> Ordering #

(<) :: URec Int p -> URec Int p -> Bool #

(<=) :: URec Int p -> URec Int p -> Bool #

(>) :: URec Int p -> URec Int p -> Bool #

(>=) :: URec Int p -> URec Int p -> Bool #

max :: URec Int p -> URec Int p -> URec Int p #

min :: URec Int p -> URec Int p -> URec Int p #

type NatNumMaxBound Int 
Instance details

Defined in Basement.Nat

type Difference Int 
Instance details

Defined in Basement.Numerical.Subtractive

type PrimSize Int 
Instance details

Defined in Basement.PrimType

type PrimSize Int = 8
newtype Vector Int 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector Int = V_Int (Vector Int)
data URec Int (p :: k)

Used for marking occurrences of Int#

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

data URec Int (p :: k) = UInt {}
type ByteSink Int g 
Instance details

Defined in Data.UUID.Types.Internal.Builder

type ByteSink Int g = Takes4Bytes g
newtype MVector s Int 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Int = MV_Int (MVector s Int)
type Rep1 (URec Int :: k -> Type)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

type Rep1 (URec Int :: k -> Type) = D1 ('MetaData "URec" "GHC.Internal.Generics" "ghc-internal" 'False) (C1 ('MetaCons "UInt" 'PrefixI 'True) (S1 ('MetaSel ('Just "uInt#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UInt :: k -> Type)))
type Rep (URec Int p)

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Generics

type Rep (URec Int p) = D1 ('MetaData "URec" "GHC.Internal.Generics" "ghc-internal" 'False) (C1 ('MetaCons "UInt" 'PrefixI 'True) (S1 ('MetaSel ('Just "uInt#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UInt :: Type -> Type)))

newtype Environment #

Application environment, like prod, devel, testing.

Constructors

Environment 

Fields

Instances

Instances details
FromJSON Environment 
Instance details

Defined in Katip.Core

ToJSON Environment 
Instance details

Defined in Katip.Core

IsString Environment 
Instance details

Defined in Katip.Core

Generic Environment 
Instance details

Defined in Katip.Core

Associated Types

type Rep Environment 
Instance details

Defined in Katip.Core

type Rep Environment = D1 ('MetaData "Environment" "Katip.Core" "katip-0.8.8.2-6lLMmxWNR0z6aY6MiVew6C" 'True) (C1 ('MetaCons "Environment" 'PrefixI 'True) (S1 ('MetaSel ('Just "getEnvironment") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))
Read Environment 
Instance details

Defined in Katip.Core

Show Environment 
Instance details

Defined in Katip.Core

Eq Environment 
Instance details

Defined in Katip.Core

Ord Environment 
Instance details

Defined in Katip.Core

type Rep Environment 
Instance details

Defined in Katip.Core

type Rep Environment = D1 ('MetaData "Environment" "Katip.Core" "katip-0.8.8.2-6lLMmxWNR0z6aY6MiVew6C" 'True) (C1 ('MetaCons "Environment" 'PrefixI 'True) (S1 ('MetaSel ('Just "getEnvironment") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

forM_ :: (Foldable t, Monad m) => t a -> (a -> m b) -> m () #

forM_ is mapM_ with its arguments flipped. For a version that doesn't ignore the results see forM.

forM_ is just like for_, but specialised to monadic actions.

data AggLevel #

Constructors

Unit

Expression is at the row level

Agg

Aggregate functions, like sum

Analytic

Analytic level (some backends)

Instances

Instances details
Data AggLevel 
Instance details

Defined in Napkin.Types.Core

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AggLevel -> c AggLevel #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AggLevel #

toConstr :: AggLevel -> Constr #

dataTypeOf :: AggLevel -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AggLevel) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AggLevel) #

gmapT :: (forall b. Data b => b -> b) -> AggLevel -> AggLevel #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AggLevel -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AggLevel -> r #

gmapQ :: (forall d. Data d => d -> u) -> AggLevel -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AggLevel -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AggLevel -> m AggLevel #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AggLevel -> m AggLevel #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AggLevel -> m AggLevel #

Show AggLevel 
Instance details

Defined in Napkin.Types.Core

Eq AggLevel 
Instance details

Defined in Napkin.Types.Core

Ord AggLevel 
Instance details

Defined in Napkin.Types.Core

assert :: forall (r :: EffectRow). Member (Assertion :: (Type -> Type) -> Type -> Type) r => Text -> AssertionStatus -> Sem r () #

assertError :: forall (r :: EffectRow). Member (Assertion :: (Type -> Type) -> Type -> Type) r => Text -> Sem ((Error Text :: (Type -> Type) -> Type -> Type) ': r) () -> Sem r () #

integral :: (Integral a, Integral b) => Iso' a b #

optional :: Alternative f => f a -> f (Maybe a) #

One or none.

It is useful for modelling any computation that is allowed to fail.

Examples

Expand

Using the Alternative instance of Control.Monad.Except, the following functions:

>>> import Control.Monad.Except
>>> canFail = throwError "it failed" :: Except String Int
>>> final = return 42                :: Except String Int

Can be combined by allowing the first function to fail:

>>> runExcept $ canFail *> final
Left "it failed"
>>> runExcept $ optional canFail *> final
Right 42

data SExp #

Instances

Instances details
NFData SExp 
Instance details

Defined in Napkin.Types.Core

Methods

rnf :: SExp -> () #

Data SExp 
Instance details

Defined in Napkin.Types.Core

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SExp -> c SExp #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SExp #

toConstr :: SExp -> Constr #

dataTypeOf :: SExp -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SExp) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SExp) #

gmapT :: (forall b. Data b => b -> b) -> SExp -> SExp #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SExp -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SExp -> r #

gmapQ :: (forall d. Data d => d -> u) -> SExp -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SExp -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SExp -> m SExp #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SExp -> m SExp #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SExp -> m SExp #

Generic SExp 
Instance details

Defined in Napkin.Types.Core

Associated Types

type Rep SExp 
Instance details

Defined in Napkin.Types.Core

type Rep SExp = D1 ('MetaData "SExp" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (((C1 ('MetaCons "Lit" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Value)) :+: (C1 ('MetaCons "Var" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Ref SExp))) :+: C1 ('MetaCons "ArraySelect" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Query)))) :+: (C1 ('MetaCons "ArrayItem" 'PrefixI 'True) ((S1 ('MetaSel ('Just "_sExp_ArrayItem_base") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ArrayBase) :*: S1 ('MetaSel ('Just "_sExp_ArrayItem_null") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Nullability)) :*: (S1 ('MetaSel ('Just "_sExp_ArrayItem_arr") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SExp) :*: S1 ('MetaSel ('Just "_sExp_ArrayItem_idx") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SExp))) :+: (C1 ('MetaCons "Array" 'PrefixI 'True) (S1 ('MetaSel ('Just "_sExp_Array_itemType") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Type)) :*: S1 ('MetaSel ('Just "_sExp_Array_items") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [SExp])) :+: C1 ('MetaCons "Struct" 'PrefixI 'True) (S1 ('MetaSel ('Just "_sExp_Struct_types") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (OMap StructField Type))) :*: S1 ('MetaSel ('Just "_sExp_Struct_values") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (OMap StructField SExp)))))) :+: ((C1 ('MetaCons "FieldAccess" 'PrefixI 'True) (S1 ('MetaSel ('Just "_sExp_fieldAccess_base") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SExp) :*: S1 ('MetaSel ('Just "_sExp_fieldAccess_name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 StructField)) :+: (C1 ('MetaCons "Extern" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ExternFun)) :+: C1 ('MetaCons "Case" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(SExp, SExp)]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SExp)))) :+: (C1 ('MetaCons "ExceptColumns" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SExp) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Ref SExp])) :+: (C1 ('MetaCons "SubQuery" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Query)) :+: C1 ('MetaCons "NativeExpr" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 NativeExpr))))))

Methods

from :: SExp -> Rep SExp x #

to :: Rep SExp x -> SExp #

Show SExp 
Instance details

Defined in Napkin.Types.Core

Methods

showsPrec :: Int -> SExp -> ShowS #

show :: SExp -> String #

showList :: [SExp] -> ShowS #

Eq SExp 
Instance details

Defined in Napkin.Types.Core

Methods

(==) :: SExp -> SExp -> Bool #

(/=) :: SExp -> SExp -> Bool #

Ord SExp 
Instance details

Defined in Napkin.Types.Core

Methods

compare :: SExp -> SExp -> Ordering #

(<) :: SExp -> SExp -> Bool #

(<=) :: SExp -> SExp -> Bool #

(>) :: SExp -> SExp -> Bool #

(>=) :: SExp -> SExp -> Bool #

max :: SExp -> SExp -> SExp #

min :: SExp -> SExp -> SExp #

HasDeps SExp 
Instance details

Defined in Napkin.Types.Deps

FunRenamer SExp 
Instance details

Defined in Napkin.Types.QueryTransformer

Methods

renameFun :: (Ref Function -> Ref Function) -> SExp -> SExp #

TableRenamer SExp 
Instance details

Defined in Napkin.Types.QueryTransformer

Methods

renameTableRef :: (Ref Table -> Ref Table) -> SExp -> SExp #

Lift SExp 
Instance details

Defined in Napkin.Types.Core

Methods

lift :: Quote m => SExp -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => SExp -> Code m SExp #

HasDeps (Alias SExp) 
Instance details

Defined in Napkin.Types.Deps

FunRenamer (Alias SExp) 
Instance details

Defined in Napkin.Types.QueryTransformer

TableRenamer (Alias SExp) 
Instance details

Defined in Napkin.Types.QueryTransformer

HasDeps (OMap Name SExp) 
Instance details

Defined in Napkin.Types.Deps

type Rep SExp 
Instance details

Defined in Napkin.Types.Core

type Rep SExp = D1 ('MetaData "SExp" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (((C1 ('MetaCons "Lit" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Value)) :+: (C1 ('MetaCons "Var" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Ref SExp))) :+: C1 ('MetaCons "ArraySelect" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Query)))) :+: (C1 ('MetaCons "ArrayItem" 'PrefixI 'True) ((S1 ('MetaSel ('Just "_sExp_ArrayItem_base") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ArrayBase) :*: S1 ('MetaSel ('Just "_sExp_ArrayItem_null") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Nullability)) :*: (S1 ('MetaSel ('Just "_sExp_ArrayItem_arr") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SExp) :*: S1 ('MetaSel ('Just "_sExp_ArrayItem_idx") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SExp))) :+: (C1 ('MetaCons "Array" 'PrefixI 'True) (S1 ('MetaSel ('Just "_sExp_Array_itemType") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Type)) :*: S1 ('MetaSel ('Just "_sExp_Array_items") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [SExp])) :+: C1 ('MetaCons "Struct" 'PrefixI 'True) (S1 ('MetaSel ('Just "_sExp_Struct_types") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (OMap StructField Type))) :*: S1 ('MetaSel ('Just "_sExp_Struct_values") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (OMap StructField SExp)))))) :+: ((C1 ('MetaCons "FieldAccess" 'PrefixI 'True) (S1 ('MetaSel ('Just "_sExp_fieldAccess_base") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SExp) :*: S1 ('MetaSel ('Just "_sExp_fieldAccess_name") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 StructField)) :+: (C1 ('MetaCons "Extern" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ExternFun)) :+: C1 ('MetaCons "Case" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(SExp, SExp)]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SExp)))) :+: (C1 ('MetaCons "ExceptColumns" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SExp) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Ref SExp])) :+: (C1 ('MetaCons "SubQuery" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Query)) :+: C1 ('MetaCons "NativeExpr" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 NativeExpr))))))

data Field #

Constructors

Field Nullability Type 

data DatePart #

Instances

Instances details
NFData DatePart 
Instance details

Defined in Napkin.Types.Core

Methods

rnf :: DatePart -> () #

Data DatePart 
Instance details

Defined in Napkin.Types.Core

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DatePart -> c DatePart #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DatePart #

toConstr :: DatePart -> Constr #

dataTypeOf :: DatePart -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DatePart) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DatePart) #

gmapT :: (forall b. Data b => b -> b) -> DatePart -> DatePart #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DatePart -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DatePart -> r #

gmapQ :: (forall d. Data d => d -> u) -> DatePart -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DatePart -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DatePart -> m DatePart #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DatePart -> m DatePart #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DatePart -> m DatePart #

Generic DatePart 
Instance details

Defined in Napkin.Types.Core

Associated Types

type Rep DatePart 
Instance details

Defined in Napkin.Types.Core

type Rep DatePart = D1 ('MetaData "DatePart" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) ((((C1 ('MetaCons "Millennium" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Century" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Decade" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Epoch" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "Year" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Quarter" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Month" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Week" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: (((C1 ('MetaCons "DayOfWeek" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DayOfYear" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Day" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Hour" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "Minute" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Second" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Millisecond" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Microsecond" 'PrefixI 'False) (U1 :: Type -> Type)))))

Methods

from :: DatePart -> Rep DatePart x #

to :: Rep DatePart x -> DatePart #

Show DatePart 
Instance details

Defined in Napkin.Types.Core

Eq DatePart 
Instance details

Defined in Napkin.Types.Core

Ord DatePart 
Instance details

Defined in Napkin.Types.Core

Val DatePart 
Instance details

Defined in Napkin.Types.Core

Lift DatePart 
Instance details

Defined in Napkin.Types.Core

Methods

lift :: Quote m => DatePart -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => DatePart -> Code m DatePart #

type Rep DatePart 
Instance details

Defined in Napkin.Types.Core

type Rep DatePart = D1 ('MetaData "DatePart" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) ((((C1 ('MetaCons "Millennium" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Century" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Decade" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Epoch" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "Year" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Quarter" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Month" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Week" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: (((C1 ('MetaCons "DayOfWeek" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DayOfYear" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Day" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Hour" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "Minute" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Second" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Millisecond" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Microsecond" 'PrefixI 'False) (U1 :: Type -> Type)))))

data AssertionStatus #

Constructors

Success 
Failure (Maybe Text) 

Instances

Instances details
ToJSON AssertionStatus 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

Generic AssertionStatus 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

Associated Types

type Rep AssertionStatus 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

type Rep AssertionStatus = D1 ('MetaData "AssertionStatus" "Napkin.Run.Effects.Languages.Assertion" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "Success" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Failure" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text))))
Show AssertionStatus 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

Eq AssertionStatus 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

type Rep AssertionStatus 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

type Rep AssertionStatus = D1 ('MetaData "AssertionStatus" "Napkin.Run.Effects.Languages.Assertion" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "Success" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Failure" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text))))

data Assertion (m :: k) a where #

Assertion effects so we can skip past them in dry runs, and optionally throw exceptions or just collect them along the way for final reporting, etc..

Constructors

Assert' :: forall {k} (m :: k). AssertionGroup -> AssertionSeverity -> Text -> AssertionStatus -> Assertion m ()

Assertions are run-time checks based on actual results that may be returned by various operations. Dry runs may ignore these failures, but they're respected in real operations.

Instances

Instances details
ToDumpItem (b :: k) (Assertion :: (Type -> Type) -> Type -> Type) 
Instance details

Defined in Napkin.Run.Effects.Interceptors.LogProgram.Types

Methods

toDumpItem :: forall (r :: EffectRow) x. Assertion (Sem r) x -> DumpItem b #

GShow (Assertion a :: Type -> Type) 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

Methods

gshowsPrec :: Int -> Assertion a a0 -> ShowS #

Show (Assertion a b) 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

Methods

showsPrec :: Int -> Assertion a b -> ShowS #

show :: Assertion a b -> String #

showList :: [Assertion a b] -> ShowS #

Eq (Assertion a b) 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

Methods

(==) :: Assertion a b -> Assertion a b -> Bool #

(/=) :: Assertion a b -> Assertion a b -> Bool #

sign :: SExp -> SExp #

Basic arithmetic

data SpecRuntime b #

Constructors

SpecRuntime 

Fields

Instances

Instances details
Generic (SpecRuntime b) 
Instance details

Defined in Napkin.Spec.Types.Runtime

Associated Types

type Rep (SpecRuntime b) 
Instance details

Defined in Napkin.Spec.Types.Runtime

type Rep (SpecRuntime b) = D1 ('MetaData "SpecRuntime" "Napkin.Spec.Types.Runtime" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "SpecRuntime" 'PrefixI 'True) (S1 ('MetaSel ('Just "connection") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (BackendConn b))))

Methods

from :: SpecRuntime b -> Rep (SpecRuntime b) x #

to :: Rep (SpecRuntime b) x -> SpecRuntime b #

type Rep (SpecRuntime b) 
Instance details

Defined in Napkin.Spec.Types.Runtime

type Rep (SpecRuntime b) = D1 ('MetaData "SpecRuntime" "Napkin.Spec.Types.Runtime" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "SpecRuntime" 'PrefixI 'True) (S1 ('MetaSel ('Just "connection") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (BackendConn b))))

data Function #

Instances

Instances details
Data Function 
Instance details

Defined in Napkin.Types.Core

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Function -> c Function #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Function #

toConstr :: Function -> Constr #

dataTypeOf :: Function -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Function) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Function) #

gmapT :: (forall b. Data b => b -> b) -> Function -> Function #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Function -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Function -> r #

gmapQ :: (forall d. Data d => d -> u) -> Function -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Function -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Function -> m Function #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Function -> m Function #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Function -> m Function #

(.&&.) :: SExp -> SExp -> SExp infixr 3 #

(.||.) :: SExp -> SExp -> SExp infixr 2 #

data Specs b #

Constructors

Specs 

Fields

Instances

Instances details
Default (Specs b) 
Instance details

Defined in Napkin.Spec.Types.Spec

Methods

def :: Specs b #

Generic (Specs b) 
Instance details

Defined in Napkin.Spec.Types.Spec

Associated Types

type Rep (Specs b) 
Instance details

Defined in Napkin.Spec.Types.Spec

type Rep (Specs b) = D1 ('MetaData "Specs" "Napkin.Spec.Types.Spec" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "Specs" 'PrefixI 'True) ((S1 ('MetaSel ('Just "tables") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (SpecTableMap b)) :*: S1 ('MetaSel ('Just "hooks") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (GlobalHooks b))) :*: (S1 ('MetaSel ('Just "metaArgs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SpecMetaArgs) :*: S1 ('MetaSel ('Just "transformer") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 QueryTransformer))))

Methods

from :: Specs b -> Rep (Specs b) x #

to :: Rep (Specs b) x -> Specs b #

MonadState (Specs b) (Spec b) 
Instance details

Defined in Napkin.Spec.Types.Spec

Methods

get :: Spec b (Specs b) #

put :: Specs b -> Spec b () #

state :: (Specs b -> (a, Specs b)) -> Spec b a #

type Rep (Specs b) 
Instance details

Defined in Napkin.Spec.Types.Spec

type Rep (Specs b) = D1 ('MetaData "Specs" "Napkin.Spec.Types.Spec" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "Specs" 'PrefixI 'True) ((S1 ('MetaSel ('Just "tables") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (SpecTableMap b)) :*: S1 ('MetaSel ('Just "hooks") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (GlobalHooks b))) :*: (S1 ('MetaSel ('Just "metaArgs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SpecMetaArgs) :*: S1 ('MetaSel ('Just "transformer") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 QueryTransformer))))

data Value #

Instances

Instances details
NFData Value 
Instance details

Defined in Napkin.Types.Core

Methods

rnf :: Value -> () #

Buildable Value 
Instance details

Defined in Napkin.Types.Core

Methods

build :: Value -> Builder #

Data Value 
Instance details

Defined in Napkin.Types.Core

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Value -> c Value #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Value #

toConstr :: Value -> Constr #

dataTypeOf :: Value -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Value) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Value) #

gmapT :: (forall b. Data b => b -> b) -> Value -> Value #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Value -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Value -> r #

gmapQ :: (forall d. Data d => d -> u) -> Value -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Value -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Value -> m Value #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Value -> m Value #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Value -> m Value #

Generic Value 
Instance details

Defined in Napkin.Types.Core

Associated Types

type Rep Value 
Instance details

Defined in Napkin.Types.Core

type Rep Value = D1 ('MetaData "Value" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (((C1 ('MetaCons "VDouble" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'SourceUnpack 'SourceStrict 'DecidedUnpack) (Rec0 Double)) :+: C1 ('MetaCons "VInt" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'SourceUnpack 'SourceStrict 'DecidedUnpack) (Rec0 Int64))) :+: (C1 ('MetaCons "VBool" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Bool)) :+: (C1 ('MetaCons "VDate" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Day)) :+: C1 ('MetaCons "VDateTime" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'SourceUnpack 'SourceStrict 'DecidedUnpack) (Rec0 UTCTime))))) :+: ((C1 ('MetaCons "VText" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text)) :+: C1 ('MetaCons "VBinary" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'SourceUnpack 'SourceStrict 'DecidedUnpack) (Rec0 ByteString))) :+: (C1 ('MetaCons "VInterval" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Interval)) :+: (C1 ('MetaCons "VNull" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "VDatePart" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 DatePart))))))

Methods

from :: Value -> Rep Value x #

to :: Rep Value x -> Value #

Show Value 
Instance details

Defined in Napkin.Types.Core

Methods

showsPrec :: Int -> Value -> ShowS #

show :: Value -> String #

showList :: [Value] -> ShowS #

Eq Value 
Instance details

Defined in Napkin.Types.Core

Methods

(==) :: Value -> Value -> Bool #

(/=) :: Value -> Value -> Bool #

Ord Value 
Instance details

Defined in Napkin.Types.Core

Methods

compare :: Value -> Value -> Ordering #

(<) :: Value -> Value -> Bool #

(<=) :: Value -> Value -> Bool #

(>) :: Value -> Value -> Bool #

(>=) :: Value -> Value -> Bool #

max :: Value -> Value -> Value #

min :: Value -> Value -> Value #

Val Value 
Instance details

Defined in Napkin.Types.Core

Methods

val :: Prism' Value Value #

Lift Value 
Instance details

Defined in Napkin.Types.Core

Methods

lift :: Quote m => Value -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Value -> Code m Value #

FromField (Named Value) 
Instance details

Defined in Napkin.Run.PGCommon

type Rep Value 
Instance details

Defined in Napkin.Types.Core

type Rep Value = D1 ('MetaData "Value" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (((C1 ('MetaCons "VDouble" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'SourceUnpack 'SourceStrict 'DecidedUnpack) (Rec0 Double)) :+: C1 ('MetaCons "VInt" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'SourceUnpack 'SourceStrict 'DecidedUnpack) (Rec0 Int64))) :+: (C1 ('MetaCons "VBool" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Bool)) :+: (C1 ('MetaCons "VDate" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Day)) :+: C1 ('MetaCons "VDateTime" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'SourceUnpack 'SourceStrict 'DecidedUnpack) (Rec0 UTCTime))))) :+: ((C1 ('MetaCons "VText" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text)) :+: C1 ('MetaCons "VBinary" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'SourceUnpack 'SourceStrict 'DecidedUnpack) (Rec0 ByteString))) :+: (C1 ('MetaCons "VInterval" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Interval)) :+: (C1 ('MetaCons "VNull" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "VDatePart" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 DatePart))))))

data Text #

A space efficient, packed, unboxed Unicode text type.

Instances

Instances details
FromJSON Text 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Text 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Text 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Text 
Instance details

Defined in Data.Aeson.Types.ToJSON

Chunk Text 
Instance details

Defined in Data.Attoparsec.Internal.Types

Associated Types

type ChunkElem Text 
Instance details

Defined in Data.Attoparsec.Internal.Types

type ChunkElem Text = Char

Methods

nullChunk :: Text -> Bool

pappendChunk :: State Text -> Text -> State Text

atBufferEnd :: Text -> State Text -> Pos

bufferElemAt :: Text -> Pos -> State Text -> Maybe (ChunkElem Text, Int)

chunkElemToChar :: Text -> ChunkElem Text -> Char

FromBuilder Text 
Instance details

Defined in Fmt.Internal.Core

Methods

fromBuilder :: Builder -> Text #

Buildable Text 
Instance details

Defined in Formatting.Buildable

Methods

build :: Text -> Builder #

Hashable Text 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Text -> Int #

hash :: Text -> Int #

FromFormKey Text 
Instance details

Defined in Web.Internal.FormUrlEncoded

ToFormKey Text 
Instance details

Defined in Web.Internal.FormUrlEncoded

Methods

toFormKey :: Text -> Text #

Ixed Text 
Instance details

Defined in Control.Lens.At

AsEmpty Text 
Instance details

Defined in Control.Lens.Empty

Methods

_Empty :: Prism' Text () #

Reversing Text 
Instance details

Defined in Control.Lens.Internal.Iso

Methods

reversing :: Text -> Text #

Prefixed Text 
Instance details

Defined in Control.Lens.Prism

Methods

prefixed :: Text -> Prism' Text Text #

Suffixed Text 
Instance details

Defined in Control.Lens.Prism

Methods

suffixed :: Text -> Prism' Text Text #

IsText Text 
Instance details

Defined in Data.Text.Lens

AsJSON Text 
Instance details

Defined in Data.Aeson.Lens

Methods

_JSON :: (FromJSON a, ToJSON b) => Prism Text Text a b #

AsNumber Text 
Instance details

Defined in Data.Aeson.Lens

AsValue Text 
Instance details

Defined in Data.Aeson.Lens

IsKey Text 
Instance details

Defined in Data.Aeson.Lens

Methods

_Key :: Iso' Text Key #

Stream Text 
Instance details

Defined in Text.Megaparsec.Stream

Associated Types

type Token Text 
Instance details

Defined in Text.Megaparsec.Stream

type Tokens Text 
Instance details

Defined in Text.Megaparsec.Stream

TraversableStream Text 
Instance details

Defined in Text.Megaparsec.Stream

VisualStream Text 
Instance details

Defined in Text.Megaparsec.Stream

GrowingAppend Text 
Instance details

Defined in Data.MonoTraversable

MonoFoldable Text 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element Text -> m) -> Text -> m #

ofoldr :: (Element Text -> b -> b) -> b -> Text -> b #

ofoldl' :: (a -> Element Text -> a) -> a -> Text -> a #

otoList :: Text -> [Element Text] #

oall :: (Element Text -> Bool) -> Text -> Bool #

oany :: (Element Text -> Bool) -> Text -> Bool #

onull :: Text -> Bool #

olength :: Text -> Int #

olength64 :: Text -> Int64 #

ocompareLength :: Integral i => Text -> i -> Ordering #

otraverse_ :: Applicative f => (Element Text -> f b) -> Text -> f () #

ofor_ :: Applicative f => Text -> (Element Text -> f b) -> f () #

omapM_ :: Applicative m => (Element Text -> m ()) -> Text -> m () #

oforM_ :: Applicative m => Text -> (Element Text -> m ()) -> m () #

ofoldlM :: Monad m => (a -> Element Text -> m a) -> a -> Text -> m a #

ofoldMap1Ex :: Semigroup m => (Element Text -> m) -> Text -> m #

ofoldr1Ex :: (Element Text -> Element Text -> Element Text) -> Text -> Element Text #

ofoldl1Ex' :: (Element Text -> Element Text -> Element Text) -> Text -> Element Text #

headEx :: Text -> Element Text #

lastEx :: Text -> Element Text #

unsafeHead :: Text -> Element Text #

unsafeLast :: Text -> Element Text #

maximumByEx :: (Element Text -> Element Text -> Ordering) -> Text -> Element Text #

minimumByEx :: (Element Text -> Element Text -> Ordering) -> Text -> Element Text #

oelem :: Element Text -> Text -> Bool #

onotElem :: Element Text -> Text -> Bool #

MonoFunctor Text 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element Text -> Element Text) -> Text -> Text #

MonoPointed Text 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element Text -> Text #

MonoTraversable Text 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element Text -> f (Element Text)) -> Text -> f Text #

omapM :: Applicative m => (Element Text -> m (Element Text)) -> Text -> m Text #

IsSequence Text 
Instance details

Defined in Data.Sequences

Methods

fromList :: [Element Text] -> Text #

lengthIndex :: Text -> Index Text #

break :: (Element Text -> Bool) -> Text -> (Text, Text) #

span :: (Element Text -> Bool) -> Text -> (Text, Text) #

dropWhile :: (Element Text -> Bool) -> Text -> Text #

takeWhile :: (Element Text -> Bool) -> Text -> Text #

splitAt :: Index Text -> Text -> (Text, Text) #

unsafeSplitAt :: Index Text -> Text -> (Text, Text) #

take :: Index Text -> Text -> Text #

unsafeTake :: Index Text -> Text -> Text #

drop :: Index Text -> Text -> Text #

unsafeDrop :: Index Text -> Text -> Text #

dropEnd :: Index Text -> Text -> Text #

partition :: (Element Text -> Bool) -> Text -> (Text, Text) #

uncons :: Text -> Maybe (Element Text, Text) #

unsnoc :: Text -> Maybe (Text, Element Text) #

filter :: (Element Text -> Bool) -> Text -> Text #

filterM :: Monad m => (Element Text -> m Bool) -> Text -> m Text #

replicate :: Index Text -> Element Text -> Text #

replicateM :: Monad m => Index Text -> m (Element Text) -> m Text #

groupBy :: (Element Text -> Element Text -> Bool) -> Text -> [Text] #

groupAllOn :: Eq b => (Element Text -> b) -> Text -> [Text] #

subsequences :: Text -> [Text] #

permutations :: Text -> [Text] #

tailEx :: Text -> Text #

tailMay :: Text -> Maybe Text #

initEx :: Text -> Text #

initMay :: Text -> Maybe Text #

unsafeTail :: Text -> Text #

unsafeInit :: Text -> Text #

index :: Text -> Index Text -> Maybe (Element Text) #

indexEx :: Text -> Index Text -> Element Text #

unsafeIndex :: Text -> Index Text -> Element Text #

splitWhen :: (Element Text -> Bool) -> Text -> [Text] #

tails :: Text -> [Text] #

inits :: Text -> [Text] #

initTails :: Text -> [(Text, Text)] #

SemiSequence Text 
Instance details

Defined in Data.Sequences

Associated Types

type Index Text 
Instance details

Defined in Data.Sequences

type Index Text = Int
Textual Text 
Instance details

Defined in Data.Sequences

Methods

words :: Text -> [Text] #

unwords :: (Element seq ~ Text, MonoFoldable seq) => seq -> Text #

lines :: Text -> [Text] #

unlines :: (Element seq ~ Text, MonoFoldable seq) => seq -> Text #

toLower :: Text -> Text #

toUpper :: Text -> Text #

toCaseFold :: Text -> Text #

breakWord :: Text -> (Text, Text) #

breakLine :: Text -> (Text, Text) #

IsRef Text 
Instance details

Defined in Napkin.Types.Core

Methods

ref :: forall {k} (b :: k). Text -> Ref b #

Val Text 
Instance details

Defined in Napkin.Types.Core

Methods

val :: Prism' Value Text #

ToNapkinError Text 
Instance details

Defined in Napkin.Run.Types.ErrorReporting

ToSql Text

Corresponds to NTEXT (Unicode) of SQL Server. Note that if your character exceeds the range supported by a wide-char (16-bit), that cannot be sent to the server.

Instance details

Defined in Database.ODBC.SQLServer

Methods

toSql :: Text -> Query #

Pretty Text

Automatically converts all newlines to line.

>>> pretty ("hello\nworld" :: Text)
hello
world

Note that line can be undone by group:

>>> group (pretty ("hello\nworld" :: Text))
hello world

Manually use hardline if you definitely want newlines.

Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Text -> Doc ann #

prettyList :: [Text] -> Doc ann #

One Text

Create singleton strict Text.

>>> one 'a' :: Text
"a"
law> length (one x) ≡ 1
Instance details

Defined in Relude.Container.One

Associated Types

type OneItem Text 
Instance details

Defined in Relude.Container.One

Methods

one :: OneItem Text -> Text #

ToLText Text 
Instance details

Defined in Relude.String.Conversion

Methods

toLText :: Text -> LText #

ToString Text 
Instance details

Defined in Relude.String.Conversion

Methods

toString :: Text -> String #

ToText Text 
Instance details

Defined in Relude.String.Conversion

Methods

toText :: Text -> Text #

LazySequence Text Text 
Instance details

Defined in Data.Sequences

Utf8 Text ByteString 
Instance details

Defined in Data.Sequences

ConvertUtf8 Text ByteString 
Instance details

Defined in Relude.String.Conversion

ConvertUtf8 Text ShortByteString

Since: relude-0.6.0.0

Instance details

Defined in Relude.String.Conversion

ConvertUtf8 Text LByteString 
Instance details

Defined in Relude.String.Conversion

LazyStrict LText Text 
Instance details

Defined in Relude.String.Conversion

Methods

toLazy :: Text -> LText #

toStrict :: LText -> Text #

StringConv ByteString Text 
Instance details

Defined in Data.String.Conv

Methods

strConv :: Leniency -> ByteString -> Text #

StringConv ByteString Text 
Instance details

Defined in Data.String.Conv

Methods

strConv :: Leniency -> ByteString -> Text #

StringConv Text ByteString 
Instance details

Defined in Data.String.Conv

Methods

strConv :: Leniency -> Text -> ByteString #

StringConv Text ByteString 
Instance details

Defined in Data.String.Conv

Methods

strConv :: Leniency -> Text -> ByteString #

StringConv Text Text 
Instance details

Defined in Data.String.Conv

Methods

strConv :: Leniency -> Text -> Text #

StringConv Text Text 
Instance details

Defined in Data.String.Conv

Methods

strConv :: Leniency -> Text -> Text #

StringConv Text String 
Instance details

Defined in Data.String.Conv

Methods

strConv :: Leniency -> Text -> String #

StringConv Text Text 
Instance details

Defined in Data.String.Conv

Methods

strConv :: Leniency -> Text -> Text #

StringConv String Text 
Instance details

Defined in Data.String.Conv

Methods

strConv :: Leniency -> String -> Text #

DumpPayload Text (b :: k) 
Instance details

Defined in Napkin.Run.Effects.Interceptors.LogProgram.Types

MimeRender PlainText Text
fromStrict . TextS.encodeUtf8
Instance details

Defined in Servant.API.ContentTypes

MimeUnrender PlainText Text
left show . TextS.decodeUtf8' . toStrict
Instance details

Defined in Servant.API.ContentTypes

Cons Text Text Char Char 
Instance details

Defined in Control.Lens.Cons

Methods

_Cons :: Prism Text Text (Char, Text) (Char, Text) #

Snoc Text Text Char Char 
Instance details

Defined in Control.Lens.Cons

Methods

_Snoc :: Prism Text Text (Text, Char) (Text, Char) #

(a ~ Char, b ~ Char) => Each Text Text a b
each :: Traversal Text Text Char Char
Instance details

Defined in Control.Lens.Each

Methods

each :: Traversal Text Text a b #

Stream (NoShareInput Text) 
Instance details

Defined in Text.Megaparsec.Stream

Associated Types

type Token (NoShareInput Text) 
Instance details

Defined in Text.Megaparsec.Stream

type Tokens (NoShareInput Text) 
Instance details

Defined in Text.Megaparsec.Stream

Stream (ShareInput Text) 
Instance details

Defined in Text.Megaparsec.Stream

Associated Types

type Token (ShareInput Text) 
Instance details

Defined in Text.Megaparsec.Stream

type Tokens (ShareInput Text) 
Instance details

Defined in Text.Megaparsec.Stream

type ChunkElem Text 
Instance details

Defined in Data.Attoparsec.Internal.Types

type ChunkElem Text = Char
type State Text 
Instance details

Defined in Data.Attoparsec.Internal.Types

type State Text = Buffer
type Item Text 
Instance details

Defined in Data.Text

type Item Text = Char
type Index Text 
Instance details

Defined in Control.Lens.At

type Index Text = Int
type IxValue Text 
Instance details

Defined in Control.Lens.At

type Token Text 
Instance details

Defined in Text.Megaparsec.Stream

type Tokens Text 
Instance details

Defined in Text.Megaparsec.Stream

type Element Text 
Instance details

Defined in Data.MonoTraversable

type Index Text 
Instance details

Defined in Data.Sequences

type Index Text = Int
type OneItem Text 
Instance details

Defined in Relude.Container.One

type Builder 'True Text 
Instance details

Defined in Data.String.Interpolate.Conversion.TextSink

type Token (NoShareInput Text) 
Instance details

Defined in Text.Megaparsec.Stream

type Token (ShareInput Text) 
Instance details

Defined in Text.Megaparsec.Stream

type Tokens (NoShareInput Text) 
Instance details

Defined in Text.Megaparsec.Stream

type Tokens (ShareInput Text) 
Instance details

Defined in Text.Megaparsec.Stream

data WithSpecTable a #

Constructors

WithSpecTable 

Instances

Instances details
Functor WithSpecTable 
Instance details

Defined in Napkin.Types.Core

Methods

fmap :: (a -> b) -> WithSpecTable a -> WithSpecTable b #

(<$) :: a -> WithSpecTable b -> WithSpecTable a #

Generic (WithSpecTable a) 
Instance details

Defined in Napkin.Types.Core

Associated Types

type Rep (WithSpecTable a) 
Instance details

Defined in Napkin.Types.Core

type Rep (WithSpecTable a) = D1 ('MetaData "WithSpecTable" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "WithSpecTable" 'PrefixI 'True) (S1 ('MetaSel ('Just "specTableName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SpecTableName) :*: S1 ('MetaSel ('Just "value") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))
Show a => Show (WithSpecTable a) 
Instance details

Defined in Napkin.Types.Core

Eq a => Eq (WithSpecTable a) 
Instance details

Defined in Napkin.Types.Core

Ord a => Ord (WithSpecTable a) 
Instance details

Defined in Napkin.Types.Core

type Rep (WithSpecTable a) 
Instance details

Defined in Napkin.Types.Core

type Rep (WithSpecTable a) = D1 ('MetaData "WithSpecTable" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "WithSpecTable" 'PrefixI 'True) (S1 ('MetaSel ('Just "specTableName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SpecTableName) :*: S1 ('MetaSel ('Just "value") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))

data UTCTime #

This is the simplest representation of UTC. It consists of the day number, and a time offset from midnight. Note that if a day has a leap second added to it, it will have 86401 seconds.

Constructors

UTCTime 

Fields

Instances

Instances details
FromJSON UTCTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey UTCTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON UTCTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey UTCTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

NFData UTCTime 
Instance details

Defined in Data.Time.Clock.Internal.UTCTime

Methods

rnf :: UTCTime -> () #

Buildable UTCTime 
Instance details

Defined in Formatting.Buildable

Methods

build :: UTCTime -> Builder #

Outputable UTCTime 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: UTCTime -> SDoc #

Data UTCTime 
Instance details

Defined in Data.Time.Clock.Internal.UTCTime

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UTCTime -> c UTCTime #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UTCTime #

toConstr :: UTCTime -> Constr #

dataTypeOf :: UTCTime -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UTCTime) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UTCTime) #

gmapT :: (forall b. Data b => b -> b) -> UTCTime -> UTCTime #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UTCTime -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UTCTime -> r #

gmapQ :: (forall d. Data d => d -> u) -> UTCTime -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UTCTime -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UTCTime -> m UTCTime #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UTCTime -> m UTCTime #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UTCTime -> m UTCTime #

Eq UTCTime 
Instance details

Defined in Data.Time.Clock.Internal.UTCTime

Methods

(==) :: UTCTime -> UTCTime -> Bool #

(/=) :: UTCTime -> UTCTime -> Bool #

Ord UTCTime 
Instance details

Defined in Data.Time.Clock.Internal.UTCTime

FromFormKey UTCTime 
Instance details

Defined in Web.Internal.FormUrlEncoded

ToFormKey UTCTime 
Instance details

Defined in Web.Internal.FormUrlEncoded

Methods

toFormKey :: UTCTime -> Text #

Val UTCTime 
Instance details

Defined in Napkin.Types.Core

(TypeError ((('Text "Instance for UTCTime is not possible:" ':$$: 'Text "SQL Server does not support time zones. ") ':$$: 'Text "You can use utcToLocalTime to make a LocalTime, and") ':$$: 'Text "wrap your value in either (Datetime2 foo) or (Smalldatetime foo).") :: Constraint) => ToSql UTCTime

You cannot use this instance. Wrap your value in either Datetime2 or Smalldatetime.

Instance details

Defined in Database.ODBC.SQLServer

Methods

toSql :: UTCTime -> Query #

ISO8601 UTCTime

yyyy-mm-ddThh:mm:ss[.sss]Z (ISO 8601:2004(E) sec. 4.3.2 extended format)

Instance details

Defined in Data.Time.Format.ISO8601

FromJSON (UTCTime -> OAuthToken s) 
Instance details

Defined in Gogol.Internal.Auth

newtype Q a #

Constructors

Q 

Fields

Instances

Instances details
Applicative Q 
Instance details

Defined in Napkin.Untyped.Monad

Methods

pure :: a -> Q a #

(<*>) :: Q (a -> b) -> Q a -> Q b #

liftA2 :: (a -> b -> c) -> Q a -> Q b -> Q c #

(*>) :: Q a -> Q b -> Q b #

(<*) :: Q a -> Q b -> Q a #

Functor Q 
Instance details

Defined in Napkin.Untyped.Monad

Methods

fmap :: (a -> b) -> Q a -> Q b #

(<$) :: a -> Q b -> Q a #

Monad Q 
Instance details

Defined in Napkin.Untyped.Monad

Methods

(>>=) :: Q a -> (a -> Q b) -> Q b #

(>>) :: Q a -> Q b -> Q b #

return :: a -> Q a #

MonadState QState Q 
Instance details

Defined in Napkin.Untyped.Monad

Methods

get :: Q QState #

put :: QState -> Q () #

state :: (QState -> (a, QState)) -> Q a #

RenderSql Query backend => RenderSql (Q a) (backend :: k)

Monadic query interface

Instance details

Defined in Napkin.Render.Types

Methods

renderSql :: Proxy backend -> Q a -> ME Doc #

AsRelation (Q a) 
Instance details

Defined in Napkin.Untyped.Monad

Methods

asRelation :: Q a -> Relation #

HasDefinition (Q ()) 
Instance details

Defined in Napkin.Untyped.Monad

Methods

defQuery :: Lens (Q ()) (Q ()) Query Query #

MaybeQuery (Q ()) 
Instance details

Defined in Napkin.Untyped.Monad

Methods

getQuery :: Q () -> Maybe Query #

(<**>) :: Applicative f => f a -> f (a -> b) -> f b infixl 4 #

A variant of <*> with the types of the arguments reversed. It differs from flip (<*>) in that the effects are resolved in the order the arguments are presented.

Examples

Expand
>>> (<**>) (print 1) (id <$ print 2)
1
2
>>> flip (<*>) (print 1) (id <$ print 2)
2
1
>>> ZipList [4, 5, 6] <**> ZipList [(+1), (*2), (/3)]
ZipList {getZipList = [5.0,10.0,2.0]}

mapM_ :: (Foldable t, Monad m) => (a -> m b) -> t a -> m () #

Map each element of a structure to a monadic action, evaluate these actions from left to right, and ignore the results. For a version that doesn't ignore the results see mapM.

mapM_ is just like traverse_, but specialised to monadic actions.

type Year = Integer #

Year of Common Era (when positive).

getCurrentTime :: forall (effs :: EffectRow). Member (Time :: (Type -> Type) -> Type -> Type) effs => Sem effs UTCTime #

liftA :: Applicative f => (a -> b) -> f a -> f b #

Lift a function to actions. Equivalent to Functor's fmap but implemented using only Applicative's methods: liftA f a = pure f <*> a

As such this function may be used to implement a Functor instance from an Applicative one.

Examples

Expand

Using the Applicative instance for Lists:

>>> liftA (+1) [1, 2]
[2,3]

Or the Applicative instance for Maybe

>>> liftA (+1) (Just 3)
Just 4

liftA3 :: Applicative f => (a -> b -> c -> d) -> f a -> f b -> f c -> f d #

Lift a ternary function to actions.

sequence :: (Traversable t, Monad m) => t (m a) -> m (t a) #

Evaluate each monadic action in the structure from left to right, and collect the results. For a version that ignores the results see sequence_.

Examples

Expand

Basic usage:

The first two examples are instances where the input and and output of sequence are isomorphic.

>>> sequence $ Right [1,2,3,4]
[Right 1,Right 2,Right 3,Right 4]
>>> sequence $ [Right 1,Right 2,Right 3,Right 4]
Right [1,2,3,4]

The following examples demonstrate short circuit behavior for sequence.

>>> sequence $ Left [1,2,3,4]
Left [1,2,3,4]
>>> sequence $ [Left 0, Right 1,Right 2,Right 3,Right 4]
Left 0

mapM :: (Traversable t, Monad m) => (a -> m b) -> t a -> m (t b) #

Map each element of a structure to a monadic action, evaluate these actions from left to right, and collect the results. For a version that ignores the results see mapM_.

Examples

Expand

mapM is literally a traverse with a type signature restricted to Monad. Its implementation may be more efficient due to additional power of Monad.

liftM3 :: Monad m => (a1 -> a2 -> a3 -> r) -> m a1 -> m a2 -> m a3 -> m r #

Promote a function to a monad, scanning the monadic arguments from left to right (cf. liftM2).

liftM4 :: Monad m => (a1 -> a2 -> a3 -> a4 -> r) -> m a1 -> m a2 -> m a3 -> m a4 -> m r #

Promote a function to a monad, scanning the monadic arguments from left to right (cf. liftM2).

liftM5 :: Monad m => (a1 -> a2 -> a3 -> a4 -> a5 -> r) -> m a1 -> m a2 -> m a3 -> m a4 -> m a5 -> m r #

Promote a function to a monad, scanning the monadic arguments from left to right (cf. liftM2).

asum :: (Foldable t, Alternative f) => t (f a) -> f a #

The sum of a collection of actions using (<|>), generalizing concat.

asum is just like msum, but generalised to Alternative.

Examples

Expand

Basic usage:

>>> asum [Just "Hello", Nothing, Just "World"]
Just "Hello"

msum :: (Foldable t, MonadPlus m) => t (m a) -> m a #

The sum of a collection of actions using (<|>), generalizing concat.

msum is just like asum, but specialised to MonadPlus.

Examples

Expand

Basic usage, using the MonadPlus instance for Maybe:

>>> msum [Just "Hello", Nothing, Just "World"]
Just "Hello"

cast :: SExp -> Type -> SExp #

Type casts

forM :: (Traversable t, Monad m) => t a -> (a -> m b) -> m (t b) #

forM is mapM with its arguments flipped. For a version that ignores the results see forM_.

(>=>) :: Monad m => (a -> m b) -> (b -> m c) -> a -> m c infixr 1 #

Left-to-right composition of Kleisli arrows.

'(bs >=> cs) a' can be understood as the do expression

do b <- bs a
   cs b

or in terms of (>>=) as

bs a >>= cs

(<=<) :: Monad m => (b -> m c) -> (a -> m b) -> a -> m c infixr 1 #

Right-to-left composition of Kleisli arrows. (>=>), with the arguments flipped.

Note how this operator resembles function composition (.):

(.)   ::            (b ->   c) -> (a ->   b) -> a ->   c
(<=<) :: Monad m => (b -> m c) -> (a -> m b) -> a -> m c

forever :: Applicative f => f a -> f b #

Repeat an action indefinitely.

Examples

Expand

A common use of forever is to process input from network sockets, Handles, and channels (e.g. MVar and Chan).

For example, here is how we might implement an echo server, using forever both to listen for client connections on a network socket and to echo client input on client connection handles:

echoServer :: Socket -> IO ()
echoServer socket = forever $ do
  client <- accept socket
  forkFinally (echo client) (\_ -> hClose client)
  where
    echo :: Handle -> IO ()
    echo client = forever $
      hGetLine client >>= hPutStrLn client

Note that "forever" isn't necessarily non-terminating. If the action is in a MonadPlus and short-circuits after some number of iterations. then forever actually returns mzero, effectively short-circuiting its caller.

mapAndUnzipM :: Applicative m => (a -> m (b, c)) -> [a] -> m ([b], [c]) #

The mapAndUnzipM function maps its first argument over a list, returning the result as a pair of lists. This function is mainly used with complicated data structures or a state monad.

zipWithM :: Applicative m => (a -> b -> m c) -> [a] -> [b] -> m [c] #

The zipWithM function generalizes zipWith to arbitrary applicative functors.

zipWithM_ :: Applicative m => (a -> b -> m c) -> [a] -> [b] -> m () #

zipWithM_ is the extension of zipWithM which ignores the final result.

foldM_ :: (Foldable t, Monad m) => (b -> a -> m b) -> b -> t a -> m () #

Like foldM, but discards the result.

replicateM :: Applicative m => Int -> m a -> m [a] #

replicateM n act performs the action act n times, and then returns the list of results.

replicateM n (pure x) == replicate n x

Examples

Expand
>>> replicateM 3 getLine
hi
heya
hiya
["hi","heya","hiya"]
>>> import Control.Monad.State
>>> runState (replicateM 3 $ state $ \s -> (s, s + 1)) 1
([1,2,3],4)

replicateM_ :: Applicative m => Int -> m a -> m () #

Like replicateM, but discards the result.

Examples

Expand
>>> replicateM_ 3 (putStr "a")
aaa

(<$!>) :: Monad m => (a -> b) -> m a -> m b infixl 4 #

Strict version of <$>.

@since base-4.8.0.0

mfilter :: MonadPlus m => (a -> Bool) -> m a -> m a #

Direct MonadPlus equivalent of filter.

Examples

Expand

The filter function is just mfilter specialized to the list monad:

filter = ( mfilter :: (a -> Bool) -> [a] -> [a] )

An example using mfilter with the Maybe monad:

>>> mfilter odd (Just 1)
Just 1
>>> mfilter odd (Just 2)
Nothing

newtype ZipList a #

Lists, but with an Applicative functor based on zipping.

Examples

Expand

In contrast to the Applicative for List:

>>> (+) <$> [1, 2, 3] <*> [4, 5, 6]
[5,6,7,6,7,8,7,8,9]

The Applicative instance of ZipList applies the operation by pairing up the elements, analogous to zipWithN

>>> (+) <$> ZipList [1, 2, 3] <*> ZipList [4, 5, 6]
ZipList {getZipList = [5,7,9]}
>>> (,,,) <$> ZipList [1, 2] <*> ZipList [3, 4] <*> ZipList [5, 6] <*> ZipList [7, 8]
ZipList {getZipList = [(1,3,5,7),(2,4,6,8)]}
>>> ZipList [(+1), (^2), (/ 2)] <*> ZipList [5, 5, 5]
ZipList {getZipList = [6.0,25.0,2.5]}

Constructors

ZipList 

Fields

Instances

Instances details
NFData1 ZipList

Since: deepseq-1.4.3.0

Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> ZipList a -> () #

Alternative ZipList

@since base-4.11.0.0

Instance details

Defined in GHC.Internal.Functor.ZipList

Methods

empty :: ZipList a #

(<|>) :: ZipList a -> ZipList a -> ZipList a #

some :: ZipList a -> ZipList [a] #

many :: ZipList a -> ZipList [a] #

Applicative ZipList
f <$> ZipList xs1 <*> ... <*> ZipList xsN
    = ZipList (zipWithN f xs1 ... xsN)

where zipWithN refers to the zipWith function of the appropriate arity (zipWith, zipWith3, zipWith4, ...). For example:

(\a b c -> stimes c [a, b]) <$> ZipList "abcd" <*> ZipList "567" <*> ZipList [1..]
    = ZipList (zipWith3 (\a b c -> stimes c [a, b]) "abcd" "567" [1..])
    = ZipList {getZipList = ["a5","b6b6","c7c7c7"]}

@since base-2.01

Instance details

Defined in GHC.Internal.Functor.ZipList

Methods

pure :: a -> ZipList a #

(<*>) :: ZipList (a -> b) -> ZipList a -> ZipList b #

liftA2 :: (a -> b -> c) -> ZipList a -> ZipList b -> ZipList c #

(*>) :: ZipList a -> ZipList b -> ZipList b #

(<*) :: ZipList a -> ZipList b -> ZipList a #

Functor ZipList

@since base-2.01

Instance details

Defined in GHC.Internal.Functor.ZipList

Methods

fmap :: (a -> b) -> ZipList a -> ZipList b #

(<$) :: a -> ZipList b -> ZipList a #

Foldable ZipList

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Functor.ZipList

Methods

fold :: Monoid m => ZipList m -> m #

foldMap :: Monoid m => (a -> m) -> ZipList a -> m #

foldMap' :: Monoid m => (a -> m) -> ZipList a -> m #

foldr :: (a -> b -> b) -> b -> ZipList a -> b #

foldr' :: (a -> b -> b) -> b -> ZipList a -> b #

foldl :: (b -> a -> b) -> b -> ZipList a -> b #

foldl' :: (b -> a -> b) -> b -> ZipList a -> b #

foldr1 :: (a -> a -> a) -> ZipList a -> a #

foldl1 :: (a -> a -> a) -> ZipList a -> a #

toList :: ZipList a -> [a] #

null :: ZipList a -> Bool #

length :: ZipList a -> Int #

elem :: Eq a => a -> ZipList a -> Bool #

maximum :: Ord a => ZipList a -> a #

minimum :: Ord a => ZipList a -> a #

sum :: Num a => ZipList a -> a #

product :: Num a => ZipList a -> a #

Traversable ZipList

@since base-4.9.0.0

Instance details

Defined in GHC.Internal.Functor.ZipList

Methods

traverse :: Applicative f => (a -> f b) -> ZipList a -> f (ZipList b) #

sequenceA :: Applicative f => ZipList (f a) -> f (ZipList a) #

mapM :: Monad m => (a -> m b) -> ZipList a -> m (ZipList b) #

sequence :: Monad m => ZipList (m a) -> m (ZipList a) #

Generic1 ZipList 
Instance details

Defined in GHC.Internal.Functor.ZipList

Associated Types

type Rep1 ZipList

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Functor.ZipList

type Rep1 ZipList = D1 ('MetaData "ZipList" "GHC.Internal.Functor.ZipList" "ghc-internal" 'True) (C1 ('MetaCons "ZipList" 'PrefixI 'True) (S1 ('MetaSel ('Just "getZipList") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 [])))

Methods

from1 :: ZipList a -> Rep1 ZipList a #

to1 :: Rep1 ZipList a -> ZipList a #

FoldableWithIndex Int ZipList 
Instance details

Defined in WithIndex

Methods

ifoldMap :: Monoid m => (Int -> a -> m) -> ZipList a -> m #

ifoldMap' :: Monoid m => (Int -> a -> m) -> ZipList a -> m #

ifoldr :: (Int -> a -> b -> b) -> b -> ZipList a -> b #

ifoldl :: (Int -> b -> a -> b) -> b -> ZipList a -> b #

ifoldr' :: (Int -> a -> b -> b) -> b -> ZipList a -> b #

ifoldl' :: (Int -> b -> a -> b) -> b -> ZipList a -> b #

FunctorWithIndex Int ZipList

Same instance as for [].

Instance details

Defined in WithIndex

Methods

imap :: (Int -> a -> b) -> ZipList a -> ZipList b #

TraversableWithIndex Int ZipList 
Instance details

Defined in WithIndex

Methods

itraverse :: Applicative f => (Int -> a -> f b) -> ZipList a -> f (ZipList b) #

NFData a => NFData (ZipList a)

Since: deepseq-1.4.0.0

Instance details

Defined in Control.DeepSeq

Methods

rnf :: ZipList a -> () #

Data a => Data (ZipList a)

@since base-4.14.0.0

Instance details

Defined in GHC.Internal.Functor.ZipList

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ZipList a -> c (ZipList a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ZipList a) #

toConstr :: ZipList a -> Constr #

dataTypeOf :: ZipList a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (ZipList a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ZipList a)) #

gmapT :: (forall b. Data b => b -> b) -> ZipList a -> ZipList a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ZipList a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ZipList a -> r #

gmapQ :: (forall d. Data d => d -> u) -> ZipList a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ZipList a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ZipList a -> m (ZipList a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ZipList a -> m (ZipList a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ZipList a -> m (ZipList a) #

Generic (ZipList a) 
Instance details

Defined in GHC.Internal.Functor.ZipList

Associated Types

type Rep (ZipList a)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Functor.ZipList

type Rep (ZipList a) = D1 ('MetaData "ZipList" "GHC.Internal.Functor.ZipList" "ghc-internal" 'True) (C1 ('MetaCons "ZipList" 'PrefixI 'True) (S1 ('MetaSel ('Just "getZipList") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [a])))

Methods

from :: ZipList a -> Rep (ZipList a) x #

to :: Rep (ZipList a) x -> ZipList a #

IsList (ZipList a)

@since base-4.15.0.0

Instance details

Defined in GHC.Internal.IsList

Associated Types

type Item (ZipList a) 
Instance details

Defined in GHC.Internal.IsList

type Item (ZipList a) = a

Methods

fromList :: [Item (ZipList a)] -> ZipList a #

fromListN :: Int -> [Item (ZipList a)] -> ZipList a #

toList :: ZipList a -> [Item (ZipList a)] #

Read a => Read (ZipList a)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Functor.ZipList

Show a => Show (ZipList a)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Functor.ZipList

Methods

showsPrec :: Int -> ZipList a -> ShowS #

show :: ZipList a -> String #

showList :: [ZipList a] -> ShowS #

Eq a => Eq (ZipList a)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Functor.ZipList

Methods

(==) :: ZipList a -> ZipList a -> Bool #

(/=) :: ZipList a -> ZipList a -> Bool #

Ord a => Ord (ZipList a)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Functor.ZipList

Methods

compare :: ZipList a -> ZipList a -> Ordering #

(<) :: ZipList a -> ZipList a -> Bool #

(<=) :: ZipList a -> ZipList a -> Bool #

(>) :: ZipList a -> ZipList a -> Bool #

(>=) :: ZipList a -> ZipList a -> Bool #

max :: ZipList a -> ZipList a -> ZipList a #

min :: ZipList a -> ZipList a -> ZipList a #

AsEmpty (ZipList a) 
Instance details

Defined in Control.Lens.Empty

Methods

_Empty :: Prism' (ZipList a) () #

Wrapped (ZipList a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (ZipList a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (ZipList a) = [a]

Methods

_Wrapped' :: Iso' (ZipList a) (Unwrapped (ZipList a)) #

MonoFunctor (ZipList a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (ZipList a) -> Element (ZipList a)) -> ZipList a -> ZipList a #

MonoPointed (ZipList a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (ZipList a) -> ZipList a #

t ~ ZipList b => Rewrapped (ZipList a) t 
Instance details

Defined in Control.Lens.Wrapped

Cons (ZipList a) (ZipList b) a b 
Instance details

Defined in Control.Lens.Cons

Methods

_Cons :: Prism (ZipList a) (ZipList b) (a, ZipList a) (b, ZipList b) #

Snoc (ZipList a) (ZipList b) a b 
Instance details

Defined in Control.Lens.Cons

Methods

_Snoc :: Prism (ZipList a) (ZipList b) (ZipList a, a) (ZipList b, b) #

type Rep1 ZipList

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Functor.ZipList

type Rep1 ZipList = D1 ('MetaData "ZipList" "GHC.Internal.Functor.ZipList" "ghc-internal" 'True) (C1 ('MetaCons "ZipList" 'PrefixI 'True) (S1 ('MetaSel ('Just "getZipList") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 [])))
type Rep (ZipList a)

@since base-4.7.0.0

Instance details

Defined in GHC.Internal.Functor.ZipList

type Rep (ZipList a) = D1 ('MetaData "ZipList" "GHC.Internal.Functor.ZipList" "ghc-internal" 'True) (C1 ('MetaCons "ZipList" 'PrefixI 'True) (S1 ('MetaSel ('Just "getZipList") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [a])))
type Item (ZipList a) 
Instance details

Defined in GHC.Internal.IsList

type Item (ZipList a) = a
type Unwrapped (ZipList a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (ZipList a) = [a]
type Element (ZipList a) 
Instance details

Defined in Data.MonoTraversable

type Element (ZipList a) = a

data Item a #

This has everything each log message will contain.

Instances

Instances details
Functor Item 
Instance details

Defined in Katip.Core

Methods

fmap :: (a -> b) -> Item a -> Item b #

(<$) :: a -> Item b -> Item a #

FromJSON a => FromJSON (Item a) 
Instance details

Defined in Katip.Core

ToJSON a => ToJSON (Item a) 
Instance details

Defined in Katip.Core

Generic (Item a) 
Instance details

Defined in Katip.Core

Methods

from :: Item a -> Rep (Item a) x #

to :: Rep (Item a) x -> Item a #

Show a => Show (Item a) 
Instance details

Defined in Katip.Core

Methods

showsPrec :: Int -> Item a -> ShowS #

show :: Item a -> String #

showList :: [Item a] -> ShowS #

Eq a => Eq (Item a) 
Instance details

Defined in Katip.Core

Methods

(==) :: Item a -> Item a -> Bool #

(/=) :: Item a -> Item a -> Bool #

type Rep (Item a) 
Instance details

Defined in Katip.Core

newtype WrappedArrow (a :: Type -> Type -> Type) b c #

Constructors

WrapArrow 

Fields

Instances

Instances details
Generic1 (WrappedArrow a b :: Type -> Type) 
Instance details

Defined in Control.Applicative

Associated Types

type Rep1 (WrappedArrow a b :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Control.Applicative

type Rep1 (WrappedArrow a b :: Type -> Type) = D1 ('MetaData "WrappedArrow" "Control.Applicative" "base" 'True) (C1 ('MetaCons "WrapArrow" 'PrefixI 'True) (S1 ('MetaSel ('Just "unwrapArrow") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 (a b))))

Methods

from1 :: WrappedArrow a b a0 -> Rep1 (WrappedArrow a b) a0 #

to1 :: Rep1 (WrappedArrow a b) a0 -> WrappedArrow a b a0 #

(ArrowZero a, ArrowPlus a) => Alternative (WrappedArrow a b)

Since: base-2.1

Instance details

Defined in Control.Applicative

Methods

empty :: WrappedArrow a b a0 #

(<|>) :: WrappedArrow a b a0 -> WrappedArrow a b a0 -> WrappedArrow a b a0 #

some :: WrappedArrow a b a0 -> WrappedArrow a b [a0] #

many :: WrappedArrow a b a0 -> WrappedArrow a b [a0] #

Arrow a => Applicative (WrappedArrow a b)

Since: base-2.1

Instance details

Defined in Control.Applicative

Methods

pure :: a0 -> WrappedArrow a b a0 #

(<*>) :: WrappedArrow a b (a0 -> b0) -> WrappedArrow a b a0 -> WrappedArrow a b b0 #

liftA2 :: (a0 -> b0 -> c) -> WrappedArrow a b a0 -> WrappedArrow a b b0 -> WrappedArrow a b c #

(*>) :: WrappedArrow a b a0 -> WrappedArrow a b b0 -> WrappedArrow a b b0 #

(<*) :: WrappedArrow a b a0 -> WrappedArrow a b b0 -> WrappedArrow a b a0 #

Arrow a => Functor (WrappedArrow a b)

Since: base-2.1

Instance details

Defined in Control.Applicative

Methods

fmap :: (a0 -> b0) -> WrappedArrow a b a0 -> WrappedArrow a b b0 #

(<$) :: a0 -> WrappedArrow a b b0 -> WrappedArrow a b a0 #

(Typeable a, Typeable b, Typeable c, Data (a b c)) => Data (WrappedArrow a b c)

Since: base-4.14.0.0

Instance details

Defined in Control.Applicative

Methods

gfoldl :: (forall d b0. Data d => c0 (d -> b0) -> d -> c0 b0) -> (forall g. g -> c0 g) -> WrappedArrow a b c -> c0 (WrappedArrow a b c) #

gunfold :: (forall b0 r. Data b0 => c0 (b0 -> r) -> c0 r) -> (forall r. r -> c0 r) -> Constr -> c0 (WrappedArrow a b c) #

toConstr :: WrappedArrow a b c -> Constr #

dataTypeOf :: WrappedArrow a b c -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c0 (t d)) -> Maybe (c0 (WrappedArrow a b c)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c0 (t d e)) -> Maybe (c0 (WrappedArrow a b c)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> WrappedArrow a b c -> WrappedArrow a b c #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WrappedArrow a b c -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WrappedArrow a b c -> r #

gmapQ :: (forall d. Data d => d -> u) -> WrappedArrow a b c -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> WrappedArrow a b c -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> WrappedArrow a b c -> m (WrappedArrow a b c) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> WrappedArrow a b c -> m (WrappedArrow a b c) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> WrappedArrow a b c -> m (WrappedArrow a b c) #

Generic (WrappedArrow a b c) 
Instance details

Defined in Control.Applicative

Associated Types

type Rep (WrappedArrow a b c)

Since: base-4.7.0.0

Instance details

Defined in Control.Applicative

type Rep (WrappedArrow a b c) = D1 ('MetaData "WrappedArrow" "Control.Applicative" "base" 'True) (C1 ('MetaCons "WrapArrow" 'PrefixI 'True) (S1 ('MetaSel ('Just "unwrapArrow") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (a b c))))

Methods

from :: WrappedArrow a b c -> Rep (WrappedArrow a b c) x #

to :: Rep (WrappedArrow a b c) x -> WrappedArrow a b c #

Wrapped (WrappedArrow a b c) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (WrappedArrow a b c) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (WrappedArrow a b c) = a b c

Methods

_Wrapped' :: Iso' (WrappedArrow a b c) (Unwrapped (WrappedArrow a b c)) #

Arrow a => MonoFunctor (WrappedArrow a b c) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (WrappedArrow a b c) -> Element (WrappedArrow a b c)) -> WrappedArrow a b c -> WrappedArrow a b c #

Arrow a => MonoPointed (WrappedArrow a b c) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (WrappedArrow a b c) -> WrappedArrow a b c #

t ~ WrappedArrow a' b' c' => Rewrapped (WrappedArrow a b c) t 
Instance details

Defined in Control.Lens.Wrapped

type Rep1 (WrappedArrow a b :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Control.Applicative

type Rep1 (WrappedArrow a b :: Type -> Type) = D1 ('MetaData "WrappedArrow" "Control.Applicative" "base" 'True) (C1 ('MetaCons "WrapArrow" 'PrefixI 'True) (S1 ('MetaSel ('Just "unwrapArrow") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 (a b))))
type Rep (WrappedArrow a b c)

Since: base-4.7.0.0

Instance details

Defined in Control.Applicative

type Rep (WrappedArrow a b c) = D1 ('MetaData "WrappedArrow" "Control.Applicative" "base" 'True) (C1 ('MetaCons "WrapArrow" 'PrefixI 'True) (S1 ('MetaSel ('Just "unwrapArrow") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (a b c))))
type Unwrapped (WrappedArrow a b c) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (WrappedArrow a b c) = a b c
type Element (WrappedArrow a b c) 
Instance details

Defined in Data.MonoTraversable

type Element (WrappedArrow a b c) = c

newtype WrappedMonad (m :: Type -> Type) a #

Constructors

WrapMonad 

Fields

Instances

Instances details
Generic1 (WrappedMonad m :: Type -> Type) 
Instance details

Defined in Control.Applicative

Associated Types

type Rep1 (WrappedMonad m :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Control.Applicative

type Rep1 (WrappedMonad m :: Type -> Type) = D1 ('MetaData "WrappedMonad" "Control.Applicative" "base" 'True) (C1 ('MetaCons "WrapMonad" 'PrefixI 'True) (S1 ('MetaSel ('Just "unwrapMonad") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 m)))

Methods

from1 :: WrappedMonad m a -> Rep1 (WrappedMonad m) a #

to1 :: Rep1 (WrappedMonad m) a -> WrappedMonad m a #

MonadPlus m => Alternative (WrappedMonad m)

Since: base-2.1

Instance details

Defined in Control.Applicative

Methods

empty :: WrappedMonad m a #

(<|>) :: WrappedMonad m a -> WrappedMonad m a -> WrappedMonad m a #

some :: WrappedMonad m a -> WrappedMonad m [a] #

many :: WrappedMonad m a -> WrappedMonad m [a] #

Monad m => Applicative (WrappedMonad m)

Since: base-2.1

Instance details

Defined in Control.Applicative

Methods

pure :: a -> WrappedMonad m a #

(<*>) :: WrappedMonad m (a -> b) -> WrappedMonad m a -> WrappedMonad m b #

liftA2 :: (a -> b -> c) -> WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m c #

(*>) :: WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m b #

(<*) :: WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m a #

Monad m => Functor (WrappedMonad m)

Since: base-2.1

Instance details

Defined in Control.Applicative

Methods

fmap :: (a -> b) -> WrappedMonad m a -> WrappedMonad m b #

(<$) :: a -> WrappedMonad m b -> WrappedMonad m a #

Monad m => Monad (WrappedMonad m)

Since: base-4.7.0.0

Instance details

Defined in Control.Applicative

Methods

(>>=) :: WrappedMonad m a -> (a -> WrappedMonad m b) -> WrappedMonad m b #

(>>) :: WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m b #

return :: a -> WrappedMonad m a #

(Typeable m, Typeable a, Data (m a)) => Data (WrappedMonad m a)

Since: base-4.14.0.0

Instance details

Defined in Control.Applicative

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> WrappedMonad m a -> c (WrappedMonad m a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (WrappedMonad m a) #

toConstr :: WrappedMonad m a -> Constr #

dataTypeOf :: WrappedMonad m a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (WrappedMonad m a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (WrappedMonad m a)) #

gmapT :: (forall b. Data b => b -> b) -> WrappedMonad m a -> WrappedMonad m a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WrappedMonad m a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WrappedMonad m a -> r #

gmapQ :: (forall d. Data d => d -> u) -> WrappedMonad m a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> WrappedMonad m a -> u #

gmapM :: Monad m0 => (forall d. Data d => d -> m0 d) -> WrappedMonad m a -> m0 (WrappedMonad m a) #

gmapMp :: MonadPlus m0 => (forall d. Data d => d -> m0 d) -> WrappedMonad m a -> m0 (WrappedMonad m a) #

gmapMo :: MonadPlus m0 => (forall d. Data d => d -> m0 d) -> WrappedMonad m a -> m0 (WrappedMonad m a) #

Generic (WrappedMonad m a) 
Instance details

Defined in Control.Applicative

Associated Types

type Rep (WrappedMonad m a)

Since: base-4.7.0.0

Instance details

Defined in Control.Applicative

type Rep (WrappedMonad m a) = D1 ('MetaData "WrappedMonad" "Control.Applicative" "base" 'True) (C1 ('MetaCons "WrapMonad" 'PrefixI 'True) (S1 ('MetaSel ('Just "unwrapMonad") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (m a))))

Methods

from :: WrappedMonad m a -> Rep (WrappedMonad m a) x #

to :: Rep (WrappedMonad m a) x -> WrappedMonad m a #

Wrapped (WrappedMonad m a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (WrappedMonad m a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (WrappedMonad m a) = m a
Monad m => MonoFunctor (WrappedMonad m a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (WrappedMonad m a) -> Element (WrappedMonad m a)) -> WrappedMonad m a -> WrappedMonad m a #

Monad m => MonoPointed (WrappedMonad m a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (WrappedMonad m a) -> WrappedMonad m a #

t ~ WrappedMonad m' a' => Rewrapped (WrappedMonad m a) t 
Instance details

Defined in Control.Lens.Wrapped

type Rep1 (WrappedMonad m :: Type -> Type)

Since: base-4.7.0.0

Instance details

Defined in Control.Applicative

type Rep1 (WrappedMonad m :: Type -> Type) = D1 ('MetaData "WrappedMonad" "Control.Applicative" "base" 'True) (C1 ('MetaCons "WrapMonad" 'PrefixI 'True) (S1 ('MetaSel ('Just "unwrapMonad") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 m)))
type Rep (WrappedMonad m a)

Since: base-4.7.0.0

Instance details

Defined in Control.Applicative

type Rep (WrappedMonad m a) = D1 ('MetaData "WrappedMonad" "Control.Applicative" "base" 'True) (C1 ('MetaCons "WrapMonad" 'PrefixI 'True) (S1 ('MetaSel ('Just "unwrapMonad") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (m a))))
type Unwrapped (WrappedMonad m a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (WrappedMonad m a) = m a
type Element (WrappedMonad m a) 
Instance details

Defined in Data.MonoTraversable

type Element (WrappedMonad m a) = a

data ExternFun #

Instances

Instances details
NFData ExternFun 
Instance details

Defined in Napkin.Types.Core

Methods

rnf :: ExternFun -> () #

Data ExternFun 
Instance details

Defined in Napkin.Types.Core

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ExternFun -> c ExternFun #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ExternFun #

toConstr :: ExternFun -> Constr #

dataTypeOf :: ExternFun -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ExternFun) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ExternFun) #

gmapT :: (forall b. Data b => b -> b) -> ExternFun -> ExternFun #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ExternFun -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ExternFun -> r #

gmapQ :: (forall d. Data d => d -> u) -> ExternFun -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ExternFun -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ExternFun -> m ExternFun #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ExternFun -> m ExternFun #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ExternFun -> m ExternFun #

Generic ExternFun 
Instance details

Defined in Napkin.Types.Core

Associated Types

type Rep ExternFun 
Instance details

Defined in Napkin.Types.Core

type Rep ExternFun = D1 ('MetaData "ExternFun" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) ((C1 ('MetaCons "SimpleExtern" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Ref Function)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [SExp])) :+: (C1 ('MetaCons "ParensExtern" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [ParensOperator])) :+: C1 ('MetaCons "ModExtern" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Ref Function)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [SExp]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FunModifier]))))) :+: (C1 ('MetaCons "Cast" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SExp) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type)) :+: (C1 ('MetaCons "SafeCast" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SExp) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type)) :+: C1 ('MetaCons "ExternRaw" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))))
Show ExternFun 
Instance details

Defined in Napkin.Types.Core

Eq ExternFun 
Instance details

Defined in Napkin.Types.Core

Ord ExternFun 
Instance details

Defined in Napkin.Types.Core

HasDeps ExternFun 
Instance details

Defined in Napkin.Types.Deps

FunRenamer ExternFun 
Instance details

Defined in Napkin.Types.QueryTransformer

TableRenamer ExternFun 
Instance details

Defined in Napkin.Types.QueryTransformer

Lift ExternFun 
Instance details

Defined in Napkin.Types.Core

Methods

lift :: Quote m => ExternFun -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => ExternFun -> Code m ExternFun #

type Rep ExternFun 
Instance details

Defined in Napkin.Types.Core

type Rep ExternFun = D1 ('MetaData "ExternFun" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) ((C1 ('MetaCons "SimpleExtern" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Ref Function)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [SExp])) :+: (C1 ('MetaCons "ParensExtern" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [ParensOperator])) :+: C1 ('MetaCons "ModExtern" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Ref Function)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [SExp]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FunModifier]))))) :+: (C1 ('MetaCons "Cast" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SExp) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type)) :+: (C1 ('MetaCons "SafeCast" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SExp) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type)) :+: C1 ('MetaCons "ExternRaw" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))))

data From #

Instances

Instances details
NFData From 
Instance details

Defined in Napkin.Types.Core

Methods

rnf :: From -> () #

Data From 
Instance details

Defined in Napkin.Types.Core

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> From -> c From #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c From #

toConstr :: From -> Constr #

dataTypeOf :: From -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c From) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c From) #

gmapT :: (forall b. Data b => b -> b) -> From -> From #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> From -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> From -> r #

gmapQ :: (forall d. Data d => d -> u) -> From -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> From -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> From -> m From #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> From -> m From #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> From -> m From #

Generic From 
Instance details

Defined in Napkin.Types.Core

Associated Types

type Rep From 
Instance details

Defined in Napkin.Types.Core

Methods

from :: From -> Rep From x #

to :: Rep From x -> From #

Show From 
Instance details

Defined in Napkin.Types.Core

Methods

showsPrec :: Int -> From -> ShowS #

show :: From -> String #

showList :: [From] -> ShowS #

Eq From 
Instance details

Defined in Napkin.Types.Core

Methods

(==) :: From -> From -> Bool #

(/=) :: From -> From -> Bool #

Ord From 
Instance details

Defined in Napkin.Types.Core

Methods

compare :: From -> From -> Ordering #

(<) :: From -> From -> Bool #

(<=) :: From -> From -> Bool #

(>) :: From -> From -> Bool #

(>=) :: From -> From -> Bool #

max :: From -> From -> From #

min :: From -> From -> From #

HasDeps From 
Instance details

Defined in Napkin.Types.Deps

FunRenamer From 
Instance details

Defined in Napkin.Types.QueryTransformer

Methods

renameFun :: (Ref Function -> Ref Function) -> From -> From #

TableRenamer From 
Instance details

Defined in Napkin.Types.QueryTransformer

Methods

renameTableRef :: (Ref Table -> Ref Table) -> From -> From #

Lift From 
Instance details

Defined in Napkin.Types.Core

Methods

lift :: Quote m => From -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => From -> Code m From #

type Rep From 
Instance details

Defined in Napkin.Types.Core

isEmpty :: SExp -> SExp #

Common case of a string column possibly being empty either by being a blank string or properly being NULL.

table :: forall {k} (a :: k). Ref a -> Relation #

treat a reference as relation

var :: forall {k} (a :: k). Ref a -> SExp #

data InsertStatement #

Constructors

Insert 

Instances

Instances details
Generic InsertStatement 
Instance details

Defined in Napkin.Run.Effects.Languages.StatementParse

Associated Types

type Rep InsertStatement 
Instance details

Defined in Napkin.Run.Effects.Languages.StatementParse

type Rep InsertStatement = D1 ('MetaData "InsertStatement" "Napkin.Run.Effects.Languages.StatementParse" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "Insert" 'PrefixI 'True) (S1 ('MetaSel ('Just "names") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty Name)) :*: (S1 ('MetaSel ('Just "columnNames") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe [Name])) :*: S1 ('MetaSel ('Just "source") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 InsertSource))))
Show InsertStatement 
Instance details

Defined in Napkin.Run.Effects.Languages.StatementParse

Eq InsertStatement 
Instance details

Defined in Napkin.Run.Effects.Languages.StatementParse

Stateable InsertStatement 
Instance details

Defined in Napkin.Run.Effects.Languages.StatementParse

type Rep InsertStatement 
Instance details

Defined in Napkin.Run.Effects.Languages.StatementParse

type Rep InsertStatement = D1 ('MetaData "InsertStatement" "Napkin.Run.Effects.Languages.StatementParse" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "Insert" 'PrefixI 'True) (S1 ('MetaSel ('Just "names") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty Name)) :*: (S1 ('MetaSel ('Just "columnNames") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe [Name])) :*: S1 ('MetaSel ('Just "source") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 InsertSource))))

data External (m :: k) a where #

Constructors

ExecuteExternalCommand' :: forall {k} (m :: k). ExternalCommand -> External m (Either Text ExitCode) 

Instances

Instances details
ToDumpItem (b :: k) (External :: (Type -> Type) -> Type -> Type) 
Instance details

Defined in Napkin.Run.Effects.Interceptors.LogProgram.Types

Methods

toDumpItem :: forall (r :: EffectRow) x. External (Sem r) x -> DumpItem b #

GEq (External a :: Type -> Type) 
Instance details

Defined in Napkin.Run.Effects.Languages.External

Methods

geq :: External a a0 -> External a b -> Maybe (a0 :~: b) #

GShow (External t :: Type -> Type) 
Instance details

Defined in Napkin.Run.Effects.Languages.External

Methods

gshowsPrec :: Int -> External t a -> ShowS #

Show (External m a) 
Instance details

Defined in Napkin.Run.Effects.Languages.External

Methods

showsPrec :: Int -> External m a -> ShowS #

show :: External m a -> String #

showList :: [External m a] -> ShowS #

Eq (External m a) 
Instance details

Defined in Napkin.Run.Effects.Languages.External

Methods

(==) :: External m a -> External m a -> Bool #

(/=) :: External m a -> External m a -> Bool #

external :: forall {k} (b :: k) (r :: EffectRow). Members '[FatalError :: (Type -> Type) -> Type -> Type, SqlRead b :: (Type -> Type) -> Type -> Type, External :: (Type -> Type) -> Type -> Type, Reader TargetName, Output ExtraDependencies :: (Type -> Type) -> Type -> Type, Input MetaArguments :: (Type -> Type) -> Type -> Type] r => Set (Ref Table) -> ExternalCommand -> Sem r () #

data Table #

Instances

Instances details
Data Table 
Instance details

Defined in Napkin.Types.Core

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Table -> c Table #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Table #

toConstr :: Table -> Constr #

dataTypeOf :: Table -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Table) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Table) #

gmapT :: (forall b. Data b => b -> b) -> Table -> Table #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Table -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Table -> r #

gmapQ :: (forall d. Data d => d -> u) -> Table -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Table -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Table -> m Table #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Table -> m Table #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Table -> m Table #

TableRenamer (Alias Table) 
Instance details

Defined in Napkin.Types.QueryTransformer

TableRenamer (Selected Table) 
Instance details

Defined in Napkin.Types.QueryTransformer

TableRef (Ref Table) 
Instance details

Defined in Napkin.Types.Core

HasDeps (Ref Table) 
Instance details

Defined in Napkin.Types.Deps

TableRenamer (Ref Table) 
Instance details

Defined in Napkin.Types.QueryTransformer

class Default a where #

A class for types with a default value.

Minimal complete definition

Nothing

Methods

def :: a #

The default value for this type.

default def :: (Generic a, GDefault (Rep a)) => a #

Instances

Instances details
Default All 
Instance details

Defined in Data.Default.Class

Methods

def :: All #

Default Any 
Instance details

Defined in Data.Default.Class

Methods

def :: Any #

Default CClock 
Instance details

Defined in Data.Default.Class

Methods

def :: CClock #

Default CDouble 
Instance details

Defined in Data.Default.Class

Methods

def :: CDouble #

Default CFloat 
Instance details

Defined in Data.Default.Class

Methods

def :: CFloat #

Default CInt 
Instance details

Defined in Data.Default.Class

Methods

def :: CInt #

Default CIntMax 
Instance details

Defined in Data.Default.Class

Methods

def :: CIntMax #

Default CIntPtr 
Instance details

Defined in Data.Default.Class

Methods

def :: CIntPtr #

Default CLLong 
Instance details

Defined in Data.Default.Class

Methods

def :: CLLong #

Default CLong 
Instance details

Defined in Data.Default.Class

Methods

def :: CLong #

Default CPtrdiff 
Instance details

Defined in Data.Default.Class

Methods

def :: CPtrdiff #

Default CSUSeconds 
Instance details

Defined in Data.Default.Class

Methods

def :: CSUSeconds #

Default CShort 
Instance details

Defined in Data.Default.Class

Methods

def :: CShort #

Default CSigAtomic 
Instance details

Defined in Data.Default.Class

Methods

def :: CSigAtomic #

Default CSize 
Instance details

Defined in Data.Default.Class

Methods

def :: CSize #

Default CTime 
Instance details

Defined in Data.Default.Class

Methods

def :: CTime #

Default CUInt 
Instance details

Defined in Data.Default.Class

Methods

def :: CUInt #

Default CUIntMax 
Instance details

Defined in Data.Default.Class

Methods

def :: CUIntMax #

Default CUIntPtr 
Instance details

Defined in Data.Default.Class

Methods

def :: CUIntPtr #

Default CULLong 
Instance details

Defined in Data.Default.Class

Methods

def :: CULLong #

Default CULong 
Instance details

Defined in Data.Default.Class

Methods

def :: CULong #

Default CUSeconds 
Instance details

Defined in Data.Default.Class

Methods

def :: CUSeconds #

Default CUShort 
Instance details

Defined in Data.Default.Class

Methods

def :: CUShort #

Default Int16 
Instance details

Defined in Data.Default.Class

Methods

def :: Int16 #

Default Int32 
Instance details

Defined in Data.Default.Class

Methods

def :: Int32 #

Default Int64 
Instance details

Defined in Data.Default.Class

Methods

def :: Int64 #

Default Int8 
Instance details

Defined in Data.Default.Class

Methods

def :: Int8 #

Default Word16 
Instance details

Defined in Data.Default.Class

Methods

def :: Word16 #

Default Word32 
Instance details

Defined in Data.Default.Class

Methods

def :: Word32 #

Default Word64 
Instance details

Defined in Data.Default.Class

Methods

def :: Word64 #

Default Word8 
Instance details

Defined in Data.Default.Class

Methods

def :: Word8 #

Default Ordering 
Instance details

Defined in Data.Default.Class

Methods

def :: Ordering #

Default OAuth2 
Instance details

Defined in Network.OAuth.OAuth2.Internal

Methods

def :: OAuth2 #

Default MaterializedViewMeta 
Instance details

Defined in Napkin.Types.BigQuery

Default TableMeta 
Instance details

Defined in Napkin.Types.BigQuery

Methods

def :: TableMeta #

Default TimePartitioning 
Instance details

Defined in Napkin.Types.BigQuery

Default ViewMeta 
Instance details

Defined in Napkin.Types.BigQuery

Methods

def :: ViewMeta #

Default SubQueryTransformState 
Instance details

Defined in Napkin.Untyped.Ops.BigQuery

Default MaterializedViewMeta 
Instance details

Defined in Napkin.Types.Postgres

Default TableMeta 
Instance details

Defined in Napkin.Types.Postgres

Methods

def :: TableMeta #

Default ContinuousViewMeta 
Instance details

Defined in Napkin.Types.Postgres.Timescale

Default TimescaleViewMeta 
Instance details

Defined in Napkin.Types.Postgres.Timescale

Default DistStyle 
Instance details

Defined in Napkin.Types.Redshift

Methods

def :: DistStyle #

Default SortStyle 
Instance details

Defined in Napkin.Types.Redshift

Methods

def :: SortStyle #

Default TableMeta 
Instance details

Defined in Napkin.Types.Redshift

Methods

def :: TableMeta #

Default Distinctness 
Instance details

Defined in Napkin.Types.Core

Methods

def :: Distinctness #

Default WOver 
Instance details

Defined in Napkin.Types.Core

Methods

def :: WOver #

Default WithClauses 
Instance details

Defined in Napkin.Types.Core

Methods

def :: WithClauses #

Default SqlTemplateVariables 
Instance details

Defined in Napkin.Parse.Interpolation.Types

Default AssertionGroup 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

Methods

def :: AssertionGroup #

Default InsertColumnsList 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlWrite

Default ExtraDependencies 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

Default HiddenArtifacts 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

Default HiddenDependencies 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

Default CustomValidator 
Instance details

Defined in Napkin.Spec.Types.Spec

Default Options 
Instance details

Defined in Web.Scotty.Internal.Types

Methods

def :: Options #

Default RouteOptions 
Instance details

Defined in Web.Scotty.Internal.Types

Methods

def :: RouteOptions #

Default ScottyResponse 
Instance details

Defined in Web.Scotty.Internal.Types

Methods

def :: ScottyResponse #

Default Integer 
Instance details

Defined in Data.Default.Class

Methods

def :: Integer #

Default () 
Instance details

Defined in Data.Default.Class

Methods

def :: () #

Default Double 
Instance details

Defined in Data.Default.Class

Methods

def :: Double #

Default Float 
Instance details

Defined in Data.Default.Class

Methods

def :: Float #

Default Int 
Instance details

Defined in Data.Default.Class

Methods

def :: Int #

Default Word 
Instance details

Defined in Data.Default.Class

Methods

def :: Word #

(Default a, RealFloat a) => Default (Complex a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Complex a #

Default (First a) 
Instance details

Defined in Data.Default.Class

Methods

def :: First a #

Default (Last a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Last a #

Default a => Default (Dual a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Dual a #

Default (Endo a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Endo a #

Num a => Default (Product a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Product a #

Num a => Default (Sum a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Sum a #

Integral a => Default (Ratio a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Ratio a #

Default a => Default (IO a) 
Instance details

Defined in Data.Default.Class

Methods

def :: IO a #

Default (BoolOrOpts a) 
Instance details

Defined in Napkin.Types.Postgres.Timescale

Methods

def :: BoolOrOpts a #

Default a => Default (ContinuousAggregatePolicy' a) 
Instance details

Defined in Napkin.Types.Postgres.Timescale

Default (ResultCache a) 
Instance details

Defined in Polysemy.Memoize

Methods

def :: ResultCache a #

Default (Specs b) 
Instance details

Defined in Napkin.Spec.Types.Spec

Methods

def :: Specs b #

Default (Maybe a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Maybe a #

Default [a] 
Instance details

Defined in Data.Default.Class

Methods

def :: [a] #

(Default a, Default b) => Default (a, b) 
Instance details

Defined in Data.Default.Class

Methods

def :: (a, b) #

Default r => Default (e -> r) 
Instance details

Defined in Data.Default.Class

Methods

def :: e -> r #

(Default a, Default b, Default c) => Default (a, b, c) 
Instance details

Defined in Data.Default.Class

Methods

def :: (a, b, c) #

(Default a, Default b, Default c, Default d) => Default (a, b, c, d) 
Instance details

Defined in Data.Default.Class

Methods

def :: (a, b, c, d) #

(Default a, Default b, Default c, Default d, Default e) => Default (a, b, c, d, e) 
Instance details

Defined in Data.Default.Class

Methods

def :: (a, b, c, d, e) #

(Default a, Default b, Default c, Default d, Default e, Default f) => Default (a, b, c, d, e, f) 
Instance details

Defined in Data.Default.Class

Methods

def :: (a, b, c, d, e, f) #

(Default a, Default b, Default c, Default d, Default e, Default f, Default g) => Default (a, b, c, d, e, f, g) 
Instance details

Defined in Data.Default.Class

Methods

def :: (a, b, c, d, e, f, g) #

data DiffTime #

This is a length of time, as measured by a clock. Conversion functions such as fromInteger and realToFrac will treat it as seconds. For example, (0.010 :: DiffTime) corresponds to 10 milliseconds.

It has a precision of one picosecond (= 10^-12 s). Enumeration functions will treat it as picoseconds.

Instances

Instances details
FromJSON DiffTime

This instance includes a bounds check to prevent maliciously large inputs to fill up the memory of the target system. You can newtype Scientific and provide your own instance using withScientific if you want to allow larger inputs.

Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON DiffTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

NFData DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Methods

rnf :: DiffTime -> () #

Buildable DiffTime 
Instance details

Defined in Formatting.Buildable

Methods

build :: DiffTime -> Builder #

Data DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DiffTime -> c DiffTime #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DiffTime #

toConstr :: DiffTime -> Constr #

dataTypeOf :: DiffTime -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DiffTime) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DiffTime) #

gmapT :: (forall b. Data b => b -> b) -> DiffTime -> DiffTime #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DiffTime -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DiffTime -> r #

gmapQ :: (forall d. Data d => d -> u) -> DiffTime -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DiffTime -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DiffTime -> m DiffTime #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DiffTime -> m DiffTime #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DiffTime -> m DiffTime #

Enum DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Num DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Read DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Fractional DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Real DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

RealFrac DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Methods

properFraction :: Integral b => DiffTime -> (b, DiffTime) #

truncate :: Integral b => DiffTime -> b #

round :: Integral b => DiffTime -> b #

ceiling :: Integral b => DiffTime -> b #

floor :: Integral b => DiffTime -> b #

Show DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Eq DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Ord DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

dropView :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => Ref Table -> MissingBehavior -> Cascade -> Sem r () #

data TimeLocale #

Constructors

TimeLocale 

Fields

data CreateTableDDL #

Constructors

CreateTableDDL 

Instances

Instances details
Generic CreateTableDDL 
Instance details

Defined in Napkin.Run.Effects.Languages.StatementParse

Associated Types

type Rep CreateTableDDL 
Instance details

Defined in Napkin.Run.Effects.Languages.StatementParse

type Rep CreateTableDDL = D1 ('MetaData "CreateTableDDL" "Napkin.Run.Effects.Languages.StatementParse" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "CreateTableDDL" 'PrefixI 'True) (S1 ('MetaSel ('Just "names") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty Name)) :*: S1 ('MetaSel ('Just "columns") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [TableElement])))
Show CreateTableDDL 
Instance details

Defined in Napkin.Run.Effects.Languages.StatementParse

Eq CreateTableDDL 
Instance details

Defined in Napkin.Run.Effects.Languages.StatementParse

Stateable CreateTableDDL 
Instance details

Defined in Napkin.Run.Effects.Languages.StatementParse

type Rep CreateTableDDL 
Instance details

Defined in Napkin.Run.Effects.Languages.StatementParse

type Rep CreateTableDDL = D1 ('MetaData "CreateTableDDL" "Napkin.Run.Effects.Languages.StatementParse" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "CreateTableDDL" 'PrefixI 'True) (S1 ('MetaSel ('Just "names") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty Name)) :*: S1 ('MetaSel ('Just "columns") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [TableElement])))

newtype LogStr #

Log message with Builder underneath; use <> to concat in O(1).

Constructors

LogStr 

Fields

Instances

Instances details
FromJSON LogStr 
Instance details

Defined in Katip.Core

Monoid LogStr 
Instance details

Defined in Katip.Core

Semigroup LogStr 
Instance details

Defined in Katip.Core

IsString LogStr 
Instance details

Defined in Katip.Core

Methods

fromString :: String -> LogStr #

Generic LogStr 
Instance details

Defined in Katip.Core

Associated Types

type Rep LogStr 
Instance details

Defined in Katip.Core

type Rep LogStr = D1 ('MetaData "LogStr" "Katip.Core" "katip-0.8.8.2-6lLMmxWNR0z6aY6MiVew6C" 'True) (C1 ('MetaCons "LogStr" 'PrefixI 'True) (S1 ('MetaSel ('Just "unLogStr") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Builder)))

Methods

from :: LogStr -> Rep LogStr x #

to :: Rep LogStr x -> LogStr #

Show LogStr 
Instance details

Defined in Katip.Core

Eq LogStr 
Instance details

Defined in Katip.Core

Methods

(==) :: LogStr -> LogStr -> Bool #

(/=) :: LogStr -> LogStr -> Bool #

type Rep LogStr 
Instance details

Defined in Katip.Core

type Rep LogStr = D1 ('MetaData "LogStr" "Katip.Core" "katip-0.8.8.2-6lLMmxWNR0z6aY6MiVew6C" 'True) (C1 ('MetaCons "LogStr" 'PrefixI 'True) (S1 ('MetaSel ('Just "unLogStr") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Builder)))

type Partition = [SExp] #

data NominalDiffTime #

This is a length of time, as measured by UTC. It has a precision of 10^-12 s.

Conversion functions such as fromInteger and realToFrac will treat it as seconds. For example, (0.010 :: NominalDiffTime) corresponds to 10 milliseconds.

It has a precision of one picosecond (= 10^-12 s). Enumeration functions will treat it as picoseconds.

It ignores leap-seconds, so it's not necessarily a fixed amount of clock time. For instance, 23:00 UTC + 2 hours of NominalDiffTime = 01:00 UTC (+ 1 day), regardless of whether a leap-second intervened.

Instances

Instances details
FromJSON NominalDiffTime

This instance includes a bounds check to prevent maliciously large inputs to fill up the memory of the target system. You can newtype Scientific and provide your own instance using withScientific if you want to allow larger inputs.

Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON NominalDiffTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

NFData NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Methods

rnf :: NominalDiffTime -> () #

Buildable NominalDiffTime 
Instance details

Defined in Formatting.Buildable

Data NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NominalDiffTime -> c NominalDiffTime #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NominalDiffTime #

toConstr :: NominalDiffTime -> Constr #

dataTypeOf :: NominalDiffTime -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NominalDiffTime) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NominalDiffTime) #

gmapT :: (forall b. Data b => b -> b) -> NominalDiffTime -> NominalDiffTime #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NominalDiffTime -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NominalDiffTime -> r #

gmapQ :: (forall d. Data d => d -> u) -> NominalDiffTime -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> NominalDiffTime -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NominalDiffTime -> m NominalDiffTime #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NominalDiffTime -> m NominalDiffTime #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NominalDiffTime -> m NominalDiffTime #

Enum NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Num NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Read NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Fractional NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Real NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

RealFrac NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Show NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Eq NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Ord NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

FromFormKey NominalDiffTime 
Instance details

Defined in Web.Internal.FormUrlEncoded

ToFormKey NominalDiffTime 
Instance details

Defined in Web.Internal.FormUrlEncoded

assertM :: forall (r :: EffectRow). Member (Assertion :: (Type -> Type) -> Type -> Type) r => Text -> Sem r AssertionStatus -> Sem r () #

data Severity #

Constructors

DebugS

Debug messages

InfoS

Information

NoticeS

Normal runtime Conditions

WarningS

General Warnings

ErrorS

General Errors

CriticalS

Severe situations

AlertS

Take immediate action

EmergencyS

System is unusable

Instances

Instances details
FromJSON Severity 
Instance details

Defined in Katip.Core

ToJSON Severity 
Instance details

Defined in Katip.Core

Bounded Severity 
Instance details

Defined in Katip.Core

Enum Severity 
Instance details

Defined in Katip.Core

Generic Severity 
Instance details

Defined in Katip.Core

Associated Types

type Rep Severity 
Instance details

Defined in Katip.Core

type Rep Severity = D1 ('MetaData "Severity" "Katip.Core" "katip-0.8.8.2-6lLMmxWNR0z6aY6MiVew6C" 'False) (((C1 ('MetaCons "DebugS" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "InfoS" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "NoticeS" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "WarningS" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "ErrorS" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CriticalS" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "AlertS" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "EmergencyS" 'PrefixI 'False) (U1 :: Type -> Type))))

Methods

from :: Severity -> Rep Severity x #

to :: Rep Severity x -> Severity #

Read Severity 
Instance details

Defined in Katip.Core

Show Severity 
Instance details

Defined in Katip.Core

Eq Severity 
Instance details

Defined in Katip.Core

Ord Severity 
Instance details

Defined in Katip.Core

Lift Severity 
Instance details

Defined in Katip.Core

Methods

lift :: Quote m => Severity -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Severity -> Code m Severity #

type Rep Severity 
Instance details

Defined in Katip.Core

type Rep Severity = D1 ('MetaData "Severity" "Katip.Core" "katip-0.8.8.2-6lLMmxWNR0z6aY6MiVew6C" 'False) (((C1 ('MetaCons "DebugS" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "InfoS" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "NoticeS" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "WarningS" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "ErrorS" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CriticalS" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "AlertS" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "EmergencyS" 'PrefixI 'False) (U1 :: Type -> Type))))

logMsg :: (Applicative m, Katip m) => Namespace -> Severity -> LogStr -> m () #

Log a message without any payload/context or code location.

logInfo :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LText -> Sem effs () #

class Backend b where #

Associated Types

data BackendConn b #

Methods

backendConnectionString :: BackendConn b -> ConnectionString #

backendExecute :: (MonadNapkin b m, RenderSql command b) => BackendConn b -> command -> m () #

backendQuery :: (MonadNapkin b m, RenderSql q b) => BackendConn b -> q -> m [Map Text Value] #

backendCheckTableExists :: MonadNapkin b m => BackendConn b -> Ref Table -> m Bool #

backendGetTableKind :: MonadNapkin b m => BackendConn b -> Ref Table -> m TableKind #

backendGetRelationSchema :: MonadNapkin b m => BackendConn b -> Ref Table -> Relation -> m [BackendSchemaField b] #

backendGetAnnotations :: MonadNapkin b m => BackendConn b -> Ref Table -> m TableAnnotations #

backendAnnotate :: MonadNapkin b m => BackendConn b -> Ref Table -> Annotation -> m () #

backendCreateAs :: (MonadNapkin b m, RenderSql command b, command ~ CreateRelation b) => BackendConn b -> command -> m () #

backendCreate :: (MonadNapkin b m, RenderSql command b, command ~ CreateTableSchema b) => BackendConn b -> command -> m () #

backendCopyTable :: (Default (BackendMeta 'KindTable b), MonadNapkin b m, RenderSql (CreateRelation b) b, RenderSql DeleteRows b, RenderSql InsertInto b) => BackendConn b -> Ref Table -> Ref Table -> TableWriteStrategy -> m () #

backendDrop :: MonadNapkin b m => BackendConn b -> DropRelation -> m () #

backendInsertInto :: (MonadNapkin b m, RenderSql command b, command ~ InsertInto) => BackendConn b -> command -> m () #

backendRename :: MonadNapkin b m => BackendConn b -> RenameRelation -> m () #

backendListTables :: MonadNapkin b m => BackendConn b -> ListTables -> m (Set ListedTable) #

backendNormalize :: MonadNapkin b m => BackendConn b -> NormalizeTableNames -> m (Map (Ref Table) NormalizedTable) #

backendAddColumn :: (MonadNapkin b m, RenderSql command b, command ~ AddColumnToTable) => BackendConn b -> command -> m () #

backendDropColumn :: (MonadNapkin b m, RenderSql command b, command ~ DropColumnFromTable) => BackendConn b -> command -> m () #

if_ :: SExp -> SExp -> SExp -> SExp #

addDependency :: forall (r :: EffectRow). Member (Output ExtraDependencies :: (Type -> Type) -> Type -> Type) r => Ref Table -> Sem r () #

Add the given reference to list of dependency for the underlying region.

Later during interpretation, this will cause the given dependency to be forcefully considered upstream dependency within the enclosed region even though they were not seen in the parsed SQL.

data Alias a #

Like selected, but aliasing is optional

Constructors

Alias 

Fields

Instances

Instances details
Foldable Alias 
Instance details

Defined in Napkin.Types.Core

Methods

fold :: Monoid m => Alias m -> m #

foldMap :: Monoid m => (a -> m) -> Alias a -> m #

foldMap' :: Monoid m => (a -> m) -> Alias a -> m #

foldr :: (a -> b -> b) -> b -> Alias a -> b #

foldr' :: (a -> b -> b) -> b -> Alias a -> b #

foldl :: (b -> a -> b) -> b -> Alias a -> b #

foldl' :: (b -> a -> b) -> b -> Alias a -> b #

foldr1 :: (a -> a -> a) -> Alias a -> a #

foldl1 :: (a -> a -> a) -> Alias a -> a #

toList :: Alias a -> [a] #

null :: Alias a -> Bool #

length :: Alias a -> Int #

elem :: Eq a => a -> Alias a -> Bool #

maximum :: Ord a => Alias a -> a #

minimum :: Ord a => Alias a -> a #

sum :: Num a => Alias a -> a #

product :: Num a => Alias a -> a #

WithName Alias 
Instance details

Defined in Napkin.Types.Core

Methods

as :: b -> Ref b -> Alias b #

Lift a => Lift (Alias a :: Type) 
Instance details

Defined in Napkin.Types.Core

Methods

lift :: Quote m => Alias a -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Alias a -> Code m (Alias a) #

NFData a => NFData (Alias a) 
Instance details

Defined in Napkin.Types.Core

Methods

rnf :: Alias a -> () #

Data a => Data (Alias a) 
Instance details

Defined in Napkin.Types.Core

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Alias a -> c (Alias a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Alias a) #

toConstr :: Alias a -> Constr #

dataTypeOf :: Alias a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Alias a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Alias a)) #

gmapT :: (forall b. Data b => b -> b) -> Alias a -> Alias a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Alias a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Alias a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Alias a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Alias a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Alias a -> m (Alias a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Alias a -> m (Alias a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Alias a -> m (Alias a) #

Generic (Alias a) 
Instance details

Defined in Napkin.Types.Core

Associated Types

type Rep (Alias a) 
Instance details

Defined in Napkin.Types.Core

type Rep (Alias a) = D1 ('MetaData "Alias" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "Alias" 'PrefixI 'True) (S1 ('MetaSel ('Just "_aliasRef") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (Ref a))) :*: S1 ('MetaSel ('Just "_aliasItem") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))

Methods

from :: Alias a -> Rep (Alias a) x #

to :: Rep (Alias a) x -> Alias a #

Show a => Show (Alias a) 
Instance details

Defined in Napkin.Types.Core

Methods

showsPrec :: Int -> Alias a -> ShowS #

show :: Alias a -> String #

showList :: [Alias a] -> ShowS #

Eq a => Eq (Alias a) 
Instance details

Defined in Napkin.Types.Core

Methods

(==) :: Alias a -> Alias a -> Bool #

(/=) :: Alias a -> Alias a -> Bool #

Ord a => Ord (Alias a) 
Instance details

Defined in Napkin.Types.Core

Methods

compare :: Alias a -> Alias a -> Ordering #

(<) :: Alias a -> Alias a -> Bool #

(<=) :: Alias a -> Alias a -> Bool #

(>) :: Alias a -> Alias a -> Bool #

(>=) :: Alias a -> Alias a -> Bool #

max :: Alias a -> Alias a -> Alias a #

min :: Alias a -> Alias a -> Alias a #

HasDeps (Alias SExp) 
Instance details

Defined in Napkin.Types.Deps

FunRenamer (Alias SExp) 
Instance details

Defined in Napkin.Types.QueryTransformer

TableRenamer (Alias SExp) 
Instance details

Defined in Napkin.Types.QueryTransformer

TableRenamer (Alias Table) 
Instance details

Defined in Napkin.Types.QueryTransformer

type Rep (Alias a) 
Instance details

Defined in Napkin.Types.Core

type Rep (Alias a) = D1 ('MetaData "Alias" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "Alias" 'PrefixI 'True) (S1 ('MetaSel ('Just "_aliasRef") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (Ref a))) :*: S1 ('MetaSel ('Just "_aliasItem") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))

getAnnotations :: forall {k} (b :: k) (r :: EffectRow). Member (AnnotateRead b :: (Type -> Type) -> Type -> Type) r => Ref Table -> Sem r TableAnnotations #

class Val a where #

Methods

val :: Prism' Value a #

Instances

Instances details
Val ByteString 
Instance details

Defined in Napkin.Types.Core

Val Int64

Auto-convert from VText

Instance details

Defined in Napkin.Types.Core

Methods

val :: Prism' Value Int64 #

Val DatePart 
Instance details

Defined in Napkin.Types.Core

Val IntInterval 
Instance details

Defined in Napkin.Types.Core

Val Value 
Instance details

Defined in Napkin.Types.Core

Methods

val :: Prism' Value Value #

Val Text 
Instance details

Defined in Napkin.Types.Core

Methods

val :: Prism' Value Text #

Val Day 
Instance details

Defined in Napkin.Types.Core

Methods

val :: Prism' Value Day #

Val UTCTime 
Instance details

Defined in Napkin.Types.Core

Val Integer 
Instance details

Defined in Napkin.Types.Core

Val String 
Instance details

Defined in Napkin.Types.Core

Methods

val :: Prism' Value String #

Val Bool 
Instance details

Defined in Napkin.Types.Core

Methods

val :: Prism' Value Bool #

Val Double

Auto-convert from VInt and VText

Instance details

Defined in Napkin.Types.Core

Methods

val :: Prism' Value Double #

Val Int 
Instance details

Defined in Napkin.Types.Core

Methods

val :: Prism' Value Int #

Val a => Val (Maybe a) 
Instance details

Defined in Napkin.Types.Core

Methods

val :: Prism' Value (Maybe a) #

data QState #

Constructors

QState 

Fields

Instances

Instances details
Data QState 
Instance details

Defined in Napkin.Untyped.Monad

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> QState -> c QState #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c QState #

toConstr :: QState -> Constr #

dataTypeOf :: QState -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c QState) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c QState) #

gmapT :: (forall b. Data b => b -> b) -> QState -> QState #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> QState -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> QState -> r #

gmapQ :: (forall d. Data d => d -> u) -> QState -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> QState -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> QState -> m QState #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> QState -> m QState #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> QState -> m QState #

Generic QState 
Instance details

Defined in Napkin.Untyped.Monad

Associated Types

type Rep QState 
Instance details

Defined in Napkin.Untyped.Monad

type Rep QState = D1 ('MetaData "QState" "Napkin.Untyped.Monad" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "QState" 'PrefixI 'True) (S1 ('MetaSel ('Just "vars") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RefStore) :*: S1 ('MetaSel ('Just "query") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Query)))

Methods

from :: QState -> Rep QState x #

to :: Rep QState x -> QState #

Show QState 
Instance details

Defined in Napkin.Untyped.Monad

Eq QState 
Instance details

Defined in Napkin.Untyped.Monad

Methods

(==) :: QState -> QState -> Bool #

(/=) :: QState -> QState -> Bool #

HasRefStore QState 
Instance details

Defined in Napkin.Untyped.Monad

MonadState QState Q 
Instance details

Defined in Napkin.Untyped.Monad

Methods

get :: Q QState #

put :: QState -> Q () #

state :: (QState -> (a, QState)) -> Q a #

type Rep QState 
Instance details

Defined in Napkin.Untyped.Monad

type Rep QState = D1 ('MetaData "QState" "Napkin.Untyped.Monad" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "QState" 'PrefixI 'True) (S1 ('MetaSel ('Just "vars") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RefStore) :*: S1 ('MetaSel ('Just "query") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Query)))

type Time = Input UTCTime :: k1 -> Type -> Type #

logError :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LText -> Sem effs () #

logDebug :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LText -> Sem effs () #

data UState #

Constructors

UState 

Instances

Instances details
Data UState 
Instance details

Defined in Napkin.Untyped.Monad

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UState -> c UState #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UState #

toConstr :: UState -> Constr #

dataTypeOf :: UState -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UState) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UState) #

gmapT :: (forall b. Data b => b -> b) -> UState -> UState #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UState -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UState -> r #

gmapQ :: (forall d. Data d => d -> u) -> UState -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UState -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UState -> m UState #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UState -> m UState #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UState -> m UState #

Generic UState 
Instance details

Defined in Napkin.Untyped.Monad

Associated Types

type Rep UState 
Instance details

Defined in Napkin.Untyped.Monad

type Rep UState = D1 ('MetaData "UState" "Napkin.Untyped.Monad" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "UState" 'PrefixI 'True) (S1 ('MetaSel ('Just "vars") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RefStore) :*: S1 ('MetaSel ('Just "query") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UpdateQuery)))

Methods

from :: UState -> Rep UState x #

to :: Rep UState x -> UState #

Show UState 
Instance details

Defined in Napkin.Untyped.Monad

Eq UState 
Instance details

Defined in Napkin.Untyped.Monad

Methods

(==) :: UState -> UState -> Bool #

(/=) :: UState -> UState -> Bool #

HasRefStore UState 
Instance details

Defined in Napkin.Untyped.Monad

MonadState UState U 
Instance details

Defined in Napkin.Untyped.Monad

Methods

get :: U UState #

put :: UState -> U () #

state :: (UState -> (a, UState)) -> U a #

type Rep UState 
Instance details

Defined in Napkin.Untyped.Monad

type Rep UState = D1 ('MetaData "UState" "Napkin.Untyped.Monad" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "UState" 'PrefixI 'True) (S1 ('MetaSel ('Just "vars") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RefStore) :*: S1 ('MetaSel ('Just "query") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UpdateQuery)))

interval :: [(Double, DatePart)] -> SExp #

Shorthand for using literal Doubles in making interval expressions.

data AssertionEntry #

Instances

Instances details
Generic AssertionEntry 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

Associated Types

type Rep AssertionEntry 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

type Rep AssertionEntry = D1 ('MetaData "AssertionEntry" "Napkin.Run.Effects.Languages.Assertion" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "AssertionEntry" 'PrefixI 'True) ((S1 ('MetaSel ('Just "assertionGroup") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 AssertionGroup) :*: S1 ('MetaSel ('Just "message") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)) :*: (S1 ('MetaSel ('Just "status") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 AssertionStatus) :*: S1 ('MetaSel ('Just "severity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 AssertionSeverity))))
Show AssertionEntry 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

Eq AssertionEntry 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

type Rep AssertionEntry 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

type Rep AssertionEntry = D1 ('MetaData "AssertionEntry" "Napkin.Run.Effects.Languages.Assertion" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "AssertionEntry" 'PrefixI 'True) ((S1 ('MetaSel ('Just "assertionGroup") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 AssertionGroup) :*: S1 ('MetaSel ('Just "message") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)) :*: (S1 ('MetaSel ('Just "status") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 AssertionStatus) :*: S1 ('MetaSel ('Just "severity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 AssertionSeverity))))

newtype Day #

The Modified Julian Day is a standard count of days, with zero being the day 1858-11-17.

Instances

Instances details
FromJSON Day 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Day 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Day 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Day 
Instance details

Defined in Data.Aeson.Types.ToJSON

NFData Day 
Instance details

Defined in Data.Time.Calendar.Days

Methods

rnf :: Day -> () #

Buildable Day 
Instance details

Defined in Formatting.Buildable

Methods

build :: Day -> Builder #

Data Day 
Instance details

Defined in Data.Time.Calendar.Days

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Day -> c Day #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Day #

toConstr :: Day -> Constr #

dataTypeOf :: Day -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Day) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Day) #

gmapT :: (forall b. Data b => b -> b) -> Day -> Day #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Day -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Day -> r #

gmapQ :: (forall d. Data d => d -> u) -> Day -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Day -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Day -> m Day #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Day -> m Day #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Day -> m Day #

Enum Day 
Instance details

Defined in Data.Time.Calendar.Days

Methods

succ :: Day -> Day #

pred :: Day -> Day #

toEnum :: Int -> Day #

fromEnum :: Day -> Int #

enumFrom :: Day -> [Day] #

enumFromThen :: Day -> Day -> [Day] #

enumFromTo :: Day -> Day -> [Day] #

enumFromThenTo :: Day -> Day -> Day -> [Day] #

Ix Day 
Instance details

Defined in Data.Time.Calendar.Days

Methods

range :: (Day, Day) -> [Day] #

index :: (Day, Day) -> Day -> Int #

unsafeIndex :: (Day, Day) -> Day -> Int #

inRange :: (Day, Day) -> Day -> Bool #

rangeSize :: (Day, Day) -> Int #

unsafeRangeSize :: (Day, Day) -> Int #

Eq Day 
Instance details

Defined in Data.Time.Calendar.Days

Methods

(==) :: Day -> Day -> Bool #

(/=) :: Day -> Day -> Bool #

Ord Day 
Instance details

Defined in Data.Time.Calendar.Days

Methods

compare :: Day -> Day -> Ordering #

(<) :: Day -> Day -> Bool #

(<=) :: Day -> Day -> Bool #

(>) :: Day -> Day -> Bool #

(>=) :: Day -> Day -> Bool #

max :: Day -> Day -> Day #

min :: Day -> Day -> Day #

FromFormKey Day 
Instance details

Defined in Web.Internal.FormUrlEncoded

ToFormKey Day 
Instance details

Defined in Web.Internal.FormUrlEncoded

Methods

toFormKey :: Day -> Text #

Val Day 
Instance details

Defined in Napkin.Types.Core

Methods

val :: Prism' Value Day #

ToSql Day

Corresponds to DATE type of SQL Server.

Instance details

Defined in Database.ODBC.SQLServer

Methods

toSql :: Day -> Query #

DayPeriod Day 
Instance details

Defined in Data.Time.Calendar.Days

ISO8601 Day

yyyy-mm-dd (ISO 8601:2004(E) sec. 4.1.2.2 extended format)

Instance details

Defined in Data.Time.Format.ISO8601

data TimeOfDay #

Time of day as represented in hour, minute and second (with picoseconds), typically used to express local time of day.

TimeOfDay 24 0 0 is considered invalid for the purposes of makeTimeOfDayValid, as well as reading and parsing, but valid for ISO 8601 parsing in Data.Time.Format.ISO8601.

Constructors

TimeOfDay 

Fields

  • todHour :: Int

    range 0 - 23

  • todMin :: Int

    range 0 - 59

  • todSec :: Pico

    Note that 0 <= todSec < 61, accomodating leap seconds. Any local minute may have a leap second, since leap seconds happen in all zones simultaneously

Instances

Instances details
FromJSON TimeOfDay 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey TimeOfDay 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON TimeOfDay 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey TimeOfDay 
Instance details

Defined in Data.Aeson.Types.ToJSON

NFData TimeOfDay 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeOfDay

Methods

rnf :: TimeOfDay -> () #

Buildable TimeOfDay 
Instance details

Defined in Formatting.Buildable

Methods

build :: TimeOfDay -> Builder #

Data TimeOfDay 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeOfDay

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TimeOfDay -> c TimeOfDay #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TimeOfDay #

toConstr :: TimeOfDay -> Constr #

dataTypeOf :: TimeOfDay -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TimeOfDay) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TimeOfDay) #

gmapT :: (forall b. Data b => b -> b) -> TimeOfDay -> TimeOfDay #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TimeOfDay -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TimeOfDay -> r #

gmapQ :: (forall d. Data d => d -> u) -> TimeOfDay -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TimeOfDay -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TimeOfDay -> m TimeOfDay #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TimeOfDay -> m TimeOfDay #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TimeOfDay -> m TimeOfDay #

Show TimeOfDay 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeOfDay

Eq TimeOfDay 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeOfDay

Ord TimeOfDay 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeOfDay

ToSql TimeOfDay

Corresponds to TIME type of SQL Server.

TimeOfDay supports more precision than the time type of SQL server, so you will lose precision and not get back what you inserted.

Instance details

Defined in Database.ODBC.SQLServer

Methods

toSql :: TimeOfDay -> Query #

ISO8601 TimeOfDay

hh:mm:ss[.sss] (ISO 8601:2004(E) sec. 4.2.2.2, 4.2.2.4(a) extended format)

Instance details

Defined in Data.Time.Format.ISO8601

type GroupBy = [SExp] #

newtype Namespace #

Represents a heirarchy of namespaces going from general to specific. For instance: ["processname", "subsystem"]. Note that single-segment namespaces can be created using IsString/OverloadedStrings, so "foo" will result in Namespace ["foo"].

Constructors

Namespace 

Fields

Instances

Instances details
FromJSON Namespace 
Instance details

Defined in Katip.Core

ToJSON Namespace 
Instance details

Defined in Katip.Core

Monoid Namespace 
Instance details

Defined in Katip.Core

Semigroup Namespace 
Instance details

Defined in Katip.Core

IsString Namespace 
Instance details

Defined in Katip.Core

Generic Namespace 
Instance details

Defined in Katip.Core

Associated Types

type Rep Namespace 
Instance details

Defined in Katip.Core

type Rep Namespace = D1 ('MetaData "Namespace" "Katip.Core" "katip-0.8.8.2-6lLMmxWNR0z6aY6MiVew6C" 'True) (C1 ('MetaCons "Namespace" 'PrefixI 'True) (S1 ('MetaSel ('Just "unNamespace") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Text])))
Read Namespace 
Instance details

Defined in Katip.Core

Show Namespace 
Instance details

Defined in Katip.Core

Eq Namespace 
Instance details

Defined in Katip.Core

Ord Namespace 
Instance details

Defined in Katip.Core

Lift Namespace 
Instance details

Defined in Katip.Core

Methods

lift :: Quote m => Namespace -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Namespace -> Code m Namespace #

type Rep Namespace 
Instance details

Defined in Katip.Core

type Rep Namespace = D1 ('MetaData "Namespace" "Katip.Core" "katip-0.8.8.2-6lLMmxWNR0z6aY6MiVew6C" 'True) (C1 ('MetaCons "Namespace" 'PrefixI 'True) (S1 ('MetaSel ('Just "unNamespace") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Text])))

class WithName (a :: Type -> Type) where #

Methods

as :: b -> Ref b -> a b #

e.g. var "foo" as "bar"

Instances

Instances details
WithName Alias 
Instance details

Defined in Napkin.Types.Core

Methods

as :: b -> Ref b -> Alias b #

WithName Selected 
Instance details

Defined in Napkin.Types.Core

Methods

as :: b -> Ref b -> Selected b #

data DayOfWeek #

Instances

Instances details
FromJSON DayOfWeek 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey DayOfWeek 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON DayOfWeek 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey DayOfWeek 
Instance details

Defined in Data.Aeson.Types.ToJSON

NFData DayOfWeek 
Instance details

Defined in Data.Time.Calendar.Week

Methods

rnf :: DayOfWeek -> () #

Data DayOfWeek 
Instance details

Defined in Data.Time.Calendar.Week

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DayOfWeek -> c DayOfWeek #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DayOfWeek #

toConstr :: DayOfWeek -> Constr #

dataTypeOf :: DayOfWeek -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DayOfWeek) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DayOfWeek) #

gmapT :: (forall b. Data b => b -> b) -> DayOfWeek -> DayOfWeek #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DayOfWeek -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DayOfWeek -> r #

gmapQ :: (forall d. Data d => d -> u) -> DayOfWeek -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DayOfWeek -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DayOfWeek -> m DayOfWeek #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DayOfWeek -> m DayOfWeek #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DayOfWeek -> m DayOfWeek #

Enum DayOfWeek

"Circular", so for example [Tuesday ..] gives an endless sequence. Also: fromEnum gives [1 .. 7] for [Monday .. Sunday], and toEnum performs mod 7 to give a cycle of days.

Instance details

Defined in Data.Time.Calendar.Week

Ix DayOfWeek 
Instance details

Defined in Data.Time.Calendar.Week

Read DayOfWeek 
Instance details

Defined in Data.Time.Calendar.Week

Show DayOfWeek 
Instance details

Defined in Data.Time.Calendar.Week

Eq DayOfWeek 
Instance details

Defined in Data.Time.Calendar.Week

Ord DayOfWeek 
Instance details

Defined in Data.Time.Calendar.Week

pattern January :: MonthOfYear #

pattern March :: MonthOfYear #

pattern April :: MonthOfYear #

pattern May :: MonthOfYear #

pattern June :: MonthOfYear #

pattern July :: MonthOfYear #

pattern August :: MonthOfYear #

pattern October :: MonthOfYear #

pattern December :: MonthOfYear #

The twelve MonthOfYear patterns form a COMPLETE set.

isLeapYear :: Year -> Bool #

Is this year a leap year according to the proleptic Gregorian calendar?

data LocalTime #

A simple day and time aggregate, where the day is of the specified parameter, and the time is a TimeOfDay. Conversion of this (as local civil time) to UTC depends on the time zone. Conversion of this (as local mean time) to UT1 depends on the longitude.

Constructors

LocalTime 

Instances

Instances details
FromJSON LocalTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey LocalTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON LocalTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey LocalTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

NFData LocalTime 
Instance details

Defined in Data.Time.LocalTime.Internal.LocalTime

Methods

rnf :: LocalTime -> () #

Buildable LocalTime 
Instance details

Defined in Formatting.Buildable

Methods

build :: LocalTime -> Builder #

Data LocalTime 
Instance details

Defined in Data.Time.LocalTime.Internal.LocalTime

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LocalTime -> c LocalTime #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c LocalTime #

toConstr :: LocalTime -> Constr #

dataTypeOf :: LocalTime -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LocalTime) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c LocalTime) #

gmapT :: (forall b. Data b => b -> b) -> LocalTime -> LocalTime #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LocalTime -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LocalTime -> r #

gmapQ :: (forall d. Data d => d -> u) -> LocalTime -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> LocalTime -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> LocalTime -> m LocalTime #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LocalTime -> m LocalTime #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LocalTime -> m LocalTime #

Show LocalTime 
Instance details

Defined in Data.Time.LocalTime.Internal.LocalTime

Eq LocalTime 
Instance details

Defined in Data.Time.LocalTime.Internal.LocalTime

Ord LocalTime 
Instance details

Defined in Data.Time.LocalTime.Internal.LocalTime

FromFormKey LocalTime 
Instance details

Defined in Web.Internal.FormUrlEncoded

ToFormKey LocalTime 
Instance details

Defined in Web.Internal.FormUrlEncoded

Methods

toFormKey :: LocalTime -> Text #

(TypeError ('Text "Instance for LocalTime is disabled:" ':$$: 'Text "Wrap your value in either (Datetime2 foo) or (Smalldatetime foo).") :: Constraint) => ToSql LocalTime

You cannot use this instance. Wrap your value in either Datetime2 or Smalldatetime.

Instance details

Defined in Database.ODBC.SQLServer

Methods

toSql :: LocalTime -> Query #

ISO8601 LocalTime

yyyy-mm-ddThh:mm:ss[.sss] (ISO 8601:2004(E) sec. 4.3.2 extended format)

Instance details

Defined in Data.Time.Format.ISO8601

(/.) :: SExp -> SExp -> SExp #

renderQuery :: forall (r :: EffectRow). Member (SqlRender :: (Type -> Type) -> Type -> Type) r => Query -> Sem r SqlText #

logStr :: StringConv a Text => a -> LogStr #

Pack any string-like thing into a LogStr. This will automatically work on String, ByteString, Text and any of the lazy variants.

ls :: StringConv a Text => a -> LogStr #

Shorthand for logStr

showLS :: Show a => a -> LogStr #

Convert any showable type into a LogStr.

data LogEnv #

Constructors

LogEnv 

Fields

data Scribe #

Constructors

Scribe 

Fields

  • liPush :: forall a. LogItem a => Item a -> IO ()

    How do we write an item to the scribe's output?

  • scribeFinalizer :: IO ()

    Provide a blocking finalizer to call when your scribe is removed. All pending writes should be flushed synchronously. If this is not relevant to your scribe, return () is fine.

  • scribePermitItem :: !PermitFunc

    Provide a filtering function to allow the item to be logged, or not. It can check Severity or some string in item's body. The initial value of this is usually created from permitItem. Scribes and users can customize this by ANDing or ORing onto the default with permitAND or permitOR

Instances

Instances details
Monoid Scribe 
Instance details

Defined in Katip.Core

Semigroup Scribe

Combine two scribes. Publishes to the left scribe if the left would permit the item and to the right scribe if the right would permit the item. Finalizers are called in sequence from left to right.

Instance details

Defined in Katip.Core

type PermitFunc = forall a. Item a -> IO Bool #

Scribes are handlers of incoming items. Each registered scribe knows how to push a log item somewhere.

Guidelines for writing your own Scribe

Scribes should always take a Severity and Verbosity.

Severity is used to exclude log messages that are lower than the provided Severity. For instance, if the user passes InfoS, DebugS items should be ignored. Katip provides the permitItem utility for this. The user or the scribe may use permitAND and permitOR to further customize this filtering, even dynamically if they wish to.

Verbosity is used to select keys from the log item's payload. Each LogItem instance describes what keys should be retained for each Verbosity level. Use the payloadObject utility for extracting the keys that should be written.

Scribes provide a finalizer IO action (scribeFinalizer) that is meant to synchronously flush any remaining writes and clean up any resources acquired when the scribe was created. Internally, katip keeps a buffer for each scribe's writes. When closeScribe or closeScribes is called, that buffer stops accepting new log messages and after the last item in its buffer is sent to liPush, calls the finalizer. Thus, when the finalizer returns, katip can assume that all resources are cleaned up and all log messages are durably written.

While katip internally buffers messages per ScribeSettings, it sends them one at a time to the scribe. Depending on the scribe itself, it may make sense for that scribe to keep its own internal buffer to batch-send logs if writing items one at a time is not efficient. The scribe implementer must be sure that on finalization, all writes are committed synchronously.

Signature of a function passed to Scribe constructor and mkScribe* functions that decides which messages to be logged. Typically filters based on Severity, but can be combined with other, custom logic with permitAND and permitOR

data SimpleLogPayload #

Instances

Instances details
ToJSON SimpleLogPayload

A built-in convenience log payload that won't log anything on V0, but will log everything in any other level of verbosity. Intended for easy in-line usage without having to define new log types.

Construct using sl and combine multiple tuples using <> from Monoid.

Instance details

Defined in Katip.Core

Monoid SimpleLogPayload 
Instance details

Defined in Katip.Core

Semigroup SimpleLogPayload 
Instance details

Defined in Katip.Core

LogItem SimpleLogPayload 
Instance details

Defined in Katip.Core

ToObject SimpleLogPayload 
Instance details

Defined in Katip.Core

payloadKeys :: LogItem a => Verbosity -> a -> PayloadSelection #

List of keys in the JSON object that should be included in message.

class ToObject a where #

Katip requires JSON objects to be logged as context. This typeclass provides a default instance which uses ToJSON and produces an empty object if toJSON results in any type other than object. If you have a type you want to log that produces an Array or Number for example, you'll want to write an explicit instance here. You can trivially add a ToObject instance for something with a ToJSON instance like:

instance ToObject Foo

Minimal complete definition

Nothing

Methods

toObject :: a -> Object #

default toObject :: ToJSON a => a -> Object #

Instances

Instances details
ToObject Object 
Instance details

Defined in Katip.Core

Methods

toObject :: Object -> Object #

ToObject SimpleLogPayload 
Instance details

Defined in Katip.Core

ToObject LogContexts 
Instance details

Defined in Katip.Monadic

ToObject () 
Instance details

Defined in Katip.Core

Methods

toObject :: () -> Object #

ToObject (TableSpec b) 
Instance details

Defined in Napkin.Spec.Types.Spec

Methods

toObject :: TableSpec b -> Object #

itemApp :: forall a f. Functor f => (Namespace -> f Namespace) -> Item a -> f (Item a) #

itemEnv :: forall a f. Functor f => (Environment -> f Environment) -> Item a -> f (Item a) #

itemHost :: forall a f. Functor f => (HostName -> f HostName) -> Item a -> f (Item a) #

itemLoc :: forall a f. Functor f => (Maybe Loc -> f (Maybe Loc)) -> Item a -> f (Item a) #

itemMessage :: forall a f. Functor f => (LogStr -> f LogStr) -> Item a -> f (Item a) #

itemNamespace :: forall a f. Functor f => (Namespace -> f Namespace) -> Item a -> f (Item a) #

itemPayload :: forall a1 a2 f. Functor f => (a1 -> f a2) -> Item a1 -> f (Item a2) #

itemProcess :: forall a f. Functor f => (ProcessID -> f ProcessID) -> Item a -> f (Item a) #

itemSeverity :: forall a f. Functor f => (Severity -> f Severity) -> Item a -> f (Item a) #

itemThread :: forall a f. Functor f => (ThreadIdText -> f ThreadIdText) -> Item a -> f (Item a) #

itemTime :: forall a f. Functor f => (UTCTime -> f UTCTime) -> Item a -> f (Item a) #

sl :: ToJSON a => Text -> a -> SimpleLogPayload #

Construct a simple log from any JSON item.

payloadObject :: LogItem a => Verbosity -> a -> Object #

Constrain payload based on verbosity. Backends should use this to automatically bubble higher verbosity levels to lower ones.

itemJson :: LogItem a => Verbosity -> Item a -> Value #

Convert log item to its JSON representation while trimming its payload based on the desired verbosity. Backends that push JSON messages should use this to obtain their payload.

permitAND :: PermitFunc -> PermitFunc -> PermitFunc #

AND together 2 permit functions

permitOR :: PermitFunc -> PermitFunc -> PermitFunc #

OR together 2 permit functions

permitItem :: Monad m => Severity -> Item a -> m Bool #

Should this item be logged given the user's maximum severity? Most new scribes will use this as a base for their PermitFunc

data ScribeSettings #

Instances

Instances details
Show ScribeSettings 
Instance details

Defined in Katip.Core

Eq ScribeSettings 
Instance details

Defined in Katip.Core

initLogEnv #

Arguments

:: Namespace

A base namespace for this application

-> Environment

Current run environment (e.g. prod vs. devel)

-> IO LogEnv 

Create a reasonable default InitLogEnv. Uses an AutoUpdate which updates the timer every 1ms. If you need even more timestamp precision at the cost of performance, consider setting _logEnvTimer with getCurrentTime.

registerScribe #

Arguments

:: Text

Name the scribe

-> Scribe 
-> ScribeSettings 
-> LogEnv 
-> IO LogEnv 

Add a scribe to the list. All future log calls will go to this scribe in addition to the others. Writes will be buffered per the ScribeSettings to prevent slow scribes from slowing down logging. Writes will be dropped if the buffer fills.

newtype KatipT (m :: Type -> Type) a #

A concrete monad you can use to run logging actions. Use this if you prefer an explicit monad transformer stack and adding layers as opposed to implementing Katip for your monad.

Constructors

KatipT 

Fields

Instances

Instances details
MonadTransControl KatipT 
Instance details

Defined in Katip.Core

Associated Types

type StT KatipT a 
Instance details

Defined in Katip.Core

type StT KatipT a = a

Methods

liftWith :: Monad m => (Run KatipT -> m a) -> KatipT m a #

restoreT :: Monad m => m (StT KatipT a) -> KatipT m a #

MonadTrans KatipT 
Instance details

Defined in Katip.Core

Methods

lift :: Monad m => m a -> KatipT m a #

HasBackendQueryStats b => LocalQueryStats (b :: k) (KatipT IO) 
Instance details

Defined in Napkin.Run.Base

Methods

tellStats :: QueryStats b -> KatipT IO () #

HasBackendQueryStats backend => LocalQueryStats (backend :: k) (ReaderT (IORef (QueryStats backend)) (KatipT IO)) 
Instance details

Defined in Napkin.Run.Base

Methods

tellStats :: QueryStats backend -> ReaderT (IORef (QueryStats backend)) (KatipT IO) () #

MonadBaseControl b m => MonadBaseControl b (KatipT m) 
Instance details

Defined in Katip.Core

Methods

liftBaseWith :: (RunInBase (KatipT m) b -> b a) -> KatipT m a #

restoreM :: StM (KatipT m) a -> KatipT m a #

MonadBase b m => MonadBase b (KatipT m) 
Instance details

Defined in Katip.Core

Methods

liftBase :: b α -> KatipT m α #

MonadIO m => MonadIO (KatipT m) 
Instance details

Defined in Katip.Core

Methods

liftIO :: IO a -> KatipT m a #

MonadCatch m => MonadCatch (KatipT m) 
Instance details

Defined in Katip.Core

Methods

catch :: (HasCallStack, Exception e) => KatipT m a -> (e -> KatipT m a) -> KatipT m a #

MonadMask m => MonadMask (KatipT m) 
Instance details

Defined in Katip.Core

Methods

mask :: HasCallStack => ((forall a. KatipT m a -> KatipT m a) -> KatipT m b) -> KatipT m b #

uninterruptibleMask :: HasCallStack => ((forall a. KatipT m a -> KatipT m a) -> KatipT m b) -> KatipT m b #

generalBracket :: HasCallStack => KatipT m a -> (a -> ExitCase b -> KatipT m c) -> (a -> KatipT m b) -> KatipT m (b, c) #

MonadThrow m => MonadThrow (KatipT m) 
Instance details

Defined in Katip.Core

Methods

throwM :: (HasCallStack, Exception e) => e -> KatipT m a #

Applicative m => Applicative (KatipT m) 
Instance details

Defined in Katip.Core

Methods

pure :: a -> KatipT m a #

(<*>) :: KatipT m (a -> b) -> KatipT m a -> KatipT m b #

liftA2 :: (a -> b -> c) -> KatipT m a -> KatipT m b -> KatipT m c #

(*>) :: KatipT m a -> KatipT m b -> KatipT m b #

(<*) :: KatipT m a -> KatipT m b -> KatipT m a #

Functor m => Functor (KatipT m) 
Instance details

Defined in Katip.Core

Methods

fmap :: (a -> b) -> KatipT m a -> KatipT m b #

(<$) :: a -> KatipT m b -> KatipT m a #

Monad m => Monad (KatipT m) 
Instance details

Defined in Katip.Core

Methods

(>>=) :: KatipT m a -> (a -> KatipT m b) -> KatipT m b #

(>>) :: KatipT m a -> KatipT m b -> KatipT m b #

return :: a -> KatipT m a #

MonadFail m => MonadFail (KatipT m) 
Instance details

Defined in Katip.Core

Methods

fail :: String -> KatipT m a #

MonadIO m => Katip (KatipT m) 
Instance details

Defined in Katip.Core

Methods

getLogEnv :: KatipT m LogEnv #

localLogEnv :: (LogEnv -> LogEnv) -> KatipT m a -> KatipT m a #

(Monad m, KatipContext m) => KatipContext (KatipT m) 
Instance details

Defined in Katip.Monadic

MonadResource m => MonadResource (KatipT m) 
Instance details

Defined in Katip.Core

Methods

liftResourceT :: ResourceT IO a -> KatipT m a #

MonadUnliftIO m => MonadUnliftIO (KatipT m) 
Instance details

Defined in Katip.Core

Methods

withRunInIO :: ((forall a. KatipT m a -> IO a) -> IO b) -> KatipT m b #

type StT KatipT a 
Instance details

Defined in Katip.Core

type StT KatipT a = a
type StM (KatipT m) a 
Instance details

Defined in Katip.Core

type StM (KatipT m) a = ComposeSt KatipT m a

defaultScribeSettings :: ScribeSettings #

Reasonable defaults for a scribe. Buffer size of 4096.

unregisterScribe #

Arguments

:: Text

Name of the scribe

-> LogEnv 
-> LogEnv 

Remove a scribe from the environment. This does not finalize the scribe. This mainly only makes sense to use with something like MonadReader's local function to temporarily disavow a single logger for a block of code.

clearScribes :: LogEnv -> LogEnv #

Unregister all scribes. Note that this is not for closing or finalizing scribes, use closeScribes for that. This mainly only makes sense to use with something like MonadReader's local function to temporarily disavow any loggers for a block of code.

closeScribe #

Arguments

:: Text

Name of the scribe

-> LogEnv 
-> IO LogEnv 

Finalize a scribe. The scribe is removed from the environment, its finalizer is called so that it can never be written to again and all pending writes are flushed. Note that this will throw any exceptions yoru finalizer will throw, and that LogEnv is immutable, so it will not be removed in that case.

closeScribes :: LogEnv -> IO LogEnv #

Call this at the end of your program. This is a blocking call that stop writing to a scribe's queue, waits for the queue to empty, finalizes each scribe in the log environment and then removes it. Finalizers are all run even if one of them throws, but the exception will be re-thrown at the end.

runKatipT :: LogEnv -> KatipT m a -> m a #

Execute KatipT on a log env.

katipNoLogging :: Katip m => m a -> m a #

Disable all scribes for the given monadic action, then restore them afterwards. Works in any Katip monad.

logItem :: (Applicative m, LogItem a, Katip m) => a -> Namespace -> Maybe Loc -> Severity -> LogStr -> m () #

Log with everything, including a source code location. This is very low level and you typically can use logT in its place.

logKatipItem :: (Applicative m, LogItem a, Katip m) => Item a -> m () #

Log already constructed Item. This is the lowest level function that other log* functions use. It can be useful when implementing centralised logging services.

logF #

Arguments

:: (Applicative m, LogItem a, Katip m) 
=> a

Contextual payload for the log

-> Namespace

Specific namespace of the message.

-> Severity

Severity of the message

-> LogStr

The log message

-> m () 

Log with full context, but without any code location.

logException #

Arguments

:: (Katip m, LogItem a, MonadCatch m, Applicative m) 
=> a

Log context

-> Namespace

Namespace

-> Severity

Severity

-> m b

Main action being run

-> m b 

Perform an action while logging any exceptions that may occur. Inspired by onException.

>>> > logException () mempty ErrorS (error "foo")

logT :: ExpQ #

Loc-tagged logging when using template-haskell.

$(logT) obj mempty InfoS "Hello world"

logLoc :: (Applicative m, LogItem a, Katip m, HasCallStack) => a -> Namespace -> Severity -> LogStr -> m () #

Loc-tagged logging using Stack when available.

This function does not require template-haskell as it automatically uses implicit-callstacks when the code is compiled using GHC > 7.8. Using an older version of the compiler will result in the emission of a log line without any location information, so be aware of it. Users using GHC <= 7.8 may want to use the template-haskell function logT for maximum compatibility.

logLoc obj mempty InfoS "Hello world"

data KatipContextT (m :: Type -> Type) a #

Provides a simple transformer that defines a KatipContext instance for a fixed namespace and context. Just like KatipT, you should use this if you prefer an explicit transformer stack and don't want to (or cannot) define KatipContext for your monad . This is the slightly more powerful version of KatipT in that it provides KatipContext instead of just Katip. For instance:

  threadWithLogging = do
    le <- getLogEnv
    ctx <- getKatipContext
    ns <- getKatipNamespace
    forkIO $ runKatipContextT le ctx ns $ do
      $(logTM) InfoS "Look, I can log in IO and retain context!"
      doOtherStuff

Instances

Instances details
MonadTransControl KatipContextT 
Instance details

Defined in Katip.Monadic

Associated Types

type StT KatipContextT a 
Instance details

Defined in Katip.Monadic

Methods

liftWith :: Monad m => (Run KatipContextT -> m a) -> KatipContextT m a #

restoreT :: Monad m => m (StT KatipContextT a) -> KatipContextT m a #

MonadTrans KatipContextT 
Instance details

Defined in Katip.Monadic

Methods

lift :: Monad m => m a -> KatipContextT m a #

MonadBaseControl b m => MonadBaseControl b (KatipContextT m) 
Instance details

Defined in Katip.Monadic

MonadError e m => MonadError e (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

throwError :: e -> KatipContextT m a #

catchError :: KatipContextT m a -> (e -> KatipContextT m a) -> KatipContextT m a #

MonadReader r m => MonadReader r (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

ask :: KatipContextT m r #

local :: (r -> r) -> KatipContextT m a -> KatipContextT m a #

reader :: (r -> a) -> KatipContextT m a #

MonadState s m => MonadState s (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

get :: KatipContextT m s #

put :: s -> KatipContextT m () #

state :: (s -> (a, s)) -> KatipContextT m a #

MonadWriter w m => MonadWriter w (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

writer :: (a, w) -> KatipContextT m a #

tell :: w -> KatipContextT m () #

listen :: KatipContextT m a -> KatipContextT m (a, w) #

pass :: KatipContextT m (a, w -> w) -> KatipContextT m a #

MonadBase b m => MonadBase b (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

liftBase :: b α -> KatipContextT m α #

MonadIO m => MonadIO (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

liftIO :: IO a -> KatipContextT m a #

MonadCatch m => MonadCatch (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

catch :: (HasCallStack, Exception e) => KatipContextT m a -> (e -> KatipContextT m a) -> KatipContextT m a #

MonadMask m => MonadMask (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

mask :: HasCallStack => ((forall a. KatipContextT m a -> KatipContextT m a) -> KatipContextT m b) -> KatipContextT m b #

uninterruptibleMask :: HasCallStack => ((forall a. KatipContextT m a -> KatipContextT m a) -> KatipContextT m b) -> KatipContextT m b #

generalBracket :: HasCallStack => KatipContextT m a -> (a -> ExitCase b -> KatipContextT m c) -> (a -> KatipContextT m b) -> KatipContextT m (b, c) #

MonadThrow m => MonadThrow (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

throwM :: (HasCallStack, Exception e) => e -> KatipContextT m a #

Alternative m => Alternative (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Applicative m => Applicative (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

pure :: a -> KatipContextT m a #

(<*>) :: KatipContextT m (a -> b) -> KatipContextT m a -> KatipContextT m b #

liftA2 :: (a -> b -> c) -> KatipContextT m a -> KatipContextT m b -> KatipContextT m c #

(*>) :: KatipContextT m a -> KatipContextT m b -> KatipContextT m b #

(<*) :: KatipContextT m a -> KatipContextT m b -> KatipContextT m a #

Functor m => Functor (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

fmap :: (a -> b) -> KatipContextT m a -> KatipContextT m b #

(<$) :: a -> KatipContextT m b -> KatipContextT m a #

Monad m => Monad (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

(>>=) :: KatipContextT m a -> (a -> KatipContextT m b) -> KatipContextT m b #

(>>) :: KatipContextT m a -> KatipContextT m b -> KatipContextT m b #

return :: a -> KatipContextT m a #

MonadPlus m => MonadPlus (KatipContextT m) 
Instance details

Defined in Katip.Monadic

MonadFail m => MonadFail (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

fail :: String -> KatipContextT m a #

MonadFix m => MonadFix (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

mfix :: (a -> KatipContextT m a) -> KatipContextT m a #

MonadIO m => Katip (KatipContextT m) 
Instance details

Defined in Katip.Monadic

MonadIO m => KatipContext (KatipContextT m) 
Instance details

Defined in Katip.Monadic

MonadResource m => MonadResource (KatipContextT m) 
Instance details

Defined in Katip.Monadic

MonadUnliftIO m => MonadUnliftIO (KatipContextT m) 
Instance details

Defined in Katip.Monadic

Methods

withRunInIO :: ((forall a. KatipContextT m a -> IO a) -> IO b) -> KatipContextT m b #

type StT KatipContextT a 
Instance details

Defined in Katip.Monadic

type StM (KatipContextT m) a 
Instance details

Defined in Katip.Monadic

class Katip m => KatipContext (m :: Type -> Type) where #

A monadic context that has an inherant way to get logging context and namespace. Examples include a web application monad or database monad. The local variants are just like local from Reader and indeed you can easily implement them with local if you happen to be using a Reader in your monad. These give us katipAddNamespace and katipAddContext that works with *any* KatipContext, as opposed to making users have to implement these functions on their own in each app.

Methods

getKatipContext :: m LogContexts #

localKatipContext :: (LogContexts -> LogContexts) -> m a -> m a #

Temporarily modify the current context for the duration of the supplied monad. Used in katipAddContext

getKatipNamespace :: m Namespace #

localKatipNamespace :: (Namespace -> Namespace) -> m a -> m a #

Temporarily modify the current namespace for the duration of the supplied monad. Used in katipAddNamespace

Instances

Instances details
(Monad m, KatipContext m) => KatipContext (KatipT m) 
Instance details

Defined in Katip.Monadic

MonadIO m => KatipContext (KatipContextT m) 
Instance details

Defined in Katip.Monadic

MonadIO m => KatipContext (NoLoggingT m) 
Instance details

Defined in Katip.Monadic

(KatipContext m, Katip (ResourceT m)) => KatipContext (ResourceT m) 
Instance details

Defined in Katip.Monadic

(KatipContext m, Katip (MaybeT m)) => KatipContext (MaybeT m) 
Instance details

Defined in Katip.Monadic

(KatipContext m, Katip (ExceptT e m)) => KatipContext (ExceptT e m) 
Instance details

Defined in Katip.Monadic

(KatipContext m, Katip (IdentityT m)) => KatipContext (IdentityT m) 
Instance details

Defined in Katip.Monadic

(KatipContext m, Katip (ReaderT r m)) => KatipContext (ReaderT r m) 
Instance details

Defined in Katip.Monadic

(KatipContext m, Katip (StateT s m)) => KatipContext (StateT s m) 
Instance details

Defined in Katip.Monadic

(KatipContext m, Katip (StateT s m)) => KatipContext (StateT s m) 
Instance details

Defined in Katip.Monadic

(Monoid w, KatipContext m, Katip (WriterT w m)) => KatipContext (WriterT w m) 
Instance details

Defined in Katip.Monadic

(Monoid w, KatipContext m, Katip (WriterT w m)) => KatipContext (WriterT w m) 
Instance details

Defined in Katip.Monadic

(Monoid w, KatipContext m, Katip (RWST r w s m)) => KatipContext (RWST r w s m) 
Instance details

Defined in Katip.Monadic

Methods

getKatipContext :: RWST r w s m LogContexts #

localKatipContext :: (LogContexts -> LogContexts) -> RWST r w s m a -> RWST r w s m a #

getKatipNamespace :: RWST r w s m Namespace #

localKatipNamespace :: (Namespace -> Namespace) -> RWST r w s m a -> RWST r w s m a #

(Monoid w, KatipContext m, Katip (RWST r w s m)) => KatipContext (RWST r w s m) 
Instance details

Defined in Katip.Monadic

Methods

getKatipContext :: RWST r w s m LogContexts #

localKatipContext :: (LogContexts -> LogContexts) -> RWST r w s m a -> RWST r w s m a #

getKatipNamespace :: RWST r w s m Namespace #

localKatipNamespace :: (Namespace -> Namespace) -> RWST r w s m a -> RWST r w s m a #

data LogContexts #

Heterogeneous list of log contexts that provides a smart LogContext instance for combining multiple payload policies. This is critical for log contexts deep down in a stack to be able to inject their own context without worrying about other context that has already been set. Also note that contexts are treated as a sequence and <> will be appended to the right hand side of the sequence. If there are conflicting keys in the contexts, the /right side will take precedence/, which is counter to how monoid works for Map and HashMap, so bear that in mind. The reasoning is that if the user is sequentially adding contexts to the right side of the sequence, on conflict the intent is to overwrite with the newer value (i.e. the rightmost value).

Additional note: you should not mappend LogContexts in any sort of infinite loop, as it retains all data, so that would be a memory leak.

data AnyLogContext #

A wrapper around a log context that erases type information so that contexts from multiple layers can be combined intelligently.

liftPayload :: LogItem a => a -> LogContexts #

Lift a log context into the generic wrapper so that it can combine with the existing log context.

logItemM :: (Applicative m, KatipContext m, HasCallStack) => Maybe Loc -> Severity -> LogStr -> m () #

Log with everything, including a source code location. This is very low level and you typically can use logTM in its place. Automatically supplies payload and namespace.

logFM #

Arguments

:: (Applicative m, KatipContext m) 
=> Severity

Severity of the message

-> LogStr

The log message

-> m () 

Log with full context, but without any code location. Automatically supplies payload and namespace.

logTM :: ExpQ #

Loc-tagged logging when using template-haskell. Automatically supplies payload and namespace.

$(logTM) InfoS "Hello world"

logLocM :: (Applicative m, KatipContext m, HasCallStack) => Severity -> LogStr -> m () #

Loc-tagged logging when using getCallStack implicit-callstacks>. Automatically supplies payload and namespace.

Same consideration as logLoc applies.

By default, location will be logged from the module that invokes logLocM. If you want to use logLocM in a helper, wrap the entire helper in withFrozenCallStack to retain the callsite of the helper in the logs.

This function does not require template-haskell. Using GHC <= 7.8 will result in the emission of a log line without any location information. Users using GHC <= 7.8 may want to use the template-haskell function logTM for maximum compatibility.

logLocM InfoS "Hello world"

logExceptionM #

Arguments

:: (KatipContext m, MonadCatch m, Applicative m) 
=> m a

Main action to run

-> Severity

Severity

-> m a 

Perform an action while logging any exceptions that may occur. Inspired by onException.

>>> > error "foo" `logExceptionM` ErrorS

runKatipContextT :: LogItem c => LogEnv -> c -> Namespace -> KatipContextT m a -> m a #

katipAddNamespace :: KatipContext m => Namespace -> m a -> m a #

Append a namespace segment to the current namespace for the given monadic action, then restore the previous state afterwards. Works with anything implementing KatipContext.

katipAddContext :: (LogItem i, KatipContext m) => i -> m a -> m a #

Append some context to the current context for the given monadic action, then restore the previous state afterwards. Important note: be careful using this in a loop. If you're using something like forever or replicateM_ that does explicit sharing to avoid a memory leak, youll be fine as it will *sequence* calls to katipAddNamespace, so each loop will get the same context added. If you instead roll your own recursion and you're recursing in the action you provide, you'll instead accumulate tons of redundant contexts and even if they all merge on log, they are stored in a sequence and will leak memory. Works with anything implementing KatipContext.

type ItemFormatter a = Bool -> Verbosity -> Item a -> Builder #

A custom ItemFormatter for logging Items. Takes a Bool indicating whether to colorize the output, Verbosity of output, and an Item to format.

See bracketFormat and jsonFormat for examples.

data ColorStrategy #

Constructors

ColorLog Bool

Whether to use color control chars in log output

ColorIfTerminal

Color if output is a terminal

Instances

Instances details
Show ColorStrategy 
Instance details

Defined in Katip.Scribes.Handle

Eq ColorStrategy 
Instance details

Defined in Katip.Scribes.Handle

mkHandleScribe :: ColorStrategy -> Handle -> PermitFunc -> Verbosity -> IO Scribe #

Logs to a file handle such as stdout, stderr, or a file. Contexts and other information will be flattened out into bracketed fields. For example:

[2016-05-11 21:01:15][MyApp][Info][myhost.example.com][PID 1724][ThreadId 1154][main:Helpers.Logging Helpers/Logging.hs:32:7] Started
[2016-05-11 21:01:15][MyApp.confrabulation][Debug][myhost.example.com][PID 1724][ThreadId 1154][confrab_factor:42.0][main:Helpers.Logging Helpers/Logging.hs:41:9] Confrabulating widgets, with extra namespace and context
[2016-05-11 21:01:15][MyApp][Info][myhost.example.com][PID 1724][ThreadId 1154][main:Helpers.Logging Helpers/Logging.hs:43:7] Namespace and context are back to normal

Returns the newly-created Scribe. The finalizer flushes the handle. Handle mode is set to LineBuffering automatically.

mkHandleScribeWithFormatter :: (forall a. LogItem a => ItemFormatter a) -> ColorStrategy -> Handle -> PermitFunc -> Verbosity -> IO Scribe #

Logs to a file handle such as stdout, stderr, or a file. Takes a custom ItemFormatter that can be used to format Item as needed.

Returns the newly-created Scribe. The finalizer flushes the handle. Handle mode is set to LineBuffering automatically.

mkFileScribe :: FilePath -> PermitFunc -> Verbosity -> IO Scribe #

A specialization of mkHandleScribe that takes a FilePath instead of a Handle. It is responsible for opening the file in AppendMode and will close the file handle on closeScribe/closeScribes. Does not do log coloring. Sets handle to LineBuffering mode.

bracketFormat :: LogItem a => ItemFormatter a #

A traditional bracketed log format. Contexts and other information will be flattened out into bracketed fields. For example:

[2016-05-11 21:01:15][MyApp][Info][myhost.example.com][PID 1724][ThreadId 1154][main:Helpers.Logging Helpers/Logging.hs:32:7] Started
[2016-05-11 21:01:15][MyApp.confrabulation][Debug][myhost.example.com][PID 1724][ThreadId 1154][confrab_factor:42.0][main:Helpers.Logging Helpers/Logging.hs:41:9] Confrabulating widgets, with extra namespace and context
[2016-05-11 21:01:15][MyApp][Info][myhost.example.com][PID 1724][ThreadId 1154][main:Helpers.Logging Helpers/Logging.hs:43:7] Namespace and context are back to normal

jsonFormat :: LogItem a => ItemFormatter a #

Logs items as JSON. This can be useful in circumstances where you already have infrastructure that is expecting JSON to be logged to a standard stream or file. For example:

{"at":"2018-10-02T21:50:30.4523848Z","env":"production","ns":["MyApp"],"data":{},"app":["MyApp"],"msg":"Started","pid":"10456","loc":{"loc_col":9,"loc_pkg":"main","loc_mod":"Helpers.Logging","loc_fn":"Helpers\\Logging.hs","loc_ln":44},"host":"myhost.example.com","sev":"Info","thread":"ThreadId 139"}
{"at":"2018-10-02T21:50:30.4523848Z","env":"production","ns":["MyApp","confrabulation"],"data":{"confrab_factor":42},"app":["MyApp"],"msg":"Confrabulating widgets, with extra namespace and context","pid":"10456","loc":{"loc_col":11,"loc_pkg":"main","loc_mod":"Helpers.Logging","loc_fn":"Helpers\\Logging.hs","loc_ln":53},"host":"myhost.example.com","sev":"Debug","thread":"ThreadId 139"}
{"at":"2018-10-02T21:50:30.4523848Z","env":"production","ns":["MyApp"],"data":{},"app":["MyApp"],"msg":"Namespace and context are back to normal","pid":"10456","loc":{"loc_col":9,"loc_pkg":"main","loc_mod":"Helpers.Logging","loc_fn":"Helpers\\Logging.hs","loc_ln":55},"host":"myhost.example.com","sev":"Info","thread":"ThreadId 139"}

is :: SExp -> SExp -> SExp #

(<.) :: SExp -> SExp -> SExp infix 4 #

data AsStruct #

Constructors

AsStruct 
AsStructNo 
AsValue 

Instances

Instances details
NFData AsStruct 
Instance details

Defined in Napkin.Types.Core

Methods

rnf :: AsStruct -> () #

Data AsStruct 
Instance details

Defined in Napkin.Types.Core

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AsStruct -> c AsStruct #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AsStruct #

toConstr :: AsStruct -> Constr #

dataTypeOf :: AsStruct -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AsStruct) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AsStruct) #

gmapT :: (forall b. Data b => b -> b) -> AsStruct -> AsStruct #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AsStruct -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AsStruct -> r #

gmapQ :: (forall d. Data d => d -> u) -> AsStruct -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AsStruct -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AsStruct -> m AsStruct #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AsStruct -> m AsStruct #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AsStruct -> m AsStruct #

Generic AsStruct 
Instance details

Defined in Napkin.Types.Core

Associated Types

type Rep AsStruct 
Instance details

Defined in Napkin.Types.Core

type Rep AsStruct = D1 ('MetaData "AsStruct" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "AsStruct" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "AsStructNo" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "AsValue" 'PrefixI 'False) (U1 :: Type -> Type)))

Methods

from :: AsStruct -> Rep AsStruct x #

to :: Rep AsStruct x -> AsStruct #

Read AsStruct 
Instance details

Defined in Napkin.Types.Core

Show AsStruct 
Instance details

Defined in Napkin.Types.Core

Eq AsStruct 
Instance details

Defined in Napkin.Types.Core

Ord AsStruct 
Instance details

Defined in Napkin.Types.Core

Lift AsStruct 
Instance details

Defined in Napkin.Types.Core

Methods

lift :: Quote m => AsStruct -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => AsStruct -> Code m AsStruct #

type Rep AsStruct 
Instance details

Defined in Napkin.Types.Core

type Rep AsStruct = D1 ('MetaData "AsStruct" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "AsStruct" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "AsStructNo" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "AsValue" 'PrefixI 'False) (U1 :: Type -> Type)))

bqSQL :: QuasiQuoter #

QuasiQuoter for declaring a Query in BigQuery backend with TemplateHaskell

bqSQLSExp :: QuasiQuoter #

QuasiQuoter for declaring a SExp in BigQuery backend with TemplateHaskell

bqSQLSelExps :: QuasiQuoter #

QuasiQuoter for declaring one or many clauses of a select statement in BigQuery backend with TemplateHaskell

bqSQLFrom :: QuasiQuoter #

QuasiQuoter for declaring a From ("from" keyword and a corresponding Relation) in BigQuery backend with TemplateHaskell

bqSQLRel :: QuasiQuoter #

QuasiQuoter for declaring a Alias Relation (corresponds "table as alias" syntax) in BigQuery backend with TemplateHaskell

debugSql' :: forall {k} (b :: k) a. RenderSql a b => a -> Unshow #

for evaluating queries in source code comments, use instances defined in Napkin.Backend...

renderSql' :: forall {k} a (b :: k). RenderSql a b => Proxy b -> a -> Text #

renderSqlCollapsed :: forall {k} a (b :: k). RenderSql a b => Proxy b -> a -> Text #

renderSqlErr :: forall {k} a (b :: k). RenderSql a b => Proxy b -> a -> Either Text Text #

renderSqlWith :: forall {k} a (b :: k). RenderSql a b => Style -> Proxy b -> a -> Text #

class RenderSql a (backend :: k) where #

If one day we support multiple backends, one option would be for this typeclass to take a (Proxy backend) argument to dispatch on the right backend.

Methods

renderSql :: Proxy backend -> a -> ME Doc #

Instances

Instances details
RenderSql Query a => RenderSql (CreateTableAs a) (a :: Type) # 
Instance details

Defined in Napkin.Spec.Types.CreateTableAs

Methods

renderSql :: Proxy a -> CreateTableAs a -> ME Doc #

RenderSql Query backend => RenderSql (Q a) (backend :: k)

Monadic query interface

Instance details

Defined in Napkin.Render.Types

Methods

renderSql :: Proxy backend -> Q a -> ME Doc #

data RenderedSql #

Constructors

RenderSql a backend => RenderedSql (Proxy backend) a 

newtype Unshow #

Workaround for HLS eval plugin (using show) not handling multiline output well

Constructors

Unshow Text 

Instances

Instances details
Show Unshow 
Instance details

Defined in Napkin.Render.Types

data family BackendConn b #

Instances

Instances details
data BackendConn BigQuery 
Instance details

Defined in Napkin.Run.BigQuery

data BackendConn MsSql 
Instance details

Defined in Napkin.Run.MsSql

data BackendConn Postgres 
Instance details

Defined in Napkin.Run.Postgres

data BackendConn Redshift 
Instance details

Defined in Napkin.Run.Redshift

data BackendConn Sqlite 
Instance details

Defined in Napkin.Run.Sqlite

type Rep (BackendConn Postgres) 
Instance details

Defined in Napkin.Run.Postgres

type Rep (BackendConn Postgres) = D1 ('MetaData "BackendConn" "Napkin.Run.Postgres" "napkin-backend-postgres-redshift-2.0.0-8c7ovqR1PRBAKEWr41oVVZ" 'False) (C1 ('MetaCons "PostgresConn" 'PrefixI 'True) (S1 ('MetaSel ('Just "getConnectionString") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ConnectionString) :*: S1 ('MetaSel ('Just "getPostgresConn") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Pool Connection))))

scopeGeneric :: [(Ref Function, SExp)] -> SExp -> SExp -> SExp #

Apply a given predicate condition deeply within a given expression, such that the predicate is pushed inside all the aggregating function calls in SQL.

This makes it possible to have conditional aggregations without needing additional CTEs.

TODO. This is may have holes; we need a principled end-to-end review of this transformation. Perhaps even put it as a primitive into the SExp type.

data NullStrategy #

Constructors

IgnoreNulls 
RespectNulls 

Instances

Instances details
NFData NullStrategy 
Instance details

Defined in Napkin.Types.Core

Methods

rnf :: NullStrategy -> () #

Data NullStrategy 
Instance details

Defined in Napkin.Types.Core

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NullStrategy -> c NullStrategy #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NullStrategy #

toConstr :: NullStrategy -> Constr #

dataTypeOf :: NullStrategy -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NullStrategy) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NullStrategy) #

gmapT :: (forall b. Data b => b -> b) -> NullStrategy -> NullStrategy #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NullStrategy -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NullStrategy -> r #

gmapQ :: (forall d. Data d => d -> u) -> NullStrategy -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> NullStrategy -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NullStrategy -> m NullStrategy #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NullStrategy -> m NullStrategy #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NullStrategy -> m NullStrategy #

Generic NullStrategy 
Instance details

Defined in Napkin.Types.Core

Associated Types

type Rep NullStrategy 
Instance details

Defined in Napkin.Types.Core

type Rep NullStrategy = D1 ('MetaData "NullStrategy" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "IgnoreNulls" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "RespectNulls" 'PrefixI 'False) (U1 :: Type -> Type))
Show NullStrategy 
Instance details

Defined in Napkin.Types.Core

Eq NullStrategy 
Instance details

Defined in Napkin.Types.Core

Ord NullStrategy 
Instance details

Defined in Napkin.Types.Core

Lift NullStrategy 
Instance details

Defined in Napkin.Types.Core

Methods

lift :: Quote m => NullStrategy -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => NullStrategy -> Code m NullStrategy #

type Rep NullStrategy 
Instance details

Defined in Napkin.Types.Core

type Rep NullStrategy = D1 ('MetaData "NullStrategy" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "IgnoreNulls" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "RespectNulls" 'PrefixI 'False) (U1 :: Type -> Type))

msSQL :: QuasiQuoter #

QuasiQuoter for declaring a Query in MsSql backend with TemplateHaskell

msSQLSExp :: QuasiQuoter #

QuasiQuoter for declaring a SExp in MsSql backend with TemplateHaskell

msSQLSelExps :: QuasiQuoter #

QuasiQuoter for declaring one or many clauses of a select statement in MsSql backend with TemplateHaskell

msSQLFrom :: QuasiQuoter #

QuasiQuoter for declaring a From ("from" keyword and a corresponding Relation) in MsSql backend with TemplateHaskell

msSQLRel :: QuasiQuoter #

QuasiQuoter for declaring a Alias Relation (corresponds "table as alias" syntax) in MsSql backend with TemplateHaskell

pgSQL :: QuasiQuoter #

QuasiQuoter for declaring a Query in Postgres backend with TemplateHaskell

pgSQLSExp :: QuasiQuoter #

QuasiQuoter for declaring a SExp in Postgres backend with TemplateHaskell

pgSQLSelExps :: QuasiQuoter #

QuasiQuoter for declaring one or many clauses of a select statement in Postgres backend with TemplateHaskell

pgSQLFrom :: QuasiQuoter #

QuasiQuoter for declaring a From ("from" keyword and a corresponding Relation) in Postgres backend with TemplateHaskell

pgSQLRel :: QuasiQuoter #

QuasiQuoter for declaring a Alias Relation (corresponds "table as alias" syntax) in Postgres backend with TemplateHaskell

rsSQL :: QuasiQuoter #

QuasiQuoter for declaring a Query in Postgres backend with TemplateHaskell

rsSQLSExp :: QuasiQuoter #

QuasiQuoter for declaring a SExp in Redshift backend with TemplateHaskell

rsSQLSelExps :: QuasiQuoter #

QuasiQuoter for declaring one or many clauses of a select statement in Redshift backend with TemplateHaskell

rsSQLFrom :: QuasiQuoter #

QuasiQuoter for declaring a From ("from" keyword and a corresponding Relation) in Redshift backend with TemplateHaskell

rsSQLRel :: QuasiQuoter #

QuasiQuoter for declaring a Alias Relation (corresponds "table as alias" syntax) in Redshift backend with TemplateHaskell

npgSQL :: QuasiQuoter #

QuasiQuoter for declaring a Query in Postgres backend with TemplateHaskell

npgSQLSExp :: QuasiQuoter #

QuasiQuoter for declaring a SExp in Postgres backend with TemplateHaskell

class IsRef a where #

Class of string-like types that can be interpreted as Refs

Methods

ref :: forall {k} (b :: k). a -> Ref b #

Instances

Instances details
IsRef Name 
Instance details

Defined in Napkin.Types.Core

Methods

ref :: forall {k} (b :: k). Name -> Ref b #

IsRef LText 
Instance details

Defined in Napkin.Types.Core

Methods

ref :: forall {k} (b :: k). LText -> Ref b #

IsRef Text 
Instance details

Defined in Napkin.Types.Core

Methods

ref :: forall {k} (b :: k). Text -> Ref b #

IsRef String 
Instance details

Defined in Napkin.Types.Core

Methods

ref :: forall {k} (b :: k). String -> Ref b #

IsRef (NonEmpty Name) 
Instance details

Defined in Napkin.Types.Core

Methods

ref :: forall {k} (b :: k). NonEmpty Name -> Ref b #

IsRef [Name] 
Instance details

Defined in Napkin.Types.Core

Methods

ref :: forall {k} (b :: k). [Name] -> Ref b #

IsRef (Ref a) 
Instance details

Defined in Napkin.Types.Core

Methods

ref :: forall {k0} (b :: k0). Ref a -> Ref b #

checkTableExists :: forall {k} (b :: k) (r :: EffectRow). Member (SqlRead b :: (Type -> Type) -> Type -> Type) r => Ref Table -> Sem r Bool #

data Relation #

Constructors

TableRelation (Ref Table) 
QueryRelation Query 
ArrayRelation SExp (Maybe Name) 
RawRelation [Ref Table] Text

Escape hatch: A raw relation with its dependencies. Avoid if possible

Instances

Instances details
NFData Relation 
Instance details

Defined in Napkin.Types.Core

Methods

rnf :: Relation -> () #

Data Relation 
Instance details

Defined in Napkin.Types.Core

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Relation -> c Relation #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Relation #

toConstr :: Relation -> Constr #

dataTypeOf :: Relation -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Relation) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Relation) #

gmapT :: (forall b. Data b => b -> b) -> Relation -> Relation #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Relation -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Relation -> r #

gmapQ :: (forall d. Data d => d -> u) -> Relation -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Relation -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Relation -> m Relation #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Relation -> m Relation #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Relation -> m Relation #

IsString Relation 
Instance details

Defined in Napkin.Types.Core

Generic Relation 
Instance details

Defined in Napkin.Types.Core

Methods

from :: Relation -> Rep Relation x #

to :: Rep Relation x -> Relation #

Show Relation 
Instance details

Defined in Napkin.Types.Core

Eq Relation 
Instance details

Defined in Napkin.Types.Core

Ord Relation 
Instance details

Defined in Napkin.Types.Core

AsRelation Relation 
Instance details

Defined in Napkin.Types.Core

MaybeQuery Relation 
Instance details

Defined in Napkin.Types.Core

HasDeps Relation 
Instance details

Defined in Napkin.Types.Deps

FunRenamer Relation 
Instance details

Defined in Napkin.Types.QueryTransformer

TableRenamer Relation 
Instance details

Defined in Napkin.Types.QueryTransformer

Lift Relation 
Instance details

Defined in Napkin.Types.Core

Methods

lift :: Quote m => Relation -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Relation -> Code m Relation #

FunRenamer (Selected Relation) 
Instance details

Defined in Napkin.Types.QueryTransformer

TableRenamer (Selected Relation) 
Instance details

Defined in Napkin.Types.QueryTransformer

type Rep Relation 
Instance details

Defined in Napkin.Types.Core

slSQL :: QuasiQuoter #

QuasiQuoter for declaring a Query in Sqlite backend with TemplateHaskell

slSQLSExp :: QuasiQuoter #

QuasiQuoter for declaring a SExp in Sqlite backend with TemplateHaskell

slSQLSelExps :: QuasiQuoter #

QuasiQuoter for declaring one or many clauses of a select statement in Sqlite backend with TemplateHaskell

slSQLFrom :: QuasiQuoter #

QuasiQuoter for declaring a From ("from" keyword and a corresponding Relation) in Sqlite backend with TemplateHaskell

slSQLRel :: QuasiQuoter #

QuasiQuoter for declaring a Alias Relation (corresponds "table as alias" syntax) in Sqlite backend with TemplateHaskell

renameTable :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => Ref Table -> Ref Table -> Sem r () #

newtype RandomToken #

Constructors

RandomToken 

Fields

class MaybeQuery s where #

Things that may or may not contain an explicit Query inside

Methods

getQuery :: s -> Maybe Query #

Instances

Instances details
MaybeQuery Query 
Instance details

Defined in Napkin.Types.Core

Methods

getQuery :: Query -> Maybe Query #

MaybeQuery Relation 
Instance details

Defined in Napkin.Types.Core

MaybeQuery (CreateTableAs m) # 
Instance details

Defined in Napkin.Spec.Types.CreateTableAs

MaybeQuery (Q ()) 
Instance details

Defined in Napkin.Untyped.Monad

Methods

getQuery :: Q () -> Maybe Query #

class HasDefinition s where #

Methods

defQuery :: Lens s s Query Query #

Instances

Instances details
HasDefinition Query 
Instance details

Defined in Napkin.Types.Core

HasDefinition (CreateTableAs m) # 
Instance details

Defined in Napkin.Spec.Types.CreateTableAs

HasDefinition (Q ()) 
Instance details

Defined in Napkin.Untyped.Monad

Methods

defQuery :: Lens (Q ()) (Q ()) Query Query #

class AsRelation s where #

Methods

asRelation :: s -> Relation #

Instances

Instances details
AsRelation DefinedRelation 
Instance details

Defined in Napkin.Types.Core

AsRelation Query 
Instance details

Defined in Napkin.Types.Core

Methods

asRelation :: Query -> Relation #

AsRelation Relation 
Instance details

Defined in Napkin.Types.Core

AsRelation SpecTableName 
Instance details

Defined in Napkin.Types.Core

AsRelation (CreateTableAs m) # 
Instance details

Defined in Napkin.Spec.Types.CreateTableAs

AsRelation (Q a) 
Instance details

Defined in Napkin.Untyped.Monad

Methods

asRelation :: Q a -> Relation #

AsRelation (Ref a) 
Instance details

Defined in Napkin.Types.Core

Methods

asRelation :: Ref a -> Relation #

data DefinedQuery #

Like DefinedRelation, but only requires a defined query.

Constructors

HasDefinition s => DefinedQuery s 

data DefinedRelation #

OO-style wrapper for objects that contain a full query definition

Constructors

(AsRelation s, HasDefinition s, MaybeQuery s) => DefinedRelation s 

Instances

Instances details
AsRelation DefinedRelation 
Instance details

Defined in Napkin.Types.Core

data NativeQuery #

Instances

Instances details
NFData NativeQuery 
Instance details

Defined in Napkin.Types.Core

Methods

rnf :: NativeQuery -> () #

Data NativeQuery 
Instance details

Defined in Napkin.Types.Core

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NativeQuery -> c NativeQuery #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NativeQuery #

toConstr :: NativeQuery -> Constr #

dataTypeOf :: NativeQuery -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NativeQuery) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NativeQuery) #

gmapT :: (forall b. Data b => b -> b) -> NativeQuery -> NativeQuery #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NativeQuery -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NativeQuery -> r #

gmapQ :: (forall d. Data d => d -> u) -> NativeQuery -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> NativeQuery -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NativeQuery -> m NativeQuery #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NativeQuery -> m NativeQuery #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NativeQuery -> m NativeQuery #

Generic NativeQuery 
Instance details

Defined in Napkin.Types.Core

Associated Types

type Rep NativeQuery 
Instance details

Defined in Napkin.Types.Core

type Rep NativeQuery = D1 ('MetaData "NativeQuery" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "PostgresSelectStmt" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SelectStmt)) :+: C1 ('MetaCons "SimpleSQLParserQueryExpr" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 QueryExpr)))
Show NativeQuery 
Instance details

Defined in Napkin.Types.Core

Eq NativeQuery 
Instance details

Defined in Napkin.Types.Core

Ord NativeQuery 
Instance details

Defined in Napkin.Types.Core

Lift NativeQuery 
Instance details

Defined in Napkin.Types.Core

Methods

lift :: Quote m => NativeQuery -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => NativeQuery -> Code m NativeQuery #

type Rep NativeQuery 
Instance details

Defined in Napkin.Types.Core

type Rep NativeQuery = D1 ('MetaData "NativeQuery" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "PostgresSelectStmt" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SelectStmt)) :+: C1 ('MetaCons "SimpleSQLParserQueryExpr" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 QueryExpr)))

data ParensOperator #

Instances

Instances details
NFData ParensOperator 
Instance details

Defined in Napkin.Types.Core

Methods

rnf :: ParensOperator -> () #

Data ParensOperator 
Instance details

Defined in Napkin.Types.Core

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ParensOperator -> c ParensOperator #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ParensOperator #

toConstr :: ParensOperator -> Constr #

dataTypeOf :: ParensOperator -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ParensOperator) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ParensOperator) #

gmapT :: (forall b. Data b => b -> b) -> ParensOperator -> ParensOperator #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ParensOperator -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ParensOperator -> r #

gmapQ :: (forall d. Data d => d -> u) -> ParensOperator -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ParensOperator -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ParensOperator -> m ParensOperator #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ParensOperator -> m ParensOperator #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ParensOperator -> m ParensOperator #

Generic ParensOperator 
Instance details

Defined in Napkin.Types.Core

Associated Types

type Rep ParensOperator 
Instance details

Defined in Napkin.Types.Core

type Rep ParensOperator = D1 ('MetaData "ParensOperator" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "ParensOperator" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Ref Function]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [ParensOperatorArgument])))
Show ParensOperator 
Instance details

Defined in Napkin.Types.Core

Eq ParensOperator 
Instance details

Defined in Napkin.Types.Core

Ord ParensOperator 
Instance details

Defined in Napkin.Types.Core

Lift ParensOperator 
Instance details

Defined in Napkin.Types.Core

Methods

lift :: Quote m => ParensOperator -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => ParensOperator -> Code m ParensOperator #

type Rep ParensOperator 
Instance details

Defined in Napkin.Types.Core

type Rep ParensOperator = D1 ('MetaData "ParensOperator" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "ParensOperator" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Ref Function]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [ParensOperatorArgument])))

data ParensOperatorArgument #

Instances

Instances details
NFData ParensOperatorArgument 
Instance details

Defined in Napkin.Types.Core

Methods

rnf :: ParensOperatorArgument -> () #

Data ParensOperatorArgument 
Instance details

Defined in Napkin.Types.Core

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ParensOperatorArgument -> c ParensOperatorArgument #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ParensOperatorArgument #

toConstr :: ParensOperatorArgument -> Constr #

dataTypeOf :: ParensOperatorArgument -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ParensOperatorArgument) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ParensOperatorArgument) #

gmapT :: (forall b. Data b => b -> b) -> ParensOperatorArgument -> ParensOperatorArgument #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ParensOperatorArgument -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ParensOperatorArgument -> r #

gmapQ :: (forall d. Data d => d -> u) -> ParensOperatorArgument -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ParensOperatorArgument -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ParensOperatorArgument -> m ParensOperatorArgument #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ParensOperatorArgument -> m ParensOperatorArgument #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ParensOperatorArgument -> m ParensOperatorArgument #

Generic ParensOperatorArgument 
Instance details

Defined in Napkin.Types.Core

Associated Types

type Rep ParensOperatorArgument 
Instance details

Defined in Napkin.Types.Core

type Rep ParensOperatorArgument = D1 ('MetaData "ParensOperatorArgument" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "ParensOperatorArgument" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Keyword]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Alias SExp))) :+: C1 ('MetaCons "ParensOperatorConst" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Keyword])))
Show ParensOperatorArgument 
Instance details

Defined in Napkin.Types.Core

Eq ParensOperatorArgument 
Instance details

Defined in Napkin.Types.Core

Ord ParensOperatorArgument 
Instance details

Defined in Napkin.Types.Core

Lift ParensOperatorArgument 
Instance details

Defined in Napkin.Types.Core

type Rep ParensOperatorArgument 
Instance details

Defined in Napkin.Types.Core

type Rep ParensOperatorArgument = D1 ('MetaData "ParensOperatorArgument" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "ParensOperatorArgument" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Keyword]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Alias SExp))) :+: C1 ('MetaCons "ParensOperatorConst" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Keyword])))

data WithClauses #

CTE expression support- the RECURSIVE keyword allows any subsequently mentioned CTEs to be recursive (but are not necessarily recursive).

Instances

Instances details
Default WithClauses 
Instance details

Defined in Napkin.Types.Core

Methods

def :: WithClauses #

NFData WithClauses 
Instance details

Defined in Napkin.Types.Core

Methods

rnf :: WithClauses -> () #

Data WithClauses 
Instance details

Defined in Napkin.Types.Core

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> WithClauses -> c WithClauses #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c WithClauses #

toConstr :: WithClauses -> Constr #

dataTypeOf :: WithClauses -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c WithClauses) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c WithClauses) #

gmapT :: (forall b. Data b => b -> b) -> WithClauses -> WithClauses #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WithClauses -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WithClauses -> r #

gmapQ :: (forall d. Data d => d -> u) -> WithClauses -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> WithClauses -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> WithClauses -> m WithClauses #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> WithClauses -> m WithClauses #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> WithClauses -> m WithClauses #

Generic WithClauses 
Instance details

Defined in Napkin.Types.Core

Associated Types

type Rep WithClauses 
Instance details

Defined in Napkin.Types.Core

type Rep WithClauses = D1 ('MetaData "WithClauses" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "WithClauses" 'PrefixI 'True) (S1 ('MetaSel ('Just "_withClauses_recursive") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "_withClauses_cteBodies") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (OMap (Ref Query) CteBody))))
Show WithClauses 
Instance details

Defined in Napkin.Types.Core

Eq WithClauses 
Instance details

Defined in Napkin.Types.Core

Ord WithClauses 
Instance details

Defined in Napkin.Types.Core

HasDeps WithClauses 
Instance details

Defined in Napkin.Types.Deps

FunRenamer WithClauses 
Instance details

Defined in Napkin.Types.QueryTransformer

TableRenamer WithClauses 
Instance details

Defined in Napkin.Types.QueryTransformer

Lift WithClauses 
Instance details

Defined in Napkin.Types.Core

Methods

lift :: Quote m => WithClauses -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => WithClauses -> Code m WithClauses #

type Rep WithClauses 
Instance details

Defined in Napkin.Types.Core

type Rep WithClauses = D1 ('MetaData "WithClauses" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "WithClauses" 'PrefixI 'True) (S1 ('MetaSel ('Just "_withClauses_recursive") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "_withClauses_cteBodies") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (OMap (Ref Query) CteBody))))

data CteBody #

Instances

Instances details
NFData CteBody 
Instance details

Defined in Napkin.Types.Core

Methods

rnf :: CteBody -> () #

Data CteBody 
Instance details

Defined in Napkin.Types.Core

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CteBody -> c CteBody #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CteBody #

toConstr :: CteBody -> Constr #

dataTypeOf :: CteBody -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CteBody) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CteBody) #

gmapT :: (forall b. Data b => b -> b) -> CteBody -> CteBody #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CteBody -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CteBody -> r #

gmapQ :: (forall d. Data d => d -> u) -> CteBody -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CteBody -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CteBody -> m CteBody #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CteBody -> m CteBody #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CteBody -> m CteBody #

Generic CteBody 
Instance details

Defined in Napkin.Types.Core

Associated Types

type Rep CteBody 
Instance details

Defined in Napkin.Types.Core

type Rep CteBody = D1 ('MetaData "CteBody" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "JustCteBody" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Selected Query))) :+: C1 ('MetaCons "PositionalBoundsCteBody" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty (Ref SExp))) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Selected Query))))

Methods

from :: CteBody -> Rep CteBody x #

to :: Rep CteBody x -> CteBody #

Show CteBody 
Instance details

Defined in Napkin.Types.Core

Eq CteBody 
Instance details

Defined in Napkin.Types.Core

Methods

(==) :: CteBody -> CteBody -> Bool #

(/=) :: CteBody -> CteBody -> Bool #

Ord CteBody 
Instance details

Defined in Napkin.Types.Core

HasDeps CteBody 
Instance details

Defined in Napkin.Types.Deps

FunRenamer CteBody 
Instance details

Defined in Napkin.Types.QueryTransformer

TableRenamer CteBody 
Instance details

Defined in Napkin.Types.QueryTransformer

Lift CteBody 
Instance details

Defined in Napkin.Types.Core

Methods

lift :: Quote m => CteBody -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => CteBody -> Code m CteBody #

type Rep CteBody 
Instance details

Defined in Napkin.Types.Core

type Rep CteBody = D1 ('MetaData "CteBody" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "JustCteBody" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Selected Query))) :+: C1 ('MetaCons "PositionalBoundsCteBody" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty (Ref SExp))) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Selected Query))))

data RawQuery #

Constructors

RawQuery 

Instances

Instances details
NFData RawQuery 
Instance details

Defined in Napkin.Types.Core

Methods

rnf :: RawQuery -> () #

Data RawQuery 
Instance details

Defined in Napkin.Types.Core

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RawQuery -> c RawQuery #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RawQuery #

toConstr :: RawQuery -> Constr #

dataTypeOf :: RawQuery -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RawQuery) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RawQuery) #

gmapT :: (forall b. Data b => b -> b) -> RawQuery -> RawQuery #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RawQuery -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RawQuery -> r #

gmapQ :: (forall d. Data d => d -> u) -> RawQuery -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> RawQuery -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RawQuery -> m RawQuery #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RawQuery -> m RawQuery #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RawQuery -> m RawQuery #

Generic RawQuery 
Instance details

Defined in Napkin.Types.Core

Associated Types

type Rep RawQuery 
Instance details

Defined in Napkin.Types.Core

type Rep RawQuery = D1 ('MetaData "RawQuery" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "RawQuery" 'PrefixI 'True) (S1 ('MetaSel ('Just "_rawQuery_deps") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Ref Table]) :*: S1 ('MetaSel ('Just "_rawQuery_raw") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

Methods

from :: RawQuery -> Rep RawQuery x #

to :: Rep RawQuery x -> RawQuery #

Show RawQuery 
Instance details

Defined in Napkin.Types.Core

Eq RawQuery 
Instance details

Defined in Napkin.Types.Core

Ord RawQuery 
Instance details

Defined in Napkin.Types.Core

Lift RawQuery 
Instance details

Defined in Napkin.Types.Core

Methods

lift :: Quote m => RawQuery -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => RawQuery -> Code m RawQuery #

type Rep RawQuery 
Instance details

Defined in Napkin.Types.Core

type Rep RawQuery = D1 ('MetaData "RawQuery" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "RawQuery" 'PrefixI 'True) (S1 ('MetaSel ('Just "_rawQuery_deps") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Ref Table]) :*: S1 ('MetaSel ('Just "_rawQuery_raw") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

data UnionType #

Instances

Instances details
NFData UnionType 
Instance details

Defined in Napkin.Types.Core

Methods

rnf :: UnionType -> () #

Data UnionType 
Instance details

Defined in Napkin.Types.Core

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UnionType -> c UnionType #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UnionType #

toConstr :: UnionType -> Constr #

dataTypeOf :: UnionType -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UnionType) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UnionType) #

gmapT :: (forall b. Data b => b -> b) -> UnionType -> UnionType #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UnionType -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UnionType -> r #

gmapQ :: (forall d. Data d => d -> u) -> UnionType -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UnionType -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UnionType -> m UnionType #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UnionType -> m UnionType #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UnionType -> m UnionType #

Generic UnionType 
Instance details

Defined in Napkin.Types.Core

Associated Types

type Rep UnionType 
Instance details

Defined in Napkin.Types.Core

type Rep UnionType = D1 ('MetaData "UnionType" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) ((C1 ('MetaCons "SetUnion" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DuplicateUnion" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "IntersectUnion" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "MinusUnion" 'PrefixI 'False) (U1 :: Type -> Type)))
Show UnionType 
Instance details

Defined in Napkin.Types.Core

Eq UnionType 
Instance details

Defined in Napkin.Types.Core

Ord UnionType 
Instance details

Defined in Napkin.Types.Core

Lift UnionType 
Instance details

Defined in Napkin.Types.Core

Methods

lift :: Quote m => UnionType -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => UnionType -> Code m UnionType #

type Rep UnionType 
Instance details

Defined in Napkin.Types.Core

type Rep UnionType = D1 ('MetaData "UnionType" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) ((C1 ('MetaCons "SetUnion" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DuplicateUnion" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "IntersectUnion" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "MinusUnion" 'PrefixI 'False) (U1 :: Type -> Type)))

data JoinType #

Instances

Instances details
NFData JoinType 
Instance details

Defined in Napkin.Types.Core

Methods

rnf :: JoinType -> () #

Data JoinType 
Instance details

Defined in Napkin.Types.Core

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> JoinType -> c JoinType #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c JoinType #

toConstr :: JoinType -> Constr #

dataTypeOf :: JoinType -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c JoinType) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c JoinType) #

gmapT :: (forall b. Data b => b -> b) -> JoinType -> JoinType #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> JoinType -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> JoinType -> r #

gmapQ :: (forall d. Data d => d -> u) -> JoinType -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> JoinType -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> JoinType -> m JoinType #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> JoinType -> m JoinType #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> JoinType -> m JoinType #

Generic JoinType 
Instance details

Defined in Napkin.Types.Core

Associated Types

type Rep JoinType 
Instance details

Defined in Napkin.Types.Core

type Rep JoinType = D1 ('MetaData "JoinType" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) ((C1 ('MetaCons "JoinLeft" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "JoinRight" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "JoinInner" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "JoinCross" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "JoinOuter" 'PrefixI 'False) (U1 :: Type -> Type))))

Methods

from :: JoinType -> Rep JoinType x #

to :: Rep JoinType x -> JoinType #

Show JoinType 
Instance details

Defined in Napkin.Types.Core

Eq JoinType 
Instance details

Defined in Napkin.Types.Core

Ord JoinType 
Instance details

Defined in Napkin.Types.Core

Lift JoinType 
Instance details

Defined in Napkin.Types.Core

Methods

lift :: Quote m => JoinType -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => JoinType -> Code m JoinType #

type Rep JoinType 
Instance details

Defined in Napkin.Types.Core

type Rep JoinType = D1 ('MetaData "JoinType" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) ((C1 ('MetaCons "JoinLeft" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "JoinRight" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "JoinInner" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "JoinCross" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "JoinOuter" 'PrefixI 'False) (U1 :: Type -> Type))))

data OrderPart #

Constructors

OrderPart 

Instances

Instances details
NFData OrderPart 
Instance details

Defined in Napkin.Types.Core

Methods

rnf :: OrderPart -> () #

Data OrderPart 
Instance details

Defined in Napkin.Types.Core

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrderPart -> c OrderPart #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrderPart #

toConstr :: OrderPart -> Constr #

dataTypeOf :: OrderPart -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrderPart) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrderPart) #

gmapT :: (forall b. Data b => b -> b) -> OrderPart -> OrderPart #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrderPart -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrderPart -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrderPart -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrderPart -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrderPart -> m OrderPart #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderPart -> m OrderPart #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderPart -> m OrderPart #

Generic OrderPart 
Instance details

Defined in Napkin.Types.Core

Associated Types

type Rep OrderPart 
Instance details

Defined in Napkin.Types.Core

type Rep OrderPart = D1 ('MetaData "OrderPart" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "OrderPart" 'PrefixI 'True) (S1 ('MetaSel ('Just "_opExp") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SExp) :*: (S1 ('MetaSel ('Just "_opOrder") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 OrderDir) :*: S1 ('MetaSel ('Just "_opNulls") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe NullOrder)))))
Show OrderPart 
Instance details

Defined in Napkin.Types.Core

Eq OrderPart 
Instance details

Defined in Napkin.Types.Core

Ord OrderPart 
Instance details

Defined in Napkin.Types.Core

FunRenamer OrderPart 
Instance details

Defined in Napkin.Types.QueryTransformer

TableRenamer OrderPart 
Instance details

Defined in Napkin.Types.QueryTransformer

Lift OrderPart 
Instance details

Defined in Napkin.Types.Core

Methods

lift :: Quote m => OrderPart -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => OrderPart -> Code m OrderPart #

type Rep OrderPart 
Instance details

Defined in Napkin.Types.Core

type Rep OrderPart = D1 ('MetaData "OrderPart" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "OrderPart" 'PrefixI 'True) (S1 ('MetaSel ('Just "_opExp") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SExp) :*: (S1 ('MetaSel ('Just "_opOrder") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 OrderDir) :*: S1 ('MetaSel ('Just "_opNulls") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe NullOrder)))))

data NullOrder #

Constructors

NullsFirst 
NullsLast 

Instances

Instances details
NFData NullOrder 
Instance details

Defined in Napkin.Types.Core

Methods

rnf :: NullOrder -> () #

Data NullOrder 
Instance details

Defined in Napkin.Types.Core

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NullOrder -> c NullOrder #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NullOrder #

toConstr :: NullOrder -> Constr #

dataTypeOf :: NullOrder -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NullOrder) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NullOrder) #

gmapT :: (forall b. Data b => b -> b) -> NullOrder -> NullOrder #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NullOrder -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NullOrder -> r #

gmapQ :: (forall d. Data d => d -> u) -> NullOrder -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> NullOrder -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NullOrder -> m NullOrder #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NullOrder -> m NullOrder #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NullOrder -> m NullOrder #

Generic NullOrder 
Instance details

Defined in Napkin.Types.Core

Associated Types

type Rep NullOrder 
Instance details

Defined in Napkin.Types.Core

type Rep NullOrder = D1 ('MetaData "NullOrder" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "NullsFirst" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "NullsLast" 'PrefixI 'False) (U1 :: Type -> Type))
Show NullOrder 
Instance details

Defined in Napkin.Types.Core

Eq NullOrder 
Instance details

Defined in Napkin.Types.Core

Ord NullOrder 
Instance details

Defined in Napkin.Types.Core

Lift NullOrder 
Instance details

Defined in Napkin.Types.Core

Methods

lift :: Quote m => NullOrder -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => NullOrder -> Code m NullOrder #

type Rep NullOrder 
Instance details

Defined in Napkin.Types.Core

type Rep NullOrder = D1 ('MetaData "NullOrder" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "NullsFirst" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "NullsLast" 'PrefixI 'False) (U1 :: Type -> Type))

data OrderDir #

Constructors

Asc 
Desc 

Instances

Instances details
NFData OrderDir 
Instance details

Defined in Napkin.Types.Core

Methods

rnf :: OrderDir -> () #

Data OrderDir 
Instance details

Defined in Napkin.Types.Core

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrderDir -> c OrderDir #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrderDir #

toConstr :: OrderDir -> Constr #

dataTypeOf :: OrderDir -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrderDir) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrderDir) #

gmapT :: (forall b. Data b => b -> b) -> OrderDir -> OrderDir #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrderDir -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrderDir -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrderDir -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrderDir -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrderDir -> m OrderDir #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderDir -> m OrderDir #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrderDir -> m OrderDir #

Generic OrderDir 
Instance details

Defined in Napkin.Types.Core

Associated Types

type Rep OrderDir 
Instance details

Defined in Napkin.Types.Core

type Rep OrderDir = D1 ('MetaData "OrderDir" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "Asc" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Desc" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: OrderDir -> Rep OrderDir x #

to :: Rep OrderDir x -> OrderDir #

Show OrderDir 
Instance details

Defined in Napkin.Types.Core

Eq OrderDir 
Instance details

Defined in Napkin.Types.Core

Ord OrderDir 
Instance details

Defined in Napkin.Types.Core

CombiBomb OrderDir 
Instance details

Defined in Napkin.Backends.MsSql.ApiGen.Types

Lift OrderDir 
Instance details

Defined in Napkin.Types.Core

Methods

lift :: Quote m => OrderDir -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => OrderDir -> Code m OrderDir #

type Rep OrderDir 
Instance details

Defined in Napkin.Types.Core

type Rep OrderDir = D1 ('MetaData "OrderDir" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "Asc" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Desc" 'PrefixI 'False) (U1 :: Type -> Type))

type Order = [OrderPart] #

data FunModifier #

Instances

Instances details
NFData FunModifier 
Instance details

Defined in Napkin.Types.Core

Methods

rnf :: FunModifier -> () #

Data FunModifier 
Instance details

Defined in Napkin.Types.Core

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FunModifier -> c FunModifier #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FunModifier #

toConstr :: FunModifier -> Constr #

dataTypeOf :: FunModifier -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c FunModifier) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FunModifier) #

gmapT :: (forall b. Data b => b -> b) -> FunModifier -> FunModifier #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FunModifier -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FunModifier -> r #

gmapQ :: (forall d. Data d => d -> u) -> FunModifier -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FunModifier -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FunModifier -> m FunModifier #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FunModifier -> m FunModifier #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FunModifier -> m FunModifier #

Generic FunModifier 
Instance details

Defined in Napkin.Types.Core

Show FunModifier 
Instance details

Defined in Napkin.Types.Core

Eq FunModifier 
Instance details

Defined in Napkin.Types.Core

Ord FunModifier 
Instance details

Defined in Napkin.Types.Core

Lift FunModifier 
Instance details

Defined in Napkin.Types.Core

Methods

lift :: Quote m => FunModifier -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => FunModifier -> Code m FunModifier #

type Rep FunModifier 
Instance details

Defined in Napkin.Types.Core

data FrameLength #

Instances

Instances details
NFData FrameLength 
Instance details

Defined in Napkin.Types.Core

Methods

rnf :: FrameLength -> () #

Data FrameLength 
Instance details

Defined in Napkin.Types.Core

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FrameLength -> c FrameLength #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FrameLength #

toConstr :: FrameLength -> Constr #

dataTypeOf :: FrameLength -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c FrameLength) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FrameLength) #

gmapT :: (forall b. Data b => b -> b) -> FrameLength -> FrameLength #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FrameLength -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FrameLength -> r #

gmapQ :: (forall d. Data d => d -> u) -> FrameLength -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FrameLength -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FrameLength -> m FrameLength #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FrameLength -> m FrameLength #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FrameLength -> m FrameLength #

Generic FrameLength 
Instance details

Defined in Napkin.Types.Core

Associated Types

type Rep FrameLength 
Instance details

Defined in Napkin.Types.Core

type Rep FrameLength = D1 ('MetaData "FrameLength" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) ((C1 ('MetaCons "CurrentRow" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Unbounded" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "LimitedPreceding" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SExp)) :+: C1 ('MetaCons "LimitedFollowing" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SExp))))
Show FrameLength 
Instance details

Defined in Napkin.Types.Core

Eq FrameLength 
Instance details

Defined in Napkin.Types.Core

Ord FrameLength 
Instance details

Defined in Napkin.Types.Core

Lift FrameLength 
Instance details

Defined in Napkin.Types.Core

Methods

lift :: Quote m => FrameLength -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => FrameLength -> Code m FrameLength #

type Rep FrameLength 
Instance details

Defined in Napkin.Types.Core

type Rep FrameLength = D1 ('MetaData "FrameLength" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) ((C1 ('MetaCons "CurrentRow" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Unbounded" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "LimitedPreceding" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SExp)) :+: C1 ('MetaCons "LimitedFollowing" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SExp))))

data WindowFrame #

Instances

Instances details
NFData WindowFrame 
Instance details

Defined in Napkin.Types.Core

Methods

rnf :: WindowFrame -> () #

Data WindowFrame 
Instance details

Defined in Napkin.Types.Core

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> WindowFrame -> c WindowFrame #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c WindowFrame #

toConstr :: WindowFrame -> Constr #

dataTypeOf :: WindowFrame -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c WindowFrame) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c WindowFrame) #

gmapT :: (forall b. Data b => b -> b) -> WindowFrame -> WindowFrame #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WindowFrame -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WindowFrame -> r #

gmapQ :: (forall d. Data d => d -> u) -> WindowFrame -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> WindowFrame -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> WindowFrame -> m WindowFrame #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> WindowFrame -> m WindowFrame #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> WindowFrame -> m WindowFrame #

Generic WindowFrame 
Instance details

Defined in Napkin.Types.Core

Show WindowFrame 
Instance details

Defined in Napkin.Types.Core

Eq WindowFrame 
Instance details

Defined in Napkin.Types.Core

Ord WindowFrame 
Instance details

Defined in Napkin.Types.Core

Lift WindowFrame 
Instance details

Defined in Napkin.Types.Core

Methods

lift :: Quote m => WindowFrame -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => WindowFrame -> Code m WindowFrame #

type Rep WindowFrame 
Instance details

Defined in Napkin.Types.Core

data WindowFrameUnit #

Constructors

WindowRows 
WindowRange 

Instances

Instances details
NFData WindowFrameUnit 
Instance details

Defined in Napkin.Types.Core

Methods

rnf :: WindowFrameUnit -> () #

Data WindowFrameUnit 
Instance details

Defined in Napkin.Types.Core

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> WindowFrameUnit -> c WindowFrameUnit #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c WindowFrameUnit #

toConstr :: WindowFrameUnit -> Constr #

dataTypeOf :: WindowFrameUnit -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c WindowFrameUnit) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c WindowFrameUnit) #

gmapT :: (forall b. Data b => b -> b) -> WindowFrameUnit -> WindowFrameUnit #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WindowFrameUnit -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WindowFrameUnit -> r #

gmapQ :: (forall d. Data d => d -> u) -> WindowFrameUnit -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> WindowFrameUnit -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> WindowFrameUnit -> m WindowFrameUnit #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> WindowFrameUnit -> m WindowFrameUnit #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> WindowFrameUnit -> m WindowFrameUnit #

Generic WindowFrameUnit 
Instance details

Defined in Napkin.Types.Core

Associated Types

type Rep WindowFrameUnit 
Instance details

Defined in Napkin.Types.Core

type Rep WindowFrameUnit = D1 ('MetaData "WindowFrameUnit" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "WindowRows" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "WindowRange" 'PrefixI 'False) (U1 :: Type -> Type))
Show WindowFrameUnit 
Instance details

Defined in Napkin.Types.Core

Eq WindowFrameUnit 
Instance details

Defined in Napkin.Types.Core

Ord WindowFrameUnit 
Instance details

Defined in Napkin.Types.Core

Lift WindowFrameUnit 
Instance details

Defined in Napkin.Types.Core

Methods

lift :: Quote m => WindowFrameUnit -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => WindowFrameUnit -> Code m WindowFrameUnit #

type Rep WindowFrameUnit 
Instance details

Defined in Napkin.Types.Core

type Rep WindowFrameUnit = D1 ('MetaData "WindowFrameUnit" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "WindowRows" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "WindowRange" 'PrefixI 'False) (U1 :: Type -> Type))

data WOver #

Instances

Instances details
Default WOver 
Instance details

Defined in Napkin.Types.Core

Methods

def :: WOver #

NFData WOver 
Instance details

Defined in Napkin.Types.Core

Methods

rnf :: WOver -> () #

Data WOver 
Instance details

Defined in Napkin.Types.Core

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> WOver -> c WOver #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c WOver #

toConstr :: WOver -> Constr #

dataTypeOf :: WOver -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c WOver) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c WOver) #

gmapT :: (forall b. Data b => b -> b) -> WOver -> WOver #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WOver -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WOver -> r #

gmapQ :: (forall d. Data d => d -> u) -> WOver -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> WOver -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> WOver -> m WOver #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> WOver -> m WOver #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> WOver -> m WOver #

Generic WOver 
Instance details

Defined in Napkin.Types.Core

Associated Types

type Rep WOver 
Instance details

Defined in Napkin.Types.Core

type Rep WOver = D1 ('MetaData "WOver" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "WOver" 'PrefixI 'True) (S1 ('MetaSel ('Just "_overPartition") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Partition) :*: (S1 ('MetaSel ('Just "_overOrder") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Order) :*: S1 ('MetaSel ('Just "_overFrame") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe WindowFrame)))))

Methods

from :: WOver -> Rep WOver x #

to :: Rep WOver x -> WOver #

Show WOver 
Instance details

Defined in Napkin.Types.Core

Methods

showsPrec :: Int -> WOver -> ShowS #

show :: WOver -> String #

showList :: [WOver] -> ShowS #

Eq WOver 
Instance details

Defined in Napkin.Types.Core

Methods

(==) :: WOver -> WOver -> Bool #

(/=) :: WOver -> WOver -> Bool #

Ord WOver 
Instance details

Defined in Napkin.Types.Core

Methods

compare :: WOver -> WOver -> Ordering #

(<) :: WOver -> WOver -> Bool #

(<=) :: WOver -> WOver -> Bool #

(>) :: WOver -> WOver -> Bool #

(>=) :: WOver -> WOver -> Bool #

max :: WOver -> WOver -> WOver #

min :: WOver -> WOver -> WOver #

Lift WOver 
Instance details

Defined in Napkin.Types.Core

Methods

lift :: Quote m => WOver -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => WOver -> Code m WOver #

type Rep WOver 
Instance details

Defined in Napkin.Types.Core

type Rep WOver = D1 ('MetaData "WOver" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "WOver" 'PrefixI 'True) (S1 ('MetaSel ('Just "_overPartition") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Partition) :*: (S1 ('MetaSel ('Just "_overOrder") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Order) :*: S1 ('MetaSel ('Just "_overFrame") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe WindowFrame)))))

data Distinctness #

Constructors

Distinct 
NonDistinct 

Instances

Instances details
Default Distinctness 
Instance details

Defined in Napkin.Types.Core

Methods

def :: Distinctness #

NFData Distinctness 
Instance details

Defined in Napkin.Types.Core

Methods

rnf :: Distinctness -> () #

Data Distinctness 
Instance details

Defined in Napkin.Types.Core

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Distinctness -> c Distinctness #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Distinctness #

toConstr :: Distinctness -> Constr #

dataTypeOf :: Distinctness -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Distinctness) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Distinctness) #

gmapT :: (forall b. Data b => b -> b) -> Distinctness -> Distinctness #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Distinctness -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Distinctness -> r #

gmapQ :: (forall d. Data d => d -> u) -> Distinctness -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Distinctness -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Distinctness -> m Distinctness #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Distinctness -> m Distinctness #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Distinctness -> m Distinctness #

Generic Distinctness 
Instance details

Defined in Napkin.Types.Core

Associated Types

type Rep Distinctness 
Instance details

Defined in Napkin.Types.Core

type Rep Distinctness = D1 ('MetaData "Distinctness" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "Distinct" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "NonDistinct" 'PrefixI 'False) (U1 :: Type -> Type))
Show Distinctness 
Instance details

Defined in Napkin.Types.Core

Eq Distinctness 
Instance details

Defined in Napkin.Types.Core

Ord Distinctness 
Instance details

Defined in Napkin.Types.Core

CombiBomb Distinctness 
Instance details

Defined in Napkin.Backends.MsSql.ApiGen.Types

Lift Distinctness 
Instance details

Defined in Napkin.Types.Core

Methods

lift :: Quote m => Distinctness -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Distinctness -> Code m Distinctness #

type Rep Distinctness 
Instance details

Defined in Napkin.Types.Core

type Rep Distinctness = D1 ('MetaData "Distinctness" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "Distinct" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "NonDistinct" 'PrefixI 'False) (U1 :: Type -> Type))

data NativeExpr #

Instances

Instances details
NFData NativeExpr 
Instance details

Defined in Napkin.Types.Core

Methods

rnf :: NativeExpr -> () #

Data NativeExpr 
Instance details

Defined in Napkin.Types.Core

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NativeExpr -> c NativeExpr #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NativeExpr #

toConstr :: NativeExpr -> Constr #

dataTypeOf :: NativeExpr -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NativeExpr) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NativeExpr) #

gmapT :: (forall b. Data b => b -> b) -> NativeExpr -> NativeExpr #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NativeExpr -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NativeExpr -> r #

gmapQ :: (forall d. Data d => d -> u) -> NativeExpr -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> NativeExpr -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NativeExpr -> m NativeExpr #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NativeExpr -> m NativeExpr #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NativeExpr -> m NativeExpr #

Generic NativeExpr 
Instance details

Defined in Napkin.Types.Core

Associated Types

type Rep NativeExpr 
Instance details

Defined in Napkin.Types.Core

type Rep NativeExpr = D1 ('MetaData "NativeExpr" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "PostgresAExpr" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 AExpr)) :+: C1 ('MetaCons "SimpleSQLParserScalarExpr" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ScalarExpr)))
Show NativeExpr 
Instance details

Defined in Napkin.Types.Core

Eq NativeExpr 
Instance details

Defined in Napkin.Types.Core

Ord NativeExpr 
Instance details

Defined in Napkin.Types.Core

Lift NativeExpr 
Instance details

Defined in Napkin.Types.Core

Methods

lift :: Quote m => NativeExpr -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => NativeExpr -> Code m NativeExpr #

type Rep NativeExpr 
Instance details

Defined in Napkin.Types.Core

type Rep NativeExpr = D1 ('MetaData "NativeExpr" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "PostgresAExpr" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 AExpr)) :+: C1 ('MetaCons "SimpleSQLParserScalarExpr" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ScalarExpr)))

data Nullability #

Constructors

Nullable 
NotNull 

Instances

Instances details
NFData Nullability 
Instance details

Defined in Napkin.Types.Core

Methods

rnf :: Nullability -> () #

Data Nullability 
Instance details

Defined in Napkin.Types.Core

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Nullability -> c Nullability #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Nullability #

toConstr :: Nullability -> Constr #

dataTypeOf :: Nullability -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Nullability) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Nullability) #

gmapT :: (forall b. Data b => b -> b) -> Nullability -> Nullability #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Nullability -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Nullability -> r #

gmapQ :: (forall d. Data d => d -> u) -> Nullability -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Nullability -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Nullability -> m Nullability #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Nullability -> m Nullability #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Nullability -> m Nullability #

Generic Nullability 
Instance details

Defined in Napkin.Types.Core

Associated Types

type Rep Nullability 
Instance details

Defined in Napkin.Types.Core

type Rep Nullability = D1 ('MetaData "Nullability" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "Nullable" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "NotNull" 'PrefixI 'False) (U1 :: Type -> Type))
Show Nullability 
Instance details

Defined in Napkin.Types.Core

Eq Nullability 
Instance details

Defined in Napkin.Types.Core

Ord Nullability 
Instance details

Defined in Napkin.Types.Core

Lift Nullability 
Instance details

Defined in Napkin.Types.Core

Methods

lift :: Quote m => Nullability -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Nullability -> Code m Nullability #

type Rep Nullability 
Instance details

Defined in Napkin.Types.Core

type Rep Nullability = D1 ('MetaData "Nullability" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "Nullable" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "NotNull" 'PrefixI 'False) (U1 :: Type -> Type))

data ArrayBase #

BigQuery array index can be 0-based or 1-based

Constructors

ArrayBase0 
ArrayBase1 

Instances

Instances details
NFData ArrayBase 
Instance details

Defined in Napkin.Types.Core

Methods

rnf :: ArrayBase -> () #

Data ArrayBase 
Instance details

Defined in Napkin.Types.Core

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ArrayBase -> c ArrayBase #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ArrayBase #

toConstr :: ArrayBase -> Constr #

dataTypeOf :: ArrayBase -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ArrayBase) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ArrayBase) #

gmapT :: (forall b. Data b => b -> b) -> ArrayBase -> ArrayBase #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ArrayBase -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ArrayBase -> r #

gmapQ :: (forall d. Data d => d -> u) -> ArrayBase -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ArrayBase -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ArrayBase -> m ArrayBase #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ArrayBase -> m ArrayBase #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ArrayBase -> m ArrayBase #

Generic ArrayBase 
Instance details

Defined in Napkin.Types.Core

Associated Types

type Rep ArrayBase 
Instance details

Defined in Napkin.Types.Core

type Rep ArrayBase = D1 ('MetaData "ArrayBase" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "ArrayBase0" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ArrayBase1" 'PrefixI 'False) (U1 :: Type -> Type))
Show ArrayBase 
Instance details

Defined in Napkin.Types.Core

Eq ArrayBase 
Instance details

Defined in Napkin.Types.Core

Ord ArrayBase 
Instance details

Defined in Napkin.Types.Core

Lift ArrayBase 
Instance details

Defined in Napkin.Types.Core

Methods

lift :: Quote m => ArrayBase -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => ArrayBase -> Code m ArrayBase #

type Rep ArrayBase 
Instance details

Defined in Napkin.Types.Core

type Rep ArrayBase = D1 ('MetaData "ArrayBase" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "ArrayBase0" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ArrayBase1" 'PrefixI 'False) (U1 :: Type -> Type))

data IntInterval #

A simpler sub-variant to Interval that fits certain cases better. Maps onto Interval underneath.

Constructors

IntInterval SExp DatePart 

Instances

Instances details
Data IntInterval 
Instance details

Defined in Napkin.Types.Core

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IntInterval -> c IntInterval #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IntInterval #

toConstr :: IntInterval -> Constr #

dataTypeOf :: IntInterval -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IntInterval) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IntInterval) #

gmapT :: (forall b. Data b => b -> b) -> IntInterval -> IntInterval #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IntInterval -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IntInterval -> r #

gmapQ :: (forall d. Data d => d -> u) -> IntInterval -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IntInterval -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IntInterval -> m IntInterval #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IntInterval -> m IntInterval #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IntInterval -> m IntInterval #

Show IntInterval 
Instance details

Defined in Napkin.Types.Core

Eq IntInterval 
Instance details

Defined in Napkin.Types.Core

Ord IntInterval 
Instance details

Defined in Napkin.Types.Core

Val IntInterval 
Instance details

Defined in Napkin.Types.Core

newtype Interval #

Intervals could internally make use of expressions

Constructors

Interval 

Fields

Instances

Instances details
NFData Interval 
Instance details

Defined in Napkin.Types.Core

Methods

rnf :: Interval -> () #

Data Interval 
Instance details

Defined in Napkin.Types.Core

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Interval -> c Interval #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Interval #

toConstr :: Interval -> Constr #

dataTypeOf :: Interval -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Interval) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Interval) #

gmapT :: (forall b. Data b => b -> b) -> Interval -> Interval #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Interval -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Interval -> r #

gmapQ :: (forall d. Data d => d -> u) -> Interval -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Interval -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Interval -> m Interval #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Interval -> m Interval #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Interval -> m Interval #

Generic Interval 
Instance details

Defined in Napkin.Types.Core

Associated Types

type Rep Interval 
Instance details

Defined in Napkin.Types.Core

type Rep Interval = D1 ('MetaData "Interval" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'True) (C1 ('MetaCons "Interval" 'PrefixI 'True) (S1 ('MetaSel ('Just "_unInterval") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(SExp, DatePart)])))

Methods

from :: Interval -> Rep Interval x #

to :: Rep Interval x -> Interval #

Show Interval 
Instance details

Defined in Napkin.Types.Core

Eq Interval 
Instance details

Defined in Napkin.Types.Core

Ord Interval 
Instance details

Defined in Napkin.Types.Core

Lift Interval 
Instance details

Defined in Napkin.Types.Core

Methods

lift :: Quote m => Interval -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Interval -> Code m Interval #

type Rep Interval 
Instance details

Defined in Napkin.Types.Core

type Rep Interval = D1 ('MetaData "Interval" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'True) (C1 ('MetaCons "Interval" 'PrefixI 'True) (S1 ('MetaSel ('Just "_unInterval") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(SExp, DatePart)])))

data StructField #

Instances

Instances details
NFData StructField 
Instance details

Defined in Napkin.Types.Core

Methods

rnf :: StructField -> () #

Data StructField 
Instance details

Defined in Napkin.Types.Core

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> StructField -> c StructField #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c StructField #

toConstr :: StructField -> Constr #

dataTypeOf :: StructField -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c StructField) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c StructField) #

gmapT :: (forall b. Data b => b -> b) -> StructField -> StructField #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> StructField -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> StructField -> r #

gmapQ :: (forall d. Data d => d -> u) -> StructField -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> StructField -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> StructField -> m StructField #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> StructField -> m StructField #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> StructField -> m StructField #

Generic StructField 
Instance details

Defined in Napkin.Types.Core

Associated Types

type Rep StructField 
Instance details

Defined in Napkin.Types.Core

type Rep StructField = D1 ('MetaData "StructField" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "StructFieldSharp" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)) :+: C1 ('MetaCons "StructFieldNamed" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))
Read StructField 
Instance details

Defined in Napkin.Types.Core

Show StructField 
Instance details

Defined in Napkin.Types.Core

Eq StructField 
Instance details

Defined in Napkin.Types.Core

Ord StructField 
Instance details

Defined in Napkin.Types.Core

Lift StructField 
Instance details

Defined in Napkin.Types.Core

Methods

lift :: Quote m => StructField -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => StructField -> Code m StructField #

type Rep StructField 
Instance details

Defined in Napkin.Types.Core

type Rep StructField = D1 ('MetaData "StructField" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "StructFieldSharp" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)) :+: C1 ('MetaCons "StructFieldNamed" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

data Selected a #

Select something and give it a name; e.g. (my_field as foo)

Constructors

Selected 

Fields

Instances

Instances details
Foldable Selected 
Instance details

Defined in Napkin.Types.Core

Methods

fold :: Monoid m => Selected m -> m #

foldMap :: Monoid m => (a -> m) -> Selected a -> m #

foldMap' :: Monoid m => (a -> m) -> Selected a -> m #

foldr :: (a -> b -> b) -> b -> Selected a -> b #

foldr' :: (a -> b -> b) -> b -> Selected a -> b #

foldl :: (b -> a -> b) -> b -> Selected a -> b #

foldl' :: (b -> a -> b) -> b -> Selected a -> b #

foldr1 :: (a -> a -> a) -> Selected a -> a #

foldl1 :: (a -> a -> a) -> Selected a -> a #

toList :: Selected a -> [a] #

null :: Selected a -> Bool #

length :: Selected a -> Int #

elem :: Eq a => a -> Selected a -> Bool #

maximum :: Ord a => Selected a -> a #

minimum :: Ord a => Selected a -> a #

sum :: Num a => Selected a -> a #

product :: Num a => Selected a -> a #

WithName Selected 
Instance details

Defined in Napkin.Types.Core

Methods

as :: b -> Ref b -> Selected b #

Lift a => Lift (Selected a :: Type) 
Instance details

Defined in Napkin.Types.Core

Methods

lift :: Quote m => Selected a -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Selected a -> Code m (Selected a) #

NFData a => NFData (Selected a) 
Instance details

Defined in Napkin.Types.Core

Methods

rnf :: Selected a -> () #

Data a => Data (Selected a) 
Instance details

Defined in Napkin.Types.Core

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Selected a -> c (Selected a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Selected a) #

toConstr :: Selected a -> Constr #

dataTypeOf :: Selected a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Selected a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Selected a)) #

gmapT :: (forall b. Data b => b -> b) -> Selected a -> Selected a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Selected a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Selected a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Selected a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Selected a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Selected a -> m (Selected a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Selected a -> m (Selected a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Selected a -> m (Selected a) #

Generic (Selected a) 
Instance details

Defined in Napkin.Types.Core

Associated Types

type Rep (Selected a) 
Instance details

Defined in Napkin.Types.Core

type Rep (Selected a) = D1 ('MetaData "Selected" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "Selected" 'PrefixI 'True) (S1 ('MetaSel ('Just "_selectRef") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Ref a)) :*: S1 ('MetaSel ('Just "_selectItem") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))

Methods

from :: Selected a -> Rep (Selected a) x #

to :: Rep (Selected a) x -> Selected a #

Show a => Show (Selected a) 
Instance details

Defined in Napkin.Types.Core

Methods

showsPrec :: Int -> Selected a -> ShowS #

show :: Selected a -> String #

showList :: [Selected a] -> ShowS #

Eq a => Eq (Selected a) 
Instance details

Defined in Napkin.Types.Core

Methods

(==) :: Selected a -> Selected a -> Bool #

(/=) :: Selected a -> Selected a -> Bool #

Ord a => Ord (Selected a) 
Instance details

Defined in Napkin.Types.Core

Methods

compare :: Selected a -> Selected a -> Ordering #

(<) :: Selected a -> Selected a -> Bool #

(<=) :: Selected a -> Selected a -> Bool #

(>) :: Selected a -> Selected a -> Bool #

(>=) :: Selected a -> Selected a -> Bool #

max :: Selected a -> Selected a -> Selected a #

min :: Selected a -> Selected a -> Selected a #

HasDeps a => HasDeps (Selected a) 
Instance details

Defined in Napkin.Types.Deps

FunRenamer (Selected Query) 
Instance details

Defined in Napkin.Types.QueryTransformer

FunRenamer (Selected Relation) 
Instance details

Defined in Napkin.Types.QueryTransformer

TableRenamer (Selected Query) 
Instance details

Defined in Napkin.Types.QueryTransformer

TableRenamer (Selected Relation) 
Instance details

Defined in Napkin.Types.QueryTransformer

TableRenamer (Selected Table) 
Instance details

Defined in Napkin.Types.QueryTransformer

type Rep (Selected a) 
Instance details

Defined in Napkin.Types.Core

type Rep (Selected a) = D1 ('MetaData "Selected" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "Selected" 'PrefixI 'True) (S1 ('MetaSel ('Just "_selectRef") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Ref a)) :*: S1 ('MetaSel ('Just "_selectItem") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))

newtype SpecTableName #

The way to refer to tasks in the spec. With renaming these can then refer to tables in a database. Once renamed, they should never be repacked into newtype. Be careful to avoid use of Constructor SpecTableName internally in Napkin. Ideally, baseTableName will only be used when renaming, but this is less of a concern.

Constructors

SpecTableName 

Instances

Instances details
FromJSON SpecTableName 
Instance details

Defined in Napkin.Types.Core

FromJSONKey SpecTableName 
Instance details

Defined in Napkin.Types.Core

ToJSON SpecTableName 
Instance details

Defined in Napkin.Types.Core

ToJSONKey SpecTableName 
Instance details

Defined in Napkin.Types.Core

Buildable SpecTableName 
Instance details

Defined in Napkin.Types.Core

Semigroup SpecTableName 
Instance details

Defined in Napkin.Types.Core

Data SpecTableName 
Instance details

Defined in Napkin.Types.Core

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SpecTableName -> c SpecTableName #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SpecTableName #

toConstr :: SpecTableName -> Constr #

dataTypeOf :: SpecTableName -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SpecTableName) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SpecTableName) #

gmapT :: (forall b. Data b => b -> b) -> SpecTableName -> SpecTableName #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SpecTableName -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SpecTableName -> r #

gmapQ :: (forall d. Data d => d -> u) -> SpecTableName -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SpecTableName -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SpecTableName -> m SpecTableName #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SpecTableName -> m SpecTableName #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SpecTableName -> m SpecTableName #

IsString SpecTableName 
Instance details

Defined in Napkin.Types.Core

Generic SpecTableName 
Instance details

Defined in Napkin.Types.Core

Associated Types

type Rep SpecTableName 
Instance details

Defined in Napkin.Types.Core

type Rep SpecTableName = D1 ('MetaData "SpecTableName" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'True) (C1 ('MetaCons "SpecTableName" 'PrefixI 'True) (S1 ('MetaSel ('Just "baseTableName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Ref Table))))
Show SpecTableName 
Instance details

Defined in Napkin.Types.Core

Eq SpecTableName 
Instance details

Defined in Napkin.Types.Core

Ord SpecTableName 
Instance details

Defined in Napkin.Types.Core

AsRelation SpecTableName 
Instance details

Defined in Napkin.Types.Core

TableRef SpecTableName 
Instance details

Defined in Napkin.Types.Core

type Rep SpecTableName 
Instance details

Defined in Napkin.Types.Core

type Rep SpecTableName = D1 ('MetaData "SpecTableName" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'True) (C1 ('MetaCons "SpecTableName" 'PrefixI 'True) (S1 ('MetaSel ('Just "baseTableName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Ref Table))))

newtype Ref (a :: k) #

A way to refer to entities like fields, tables, schemas, etc. Namespacing is common so we keep a list here.

Constructors

Ref 

Fields

Instances

Instances details
Lift (Ref a :: Type) 
Instance details

Defined in Napkin.Types.Core

Methods

lift :: Quote m => Ref a -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Ref a -> Code m (Ref a) #

FromJSON (Ref a) 
Instance details

Defined in Napkin.Types.Core

FromJSONKey (Ref a) 
Instance details

Defined in Napkin.Types.Core

ToJSON (Ref a) 
Instance details

Defined in Napkin.Types.Core

Methods

toJSON :: Ref a -> Value #

toEncoding :: Ref a -> Encoding #

toJSONList :: [Ref a] -> Value #

toEncodingList :: [Ref a] -> Encoding #

omitField :: Ref a -> Bool #

ToJSONKey (Ref a) 
Instance details

Defined in Napkin.Types.Core

FoldCase (Ref a) 
Instance details

Defined in Napkin.Types.Core

Methods

foldCase :: Ref a -> Ref a #

foldCaseList :: [Ref a] -> [Ref a]

NFData (Ref a) 
Instance details

Defined in Napkin.Types.Core

Methods

rnf :: Ref a -> () #

Buildable (Ref a) 
Instance details

Defined in Napkin.Types.Core

Methods

build :: Ref a -> Builder #

Semigroup (Ref a) 
Instance details

Defined in Napkin.Types.Core

Methods

(<>) :: Ref a -> Ref a -> Ref a #

sconcat :: NonEmpty (Ref a) -> Ref a #

stimes :: Integral b => b -> Ref a -> Ref a #

(Typeable a, Typeable k) => Data (Ref a) 
Instance details

Defined in Napkin.Types.Core

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Ref a -> c (Ref a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Ref a) #

toConstr :: Ref a -> Constr #

dataTypeOf :: Ref a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Ref a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Ref a)) #

gmapT :: (forall b. Data b => b -> b) -> Ref a -> Ref a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Ref a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Ref a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Ref a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Ref a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Ref a -> m (Ref a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Ref a -> m (Ref a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Ref a -> m (Ref a) #

IsString (Ref a) 
Instance details

Defined in Napkin.Types.Core

Methods

fromString :: String -> Ref a #

Generic (Ref a) 
Instance details

Defined in Napkin.Types.Core

Associated Types

type Rep (Ref a) 
Instance details

Defined in Napkin.Types.Core

type Rep (Ref a) = D1 ('MetaData "Ref" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'True) (C1 ('MetaCons "Ref" 'PrefixI 'True) (S1 ('MetaSel ('Just "_unRef") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty Name))))

Methods

from :: Ref a -> Rep (Ref a) x #

to :: Rep (Ref a) x -> Ref a #

Show (Ref a) 
Instance details

Defined in Napkin.Types.Core

Methods

showsPrec :: Int -> Ref a -> ShowS #

show :: Ref a -> String #

showList :: [Ref a] -> ShowS #

Eq (Ref a) 
Instance details

Defined in Napkin.Types.Core

Methods

(==) :: Ref a -> Ref a -> Bool #

(/=) :: Ref a -> Ref a -> Bool #

Ord (Ref a) 
Instance details

Defined in Napkin.Types.Core

Methods

compare :: Ref a -> Ref a -> Ordering #

(<) :: Ref a -> Ref a -> Bool #

(<=) :: Ref a -> Ref a -> Bool #

(>) :: Ref a -> Ref a -> Bool #

(>=) :: Ref a -> Ref a -> Bool #

max :: Ref a -> Ref a -> Ref a #

min :: Ref a -> Ref a -> Ref a #

Hashable (Ref a) 
Instance details

Defined in Napkin.Types.Core

Methods

hashWithSalt :: Int -> Ref a -> Int #

hash :: Ref a -> Int #

AsRelation (Ref a) 
Instance details

Defined in Napkin.Types.Core

Methods

asRelation :: Ref a -> Relation #

IsRef (Ref a) 
Instance details

Defined in Napkin.Types.Core

Methods

ref :: forall {k0} (b :: k0). Ref a -> Ref b #

TableRef (Ref Table) 
Instance details

Defined in Napkin.Types.Core

HasDeps (Ref Table) 
Instance details

Defined in Napkin.Types.Deps

TableRenamer (Ref Table) 
Instance details

Defined in Napkin.Types.QueryTransformer

Cons (Ref a) (Ref a) Name Name 
Instance details

Defined in Napkin.Types.Core

Methods

_Cons :: Prism (Ref a) (Ref a) (Name, Ref a) (Name, Ref a) #

Snoc (Ref a) (Ref a) Name Name 
Instance details

Defined in Napkin.Types.Core

Methods

_Snoc :: Prism (Ref a) (Ref a) (Ref a, Name) (Ref a, Name) #

type Rep (Ref a) 
Instance details

Defined in Napkin.Types.Core

type Rep (Ref a) = D1 ('MetaData "Ref" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'True) (C1 ('MetaCons "Ref" 'PrefixI 'True) (S1 ('MetaSel ('Just "_unRef") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty Name))))

text2Ref :: forall {k} (a :: k). Text -> Ref a #

useSpecName :: SpecTableName -> Ref Table #

An alias for baseTableName to use when renaming. As renaming is the proper way to unpack a SpecTableName, use this when unpacking a SpecTableName for renaming (or potential renaming). A little semantic flag to demarcate proper usages.

refComponentCount :: forall {k} (a :: k). Ref a -> Int #

Return the number of Names in the Ref.

textRefIso :: forall {k} (a :: k) p f. (Profunctor p, Functor f) => p (Ref a) (f (Ref a)) -> p Text (f Text) #

refTextIso :: forall {k} (a :: k) p f. (Profunctor p, Functor f) => p Text (f Text) -> p (Ref a) (f (Ref a)) #

refNameIso :: forall {k} (a :: k) p f. (Profunctor p, Functor f) => p (Ref a) (f (Ref a)) -> p (NonEmpty Name) (f (NonEmpty Name)) #

textRef :: forall {k} (a :: k). Text -> Ref a #

nameRef :: forall {k} (a :: k). Name -> Ref a #

namesRef :: forall {k} (a :: k). [Name] -> Ref a #

sNamesRef :: forall {k} (a :: k). NonEmpty Name -> Ref a #

sNameRef :: forall {k} (a :: k). Name -> Ref a #

refText :: forall {k} (t :: k). Ref t -> Text #

retagRef :: forall {k1} {k2} (t :: k1) (a :: k2). Ref t -> Ref a #

appendRef :: forall {k} (a :: k). Ref a -> Name -> Ref a #

nonAlias :: a -> Alias a #

sa :: WithName a => Ref b -> b -> a b #

Flipped as

invertOrder :: OrderDir -> OrderDir #

Flip order

cteRefs :: forall {k} (a :: k). WithClauses -> Set (Ref a) #

mkUnion :: UnionType -> [Query] -> Query #

Convenience: Combine list of queries via union of the same type

collectUnionQueries :: Query -> NonEmpty Query #

Pull apart any UNIONs and extract a flat list of non-union queries.

queryFullySpecified :: Data a => a -> Bool #

Has select * been used anywhere inside this thing? If so, False.

unRef :: forall k1 (a1 :: k1) k2 (a2 :: k2) p f. (Profunctor p, Functor f) => p (NonEmpty Name) (f (NonEmpty Name)) -> p (Ref a1) (f (Ref a2)) #

selectItem :: forall a f. Functor f => (a -> f a) -> Selected a -> f (Selected a) #

selectRef :: forall a f. Functor f => (Ref a -> f (Ref a)) -> Selected a -> f (Selected a) #

aliasItem :: forall a f. Functor f => (a -> f a) -> Alias a -> f (Alias a) #

aliasRef :: forall a f. Functor f => (Maybe (Ref a) -> f (Maybe (Ref a))) -> Alias a -> f (Alias a) #

data UpdateQuery #

Instances

Instances details
NFData UpdateQuery 
Instance details

Defined in Napkin.Types.Core

Methods

rnf :: UpdateQuery -> () #

Data UpdateQuery 
Instance details

Defined in Napkin.Types.Core

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UpdateQuery -> c UpdateQuery #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UpdateQuery #

toConstr :: UpdateQuery -> Constr #

dataTypeOf :: UpdateQuery -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UpdateQuery) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UpdateQuery) #

gmapT :: (forall b. Data b => b -> b) -> UpdateQuery -> UpdateQuery #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UpdateQuery -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UpdateQuery -> r #

gmapQ :: (forall d. Data d => d -> u) -> UpdateQuery -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UpdateQuery -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UpdateQuery -> m UpdateQuery #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UpdateQuery -> m UpdateQuery #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UpdateQuery -> m UpdateQuery #

Generic UpdateQuery 
Instance details

Defined in Napkin.Types.Core

Associated Types

type Rep UpdateQuery 
Instance details

Defined in Napkin.Types.Core

type Rep UpdateQuery = D1 ('MetaData "UpdateQuery" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "UpdateQuery" 'PrefixI 'True) ((S1 ('MetaSel ('Just "_updateQueryTarget") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Alias (Ref Table))) :*: S1 ('MetaSel ('Just "_updateQuerySet") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (OMap Name SExp))) :*: (S1 ('MetaSel ('Just "_updateQueryFrom") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe From)) :*: S1 ('MetaSel ('Just "_updateQueryWhere") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe SExp)))))
Show UpdateQuery 
Instance details

Defined in Napkin.Types.Core

Eq UpdateQuery 
Instance details

Defined in Napkin.Types.Core

Ord UpdateQuery 
Instance details

Defined in Napkin.Types.Core

HasDeps UpdateQuery 
Instance details

Defined in Napkin.Types.Deps

Lift UpdateQuery 
Instance details

Defined in Napkin.Types.Core

Methods

lift :: Quote m => UpdateQuery -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => UpdateQuery -> Code m UpdateQuery #

type Rep UpdateQuery 
Instance details

Defined in Napkin.Types.Core

type Rep UpdateQuery = D1 ('MetaData "UpdateQuery" "Napkin.Types.Core" "napkin-core-2.0.0-32bCCK2QLK4BxtaZPaOqEw" 'False) (C1 ('MetaCons "UpdateQuery" 'PrefixI 'True) ((S1 ('MetaSel ('Just "_updateQueryTarget") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Alias (Ref Table))) :*: S1 ('MetaSel ('Just "_updateQuerySet") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (OMap Name SExp))) :*: (S1 ('MetaSel ('Just "_updateQueryFrom") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe From)) :*: S1 ('MetaSel ('Just "_updateQueryWhere") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe SExp)))))

class TableRef a where #

Methods

tableRef :: Getter a (Ref Table) #

Instances

Instances details
TableRef SpecTableName 
Instance details

Defined in Napkin.Types.Core

TableRef (CreateTableAs m) # 
Instance details

Defined in Napkin.Spec.Types.CreateTableAs

TableRef (Ref Table) 
Instance details

Defined in Napkin.Types.Core

refNamespace :: forall {k} (a :: k) f. Functor f => (Maybe Name -> f (Maybe Name)) -> Ref a -> f (Ref a) #

_lit :: Val a => Prism' SExp a #

lit :: Val a => a -> SExp #

txt :: Text -> SExp #

Monomorphic converter to make it easy to type string literals under OverloadedStrings

fullWindow :: WOver #

Convenient starting point for full window (unbounded) for cases where not specifying window defaults to a partial window. (E.g. BigQuery)

varAs :: forall {k} (a :: k). Ref a -> Selected SExp #

Polymorphic to support refs that come out of Relations, etc.

asSelf :: SExp -> Selected SExp #

"Note that this is a partial function and will work only for SExps that are Var's. Please prefer varAs or as when possible

funAs :: (SExp -> b) -> Ref b -> Selected b #

Apply function to a Ref and select it by the same name as the ref. Common use case in SELECT queries.

selectToRef :: Selected SExp -> SExp #

Use the name of a Selected as a reference. Typically when you've computed a field in a subquery or a previous table, and you're now using that computation directly via its name.

selectedExps :: forall a f. Applicative f => (a -> f a) -> [Selected a] -> f [Selected a] #

selectedNames :: forall a0 f. Applicative f => (Text -> f Text) -> [Selected a0] -> f [Selected a0] #

refName :: forall {k1} {k2} (a :: k1) (a1 :: k2) f. Applicative f => (Text -> f Text) -> Ref a -> f (Ref a1) #

Pull the last name out of a Ref. E.g. if Ref contains a schema.table_name, pull just the table_name out.

refRoot :: forall {k} (a :: k) f. Functor f => (Name -> f Name) -> Ref a -> f (Ref a) #

Get final segments on the ref path and grab the name

refJustRoot :: forall {k} (a :: k). Ref a -> Ref a #

refParentRoot :: forall {k} (a :: k). Ref a -> ([Text], Maybe Text) #

ne :: forall a p f. (Profunctor p, Functor f) => p (NonEmpty a) (f (NonEmpty a)) -> p [a] (f [a]) #

selectedName :: forall a f. Applicative f => (Name -> f Name) -> Selected a -> f (Selected a) #

atAlias :: (Applicative f, Choice p) => Ref t -> Optic' p f (Alias t) (Alias t) #

viewAliasedNames :: (Applicative f, Contravariant f, MaybeQuery s) => (Ref SExp -> f (Ref SExp)) -> s -> f s #

scopeRefs :: forall {k} b (t :: k). Data b => Ref t -> b -> b #

Attach all column references within expression to given (table) reference. Note this would replace both their use as variables and in naming the aliases.

scopeExps :: forall {k} b (t :: k). Data b => Ref t -> b -> b #

Modify all variable references in the given object to use the given reference as the hierarchical source of the variable. Useful when pointing all variables to belong to a given relationtablename in a context.

modifyExterns :: Data b => (ExternFun -> SExp) -> b -> b #

(^^.) :: Ref Relation -> Name -> SExp infixl 9 #

Attach given name on the relation

data SpecNode #

Instances

Instances details
Show SpecNode 
Instance details

Defined in Napkin.Types.Core

Eq SpecNode 
Instance details

Defined in Napkin.Types.Core

Ord SpecNode 
Instance details

Defined in Napkin.Types.Core

pattern NapkinTableSeparator :: (Eq a, IsString a) => a #

pattern NapkinTablePrefix :: (Eq a, IsString a) => a #

tmpTableNameFormat :: UTCTime -> Text -> Text #

Temporary tables name format: _np_POSIXtimestamp_token[_tablename], timestamps are used for temporary tables cleanup command

getUTCTimeTemporaryTable :: Ref Table -> Maybe UTCTime #

extracts timestamp from temporary tables name format (tmpTableNameFormat function): _np_day-utc-timestamp_seconds-utc-timestamp_token[_tablename]

getTemporaryTableName :: forall {k} m (b :: k). MonadIO m => m (Ref b) #

class FunRenamer a where #

Methods

renameFun :: (Ref Function -> Ref Function) -> a -> a #

Instances

Instances details
FunRenamer CteBody 
Instance details

Defined in Napkin.Types.QueryTransformer

FunRenamer ExternFun 
Instance details

Defined in Napkin.Types.QueryTransformer

FunRenamer From 
Instance details

Defined in Napkin.Types.QueryTransformer

Methods

renameFun :: (Ref Function -> Ref Function) -> From -> From #

FunRenamer OrderPart 
Instance details

Defined in Napkin.Types.QueryTransformer

FunRenamer Query 
Instance details

Defined in Napkin.Types.QueryTransformer

Methods

renameFun :: (Ref Function -> Ref Function) -> Query -> Query #

FunRenamer Relation 
Instance details

Defined in Napkin.Types.QueryTransformer

FunRenamer SExp 
Instance details

Defined in Napkin.Types.QueryTransformer

Methods

renameFun :: (Ref Function -> Ref Function) -> SExp -> SExp #

FunRenamer WithClauses 
Instance details

Defined in Napkin.Types.QueryTransformer

FunRenamer (Alias SExp) 
Instance details

Defined in Napkin.Types.QueryTransformer

FunRenamer (Selected Query) 
Instance details

Defined in Napkin.Types.QueryTransformer

FunRenamer (Selected Relation) 
Instance details

Defined in Napkin.Types.QueryTransformer

class TableRenamer a where #

Methods

renameTableRef :: (Ref Table -> Ref Table) -> a -> a #

Instances

Instances details
TableRenamer CteBody 
Instance details

Defined in Napkin.Types.QueryTransformer

TableRenamer ExternFun 
Instance details

Defined in Napkin.Types.QueryTransformer

TableRenamer From 
Instance details

Defined in Napkin.Types.QueryTransformer

Methods

renameTableRef :: (Ref Table -> Ref Table) -> From -> From #

TableRenamer OrderPart 
Instance details

Defined in Napkin.Types.QueryTransformer

TableRenamer Query 
Instance details

Defined in Napkin.Types.QueryTransformer

Methods

renameTableRef :: (Ref Table -> Ref Table) -> Query -> Query #

TableRenamer Relation 
Instance details

Defined in Napkin.Types.QueryTransformer

TableRenamer SExp 
Instance details

Defined in Napkin.Types.QueryTransformer

Methods

renameTableRef :: (Ref Table -> Ref Table) -> SExp -> SExp #

TableRenamer WithClauses 
Instance details

Defined in Napkin.Types.QueryTransformer

TableRenamer Statement 
Instance details

Defined in Napkin.Types.QueryTransformer

TableRenamer (Alias SExp) 
Instance details

Defined in Napkin.Types.QueryTransformer

TableRenamer (Alias Table) 
Instance details

Defined in Napkin.Types.QueryTransformer

TableRenamer (Selected Query) 
Instance details

Defined in Napkin.Types.QueryTransformer

TableRenamer (Selected Relation) 
Instance details

Defined in Napkin.Types.QueryTransformer

TableRenamer (Selected Table) 
Instance details

Defined in Napkin.Types.QueryTransformer

TableRenamer (Ref Table) 
Instance details

Defined in Napkin.Types.QueryTransformer

qt_spec :: Getter QueryTransformer (SpecTableName -> Ref Table) #

In general this should be used for renaming SpecTableName.

modifyFunctions :: Data b => (Ref Function -> Ref Function) -> b -> b #

class HasDeps a where #

Class of things that have external table dependencies

Minimal complete definition

dependenciesSet

Instances

Instances details
HasDeps CteBody 
Instance details

Defined in Napkin.Types.Deps

HasDeps ExternFun 
Instance details

Defined in Napkin.Types.Deps

HasDeps From 
Instance details

Defined in Napkin.Types.Deps

HasDeps Query 
Instance details

Defined in Napkin.Types.Deps

HasDeps Relation 
Instance details

Defined in Napkin.Types.Deps

HasDeps SExp 
Instance details

Defined in Napkin.Types.Deps

HasDeps UpdateQuery 
Instance details

Defined in Napkin.Types.Deps

HasDeps WithClauses 
Instance details

Defined in Napkin.Types.Deps

HasDeps (CreateTableAs m) # 
Instance details

Defined in Napkin.Spec.Types.CreateTableAs

HasDeps (Alias SExp) 
Instance details

Defined in Napkin.Types.Deps

HasDeps a => HasDeps (Selected a) 
Instance details

Defined in Napkin.Types.Deps

HasDeps a => HasDeps (Maybe a) 
Instance details

Defined in Napkin.Types.Deps

HasDeps a => HasDeps [a] 
Instance details

Defined in Napkin.Types.Deps

HasDeps (Ref Table) 
Instance details

Defined in Napkin.Types.Deps

HasDeps (OMap Name SExp) 
Instance details

Defined in Napkin.Types.Deps

type family Members (es :: [Effect]) (r :: EffectRow) where ... #

Makes constraints of functions that use multiple effects shorter by translating single list of effects into multiple Member constraints:

foo :: Members '[ Output Int
                , Output Bool
                , State String
                ] r
    => Sem r ()

translates into:

foo :: ( Member (Output Int) r
       , Member (Output Bool) r
       , Member (State String) r
       )
    => Sem r ()

Since: polysemy-0.1.2.0

Equations

Members ('[] :: [Effect]) r = () 
Members (e ': es) r = (Member e r, Members es r) 

data Sem (r :: EffectRow) a #

The Sem monad handles computations of arbitrary extensible effects. A value of type Sem r describes a program with the capabilities of r. For best results, r should always be kept polymorphic, but you can add capabilities via the Member constraint.

The value of the Sem monad is that it allows you to write programs against a set of effects without a predefined meaning, and provide that meaning later. For example, unlike with mtl, you can decide to interpret an Error effect traditionally as an Either, or instead as (a significantly faster) IO Exception. These interpretations (and others that you might add) may be used interchangeably without needing to write any newtypes or Monad instances. The only change needed to swap interpretations is to change a call from runError to errorToIOFinal.

The effect stack r can contain arbitrary other monads inside of it. These monads are lifted into effects via the Embed effect. Monadic values can be lifted into a Sem via embed.

Higher-order actions of another monad can be lifted into higher-order actions of Sem via the Final effect, which is more powerful than Embed, but also less flexible to interpret.

A Sem can be interpreted as a pure value (via run) or as any traditional Monad (via runM or runFinal). Each effect E comes equipped with some interpreters of the form:

runE :: Sem (E ': r) a -> Sem r a

which is responsible for removing the effect E from the effect stack. It is the order in which you call the interpreters that determines the monomorphic representation of the r parameter.

Order of interpreters can be important - it determines behaviour of effects that manipulate state or change control flow. For example, when interpreting this action:

>>> :{
  example :: Members '[State String, Error String] r => Sem r String
  example = do
    put "start"
    let throwing, catching :: Members '[State String, Error String] r => Sem r String
        throwing = do
          modify (++"-throw")
          throw "error"
          get
        catching = do
          modify (++"-catch")
          get
    catch @String throwing (\ _ -> catching)
:}

when handling Error first, state is preserved after error occurs:

>>> :{
  example
    & runError
    & fmap (either id id)
    & evalState ""
    & runM
    & (print =<<)
:}
"start-throw-catch"

while handling State first discards state in such cases:

>>> :{
  example
    & evalState ""
    & runError
    & fmap (either id id)
    & runM
    & (print =<<)
:}
"start-catch"

A good rule of thumb is to handle effects which should have "global" behaviour over other effects later in the chain.

After all of your effects are handled, you'll be left with either a Sem '[] a, a Sem '[ Embed m ] a, or a Sem '[ Final m ] a value, which can be consumed respectively by run, runM, and runFinal.

Examples

As an example of keeping r polymorphic, we can consider the type

Member (State String) r => Sem r ()

to be a program with access to

get :: Sem r String
put :: String -> Sem r ()

methods.

By also adding a

Member (Error Bool) r

constraint on r, we gain access to the

throw :: Bool -> Sem r a
catch :: Sem r a -> (Bool -> Sem r a) -> Sem r a

functions as well.

In this sense, a Member (State s) r constraint is analogous to mtl's MonadState s m and should be thought of as such. However, unlike mtl, a Sem monad may have an arbitrary number of the same effect.

For example, we can write a Sem program which can output either Ints or Bools:

foo :: ( Member (Output Int) r
       , Member (Output Bool) r
       )
    => Sem r ()
foo = do
  output @Int  5
  output True

Notice that we must use -XTypeApplications to specify that we'd like to use the (Output Int) effect.

Since: polysemy-0.1.2.0

Instances

Instances details
Member (Embed IO) r => MonadIO (Sem r)

This instance will only lift IO actions. If you want to lift into some other MonadIO type, use this instance, and handle it via the embedToMonadIO interpretation.

Instance details

Defined in Polysemy.Internal

Methods

liftIO :: IO a -> Sem r a #

Member NonDet r => Alternative (Sem r) 
Instance details

Defined in Polysemy.Internal

Methods

empty :: Sem r a #

(<|>) :: Sem r a -> Sem r a -> Sem r a #

some :: Sem r a -> Sem r [a] #

many :: Sem r a -> Sem r [a] #

Applicative (Sem f) 
Instance details

Defined in Polysemy.Internal

Methods

pure :: a -> Sem f a #

(<*>) :: Sem f (a -> b) -> Sem f a -> Sem f b #

liftA2 :: (a -> b -> c) -> Sem f a -> Sem f b -> Sem f c #

(*>) :: Sem f a -> Sem f b -> Sem f b #

(<*) :: Sem f a -> Sem f b -> Sem f a #

Functor (Sem f) 
Instance details

Defined in Polysemy.Internal

Methods

fmap :: (a -> b) -> Sem f a -> Sem f b #

(<$) :: a -> Sem f b -> Sem f a #

Monad (Sem f) 
Instance details

Defined in Polysemy.Internal

Methods

(>>=) :: Sem f a -> (a -> Sem f b) -> Sem f b #

(>>) :: Sem f a -> Sem f b -> Sem f b #

return :: a -> Sem f a #

Member NonDet r => MonadPlus (Sem r)

Since: polysemy-0.2.1.0

Instance details

Defined in Polysemy.Internal

Methods

mzero :: Sem r a #

mplus :: Sem r a -> Sem r a -> Sem r a #

Member (Fail :: (Type -> Type) -> Type -> Type) r => MonadFail (Sem r)

Since: polysemy-1.1.0.0

Instance details

Defined in Polysemy.Internal

Methods

fail :: String -> Sem r a #

Member Fixpoint r => MonadFix (Sem r) 
Instance details

Defined in Polysemy.Internal

Methods

mfix :: (a -> Sem r a) -> Sem r a #

Monoid a => Monoid (Sem f a)

Since: polysemy-1.6.0.0

Instance details

Defined in Polysemy.Internal

Methods

mempty :: Sem f a #

mappend :: Sem f a -> Sem f a -> Sem f a #

mconcat :: [Sem f a] -> Sem f a #

Semigroup a => Semigroup (Sem f a)

Since: polysemy-1.6.0.0

Instance details

Defined in Polysemy.Internal

Methods

(<>) :: Sem f a -> Sem f a -> Sem f a #

sconcat :: NonEmpty (Sem f a) -> Sem f a #

stimes :: Integral b => b -> Sem f a -> Sem f a #

class Member (t :: Effect) (r :: EffectRow) #

This class indicates that an effect must be present in the caller's stack. It is the main mechanism by which a program defines its effect dependencies.

Minimal complete definition

membership'

Instances

Instances details
Member t z => Member t (_1 ': z) 
Instance details

Defined in Polysemy.Internal.Union

Methods

membership' :: ElemOf t (_1 ': z)

Member t (t ': z) 
Instance details

Defined in Polysemy.Internal.Union

Methods

membership' :: ElemOf t (t ': z)

ansi2011SQL :: QuasiQuoter #

QuasiQuoter for declaring a Query in generic ansi2011 backend with TemplateHaskell

ansi2011SQLSExp :: QuasiQuoter #

QuasiQuoter for declaring a SExp in generic ansi2011 backend with TemplateHaskell

newtype SqlTemplateVariables #

Instances

Instances details
FromJSON SqlTemplateVariables 
Instance details

Defined in Napkin.Parse.Interpolation.Types

ToJSON SqlTemplateVariables 
Instance details

Defined in Napkin.Parse.Interpolation.Types

Default SqlTemplateVariables 
Instance details

Defined in Napkin.Parse.Interpolation.Types

Monoid SqlTemplateVariables 
Instance details

Defined in Napkin.Parse.Interpolation.Types

Semigroup SqlTemplateVariables 
Instance details

Defined in Napkin.Parse.Interpolation.Types

Show SqlTemplateVariables 
Instance details

Defined in Napkin.Parse.Interpolation.Types

Eq SqlTemplateVariables 
Instance details

Defined in Napkin.Parse.Interpolation.Types

Ord SqlTemplateVariables 
Instance details

Defined in Napkin.Parse.Interpolation.Types

sqlVar :: ToJSON a => Text -> a -> (Text, Value) #

type FatalError = Error FatalErrorInfo :: (k -> Type) -> k -> Type #

fatalError :: forall (r :: EffectRow) a. Member (FatalError :: (Type -> Type) -> Type -> Type) r => Text -> Sem r a #

orFatalErrorME :: forall (r :: EffectRow) e' v. Member (FatalError :: (Type -> Type) -> Type -> Type) r => Sem r (Either e' v) -> (e' -> Text) -> Sem r v #

orFatalErrorM :: forall (r :: EffectRow) v. Member (FatalError :: (Type -> Type) -> Type -> Type) r => Sem r (Maybe v) -> Text -> Sem r v #

orFatalError :: forall (r :: EffectRow) v. Member (FatalError :: (Type -> Type) -> Type -> Type) r => Maybe v -> Text -> Sem r v #

executeExternalCommand :: forall (effs :: EffectRow). Members '[FatalError :: (Type -> Type) -> Type -> Type, External :: (Type -> Type) -> Type -> Type] effs => ExternalCommand -> Sem effs () #

data LocalFile (m :: k) a where #

Effect that deal with local files

Constructors

LoadFile :: forall {k} (m :: k). FilePath -> LocalFile m (Either LocalFileError Text) 

loadFile :: forall (r :: EffectRow) a. Members '[SqlParse :: (Type -> Type) -> Type -> Type, LoadQuery :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type] r => (SourceLocation -> Text -> Sem r a) -> FilePath -> SqlTemplateVariables -> Sem r a #

type Log = Output LogLine :: k -> Type -> Type #

data LogLine #

Instances

Instances details
ToDumpItem (b :: k) (Log :: (Type -> Type) -> Type -> Type) 
Instance details

Defined in Napkin.Run.Effects.Interceptors.LogProgram.Types

Methods

toDumpItem :: forall (r :: EffectRow) x. Log (Sem r) x -> DumpItem b #

logNotice :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LText -> Sem effs () #

logWarning :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LText -> Sem effs () #

logCritical :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LText -> Sem effs () #

logAlert :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LText -> Sem effs () #

logEmergency :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LText -> Sem effs () #

logDebug' :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LogItem -> LText -> Sem effs () #

logInfo' :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LogItem -> LText -> Sem effs () #

logNotice' :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LogItem -> LText -> Sem effs () #

logWarning' :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LogItem -> LText -> Sem effs () #

logError' :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LogItem -> LText -> Sem effs () #

logCritical' :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LogItem -> LText -> Sem effs () #

logAlert' :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LogItem -> LText -> Sem effs () #

logEmergency' :: forall (effs :: EffectRow). Member (Log :: (Type -> Type) -> Type -> Type) effs => LogItem -> LText -> Sem effs () #

runLogKatip :: forall (m :: Type -> Type) (r :: EffectRow) a. (Katip m, Member (Embed m) r) => SimpleLogPayload -> Sem ((Log :: (Type -> Type) -> Type -> Type) ': r) a -> Sem r a #

runLogDiscard :: forall (r :: [(Type -> Type) -> Type -> Type]) a. Sem ((Log :: (Type -> Type) -> Type -> Type) ': r) a -> Sem r a #

newtype AssertionLog #

Instances

Instances details
Monoid AssertionLog 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

Semigroup AssertionLog 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

Generic AssertionLog 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

Associated Types

type Rep AssertionLog 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

type Rep AssertionLog = D1 ('MetaData "AssertionLog" "Napkin.Run.Effects.Languages.Assertion" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'True) (C1 ('MetaCons "AssertionLog" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [AssertionEntry])))
Show AssertionLog 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

Eq AssertionLog 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

type Rep AssertionLog 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

type Rep AssertionLog = D1 ('MetaData "AssertionLog" "Napkin.Run.Effects.Languages.Assertion" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'True) (C1 ('MetaCons "AssertionLog" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [AssertionEntry])))

newtype AssertionGroup #

Constructors

AssertionGroup [Text] 

Instances

Instances details
Default AssertionGroup 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

Methods

def :: AssertionGroup #

Monoid AssertionGroup 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

Semigroup AssertionGroup 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

Generic AssertionGroup 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

Associated Types

type Rep AssertionGroup 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

type Rep AssertionGroup = D1 ('MetaData "AssertionGroup" "Napkin.Run.Effects.Languages.Assertion" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'True) (C1 ('MetaCons "AssertionGroup" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Text])))
Show AssertionGroup 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

Eq AssertionGroup 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

type Rep AssertionGroup 
Instance details

Defined in Napkin.Run.Effects.Languages.Assertion

type Rep AssertionGroup = D1 ('MetaData "AssertionGroup" "Napkin.Run.Effects.Languages.Assertion" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'True) (C1 ('MetaCons "AssertionGroup" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Text])))

assert' :: forall (r :: EffectRow). Member (Assertion :: (Type -> Type) -> Type -> Type) r => AssertionGroup -> AssertionSeverity -> Text -> AssertionStatus -> Sem r () #

Assertions are run-time checks based on actual results that may be returned by various operations. Dry runs may ignore these failures, but they're respected in real operations.

assertTrue :: forall (r :: EffectRow). Member (Assertion :: (Type -> Type) -> Type -> Type) r => Text -> Bool -> Sem r () #

assertEquals :: forall a (r :: EffectRow). (Eq a, Member (Assertion :: (Type -> Type) -> Type -> Type) r) => Text -> a -> a -> Sem r () #

assertEquals' :: forall a (r :: EffectRow). (Eq a, Member (Assertion :: (Type -> Type) -> Type -> Type) r, Show a) => Text -> a -> a -> Sem r () #

assertTrueWith :: forall (r :: EffectRow). Member (Assertion :: (Type -> Type) -> Type -> Type) r => Text -> Bool -> Text -> Sem r () #

assertTrueWithM :: forall (r :: EffectRow). Member (Assertion :: (Type -> Type) -> Type -> Type) r => Text -> Bool -> Sem r Text -> Sem r () #

failedAssertion :: forall (r :: EffectRow). Member (Assertion :: (Type -> Type) -> Type -> Type) r => Text -> Sem r () #

warnOnly :: forall (r :: EffectRow) a. Member (Assertion :: (Type -> Type) -> Type -> Type) r => Sem r a -> Sem r a #

describe' :: forall (r :: EffectRow) a. Members '[Assertion :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r => [Text] -> Sem r a -> Sem r a #

assertionToAssertionEntry :: forall {k} (r :: k) a. Assertion r a -> AssertionEntry #

type SqlIO (m :: Type -> Type) = MonadCatch m #

safeIO :: forall m (r :: EffectRow) v. (Members '[FatalError :: (Type -> Type) -> Type -> Type, Embed m] r, SqlIO m) => m v -> Sem r v #

data SqlRead (b :: k) (m :: k1) a where #

Constructors

RunQuery :: forall {k} {k1} (b :: k) (m :: k1). Query -> SqlRead b m [Map Text Value] 
CheckTableExists :: forall {k} {k1} (b :: k) (m :: k1). Ref Table -> SqlRead b m Bool 
GetTableKind :: forall {k} {k1} (b :: k) (m :: k1). Ref Table -> SqlRead b m TableKind 
GetRelationSchema' :: forall {k} {k1} (b :: k) (m :: k1). Ref Table -> Relation -> SqlRead b m [BackendSchemaField b] 

Instances

Instances details
(IsRenderable Query b, IsRenderable SExp b, IsRenderable Text b) => ToDumpItem (b :: k) (SqlRead b :: (Type -> Type) -> Type -> Type) 
Instance details

Defined in Napkin.Run.Effects.Interceptors.LogProgram.Types

Methods

toDumpItem :: forall (r :: EffectRow) x. SqlRead b (Sem r) x -> DumpItem b #

GShow (SqlRead b m :: Type -> Type) 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlRead

Methods

gshowsPrec :: Int -> SqlRead b m a -> ShowS #

Show (SqlRead b m a) 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlRead

Methods

showsPrec :: Int -> SqlRead b m a -> ShowS #

show :: SqlRead b m a -> String #

showList :: [SqlRead b m a] -> ShowS #

Eq (SqlRead b m a) 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlRead

Methods

(==) :: SqlRead b m a -> SqlRead b m a -> Bool #

(/=) :: SqlRead b m a -> SqlRead b m a -> Bool #

newtype SchemaDiffError (bk :: k) #

data SchemaDiff (bk :: k) #

Instances

Instances details
Generic (SchemaDiff bk) 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlRead

Associated Types

type Rep (SchemaDiff bk) 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlRead

type Rep (SchemaDiff bk) = D1 ('MetaData "SchemaDiff" "Napkin.Run.Effects.Languages.SqlRead" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "SchemaDiff" 'PrefixI 'True) (S1 ('MetaSel ('Just "droppedColumns") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [BackendSchemaField bk]) :*: S1 ('MetaSel ('Just "addedColumns") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [BackendSchemaField bk])))

Methods

from :: SchemaDiff bk -> Rep (SchemaDiff bk) x #

to :: Rep (SchemaDiff bk) x -> SchemaDiff bk #

type Rep (SchemaDiff bk) 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlRead

type Rep (SchemaDiff bk) = D1 ('MetaData "SchemaDiff" "Napkin.Run.Effects.Languages.SqlRead" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "SchemaDiff" 'PrefixI 'True) (S1 ('MetaSel ('Just "droppedColumns") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [BackendSchemaField bk]) :*: S1 ('MetaSel ('Just "addedColumns") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [BackendSchemaField bk])))

runQuery :: forall {k} (b :: k) (r :: EffectRow). Member (SqlRead b :: (Type -> Type) -> Type -> Type) r => Query -> Sem r [Map Text Value] #

getTableKind :: forall {k} (b :: k) (r :: EffectRow). Member (SqlRead b :: (Type -> Type) -> Type -> Type) r => Ref Table -> Sem r TableKind #

getRelationSchema' :: forall {k} (b :: k) (r :: EffectRow). Member (SqlRead b :: (Type -> Type) -> Type -> Type) r => Ref Table -> Relation -> Sem r [BackendSchemaField b] #

runQuerySingleAnswer :: forall {k} (b :: k) a (r :: EffectRow). (Member (SqlRead b :: (Type -> Type) -> Type -> Type) r, Val a) => Query -> Sem r (Maybe a) #

Run a query and pull out the first column from its first row. Meant for queries that return a single result.

getRelationSchema :: forall {k} (b :: k) (r :: EffectRow). Members '[SqlRead b :: (Type -> Type) -> Type -> Type, Input TemporaryTableName :: (Type -> Type) -> Type -> Type] r => Relation -> Sem r [BackendSchemaField b] #

data SqlRender (m :: k) a where #

Constructors

RenderSExp :: forall {k} (m :: k). SExp -> SqlRender m Text 
RenderQuery :: forall {k} (m :: k). Query -> SqlRender m Text 

Instances

Instances details
GShow (SqlRender a :: Type -> Type) 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlRender

Methods

gshowsPrec :: Int -> SqlRender a a0 -> ShowS #

CacheableEffect (SqlRender :: k -> Type -> Type) SqlRenderCacheKey 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlRender

Show (SqlRender a b) 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlRender

Methods

showsPrec :: Int -> SqlRender a b -> ShowS #

show :: SqlRender a b -> String #

showList :: [SqlRender a b] -> ShowS #

Eq (SqlRender m a) 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlRender

Methods

(==) :: SqlRender m a -> SqlRender m a -> Bool #

(/=) :: SqlRender m a -> SqlRender m a -> Bool #

Ord (SqlRender m a) 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlRender

Methods

compare :: SqlRender m a -> SqlRender m a -> Ordering #

(<) :: SqlRender m a -> SqlRender m a -> Bool #

(<=) :: SqlRender m a -> SqlRender m a -> Bool #

(>) :: SqlRender m a -> SqlRender m a -> Bool #

(>=) :: SqlRender m a -> SqlRender m a -> Bool #

max :: SqlRender m a -> SqlRender m a -> SqlRender m a #

min :: SqlRender m a -> SqlRender m a -> SqlRender m a #

type SqlText = Text #

data SqlRenderCacheKey #

Instances

Instances details
CacheableEffect (SqlRender :: k -> Type -> Type) SqlRenderCacheKey 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlRender

renderSExp :: forall (r :: EffectRow). Member (SqlRender :: (Type -> Type) -> Type -> Type) r => SExp -> Sem r SqlText #

data Template (m :: k) a where #

Constructors

Substitute :: forall {k} (m :: k). SourceLocation -> Text -> SqlTemplateVariables -> Template m (Either TemplateError Text) 

data SqlParse (m :: k) a where #

Constructors

ParseSqlQuery' :: forall {k} (m :: k). SourceLocation -> Text -> SqlParse m (Either SqlParseError Query) 
ParseSqlExp' :: forall {k} (m :: k). SourceLocation -> Text -> SqlParse m (Either SqlParseError SExp) 
ParseSqlStatements' :: forall {k} (m :: k). SourceLocation -> Text -> SqlParse m (Either SqlParseError [Statement]) 

Instances

Instances details
GShow (SqlParse a :: Type -> Type) 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlParse

Methods

gshowsPrec :: Int -> SqlParse a a0 -> ShowS #

CacheableEffect (SqlParse :: k -> Type -> Type) SqlParseCacheKey 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlParse

Show (SqlParse m a) 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlParse

Methods

showsPrec :: Int -> SqlParse m a -> ShowS #

show :: SqlParse m a -> String #

showList :: [SqlParse m a] -> ShowS #

Eq (SqlParse m a) 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlParse

Methods

(==) :: SqlParse m a -> SqlParse m a -> Bool #

(/=) :: SqlParse m a -> SqlParse m a -> Bool #

Ord (SqlParse m a) 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlParse

Methods

compare :: SqlParse m a -> SqlParse m a -> Ordering #

(<) :: SqlParse m a -> SqlParse m a -> Bool #

(<=) :: SqlParse m a -> SqlParse m a -> Bool #

(>) :: SqlParse m a -> SqlParse m a -> Bool #

(>=) :: SqlParse m a -> SqlParse m a -> Bool #

max :: SqlParse m a -> SqlParse m a -> SqlParse m a #

min :: SqlParse m a -> SqlParse m a -> SqlParse m a #

data SqlParseCacheKey #

Instances

Instances details
CacheableEffect (SqlParse :: k -> Type -> Type) SqlParseCacheKey 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlParse

parseSqlQuery :: forall (r :: EffectRow). Members '[SqlParse :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type] r => SourceLocation -> Text -> Sem r Query #

parseSqlExp :: forall (r :: EffectRow). Members '[SqlParse :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type] r => SourceLocation -> Text -> Sem r SExp #

parseStatements :: forall (r :: EffectRow) a. (Members '[SqlParse :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type] r, Stateable a) => SourceLocation -> Text -> Sem r [a] #

overrideDialect :: forall (r :: EffectRow) a. Member (Reader SQLDialect) r => SQLDialect -> Sem r a -> Sem r a #

data ExtendedStatement #

Instances

Instances details
Generic ExtendedStatement 
Instance details

Defined in Napkin.Run.Effects.Languages.StatementParse

Associated Types

type Rep ExtendedStatement 
Instance details

Defined in Napkin.Run.Effects.Languages.StatementParse

type Rep ExtendedStatement = D1 ('MetaData "ExtendedStatement" "Napkin.Run.Effects.Languages.StatementParse" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "ExtendedStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ddl") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 CreateTableDDL) :*: S1 ('MetaSel ('Just "inserts") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [InsertStatement])))
Show ExtendedStatement 
Instance details

Defined in Napkin.Run.Effects.Languages.StatementParse

Eq ExtendedStatement 
Instance details

Defined in Napkin.Run.Effects.Languages.StatementParse

type Rep ExtendedStatement 
Instance details

Defined in Napkin.Run.Effects.Languages.StatementParse

type Rep ExtendedStatement = D1 ('MetaData "ExtendedStatement" "Napkin.Run.Effects.Languages.StatementParse" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "ExtendedStatement" 'PrefixI 'True) (S1 ('MetaSel ('Just "ddl") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 CreateTableDDL) :*: S1 ('MetaSel ('Just "inserts") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [InsertStatement])))

data SqlWrite b (m :: k) a where #

Constructors

CreateTableAsWithMeta :: forall {k} b (m :: k). BackendTableMeta b -> Ref Table -> Query -> SqlWrite b m () 
CreateViewAsWithMeta :: forall {k} b (m :: k). BackendViewMeta b -> Ref Table -> Query -> SqlWrite b m () 
CreateMaterializedViewAsWithMeta :: forall {k} b (m :: k). BackendMaterializedViewMeta b -> Ref Table -> Query -> SqlWrite b m () 
InsertInto :: forall {k} b (m :: k). Ref Table -> InsertColumnsList -> Query -> SqlWrite b m () 
UpdateTable :: forall {k} b (m :: k). UpdateQuery -> SqlWrite b m () 
RenameTable :: forall {k} b (m :: k). Ref Table -> Ref Table -> SqlWrite b m () 
CopyTable :: forall {k} b (m :: k). Ref Table -> Ref Table -> TableWriteStrategy -> SqlWrite b m () 
DropTable :: forall {k} b (m :: k). Ref Table -> MissingBehavior -> Cascade -> SqlWrite b m () 
DropView :: forall {k} b (m :: k). Ref Table -> MissingBehavior -> Cascade -> SqlWrite b m () 
DropMaterializedView :: forall {k} b (m :: k). Ref Table -> MissingBehavior -> Cascade -> SqlWrite b m () 
DeleteFrom :: forall {k} b (m :: k). Ref Table -> SExp -> SqlWrite b m () 
CreateTable :: forall {k} b (m :: k). BackendTableMeta b -> CreateTableDDL -> SqlWrite b m () 
DropColumn :: forall {k} b (m :: k). Ref Table -> Text -> SqlWrite b m () 
AddColumn :: forall {k} b (m :: k). Ref Table -> Text -> Type -> SqlWrite b m () 

Instances

Instances details
(Default (BackendTableMeta b), Default (BackendViewMeta b), Eq (BackendTableMeta b), Eq (BackendViewMeta b), Eq (YamlBackendMaterializedViewMeta b), IsRenderable Query b, IsRenderable SExp b, IsRenderable Statement b, IsRenderable Text b, IsRenderable UpdateQuery b, MaybeDefault (YamlBackendMaterializedViewMeta b), Show (BackendMaterializedViewMeta b), Show (BackendTableMeta b), Show (BackendViewMeta b)) => ToDumpItem (b :: Type) (SqlWrite b :: (Type -> Type) -> Type -> Type) 
Instance details

Defined in Napkin.Run.Effects.Interceptors.LogProgram.Types

Methods

toDumpItem :: forall (r :: EffectRow) x. SqlWrite b (Sem r) x -> DumpItem b #

(Show (BackendMaterializedViewMeta bk), Show (BackendTableMeta bk), Show (BackendViewMeta bk)) => GShow (SqlWrite bk a :: Type -> Type) 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlWrite

Methods

gshowsPrec :: Int -> SqlWrite bk a a0 -> ShowS #

(Show (BackendMaterializedViewMeta bk), Show (BackendTableMeta bk), Show (BackendViewMeta bk)) => Show (SqlWrite bk a b) 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlWrite

Methods

showsPrec :: Int -> SqlWrite bk a b -> ShowS #

show :: SqlWrite bk a b -> String #

showList :: [SqlWrite bk a b] -> ShowS #

(Eq (BackendMaterializedViewMeta bk), Eq (BackendTableMeta bk), Eq (BackendViewMeta bk)) => Eq (SqlWrite bk a b) 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlWrite

Methods

(==) :: SqlWrite bk a b -> SqlWrite bk a b -> Bool #

(/=) :: SqlWrite bk a b -> SqlWrite bk a b -> Bool #

type ColName = Text #

data Cascade #

Constructors

Cascade 
Restrict 

Instances

Instances details
Show Cascade 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlWrite

Eq Cascade 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlWrite

Methods

(==) :: Cascade -> Cascade -> Bool #

(/=) :: Cascade -> Cascade -> Bool #

data TableWriteStrategy #

Instances

Instances details
FromJSON TableWriteStrategy 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlWrite

ToJSON TableWriteStrategy 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlWrite

Data TableWriteStrategy 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlWrite

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TableWriteStrategy -> c TableWriteStrategy #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TableWriteStrategy #

toConstr :: TableWriteStrategy -> Constr #

dataTypeOf :: TableWriteStrategy -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TableWriteStrategy) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TableWriteStrategy) #

gmapT :: (forall b. Data b => b -> b) -> TableWriteStrategy -> TableWriteStrategy #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TableWriteStrategy -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TableWriteStrategy -> r #

gmapQ :: (forall d. Data d => d -> u) -> TableWriteStrategy -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TableWriteStrategy -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TableWriteStrategy -> m TableWriteStrategy #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TableWriteStrategy -> m TableWriteStrategy #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TableWriteStrategy -> m TableWriteStrategy #

Bounded TableWriteStrategy 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlWrite

Enum TableWriteStrategy 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlWrite

Generic TableWriteStrategy 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlWrite

Associated Types

type Rep TableWriteStrategy 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlWrite

type Rep TableWriteStrategy = D1 ('MetaData "TableWriteStrategy" "Napkin.Run.Effects.Languages.SqlWrite" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "TableWriteStrategyRecreate" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "TableWriteStrategyTruncate" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TableWriteStrategyAppend" 'PrefixI 'False) (U1 :: Type -> Type)))
Show TableWriteStrategy 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlWrite

Eq TableWriteStrategy 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlWrite

type Rep TableWriteStrategy 
Instance details

Defined in Napkin.Run.Effects.Languages.SqlWrite

type Rep TableWriteStrategy = D1 ('MetaData "TableWriteStrategy" "Napkin.Run.Effects.Languages.SqlWrite" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "TableWriteStrategyRecreate" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "TableWriteStrategyTruncate" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TableWriteStrategyAppend" 'PrefixI 'False) (U1 :: Type -> Type)))

type family BackendViewMeta bk #

Instances

Instances details
type BackendViewMeta BigQuery 
Instance details

Defined in Napkin.Types.BigQuery

type BackendViewMeta MsSql 
Instance details

Defined in Napkin.Types.MsSql

type BackendViewMeta Postgres 
Instance details

Defined in Napkin.Types.Postgres

type BackendViewMeta Redshift 
Instance details

Defined in Napkin.Types.Redshift

type BackendViewMeta Sqlite 
Instance details

Defined in Napkin.Types.Sqlite

type family BackendTableMeta bk #

Instances

Instances details
type BackendTableMeta BigQuery 
Instance details

Defined in Napkin.Types.BigQuery

type BackendTableMeta MsSql 
Instance details

Defined in Napkin.Types.MsSql

type BackendTableMeta Postgres 
Instance details

Defined in Napkin.Types.Postgres

type BackendTableMeta Redshift 
Instance details

Defined in Napkin.Types.Redshift

type BackendTableMeta Sqlite 
Instance details

Defined in Napkin.Types.Sqlite

createTableAsWithMeta :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => BackendTableMeta b -> Ref Table -> Query -> Sem r () #

createViewAsWithMeta :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => BackendViewMeta b -> Ref Table -> Query -> Sem r () #

insertInto :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => Ref Table -> InsertColumnsList -> Query -> Sem r () #

updateTable :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => UpdateQuery -> Sem r () #

copyTable :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => Ref Table -> Ref Table -> TableWriteStrategy -> Sem r () #

dropTable :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => Ref Table -> MissingBehavior -> Cascade -> Sem r () #

dropMaterializedView :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => Ref Table -> MissingBehavior -> Cascade -> Sem r () #

deleteFrom :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => Ref Table -> SExp -> Sem r () #

createTable :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => BackendTableMeta b -> CreateTableDDL -> Sem r () #

dropColumn :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => Ref Table -> Text -> Sem r () #

addColumn :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => Ref Table -> Text -> Type -> Sem r () #

createTableAs :: forall b (r :: EffectRow). (Default (BackendTableMeta b), Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r) => Ref Table -> Query -> Sem r () #

createTableIfNotExistAs :: forall b (r :: EffectRow). (Default (BackendTableMeta b), Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r) => Ref Table -> Query -> Sem r () #

createViewAs :: forall b (r :: EffectRow). (Default (BackendViewMeta b), Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r) => Ref Table -> Query -> Sem r () #

insertIntoQuery :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => Ref Table -> Query -> Sem r () #

data LoadQuery (m :: k) a where #

Effects that deal with local files

Instances

Instances details
CacheableEffect (LoadQuery :: k -> Type -> Type) LoadQueryCacheKey 
Instance details

Defined in Napkin.Run.Effects.Languages.LoadQuery

Eq (LoadQuery m a) 
Instance details

Defined in Napkin.Run.Effects.Languages.LoadQuery

Methods

(==) :: LoadQuery m a -> LoadQuery m a -> Bool #

(/=) :: LoadQuery m a -> LoadQuery m a -> Bool #

Ord (LoadQuery m a) 
Instance details

Defined in Napkin.Run.Effects.Languages.LoadQuery

Methods

compare :: LoadQuery m a -> LoadQuery m a -> Ordering #

(<) :: LoadQuery m a -> LoadQuery m a -> Bool #

(<=) :: LoadQuery m a -> LoadQuery m a -> Bool #

(>) :: LoadQuery m a -> LoadQuery m a -> Bool #

(>=) :: LoadQuery m a -> LoadQuery m a -> Bool #

max :: LoadQuery m a -> LoadQuery m a -> LoadQuery m a #

min :: LoadQuery m a -> LoadQuery m a -> LoadQuery m a #

data LoadQueryCacheKey #

Instances

Instances details
CacheableEffect (LoadQuery :: k -> Type -> Type) LoadQueryCacheKey 
Instance details

Defined in Napkin.Run.Effects.Languages.LoadQuery

loadInline :: forall (r :: EffectRow) a. Members '[SqlParse :: (Type -> Type) -> Type -> Type, LoadQuery :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type] r => (SourceLocation -> Text -> Sem r a) -> Text -> SqlTemplateVariables -> Sem r a #

loadSqlFile :: forall (r :: EffectRow). Members '[SqlParse :: (Type -> Type) -> Type -> Type, LoadQuery :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type] r => FilePath -> SqlTemplateVariables -> Sem r Query #

loadSqlFiles :: forall (r :: EffectRow). Members '[SqlParse :: (Type -> Type) -> Type -> Type, LoadQuery :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type] r => NonEmpty FilePath -> SqlTemplateVariables -> Sem r (NonEmpty Query) #

loadInlineSql :: forall (r :: EffectRow). Members '[SqlParse :: (Type -> Type) -> Type -> Type, LoadQuery :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type] r => Text -> SqlTemplateVariables -> Sem r Query #

loadInlineStatement :: forall (r :: EffectRow) a. (Members '[SqlParse :: (Type -> Type) -> Type -> Type, LoadQuery :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type] r, Stateable a) => Text -> SqlTemplateVariables -> Sem r [a] #

loadStatementFile :: forall (r :: EffectRow) a. (Members '[SqlParse :: (Type -> Type) -> Type -> Type, LoadQuery :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type] r, Stateable a) => FilePath -> SqlTemplateVariables -> Sem r [a] #

data BackendFunctionMeta #

Constructors

BackendFunctionMeta 

Fields

Instances

Instances details
Generic BackendFunctionMeta 
Instance details

Defined in Napkin.Untyped.Ops

Associated Types

type Rep BackendFunctionMeta 
Instance details

Defined in Napkin.Untyped.Ops

type Rep BackendFunctionMeta = D1 ('MetaData "BackendFunctionMeta" "Napkin.Untyped.Ops" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "BackendFunctionMeta" 'PrefixI 'True) (S1 ('MetaSel ('Just "aggs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(Ref Function, SExp)]) :*: S1 ('MetaSel ('Just "analytics") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Ref Function])))
Show BackendFunctionMeta 
Instance details

Defined in Napkin.Untyped.Ops

Eq BackendFunctionMeta 
Instance details

Defined in Napkin.Untyped.Ops

type Rep BackendFunctionMeta 
Instance details

Defined in Napkin.Untyped.Ops

type Rep BackendFunctionMeta = D1 ('MetaData "BackendFunctionMeta" "Napkin.Untyped.Ops" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "BackendFunctionMeta" 'PrefixI 'True) (S1 ('MetaSel ('Just "aggs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(Ref Function, SExp)]) :*: S1 ('MetaSel ('Just "analytics") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Ref Function])))

type SExp_ (a :: Symbol) = SExp #

(||.) :: SExp -> SExp -> SExp #

Concatenate two strings using ||

concatPortable :: [SExp] -> SExp #

"portable" concat for backends that do not have a native concat function.

avg :: SExp -> SExp #

Basic aggregations

countd :: SExp -> SExp #

Distinct count of expression

nullary :: Ref Function -> SExp #

Function calls and common control flow

raw :: Text -> SExp #

case_ :: [(SExp, SExp)] -> SExp -> SExp #

caseMatch_ #

Arguments

:: SExp

column to check

-> [(SExp, SExp)]

check equal on left assume right

-> SExp

default

-> SExp 

(==.) :: SExp -> SExp -> SExp infix 4 #

Logical operators

(/=.) :: SExp -> SExp -> SExp infix 4 #

(>=.) :: SExp -> SExp -> SExp infix 4 #

(>.) :: SExp -> SExp -> SExp infix 4 #

(<=.) :: SExp -> SExp -> SExp infix 4 #

isNot :: SExp -> SExp -> SExp #

in_ :: SExp -> [SExp] -> SExp #

notIn :: SExp -> [SExp] -> SExp #

any_ :: SExp -> SExp #

all_ :: SExp -> SExp #

maxOf :: SExp -> SExp -> SExp #

minOf :: SExp -> SExp -> SExp #

hardCount :: SExp #

Higher level combinators and utilities

sum 1

valueIf :: SExp -> SExp -> SExp -> SExp #

Replace exp if its equal to val with replace.

nullifyUnless :: SExp -> SExp -> SExp #

Set to null unless predicate in first argument is true

nullifyIf :: SExp -> SExp -> SExp #

Set to null if predicate in first argument is true

nullifyIfEmpty :: SExp -> SExp #

Make empty string NULL.

deepApply :: (SExp -> SExp) -> SExp -> SExp #

Apply a function on Literals and Vars, recursing deep into function calls, etc.

notEmpty :: SExp -> SExp #

Opposite of isEmpty

countTrue :: SExp -> SExp #

(Agg) Count number of Trues in a boolean expression.

boolToInt :: SExp -> SExp #

True -> 1, False -> 0, NULL -> 0

coalesce :: [SExp] -> SExp #

returns the first non-null value in the arguments list.

inferAggGeneric :: BackendFunctionMeta -> SExp -> AggLevel #

Infer aggregation level of an expression.

TODO: ExternRaw and NativeExpr cant be inferred at the moment; needs more info inside the SExp if this becomes a problem.

unitBoundaryGeneric :: BackendFunctionMeta -> SExp -> [SExp] #

Explore expression's insides to pull out top level Unit expressions within its branches, but no deeper in each branch.

Originally created to help with common expression caching - since you can commonolize unit-level expressions without any side-effect.

newtype U a #

Constructors

U 

Fields

Instances

Instances details
Applicative U 
Instance details

Defined in Napkin.Untyped.Monad

Methods

pure :: a -> U a #

(<*>) :: U (a -> b) -> U a -> U b #

liftA2 :: (a -> b -> c) -> U a -> U b -> U c #

(*>) :: U a -> U b -> U b #

(<*) :: U a -> U b -> U a #

Functor U 
Instance details

Defined in Napkin.Untyped.Monad

Methods

fmap :: (a -> b) -> U a -> U b #

(<$) :: a -> U b -> U a #

Monad U 
Instance details

Defined in Napkin.Untyped.Monad

Methods

(>>=) :: U a -> (a -> U b) -> U b #

(>>) :: U a -> U b -> U b #

return :: a -> U a #

MonadState UState U 
Instance details

Defined in Napkin.Untyped.Monad

Methods

get :: U UState #

put :: UState -> U () #

state :: (UState -> (a, UState)) -> U a #

runQ :: Q a -> (a, Query) #

class HasRefStore s where #

Methods

refRepo :: Lens' s RefStore #

Instances

Instances details
HasRefStore SubQueryTransformState 
Instance details

Defined in Napkin.Untyped.Ops.BigQuery

HasRefStore QState 
Instance details

Defined in Napkin.Untyped.Monad

HasRefStore RefStore 
Instance details

Defined in Napkin.Untyped.Monad

HasRefStore UState 
Instance details

Defined in Napkin.Untyped.Monad

data RefStore #

Supply of fresh reference names to be used in monadic contexts where you need an infinite-ish supply.

Constructors

RefStore 

Instances

Instances details
Data RefStore 
Instance details

Defined in Napkin.Untyped.Monad

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RefStore -> c RefStore #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RefStore #

toConstr :: RefStore -> Constr #

dataTypeOf :: RefStore -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RefStore) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RefStore) #

gmapT :: (forall b. Data b => b -> b) -> RefStore -> RefStore #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RefStore -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RefStore -> r #

gmapQ :: (forall d. Data d => d -> u) -> RefStore -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> RefStore -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RefStore -> m RefStore #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RefStore -> m RefStore #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RefStore -> m RefStore #

Generic RefStore 
Instance details

Defined in Napkin.Untyped.Monad

Associated Types

type Rep RefStore 
Instance details

Defined in Napkin.Untyped.Monad

type Rep RefStore = D1 ('MetaData "RefStore" "Napkin.Untyped.Monad" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "RefStore" 'PrefixI 'True) (S1 ('MetaSel ('Just "feed") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty Text)) :*: S1 ('MetaSel ('Just "blacklist") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Set Text))))

Methods

from :: RefStore -> Rep RefStore x #

to :: Rep RefStore x -> RefStore #

Show RefStore 
Instance details

Defined in Napkin.Untyped.Monad

Eq RefStore 
Instance details

Defined in Napkin.Untyped.Monad

Ord RefStore 
Instance details

Defined in Napkin.Untyped.Monad

HasRefStore RefStore 
Instance details

Defined in Napkin.Untyped.Monad

type Rep RefStore 
Instance details

Defined in Napkin.Untyped.Monad

type Rep RefStore = D1 ('MetaData "RefStore" "Napkin.Untyped.Monad" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "RefStore" 'PrefixI 'True) (S1 ('MetaSel ('Just "feed") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty Text)) :*: S1 ('MetaSel ('Just "blacklist") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Set Text))))

newRef :: forall {k} s m (a :: k). (HasRefStore s, MonadState s m) => m (Ref a) #

mkQ :: Q a -> Query #

evalQ :: Q c -> c #

modQ :: Query -> Q a -> Query #

Alter a pre-existing Query monadically.

asQuery :: Iso' (Q ()) Query #

withQ_ :: Q a -> Q (Ref Relation) #

Define a subquery using the WITH syntax. Note that this does not automatically include this table in a SELECT; you need to additionally include the resulting relation from withQ_ using the from_ operator.

withQ'_ :: Q a -> Q (Ref Relation, Query) #

Define a WITH subquery, returning the reference and the query.

withQ :: Q a -> Q (Ref Relation, Query, a) #

Define a WITH subquery, returning the reference, the query, and the result of running the Q block.

withQAs_ :: Ref Query -> Q a -> Q (Ref Table) #

withAs_ :: Selected Query -> Q (Ref Table) #

Define a WITH subquery while retaining and re-using its given name. Useful in some scenarios where you want to keep the original name in further referring to the newly introduced subquery table.

withAsUnique :: Selected Query -> Q (Ref Table) #

Use unique naming scheme along with Ref Relation to construct the WITH macro's name. This is useful when ensuring unique naming while not throwing out some human-readable information.

select_ :: SExp -> Q (Ref SExp) #

Smart selector that will use the variable's name if expression is a variable and assign a fresh variable name if it's something else without a name.

selectAs_' :: Alias SExp -> Q (Maybe (Ref SExp)) #

Add optional aliasing to the Q.

annotateJson :: ToJSON a => a -> Ref SExp -> Q (Ref SExp) #

selectsGroupsAs_ :: [Selected SExp] -> Q () #

Select a field and also include it in GROUP BY. Do this intelligently, referring to it by its given name in most cases but by its direct expression definition in case of external functions to prevent overlap with fields that may already exist.

selectsGroupsAsRef_ :: [Selected SExp] -> Q () #

Like selectsGroupsAs_ but will use the name you gave to each field in the group by statement. Some backends like BigQuery require this while others like Redshift don't like it.

selectNonEmptyGroups :: [Selected SExp] -> Q () #

Special convenience case: Select and group while demanding that none of the group values is null.

fromIfNecessary :: Relation -> Q (Ref Relation) #

Add a from clause unless the relation is already in place.

fromRef_ :: Ref Relation -> Q (Ref Relation) #

Use a name directly and don't alias it one more time. | This can fail to create a proper alias if the Ref includes multiple names.

fromRel :: AsRelation r => r -> Q (Ref Relation) #

fromSpecified :: Q Bool #

Returns True iff the current Query already has an initial From table available.

having :: MonadState QState m => SExp -> m () #

havingL :: Applicative f => (Maybe SExp -> f (Maybe SExp)) -> QState -> f QState #

where_ :: SExp -> Q () #

whereAdd :: MonadState QState m => SExp -> m () #

whereAddIn :: MonadState QState m => SExp -> [SExp] -> m () #

where x in y

whereAddNotIn :: MonadState QState m => SExp -> [SExp] -> m () #

where x not in y

groupBy_ :: [SExp] -> Q () #

orderBy_ :: Order -> Q () #

limit_ :: MonadState QState m => Int -> m () #

offset_ :: MonadState QState m => Int -> m () #

mdef :: a -> Iso' (Maybe a) a #

fromQuery :: Q a -> Relation #

Turn query into relation

scopeRelation :: SExp -> Relation -> Relation #

Make a query relation that applies predicate on the given relation in a subquery.

selectEverything :: [(Ref Relation, DefinedQuery)] -> Q () #

Introspects the given list of Queryies, along with their references in the current context, and selects every named field in them within the current context, while deduplicating repeat fields (by name). Good for the common case of joining tables and selecting everything possible in them.

explicitSelectStarWith #

Arguments

:: s

Object containing definitions

-> Ref Relation

Concrete reference within the context

-> Getting (Endo [Ref SExp]) s (Ref SExp)

Traversal to get field definitions from the object

-> (Selected SExp -> Selected SExp)

A function to modify the final selection

-> Q () 

explicitSelectStar :: HasDefinition s => s -> Ref Relation -> Q () #

Instead of doing a select * that's impossible to introspect, explicitly select all fields from something that contains a definition - e.g. a Query.

explicitMapSelectStar :: HasDefinition s => s -> Ref Relation -> (Selected SExp -> Selected SExp) -> Q () #

Instead of doing a select * that's impossible to introspect, explicitly select all fields from something that contains a definition - e.g. a Query.

selectStar :: Ref Relation -> Q (Ref Relation) #

select * from x

selectNonDuplicates :: Foldable t => t (Ref SExp) -> Q () #

Given a list of references, select those that have not yet been selected in current monadic block.

mapSelectNonDuplicates :: Foldable t => t (Ref SExp) -> (Selected SExp -> Selected SExp) -> Q () #

Given a list of references, select those that have not yet been selected in current monadic block with option to modify the finalized selection.

updateSet_ :: Name -> SExp -> U () #

newtype Transformed a #

Constructors

Transformed a 

Instances

Instances details
Show a => Show (Transformed a) 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

Eq a => Eq (Transformed a) 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

newtype MetaArguments #

Constructors

MetaArguments 

newtype TargetName #

Constructors

TargetName (Ref Table) 

newtype HiddenArtifacts #

Constructors

HiddenArtifacts (Set (Ref Table)) 

Instances

Instances details
Default HiddenArtifacts 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

Monoid HiddenArtifacts 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

Semigroup HiddenArtifacts 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

IsList HiddenArtifacts 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

Associated Types

type Item HiddenArtifacts 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

Show HiddenArtifacts 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

Eq HiddenArtifacts 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

type Item HiddenArtifacts 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

newtype HiddenDependencies #

Constructors

HiddenDependencies (Set (Ref Table)) 

Instances

Instances details
Default HiddenDependencies 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

Monoid HiddenDependencies 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

Semigroup HiddenDependencies 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

IsList HiddenDependencies 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

Associated Types

type Item HiddenDependencies 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

Show HiddenDependencies 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

Eq HiddenDependencies 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

type Item HiddenDependencies 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

newtype ExtraDependencies #

Constructors

ExtraDependencies (Set (Ref Table)) 

Instances

Instances details
Default ExtraDependencies 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

Monoid ExtraDependencies 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

Semigroup ExtraDependencies 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

IsList ExtraDependencies 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

Associated Types

type Item ExtraDependencies 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

Show ExtraDependencies 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

Eq ExtraDependencies 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

type Item ExtraDependencies 
Instance details

Defined in Napkin.Run.Effects.Languages.TableSpec

renameReferences :: forall (r :: EffectRow) a. Member (Reader QueryTransformer) r => (Ref Table -> Ref Table) -> Sem r a -> Sem r a #

Apply given table name renamer to every single reference occurrence everywhere.

If you want to target only certain tables, make sure the function you provide here does the filtering internally.

applyTransformer :: forall (r :: EffectRow) a. Member (Reader QueryTransformer) r => QueryTransformerUnit -> Sem r a -> Sem r a #

Comprehensively apply the given transformer around the given region.

hideDependencies :: forall a (r :: EffectRow). Member (Reader HiddenDependencies) r => Set (Ref Table) -> Sem r a -> Sem r a #

Add the given dependencies to the hide list around the given region.

Later during interpretation, this will cause the given dependencies to not be considered upstream dependencies within the enclosed region.

hideDependency :: forall a (r :: EffectRow). Member (Reader HiddenDependencies) r => Ref Table -> Sem r a -> Sem r a #

Add the given dependency to the hide list around the given region.

Later during interpretation, this will cause the given dependency to not be considered upstream dependency within the enclosed region.

hideArtifact :: forall a (r :: EffectRow). Member (Reader HiddenArtifacts) r => Ref Table -> Sem r a -> Sem r a #

Add the given artifact to the hide list around the given region.

Later during interpretation, this will cause the given artifact to not be reported to the tablespec within the enclosed region.

addDependencies :: forall (r :: EffectRow). Member (Output ExtraDependencies :: (Type -> Type) -> Type -> Type) r => Set (Ref Table) -> Sem r () #

Add the given references to list of dependencies for the underlying region.

Later during interpretation, this will cause the given dependencies to be forcefully considered upstream dependencies within the enclosed region even though they were not seen in the parsed SQL.

overrideTarget :: forall a (r :: EffectRow). Member (Reader TargetName) r => Ref Table -> Sem r a -> Sem r a #

insertQueryIntoTarget :: forall b (effs :: EffectRow). Members '[SqlWrite b :: (Type -> Type) -> Type -> Type, Reader TargetName] effs => Query -> Sem effs () #

deleteFromTarget :: forall b (effs :: EffectRow). Members '[SqlWrite b :: (Type -> Type) -> Type -> Type, Reader TargetName] effs => SExp -> Sem effs () #

updateTarget :: forall b (effs :: EffectRow). Members '[SqlWrite b :: (Type -> Type) -> Type -> Type, Reader TargetName] effs => (Ref Relation -> U ()) -> Sem effs () #

memo :: forall a (eff :: EffectRow). (Member (Output TableMemo :: (Type -> Type) -> Type -> Type) eff, ToJSON a) => a -> Sem eff () #

data RecreateTable b (m :: k) a where #

Constructors

RecreateTableAs :: forall {k} b (m :: k). BackendTableMeta b -> Ref Table -> NonEmpty Query -> RecreateTable b m () 
RecreateViewAs :: forall {k} b (m :: k). BackendViewMeta b -> Ref Table -> Query -> RecreateTable b m () 
RecreateMaterializedViewAs :: forall {k} b (m :: k). BackendMaterializedViewMeta b -> Ref Table -> Query -> RecreateTable b m () 
RecreateTableStatement' :: forall {k} b (m :: k). BackendTableMeta b -> Ref Table -> CreateTableDDL -> [InsertStatement] -> RecreateTable b m () 

recreateTableAs :: forall b (r :: EffectRow). Member (RecreateTable b :: (Type -> Type) -> Type -> Type) r => BackendTableMeta b -> Ref Table -> NonEmpty Query -> Sem r () #

recreateViewAs :: forall b (r :: EffectRow). Member (RecreateTable b :: (Type -> Type) -> Type -> Type) r => BackendViewMeta b -> Ref Table -> Query -> Sem r () #

recreateTargetTable :: forall b (effs :: EffectRow). Members '[RecreateTable b :: (Type -> Type) -> Type -> Type, Reader TargetName] effs => BackendTableMeta b -> NonEmpty Query -> Sem effs () #

recreateTargetView :: forall b (effs :: EffectRow). Members '[RecreateTable b :: (Type -> Type) -> Type -> Type, Reader TargetName] effs => BackendViewMeta b -> Query -> Sem effs () #

data AnnotateRead (b :: k) (m :: k1) a where #

Constructors

GetAnnotations :: forall {k} {k1} (b :: k) (m :: k1). Ref Table -> AnnotateRead b m TableAnnotations 

Instances

Instances details
ToDumpItem (b :: k) (AnnotateRead b :: (Type -> Type) -> Type -> Type) 
Instance details

Defined in Napkin.Run.Effects.Interceptors.LogProgram.Types

Methods

toDumpItem :: forall (r :: EffectRow) x. AnnotateRead b (Sem r) x -> DumpItem b #

GShow (AnnotateRead bk a :: Type -> Type) 
Instance details

Defined in Napkin.Run.Effects.Languages.AnnotateRead

Methods

gshowsPrec :: Int -> AnnotateRead bk a a0 -> ShowS #

Show (AnnotateRead bk a b) 
Instance details

Defined in Napkin.Run.Effects.Languages.AnnotateRead

Methods

showsPrec :: Int -> AnnotateRead bk a b -> ShowS #

show :: AnnotateRead bk a b -> String #

showList :: [AnnotateRead bk a b] -> ShowS #

Eq (AnnotateRead bk a b) 
Instance details

Defined in Napkin.Run.Effects.Languages.AnnotateRead

Methods

(==) :: AnnotateRead bk a b -> AnnotateRead bk a b -> Bool #

(/=) :: AnnotateRead bk a b -> AnnotateRead bk a b -> Bool #

data TableAnnotations #

Instances

Instances details
Generic TableAnnotations 
Instance details

Defined in Napkin.Run.Effects.Languages.AnnotateRead

Associated Types

type Rep TableAnnotations 
Instance details

Defined in Napkin.Run.Effects.Languages.AnnotateRead

type Rep TableAnnotations = D1 ('MetaData "TableAnnotations" "Napkin.Run.Effects.Languages.AnnotateRead" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "TableAnnotations" 'PrefixI 'True) (S1 ('MetaSel ('Just "tableAnnotation") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "columnsAnnotations") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ColumnsAnnotations)))
type Rep TableAnnotations 
Instance details

Defined in Napkin.Run.Effects.Languages.AnnotateRead

type Rep TableAnnotations = D1 ('MetaData "TableAnnotations" "Napkin.Run.Effects.Languages.AnnotateRead" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "TableAnnotations" 'PrefixI 'True) (S1 ('MetaSel ('Just "tableAnnotation") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "columnsAnnotations") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ColumnsAnnotations)))

getTargetAnnotations :: forall {k} (b :: k) (effs :: EffectRow). Members '[AnnotateRead b :: (Type -> Type) -> Type -> Type, Reader TargetName] effs => Sem effs TableAnnotations #

data AnnotateWrite (b :: k) (m :: k1) a where #

Constructors

AnnotateTable :: forall {k} {k1} (b :: k) (m :: k1). Ref Table -> Text -> AnnotateWrite b m () 
AnnotateColumns :: forall {k} {k1} (b :: k) (m :: k1). Ref Table -> ColumnsAnnotations -> AnnotateWrite b m () 

Instances

Instances details
ToDumpItem (b :: k) (AnnotateWrite b :: (Type -> Type) -> Type -> Type) 
Instance details

Defined in Napkin.Run.Effects.Interceptors.LogProgram.Types

Methods

toDumpItem :: forall (r :: EffectRow) x. AnnotateWrite b (Sem r) x -> DumpItem b #

GShow (AnnotateWrite bk a :: Type -> Type) 
Instance details

Defined in Napkin.Run.Effects.Languages.AnnotateWrite

Methods

gshowsPrec :: Int -> AnnotateWrite bk a a0 -> ShowS #

Show (AnnotateWrite bk a b) 
Instance details

Defined in Napkin.Run.Effects.Languages.AnnotateWrite

Methods

showsPrec :: Int -> AnnotateWrite bk a b -> ShowS #

show :: AnnotateWrite bk a b -> String #

showList :: [AnnotateWrite bk a b] -> ShowS #

Eq (AnnotateWrite bk a b) 
Instance details

Defined in Napkin.Run.Effects.Languages.AnnotateWrite

Methods

(==) :: AnnotateWrite bk a b -> AnnotateWrite bk a b -> Bool #

(/=) :: AnnotateWrite bk a b -> AnnotateWrite bk a b -> Bool #

annotateTable :: forall {k} (b :: k) (r :: EffectRow). Member (AnnotateWrite b :: (Type -> Type) -> Type -> Type) r => Ref Table -> Text -> Sem r () #

annotateColumns :: forall {k} (b :: k) (r :: EffectRow). Member (AnnotateWrite b :: (Type -> Type) -> Type -> Type) r => Ref Table -> ColumnsAnnotations -> Sem r () #

annotateColumn :: forall {k} (b :: k) (effs :: EffectRow). Member (AnnotateWrite b :: (Type -> Type) -> Type -> Type) effs => Ref Table -> Ref SExp -> Text -> Sem effs () #

annotateTargetTable :: forall {k} (b :: k) (effs :: EffectRow). Members '[AnnotateWrite b :: (Type -> Type) -> Type -> Type, Reader TargetName] effs => Text -> Sem effs () #

annotateTargetColumns :: forall {k} (b :: k) (effs :: EffectRow). Members '[AnnotateWrite b :: (Type -> Type) -> Type -> Type, Reader TargetName] effs => ColumnsAnnotations -> Sem effs () #

annotateTargetColumn :: forall {k} (b :: k) (effs :: EffectRow). Members '[AnnotateWrite b :: (Type -> Type) -> Type -> Type, Reader TargetName] effs => Ref SExp -> Text -> Sem effs () #

askTextArgDefault :: forall (r :: EffectRow). Members '[Input MetaArguments :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r => Text -> Text -> Sem r Text #

askTextArg :: forall (r :: EffectRow). Members '[Input MetaArguments :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r => Text -> Sem r Text #

askTextArgMb :: forall (r :: EffectRow). Members '[Input MetaArguments :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r => Text -> Sem r (Maybe Text) #

askBoolArgDefault :: forall (r :: EffectRow). Members '[Input MetaArguments :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r => Bool -> Text -> Sem r Bool #

askBoolArg :: forall (r :: EffectRow). Members '[Input MetaArguments :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r => Text -> Sem r Bool #

askBoolArgMb :: forall (r :: EffectRow). Members '[Input MetaArguments :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r => Text -> Sem r (Maybe Bool) #

askNumArgDefault :: forall (r :: EffectRow). Members '[Input MetaArguments :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r => Scientific -> Text -> Sem r Scientific #

askNumArg :: forall (r :: EffectRow). Members '[Input MetaArguments :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r => Text -> Sem r Scientific #

askNumArgMb :: forall (r :: EffectRow). Members '[Input MetaArguments :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r => Text -> Sem r (Maybe Scientific) #

askArg :: forall a (r :: EffectRow). (FromJSON a, Members '[Input MetaArguments :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r) => Text -> Sem r a #

askArgMb :: forall a (r :: EffectRow). (FromJSON a, Members '[Input MetaArguments :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r) => Text -> Sem r (Maybe a) #

withTypedArg :: forall a b (r :: EffectRow). (FromJSON a, Members '[Input MetaArguments :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type] r, Typeable a) => (a -> Sem r b) -> Sem r b #

unpackRenderedSql :: RenderedSql -> Text #

Helper functions for napkin repl

sqlToFile :: forall {k} a (b :: k). RenderSql a b => Proxy b -> a -> FilePath -> IO () #

Render to a local SQL file, mainly for debugging/devel help.

sqlToFileCollapsed :: forall {k} a (b :: k). RenderSql a b => Proxy b -> a -> FilePath -> IO () #

printSql :: forall {k} a (b :: k). RenderSql a b => Proxy b -> a -> IO () #

class HasBackendQueryStats b => LocalQueryStats (b :: k) (m :: Type -> Type) where #

Methods

tellStats :: QueryStats b -> m () #

Instances

Instances details
HasBackendQueryStats b => LocalQueryStats (b :: k) IO 
Instance details

Defined in Napkin.Run.Base

Methods

tellStats :: QueryStats b -> IO () #

HasBackendQueryStats b => LocalQueryStats (b :: k) (KatipT IO) 
Instance details

Defined in Napkin.Run.Base

Methods

tellStats :: QueryStats b -> KatipT IO () #

HasBackendQueryStats backend => LocalQueryStats (backend :: k) (ReaderT (IORef (QueryStats backend)) (KatipT IO)) 
Instance details

Defined in Napkin.Run.Base

Methods

tellStats :: QueryStats backend -> ReaderT (IORef (QueryStats backend)) (KatipT IO) () #

discardQueryStats :: Katip m => KatipT IO a -> m a #

newtype AuthSpecFile #

Constructors

AuthSpecFile 

Instances

Instances details
Semigroup AuthSpecFile 
Instance details

Defined in Napkin.Spec.Types.Runtime

Generic AuthSpecFile 
Instance details

Defined in Napkin.Spec.Types.Runtime

Associated Types

type Rep AuthSpecFile 
Instance details

Defined in Napkin.Spec.Types.Runtime

type Rep AuthSpecFile = D1 ('MetaData "AuthSpecFile" "Napkin.Spec.Types.Runtime" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'True) (C1 ('MetaCons "AuthSpecFile" 'PrefixI 'True) (S1 ('MetaSel ('Just "unAuthSpecFile") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FilePath)))
Show AuthSpecFile 
Instance details

Defined in Napkin.Spec.Types.Runtime

Eq AuthSpecFile 
Instance details

Defined in Napkin.Spec.Types.Runtime

type Rep AuthSpecFile 
Instance details

Defined in Napkin.Spec.Types.Runtime

type Rep AuthSpecFile = D1 ('MetaData "AuthSpecFile" "Napkin.Spec.Types.Runtime" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'True) (C1 ('MetaCons "AuthSpecFile" 'PrefixI 'True) (S1 ('MetaSel ('Just "unAuthSpecFile") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FilePath)))

data SpecPaths #

Constructors

SpecPaths 

Instances

Instances details
MonadReader SpecPaths (Spec b) 
Instance details

Defined in Napkin.Spec.Types.Spec

Methods

ask :: Spec b SpecPaths #

local :: (SpecPaths -> SpecPaths) -> Spec b a -> Spec b a #

reader :: (SpecPaths -> a) -> Spec b a #

newtype AppName #

Constructors

AppName Text 

Instances

Instances details
FromJSON AppName 
Instance details

Defined in Napkin.Spec.Types.Runtime

ToJSON AppName 
Instance details

Defined in Napkin.Spec.Types.Runtime

Buildable AppName 
Instance details

Defined in Napkin.Spec.Types.Runtime

Methods

build :: AppName -> Builder #

Semigroup AppName 
Instance details

Defined in Napkin.Spec.Types.Runtime

Data AppName 
Instance details

Defined in Napkin.Spec.Types.Runtime

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AppName -> c AppName #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AppName #

toConstr :: AppName -> Constr #

dataTypeOf :: AppName -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AppName) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AppName) #

gmapT :: (forall b. Data b => b -> b) -> AppName -> AppName #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AppName -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AppName -> r #

gmapQ :: (forall d. Data d => d -> u) -> AppName -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AppName -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AppName -> m AppName #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AppName -> m AppName #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AppName -> m AppName #

IsString AppName 
Instance details

Defined in Napkin.Spec.Types.Runtime

Methods

fromString :: String -> AppName #

Show AppName 
Instance details

Defined in Napkin.Spec.Types.Runtime

Eq AppName 
Instance details

Defined in Napkin.Spec.Types.Runtime

Methods

(==) :: AppName -> AppName -> Bool #

(/=) :: AppName -> AppName -> Bool #

Ord AppName 
Instance details

Defined in Napkin.Spec.Types.Runtime

data SpecDepsAndQueries (bk :: k) #

Instances

Instances details
Generic (SpecDepsAndQueries bk) 
Instance details

Defined in Napkin.Run.Effects.Types

Associated Types

type Rep (SpecDepsAndQueries bk) 
Instance details

Defined in Napkin.Run.Effects.Types

type Rep (SpecDepsAndQueries bk) = D1 ('MetaData "SpecDepsAndQueries" "Napkin.Run.Effects.Types" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "SpecDepsAndQueries" 'PrefixI 'True) (S1 ('MetaSel ('Just "tablesDepsAndQueries") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(SpecTableName, ProgramAndHooksDependenciesAndQueries bk)]) :*: S1 ('MetaSel ('Just "hooksDepsAndQueries") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(Text, DryRunResult bk)])))
type Rep (SpecDepsAndQueries bk) 
Instance details

Defined in Napkin.Run.Effects.Types

type Rep (SpecDepsAndQueries bk) = D1 ('MetaData "SpecDepsAndQueries" "Napkin.Run.Effects.Types" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "SpecDepsAndQueries" 'PrefixI 'True) (S1 ('MetaSel ('Just "tablesDepsAndQueries") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(SpecTableName, ProgramAndHooksDependenciesAndQueries bk)]) :*: S1 ('MetaSel ('Just "hooksDepsAndQueries") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(Text, DryRunResult bk)])))

data DryRunResult (b :: k) #

Instances

Instances details
Monoid (DryRunResult b) 
Instance details

Defined in Napkin.Run.Effects.Types

Semigroup (DryRunResult b) 
Instance details

Defined in Napkin.Run.Effects.Types

Generic (DryRunResult b) 
Instance details

Defined in Napkin.Run.Effects.Types

Associated Types

type Rep (DryRunResult b) 
Instance details

Defined in Napkin.Run.Effects.Types

type Rep (DryRunResult b) = D1 ('MetaData "DryRunResult" "Napkin.Run.Effects.Types" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "DryRunResult" 'PrefixI 'True) ((S1 ('MetaSel ('Just "dependencies") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Dependencies) :*: S1 ('MetaSel ('Just "artifacts") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Artifacts)) :*: (S1 ('MetaSel ('Just "queries") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [DumpItem b]) :*: (S1 ('MetaSel ('Just "loadedSqlQueries") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(FilePath, Query)]) :*: S1 ('MetaSel ('Just "assertions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 AssertionLog)))))

Methods

from :: DryRunResult b -> Rep (DryRunResult b) x #

to :: Rep (DryRunResult b) x -> DryRunResult b #

Show (DryRunResult b) 
Instance details

Defined in Napkin.Run.Effects.Types

Eq (DryRunResult b) 
Instance details

Defined in Napkin.Run.Effects.Types

type Rep (DryRunResult b) 
Instance details

Defined in Napkin.Run.Effects.Types

type Rep (DryRunResult b) = D1 ('MetaData "DryRunResult" "Napkin.Run.Effects.Types" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "DryRunResult" 'PrefixI 'True) ((S1 ('MetaSel ('Just "dependencies") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Dependencies) :*: S1 ('MetaSel ('Just "artifacts") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Artifacts)) :*: (S1 ('MetaSel ('Just "queries") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [DumpItem b]) :*: (S1 ('MetaSel ('Just "loadedSqlQueries") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(FilePath, Query)]) :*: S1 ('MetaSel ('Just "assertions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 AssertionLog)))))

type TableEffects b = '[Reader TargetName, RecreateTable b :: (Type -> Type) -> Type -> Type, External :: (Type -> Type) -> Type -> Type, Output TableMemo :: (Type -> Type) -> Type -> Type] ++ Core b #

type AssertionEffects (b :: k1) = '[Assertion :: k -> Type -> Type] #

type SpecProgram b = SpecProgram' b () #

data HookSyncOrAsync #

Constructors

HookSync 
HookAsync 

Instances

Instances details
Generic HookSyncOrAsync 
Instance details

Defined in Napkin.Run.Effects.Types

Associated Types

type Rep HookSyncOrAsync 
Instance details

Defined in Napkin.Run.Effects.Types

type Rep HookSyncOrAsync = D1 ('MetaData "HookSyncOrAsync" "Napkin.Run.Effects.Types" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "HookSync" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "HookAsync" 'PrefixI 'False) (U1 :: Type -> Type))
Show HookSyncOrAsync 
Instance details

Defined in Napkin.Run.Effects.Types

type Rep HookSyncOrAsync 
Instance details

Defined in Napkin.Run.Effects.Types

type Rep HookSyncOrAsync = D1 ('MetaData "HookSyncOrAsync" "Napkin.Run.Effects.Types" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "HookSync" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "HookAsync" 'PrefixI 'False) (U1 :: Type -> Type))

type HookProgram b = HookProgram' b () #

Hooks have different capabilities than specs

type HookProgram' b a = Sem (TableHookProgramEffects b) a #

Programs packaged up for use in Specs. Intended for use in providing introspectable CustomCreate actions in specs.

pattern SyncHook :: HookProgram b -> Hook b #

pattern AsyncHook :: HookProgram b -> Hook b #

askQueryRewriterData :: forall a (r :: EffectRow). (Data a, Member (Reader QueryTransformer) r) => Sem r (a -> a) #

summarize :: forall {k} (b :: k). ProgramDependenciesAndQueries b -> DryRunResult b #

type SpecPreprocessor b = Sem '[Input SpecPaths :: (Type -> Type) -> Type -> Type, Input MetaArguments :: (Type -> Type) -> Type -> Type, State (Specs b) :: (Type -> Type) -> Type -> Type, Output DepsValidator :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Embed IO, Log :: (Type -> Type) -> Type -> Type] () #

newtype CustomValidator #

CustomValidators are run before namespacing and return a list of errors in the incoming Spec.

TODO. I find this outmoded - it's a very restrictive form of doing custom validations. The new effect machinery is much richer in being able to introspect different types of database interactions under the SqlBackend type. Keeping this for legacy compatibility for now.

Instances

Instances details
Default CustomValidator 
Instance details

Defined in Napkin.Spec.Types.Spec

newtype Spec b a #

Constructors

Spec 

Fields

Instances

Instances details
MonadReader SpecPaths (Spec b) 
Instance details

Defined in Napkin.Spec.Types.Spec

Methods

ask :: Spec b SpecPaths #

local :: (SpecPaths -> SpecPaths) -> Spec b a -> Spec b a #

reader :: (SpecPaths -> a) -> Spec b a #

MonadIO (Spec b) 
Instance details

Defined in Napkin.Spec.Types.Spec

Methods

liftIO :: IO a -> Spec b a #

MonadCatch (Spec b) 
Instance details

Defined in Napkin.Spec.Types.Spec

Methods

catch :: (HasCallStack, Exception e) => Spec b a -> (e -> Spec b a) -> Spec b a #

MonadMask (Spec b) 
Instance details

Defined in Napkin.Spec.Types.Spec

Methods

mask :: HasCallStack => ((forall a. Spec b a -> Spec b a) -> Spec b b0) -> Spec b b0 #

uninterruptibleMask :: HasCallStack => ((forall a. Spec b a -> Spec b a) -> Spec b b0) -> Spec b b0 #

generalBracket :: HasCallStack => Spec b a -> (a -> ExitCase b0 -> Spec b c) -> (a -> Spec b b0) -> Spec b (b0, c) #

MonadThrow (Spec b) 
Instance details

Defined in Napkin.Spec.Types.Spec

Methods

throwM :: (HasCallStack, Exception e) => e -> Spec b a #

Applicative (Spec b) 
Instance details

Defined in Napkin.Spec.Types.Spec

Methods

pure :: a -> Spec b a #

(<*>) :: Spec b (a -> b0) -> Spec b a -> Spec b b0 #

liftA2 :: (a -> b0 -> c) -> Spec b a -> Spec b b0 -> Spec b c #

(*>) :: Spec b a -> Spec b b0 -> Spec b b0 #

(<*) :: Spec b a -> Spec b b0 -> Spec b a #

Functor (Spec b) 
Instance details

Defined in Napkin.Spec.Types.Spec

Methods

fmap :: (a -> b0) -> Spec b a -> Spec b b0 #

(<$) :: a -> Spec b b0 -> Spec b a #

Monad (Spec b) 
Instance details

Defined in Napkin.Spec.Types.Spec

Methods

(>>=) :: Spec b a -> (a -> Spec b b0) -> Spec b b0 #

(>>) :: Spec b a -> Spec b b0 -> Spec b b0 #

return :: a -> Spec b a #

MonadState (Specs b) (Spec b) 
Instance details

Defined in Napkin.Spec.Types.Spec

Methods

get :: Spec b (Specs b) #

put :: Specs b -> Spec b () #

state :: (Specs b -> (a, Specs b)) -> Spec b a #

data SpecGlobalHook b #

Instances

Instances details
Generic b => Generic (SpecGlobalHook b) 
Instance details

Defined in Napkin.Spec.Types.Spec

Associated Types

type Rep (SpecGlobalHook b) 
Instance details

Defined in Napkin.Spec.Types.Spec

type Rep (SpecGlobalHook b) = D1 ('MetaData "SpecGlobalHook" "Napkin.Spec.Types.Spec" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "PureSpecGlobalHook" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (PureGlobalHookProgram b))) :+: C1 ('MetaCons "IOSpecGlobalHook" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (IOGlobalHookProgram b))))
type Rep (SpecGlobalHook b) 
Instance details

Defined in Napkin.Spec.Types.Spec

type Rep (SpecGlobalHook b) = D1 ('MetaData "SpecGlobalHook" "Napkin.Spec.Types.Spec" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) (C1 ('MetaCons "PureSpecGlobalHook" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (PureGlobalHookProgram b))) :+: C1 ('MetaCons "IOSpecGlobalHook" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (IOGlobalHookProgram b))))

data UpdateStrategy #

Each strategy acts independently. For example, if you have only UpdateWithDependency, it wouldn't update even if the table were missing. You need to specify each strategy in the list.

Instances

Instances details
Data UpdateStrategy 
Instance details

Defined in Napkin.Spec.Types.Spec

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UpdateStrategy -> c UpdateStrategy #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UpdateStrategy #

toConstr :: UpdateStrategy -> Constr #

dataTypeOf :: UpdateStrategy -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UpdateStrategy) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UpdateStrategy) #

gmapT :: (forall b. Data b => b -> b) -> UpdateStrategy -> UpdateStrategy #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UpdateStrategy -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UpdateStrategy -> r #

gmapQ :: (forall d. Data d => d -> u) -> UpdateStrategy -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UpdateStrategy -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UpdateStrategy -> m UpdateStrategy #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UpdateStrategy -> m UpdateStrategy #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UpdateStrategy -> m UpdateStrategy #

Generic UpdateStrategy 
Instance details

Defined in Napkin.Spec.Types.Spec

Associated Types

type Rep UpdateStrategy 
Instance details

Defined in Napkin.Spec.Types.Spec

type Rep UpdateStrategy = D1 ('MetaData "UpdateStrategy" "Napkin.Spec.Types.Spec" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) ((C1 ('MetaCons "UpdateAlways" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "UpdatePeriodically" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 NominalDiffTime))) :+: (C1 ('MetaCons "UpdateWithDependency" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "UpdateIfMissing" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "UpdateIfErroredLastRun" 'PrefixI 'False) (U1 :: Type -> Type))))
Show UpdateStrategy 
Instance details

Defined in Napkin.Spec.Types.Spec

Eq UpdateStrategy 
Instance details

Defined in Napkin.Spec.Types.Spec

Ord UpdateStrategy 
Instance details

Defined in Napkin.Spec.Types.Spec

type Rep UpdateStrategy 
Instance details

Defined in Napkin.Spec.Types.Spec

type Rep UpdateStrategy = D1 ('MetaData "UpdateStrategy" "Napkin.Spec.Types.Spec" "napkin-spec-2.0.0-5xXYUWOFBl6BG2xbztGZJm" 'False) ((C1 ('MetaCons "UpdateAlways" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "UpdatePeriodically" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 NominalDiffTime))) :+: (C1 ('MetaCons "UpdateWithDependency" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "UpdateIfMissing" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "UpdateIfErroredLastRun" 'PrefixI 'False) (U1 :: Type -> Type))))

runSpec :: SpecPaths -> Spec b a -> IO (Specs b) #

runSpecE :: SpecPaths -> ExceptT e (Spec b) a -> IO (Either e (Specs b)) #

runSpecE' :: SpecPaths -> Specs b -> ExceptT e (Spec b) a -> IO (Either e (a, Specs b)) #

allSpecsTables :: Specs b -> Set SpecTableName #

All tables that are being created/managed as part of this spec.

specTable :: forall b f. Functor f => (SpecTableName -> f SpecTableName) -> TableSpec b -> f (TableSpec b) #

specAction :: forall b f. Functor f => (SpecProgram b -> f (SpecProgram b)) -> TableSpec b -> f (TableSpec b) #

specUpdate :: forall b f. Functor f => ([UpdateStrategy] -> f [UpdateStrategy]) -> TableSpec b -> f (TableSpec b) #

specTags :: forall b f. Functor f => (Set TableSpecTag -> f (Set TableSpecTag)) -> TableSpec b -> f (TableSpec b) #

specsTables :: forall b f. Functor f => (SpecTableMap b -> f (SpecTableMap b)) -> Specs b -> f (Specs b) #

specsHooks :: forall b f. Functor f => (GlobalHooks b -> f (GlobalHooks b)) -> Specs b -> f (Specs b) #

specsMetaArgs :: forall b f. Functor f => (SpecMetaArgs -> f SpecMetaArgs) -> Specs b -> f (Specs b) #

specsTransformer :: forall b f. Functor f => (QueryTransformer -> f QueryTransformer) -> Specs b -> f (Specs b) #

specTagRefMap :: [TableSpec b] -> Map (Maybe TableSpecTag) [SpecTableName] #

create a mapping of TableSpecTags to `Ref Table`s for dumping.

specListTags :: forall bk m. MonadIO m => Specs bk -> m () #

Print the result of specTagRefMap'ing a particular spec to terminal.

showText :: Show a => a -> Text #

scaleCalendarDiffDays :: Integer -> CalendarDiffDays -> CalendarDiffDays #

Scale by a factor. Note that scaleCalendarDiffDays (-1) will not perfectly invert a duration, due to variable month lengths.

periodAllDays :: DayPeriod p => p -> [Day] #

A list of all the days in this period.

Since: time-1.12.1

periodFromDay :: DayPeriod p => Day -> (p, Int) #

Get the period this day is in, with the 1-based day number within the period.

periodFromDay (periodFirstDay p) = (p,1)

Since: time-1.12.1

periodLength :: DayPeriod p => p -> Int #

The number of days in this period.

Since: time-1.12.1

periodToDay :: DayPeriod p => p -> Int -> Day #

Inverse of periodFromDay.

Since: time-1.12.1

periodToDayValid :: DayPeriod p => p -> Int -> Maybe Day #

Validating inverse of periodFromDay.

Since: time-1.12.1

pattern YearMonthDay :: Year -> MonthOfYear -> DayOfMonth -> Day #

Bidirectional abstract constructor for the proleptic Gregorian calendar. Invalid values will be clipped to the correct range, month first, then day.

addGregorianDurationClip :: CalendarDiffDays -> Day -> Day #

Add months (clipped to last day), then add days

addGregorianDurationRollOver :: CalendarDiffDays -> Day -> Day #

Add months (rolling over to next month), then add days

addGregorianMonthsClip :: Integer -> Day -> Day #

Add months, with days past the last day of the month clipped to the last day. For instance, 2005-01-30 + 1 month = 2005-02-28.

addGregorianMonthsRollOver :: Integer -> Day -> Day #

Add months, with days past the last day of the month rolling over to the next month. For instance, 2005-01-30 + 1 month = 2005-03-02.

addGregorianYearsClip :: Integer -> Day -> Day #

Add years, matching month and day, with Feb 29th clipped to Feb 28th if necessary. For instance, 2004-02-29 + 2 years = 2006-02-28.

addGregorianYearsRollOver :: Integer -> Day -> Day #

Add years, matching month and day, with Feb 29th rolled over to Mar 1st if necessary. For instance, 2004-02-29 + 2 years = 2006-03-01.

diffGregorianDurationClip :: Day -> Day -> CalendarDiffDays #

Calendrical difference, with as many whole months as possible

diffGregorianDurationRollOver :: Day -> Day -> CalendarDiffDays #

Calendrical difference, with as many whole months as possible. Same as diffGregorianDurationClip for positive durations.

fromGregorian :: Year -> MonthOfYear -> DayOfMonth -> Day #

Convert from proleptic Gregorian calendar. Invalid values will be clipped to the correct range, month first, then day.

fromGregorianValid :: Year -> MonthOfYear -> DayOfMonth -> Maybe Day #

Convert from proleptic Gregorian calendar. Invalid values will return Nothing

gregorianMonthLength :: Year -> MonthOfYear -> DayOfMonth #

The number of days in a given month according to the proleptic Gregorian calendar.

showGregorian :: Day -> String #

Show in ISO 8601 format (yyyy-mm-dd)

toGregorian :: Day -> (Year, MonthOfYear, DayOfMonth) #

Convert to proleptic Gregorian calendar.

pattern BeforeCommonEra :: Integer -> Year #

Also known as Before Christ. Note that Year 1 = 1 CE, and the previous Year 0 = 1 BCE. CommonEra and BeforeCommonEra form a COMPLETE set.

pattern CommonEra :: Integer -> Year #

Also known as Anno Domini.

dayOfWeekDiff :: DayOfWeek -> DayOfWeek -> Int #

dayOfWeekDiff a b = a - b in range 0 to 6. The number of days from b to the next a.

firstDayOfWeekOnAfter :: DayOfWeek -> Day -> Day #

The first day-of-week on or after some day

weekAllDays :: DayOfWeek -> Day -> [Day] #

Returns a week containing the given Day where the first day is the DayOfWeek specified.

Examples:

>>> weekAllDays Sunday (YearMonthDay 2022 02 21)
[YearMonthDay 2022 2 20 .. YearMonthDay 2022 2 26]
>>> weekAllDays Monday (YearMonthDay 2022 02 21)
[YearMonthDay 2022 2 21 .. YearMonthDay 2022 2 27]
>>> weekAllDays Tuesday (YearMonthDay 2022 02 21)
[YearMonthDay 2022 2 15 .. YearMonthDay 2022 2 21]

Since: time-1.12.2

weekFirstDay :: DayOfWeek -> Day -> Day #

Returns the first day of a week containing the given Day.

Examples:

>>> weekFirstDay Sunday (YearMonthDay 2022 02 21)
YearMonthDay 2022 2 20
>>> weekFirstDay Monday (YearMonthDay 2022 02 21)
YearMonthDay 2022 2 21
>>> weekFirstDay Tuesday (YearMonthDay 2022 02 21)
YearMonthDay 2022 2 15

Since: time-1.12.2

weekLastDay :: DayOfWeek -> Day -> Day #

Returns the last day of a week containing the given Day.

Examples:

>>> weekLastDay Sunday (YearMonthDay 2022 02 21)
YearMonthDay 2022 2 26
>>> weekLastDay Monday (YearMonthDay 2022 02 21)
YearMonthDay 2022 2 27
>>> weekLastDay Tuesday (YearMonthDay 2022 02 21)
YearMonthDay 2022 2 21

Since: time-1.12.2

diffTimeToPicoseconds :: DiffTime -> Integer #

Get the number of picoseconds in a DiffTime.

picosecondsToDiffTime :: Integer -> DiffTime #

Create a DiffTime from a number of picoseconds.

secondsToDiffTime :: Integer -> DiffTime #

Create a DiffTime which represents an integral number of seconds.

nominalDiffTimeToSeconds :: NominalDiffTime -> Pico #

Get the seconds in a NominalDiffTime.

Since: time-1.9.1

secondsToNominalDiffTime :: Pico -> NominalDiffTime #

Create a NominalDiffTime from a number of seconds.

Since: time-1.9.1

getTime_resolution :: DiffTime #

The resolution of getSystemTime, getCurrentTime, getPOSIXTime. On UNIX systems this uses clock_getres, which may be wrong on WSL2.

addUTCTime :: NominalDiffTime -> UTCTime -> UTCTime #

addUTCTime a b = a + b

diffUTCTime :: UTCTime -> UTCTime -> NominalDiffTime #

diffUTCTime a b = a - b

formatTime :: FormatTime t => TimeLocale -> String -> t -> String #

Substitute various time-related information for each %-code in the string, as per formatCharacter.

The general form is %<modifier><width><alternate><specifier>, where <modifier>, <width>, and <alternate> are optional.

<modifier>

glibc-style modifiers can be used before the specifier (here marked as z):

%-z
no padding
%_z
pad with spaces
%0z
pad with zeros
%^z
convert to upper case
%#z
convert to lower case (consistently, unlike glibc)

<width>

Width digits can also be used after any modifiers and before the specifier (here marked as z), for example:

%4z
pad to 4 characters (with default padding character)
%_12z
pad with spaces to 12 characters

<alternate>

An optional E character indicates an alternate formatting. Currently this only affects %Z and %z.

%Ez
alternate formatting

<specifier>

For all types (note these three are done by formatTime, not by formatCharacter):

%%
%
%t
tab
%n
newline

TimeZone

For TimeZone (and ZonedTime and UTCTime):

%z
timezone offset in the format ±HHMM
%Ez
timezone offset in the format ±HH:MM
%Z
timezone name (or else offset in the format ±HHMM)
%EZ
timezone name (or else offset in the format ±HH:MM)

LocalTime

For LocalTime (and ZonedTime and UTCTime and UniversalTime):

%c
as dateTimeFmt locale (e.g. %a %b %e %H:%M:%S %Z %Y)

TimeOfDay

For TimeOfDay (and LocalTime and ZonedTime and UTCTime and UniversalTime):

%R
same as %H:%M
%T
same as %H:%M:%S
%X
as timeFmt locale (e.g. %H:%M:%S)
%r
as time12Fmt locale (e.g. %I:%M:%S %p)
%P
day-half of day from (amPm locale), converted to lowercase, am, pm
%p
day-half of day from (amPm locale), AM, PM
%H
hour of day (24-hour), 0-padded to two chars, 00 - 23
%k
hour of day (24-hour), space-padded to two chars, 0 - 23
%I
hour of day-half (12-hour), 0-padded to two chars, 01 - 12
%l
hour of day-half (12-hour), space-padded to two chars, 1 - 12
%M
minute of hour, 0-padded to two chars, 00 - 59
%S
second of minute (without decimal part), 0-padded to two chars, 00 - 60
%q
picosecond of second, 0-padded to twelve chars, 000000000000 - 999999999999.
%Q
decimal point and fraction of second, up to 12 second decimals, without trailing zeros. For a whole number of seconds, %Q omits the decimal point unless padding is specified.

UTCTime and ZonedTime

For UTCTime and ZonedTime:

%s
number of whole seconds since the Unix epoch. For times before the Unix epoch, this is a negative number. Note that in %s.%q and %s%Q the decimals are positive, not negative. For example, 0.9 seconds before the Unix epoch is formatted as -1.1 with %s%Q.

DayOfWeek

For DayOfWeek (and Day and LocalTime and ZonedTime and UTCTime and UniversalTime):

%u
day of week number for Week Date format, 1 (= Monday) - 7 (= Sunday)
%w
day of week number, 0 (= Sunday) - 6 (= Saturday)
%a
day of week, short form (snd from wDays locale), Sun - Sat
%A
day of week, long form (fst from wDays locale), Sunday - Saturday

Month

For Month (and Day and LocalTime and ZonedTime and UTCTime and UniversalTime):

%Y
year, no padding. Note %0Y and %_Y pad to four chars
%y
year of century, 0-padded to two chars, 00 - 99
%C
century, no padding. Note %0C and %_C pad to two chars
%B
month name, long form (fst from months locale), January - December
%b, %h
month name, short form (snd from months locale), Jan - Dec
%m
month of year, 0-padded to two chars, 01 - 12

Day

For Day (and LocalTime and ZonedTime and UTCTime and UniversalTime):

%D
same as %m/%d/%y
%F
same as %Y-%m-%d
%x
as dateFmt locale (e.g. %m/%d/%y)
%d
day of month, 0-padded to two chars, 01 - 31
%e
day of month, space-padded to two chars, 1 - 31
%j
day of year, 0-padded to three chars, 001 - 366
%f
century for Week Date format, no padding. Note %0f and %_f pad to two chars
%V
week of year for Week Date format, 0-padded to two chars, 01 - 53
%U
week of year where weeks start on Sunday (as sundayStartWeek), 0-padded to two chars, 00 - 53
%W
week of year where weeks start on Monday (as mondayStartWeek), 0-padded to two chars, 00 - 53

Duration types

The specifiers for DiffTime, NominalDiffTime, CalendarDiffDays, and CalendarDiffTime are semantically separate from the other types. Specifiers on negative time differences will generally be negative (think rem rather than mod).

NominalDiffTime and DiffTime

Note that a "minute" of DiffTime is simply 60 SI seconds, rather than a minute of civil time. Use NominalDiffTime to work with civil time, ignoring any leap seconds.

For NominalDiffTime and DiffTime:

%w
total whole weeks
%d
total whole days
%D
whole days of week
%h
total whole hours
%H
whole hours of day
%m
total whole minutes
%M
whole minutes of hour
%s
total whole seconds
%Es
total seconds, with decimal point and up to <width> (default 12) decimal places, without trailing zeros. For a whole number of seconds, %Es omits the decimal point unless padding is specified.
%0Es
total seconds, with decimal point and <width> (default 12) decimal places.
%S
whole seconds of minute
%ES
seconds of minute, with decimal point and up to <width> (default 12) decimal places, without trailing zeros. For a whole number of seconds, %ES omits the decimal point unless padding is specified.
%0ES
seconds of minute as two digits, with decimal point and <width> (default 12) decimal places.

CalendarDiffDays

For CalendarDiffDays (and CalendarDiffTime):

%y
total years
%b
total months
%B
months of year
%w
total weeks, not including months
%d
total days, not including months
%D
days of week

CalendarDiffTime

For CalendarDiffTime:

%h
total hours, not including months
%H
hours of day
%m
total minutes, not including months
%M
minutes of hour
%s
total whole seconds, not including months
%Es
total seconds, not including months, with decimal point and up to <width> (default 12) decimal places, without trailing zeros. For a whole number of seconds, %Es omits the decimal point unless padding is specified.
%0Es
total seconds, not including months, with decimal point and <width> (default 12) decimal places.
%S
whole seconds of minute
%ES
seconds of minute, with decimal point and up to <width> (default 12) decimal places, without trailing zeros. For a whole number of seconds, %ES omits the decimal point unless padding is specified.
%0ES
seconds of minute as two digits, with decimal point and <width> (default 12) decimal places.

defaultTimeLocale :: TimeLocale #

Locale representing American usage.

knownTimeZones contains only the ten time-zones mentioned in RFC 822 sec. 5: "UT", "GMT", "EST", "EDT", "CST", "CDT", "MST", "MDT", "PST", "PDT". Note that the parsing functions will regardless parse "UTC", single-letter military time-zones, and +HHMM format.

iso8601DateFormat :: Maybe String -> String #

Construct format string according to ISO-8601.

The Maybe String argument allows to supply an optional time specification. E.g.:

iso8601DateFormat Nothing            == "%Y-%m-%d"           -- i.e. YYYY-MM-DD
iso8601DateFormat (Just "%H:%M:%S")  == "%Y-%m-%dT%H:%M:%S"  -- i.e. YYYY-MM-DDTHH:MM:SS

rfc822DateFormat :: String #

Format string according to RFC822.

parseTimeM #

Arguments

:: (MonadFail m, ParseTime t) 
=> Bool

Accept leading and trailing whitespace?

-> TimeLocale

Time locale.

-> String

Format string.

-> String

Input string.

-> m t

Return the time value, or fail if the input could not be parsed using the given format.

Parses a time value given a format string. Missing information will be derived from 1970-01-01 00:00 UTC (which was a Thursday). Supports the same %-codes as formatTime, including %-, %_ and %0 modifiers, however padding widths are not supported. Case is not significant in the input string. Some variations in the input are accepted:

%z %Ez
accepts any of ±HHMM or ±HH:MM.
%Z %EZ
accepts any string of letters, or any of the formats accepted by %z.
%0Y
accepts exactly four digits.
%0G
accepts exactly four digits.
%0C
accepts exactly two digits.
%0f
accepts exactly two digits.

For example, to parse a date in YYYY-MM-DD format, while allowing the month and date to have optional leading zeros (notice the - modifier used for %m and %d):

Prelude Data.Time> parseTimeM True defaultTimeLocale "%Y-%-m-%-d" "2010-3-04" :: Maybe Day
Just 2010-03-04

parseTimeMultipleM #

Arguments

:: (MonadFail m, ParseTime t) 
=> Bool

Accept leading and trailing whitespace?

-> TimeLocale

Time locale.

-> [(String, String)]

Pairs of (format string, input string).

-> m t

Return the time value, or fail if the input could not be parsed using the given format.

Parses a time value given a list of pairs of format and input. Resulting value is constructed from all provided specifiers.

parseTimeOrError #

Arguments

:: ParseTime t 
=> Bool

Accept leading and trailing whitespace?

-> TimeLocale

Time locale.

-> String

Format string.

-> String

Input string.

-> t

The time value.

Parse a time value given a format string. Fails if the input could not be parsed using the given format. See parseTimeM for details.

readPTime #

Arguments

:: ParseTime t 
=> Bool

Accept leading whitespace?

-> TimeLocale

Time locale.

-> String

Format string

-> ReadP t 

Parse a time value given a format string. See parseTimeM for details.

readSTime #

Arguments

:: ParseTime t 
=> Bool

Accept leading whitespace?

-> TimeLocale

Time locale.

-> String

Format string

-> ReadS t 

Parse a time value given a format string. See parseTimeM for details.

scaleCalendarDiffTime :: Integer -> CalendarDiffTime -> CalendarDiffTime #

Scale by a factor. Note that scaleCalendarDiffTime (-1) will not perfectly invert a duration, due to variable month lengths.

addLocalTime :: NominalDiffTime -> LocalTime -> LocalTime #

addLocalTime a b = a + b

diffLocalTime :: LocalTime -> LocalTime -> NominalDiffTime #

diffLocalTime a b = a - b

localTimeToUT1 :: Rational -> LocalTime -> UniversalTime #

Get the UT1 time of a local time on a particular meridian (in degrees, positive is East).

localTimeToUTC :: TimeZone -> LocalTime -> UTCTime #

Get the UTC time of a local time in a time zone.

ut1ToLocalTime :: Rational -> UniversalTime -> LocalTime #

Get the local time of a UT1 time on a particular meridian (in degrees, positive is East).

utcToLocalTime :: TimeZone -> UTCTime -> LocalTime #

Get the local time of a UTC time in a time zone.

dayFractionToTimeOfDay :: Rational -> TimeOfDay #

Get the time of day given the fraction of a day since midnight.

daysAndTimeOfDayToTime :: Integer -> TimeOfDay -> NominalDiffTime #

Convert a count of days and a time of day since midnight into a period of time.

localToUTCTimeOfDay :: TimeZone -> TimeOfDay -> (Integer, TimeOfDay) #

Convert a time of day in some timezone to a time of day in UTC, together with a day adjustment.

midday :: TimeOfDay #

Hour twelve

midnight :: TimeOfDay #

Hour zero

timeOfDayToDayFraction :: TimeOfDay -> Rational #

Get the fraction of a day since midnight given a time of day.

timeOfDayToTime :: TimeOfDay -> DiffTime #

Get the time since midnight for a given time of day.

timeToDaysAndTimeOfDay :: NominalDiffTime -> (Integer, TimeOfDay) #

Convert a period of time into a count of days and a time of day since midnight. The time of day will never have a leap second.

timeToTimeOfDay :: DiffTime -> TimeOfDay #

Get the time of day given a time since midnight. Time more than 24h will be converted to leap-seconds.

utcToLocalTimeOfDay :: TimeZone -> TimeOfDay -> (Integer, TimeOfDay) #

Convert a time of day in UTC to a time of day in some timezone, together with a day adjustment.

getCurrentTimeZone :: IO TimeZone #

Get the configured time-zone for the current time.

getTimeZone :: UTCTime -> IO TimeZone #

Get the configured time-zone for a given time (varying as per summertime adjustments).

On Unix systems the output of this function depends on:

  1. The value of TZ environment variable (if set)
  2. The system time zone (usually configured by /etc/localtime symlink)

For details see tzset(3) and localtime(3).

Example:

> let t = UTCTime (fromGregorian 2021 7 1) 0
> getTimeZone t
CEST
> setEnv "TZ" "America/New_York" >> getTimeZone t
EDT
> setEnv "TZ" "Europe/Berlin" >> getTimeZone t
CEST

On Windows systems the output of this function depends on:

  1. The value of TZ environment variable (if set). See here for how Windows interprets this variable.
  2. The system time zone, configured in Settings

hoursToTimeZone :: Int -> TimeZone #

Create a nameless non-summer timezone for this number of hours.

minutesToTimeZone :: Int -> TimeZone #

Create a nameless non-summer timezone for this number of minutes.

timeZoneOffsetString :: TimeZone -> String #

Text representing the offset of this timezone, such as "-0800" or "+0400" (like %z in formatTime).

timeZoneOffsetString' :: Maybe Char -> TimeZone -> String #

Text representing the offset of this timezone, such as "-0800" or "+0400" (like %z in formatTime), with arbitrary padding.

utc :: TimeZone #

The UTC time zone.

data CalendarDiffDays #

Constructors

CalendarDiffDays 

Instances

Instances details
FromJSON CalendarDiffDays 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON CalendarDiffDays 
Instance details

Defined in Data.Aeson.Types.ToJSON

NFData CalendarDiffDays 
Instance details

Defined in Data.Time.Calendar.CalendarDiffDays

Methods

rnf :: CalendarDiffDays -> () #

Monoid CalendarDiffDays

Additive

Instance details

Defined in Data.Time.Calendar.CalendarDiffDays

Semigroup CalendarDiffDays

Additive

Instance details

Defined in Data.Time.Calendar.CalendarDiffDays

Data CalendarDiffDays

Since: time-1.9.2

Instance details

Defined in Data.Time.Calendar.CalendarDiffDays

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CalendarDiffDays -> c CalendarDiffDays #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CalendarDiffDays #

toConstr :: CalendarDiffDays -> Constr #

dataTypeOf :: CalendarDiffDays -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CalendarDiffDays) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CalendarDiffDays) #

gmapT :: (forall b. Data b => b -> b) -> CalendarDiffDays -> CalendarDiffDays #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CalendarDiffDays -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CalendarDiffDays -> r #

gmapQ :: (forall d. Data d => d -> u) -> CalendarDiffDays -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CalendarDiffDays -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CalendarDiffDays -> m CalendarDiffDays #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CalendarDiffDays -> m CalendarDiffDays #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CalendarDiffDays -> m CalendarDiffDays #

Show CalendarDiffDays 
Instance details

Defined in Data.Time.Calendar.CalendarDiffDays

Eq CalendarDiffDays 
Instance details

Defined in Data.Time.Calendar.CalendarDiffDays

ISO8601 CalendarDiffDays

PyYmMdD (ISO 8601:2004(E) sec. 4.4.3.2)

Instance details

Defined in Data.Time.Format.ISO8601

class Ord p => DayPeriod p where #

The class of types which can be represented as a period of days.

Since: time-1.12.1

Methods

periodFirstDay :: p -> Day #

Returns the first Day in a period of days.

periodLastDay :: p -> Day #

Returns the last Day in a period of days.

dayPeriod :: Day -> p #

Get the period this day is in.

Instances

Instances details
DayPeriod Day 
Instance details

Defined in Data.Time.Calendar.Days

DayPeriod Month 
Instance details

Defined in Data.Time.Calendar.Month

DayPeriod Quarter 
Instance details

Defined in Data.Time.Calendar.Quarter

type DayOfMonth = Int #

Day of month, in range 1 to 31.

type MonthOfYear = Int #

Month of year, in range 1 (January) to 12 (December).

newtype UniversalTime #

The Modified Julian Date is the day with the fraction of the day, measured from UT midnight. It's used to represent UT1, which is time as measured by the earth's rotation, adjusted for various wobbles.

Constructors

ModJulianDate 

Instances

Instances details
NFData UniversalTime 
Instance details

Defined in Data.Time.Clock.Internal.UniversalTime

Methods

rnf :: UniversalTime -> () #

Buildable UniversalTime 
Instance details

Defined in Formatting.Buildable

Data UniversalTime 
Instance details

Defined in Data.Time.Clock.Internal.UniversalTime

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UniversalTime -> c UniversalTime #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UniversalTime #

toConstr :: UniversalTime -> Constr #

dataTypeOf :: UniversalTime -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UniversalTime) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UniversalTime) #

gmapT :: (forall b. Data b => b -> b) -> UniversalTime -> UniversalTime #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UniversalTime -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UniversalTime -> r #

gmapQ :: (forall d. Data d => d -> u) -> UniversalTime -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UniversalTime -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UniversalTime -> m UniversalTime #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UniversalTime -> m UniversalTime #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UniversalTime -> m UniversalTime #

Eq UniversalTime 
Instance details

Defined in Data.Time.Clock.Internal.UniversalTime

Ord UniversalTime 
Instance details

Defined in Data.Time.Clock.Internal.UniversalTime

class FormatTime t #

Minimal complete definition

formatCharacter

Instances

Instances details
FormatTime DotNetTime 
Instance details

Defined in Data.Aeson.Types.Internal

class ParseTime t #

The class of types which can be parsed given a UNIX-style time format string.

Minimal complete definition

parseTimeSpecifier, buildTime

data CalendarDiffTime #

Instances

Instances details
FromJSON CalendarDiffTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON CalendarDiffTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

NFData CalendarDiffTime 
Instance details

Defined in Data.Time.LocalTime.Internal.CalendarDiffTime

Methods

rnf :: CalendarDiffTime -> () #

Monoid CalendarDiffTime

Additive

Instance details

Defined in Data.Time.LocalTime.Internal.CalendarDiffTime

Semigroup CalendarDiffTime

Additive

Instance details

Defined in Data.Time.LocalTime.Internal.CalendarDiffTime

Data CalendarDiffTime

Since: time-1.9.2

Instance details

Defined in Data.Time.LocalTime.Internal.CalendarDiffTime

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CalendarDiffTime -> c CalendarDiffTime #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CalendarDiffTime #

toConstr :: CalendarDiffTime -> Constr #

dataTypeOf :: CalendarDiffTime -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CalendarDiffTime) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CalendarDiffTime) #

gmapT :: (forall b. Data b => b -> b) -> CalendarDiffTime -> CalendarDiffTime #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CalendarDiffTime -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CalendarDiffTime -> r #

gmapQ :: (forall d. Data d => d -> u) -> CalendarDiffTime -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CalendarDiffTime -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CalendarDiffTime -> m CalendarDiffTime #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CalendarDiffTime -> m CalendarDiffTime #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CalendarDiffTime -> m CalendarDiffTime #

Show CalendarDiffTime 
Instance details

Defined in Data.Time.LocalTime.Internal.CalendarDiffTime

Eq CalendarDiffTime 
Instance details

Defined in Data.Time.LocalTime.Internal.CalendarDiffTime

ISO8601 CalendarDiffTime

PyYmMdDThHmMs[.sss]S (ISO 8601:2004(E) sec. 4.4.3.2)

Instance details

Defined in Data.Time.Format.ISO8601

data TimeZone #

A TimeZone is a whole number of minutes offset from UTC, together with a name and a "just for summer" flag.

Constructors

TimeZone 

Fields

Instances

Instances details
NFData TimeZone 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeZone

Methods

rnf :: TimeZone -> () #

Buildable TimeZone 
Instance details

Defined in Formatting.Buildable

Methods

build :: TimeZone -> Builder #

Data TimeZone 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeZone

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TimeZone -> c TimeZone #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TimeZone #

toConstr :: TimeZone -> Constr #

dataTypeOf :: TimeZone -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TimeZone) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TimeZone) #

gmapT :: (forall b. Data b => b -> b) -> TimeZone -> TimeZone #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TimeZone -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TimeZone -> r #

gmapQ :: (forall d. Data d => d -> u) -> TimeZone -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TimeZone -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TimeZone -> m TimeZone #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TimeZone -> m TimeZone #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TimeZone -> m TimeZone #

Show TimeZone

This only shows the time zone name, or offset if the name is empty.

Instance details

Defined in Data.Time.LocalTime.Internal.TimeZone

Eq TimeZone 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeZone

Ord TimeZone 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeZone

ISO8601 TimeZone

±hh:mm (ISO 8601:2004(E) sec. 4.2.5.1 extended format)

Instance details

Defined in Data.Time.Format.ISO8601

data ZonedTime #

A local time together with a time zone.

There is no Eq instance for ZonedTime. If you want to compare local times, use zonedTimeToLocalTime. If you want to compare absolute times, use zonedTimeToUTC.

Instances

Instances details
FromJSON ZonedTime

Supported string formats:

YYYY-MM-DD HH:MMZ YYYY-MM-DD HH:MM:SSZ YYYY-MM-DD HH:MM:SS.SSSZ

The first space may instead be a T, and the second space is optional. The Z represents UTC. The Z may be replaced with a time zone offset of the form +0000 or -08:00, where the first two digits are hours, the : is optional and the second two digits (also optional) are minutes.

Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey ZonedTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON ZonedTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey ZonedTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

NFData ZonedTime 
Instance details

Defined in Data.Time.LocalTime.Internal.ZonedTime

Methods

rnf :: ZonedTime -> () #

Buildable ZonedTime 
Instance details

Defined in Formatting.Buildable

Methods

build :: ZonedTime -> Builder #

Data ZonedTime 
Instance details

Defined in Data.Time.LocalTime.Internal.ZonedTime

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ZonedTime -> c ZonedTime #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ZonedTime #

toConstr :: ZonedTime -> Constr #

dataTypeOf :: ZonedTime -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ZonedTime) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ZonedTime) #

gmapT :: (forall b. Data b => b -> b) -> ZonedTime -> ZonedTime #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ZonedTime -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ZonedTime -> r #

gmapQ :: (forall d. Data d => d -> u) -> ZonedTime -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ZonedTime -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ZonedTime -> m ZonedTime #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ZonedTime -> m ZonedTime #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ZonedTime -> m ZonedTime #

Show ZonedTime

For the time zone, this only shows the name, or offset if the name is empty.

Instance details

Defined in Data.Time.LocalTime.Internal.ZonedTime

FromFormKey ZonedTime 
Instance details

Defined in Web.Internal.FormUrlEncoded

ToFormKey ZonedTime 
Instance details

Defined in Web.Internal.FormUrlEncoded

Methods

toFormKey :: ZonedTime -> Text #

ISO8601 ZonedTime

yyyy-mm-ddThh:mm:ss[.sss]±hh:mm (ISO 8601:2004(E) sec. 4.3.2 extended format)

Instance details

Defined in Data.Time.Format.ISO8601

assertNotNull :: forall {k} (b :: k) (r :: EffectRow). GlobalAssert b r => Relation -> [SExp] -> Sem r () #

Fail if any of the given expressions/columns have any NULL values.

data WithinSet a #

Constructors

FromToRange a a 
ValuesList [a] 

Instances

Instances details
Generic (WithinSet a) # 
Instance details

Defined in Napkin.Run.Effects.Hooks.Types

Associated Types

type Rep (WithinSet a) 
Instance details

Defined in Napkin.Run.Effects.Hooks.Types

type Rep (WithinSet a) = D1 ('MetaData "WithinSet" "Napkin.Run.Effects.Hooks.Types" "napkin-api-2.0.0-GKif1wVpGtsJEy6X9JqPgn" 'False) (C1 ('MetaCons "FromToRange" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)) :+: C1 ('MetaCons "ValuesList" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [a])))

Methods

from :: WithinSet a -> Rep (WithinSet a) x #

to :: Rep (WithinSet a) x -> WithinSet a #

Show a => Show (WithinSet a) # 
Instance details

Defined in Napkin.Run.Effects.Hooks.Types

Eq a => Eq (WithinSet a) # 
Instance details

Defined in Napkin.Run.Effects.Hooks.Types

Methods

(==) :: WithinSet a -> WithinSet a -> Bool #

(/=) :: WithinSet a -> WithinSet a -> Bool #

type Rep (WithinSet a) # 
Instance details

Defined in Napkin.Run.Effects.Hooks.Types

type Rep (WithinSet a) = D1 ('MetaData "WithinSet" "Napkin.Run.Effects.Hooks.Types" "napkin-api-2.0.0-GKif1wVpGtsJEy6X9JqPgn" 'False) (C1 ('MetaCons "FromToRange" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)) :+: C1 ('MetaCons "ValuesList" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [a])))

assertAllValuesWithin :: forall {k} (b :: k) (r :: EffectRow) a. (GlobalAssert b r, Val a) => Relation -> SExp -> WithinSet a -> Sem r () #

Fail if the table column contains some values beyond the specified (inclusive) range.

assertAllValuesWithinT :: forall {k} (b :: k) (r :: EffectRow) a. (Assert b r, Val a) => SExp -> WithinSet a -> Sem r () #

Fail if the target column contains some values beyond the specified (inclusive) range.

assertAnswerConst :: forall {k} a (b :: k) (r :: EffectRow). (GlobalAssert b r, Real a, Show a, Val a) => CompareCount -> Query -> a -> Sem r () #

Compares result of a query against a constant value using comparison over Real numbers, fails if check does not hold.

assertAnswerConstT :: forall {k} a (b :: k) (r :: EffectRow) q. (Assert b r, Real a, Show a, Val a) => CompareCount -> Q q -> a -> Sem r () #

Compares result of a query against a constant value using comparison over Real numbers, fails if check does not hold.

assertAnswerEq :: forall {k} a (b :: k) (r :: EffectRow). (Eq a, GlobalAssert b r, Show a, Val a) => Query -> a -> Sem r () #

Compares result of a query against a constant value using comparison over Eq constraint, fails if check does not hold.

assertAnswerEqT :: forall {k} a (b :: k) (r :: EffectRow) q. (Assert b r, Eq a, Show a, Val a) => Q q -> a -> Sem r () #

Compares result of a query against a constant value using comparison over Eq constraint, fails if check does not hold.

assertAnswers :: forall {k} a (b :: k) (r :: EffectRow). (GlobalAssert b r, Real a, Show a, Val a) => CompareCount -> Query -> Query -> Sem r () #

Compares result of a two queries, fails if check does not hold.

assertAnyPresent :: forall {k} (b :: k) (r :: EffectRow). GlobalAssert b r => SExp -> Relation -> Sem r () #

Checks if any values are present in given column.

assertAnyPresentT :: forall {k} (b :: k) (r :: EffectRow). Assert b r => SExp -> Sem r () #

Checks if any values are present in given column.

assertAnyValuesWithin :: forall {k} (b :: k) (r :: EffectRow) a. (GlobalAssert b r, Val a) => Relation -> SExp -> WithinSet a -> Sem r () #

Fail if the table column contains no values from the specified (inclusive) range.

assertAnyValuesWithinT :: forall {k} (b :: k) (r :: EffectRow) a. (Assert b r, Val a) => SExp -> WithinSet a -> Sem r () #

Fail if the target column contains no values from the specified (inclusive) range.

assertCardinalities :: forall {k} (b :: k) (r :: EffectRow). GlobalAssert b r => CompareCount -> Relation -> SExp -> Relation -> SExp -> Sem r () #

Checks the cardinalities of two columns that may be sourced from different tables.

assertCardinalitiesT :: forall {k} (b :: k) (r :: EffectRow). Assert b r => CompareCount -> SExp -> Relation -> SExp -> Sem r () #

Checks the cardinalities of two columns that may be sourced from different tables.

assertCount :: forall {k} (b :: k) (r :: EffectRow). GlobalAssert b r => CompareCount -> Relation -> Relation -> Sem r () #

Compares counts of two relations, fails if check does not hold.

assertCountConst :: forall {k} (b :: k) (r :: EffectRow). GlobalAssert b r => CompareCount -> Relation -> Integer -> Sem r () #

Compares counts of relation against a constant value, fails if check does not hold.

assertCountConstT :: forall {k} (b :: k) (r :: EffectRow). Assert b r => CompareCount -> Integer -> Sem r () #

Compares counts of target against a constant value, fails if check does not hold.

assertCountT :: forall {k} (b :: k) (r :: EffectRow). Assert b r => CompareCount -> Relation -> Sem r () #

Compares counts of target and a relation, fails if check does not hold.

assertExpression :: forall {k} (b :: k) (r :: EffectRow). GlobalAssert b r => Relation -> SExp -> Sem r () #

Assert expression is true

assertExpressionT :: forall {k} (b :: k) (r :: EffectRow). Assert b r => SExp -> Sem r () #

Assert expression is true

assertNotNullT :: forall {k} (b :: k) (r :: EffectRow). Assert b r => [SExp] -> Sem r () #

Fail if any of the given expressions/columns have any NULL values.

assertNoValuesWithin :: forall {k} (b :: k) (r :: EffectRow) a. (GlobalAssert b r, Val a) => Relation -> SExp -> WithinSet a -> Sem r () #

Fail if the table column contains some values within the specified (inclusive) range.

assertNoValuesWithinT :: forall {k} (b :: k) (r :: EffectRow) a. (Assert b r, Val a) => SExp -> WithinSet a -> Sem r () #

Fail if the target column contains some values within the specified (inclusive) range.

assertUniqueBy :: forall {k} (b :: k) (r :: EffectRow). GlobalAssert b r => Relation -> [Selected SExp] -> Sem r () #

Fail if there are non-unique rows in the result.

assertUniqueByCap :: forall {k} (b :: k) (r :: EffectRow). GlobalAssert b r => CountTolerance -> Relation -> [Selected SExp] -> Sem r () #

Checks if number of duplicate rows in a table is within certain tolerance.

assertUniqueByCapT :: forall {k} (b :: k) (r :: EffectRow). Assert b r => CountTolerance -> [Selected SExp] -> Sem r () #

Checks if number of duplicate rows in a target is within certain tolerance.

assertUniqueByT :: forall {k} (b :: k) (r :: EffectRow). Assert b r => [Selected SExp] -> Sem r () #

Fail if there are non-unique rows in the result.

assertUniqueByWhere :: forall {k} (b :: k) (r :: EffectRow). GlobalAssert b r => Relation -> PredicateSExp -> [Selected SExp] -> Sem r () #

Fail if there are non-unique rows in the result for the multiple predicate and column names.

assertUniqueByWhereT :: forall {k} (b :: k) (r :: EffectRow). Assert b r => PredicateSExp -> [Selected SExp] -> Sem r () #

Fail if there are non-unique rows in the result for the multiple predicate and column names.

assertMultipleCardinalities :: forall {k} (b :: k) (r :: EffectRow). GlobalAssert b r => CompareCount -> Relation -> SExp -> [(Relation, SExp)] -> Sem r () #

Checks the cardinalities of multiple columns that may be sourced from many different tables.

assertMultipleCardinalitiesT :: forall {k} (b :: k) (r :: EffectRow). Assert b r => CompareCount -> SExp -> [(Relation, SExp)] -> Sem r () #

Checks the cardinalities of multiple columns that may be sourced from many different tables.

assertMultipleColumnsCardinalities :: forall {k} (b :: k) (r :: EffectRow). GlobalAssert b r => CompareCount -> Relation -> [Selected SExp] -> Relation -> [Selected SExp] -> Sem r () #

Checks the cardinalities of two columns that may be sourced from different tables.

splitIfUnionBy :: forall b (r :: EffectRow) a. Members '[SqlWrite b :: (Type -> Type) -> Type -> Type, RecreateTable b :: (Type -> Type) -> Type -> Type] r => Int -> Sem r a -> Sem r a #

Intercept CreateTableAs calls and try to split queries into CreateTableAs + multiple InsertInto when query contains unions

incrementalInsertByPK #

Arguments

:: forall b (r :: EffectRow). Members '[SqlWrite b :: (Type -> Type) -> Type -> Type, SqlRead b :: (Type -> Type) -> Type -> Type, Time :: (Type -> Type) -> Type -> Type, Reader TargetName, Reader HiddenDependencies, RecreateTable b :: (Type -> Type) -> Type -> Type] r 
=> (Day -> Sem r Query)

Query with cutoff

-> SExp

Primary key column

-> Day

Starting timestamp value in fresh create

-> Integer

Num days to look back in each update

-> BackendTableMeta b 
-> Sem r () 

incrementalByTimeRawSql #

Arguments

:: forall b (r :: EffectRow). (Default (BackendTableMeta b), HasBackendSchemaField b, Members '[SqlWrite b :: (Type -> Type) -> Type -> Type, SqlRead b :: (Type -> Type) -> Type -> Type, Time :: (Type -> Type) -> Type -> Type, Reader TargetName, Reader HiddenDependencies, Reader HiddenArtifacts, RecreateTable b :: (Type -> Type) -> Type -> Type, SqlParse :: (Type -> Type) -> Type -> Type, SqlRender :: (Type -> Type) -> Type -> Type, LoadQuery :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Output ExtraDependencies :: (Type -> Type) -> Type -> Type, Input TemporaryTableName :: (Type -> Type) -> Type -> Type, Input MetaArguments :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r) 
=> FilePath

Local SQL file

-> SqlTemplateVariables

Any additional variables you want to bind

-> [ColumnName]

Names of columns to keep on schema change

-> SExp

Timestamp column in the destination table

-> Day

Start time when creating table fresh

-> Integer

N days to go back

-> BackendTableMeta b 
-> Sem r () 

incrementalByTimeCreateAction #

Arguments

:: forall b (r :: EffectRow). (Default (BackendTableMeta b), HasBackendSchemaField b, Members '[SqlWrite b :: (Type -> Type) -> Type -> Type, SqlRead b :: (Type -> Type) -> Type -> Type, Time :: (Type -> Type) -> Type -> Type, Input TemporaryTableName :: (Type -> Type) -> Type -> Type, Reader TargetName, Input MetaArguments :: (Type -> Type) -> Type -> Type, Reader HiddenDependencies, Reader HiddenArtifacts, RecreateTable b :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r) 
=> [ColumnName]

Names of columns to keep on schema change

-> (Day -> Sem r Query)

Table query

-> Day

Start time when creating table fresh

-> (Day -> SExp)

Cutoff SExp

-> Integer

N days to go back

-> BackendTableMeta b 
-> Sem r () 

loadSqlFileWithCutoff :: forall (r :: EffectRow). Members '[SqlParse :: (Type -> Type) -> Type -> Type, SqlRender :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, LoadQuery :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r => FilePath -> SqlTemplateVariables -> Day -> Sem r Query #

copyData :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => CopySource -> CopyDestination -> Sem r () #

copyData' :: forall b (r :: EffectRow). Member (SqlWrite b :: (Type -> Type) -> Type -> Type) r => InsertColumnsList -> CopySource -> CopyDestination -> Sem r () #

longToWideAuto #

Arguments

:: forall b (r :: EffectRow). Members '[SqlWrite b :: (Type -> Type) -> Type -> Type, SqlRead b :: (Type -> Type) -> Type -> Type, Reader HiddenDependencies, Reader TargetName, RecreateTable b :: (Type -> Type) -> Type -> Type] r 
=> Ref Table

the long table from which this table will be derived- make sure it is also listed in the dependencies

-> (SExp -> SExp)

Aggregate function to use

-> [Alias SExp]

the key columns which will remain in the resultant wide version as-is

-> SExp

the column name in the long table which will be split into multiple columns in the wide version

-> SExp

the column in the long table which will be emitted from matching on the new columns

-> (Value -> Ref SExp)

a function to generate column names from the values found in the database

-> SpecTarget b

standard table options

-> Sem r () 

combineTables #

Arguments

:: forall b (r :: EffectRow). (HasBackendSchemaField b, Members '[SqlWrite b :: (Type -> Type) -> Type -> Type, SqlRead b :: (Type -> Type) -> Type -> Type, Output ExtraDependencies :: (Type -> Type) -> Type -> Type, Reader TargetName, RecreateTable b :: (Type -> Type) -> Type -> Type, Input TemporaryTableName :: (Type -> Type) -> Type -> Type, Reader QueryTransformer] r) 
=> SpecTarget b 
-> (Query -> Query)

Any final optional query modification

-> [Relation]

List of sources to combine

-> Sem r () 

recreateTarget :: forall b (r :: EffectRow). Members '[RecreateTable b :: (Type -> Type) -> Type -> Type, Reader TargetName, SqlWrite b :: (Type -> Type) -> Type -> Type] r => SpecTarget b -> NonEmpty Query -> Sem r () #

pattern IncrementalReset :: (Eq a, IsString a) => a #

enforceSchema :: forall b (r :: EffectRow). (Eq (BackendSchemaField b), HasBackendSchemaField b, Members '[Input TemporaryTableName :: (Type -> Type) -> Type -> Type, SqlRead b :: (Type -> Type) -> Type -> Type, SqlWrite b :: (Type -> Type) -> Type -> Type, FatalError :: (Type -> Type) -> Type -> Type, Log :: (Type -> Type) -> Type -> Type] r) => SchemaMigrationOptions -> Ref Table -> [BackendSchemaField b] -> Sem r () #

data SchemaMigrationOptions #

Instances

Instances details
Generic SchemaMigrationOptions # 
Instance details

Defined in Napkin.Run.Effects.Programs

Associated Types

type Rep SchemaMigrationOptions 
Instance details

Defined in Napkin.Run.Effects.Programs

type Rep SchemaMigrationOptions = D1 ('MetaData "SchemaMigrationOptions" "Napkin.Run.Effects.Programs" "napkin-api-2.0.0-GKif1wVpGtsJEy6X9JqPgn" 'False) (C1 ('MetaCons "SchemaMigrationOptions" 'PrefixI 'True) (S1 ('MetaSel ('Just "dropColumnsPolicy") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (ColumnPolicy DroppedColumnPolicy)) :*: S1 ('MetaSel ('Just "addColumnsPolicy") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (ColumnPolicy AddedColumnPolicy))))
Show SchemaMigrationOptions # 
Instance details

Defined in Napkin.Run.Effects.Programs

Eq SchemaMigrationOptions # 
Instance details

Defined in Napkin.Run.Effects.Programs

type Rep SchemaMigrationOptions # 
Instance details

Defined in Napkin.Run.Effects.Programs

type Rep SchemaMigrationOptions = D1 ('MetaData "SchemaMigrationOptions" "Napkin.Run.Effects.Programs" "napkin-api-2.0.0-GKif1wVpGtsJEy6X9JqPgn" 'False) (C1 ('MetaCons "SchemaMigrationOptions" 'PrefixI 'True) (S1 ('MetaSel ('Just "dropColumnsPolicy") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (ColumnPolicy DroppedColumnPolicy)) :*: S1 ('MetaSel ('Just "addColumnsPolicy") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (ColumnPolicy AddedColumnPolicy))))

data AddedColumnPolicy #

Constructors

ForbidAdding 
AllowAdding 

Instances

Instances details
Bounded AddedColumnPolicy # 
Instance details

Defined in Napkin.Run.Effects.Programs

Enum AddedColumnPolicy # 
Instance details

Defined in Napkin.Run.Effects.Programs

Generic AddedColumnPolicy # 
Instance details

Defined in Napkin.Run.Effects.Programs

Associated Types

type Rep AddedColumnPolicy 
Instance details

Defined in Napkin.Run.Effects.Programs

type Rep AddedColumnPolicy = D1 ('MetaData "AddedColumnPolicy" "Napkin.Run.Effects.Programs" "napkin-api-2.0.0-GKif1wVpGtsJEy6X9JqPgn" 'False) (C1 ('MetaCons "ForbidAdding" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "AllowAdding" 'PrefixI 'False) (U1 :: Type -> Type))
Show AddedColumnPolicy # 
Instance details

Defined in Napkin.Run.Effects.Programs

Eq AddedColumnPolicy # 
Instance details

Defined in Napkin.Run.Effects.Programs

type Rep AddedColumnPolicy # 
Instance details

Defined in Napkin.Run.Effects.Programs

type Rep AddedColumnPolicy = D1 ('MetaData "AddedColumnPolicy" "Napkin.Run.Effects.Programs" "napkin-api-2.0.0-GKif1wVpGtsJEy6X9JqPgn" 'False) (C1 ('MetaCons "ForbidAdding" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "AllowAdding" 'PrefixI 'False) (U1 :: Type -> Type))

data DroppedColumnPolicy #

Instances

Instances details
Bounded DroppedColumnPolicy # 
Instance details

Defined in Napkin.Run.Effects.Programs

Enum DroppedColumnPolicy # 
Instance details

Defined in Napkin.Run.Effects.Programs

Generic DroppedColumnPolicy # 
Instance details

Defined in Napkin.Run.Effects.Programs

Associated Types

type Rep DroppedColumnPolicy 
Instance details

Defined in Napkin.Run.Effects.Programs

type Rep DroppedColumnPolicy = D1 ('MetaData "DroppedColumnPolicy" "Napkin.Run.Effects.Programs" "napkin-api-2.0.0-GKif1wVpGtsJEy6X9JqPgn" 'False) (C1 ('MetaCons "ForbidDropping" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "KeepDropped" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "AllowDropping" 'PrefixI 'False) (U1 :: Type -> Type)))
Show DroppedColumnPolicy # 
Instance details

Defined in Napkin.Run.Effects.Programs

Eq DroppedColumnPolicy # 
Instance details

Defined in Napkin.Run.Effects.Programs

type Rep DroppedColumnPolicy # 
Instance details

Defined in Napkin.Run.Effects.Programs

type Rep DroppedColumnPolicy = D1 ('MetaData "DroppedColumnPolicy" "Napkin.Run.Effects.Programs" "napkin-api-2.0.0-GKif1wVpGtsJEy6X9JqPgn" 'False) (C1 ('MetaCons "ForbidDropping" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "KeepDropped" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "AllowDropping" 'PrefixI 'False) (U1 :: Type -> Type)))

data ColumnPolicy a #

Constructors

ColumnPolicy 

Instances

Instances details
Generic (ColumnPolicy a) # 
Instance details

Defined in Napkin.Run.Effects.Programs

Associated Types

type Rep (ColumnPolicy a) 
Instance details

Defined in Napkin.Run.Effects.Programs

type Rep (ColumnPolicy a) = D1 ('MetaData "ColumnPolicy" "Napkin.Run.Effects.Programs" "napkin-api-2.0.0-GKif1wVpGtsJEy6X9JqPgn" 'False) (C1 ('MetaCons "ColumnPolicy" 'PrefixI 'True) (S1 ('MetaSel ('Just "defaultPolicy") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "columnOverrides") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Map Text a))))

Methods

from :: ColumnPolicy a -> Rep (ColumnPolicy a) x #

to :: Rep (ColumnPolicy a) x -> ColumnPolicy a #

Show a => Show (ColumnPolicy a) # 
Instance details

Defined in Napkin.Run.Effects.Programs

Eq a => Eq (ColumnPolicy a) # 
Instance details

Defined in Napkin.Run.Effects.Programs

type Rep (ColumnPolicy a) # 
Instance details

Defined in Napkin.Run.Effects.Programs

type Rep (ColumnPolicy a) = D1 ('MetaData "ColumnPolicy" "Napkin.Run.Effects.Programs" "napkin-api-2.0.0-GKif1wVpGtsJEy6X9JqPgn" 'False) (C1 ('MetaCons "ColumnPolicy" 'PrefixI 'True) (S1 ('MetaSel ('Just "defaultPolicy") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "columnOverrides") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Map Text a))))

pattern AddColumnsList :: (Eq a, IsString a) => a #

pattern AddColumnsPolicy :: (Eq a, IsString a) => a #

pattern DropColumnsList :: (Eq a, IsString a) => a #

pattern DropColumnsPolicy :: (Eq a, IsString a) => a #

spec :: SpecTableName -> TableSpec b #

shorthand for starting specs, use lenses to then update parts

ctaMeta :: forall b f. Functor f => (BackendTableMeta b -> f (BackendTableMeta b)) -> CreateTableAs b -> f (CreateTableAs b) #

ctaName :: forall b f. Functor f => (SpecTableName -> f SpecTableName) -> CreateTableAs b -> f (CreateTableAs b) #

ctaQuery :: forall b f. Functor f => (Query -> f Query) -> CreateTableAs b -> f (CreateTableAs b) #

specSplitIfUnion :: TableSpec b0 -> TableSpec b0 #

Split UNION queries and insert each individually.

specSplitIfUnionBy :: Int -> TableSpec b0 -> TableSpec b0 #

Split a top level UNION based query table definition into individual insert-based queries in chunks of n.

specIncrementalByPK #

Arguments

:: (Day -> CreateTableAs b)

Make me a query given a date cutoff

-> SExp

Expression that produces the identity/primary key for this table

-> Day

A start date if the table needs to be freshly created

-> Integer

# of days to go back and refresh each time update is run

-> TableSpec b 

specIncrementalByTime #

Arguments

:: (Default (BackendTableMeta b), HasBackendSchemaField b) 
=> [Text]

Columns to keep on schema change

-> (Day -> CreateTableAs b)

How to create/form the target table with data newer than the given cutoff date

-> (Day -> SExp)

Filter in (DELETE WHERE) to be used when deleting data newer than the given cutoff date in the target table.

-> Day

Overall start date to use when starting fresh

-> Integer

Number of days to go back and refresh each time update is run

-> [Ref Table]

Custom additional dependencies to be included (legacy)

-> TableSpec b 

specIncrementalByTimeRawSql #

Arguments

:: (Default (BackendTableMeta b), HasBackendSchemaField b) 
=> SpecTableName

Name of the backend, required for sql rendering

-> BackendTableMeta b

Any backend specific table options

-> [Ref Table]

Table's dependencies

-> FilePath

Local SQL file

-> SqlTemplateVariables

Any additional variables you want to bind

-> [Text]

Columns to keep on schema change

-> SExp

Timestamp column in the destination table

-> Day

Start time when creating table fresh

-> Integer

N days to go bac

-> TableSpec b 

rawSqlSpec :: SpecTableName -> SpecTarget b -> FilePath -> [Ref Table] -> TableSpec b #

Read a file that contains raw SQL query code that can be used to instantiate a table.

rawSqlMustacheSpec :: SpecTableName -> SpecTarget b -> FilePath -> SqlTemplateVariables -> [Ref Table] -> TableSpec b #

Same as rawSqlSpec but allows for mustache templating inside of the raw SQL file.

longToWideAutoSpec #

Arguments

:: SpecTableName

the new table to create

-> Ref Table

the long table from which this table will be derived- make sure it is also listed in the dependencies

-> (SExp -> SExp)

Aggregate function

-> [Alias SExp]

the key columns which will remain in the resultant wide version as-is

-> SExp

the column name in the long table which will be split into multiple columns in the wide version

-> SExp

the column in the long table which will be emitted from matching on the new columns

-> (Value -> Ref SExp)

a function to generate column names from the values found in the database

-> SpecTarget b

standard table options

-> [Ref Table]

create a view or table | this table's dependencies (include the long table)

-> TableSpec b 

Query the "long" version of the table to determine what columns to put in the "wide" version. This function does not support mustache templates.

commandSpec #

Arguments

:: SpecTableName

the name of the new table

-> Text

command

-> [Text]

arguments

-> [Ref Table]

the list of dependencies - these cannot be deduced

-> TableSpec b 

A custom Spec which runs a command to create a table

shellSpec #

Arguments

:: SpecTableName

the name of the new table

-> Text

command

-> [Ref Table]

the list of dependencies - these cannot be deduced

-> TableSpec b 

A custom Spec which runs a shell script to create a table

combineTablesSpec #

Arguments

:: HasBackendSchemaField b 
=> SpecTableName 
-> SpecTarget b 
-> (Query -> Query)

Any final optional query modification

-> [Relation]

List of sources to combine

-> TableSpec b 

Specialized convenience for UNION-ing several tables and queries, even for cases where the list of fields available in each table is not known at compile time. This will introspect list of fields for cases where a bare table name is given instead of a QueryRelation.

addIOHooks :: [(Text, [SpecTableName], IOGlobalHookProgram b)] -> Spec b () #

Adds global hook, description, dependencies and hook's specification

addTags :: [TableSpecTag] -> Spec b a -> Spec b a #

withParsedMetaArg :: (FromJSON a, Typeable a) => (a -> Spec b c) -> Spec b c #