stack-3.1.1: The Haskell Tool Stack
Safe HaskellNone
LanguageGHC2021

Stack.Prelude

Synopsis

Documentation

withSystemTempDir :: MonadUnliftIO m => String -> (Path Abs Dir -> m a) -> m a Source #

Path version

withKeepSystemTempDir :: MonadUnliftIO m => String -> (Path Abs Dir -> m a) -> m a Source #

Like withSystemTempDir, but the temporary directory is not deleted.

sinkProcessStderrStdout Source #

Arguments

:: forall e o env. (HasProcessContext env, HasLogFunc env, HasCallStack) 
=> String

Command

-> [String]

Command line arguments

-> ConduitM ByteString Void (RIO env) e

Sink for stderr

-> ConduitM ByteString Void (RIO env) o

Sink for stdout

-> RIO env (e, o) 

Consume the stdout and stderr of a process feeding strict ByteStrings to the consumers.

Throws a ReadProcessException if unsuccessful in launching, or ExitCodeException if the process itself fails.

sinkProcessStdout Source #

Arguments

:: (HasProcessContext env, HasLogFunc env, HasCallStack) 
=> String

Command

-> [String]

Command line arguments

-> ConduitM ByteString Void (RIO env) a

Sink for stdout

-> RIO env a 

Consume the stdout of a process feeding strict ByteStrings to a consumer. If the process fails, spits out stdout and stderr as error log level. Should not be used for long-running processes or ones with lots of output; for that use sinkProcessStderrStdout.

Throws a ReadProcessException if unsuccessful.

logProcessStderrStdout :: (HasCallStack, HasProcessContext env, HasLogFunc env) => ProcessConfig stdin stdoutIgnored stderrIgnored -> RIO env () Source #

readProcessNull Source #

Arguments

:: (HasProcessContext env, HasLogFunc env, HasCallStack) 
=> String

Command

-> [String]

Command line arguments

-> RIO env () 

Read from the process, ignoring any output.

Throws a ReadProcessException exception if the process fails.

withProcessContext :: HasProcessContext env => ProcessContext -> RIO env a -> RIO env a Source #

Use the new ProcessContext, but retain the working directory from the parent environment.

stripCR :: Text -> Text Source #

Remove a trailing carriage pure if present

prompt :: MonadIO m => Text -> m Text Source #

Prompt the user by sending text to stdout, and taking a line of input from stdin.

promptPassword :: MonadIO m => Text -> m Text Source #

Prompt the user by sending text to stdout, and collecting a line of input from stdin. While taking input from stdin, input echoing is disabled, to hide passwords.

Based on code from cabal-install, Distribution.Client.Upload

promptBool :: MonadIO m => Text -> m Bool Source #

Prompt the user by sending text to stdout, and collecting a line of input from stdin. If something other than "y" or "n" is entered, then print a message indicating that "y" or "n" is expected, and ask again.

newtype FirstTrue Source #

Like First Bool, but the default is True.

Constructors

FirstTrue 

Fields

Instances

Instances details
Monoid FirstTrue Source # 
Instance details

Defined in Stack.Prelude

Semigroup FirstTrue Source # 
Instance details

Defined in Stack.Prelude

Show FirstTrue Source # 
Instance details

Defined in Stack.Prelude

Methods

showsPrec :: Int -> FirstTrue -> ShowS

show :: FirstTrue -> String #

showList :: [FirstTrue] -> ShowS

Eq FirstTrue Source # 
Instance details

Defined in Stack.Prelude

Ord FirstTrue Source # 
Instance details

Defined in Stack.Prelude

fromFirstTrue :: FirstTrue -> Bool Source #

Get the Bool, defaulting to True

defaultFirstTrue :: FirstTrue -> Bool Source #

Helper for filling in default values

newtype FirstFalse Source #

Like First Bool, but the default is False.

Constructors

FirstFalse 

Fields

fromFirstFalse :: FirstFalse -> Bool Source #

Get the Bool, defaulting to False

defaultFirstFalse :: FirstFalse -> Bool Source #

Helper for filling in default values

writeBinaryFileAtomic :: MonadIO m => Path absrel File -> Builder -> m () Source #

Write a Builder to a file and atomically rename.

bugReport :: String -> String -> String Source #

Report a bug in Stack.

bugPrettyReport :: String -> StyleDoc -> StyleDoc Source #

Report a pretty bug in Stack.

putUtf8Builder :: MonadIO m => Utf8Builder -> m () Source #

Write a Utf8Builder to the standard output stream.

putBuilder :: MonadIO m => Builder -> m () Source #

Write a Builder to the standard output stream.

prettyThrowIO :: (Exception e, MonadIO m, Pretty e) => e -> m a #

prettyThrowM :: (Exception e, MonadThrow m, Pretty e) => e -> m a #

mcons :: Maybe a -> [a] -> [a] Source #

Maybe cons.

data MungedPackageId #

Instances

Instances details
HasMungedPackageId MungedPackageId 
Instance details

Defined in Distribution.Package

Parsec MungedPackageId 
Instance details

Defined in Distribution.Types.MungedPackageId

Methods

parsec :: CabalParsing m => m MungedPackageId

Pretty MungedPackageId 
Instance details

Defined in Distribution.Types.MungedPackageId

Methods

pretty :: MungedPackageId -> Doc

prettyVersioned :: CabalSpecVersion -> MungedPackageId -> Doc

Structured MungedPackageId 
Instance details

Defined in Distribution.Types.MungedPackageId

Methods

structure :: Proxy MungedPackageId -> Structure

structureHash' :: Tagged MungedPackageId MD5

Data MungedPackageId 
Instance details

Defined in Distribution.Types.MungedPackageId

Methods

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

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

toConstr :: MungedPackageId -> Constr #

dataTypeOf :: MungedPackageId -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic MungedPackageId 
Instance details

Defined in Distribution.Types.MungedPackageId

Associated Types

type Rep MungedPackageId 
Instance details

Defined in Distribution.Types.MungedPackageId

type Rep MungedPackageId = D1 ('MetaData "MungedPackageId" "Distribution.Types.MungedPackageId" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "MungedPackageId" 'PrefixI 'True) (S1 ('MetaSel ('Just "mungedName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MungedPackageName) :*: S1 ('MetaSel ('Just "mungedVersion") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Version)))
Read MungedPackageId 
Instance details

Defined in Distribution.Types.MungedPackageId

Show MungedPackageId 
Instance details

Defined in Distribution.Types.MungedPackageId

Binary MungedPackageId 
Instance details

Defined in Distribution.Types.MungedPackageId

Methods

put :: MungedPackageId -> Put

get :: Get MungedPackageId

putList :: [MungedPackageId] -> Put

NFData MungedPackageId 
Instance details

Defined in Distribution.Types.MungedPackageId

Methods

rnf :: MungedPackageId -> () #

Eq MungedPackageId 
Instance details

Defined in Distribution.Types.MungedPackageId

Ord MungedPackageId 
Instance details

Defined in Distribution.Types.MungedPackageId

type Rep MungedPackageId 
Instance details

Defined in Distribution.Types.MungedPackageId

type Rep MungedPackageId = D1 ('MetaData "MungedPackageId" "Distribution.Types.MungedPackageId" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "MungedPackageId" 'PrefixI 'True) (S1 ('MetaSel ('Just "mungedName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MungedPackageName) :*: S1 ('MetaSel ('Just "mungedVersion") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Version)))

data MungedPackageName #

Instances

Instances details
Parsec MungedPackageName 
Instance details

Defined in Distribution.Types.MungedPackageName

Methods

parsec :: CabalParsing m => m MungedPackageName

Pretty MungedPackageName 
Instance details

Defined in Distribution.Types.MungedPackageName

Methods

pretty :: MungedPackageName -> Doc

prettyVersioned :: CabalSpecVersion -> MungedPackageName -> Doc

Structured MungedPackageName 
Instance details

Defined in Distribution.Types.MungedPackageName

Data MungedPackageName 
Instance details

Defined in Distribution.Types.MungedPackageName

Methods

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

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

toConstr :: MungedPackageName -> Constr #

dataTypeOf :: MungedPackageName -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic MungedPackageName 
Instance details

Defined in Distribution.Types.MungedPackageName

Associated Types

type Rep MungedPackageName 
Instance details

Defined in Distribution.Types.MungedPackageName

type Rep MungedPackageName = D1 ('MetaData "MungedPackageName" "Distribution.Types.MungedPackageName" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "MungedPackageName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 PackageName) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 LibraryName)))
Read MungedPackageName 
Instance details

Defined in Distribution.Types.MungedPackageName

Show MungedPackageName 
Instance details

Defined in Distribution.Types.MungedPackageName

Binary MungedPackageName 
Instance details

Defined in Distribution.Types.MungedPackageName

NFData MungedPackageName 
Instance details

Defined in Distribution.Types.MungedPackageName

Methods

rnf :: MungedPackageName -> () #

Eq MungedPackageName 
Instance details

Defined in Distribution.Types.MungedPackageName

Ord MungedPackageName 
Instance details

Defined in Distribution.Types.MungedPackageName

type Rep MungedPackageName 
Instance details

Defined in Distribution.Types.MungedPackageName

type Rep MungedPackageName = D1 ('MetaData "MungedPackageName" "Distribution.Types.MungedPackageName" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "MungedPackageName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 PackageName) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 LibraryName)))

data LibraryName #

Constructors

LMainLibName 
LSubLibName UnqualComponentName 

Instances

Instances details
Structured LibraryName 
Instance details

Defined in Distribution.Types.LibraryName

Methods

structure :: Proxy LibraryName -> Structure

structureHash' :: Tagged LibraryName MD5

Data LibraryName 
Instance details

Defined in Distribution.Types.LibraryName

Methods

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

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

toConstr :: LibraryName -> Constr #

dataTypeOf :: LibraryName -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic LibraryName 
Instance details

Defined in Distribution.Types.LibraryName

Associated Types

type Rep LibraryName 
Instance details

Defined in Distribution.Types.LibraryName

type Rep LibraryName = D1 ('MetaData "LibraryName" "Distribution.Types.LibraryName" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "LMainLibName" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LSubLibName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UnqualComponentName)))

Methods

from :: LibraryName -> Rep LibraryName x

to :: Rep LibraryName x -> LibraryName

Read LibraryName 
Instance details

Defined in Distribution.Types.LibraryName

Methods

readsPrec :: Int -> ReadS LibraryName

readList :: ReadS [LibraryName]

readPrec :: ReadPrec LibraryName

readListPrec :: ReadPrec [LibraryName]

Show LibraryName 
Instance details

Defined in Distribution.Types.LibraryName

Methods

showsPrec :: Int -> LibraryName -> ShowS

show :: LibraryName -> String #

showList :: [LibraryName] -> ShowS

Binary LibraryName 
Instance details

Defined in Distribution.Types.LibraryName

Methods

put :: LibraryName -> Put

get :: Get LibraryName

putList :: [LibraryName] -> Put

NFData LibraryName 
Instance details

Defined in Distribution.Types.LibraryName

Methods

rnf :: LibraryName -> () #

Eq LibraryName 
Instance details

Defined in Distribution.Types.LibraryName

Ord LibraryName 
Instance details

Defined in Distribution.Types.LibraryName

type Rep LibraryName 
Instance details

Defined in Distribution.Types.LibraryName

type Rep LibraryName = D1 ('MetaData "LibraryName" "Distribution.Types.LibraryName" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "LMainLibName" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LSubLibName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UnqualComponentName)))

async :: MonadUnliftIO m => m a -> m (Async a) #

class Monad m => PrimMonad (m :: Type -> Type) where #

Associated Types

type PrimState (m :: Type -> Type) #

Methods

primitive :: (State# (PrimState m) -> (# State# (PrimState m), a #)) -> m a #

Instances

Instances details
PrimMonad IO 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState IO 
Instance details

Defined in Control.Monad.Primitive

type PrimState IO = RealWorld

Methods

primitive :: (State# (PrimState IO) -> (# State# (PrimState IO), a #)) -> IO a #

PrimMonad (ST s) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (ST s) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ST s) = s

Methods

primitive :: (State# (PrimState (ST s)) -> (# State# (PrimState (ST s)), a #)) -> ST s a #

PrimMonad (ST s) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (ST s) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ST s) = s

Methods

primitive :: (State# (PrimState (ST s)) -> (# State# (PrimState (ST s)), a #)) -> ST s a #

PrimMonad m => PrimMonad (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Associated Types

type PrimState (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

type PrimState (ResourceT m) = PrimState m

Methods

primitive :: (State# (PrimState (ResourceT m)) -> (# State# (PrimState (ResourceT m)), a #)) -> ResourceT m a #

PrimMonad (RIO env) 
Instance details

Defined in RIO.Prelude.RIO

Associated Types

type PrimState (RIO env) 
Instance details

Defined in RIO.Prelude.RIO

type PrimState (RIO env) = PrimState IO

Methods

primitive :: (State# (PrimState (RIO env)) -> (# State# (PrimState (RIO env)), a #)) -> RIO env a #

PrimMonad m => PrimMonad (MaybeT m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (MaybeT m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (MaybeT m) = PrimState m

Methods

primitive :: (State# (PrimState (MaybeT m)) -> (# State# (PrimState (MaybeT m)), a #)) -> MaybeT m a #

(Monoid w, PrimMonad m) => PrimMonad (AccumT w m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (AccumT w m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (AccumT w m) = PrimState m

Methods

primitive :: (State# (PrimState (AccumT w m)) -> (# State# (PrimState (AccumT w m)), a #)) -> AccumT w m a #

PrimMonad m => PrimMonad (ExceptT e m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (ExceptT e m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ExceptT e m) = PrimState m

Methods

primitive :: (State# (PrimState (ExceptT e m)) -> (# State# (PrimState (ExceptT e m)), a #)) -> ExceptT e m a #

PrimMonad m => PrimMonad (IdentityT m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (IdentityT m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (IdentityT m) = PrimState m

Methods

primitive :: (State# (PrimState (IdentityT m)) -> (# State# (PrimState (IdentityT m)), a #)) -> IdentityT m a #

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

Defined in Control.Monad.Primitive

Associated Types

type PrimState (ReaderT r m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ReaderT r m) = PrimState m

Methods

primitive :: (State# (PrimState (ReaderT r m)) -> (# State# (PrimState (ReaderT r m)), a #)) -> ReaderT r m a #

PrimMonad m => PrimMonad (SelectT r m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (SelectT r m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (SelectT r m) = PrimState m

Methods

primitive :: (State# (PrimState (SelectT r m)) -> (# State# (PrimState (SelectT r m)), a #)) -> SelectT r m a #

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

Defined in Control.Monad.Primitive

Associated Types

type PrimState (StateT s m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (StateT s m) = PrimState m

Methods

primitive :: (State# (PrimState (StateT s m)) -> (# State# (PrimState (StateT s m)), a #)) -> StateT s m a #

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

Defined in Control.Monad.Primitive

Associated Types

type PrimState (StateT s m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (StateT s m) = PrimState m

Methods

primitive :: (State# (PrimState (StateT s m)) -> (# State# (PrimState (StateT s m)), a #)) -> StateT s m a #

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

Defined in Control.Monad.Primitive

Associated Types

type PrimState (WriterT w m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (WriterT w m) = PrimState m

Methods

primitive :: (State# (PrimState (WriterT w m)) -> (# State# (PrimState (WriterT w m)), a #)) -> WriterT w m a #

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

Defined in Control.Monad.Primitive

Associated Types

type PrimState (WriterT w m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (WriterT w m) = PrimState m

Methods

primitive :: (State# (PrimState (WriterT w m)) -> (# State# (PrimState (WriterT w m)), a #)) -> WriterT w m a #

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

Defined in Control.Monad.Primitive

Associated Types

type PrimState (WriterT w m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (WriterT w m) = PrimState m

Methods

primitive :: (State# (PrimState (WriterT w m)) -> (# State# (PrimState (WriterT w m)), a #)) -> WriterT w m a #

PrimMonad m => PrimMonad (ConduitT i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Associated Types

type PrimState (ConduitT i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

type PrimState (ConduitT i o m) = PrimState m

Methods

primitive :: (State# (PrimState (ConduitT i o m)) -> (# State# (PrimState (ConduitT i o m)), a #)) -> ConduitT i o m a #

PrimMonad m => PrimMonad (ContT r m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (ContT r m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ContT r m) = PrimState m

Methods

primitive :: (State# (PrimState (ContT r m)) -> (# State# (PrimState (ContT r m)), a #)) -> ContT r m a #

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

Defined in Control.Monad.Primitive

Associated Types

type PrimState (RWST r w s m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (RWST r w s m) = PrimState m

Methods

primitive :: (State# (PrimState (RWST r w s m)) -> (# State# (PrimState (RWST r w s m)), a #)) -> RWST r w s m a #

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

Defined in Control.Monad.Primitive

Associated Types

type PrimState (RWST r w s m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (RWST r w s m) = PrimState m

Methods

primitive :: (State# (PrimState (RWST r w s m)) -> (# State# (PrimState (RWST r w s m)), a #)) -> RWST r w s m a #

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

Defined in Control.Monad.Primitive

Associated Types

type PrimState (RWST r w s m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (RWST r w s m) = PrimState m

Methods

primitive :: (State# (PrimState (RWST r w s m)) -> (# State# (PrimState (RWST r w s m)), a #)) -> RWST r w s m a #

PrimMonad m => PrimMonad (Pipe l i o u m) 
Instance details

Defined in Data.Conduit.Internal.Pipe

Associated Types

type PrimState (Pipe l i o u m) 
Instance details

Defined in Data.Conduit.Internal.Pipe

type PrimState (Pipe l i o u m) = PrimState m

Methods

primitive :: (State# (PrimState (Pipe l i o u m)) -> (# State# (PrimState (Pipe l i o u m)), a #)) -> Pipe l i o u m a #

deepseq :: NFData a => a -> b -> b #

data Path b t #

Instances

Instances details
(Typeable b, Typeable t) => Lift (Path b t :: Type) 
Instance details

Defined in Path.Internal.Posix

Methods

lift :: Quote m => Path b t -> m Exp

liftTyped :: forall (m :: Type -> Type). Quote m => Path b t -> Code m (Path b t)

FromJSON (Path Abs Dir) 
Instance details

Defined in Path.Posix

Methods

parseJSON :: Value -> Parser (Path Abs Dir)

parseJSONList :: Value -> Parser [Path Abs Dir]

omittedField :: Maybe (Path Abs Dir)

FromJSON (Path Abs File) 
Instance details

Defined in Path.Posix

FromJSON (Path Rel Dir) 
Instance details

Defined in Path.Posix

Methods

parseJSON :: Value -> Parser (Path Rel Dir)

parseJSONList :: Value -> Parser [Path Rel Dir]

omittedField :: Maybe (Path Rel Dir)

FromJSON (Path Rel File) 
Instance details

Defined in Path.Posix

FromJSONKey (Path Abs Dir) 
Instance details

Defined in Path.Posix

Methods

fromJSONKey :: FromJSONKeyFunction (Path Abs Dir)

fromJSONKeyList :: FromJSONKeyFunction [Path Abs Dir]

FromJSONKey (Path Abs File) 
Instance details

Defined in Path.Posix

Methods

fromJSONKey :: FromJSONKeyFunction (Path Abs File)

fromJSONKeyList :: FromJSONKeyFunction [Path Abs File]

FromJSONKey (Path Rel Dir) 
Instance details

Defined in Path.Posix

Methods

fromJSONKey :: FromJSONKeyFunction (Path Rel Dir)

fromJSONKeyList :: FromJSONKeyFunction [Path Rel Dir]

FromJSONKey (Path Rel File) 
Instance details

Defined in Path.Posix

Methods

fromJSONKey :: FromJSONKeyFunction (Path Rel File)

fromJSONKeyList :: FromJSONKeyFunction [Path Rel File]

ToJSON (Path b t) 
Instance details

Defined in Path.Internal.Posix

Methods

toJSON :: Path b t -> Value

toEncoding :: Path b t -> Encoding

toJSONList :: [Path b t] -> Value

toEncodingList :: [Path b t] -> Encoding

omitField :: Path b t -> Bool

ToJSONKey (Path b t) 
Instance details

Defined in Path.Internal.Posix

Methods

toJSONKey :: ToJSONKeyFunction (Path b t)

toJSONKeyList :: ToJSONKeyFunction [Path b t]

(Data b, Data t) => Data (Path b t) 
Instance details

Defined in Path.Internal.Posix

Methods

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

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

toConstr :: Path b t -> Constr #

dataTypeOf :: Path b t -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic (Path b t) 
Instance details

Defined in Path.Internal.Posix

Associated Types

type Rep (Path b t) 
Instance details

Defined in Path.Internal.Posix

type Rep (Path b t) = D1 ('MetaData "Path" "Path.Internal.Posix" "path-0.9.5-CmwvFN5dtyjKIUDzlNEdLE" 'True) (C1 ('MetaCons "Path" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FilePath)))

Methods

from :: Path b t -> Rep (Path b t) x

to :: Rep (Path b t) x -> Path b t

Show (Path b t) 
Instance details

Defined in Path.Internal.Posix

Methods

showsPrec :: Int -> Path b t -> ShowS

show :: Path b t -> String #

showList :: [Path b t] -> ShowS

NFData (Path b t) 
Instance details

Defined in Path.Internal.Posix

Methods

rnf :: Path b t -> () #

Eq (Path b t) 
Instance details

Defined in Path.Internal.Posix

Methods

(==) :: Path b t -> Path b t -> Bool #

(/=) :: Path b t -> Path b t -> Bool #

Ord (Path b t) 
Instance details

Defined in Path.Internal.Posix

Methods

compare :: Path b t -> Path b t -> Ordering #

(<) :: Path b t -> Path b t -> Bool #

(<=) :: Path b t -> Path b t -> Bool #

(>) :: Path b t -> Path b t -> Bool #

(>=) :: Path b t -> Path b t -> Bool #

max :: Path b t -> Path b t -> Path b t #

min :: Path b t -> Path b t -> Path b t #

Hashable (Path b t) 
Instance details

Defined in Path.Internal.Posix

Methods

hashWithSalt :: Int -> Path b t -> Int

hash :: Path b t -> Int

AnyPath (Path b Dir) 
Instance details

Defined in Path.IO

Associated Types

type AbsPath (Path b Dir) 
Instance details

Defined in Path.IO

type AbsPath (Path b Dir) = Path Abs Dir
type RelPath (Path b Dir) 
Instance details

Defined in Path.IO

type RelPath (Path b Dir) = Path Rel Dir

Methods

canonicalizePath :: MonadIO m => Path b Dir -> m (AbsPath (Path b Dir))

makeAbsolute :: MonadIO m => Path b Dir -> m (AbsPath (Path b Dir))

makeRelative :: MonadThrow m => Path Abs Dir -> Path b Dir -> m (RelPath (Path b Dir))

makeRelativeToCurrentDir :: MonadIO m => Path b Dir -> m (RelPath (Path b Dir))

AnyPath (Path b File) 
Instance details

Defined in Path.IO

Associated Types

type AbsPath (Path b File) 
Instance details

Defined in Path.IO

type AbsPath (Path b File) = Path Abs File
type RelPath (Path b File) 
Instance details

Defined in Path.IO

type RelPath (Path b File) = Path Rel File

Methods

canonicalizePath :: MonadIO m => Path b File -> m (AbsPath (Path b File))

makeAbsolute :: MonadIO m => Path b File -> m (AbsPath (Path b File))

makeRelative :: MonadThrow m => Path Abs Dir -> Path b File -> m (RelPath (Path b File))

makeRelativeToCurrentDir :: MonadIO m => Path b File -> m (RelPath (Path b File))

Pretty (Path b Dir) 
Instance details

Defined in Text.PrettyPrint.Leijen.Extended

Methods

pretty :: Path b Dir -> StyleDoc #

Pretty (Path b File) 
Instance details

Defined in Text.PrettyPrint.Leijen.Extended

Methods

pretty :: Path b File -> StyleDoc #

type Rep (Path b t) 
Instance details

Defined in Path.Internal.Posix

type Rep (Path b t) = D1 ('MetaData "Path" "Path.Internal.Posix" "path-0.9.5-CmwvFN5dtyjKIUDzlNEdLE" 'True) (C1 ('MetaCons "Path" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FilePath)))
type AbsPath (Path b Dir) 
Instance details

Defined in Path.IO

type AbsPath (Path b Dir) = Path Abs Dir
type AbsPath (Path b File) 
Instance details

Defined in Path.IO

type AbsPath (Path b File) = Path Abs File
type RelPath (Path b Dir) 
Instance details

Defined in Path.IO

type RelPath (Path b Dir) = Path Rel Dir
type RelPath (Path b File) 
Instance details

Defined in Path.IO

type RelPath (Path b File) = Path Rel File

newtype UnliftIO (m :: Type -> Type) #

Constructors

UnliftIO 

Fields

newtype RIO env a #

Constructors

RIO 

Fields

Instances

Instances details
MonadReader env (RIO env) 
Instance details

Defined in RIO.Prelude.RIO

Methods

ask :: RIO env env #

local :: (env -> env) -> RIO env a -> RIO env a #

reader :: (env -> a) -> RIO env a

HasStateRef s env => MonadState s (RIO env) 
Instance details

Defined in RIO.Prelude.RIO

Methods

get :: RIO env s

put :: s -> RIO env ()

state :: (s -> (a, s)) -> RIO env a

(Monoid w, HasWriteRef w env) => MonadWriter w (RIO env) 
Instance details

Defined in RIO.Prelude.RIO

Methods

writer :: (a, w) -> RIO env a

tell :: w -> RIO env ()

listen :: RIO env a -> RIO env (a, w)

pass :: RIO env (a, w -> w) -> RIO env a

MonadIO (RIO env) 
Instance details

Defined in RIO.Prelude.RIO

Methods

liftIO :: IO a -> RIO env 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 #

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 #

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 #

MonadThrow (RIO env) 
Instance details

Defined in RIO.Prelude.RIO

Methods

throwM :: (HasCallStack, Exception e) => e -> RIO env a #

PrimMonad (RIO env) 
Instance details

Defined in RIO.Prelude.RIO

Associated Types

type PrimState (RIO env) 
Instance details

Defined in RIO.Prelude.RIO

type PrimState (RIO env) = PrimState IO

Methods

primitive :: (State# (PrimState (RIO env)) -> (# State# (PrimState (RIO env)), a #)) -> RIO env a #

MonadUnliftIO (RIO env) 
Instance details

Defined in RIO.Prelude.RIO

Methods

withRunInIO :: ((forall a. RIO env a -> IO a) -> IO b) -> RIO env b #

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 #

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

type PrimState (RIO env) 
Instance details

Defined in RIO.Prelude.RIO

type PrimState (RIO env) = PrimState IO
type StM (RIO env) a 
Instance details

Defined in RIO.Orphans

type StM (RIO env) a = a

data Bool #

Constructors

False 
True 

Instances

Instances details
BooleanFlag Bool 
Instance details

Defined in Distribution.Simple.Flag

Methods

asBool :: Bool -> Bool

Parsec Bool 
Instance details

Defined in Distribution.Parsec

Methods

parsec :: CabalParsing m => m Bool

Pretty Bool 
Instance details

Defined in Distribution.Pretty

Methods

pretty :: Bool -> Doc

prettyVersioned :: CabalSpecVersion -> Bool -> Doc

Structured Bool 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy Bool -> Structure

structureHash' :: Tagged Bool MD5

FromJSON Bool 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Bool

parseJSONList :: Value -> Parser [Bool]

omittedField :: Maybe Bool

FromJSONKey Bool 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction Bool

fromJSONKeyList :: FromJSONKeyFunction [Bool]

ToJSON Bool 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Bool -> Value

toEncoding :: Bool -> Encoding

toJSONList :: [Bool] -> Value

toEncodingList :: [Bool] -> Encoding

omitField :: Bool -> Bool

ToJSONKey Bool 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction Bool

toJSONKeyList :: ToJSONKeyFunction [Bool]

Data Bool 
Instance details

Defined in 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 #

Storable Bool 
Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Bool -> Int

alignment :: Bool -> Int

peekElemOff :: Ptr Bool -> Int -> IO Bool

pokeElemOff :: Ptr Bool -> Int -> Bool -> IO ()

peekByteOff :: Ptr b -> Int -> IO Bool

pokeByteOff :: Ptr b -> Int -> Bool -> IO ()

peek :: Ptr Bool -> IO Bool

poke :: Ptr Bool -> Bool -> IO ()

Bits Bool 
Instance details

Defined in GHC.Bits

FiniteBits Bool 
Instance details

Defined in GHC.Bits

Bounded Bool 
Instance details

Defined in GHC.Enum

Enum Bool 
Instance details

Defined in GHC.Enum

Generic Bool 
Instance details

Defined in GHC.Generics

Associated Types

type Rep Bool 
Instance details

Defined in GHC.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 
Instance details

Defined in GHC.Generics

Associated Types

type DemoteRep Bool 
Instance details

Defined in GHC.Generics

type DemoteRep Bool = Bool

Methods

fromSing :: forall (a :: Bool). Sing a -> DemoteRep Bool

Ix Bool 
Instance details

Defined in GHC.Ix

Methods

range :: (Bool, Bool) -> [Bool]

index :: (Bool, Bool) -> Bool -> Int

unsafeIndex :: (Bool, Bool) -> Bool -> Int

inRange :: (Bool, Bool) -> Bool -> Bool

rangeSize :: (Bool, Bool) -> Int

unsafeRangeSize :: (Bool, Bool) -> Int

Read Bool 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS Bool

readList :: ReadS [Bool]

readPrec :: ReadPrec Bool

readListPrec :: ReadPrec [Bool]

Show Bool 
Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Bool -> ShowS

show :: Bool -> String #

showList :: [Bool] -> ShowS

BitOps Bool 
Instance details

Defined in Basement.Bits

Methods

(.&.) :: Bool -> Bool -> Bool

(.|.) :: Bool -> Bool -> Bool

(.^.) :: Bool -> Bool -> Bool

(.<<.) :: Bool -> CountOf Bool -> Bool

(.>>.) :: Bool -> CountOf Bool -> Bool

bit :: Offset Bool -> Bool

isBitSet :: Bool -> Offset Bool -> Bool

setBit :: Bool -> Offset Bool -> Bool

clearBit :: Bool -> Offset Bool -> Bool

FiniteBitsOps Bool 
Instance details

Defined in Basement.Bits

Methods

numberOfBits :: Bool -> CountOf Bool

rotateL :: Bool -> CountOf Bool -> Bool

rotateR :: Bool -> CountOf Bool -> Bool

popCount :: Bool -> CountOf Bool

bitFlip :: Bool -> Bool

countLeadingZeros :: Bool -> CountOf Bool

countTrailingZeros :: Bool -> CountOf Bool

Binary Bool 
Instance details

Defined in Data.Binary.Class

Methods

put :: Bool -> Put

get :: Get Bool

putList :: [Bool] -> Put

NFData Bool 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Bool -> () #

GEnum Bool 
Instance details

Defined in Generics.Deriving.Enum

Methods

genum :: [Bool]

GIx Bool 
Instance details

Defined in Generics.Deriving.Enum

Methods

range :: (Bool, Bool) -> [Bool]

index :: (Bool, Bool) -> Bool -> Int

inRange :: (Bool, Bool) -> Bool -> Bool

GEq Bool 
Instance details

Defined in Generics.Deriving.Eq

Methods

geq :: Bool -> Bool -> Bool

GShow Bool 
Instance details

Defined in Generics.Deriving.Show

Methods

gshowsPrec :: Int -> Bool -> ShowS

gshows :: Bool -> ShowS

gshow :: Bool -> String

gshowList :: [Bool] -> ShowS

Uniplate Bool 
Instance details

Defined in Generics.Deriving.Uniplate

Methods

children :: Bool -> [Bool]

context :: Bool -> [Bool] -> Bool

descend :: (Bool -> Bool) -> Bool -> Bool

descendM :: Monad m => (Bool -> m Bool) -> Bool -> m Bool

transform :: (Bool -> Bool) -> Bool -> Bool

transformM :: Monad m => (Bool -> m Bool) -> Bool -> m Bool

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

FromValue Bool 
Instance details

Defined in Data.Aeson.Config.FromValue

HpcHash Bool 
Instance details

Defined in Trace.Hpc.Util

Methods

toHash :: Bool -> Hash

FromHttpApiData Bool 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Bool 
Instance details

Defined in Web.Internal.HttpApiData

ToMustache Bool 
Instance details

Defined in Text.Mustache.Internal.Types

PathPiece Bool 
Instance details

Defined in Web.PathPieces

PersistField Bool 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Bool -> PersistValue

fromPersistValue :: PersistValue -> Either Text Bool

PersistFieldSql Bool 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Bool -> SqlType

Pretty Bool 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJClass

Methods

pPrintPrec :: PrettyLevel -> Rational -> Bool -> Doc ann

pPrint :: Bool -> Doc ann

pPrintList :: PrettyLevel -> [Bool] -> Doc ann

Pretty Bool 
Instance details

Defined in Text.PrettyPrint.HughesPJClass

Methods

pPrintPrec :: PrettyLevel -> Rational -> Bool -> Doc

pPrint :: Bool -> Doc

pPrintList :: PrettyLevel -> [Bool] -> Doc

Pretty Bool 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Bool -> Doc ann

prettyList :: [Bool] -> Doc ann

Random Bool 
Instance details

Defined in System.Random

Methods

randomR :: RandomGen g => (Bool, Bool) -> g -> (Bool, g)

random :: RandomGen g => g -> (Bool, g)

randomRs :: RandomGen g => (Bool, Bool) -> g -> [Bool]

randoms :: RandomGen g => g -> [Bool]

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

ToYaml Bool 
Instance details

Defined in Data.Yaml.Builder

Methods

toYaml :: Bool -> YamlBuilder

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 
Instance details

Defined in GHC.Generics

Methods

sing :: Sing 'False

SingI 'True 
Instance details

Defined in GHC.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

Methods

basicUnsafeFreeze :: Mutable Vector s Bool -> ST s (Vector Bool)

basicUnsafeThaw :: Vector Bool -> ST s (Mutable Vector s Bool)

basicLength :: Vector Bool -> Int

basicUnsafeSlice :: Int -> Int -> Vector Bool -> Vector Bool

basicUnsafeIndexM :: Vector Bool -> Int -> Box Bool

basicUnsafeCopy :: Mutable Vector s Bool -> Vector Bool -> ST s ()

elemseq :: Vector Bool -> Bool -> b -> b

MVector MVector Bool 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s Bool -> Int

basicUnsafeSlice :: Int -> Int -> MVector s Bool -> MVector s Bool

basicOverlaps :: MVector s Bool -> MVector s Bool -> Bool

basicUnsafeNew :: Int -> ST s (MVector s Bool)

basicInitialize :: MVector s Bool -> ST s ()

basicUnsafeReplicate :: Int -> Bool -> ST s (MVector s Bool)

basicUnsafeRead :: MVector s Bool -> Int -> ST s Bool

basicUnsafeWrite :: MVector s Bool -> Int -> Bool -> ST s ()

basicClear :: MVector s Bool -> ST s ()

basicSet :: MVector s Bool -> Bool -> ST s ()

basicUnsafeCopy :: MVector s Bool -> MVector s Bool -> ST s ()

basicUnsafeMove :: MVector s Bool -> MVector s Bool -> ST s ()

basicUnsafeGrow :: MVector s Bool -> Int -> ST s (MVector s Bool)

MArray IOUArray Bool IO 
Instance details

Defined in Data.Array.IO.Internals

Methods

getBounds :: Ix i => IOUArray i Bool -> IO (i, i)

getNumElements :: Ix i => IOUArray i Bool -> IO Int

newArray :: Ix i => (i, i) -> Bool -> IO (IOUArray i Bool)

newArray_ :: Ix i => (i, i) -> IO (IOUArray i Bool)

unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Bool)

unsafeRead :: Ix i => IOUArray i Bool -> Int -> IO Bool

unsafeWrite :: Ix i => IOUArray i Bool -> Int -> Bool -> IO ()

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 DemoteRep Bool 
Instance details

Defined in GHC.Generics

type DemoteRep Bool = Bool
type Rep Bool 
Instance details

Defined in GHC.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.Generics

data Sing (a :: Bool) where
newtype Vector Bool 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector Bool = V_Bool (Vector Word8)
newtype MVector s Bool 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Bool = MV_Bool (MVector s Word8)

data Char #

Instances

Instances details
Structured Char 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy Char -> Structure

structureHash' :: Tagged Char MD5

FromJSON Char 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Char

parseJSONList :: Value -> Parser [Char]

omittedField :: Maybe Char

FromJSONKey Char 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction Char

fromJSONKeyList :: FromJSONKeyFunction [Char]

ToJSON Char 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Char -> Value

toEncoding :: Char -> Encoding

toJSONList :: [Char] -> Value

toEncodingList :: [Char] -> Encoding

omitField :: Char -> Bool

ToJSONKey Char 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction Char

toJSONKeyList :: ToJSONKeyFunction [Char]

Data Char 
Instance details

Defined in 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 #

Storable Char 
Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Char -> Int

alignment :: Char -> Int

peekElemOff :: Ptr Char -> Int -> IO Char

pokeElemOff :: Ptr Char -> Int -> Char -> IO ()

peekByteOff :: Ptr b -> Int -> IO Char

pokeByteOff :: Ptr b -> Int -> Char -> IO ()

peek :: Ptr Char -> IO Char

poke :: Ptr Char -> Char -> IO ()

Bounded Char 
Instance details

Defined in GHC.Enum

Enum Char 
Instance details

Defined in GHC.Enum

Ix Char 
Instance details

Defined in GHC.Ix

Methods

range :: (Char, Char) -> [Char]

index :: (Char, Char) -> Char -> Int

unsafeIndex :: (Char, Char) -> Char -> Int

inRange :: (Char, Char) -> Char -> Bool

rangeSize :: (Char, Char) -> Int

unsafeRangeSize :: (Char, Char) -> Int

Read Char 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS Char

readList :: ReadS [Char]

readPrec :: ReadPrec Char

readListPrec :: ReadPrec [Char]

Show Char 
Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Char -> ShowS

show :: Char -> String #

showList :: [Char] -> ShowS

IsChar Char 
Instance details

Defined in Text.Printf

Methods

toChar :: Char -> Char

fromChar :: Char -> Char

PrintfArg Char 
Instance details

Defined in Text.Printf

Methods

formatArg :: Char -> FieldFormatter

parseFormat :: Char -> ModifierParser

Subtractive Char 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Char 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Char = Int

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

Methods

primSizeInBytes :: Proxy Char -> CountOf Word8

primShiftToBytes :: Proxy Char -> Int

primBaUIndex :: ByteArray# -> Offset Char -> Char

primMbaURead :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Char -> prim Char

primMbaUWrite :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Char -> Char -> prim ()

primAddrIndex :: Addr# -> Offset Char -> Char

primAddrRead :: PrimMonad prim => Addr# -> Offset Char -> prim Char

primAddrWrite :: PrimMonad prim => Addr# -> Offset Char -> Char -> prim ()

Binary Char 
Instance details

Defined in Data.Binary.Class

Methods

put :: Char -> Put

get :: Get Char

putList :: [Char] -> Put

FoldCase Char 
Instance details

Defined in Data.CaseInsensitive.Internal

Methods

foldCase :: Char -> Char

foldCaseList :: [Char] -> [Char]

NFData Char 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Char -> () #

GEq Char 
Instance details

Defined in Generics.Deriving.Eq

Methods

geq :: Char -> Char -> Bool

GShow Char 
Instance details

Defined in Generics.Deriving.Show

Methods

gshowsPrec :: Int -> Char -> ShowS

gshows :: Char -> ShowS

gshow :: Char -> String

gshowList :: [Char] -> ShowS

Uniplate Char 
Instance details

Defined in Generics.Deriving.Uniplate

Methods

children :: Char -> [Char]

context :: Char -> [Char] -> Char

descend :: (Char -> Char) -> Char -> Char

descendM :: Monad m => (Char -> m Char) -> Char -> m Char

transform :: (Char -> Char) -> Char -> Char

transformM :: Monad m => (Char -> m Char) -> Char -> m Char

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

FromValue ParsePackageConfig 
Instance details

Defined in Hpack.Config

Methods

fromValue :: Value -> Parser ParsePackageConfig Source #

FromValue String 
Instance details

Defined in Data.Aeson.Config.FromValue

HpcHash Char 
Instance details

Defined in Trace.Hpc.Util

Methods

toHash :: Char -> Hash

FromHttpApiData String 
Instance details

Defined in Web.Internal.HttpApiData

FromHttpApiData Char 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData String 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Char 
Instance details

Defined in Web.Internal.HttpApiData

ToMustache Char 
Instance details

Defined in Text.Mustache.Internal.Types

PathPiece String 
Instance details

Defined in Web.PathPieces

Pretty Char 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJClass

Methods

pPrintPrec :: PrettyLevel -> Rational -> Char -> Doc ann

pPrint :: Char -> Doc ann

pPrintList :: PrettyLevel -> [Char] -> Doc ann

Pretty Char 
Instance details

Defined in Text.PrettyPrint.HughesPJClass

Methods

pPrintPrec :: PrettyLevel -> Rational -> Char -> Doc

pPrint :: Char -> Doc

pPrintList :: PrettyLevel -> [Char] -> Doc

Pretty Char 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Char -> Doc ann

prettyList :: [Char] -> Doc ann

Random Char 
Instance details

Defined in System.Random

Methods

randomR :: RandomGen g => (Char, Char) -> g -> (Char, g)

random :: RandomGen g => g -> (Char, g)

randomRs :: RandomGen g => (Char, Char) -> g -> [Char]

randoms :: RandomGen g => g -> [Char]

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

Display Char 
Instance details

Defined in RIO.Prelude.Display

Unbox Char 
Instance details

Defined in Data.Vector.Unboxed.Base

ToYaml String 
Instance details

Defined in Data.Yaml.Builder

Methods

toYaml :: String -> YamlBuilder

Newtype String FilePathNT 
Instance details

Defined in Distribution.FieldGrammar.Newtypes

Methods

pack :: String -> FilePathNT

unpack :: FilePathNT -> String

Newtype String Token 
Instance details

Defined in Distribution.FieldGrammar.Newtypes

Methods

pack :: String -> Token

unpack :: Token -> String

Newtype String Token' 
Instance details

Defined in Distribution.FieldGrammar.Newtypes

Methods

pack :: String -> Token'

unpack :: Token' -> String

Newtype String CompatFilePath 
Instance details

Defined in Distribution.PackageDescription.FieldGrammar

Methods

pack :: String -> CompatFilePath

unpack :: CompatFilePath -> String

Newtype String CompatPackageKey 
Instance details

Defined in Distribution.Types.InstalledPackageInfo.FieldGrammar

Methods

pack :: String -> CompatPackageKey

unpack :: CompatPackageKey -> String

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

TestCoercion SChar 
Instance details

Defined in GHC.TypeLits

Methods

testCoercion :: forall (a :: Char) (b :: Char). SChar a -> SChar b -> Maybe (Coercion a b)

TestEquality SChar 
Instance details

Defined in GHC.TypeLits

Methods

testEquality :: forall (a :: Char) (b :: Char). SChar a -> SChar b -> Maybe (a :~: b)

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

Methods

basicUnsafeFreeze :: Mutable Vector s Char -> ST s (Vector Char)

basicUnsafeThaw :: Vector Char -> ST s (Mutable Vector s Char)

basicLength :: Vector Char -> Int

basicUnsafeSlice :: Int -> Int -> Vector Char -> Vector Char

basicUnsafeIndexM :: Vector Char -> Int -> Box Char

basicUnsafeCopy :: Mutable Vector s Char -> Vector Char -> ST s ()

elemseq :: Vector Char -> Char -> b -> b

MVector MVector Char 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s Char -> Int

basicUnsafeSlice :: Int -> Int -> MVector s Char -> MVector s Char

basicOverlaps :: MVector s Char -> MVector s Char -> Bool

basicUnsafeNew :: Int -> ST s (MVector s Char)

basicInitialize :: MVector s Char -> ST s ()

basicUnsafeReplicate :: Int -> Char -> ST s (MVector s Char)

basicUnsafeRead :: MVector s Char -> Int -> ST s Char

basicUnsafeWrite :: MVector s Char -> Int -> Char -> ST s ()

basicClear :: MVector s Char -> ST s ()

basicSet :: MVector s Char -> Char -> ST s ()

basicUnsafeCopy :: MVector s Char -> MVector s Char -> ST s ()

basicUnsafeMove :: MVector s Char -> MVector s Char -> ST s ()

basicUnsafeGrow :: MVector s Char -> Int -> ST s (MVector s Char)

MArray IOUArray Char IO 
Instance details

Defined in Data.Array.IO.Internals

Methods

getBounds :: Ix i => IOUArray i Char -> IO (i, i)

getNumElements :: Ix i => IOUArray i Char -> IO Int

newArray :: Ix i => (i, i) -> Char -> IO (IOUArray i Char)

newArray_ :: Ix i => (i, i) -> IO (IOUArray i Char)

unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Char)

unsafeRead :: Ix i => IOUArray i Char -> Int -> IO Char

unsafeWrite :: Ix i => IOUArray i Char -> Int -> Char -> IO ()

Monad m => Stream FieldLineStream m Char 
Instance details

Defined in Distribution.Parsec.FieldLineStream

Methods

uncons :: FieldLineStream -> m (Maybe (Char, FieldLineStream))

GEq' (UChar :: k -> Type) 
Instance details

Defined in Generics.Deriving.Eq

Methods

geq' :: forall (a :: k). UChar a -> UChar a -> Bool

Generic1 (URec Char :: k -> Type) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 (URec Char :: k -> Type) 
Instance details

Defined in GHC.Generics

type Rep1 (URec Char :: k -> Type) = D1 ('MetaData "URec" "GHC.Generics" "base" '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

Foldable (UChar :: Type -> Type) 
Instance details

Defined in 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) 
Instance details

Defined in 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) #

GFoldable' (UChar :: Type -> Type) 
Instance details

Defined in Generics.Deriving.Foldable

Methods

gfoldMap' :: Monoid m => (a -> m) -> UChar a -> m

GFunctor' (UChar :: Type -> Type) 
Instance details

Defined in Generics.Deriving.Functor

Methods

gmap' :: (a -> b) -> UChar a -> UChar b

GShow' (UChar :: Type -> Type) 
Instance details

Defined in Generics.Deriving.Show

Methods

gshowsPrec' :: Type -> Int -> UChar a -> ShowS

isNullary :: UChar a -> Bool

GTraversable' (UChar :: Type -> Type) 
Instance details

Defined in Generics.Deriving.Traversable

Methods

gtraverse' :: Applicative f => (a -> f b) -> UChar a -> f (UChar b)

FromValue a => FromValue (ParseCommonOptions a) 
Instance details

Defined in Hpack.Config

Methods

fromValue :: Value -> Parser (ParseCommonOptions a) Source #

FromValue a => FromValue (ParseConditionalSection a) 
Instance details

Defined in Hpack.Config

Methods

fromValue :: Value -> Parser (ParseConditionalSection a) Source #

FromValue a => FromValue (ParseThenElse a) 
Instance details

Defined in Hpack.Config

Methods

fromValue :: Value -> Parser (ParseThenElse a) Source #

QueryKeyLike [Char] 
Instance details

Defined in Network.HTTP.Types.QueryLike

Methods

toQueryKey :: [Char] -> ByteString

QueryValueLike [Char] 
Instance details

Defined in Network.HTTP.Types.QueryLike

PersistField [Char] 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: [Char] -> PersistValue

fromPersistValue :: PersistValue -> Either Text [Char]

PersistFieldSql [Char] 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy [Char] -> SqlType

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 ()

FromJSON (FilePath -> HackageCreds) 
Instance details

Defined in Stack.Upload

Functor (URec Char :: Type -> Type) 
Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> URec Char a -> URec Char b #

(<$) :: a -> URec Char b -> URec Char a #

GEq (UChar p) 
Instance details

Defined in Generics.Deriving.Eq

Methods

geq :: UChar p -> UChar p -> Bool

GShow (UChar p) 
Instance details

Defined in Generics.Deriving.Show

Methods

gshowsPrec :: Int -> UChar p -> ShowS

gshows :: UChar p -> ShowS

gshow :: UChar p -> String

gshowList :: [UChar p] -> ShowS

FromValue a => FromValue (Map String a) 
Instance details

Defined in Data.Aeson.Config.FromValue

ToMustache ω => ToMustache (Map String ω) 
Instance details

Defined in Text.Mustache.Internal.Types

ToMustache ω => ToMustache (HashMap String ω) 
Instance details

Defined in Text.Mustache.Internal.Types

MonadReader (Context Value, TemplateCache) SubM 
Instance details

Defined in Text.Mustache.Internal.Types

Generic (URec Char p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Char p) 
Instance details

Defined in GHC.Generics

type Rep (URec Char p) = D1 ('MetaData "URec" "GHC.Generics" "base" '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) 
Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> URec Char p -> ShowS

show :: URec Char p -> String #

showList :: [URec Char p] -> ShowS

Eq (URec Char p) 
Instance details

Defined in GHC.Generics

Methods

(==) :: URec Char p -> URec Char p -> Bool #

(/=) :: URec Char p -> URec Char p -> Bool #

Ord (URec Char p) 
Instance details

Defined in GHC.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 Difference Char = Int
type PrimSize Char 
Instance details

Defined in Basement.PrimType

type PrimSize Char = 4
newtype Vector Char 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector Char = V_Char (Vector Char)
data URec Char (p :: k) 
Instance details

Defined in GHC.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 Data.Type.Ord

type Compare (a :: Char) (b :: Char) = CmpChar a b
type Rep1 (URec Char :: k -> Type) 
Instance details

Defined in GHC.Generics

type Rep1 (URec Char :: k -> Type) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UChar" 'PrefixI 'True) (S1 ('MetaSel ('Just "uChar#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UChar :: k -> Type)))
type Rep (URec Char p) 
Instance details

Defined in GHC.Generics

type Rep (URec Char p) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UChar" 'PrefixI 'True) (S1 ('MetaSel ('Just "uChar#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UChar :: Type -> Type)))

data Double #

Instances

Instances details
Structured Double 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy Double -> Structure

structureHash' :: Tagged Double MD5

FromJSON Double 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Double 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction Double

fromJSONKeyList :: FromJSONKeyFunction [Double]

ToJSON Double 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Double -> Value

toEncoding :: Double -> Encoding

toJSONList :: [Double] -> Value

toEncodingList :: [Double] -> Encoding

omitField :: Double -> Bool

ToJSONKey Double 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction Double

toJSONKeyList :: ToJSONKeyFunction [Double]

Data Double 
Instance details

Defined in 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 #

Storable Double 
Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Double -> Int

alignment :: Double -> Int

peekElemOff :: Ptr Double -> Int -> IO Double

pokeElemOff :: Ptr Double -> Int -> Double -> IO ()

peekByteOff :: Ptr b -> Int -> IO Double

pokeByteOff :: Ptr b -> Int -> Double -> IO ()

peek :: Ptr Double -> IO Double

poke :: Ptr Double -> Double -> IO ()

Floating Double 
Instance details

Defined in GHC.Float

RealFloat Double 
Instance details

Defined in GHC.Float

Read Double 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS Double

readList :: ReadS [Double]

readPrec :: ReadPrec Double

readListPrec :: ReadPrec [Double]

PrintfArg Double 
Instance details

Defined in Text.Printf

Methods

formatArg :: Double -> FieldFormatter

parseFormat :: Double -> ModifierParser

Subtractive Double 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Double 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Double = Double

Methods

(-) :: Double -> Double -> Difference Double

PrimType Double 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Double 
Instance details

Defined in Basement.PrimType

type PrimSize Double = 8

Methods

primSizeInBytes :: Proxy Double -> CountOf Word8

primShiftToBytes :: Proxy Double -> Int

primBaUIndex :: ByteArray# -> Offset Double -> Double

primMbaURead :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Double -> prim Double

primMbaUWrite :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Double -> Double -> prim ()

primAddrIndex :: Addr# -> Offset Double -> Double

primAddrRead :: PrimMonad prim => Addr# -> Offset Double -> prim Double

primAddrWrite :: PrimMonad prim => Addr# -> Offset Double -> Double -> prim ()

Binary Double 
Instance details

Defined in Data.Binary.Class

Methods

put :: Double -> Put

get :: Get Double

putList :: [Double] -> Put

NFData Double 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Double -> () #

GEnum Double 
Instance details

Defined in Generics.Deriving.Enum

Methods

genum :: [Double]

GEq Double 
Instance details

Defined in Generics.Deriving.Eq

Methods

geq :: Double -> Double -> Bool

GShow Double 
Instance details

Defined in Generics.Deriving.Show

Methods

gshowsPrec :: Int -> Double -> ShowS

gshows :: Double -> ShowS

gshow :: Double -> String

gshowList :: [Double] -> ShowS

Uniplate Double 
Instance details

Defined in Generics.Deriving.Uniplate

Eq Double 
Instance details

Defined in GHC.Classes

Methods

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

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

Ord Double 
Instance details

Defined in GHC.Classes

Hashable Double 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Double -> Int

hash :: Double -> Int

FromHttpApiData Double 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Double 
Instance details

Defined in Web.Internal.HttpApiData

ToMustache Double 
Instance details

Defined in Text.Mustache.Internal.Types

PersistField Double 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Double -> PersistValue

fromPersistValue :: PersistValue -> Either Text Double

PersistFieldSql Double 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Double -> SqlType

Pretty Double 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJClass

Methods

pPrintPrec :: PrettyLevel -> Rational -> Double -> Doc ann

pPrint :: Double -> Doc ann

pPrintList :: PrettyLevel -> [Double] -> Doc ann

Pretty Double 
Instance details

Defined in Text.PrettyPrint.HughesPJClass

Methods

pPrintPrec :: PrettyLevel -> Rational -> Double -> Doc

pPrint :: Double -> Doc

pPrintList :: PrettyLevel -> [Double] -> Doc

Pretty Double 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Double -> Doc ann

prettyList :: [Double] -> Doc ann

Random Double 
Instance details

Defined in System.Random

Methods

randomR :: RandomGen g => (Double, Double) -> g -> (Double, g)

random :: RandomGen g => g -> (Double, g)

randomRs :: RandomGen g => (Double, Double) -> g -> [Double]

randoms :: RandomGen g => g -> [Double]

UniformRange Double 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Double, Double) -> g -> m Double

Display Double 
Instance details

Defined in RIO.Prelude.Display

Unbox Double 
Instance details

Defined in Data.Vector.Unboxed.Base

ToYaml Double 
Instance details

Defined in Data.Yaml.Builder

Methods

toYaml :: Double -> YamlBuilder

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

Methods

basicUnsafeFreeze :: Mutable Vector s Double -> ST s (Vector Double)

basicUnsafeThaw :: Vector Double -> ST s (Mutable Vector s Double)

basicLength :: Vector Double -> Int

basicUnsafeSlice :: Int -> Int -> Vector Double -> Vector Double

basicUnsafeIndexM :: Vector Double -> Int -> Box Double

basicUnsafeCopy :: Mutable Vector s Double -> Vector Double -> ST s ()

elemseq :: Vector Double -> Double -> b -> b

MVector MVector Double 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s Double -> Int

basicUnsafeSlice :: Int -> Int -> MVector s Double -> MVector s Double

basicOverlaps :: MVector s Double -> MVector s Double -> Bool

basicUnsafeNew :: Int -> ST s (MVector s Double)

basicInitialize :: MVector s Double -> ST s ()

basicUnsafeReplicate :: Int -> Double -> ST s (MVector s Double)

basicUnsafeRead :: MVector s Double -> Int -> ST s Double

basicUnsafeWrite :: MVector s Double -> Int -> Double -> ST s ()

basicClear :: MVector s Double -> ST s ()

basicSet :: MVector s Double -> Double -> ST s ()

basicUnsafeCopy :: MVector s Double -> MVector s Double -> ST s ()

basicUnsafeMove :: MVector s Double -> MVector s Double -> ST s ()

basicUnsafeGrow :: MVector s Double -> Int -> ST s (MVector s Double)

MArray IOUArray Double IO 
Instance details

Defined in Data.Array.IO.Internals

Methods

getBounds :: Ix i => IOUArray i Double -> IO (i, i)

getNumElements :: Ix i => IOUArray i Double -> IO Int

newArray :: Ix i => (i, i) -> Double -> IO (IOUArray i Double)

newArray_ :: Ix i => (i, i) -> IO (IOUArray i Double)

unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Double)

unsafeRead :: Ix i => IOUArray i Double -> Int -> IO Double

unsafeWrite :: Ix i => IOUArray i Double -> Int -> Double -> IO ()

GEq' (UDouble :: k -> Type) 
Instance details

Defined in Generics.Deriving.Eq

Methods

geq' :: forall (a :: k). UDouble a -> UDouble a -> Bool

Generic1 (URec Double :: k -> Type) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 (URec Double :: k -> Type) 
Instance details

Defined in GHC.Generics

type Rep1 (URec Double :: k -> Type) = D1 ('MetaData "URec" "GHC.Generics" "base" '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) 
Instance details

Defined in 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) 
Instance details

Defined in 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) #

GFoldable' (UDouble :: Type -> Type) 
Instance details

Defined in Generics.Deriving.Foldable

Methods

gfoldMap' :: Monoid m => (a -> m) -> UDouble a -> m

GFunctor' (UDouble :: Type -> Type) 
Instance details

Defined in Generics.Deriving.Functor

Methods

gmap' :: (a -> b) -> UDouble a -> UDouble b

GShow' (UDouble :: Type -> Type) 
Instance details

Defined in Generics.Deriving.Show

Methods

gshowsPrec' :: Type -> Int -> UDouble a -> ShowS

isNullary :: UDouble a -> Bool

GTraversable' (UDouble :: Type -> Type) 
Instance details

Defined in Generics.Deriving.Traversable

Methods

gtraverse' :: Applicative f => (a -> f b) -> UDouble a -> f (UDouble b)

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) 
Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> URec Double a -> URec Double b #

(<$) :: a -> URec Double b -> URec Double a #

GEq (UDouble p) 
Instance details

Defined in Generics.Deriving.Eq

Methods

geq :: UDouble p -> UDouble p -> Bool

GShow (UDouble p) 
Instance details

Defined in Generics.Deriving.Show

Methods

gshowsPrec :: Int -> UDouble p -> ShowS

gshows :: UDouble p -> ShowS

gshow :: UDouble p -> String

gshowList :: [UDouble p] -> ShowS

Generic (URec Double p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Double p) 
Instance details

Defined in GHC.Generics

type Rep (URec Double p) = D1 ('MetaData "URec" "GHC.Generics" "base" '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) 
Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> URec Double p -> ShowS

show :: URec Double p -> String #

showList :: [URec Double p] -> ShowS

Eq (URec Double p) 
Instance details

Defined in GHC.Generics

Methods

(==) :: URec Double p -> URec Double p -> Bool #

(/=) :: URec Double p -> URec Double p -> Bool #

Ord (URec Double p) 
Instance details

Defined in GHC.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 Difference Double = Double
type PrimSize Double 
Instance details

Defined in Basement.PrimType

type PrimSize Double = 8
newtype Vector Double 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector Double = V_Double (Vector Double)
data URec Double (p :: k) 
Instance details

Defined in GHC.Generics

data URec Double (p :: k) = UDouble {}
newtype MVector s Double 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Double = MV_Double (MVector s Double)
type Rep1 (URec Double :: k -> Type) 
Instance details

Defined in GHC.Generics

type Rep1 (URec Double :: k -> Type) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UDouble" 'PrefixI 'True) (S1 ('MetaSel ('Just "uDouble#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UDouble :: k -> Type)))
type Rep (URec Double p) 
Instance details

Defined in GHC.Generics

type Rep (URec Double p) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UDouble" 'PrefixI 'True) (S1 ('MetaSel ('Just "uDouble#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UDouble :: Type -> Type)))

data Float #

Instances

Instances details
Structured Float 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy Float -> Structure

structureHash' :: Tagged Float MD5

FromJSON Float 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Float

parseJSONList :: Value -> Parser [Float]

omittedField :: Maybe Float

FromJSONKey Float 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction Float

fromJSONKeyList :: FromJSONKeyFunction [Float]

ToJSON Float 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Float -> Value

toEncoding :: Float -> Encoding

toJSONList :: [Float] -> Value

toEncodingList :: [Float] -> Encoding

omitField :: Float -> Bool

ToJSONKey Float 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction Float

toJSONKeyList :: ToJSONKeyFunction [Float]

Data Float 
Instance details

Defined in Data.Data

Methods

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

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

toConstr :: Float -> Constr #

dataTypeOf :: Float -> DataType #

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

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

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

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

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

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

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

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

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

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

Storable Float 
Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Float -> Int

alignment :: Float -> Int

peekElemOff :: Ptr Float -> Int -> IO Float

pokeElemOff :: Ptr Float -> Int -> Float -> IO ()

peekByteOff :: Ptr b -> Int -> IO Float

pokeByteOff :: Ptr b -> Int -> Float -> IO ()

peek :: Ptr Float -> IO Float

poke :: Ptr Float -> Float -> IO ()

Floating Float 
Instance details

Defined in GHC.Float

RealFloat Float 
Instance details

Defined in GHC.Float

Read Float 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS Float

readList :: ReadS [Float]

readPrec :: ReadPrec Float

readListPrec :: ReadPrec [Float]

PrintfArg Float 
Instance details

Defined in Text.Printf

Methods

formatArg :: Float -> FieldFormatter

parseFormat :: Float -> ModifierParser

Subtractive Float 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Float 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Float = Float

Methods

(-) :: Float -> Float -> Difference Float

PrimType Float 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Float 
Instance details

Defined in Basement.PrimType

type PrimSize Float = 4

Methods

primSizeInBytes :: Proxy Float -> CountOf Word8

primShiftToBytes :: Proxy Float -> Int

primBaUIndex :: ByteArray# -> Offset Float -> Float

primMbaURead :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Float -> prim Float

primMbaUWrite :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Float -> Float -> prim ()

primAddrIndex :: Addr# -> Offset Float -> Float

primAddrRead :: PrimMonad prim => Addr# -> Offset Float -> prim Float

primAddrWrite :: PrimMonad prim => Addr# -> Offset Float -> Float -> prim ()

Binary Float 
Instance details

Defined in Data.Binary.Class

Methods

put :: Float -> Put

get :: Get Float

putList :: [Float] -> Put

NFData Float 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Float -> () #

GEnum Float 
Instance details

Defined in Generics.Deriving.Enum

Methods

genum :: [Float]

GEq Float 
Instance details

Defined in Generics.Deriving.Eq

Methods

geq :: Float -> Float -> Bool

GShow Float 
Instance details

Defined in Generics.Deriving.Show

Methods

gshowsPrec :: Int -> Float -> ShowS

gshows :: Float -> ShowS

gshow :: Float -> String

gshowList :: [Float] -> ShowS

Uniplate Float 
Instance details

Defined in Generics.Deriving.Uniplate

Methods

children :: Float -> [Float]

context :: Float -> [Float] -> Float

descend :: (Float -> Float) -> Float -> Float

descendM :: Monad m => (Float -> m Float) -> Float -> m Float

transform :: (Float -> Float) -> Float -> Float

transformM :: Monad m => (Float -> m Float) -> Float -> m Float

Eq Float 
Instance details

Defined in GHC.Classes

Methods

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

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

Ord Float 
Instance details

Defined in GHC.Classes

Methods

compare :: Float -> Float -> Ordering #

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

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

(>) :: Float -> Float -> Bool #

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

max :: Float -> Float -> Float #

min :: Float -> Float -> Float #

Hashable Float 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Float -> Int

hash :: Float -> Int

FromHttpApiData Float 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Float 
Instance details

Defined in Web.Internal.HttpApiData

ToMustache Float 
Instance details

Defined in Text.Mustache.Internal.Types

Pretty Float 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJClass

Methods

pPrintPrec :: PrettyLevel -> Rational -> Float -> Doc ann

pPrint :: Float -> Doc ann

pPrintList :: PrettyLevel -> [Float] -> Doc ann

Pretty Float 
Instance details

Defined in Text.PrettyPrint.HughesPJClass

Methods

pPrintPrec :: PrettyLevel -> Rational -> Float -> Doc

pPrint :: Float -> Doc

pPrintList :: PrettyLevel -> [Float] -> Doc

Pretty Float 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Float -> Doc ann

prettyList :: [Float] -> Doc ann

Random Float 
Instance details

Defined in System.Random

Methods

randomR :: RandomGen g => (Float, Float) -> g -> (Float, g)

random :: RandomGen g => g -> (Float, g)

randomRs :: RandomGen g => (Float, Float) -> g -> [Float]

randoms :: RandomGen g => g -> [Float]

UniformRange Float 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Float, Float) -> g -> m Float

Display Float 
Instance details

Defined in RIO.Prelude.Display

Unbox Float 
Instance details

Defined in Data.Vector.Unboxed.Base

IArray UArray Float 
Instance details

Defined in Data.Array.Base

Methods

bounds :: Ix i => UArray i Float -> (i, i)

numElements :: Ix i => UArray i Float -> Int

unsafeArray :: Ix i => (i, i) -> [(Int, Float)] -> UArray i Float

unsafeAt :: Ix i => UArray i Float -> Int -> Float

unsafeReplace :: Ix i => UArray i Float -> [(Int, Float)] -> UArray i Float

unsafeAccum :: Ix i => (Float -> e' -> Float) -> UArray i Float -> [(Int, e')] -> UArray i Float

unsafeAccumArray :: Ix i => (Float -> e' -> Float) -> Float -> (i, i) -> [(Int, e')] -> UArray i Float

Lift Float 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Float -> m Exp

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

Vector Vector Float 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: Mutable Vector s Float -> ST s (Vector Float)

basicUnsafeThaw :: Vector Float -> ST s (Mutable Vector s Float)

basicLength :: Vector Float -> Int

basicUnsafeSlice :: Int -> Int -> Vector Float -> Vector Float

basicUnsafeIndexM :: Vector Float -> Int -> Box Float

basicUnsafeCopy :: Mutable Vector s Float -> Vector Float -> ST s ()

elemseq :: Vector Float -> Float -> b -> b

MVector MVector Float 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s Float -> Int

basicUnsafeSlice :: Int -> Int -> MVector s Float -> MVector s Float

basicOverlaps :: MVector s Float -> MVector s Float -> Bool

basicUnsafeNew :: Int -> ST s (MVector s Float)

basicInitialize :: MVector s Float -> ST s ()

basicUnsafeReplicate :: Int -> Float -> ST s (MVector s Float)

basicUnsafeRead :: MVector s Float -> Int -> ST s Float

basicUnsafeWrite :: MVector s Float -> Int -> Float -> ST s ()

basicClear :: MVector s Float -> ST s ()

basicSet :: MVector s Float -> Float -> ST s ()

basicUnsafeCopy :: MVector s Float -> MVector s Float -> ST s ()

basicUnsafeMove :: MVector s Float -> MVector s Float -> ST s ()

basicUnsafeGrow :: MVector s Float -> Int -> ST s (MVector s Float)

MArray IOUArray Float IO 
Instance details

Defined in Data.Array.IO.Internals

Methods

getBounds :: Ix i => IOUArray i Float -> IO (i, i)

getNumElements :: Ix i => IOUArray i Float -> IO Int

newArray :: Ix i => (i, i) -> Float -> IO (IOUArray i Float)

newArray_ :: Ix i => (i, i) -> IO (IOUArray i Float)

unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Float)

unsafeRead :: Ix i => IOUArray i Float -> Int -> IO Float

unsafeWrite :: Ix i => IOUArray i Float -> Int -> Float -> IO ()

GEq' (UFloat :: k -> Type) 
Instance details

Defined in Generics.Deriving.Eq

Methods

geq' :: forall (a :: k). UFloat a -> UFloat a -> Bool

Generic1 (URec Float :: k -> Type) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 (URec Float :: k -> Type) 
Instance details

Defined in GHC.Generics

type Rep1 (URec Float :: k -> Type) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UFloat" 'PrefixI 'True) (S1 ('MetaSel ('Just "uFloat#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UFloat :: k -> Type)))

Methods

from1 :: forall (a :: k). URec Float a -> Rep1 (URec Float :: k -> Type) a

to1 :: forall (a :: k). Rep1 (URec Float :: k -> Type) a -> URec Float a

Foldable (UFloat :: Type -> Type) 
Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => UFloat m -> m #

foldMap :: Monoid m => (a -> m) -> UFloat a -> m #

foldMap' :: Monoid m => (a -> m) -> UFloat a -> m

foldr :: (a -> b -> b) -> b -> UFloat a -> b #

foldr' :: (a -> b -> b) -> b -> UFloat a -> b #

foldl :: (b -> a -> b) -> b -> UFloat a -> b

foldl' :: (b -> a -> b) -> b -> UFloat a -> b #

foldr1 :: (a -> a -> a) -> UFloat a -> a

foldl1 :: (a -> a -> a) -> UFloat a -> a

toList :: UFloat a -> [a] #

null :: UFloat a -> Bool #

length :: UFloat a -> Int #

elem :: Eq a => a -> UFloat a -> Bool #

maximum :: Ord a => UFloat a -> a

minimum :: Ord a => UFloat a -> a

sum :: Num a => UFloat a -> a #

product :: Num a => UFloat a -> a #

Traversable (UFloat :: Type -> Type) 
Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> UFloat a -> f (UFloat b) #

sequenceA :: Applicative f => UFloat (f a) -> f (UFloat a) #

mapM :: Monad m => (a -> m b) -> UFloat a -> m (UFloat b) #

sequence :: Monad m => UFloat (m a) -> m (UFloat a) #

GFoldable' (UFloat :: Type -> Type) 
Instance details

Defined in Generics.Deriving.Foldable

Methods

gfoldMap' :: Monoid m => (a -> m) -> UFloat a -> m

GFunctor' (UFloat :: Type -> Type) 
Instance details

Defined in Generics.Deriving.Functor

Methods

gmap' :: (a -> b) -> UFloat a -> UFloat b

GShow' (UFloat :: Type -> Type) 
Instance details

Defined in Generics.Deriving.Show

Methods

gshowsPrec' :: Type -> Int -> UFloat a -> ShowS

isNullary :: UFloat a -> Bool

GTraversable' (UFloat :: Type -> Type) 
Instance details

Defined in Generics.Deriving.Traversable

Methods

gtraverse' :: Applicative f => (a -> f b) -> UFloat a -> f (UFloat b)

MArray (STUArray s) Float (ST s) 
Instance details

Defined in Data.Array.Base

Methods

getBounds :: Ix i => STUArray s i Float -> ST s (i, i)

getNumElements :: Ix i => STUArray s i Float -> ST s Int

newArray :: Ix i => (i, i) -> Float -> ST s (STUArray s i Float)

newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Float)

unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Float)

unsafeRead :: Ix i => STUArray s i Float -> Int -> ST s Float

unsafeWrite :: Ix i => STUArray s i Float -> Int -> Float -> ST s ()

Functor (URec Float :: Type -> Type) 
Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> URec Float a -> URec Float b #

(<$) :: a -> URec Float b -> URec Float a #

GEq (UFloat p) 
Instance details

Defined in Generics.Deriving.Eq

Methods

geq :: UFloat p -> UFloat p -> Bool

GShow (UFloat p) 
Instance details

Defined in Generics.Deriving.Show

Methods

gshowsPrec :: Int -> UFloat p -> ShowS

gshows :: UFloat p -> ShowS

gshow :: UFloat p -> String

gshowList :: [UFloat p] -> ShowS

Generic (URec Float p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Float p) 
Instance details

Defined in GHC.Generics

type Rep (URec Float p) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UFloat" 'PrefixI 'True) (S1 ('MetaSel ('Just "uFloat#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UFloat :: Type -> Type)))

Methods

from :: URec Float p -> Rep (URec Float p) x

to :: Rep (URec Float p) x -> URec Float p

Show (URec Float p) 
Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> URec Float p -> ShowS

show :: URec Float p -> String #

showList :: [URec Float p] -> ShowS

Eq (URec Float p) 
Instance details

Defined in GHC.Generics

Methods

(==) :: URec Float p -> URec Float p -> Bool #

(/=) :: URec Float p -> URec Float p -> Bool #

Ord (URec Float p) 
Instance details

Defined in GHC.Generics

Methods

compare :: URec Float p -> URec Float p -> Ordering #

(<) :: URec Float p -> URec Float p -> Bool #

(<=) :: URec Float p -> URec Float p -> Bool #

(>) :: URec Float p -> URec Float p -> Bool #

(>=) :: URec Float p -> URec Float p -> Bool #

max :: URec Float p -> URec Float p -> URec Float p #

min :: URec Float p -> URec Float p -> URec Float p #

type Difference Float 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Float = Float
type PrimSize Float 
Instance details

Defined in Basement.PrimType

type PrimSize Float = 4
newtype Vector Float 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector Float = V_Float (Vector Float)
data URec Float (p :: k) 
Instance details

Defined in GHC.Generics

data URec Float (p :: k) = UFloat {}
newtype MVector s Float 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Float = MV_Float (MVector s Float)
type Rep1 (URec Float :: k -> Type) 
Instance details

Defined in GHC.Generics

type Rep1 (URec Float :: k -> Type) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UFloat" 'PrefixI 'True) (S1 ('MetaSel ('Just "uFloat#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UFloat :: k -> Type)))
type Rep (URec Float p) 
Instance details

Defined in GHC.Generics

type Rep (URec Float p) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UFloat" 'PrefixI 'True) (S1 ('MetaSel ('Just "uFloat#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UFloat :: Type -> Type)))

data Int #

Instances

Instances details
Pretty Int 
Instance details

Defined in Distribution.Pretty

Methods

pretty :: Int -> Doc

prettyVersioned :: CabalSpecVersion -> Int -> Doc

Structured Int 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy Int -> Structure

structureHash' :: Tagged Int MD5

FromJSON Int 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Int

parseJSONList :: Value -> Parser [Int]

omittedField :: Maybe Int

FromJSONKey Int 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction Int

fromJSONKeyList :: FromJSONKeyFunction [Int]

ToJSON Int 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Int -> Value

toEncoding :: Int -> Encoding

toJSONList :: [Int] -> Value

toEncodingList :: [Int] -> Encoding

omitField :: Int -> Bool

ToJSONKey Int 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction Int

toJSONKeyList :: ToJSONKeyFunction [Int]

Data Int 
Instance details

Defined in 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 #

Storable Int 
Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Int -> Int

alignment :: Int -> Int

peekElemOff :: Ptr Int -> Int -> IO Int

pokeElemOff :: Ptr Int -> Int -> Int -> IO ()

peekByteOff :: Ptr b -> Int -> IO Int

pokeByteOff :: Ptr b -> Int -> Int -> IO ()

peek :: Ptr Int -> IO Int

poke :: Ptr Int -> Int -> IO ()

Bits Int 
Instance details

Defined in GHC.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 
Instance details

Defined in GHC.Bits

Bounded Int 
Instance details

Defined in GHC.Enum

Methods

minBound :: Int #

maxBound :: Int #

Enum Int 
Instance details

Defined in GHC.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]

Ix Int 
Instance details

Defined in GHC.Ix

Methods

range :: (Int, Int) -> [Int]

index :: (Int, Int) -> Int -> Int

unsafeIndex :: (Int, Int) -> Int -> Int

inRange :: (Int, Int) -> Int -> Bool

rangeSize :: (Int, Int) -> Int

unsafeRangeSize :: (Int, Int) -> Int

Num Int 
Instance details

Defined in GHC.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 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS Int

readList :: ReadS [Int]

readPrec :: ReadPrec Int

readListPrec :: ReadPrec [Int]

Integral Int 
Instance details

Defined in GHC.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 
Instance details

Defined in GHC.Real

Methods

toRational :: Int -> Rational #

Show Int 
Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Int -> ShowS

show :: Int -> String #

showList :: [Int] -> ShowS

PrintfArg Int 
Instance details

Defined in Text.Printf

Methods

formatArg :: Int -> FieldFormatter

parseFormat :: Int -> ModifierParser

Subtractive Int 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Int 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Int = Int

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

Methods

primSizeInBytes :: Proxy Int -> CountOf Word8

primShiftToBytes :: Proxy Int -> Int

primBaUIndex :: ByteArray# -> Offset Int -> Int

primMbaURead :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Int -> prim Int

primMbaUWrite :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Int -> Int -> prim ()

primAddrIndex :: Addr# -> Offset Int -> Int

primAddrRead :: PrimMonad prim => Addr# -> Offset Int -> prim Int

primAddrWrite :: PrimMonad prim => Addr# -> Offset Int -> Int -> prim ()

Binary Int 
Instance details

Defined in Data.Binary.Class

Methods

put :: Int -> Put

get :: Get Int

putList :: [Int] -> Put

NFData Int 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int -> () #

GEnum Int 
Instance details

Defined in Generics.Deriving.Enum

Methods

genum :: [Int]

GIx Int 
Instance details

Defined in Generics.Deriving.Enum

Methods

range :: (Int, Int) -> [Int]

index :: (Int, Int) -> Int -> Int

inRange :: (Int, Int) -> Int -> Bool

GEq Int 
Instance details

Defined in Generics.Deriving.Eq

Methods

geq :: Int -> Int -> Bool

GShow Int 
Instance details

Defined in Generics.Deriving.Show

Methods

gshowsPrec :: Int -> Int -> ShowS

gshows :: Int -> ShowS

gshow :: Int -> String

gshowList :: [Int] -> ShowS

Uniplate Int 
Instance details

Defined in Generics.Deriving.Uniplate

Methods

children :: Int -> [Int]

context :: Int -> [Int] -> Int

descend :: (Int -> Int) -> Int -> Int

descendM :: Monad m => (Int -> m Int) -> Int -> m Int

transform :: (Int -> Int) -> Int -> Int

transformM :: Monad m => (Int -> m Int) -> Int -> m Int

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

FromValue Int 
Instance details

Defined in Data.Aeson.Config.FromValue

HpcHash Int 
Instance details

Defined in Trace.Hpc.Util

Methods

toHash :: Int -> Hash

FromHttpApiData Int 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Int 
Instance details

Defined in Web.Internal.HttpApiData

ToMustache Int 
Instance details

Defined in Text.Mustache.Internal.Types

PathPiece Int 
Instance details

Defined in Web.PathPieces

PersistField Int 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Int -> PersistValue

fromPersistValue :: PersistValue -> Either Text Int

PersistFieldSql Int 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Int -> SqlType

Pretty Int 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJClass

Methods

pPrintPrec :: PrettyLevel -> Rational -> Int -> Doc ann

pPrint :: Int -> Doc ann

pPrintList :: PrettyLevel -> [Int] -> Doc ann

Pretty Int 
Instance details

Defined in Text.PrettyPrint.HughesPJClass

Methods

pPrintPrec :: PrettyLevel -> Rational -> Int -> Doc

pPrint :: Int -> Doc

pPrintList :: PrettyLevel -> [Int] -> Doc

Pretty Int 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Int -> Doc ann

prettyList :: [Int] -> Doc ann

Random Int 
Instance details

Defined in System.Random

Methods

randomR :: RandomGen g => (Int, Int) -> g -> (Int, g)

random :: RandomGen g => g -> (Int, g)

randomRs :: RandomGen g => (Int, Int) -> g -> [Int]

randoms :: RandomGen g => g -> [Int]

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

Display Int 
Instance details

Defined in RIO.Prelude.Display

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

ToYaml Int 
Instance details

Defined in Data.Yaml.Builder

Methods

toYaml :: Int -> YamlBuilder

FromYaml Int 
Instance details

Defined in Data.Yaml.Parser

Methods

fromYaml :: YamlValue -> YamlParser Int

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

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

Methods

basicUnsafeFreeze :: Mutable Vector s Int -> ST s (Vector Int)

basicUnsafeThaw :: Vector Int -> ST s (Mutable Vector s Int)

basicLength :: Vector Int -> Int

basicUnsafeSlice :: Int -> Int -> Vector Int -> Vector Int

basicUnsafeIndexM :: Vector Int -> Int -> Box Int

basicUnsafeCopy :: Mutable Vector s Int -> Vector Int -> ST s ()

elemseq :: Vector Int -> Int -> b -> b

MVector MVector Int 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s Int -> Int

basicUnsafeSlice :: Int -> Int -> MVector s Int -> MVector s Int

basicOverlaps :: MVector s Int -> MVector s Int -> Bool

basicUnsafeNew :: Int -> ST s (MVector s Int)

basicInitialize :: MVector s Int -> ST s ()

basicUnsafeReplicate :: Int -> Int -> ST s (MVector s Int)

basicUnsafeRead :: MVector s Int -> Int -> ST s Int

basicUnsafeWrite :: MVector s Int -> Int -> Int -> ST s ()

basicClear :: MVector s Int -> ST s ()

basicSet :: MVector s Int -> Int -> ST s ()

basicUnsafeCopy :: MVector s Int -> MVector s Int -> ST s ()

basicUnsafeMove :: MVector s Int -> MVector s Int -> ST s ()

basicUnsafeGrow :: MVector s Int -> Int -> ST s (MVector s Int)

MArray IOUArray Int IO 
Instance details

Defined in Data.Array.IO.Internals

Methods

getBounds :: Ix i => IOUArray i Int -> IO (i, i)

getNumElements :: Ix i => IOUArray i Int -> IO Int

newArray :: Ix i => (i, i) -> Int -> IO (IOUArray i Int)

newArray_ :: Ix i => (i, i) -> IO (IOUArray i Int)

unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Int)

unsafeRead :: Ix i => IOUArray i Int -> Int -> IO Int

unsafeWrite :: Ix i => IOUArray i Int -> Int -> Int -> IO ()

GEq' (UInt :: k -> Type) 
Instance details

Defined in Generics.Deriving.Eq

Methods

geq' :: forall (a :: k). UInt a -> UInt a -> Bool

Generic1 (URec Int :: k -> Type) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 (URec Int :: k -> Type) 
Instance details

Defined in GHC.Generics

type Rep1 (URec Int :: k -> Type) = D1 ('MetaData "URec" "GHC.Generics" "base" '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) 
Instance details

Defined in 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) 
Instance details

Defined in 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) #

GFoldable' (UInt :: Type -> Type) 
Instance details

Defined in Generics.Deriving.Foldable

Methods

gfoldMap' :: Monoid m => (a -> m) -> UInt a -> m

GFunctor' (UInt :: Type -> Type) 
Instance details

Defined in Generics.Deriving.Functor

Methods

gmap' :: (a -> b) -> UInt a -> UInt b

GShow' (UInt :: Type -> Type) 
Instance details

Defined in Generics.Deriving.Show

Methods

gshowsPrec' :: Type -> Int -> UInt a -> ShowS

isNullary :: UInt a -> Bool

GTraversable' (UInt :: Type -> Type) 
Instance details

Defined in Generics.Deriving.Traversable

Methods

gtraverse' :: Applicative f => (a -> f b) -> UInt a -> f (UInt b)

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) 
Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> URec Int a -> URec Int b #

(<$) :: a -> URec Int b -> URec Int a #

GEq (UInt p) 
Instance details

Defined in Generics.Deriving.Eq

Methods

geq :: UInt p -> UInt p -> Bool

GShow (UInt p) 
Instance details

Defined in Generics.Deriving.Show

Methods

gshowsPrec :: Int -> UInt p -> ShowS

gshows :: UInt p -> ShowS

gshow :: UInt p -> String

gshowList :: [UInt p] -> ShowS

Generic (URec Int p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Int p) 
Instance details

Defined in GHC.Generics

type Rep (URec Int p) = D1 ('MetaData "URec" "GHC.Generics" "base" '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) 
Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> URec Int p -> ShowS

show :: URec Int p -> String #

showList :: [URec Int p] -> ShowS

Eq (URec Int p) 
Instance details

Defined in GHC.Generics

Methods

(==) :: URec Int p -> URec Int p -> Bool #

(/=) :: URec Int p -> URec Int p -> Bool #

Ord (URec Int p) 
Instance details

Defined in GHC.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 NatNumMaxBound Int = NatNumMaxBound Int64
type Difference Int 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Int = Int
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) 
Instance details

Defined in GHC.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) 
Instance details

Defined in GHC.Generics

type Rep1 (URec Int :: k -> Type) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UInt" 'PrefixI 'True) (S1 ('MetaSel ('Just "uInt#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UInt :: k -> Type)))
type Rep (URec Int p) 
Instance details

Defined in GHC.Generics

type Rep (URec Int p) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UInt" 'PrefixI 'True) (S1 ('MetaSel ('Just "uInt#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UInt :: Type -> Type)))

data Word #

Instances

Instances details
Structured Word 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy Word -> Structure

structureHash' :: Tagged Word MD5

FromJSON Word 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Word

parseJSONList :: Value -> Parser [Word]

omittedField :: Maybe Word

FromJSONKey Word 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction Word

fromJSONKeyList :: FromJSONKeyFunction [Word]

ToJSON Word 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Word -> Value

toEncoding :: Word -> Encoding

toJSONList :: [Word] -> Value

toEncodingList :: [Word] -> Encoding

omitField :: Word -> Bool

ToJSONKey Word 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction Word

toJSONKeyList :: ToJSONKeyFunction [Word]

Data Word 
Instance details

Defined in Data.Data

Methods

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

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

toConstr :: Word -> Constr #

dataTypeOf :: Word -> DataType #

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

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

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

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

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

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

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

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

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

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

Storable Word 
Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Word -> Int

alignment :: Word -> Int

peekElemOff :: Ptr Word -> Int -> IO Word

pokeElemOff :: Ptr Word -> Int -> Word -> IO ()

peekByteOff :: Ptr b -> Int -> IO Word

pokeByteOff :: Ptr b -> Int -> Word -> IO ()

peek :: Ptr Word -> IO Word

poke :: Ptr Word -> Word -> IO ()

Bits Word 
Instance details

Defined in GHC.Bits

FiniteBits Word 
Instance details

Defined in GHC.Bits

Bounded Word 
Instance details

Defined in GHC.Enum

Enum Word 
Instance details

Defined in GHC.Enum

Ix Word 
Instance details

Defined in GHC.Ix

Methods

range :: (Word, Word) -> [Word]

index :: (Word, Word) -> Word -> Int

unsafeIndex :: (Word, Word) -> Word -> Int

inRange :: (Word, Word) -> Word -> Bool

rangeSize :: (Word, Word) -> Int

unsafeRangeSize :: (Word, Word) -> Int

Num Word 
Instance details

Defined in GHC.Num

Methods

(+) :: Word -> Word -> Word #

(-) :: Word -> Word -> Word #

(*) :: Word -> Word -> Word #

negate :: Word -> Word #

abs :: Word -> Word #

signum :: Word -> Word #

fromInteger :: Integer -> Word #

Read Word 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS Word

readList :: ReadS [Word]

readPrec :: ReadPrec Word

readListPrec :: ReadPrec [Word]

Integral Word 
Instance details

Defined in GHC.Real

Methods

quot :: Word -> Word -> Word #

rem :: Word -> Word -> Word #

div :: Word -> Word -> Word #

mod :: Word -> Word -> Word #

quotRem :: Word -> Word -> (Word, Word) #

divMod :: Word -> Word -> (Word, Word) #

toInteger :: Word -> Integer #

Real Word 
Instance details

Defined in GHC.Real

Methods

toRational :: Word -> Rational #

Show Word 
Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Word -> ShowS

show :: Word -> String #

showList :: [Word] -> ShowS

PrintfArg Word 
Instance details

Defined in Text.Printf

Methods

formatArg :: Word -> FieldFormatter

parseFormat :: Word -> ModifierParser

BitOps Word 
Instance details

Defined in Basement.Bits

Methods

(.&.) :: Word -> Word -> Word

(.|.) :: Word -> Word -> Word

(.^.) :: Word -> Word -> Word

(.<<.) :: Word -> CountOf Bool -> Word

(.>>.) :: Word -> CountOf Bool -> Word

bit :: Offset Bool -> Word

isBitSet :: Word -> Offset Bool -> Bool

setBit :: Word -> Offset Bool -> Word

clearBit :: Word -> Offset Bool -> Word

FiniteBitsOps Word 
Instance details

Defined in Basement.Bits

Methods

numberOfBits :: Word -> CountOf Bool

rotateL :: Word -> CountOf Bool -> Word

rotateR :: Word -> CountOf Bool -> Word

popCount :: Word -> CountOf Bool

bitFlip :: Word -> Word

countLeadingZeros :: Word -> CountOf Bool

countTrailingZeros :: Word -> CountOf Bool

Subtractive Word 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Word 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Word = Word

Methods

(-) :: Word -> Word -> Difference Word

PrimMemoryComparable Word 
Instance details

Defined in Basement.PrimType

PrimType Word 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Word 
Instance details

Defined in Basement.PrimType

type PrimSize Word = 8

Methods

primSizeInBytes :: Proxy Word -> CountOf Word8

primShiftToBytes :: Proxy Word -> Int

primBaUIndex :: ByteArray# -> Offset Word -> Word

primMbaURead :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Word -> prim Word

primMbaUWrite :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Word -> Word -> prim ()

primAddrIndex :: Addr# -> Offset Word -> Word

primAddrRead :: PrimMonad prim => Addr# -> Offset Word -> prim Word

primAddrWrite :: PrimMonad prim => Addr# -> Offset Word -> Word -> prim ()

Binary Word 
Instance details

Defined in Data.Binary.Class

Methods

put :: Word -> Put

get :: Get Word

putList :: [Word] -> Put

NFData Word 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word -> () #

GEnum Word 
Instance details

Defined in Generics.Deriving.Enum

Methods

genum :: [Word]

GIx Word 
Instance details

Defined in Generics.Deriving.Enum

Methods

range :: (Word, Word) -> [Word]

index :: (Word, Word) -> Word -> Int

inRange :: (Word, Word) -> Word -> Bool

GEq Word 
Instance details

Defined in Generics.Deriving.Eq

Methods

geq :: Word -> Word -> Bool

GShow Word 
Instance details

Defined in Generics.Deriving.Show

Methods

gshowsPrec :: Int -> Word -> ShowS

gshows :: Word -> ShowS

gshow :: Word -> String

gshowList :: [Word] -> ShowS

Eq Word 
Instance details

Defined in GHC.Classes

Methods

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

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

Ord Word 
Instance details

Defined in GHC.Classes

Methods

compare :: Word -> Word -> Ordering #

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

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

(>) :: Word -> Word -> Bool #

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

max :: Word -> Word -> Word #

min :: Word -> Word -> Word #

Hashable Word 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word -> Int

hash :: Word -> Int

FromHttpApiData Word 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Word 
Instance details

Defined in Web.Internal.HttpApiData

ToMustache Word 
Instance details

Defined in Text.Mustache.Internal.Types

PathPiece Word 
Instance details

Defined in Web.PathPieces

PersistField Word 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Word -> PersistValue

fromPersistValue :: PersistValue -> Either Text Word

PersistFieldSql Word 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Word -> SqlType

Pretty Word 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Word -> Doc ann

prettyList :: [Word] -> Doc ann

Random Word 
Instance details

Defined in System.Random

Methods

randomR :: RandomGen g => (Word, Word) -> g -> (Word, g)

random :: RandomGen g => g -> (Word, g)

randomRs :: RandomGen g => (Word, Word) -> g -> [Word]

randoms :: RandomGen g => g -> [Word]

Uniform Word 
Instance details

Defined in System.Random.Internal

Methods

uniformM :: StatefulGen g m => g -> m Word

UniformRange Word 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Word, Word) -> g -> m Word

Display Word 
Instance details

Defined in RIO.Prelude.Display

Unbox Word 
Instance details

Defined in Data.Vector.Unboxed.Base

IArray UArray Word 
Instance details

Defined in Data.Array.Base

Methods

bounds :: Ix i => UArray i Word -> (i, i)

numElements :: Ix i => UArray i Word -> Int

unsafeArray :: Ix i => (i, i) -> [(Int, Word)] -> UArray i Word

unsafeAt :: Ix i => UArray i Word -> Int -> Word

unsafeReplace :: Ix i => UArray i Word -> [(Int, Word)] -> UArray i Word

unsafeAccum :: Ix i => (Word -> e' -> Word) -> UArray i Word -> [(Int, e')] -> UArray i Word

unsafeAccumArray :: Ix i => (Word -> e' -> Word) -> Word -> (i, i) -> [(Int, e')] -> UArray i Word

Lift Word 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Word -> m Exp

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

Vector Vector Word 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: Mutable Vector s Word -> ST s (Vector Word)

basicUnsafeThaw :: Vector Word -> ST s (Mutable Vector s Word)

basicLength :: Vector Word -> Int

basicUnsafeSlice :: Int -> Int -> Vector Word -> Vector Word

basicUnsafeIndexM :: Vector Word -> Int -> Box Word

basicUnsafeCopy :: Mutable Vector s Word -> Vector Word -> ST s ()

elemseq :: Vector Word -> Word -> b -> b

MVector MVector Word 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s Word -> Int

basicUnsafeSlice :: Int -> Int -> MVector s Word -> MVector s Word

basicOverlaps :: MVector s Word -> MVector s Word -> Bool

basicUnsafeNew :: Int -> ST s (MVector s Word)

basicInitialize :: MVector s Word -> ST s ()

basicUnsafeReplicate :: Int -> Word -> ST s (MVector s Word)

basicUnsafeRead :: MVector s Word -> Int -> ST s Word

basicUnsafeWrite :: MVector s Word -> Int -> Word -> ST s ()

basicClear :: MVector s Word -> ST s ()

basicSet :: MVector s Word -> Word -> ST s ()

basicUnsafeCopy :: MVector s Word -> MVector s Word -> ST s ()

basicUnsafeMove :: MVector s Word -> MVector s Word -> ST s ()

basicUnsafeGrow :: MVector s Word -> Int -> ST s (MVector s Word)

MArray IOUArray Word IO 
Instance details

Defined in Data.Array.IO.Internals

Methods

getBounds :: Ix i => IOUArray i Word -> IO (i, i)

getNumElements :: Ix i => IOUArray i Word -> IO Int

newArray :: Ix i => (i, i) -> Word -> IO (IOUArray i Word)

newArray_ :: Ix i => (i, i) -> IO (IOUArray i Word)

unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Word)

unsafeRead :: Ix i => IOUArray i Word -> Int -> IO Word

unsafeWrite :: Ix i => IOUArray i Word -> Int -> Word -> IO ()

GEq' (UWord :: k -> Type) 
Instance details

Defined in Generics.Deriving.Eq

Methods

geq' :: forall (a :: k). UWord a -> UWord a -> Bool

Generic1 (URec Word :: k -> Type) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 (URec Word :: k -> Type) 
Instance details

Defined in GHC.Generics

type Rep1 (URec Word :: k -> Type) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UWord" 'PrefixI 'True) (S1 ('MetaSel ('Just "uWord#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UWord :: k -> Type)))

Methods

from1 :: forall (a :: k). URec Word a -> Rep1 (URec Word :: k -> Type) a

to1 :: forall (a :: k). Rep1 (URec Word :: k -> Type) a -> URec Word a

Foldable (UWord :: Type -> Type) 
Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => UWord m -> m #

foldMap :: Monoid m => (a -> m) -> UWord a -> m #

foldMap' :: Monoid m => (a -> m) -> UWord a -> m

foldr :: (a -> b -> b) -> b -> UWord a -> b #

foldr' :: (a -> b -> b) -> b -> UWord a -> b #

foldl :: (b -> a -> b) -> b -> UWord a -> b

foldl' :: (b -> a -> b) -> b -> UWord a -> b #

foldr1 :: (a -> a -> a) -> UWord a -> a

foldl1 :: (a -> a -> a) -> UWord a -> a

toList :: UWord a -> [a] #

null :: UWord a -> Bool #

length :: UWord a -> Int #

elem :: Eq a => a -> UWord a -> Bool #

maximum :: Ord a => UWord a -> a

minimum :: Ord a => UWord a -> a

sum :: Num a => UWord a -> a #

product :: Num a => UWord a -> a #

Traversable (UWord :: Type -> Type) 
Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> UWord a -> f (UWord b) #

sequenceA :: Applicative f => UWord (f a) -> f (UWord a) #

mapM :: Monad m => (a -> m b) -> UWord a -> m (UWord b) #

sequence :: Monad m => UWord (m a) -> m (UWord a) #

GFoldable' (UWord :: Type -> Type) 
Instance details

Defined in Generics.Deriving.Foldable

Methods

gfoldMap' :: Monoid m => (a -> m) -> UWord a -> m

GFunctor' (UWord :: Type -> Type) 
Instance details

Defined in Generics.Deriving.Functor

Methods

gmap' :: (a -> b) -> UWord a -> UWord b

GShow' (UWord :: Type -> Type) 
Instance details

Defined in Generics.Deriving.Show

Methods

gshowsPrec' :: Type -> Int -> UWord a -> ShowS

isNullary :: UWord a -> Bool

GTraversable' (UWord :: Type -> Type) 
Instance details

Defined in Generics.Deriving.Traversable

Methods

gtraverse' :: Applicative f => (a -> f b) -> UWord a -> f (UWord b)

MArray (STUArray s) Word (ST s) 
Instance details

Defined in Data.Array.Base

Methods

getBounds :: Ix i => STUArray s i Word -> ST s (i, i)

getNumElements :: Ix i => STUArray s i Word -> ST s Int

newArray :: Ix i => (i, i) -> Word -> ST s (STUArray s i Word)

newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Word)

unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Word)

unsafeRead :: Ix i => STUArray s i Word -> Int -> ST s Word

unsafeWrite :: Ix i => STUArray s i Word -> Int -> Word -> ST s ()

Functor (URec Word :: Type -> Type) 
Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> URec Word a -> URec Word b #

(<$) :: a -> URec Word b -> URec Word a #

GEq (UWord p) 
Instance details

Defined in Generics.Deriving.Eq

Methods

geq :: UWord p -> UWord p -> Bool

GShow (UWord p) 
Instance details

Defined in Generics.Deriving.Show

Methods

gshowsPrec :: Int -> UWord p -> ShowS

gshows :: UWord p -> ShowS

gshow :: UWord p -> String

gshowList :: [UWord p] -> ShowS

Generic (URec Word p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Word p) 
Instance details

Defined in GHC.Generics

type Rep (URec Word p) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UWord" 'PrefixI 'True) (S1 ('MetaSel ('Just "uWord#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UWord :: Type -> Type)))

Methods

from :: URec Word p -> Rep (URec Word p) x

to :: Rep (URec Word p) x -> URec Word p

Show (URec Word p) 
Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> URec Word p -> ShowS

show :: URec Word p -> String #

showList :: [URec Word p] -> ShowS

Eq (URec Word p) 
Instance details

Defined in GHC.Generics

Methods

(==) :: URec Word p -> URec Word p -> Bool #

(/=) :: URec Word p -> URec Word p -> Bool #

Ord (URec Word p) 
Instance details

Defined in GHC.Generics

Methods

compare :: URec Word p -> URec Word p -> Ordering #

(<) :: URec Word p -> URec Word p -> Bool #

(<=) :: URec Word p -> URec Word p -> Bool #

(>) :: URec Word p -> URec Word p -> Bool #

(>=) :: URec Word p -> URec Word p -> Bool #

max :: URec Word p -> URec Word p -> URec Word p #

min :: URec Word p -> URec Word p -> URec Word p #

type NatNumMaxBound Word 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Word = NatNumMaxBound Word64
type Difference Word 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Word = Word
type PrimSize Word 
Instance details

Defined in Basement.PrimType

type PrimSize Word = 8
newtype Vector Word 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector Word = V_Word (Vector Word)
data URec Word (p :: k) 
Instance details

Defined in GHC.Generics

data URec Word (p :: k) = UWord {}
newtype MVector s Word 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Word = MV_Word (MVector s Word)
type Rep1 (URec Word :: k -> Type) 
Instance details

Defined in GHC.Generics

type Rep1 (URec Word :: k -> Type) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UWord" 'PrefixI 'True) (S1 ('MetaSel ('Just "uWord#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UWord :: k -> Type)))
type Rep (URec Word p) 
Instance details

Defined in GHC.Generics

type Rep (URec Word p) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UWord" 'PrefixI 'True) (S1 ('MetaSel ('Just "uWord#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UWord :: Type -> Type)))

data Ordering #

Constructors

LT 
EQ 
GT 

Instances

Instances details
Structured Ordering 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy Ordering -> Structure

structureHash' :: Tagged Ordering MD5

FromJSON Ordering 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Ordering 
Instance details

Defined in Data.Aeson.Types.ToJSON

Data Ordering 
Instance details

Defined in Data.Data

Methods

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

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

toConstr :: Ordering -> Constr #

dataTypeOf :: Ordering -> DataType #

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

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

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

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

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

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

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

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

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

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

Monoid Ordering 
Instance details

Defined in GHC.Base

Semigroup Ordering 
Instance details

Defined in GHC.Base

Bounded Ordering 
Instance details

Defined in GHC.Enum

Enum Ordering 
Instance details

Defined in GHC.Enum

Generic Ordering 
Instance details

Defined in GHC.Generics

Associated Types

type Rep Ordering 
Instance details

Defined in GHC.Generics

type Rep Ordering = D1 ('MetaData "Ordering" "GHC.Types" "ghc-prim" 'False) (C1 ('MetaCons "LT" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "EQ" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "GT" 'PrefixI 'False) (U1 :: Type -> Type)))

Methods

from :: Ordering -> Rep Ordering x

to :: Rep Ordering x -> Ordering

Ix Ordering 
Instance details

Defined in GHC.Ix

Read Ordering 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS Ordering

readList :: ReadS [Ordering]

readPrec :: ReadPrec Ordering

readListPrec :: ReadPrec [Ordering]

Show Ordering 
Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Ordering -> ShowS

show :: Ordering -> String #

showList :: [Ordering] -> ShowS

Binary Ordering 
Instance details

Defined in Data.Binary.Class

Methods

put :: Ordering -> Put

get :: Get Ordering

putList :: [Ordering] -> Put

NFData Ordering 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Ordering -> () #

GEnum Ordering 
Instance details

Defined in Generics.Deriving.Enum

Methods

genum :: [Ordering]

GIx Ordering 
Instance details

Defined in Generics.Deriving.Enum

GEq Ordering 
Instance details

Defined in Generics.Deriving.Eq

Methods

geq :: Ordering -> Ordering -> Bool

GMonoid Ordering 
Instance details

Defined in Generics.Deriving.Monoid.Internal

GShow Ordering 
Instance details

Defined in Generics.Deriving.Show

Methods

gshowsPrec :: Int -> Ordering -> ShowS

gshows :: Ordering -> ShowS

gshow :: Ordering -> String

gshowList :: [Ordering] -> ShowS

Eq Ordering 
Instance details

Defined in GHC.Classes

Ord Ordering 
Instance details

Defined in GHC.Classes

Hashable Ordering 
Instance details

Defined in Data.Hashable.Class

FromHttpApiData Ordering 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Ordering 
Instance details

Defined in Web.Internal.HttpApiData

Pretty Ordering 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJClass

Methods

pPrintPrec :: PrettyLevel -> Rational -> Ordering -> Doc ann

pPrint :: Ordering -> Doc ann

pPrintList :: PrettyLevel -> [Ordering] -> Doc ann

Pretty Ordering 
Instance details

Defined in Text.PrettyPrint.HughesPJClass

Methods

pPrintPrec :: PrettyLevel -> Rational -> Ordering -> Doc

pPrint :: Ordering -> Doc

pPrintList :: PrettyLevel -> [Ordering] -> Doc

type Rep Ordering 
Instance details

Defined in GHC.Generics

type Rep Ordering = D1 ('MetaData "Ordering" "GHC.Types" "ghc-prim" 'False) (C1 ('MetaCons "LT" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "EQ" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "GT" 'PrefixI 'False) (U1 :: Type -> Type)))

data Maybe a #

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

MonadFail Maybe 
Instance details

Defined in Control.Monad.Fail

Methods

fail :: String -> Maybe a #

MonadFix Maybe 
Instance details

Defined in Control.Monad.Fix

Methods

mfix :: (a -> Maybe a) -> Maybe a

MonadZip Maybe 
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)

Foldable Maybe 
Instance details

Defined in 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 #

Eq1 Maybe 
Instance details

Defined in Data.Functor.Classes

Methods

liftEq :: (a -> b -> Bool) -> Maybe a -> Maybe b -> Bool

Ord1 Maybe 
Instance details

Defined in Data.Functor.Classes

Methods

liftCompare :: (a -> b -> Ordering) -> Maybe a -> Maybe b -> Ordering

Read1 Maybe 
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 
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

Traversable Maybe 
Instance details

Defined in 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) #

Alternative Maybe 
Instance details

Defined in GHC.Base

Methods

empty :: Maybe a

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

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

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

Applicative Maybe 
Instance details

Defined in GHC.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 
Instance details

Defined in GHC.Base

Methods

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

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

Monad Maybe 
Instance details

Defined in GHC.Base

Methods

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

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

return :: a -> Maybe a #

MonadPlus Maybe 
Instance details

Defined in GHC.Base

Methods

mzero :: Maybe a #

mplus :: Maybe a -> Maybe a -> Maybe a #

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 
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 #

GFoldable Maybe 
Instance details

Defined in Generics.Deriving.Foldable

Methods

gfoldMap :: Monoid m => (a -> m) -> Maybe a -> m

gfold :: Monoid m => Maybe m -> m

gfoldr :: (a -> b -> b) -> b -> Maybe a -> b

gfoldr' :: (a -> b -> b) -> b -> Maybe a -> b

gfoldl :: (a -> b -> a) -> a -> Maybe b -> a

gfoldl' :: (a -> b -> a) -> a -> Maybe b -> a

gfoldr1 :: (a -> a -> a) -> Maybe a -> a

gfoldl1 :: (a -> a -> a) -> Maybe a -> a

GFunctor Maybe 
Instance details

Defined in Generics.Deriving.Functor

Methods

gmap :: (a -> b) -> Maybe a -> Maybe b

GTraversable Maybe 
Instance details

Defined in Generics.Deriving.Traversable

Methods

gtraverse :: Applicative f => (a -> f b) -> Maybe a -> f (Maybe b)

gsequenceA :: Applicative f => Maybe (f a) -> f (Maybe a)

gmapM :: Monad m => (a -> m b) -> Maybe a -> m (Maybe b)

gsequence :: 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

FromValue ParsePackageConfig 
Instance details

Defined in Hpack.Config

Methods

fromValue :: Value -> Parser ParsePackageConfig Source #

Generic1 Maybe 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 Maybe 
Instance details

Defined in GHC.Generics

type Rep1 Maybe = D1 ('MetaData "Maybe" "GHC.Maybe" "base" '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

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

Methods

liftBaseWith :: (RunInBase Maybe Maybe -> Maybe a) -> Maybe a

restoreM :: StM Maybe a -> Maybe a

MonadError () Maybe 
Instance details

Defined in Control.Monad.Error.Class

Methods

throwError :: () -> Maybe a

catchError :: Maybe a -> (() -> Maybe a) -> Maybe a

SymbolToField "cabal" Tree (Maybe BlobId) 
Instance details

Defined in Pantry.Storage

SymbolToField "tree" HackageCabal (Maybe TreeId) 
Instance details

Defined in Pantry.Storage

Methods

symbolToField :: EntityField HackageCabal (Maybe TreeId)

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)

Structured a => Structured (Maybe a) 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy (Maybe a) -> Structure

structureHash' :: Tagged (Maybe a) MD5

FromJSON a => FromJSON (Maybe a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Maybe a)

parseJSONList :: Value -> Parser [Maybe a]

omittedField :: Maybe (Maybe a)

ToJSON a => ToJSON (Maybe a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Maybe a -> Value

toEncoding :: Maybe a -> Encoding

toJSONList :: [Maybe a] -> Value

toEncodingList :: [Maybe a] -> Encoding

omitField :: Maybe a -> Bool

Data a => Data (Maybe a) 
Instance details

Defined in 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) #

Semigroup a => Monoid (Maybe a) 
Instance details

Defined in GHC.Base

Methods

mempty :: Maybe a #

mappend :: Maybe a -> Maybe a -> Maybe a #

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

Semigroup a => Semigroup (Maybe a) 
Instance details

Defined in GHC.Base

Methods

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

sconcat :: NonEmpty (Maybe a) -> Maybe a

stimes :: Integral b => b -> Maybe a -> Maybe a

Generic (Maybe a) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Maybe a) 
Instance details

Defined in GHC.Generics

type Rep (Maybe a) = D1 ('MetaData "Maybe" "GHC.Maybe" "base" '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) 
Instance details

Defined in GHC.Generics

Associated Types

type DemoteRep (Maybe a) 
Instance details

Defined in GHC.Generics

type DemoteRep (Maybe a) = Maybe (DemoteRep a)

Methods

fromSing :: forall (a0 :: Maybe a). Sing a0 -> DemoteRep (Maybe a)

Read a => Read (Maybe a) 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (Maybe a)

readList :: ReadS [Maybe a]

readPrec :: ReadPrec (Maybe a)

readListPrec :: ReadPrec [Maybe a]

Show a => Show (Maybe a) 
Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Maybe a -> ShowS

show :: Maybe a -> String #

showList :: [Maybe a] -> ShowS

Binary a => Binary (Maybe a) 
Instance details

Defined in Data.Binary.Class

Methods

put :: Maybe a -> Put

get :: Get (Maybe a)

putList :: [Maybe a] -> Put

NFData a => NFData (Maybe a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Maybe a -> () #

GEnum a => GEnum (Maybe a) 
Instance details

Defined in Generics.Deriving.Enum

Methods

genum :: [Maybe a]

(GEq a, GEnum a, GIx a) => GIx (Maybe a) 
Instance details

Defined in Generics.Deriving.Enum

Methods

range :: (Maybe a, Maybe a) -> [Maybe a]

index :: (Maybe a, Maybe a) -> Maybe a -> Int

inRange :: (Maybe a, Maybe a) -> Maybe a -> Bool

GEq a => GEq (Maybe a) 
Instance details

Defined in Generics.Deriving.Eq

Methods

geq :: Maybe a -> Maybe a -> Bool

GShow a => GShow (Maybe a) 
Instance details

Defined in Generics.Deriving.Show

Methods

gshowsPrec :: Int -> Maybe a -> ShowS

gshows :: Maybe a -> ShowS

gshow :: Maybe a -> String

gshowList :: [Maybe a] -> ShowS

Uniplate (Maybe a) 
Instance details

Defined in Generics.Deriving.Uniplate

Methods

children :: Maybe a -> [Maybe a]

context :: Maybe a -> [Maybe a] -> Maybe a

descend :: (Maybe a -> Maybe a) -> Maybe a -> Maybe a

descendM :: Monad m => (Maybe a -> m (Maybe a)) -> Maybe a -> m (Maybe a)

transform :: (Maybe a -> Maybe a) -> Maybe a -> Maybe a

transformM :: Monad m => (Maybe a -> m (Maybe a)) -> Maybe a -> m (Maybe a)

Eq a => Eq (Maybe a) 
Instance details

Defined in GHC.Maybe

Methods

(==) :: Maybe a -> Maybe a -> Bool #

(/=) :: Maybe a -> Maybe a -> Bool #

Ord a => Ord (Maybe a) 
Instance details

Defined in GHC.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

FromValue a => FromValue (ParseCommonOptions a) 
Instance details

Defined in Hpack.Config

Methods

fromValue :: Value -> Parser (ParseCommonOptions a) Source #

FromValue a => FromValue (ParseConditionalSection a) 
Instance details

Defined in Hpack.Config

Methods

fromValue :: Value -> Parser (ParseConditionalSection a) Source #

FromValue a => FromValue (ParseThenElse a) 
Instance details

Defined in Hpack.Config

Methods

fromValue :: Value -> Parser (ParseThenElse a) Source #

FromValue a => FromValue (Maybe a) 
Instance details

Defined in Data.Aeson.Config.FromValue

Methods

fromValue :: Value -> Parser (Maybe a) Source #

FromHttpApiData a => FromHttpApiData (Maybe a) 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData a => ToHttpApiData (Maybe a) 
Instance details

Defined in Web.Internal.HttpApiData

(QueryKeyLike k, QueryValueLike v) => QueryLike [Maybe (k, v)] 
Instance details

Defined in Network.HTTP.Types.QueryLike

Methods

toQuery :: [Maybe (k, v)] -> Query

QueryValueLike a => QueryValueLike (Maybe a) 
Instance details

Defined in Network.HTTP.Types.QueryLike

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)

ToMustache ω => ToMustache (Maybe ω) 
Instance details

Defined in Text.Mustache.Internal.Types

PathPiece a => PathPiece (Maybe a) 
Instance details

Defined in Web.PathPieces

PersistField a => PersistField (Maybe a) 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Maybe a -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Maybe a)

PersistFieldSql a => PersistFieldSql (Maybe a) 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy (Maybe a) -> SqlType

RawSql a => RawSql (Maybe a) 
Instance details

Defined in Database.Persist.Sql.Class

Methods

rawSqlCols :: (Text -> Text) -> Maybe a -> (Int, [Text])

rawSqlColCountReason :: Maybe a -> String

rawSqlProcessRow :: [PersistValue] -> Either Text (Maybe a)

Pretty a => Pretty (Maybe a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJClass

Methods

pPrintPrec :: PrettyLevel -> Rational -> Maybe a -> Doc ann

pPrint :: Maybe a -> Doc ann

pPrintList :: PrettyLevel -> [Maybe a] -> Doc ann

Pretty a => Pretty (Maybe a) 
Instance details

Defined in Text.PrettyPrint.HughesPJClass

Methods

pPrintPrec :: PrettyLevel -> Rational -> Maybe a -> Doc

pPrint :: Maybe a -> Doc

pPrintList :: PrettyLevel -> [Maybe a] -> Doc

Pretty a => Pretty (Maybe a) 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Maybe a -> Doc ann

prettyList :: [Maybe a] -> Doc ann

ToYaml a => ToYaml (Maybe a) 
Instance details

Defined in Data.Yaml.Builder

Methods

toYaml :: Maybe a -> YamlBuilder

SingI ('Nothing :: Maybe a) 
Instance details

Defined in GHC.Generics

Methods

sing :: Sing ('Nothing :: Maybe a)

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) 
Instance details

Defined in GHC.Generics

Methods

sing :: Sing ('Just a2)

(Selector sel, FromValue a, KnownBool deprecated, KnownSymbol alias) => GenericDecode (RecordField sel (Alias deprecated alias (Maybe a))) 
Instance details

Defined in Data.Aeson.Config.FromValue

Methods

genericDecode :: Options -> Value -> Parser (RecordField sel (Alias deprecated alias (Maybe a)) p)

(Selector sel, FromValue a) => GenericDecode (RecordField sel (Maybe a)) 
Instance details

Defined in Data.Aeson.Config.FromValue

Methods

genericDecode :: Options -> Value -> Parser (RecordField sel (Maybe a) p)

type Failure Maybe 
Instance details

Defined in Basement.Monad

type Failure Maybe = ()
type Rep1 Maybe 
Instance details

Defined in GHC.Generics

type Rep1 Maybe = D1 ('MetaData "Maybe" "GHC.Maybe" "base" '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 DemoteRep (Maybe a) 
Instance details

Defined in GHC.Generics

type DemoteRep (Maybe a) = Maybe (DemoteRep a)
type Rep (Maybe a) 
Instance details

Defined in GHC.Generics

type Rep (Maybe a) = D1 ('MetaData "Maybe" "GHC.Maybe" "base" '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.Generics

data Sing (b :: Maybe a) where
type Element (Maybe a) 
Instance details

Defined in Data.MonoTraversable

type Element (Maybe a) = a

data Natural #

Instances

Instances details
FromJSON Natural 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Natural 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction Natural

fromJSONKeyList :: FromJSONKeyFunction [Natural]

ToJSON Natural 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Natural -> Value

toEncoding :: Natural -> Encoding

toJSONList :: [Natural] -> Value

toEncodingList :: [Natural] -> Encoding

omitField :: Natural -> Bool

ToJSONKey Natural 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction Natural

toJSONKeyList :: ToJSONKeyFunction [Natural]

Data Natural 
Instance details

Defined in Data.Data

Methods

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

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

toConstr :: Natural -> Constr #

dataTypeOf :: Natural -> DataType #

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

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

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

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

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

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

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

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

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

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

Bits Natural 
Instance details

Defined in GHC.Bits

Enum Natural 
Instance details

Defined in GHC.Enum

Ix Natural 
Instance details

Defined in GHC.Ix

Num Natural 
Instance details

Defined in GHC.Num

Read Natural 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS Natural

readList :: ReadS [Natural]

readPrec :: ReadPrec Natural

readListPrec :: ReadPrec [Natural]

Integral Natural 
Instance details

Defined in GHC.Real

Real Natural 
Instance details

Defined in GHC.Real

Show Natural 
Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Natural -> ShowS

show :: Natural -> String #

showList :: [Natural] -> ShowS

PrintfArg Natural 
Instance details

Defined in Text.Printf

Methods

formatArg :: Natural -> FieldFormatter

parseFormat :: Natural -> ModifierParser

Subtractive Natural 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Natural 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Natural = Maybe Natural

Methods

(-) :: Natural -> Natural -> Difference Natural

Binary Natural 
Instance details

Defined in Data.Binary.Class

Methods

put :: Natural -> Put

get :: Get Natural

putList :: [Natural] -> Put

NFData Natural 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Natural -> () #

GEnum Natural 
Instance details

Defined in Generics.Deriving.Enum

Methods

genum :: [Natural]

GIx Natural 
Instance details

Defined in Generics.Deriving.Enum

GEq Natural 
Instance details

Defined in Generics.Deriving.Eq

Methods

geq :: Natural -> Natural -> Bool

GShow Natural 
Instance details

Defined in Generics.Deriving.Show

Methods

gshowsPrec :: Int -> Natural -> ShowS

gshows :: Natural -> ShowS

gshow :: Natural -> String

gshowList :: [Natural] -> ShowS

Eq Natural 
Instance details

Defined in GHC.Num.Natural

Methods

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

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

Ord Natural 
Instance details

Defined in GHC.Num.Natural

Hashable Natural 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Natural -> Int

hash :: Natural -> Int

FromHttpApiData Natural 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Natural 
Instance details

Defined in Web.Internal.HttpApiData

ToMustache Natural 
Instance details

Defined in Text.Mustache.Internal.Types

(TypeError ((((('Text "The instance of PersistField for the Natural type was removed." ':$$: 'Text "Please see the documentation for OverflowNatural if you want to ") ':$$: 'Text "continue using the old behavior or want to see documentation on ") ':$$: 'Text "why the instance was removed.") ':$$: 'Text "") ':$$: 'Text "This error instance will be removed in a future release.") :: Constraint) => PersistField Natural 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Natural -> PersistValue

fromPersistValue :: PersistValue -> Either Text Natural

Pretty Natural 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Natural -> Doc ann

prettyList :: [Natural] -> Doc ann

UniformRange Natural 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Natural, Natural) -> g -> m Natural

KnownNat n => HasResolution (n :: Nat) 
Instance details

Defined in Data.Fixed

Methods

resolution :: p n -> Integer

TestCoercion SNat 
Instance details

Defined in GHC.TypeNats

Methods

testCoercion :: forall (a :: Nat) (b :: Nat). SNat a -> SNat b -> Maybe (Coercion a b)

TestEquality SNat 
Instance details

Defined in GHC.TypeNats

Methods

testEquality :: forall (a :: Nat) (b :: Nat). SNat a -> SNat b -> Maybe (a :~: b)

Lift Natural 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Natural -> m Exp

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

type Difference Natural 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Natural = Maybe Natural
type Compare (a :: Natural) (b :: Natural) 
Instance details

Defined in Data.Type.Ord

type Compare (a :: Natural) (b :: Natural) = CmpNat a b

data Integer #

Instances

Instances details
Structured Integer 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy Integer -> Structure

structureHash' :: Tagged Integer MD5

FromJSON Integer 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Integer 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction Integer

fromJSONKeyList :: FromJSONKeyFunction [Integer]

ToJSON Integer 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Integer -> Value

toEncoding :: Integer -> Encoding

toJSONList :: [Integer] -> Value

toEncodingList :: [Integer] -> Encoding

omitField :: Integer -> Bool

ToJSONKey Integer 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction Integer

toJSONKeyList :: ToJSONKeyFunction [Integer]

Data Integer 
Instance details

Defined in Data.Data

Methods

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

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

toConstr :: Integer -> Constr #

dataTypeOf :: Integer -> DataType #

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

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

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

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

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

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

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

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

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

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

Bits Integer 
Instance details

Defined in GHC.Bits

Enum Integer 
Instance details

Defined in GHC.Enum

Ix Integer 
Instance details

Defined in GHC.Ix

Num Integer 
Instance details

Defined in GHC.Num

Read Integer 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS Integer

readList :: ReadS [Integer]

readPrec :: ReadPrec Integer

readListPrec :: ReadPrec [Integer]

Integral Integer 
Instance details

Defined in GHC.Real

Real Integer 
Instance details

Defined in GHC.Real

Show Integer 
Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Integer -> ShowS

show :: Integer -> String #

showList :: [Integer] -> ShowS

PrintfArg Integer 
Instance details

Defined in Text.Printf

Methods

formatArg :: Integer -> FieldFormatter

parseFormat :: Integer -> ModifierParser

Subtractive Integer 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Integer 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Integer = Integer

Methods

(-) :: Integer -> Integer -> Difference Integer

Binary Integer 
Instance details

Defined in Data.Binary.Class

Methods

put :: Integer -> Put

get :: Get Integer

putList :: [Integer] -> Put

NFData Integer 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Integer -> () #

GEnum Integer 
Instance details

Defined in Generics.Deriving.Enum

Methods

genum :: [Integer]

GIx Integer 
Instance details

Defined in Generics.Deriving.Enum

GEq Integer 
Instance details

Defined in Generics.Deriving.Eq

Methods

geq :: Integer -> Integer -> Bool

GShow Integer 
Instance details

Defined in Generics.Deriving.Show

Methods

gshowsPrec :: Int -> Integer -> ShowS

gshows :: Integer -> ShowS

gshow :: Integer -> String

gshowList :: [Integer] -> ShowS

Eq Integer 
Instance details

Defined in GHC.Num.Integer

Methods

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

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

Ord Integer 
Instance details

Defined in GHC.Num.Integer

Hashable Integer 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Integer -> Int

hash :: Integer -> Int

HpcHash Integer 
Instance details

Defined in Trace.Hpc.Util

Methods

toHash :: Integer -> Hash

FromHttpApiData Integer 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Integer 
Instance details

Defined in Web.Internal.HttpApiData

ToMustache Integer 
Instance details

Defined in Text.Mustache.Internal.Types

PathPiece Integer 
Instance details

Defined in Web.PathPieces

PersistField Rational 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Rational -> PersistValue

fromPersistValue :: PersistValue -> Either Text Rational

PersistFieldSql Rational 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Rational -> SqlType

Pretty Integer 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJClass

Methods

pPrintPrec :: PrettyLevel -> Rational -> Integer -> Doc ann

pPrint :: Integer -> Doc ann

pPrintList :: PrettyLevel -> [Integer] -> Doc ann

Pretty Integer 
Instance details

Defined in Text.PrettyPrint.HughesPJClass

Methods

pPrintPrec :: PrettyLevel -> Rational -> Integer -> Doc

pPrint :: Integer -> Doc

pPrintList :: PrettyLevel -> [Integer] -> Doc

Pretty Integer 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Integer -> Doc ann

prettyList :: [Integer] -> Doc ann

Random Integer 
Instance details

Defined in System.Random

Methods

randomR :: RandomGen g => (Integer, Integer) -> g -> (Integer, g)

random :: RandomGen g => g -> (Integer, g)

randomRs :: RandomGen g => (Integer, Integer) -> g -> [Integer]

randoms :: RandomGen g => g -> [Integer]

UniformRange Integer 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Integer, Integer) -> g -> m Integer

Display Integer 
Instance details

Defined in RIO.Prelude.Display

Lift Integer 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Integer -> m Exp

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

type Difference Integer 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Integer = Integer

data BlobKey #

Constructors

BlobKey !SHA256 !FileSize 

Instances

Instances details
FromJSON BlobKey 
Instance details

Defined in Pantry.Types

ToJSON BlobKey 
Instance details

Defined in Pantry.Types

Methods

toJSON :: BlobKey -> Value

toEncoding :: BlobKey -> Encoding

toJSONList :: [BlobKey] -> Value

toEncodingList :: [BlobKey] -> Encoding

omitField :: BlobKey -> Bool

Generic BlobKey 
Instance details

Defined in Pantry.Types

Associated Types

type Rep BlobKey 
Instance details

Defined in Pantry.Types

type Rep BlobKey = D1 ('MetaData "BlobKey" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "BlobKey" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SHA256) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 FileSize)))

Methods

from :: BlobKey -> Rep BlobKey x

to :: Rep BlobKey x -> BlobKey

Show BlobKey 
Instance details

Defined in Pantry.Types

Methods

showsPrec :: Int -> BlobKey -> ShowS

show :: BlobKey -> String #

showList :: [BlobKey] -> ShowS

NFData BlobKey 
Instance details

Defined in Pantry.Types

Methods

rnf :: BlobKey -> () #

Eq BlobKey 
Instance details

Defined in Pantry.Types

Methods

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

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

Ord BlobKey 
Instance details

Defined in Pantry.Types

Display BlobKey 
Instance details

Defined in Pantry.Types

type Rep BlobKey 
Instance details

Defined in Pantry.Types

type Rep BlobKey = D1 ('MetaData "BlobKey" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "BlobKey" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SHA256) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 FileSize)))

data ByteString #

Instances

Instances details
Structured ByteString 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy ByteString -> Structure

structureHash' :: Tagged ByteString MD5

Chunk ByteString 
Instance details

Defined in Data.Attoparsec.Internal.Types

Associated Types

type ChunkElem ByteString 
Instance details

Defined in Data.Attoparsec.Internal.Types

type ChunkElem ByteString = Word8
Data ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

Methods

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

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

toConstr :: ByteString -> Constr #

dataTypeOf :: ByteString -> DataType #

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

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

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

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

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

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

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

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

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

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

IsString ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

Monoid ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

Semigroup ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

IsList ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

Associated Types

type Item ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

type Item ByteString = Word8
Read ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

Methods

readsPrec :: Int -> ReadS ByteString

readList :: ReadS [ByteString]

readPrec :: ReadPrec ByteString

readListPrec :: ReadPrec [ByteString]

Show ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

Methods

showsPrec :: Int -> ByteString -> ShowS

show :: ByteString -> String #

showList :: [ByteString] -> ShowS

Binary ByteString 
Instance details

Defined in Data.Binary.Class

Methods

put :: ByteString -> Put

get :: Get ByteString

putList :: [ByteString] -> Put

Binary DbUnitInfo 
Instance details

Defined in GHC.Unit.Database

Methods

put :: DbUnitInfo -> Put

get :: Get DbUnitInfo

putList :: [DbUnitInfo] -> Put

FoldCase ByteString 
Instance details

Defined in Data.CaseInsensitive.Internal

AttoparsecInput ByteString 
Instance details

Defined in Data.Conduit.Attoparsec

NFData ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

Methods

rnf :: ByteString -> () #

Eq ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

Ord ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

Hashable ByteString 
Instance details

Defined in Data.Hashable.Class

QueryKeyLike ByteString 
Instance details

Defined in Network.HTTP.Types.QueryLike

QueryValueLike ByteString 
Instance details

Defined in Network.HTTP.Types.QueryLike

ByteArray ByteString 
Instance details

Defined in Data.ByteArray.Types

Methods

allocRet :: Int -> (Ptr p -> IO a) -> IO (a, ByteString)

ByteArrayAccess ByteString 
Instance details

Defined in Data.ByteArray.Types

Methods

length :: ByteString -> Int

withByteArray :: ByteString -> (Ptr p -> IO a) -> IO a

copyByteArrayToPtr :: ByteString -> Ptr p -> IO ()

GrowingAppend ByteString 
Instance details

Defined in Data.MonoTraversable

MonoFoldable ByteString 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element ByteString -> m) -> ByteString -> m

ofoldr :: (Element ByteString -> b -> b) -> b -> ByteString -> b

ofoldl' :: (a -> Element ByteString -> a) -> a -> ByteString -> a

otoList :: ByteString -> [Element ByteString]

oall :: (Element ByteString -> Bool) -> ByteString -> Bool

oany :: (Element ByteString -> Bool) -> ByteString -> Bool

onull :: ByteString -> Bool

olength :: ByteString -> Int

olength64 :: ByteString -> Int64

ocompareLength :: Integral i => ByteString -> i -> Ordering

otraverse_ :: Applicative f => (Element ByteString -> f b) -> ByteString -> f ()

ofor_ :: Applicative f => ByteString -> (Element ByteString -> f b) -> f ()

omapM_ :: Applicative m => (Element ByteString -> m ()) -> ByteString -> m ()

oforM_ :: Applicative m => ByteString -> (Element ByteString -> m ()) -> m ()

ofoldlM :: Monad m => (a -> Element ByteString -> m a) -> a -> ByteString -> m a

ofoldMap1Ex :: Semigroup m => (Element ByteString -> m) -> ByteString -> m

ofoldr1Ex :: (Element ByteString -> Element ByteString -> Element ByteString) -> ByteString -> Element ByteString

ofoldl1Ex' :: (Element ByteString -> Element ByteString -> Element ByteString) -> ByteString -> Element ByteString

headEx :: ByteString -> Element ByteString

lastEx :: ByteString -> Element ByteString

unsafeHead :: ByteString -> Element ByteString

unsafeLast :: ByteString -> Element ByteString

maximumByEx :: (Element ByteString -> Element ByteString -> Ordering) -> ByteString -> Element ByteString

minimumByEx :: (Element ByteString -> Element ByteString -> Ordering) -> ByteString -> Element ByteString

oelem :: Element ByteString -> ByteString -> Bool

onotElem :: Element ByteString -> ByteString -> Bool

MonoFunctor ByteString 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element ByteString -> Element ByteString) -> ByteString -> ByteString

MonoPointed ByteString 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element ByteString -> ByteString

MonoTraversable ByteString 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element ByteString -> f (Element ByteString)) -> ByteString -> f ByteString

omapM :: Applicative m => (Element ByteString -> m (Element ByteString)) -> ByteString -> m ByteString

IsSequence ByteString 
Instance details

Defined in Data.Sequences

Methods

fromList :: [Element ByteString] -> ByteString

lengthIndex :: ByteString -> Index ByteString

break :: (Element ByteString -> Bool) -> ByteString -> (ByteString, ByteString)

span :: (Element ByteString -> Bool) -> ByteString -> (ByteString, ByteString)

dropWhile :: (Element ByteString -> Bool) -> ByteString -> ByteString

takeWhile :: (Element ByteString -> Bool) -> ByteString -> ByteString

splitAt :: Index ByteString -> ByteString -> (ByteString, ByteString)

unsafeSplitAt :: Index ByteString -> ByteString -> (ByteString, ByteString)

take :: Index ByteString -> ByteString -> ByteString

unsafeTake :: Index ByteString -> ByteString -> ByteString

drop :: Index ByteString -> ByteString -> ByteString

unsafeDrop :: Index ByteString -> ByteString -> ByteString

dropEnd :: Index ByteString -> ByteString -> ByteString

partition :: (Element ByteString -> Bool) -> ByteString -> (ByteString, ByteString)

uncons :: ByteString -> Maybe (Element ByteString, ByteString)

unsnoc :: ByteString -> Maybe (ByteString, Element ByteString)

filter :: (Element ByteString -> Bool) -> ByteString -> ByteString

filterM :: Monad m => (Element ByteString -> m Bool) -> ByteString -> m ByteString

replicate :: Index ByteString -> Element ByteString -> ByteString

replicateM :: Monad m => Index ByteString -> m (Element ByteString) -> m ByteString

groupBy :: (Element ByteString -> Element ByteString -> Bool) -> ByteString -> [ByteString]

groupAllOn :: Eq b => (Element ByteString -> b) -> ByteString -> [ByteString]

subsequences :: ByteString -> [ByteString]

permutations :: ByteString -> [ByteString]

tailEx :: ByteString -> ByteString

tailMay :: ByteString -> Maybe ByteString

initEx :: ByteString -> ByteString

initMay :: ByteString -> Maybe ByteString

unsafeTail :: ByteString -> ByteString

unsafeInit :: ByteString -> ByteString

index :: ByteString -> Index ByteString -> Maybe (Element ByteString)

indexEx :: ByteString -> Index ByteString -> Element ByteString

unsafeIndex :: ByteString -> Index ByteString -> Element ByteString

splitWhen :: (Element ByteString -> Bool) -> ByteString -> [ByteString]

tails :: ByteString -> [ByteString]

inits :: ByteString -> [ByteString]

initTails :: ByteString -> [(ByteString, ByteString)]

SemiSequence ByteString 
Instance details

Defined in Data.Sequences

Associated Types

type Index ByteString 
Instance details

Defined in Data.Sequences

type Index ByteString = Int
PersistField ByteString 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: ByteString -> PersistValue

fromPersistValue :: PersistValue -> Either Text ByteString

PersistFieldSql ByteString 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy ByteString -> SqlType

DynamicBytes ByteString 
Instance details

Defined in Data.StaticBytes

Methods

lengthD :: ByteString -> Int

withPeekD :: ByteString -> ((Int -> IO Word64) -> IO a) -> IO a

fromWordsD :: Int -> [Word64] -> ByteString

LazySequence ByteString ByteString 
Instance details

Defined in Data.Sequences

Methods

toChunks :: ByteString -> [ByteString]

fromChunks :: [ByteString] -> ByteString

toStrict :: ByteString -> ByteString

fromStrict :: ByteString -> ByteString

Utf8 Text ByteString 
Instance details

Defined in Data.Sequences

Lift ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

Methods

lift :: Quote m => ByteString -> m Exp

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

SymbolToField "contents" Blob ByteString 
Instance details

Defined in Pantry.Storage

type ChunkElem ByteString 
Instance details

Defined in Data.Attoparsec.Internal.Types

type ChunkElem ByteString = Word8
type State ByteString 
Instance details

Defined in Data.Attoparsec.Internal.Types

type State ByteString = Buffer
type Item ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

type Item ByteString = Word8
type Element ByteString 
Instance details

Defined in Data.MonoTraversable

type Element ByteString = Word8
type Index ByteString 
Instance details

Defined in Data.Sequences

type Index ByteString = Int

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

Methods

liftIO :: IO a -> m a #

Instances

Instances details
MonadIO IO 
Instance details

Defined in Control.Monad.IO.Class

Methods

liftIO :: IO a -> IO a #

MonadIO Q 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

liftIO :: IO a -> Q a #

MonadIO m => MonadIO (ZeptoT m) 
Instance details

Defined in Data.Attoparsec.Zepto

Methods

liftIO :: IO a -> ZeptoT m a #

MonadIO m => MonadIO (CatchT m) 
Instance details

Defined in Control.Monad.Catch.Pure

Methods

liftIO :: IO a -> CatchT m a #

MonadIO m => MonadIO (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

liftIO :: IO a -> LoggingT m a #

MonadIO m => MonadIO (NoLoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

liftIO :: IO a -> NoLoggingT m a #

MonadIO m => MonadIO (WriterLoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

liftIO :: IO a -> WriterLoggingT m a #

MonadIO m => MonadIO (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

liftIO :: IO a -> ResourceT m a #

MonadIO (RIO env) 
Instance details

Defined in RIO.Prelude.RIO

Methods

liftIO :: IO a -> RIO env a #

Monad m => MonadIO (QuoteToQuasi m) 
Instance details

Defined in Language.Haskell.TH.Syntax.Compat

Methods

liftIO :: IO a -> QuoteToQuasi m a #

MonadIO m => MonadIO (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

liftIO :: IO a -> MaybeT m a #

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

Defined in Control.Monad.Trans.Accum

Methods

liftIO :: IO a -> AccumT w m a #

MonadIO m => MonadIO (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

liftIO :: IO a -> ExceptT e m a #

MonadIO m => MonadIO (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

liftIO :: IO a -> IdentityT m a #

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

Defined in Control.Monad.Trans.Reader

Methods

liftIO :: IO a -> ReaderT r m a #

MonadIO m => MonadIO (SelectT r m) 
Instance details

Defined in Control.Monad.Trans.Select

Methods

liftIO :: IO a -> SelectT r m a #

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

Defined in Control.Monad.Trans.State.Lazy

Methods

liftIO :: IO a -> StateT s m a #

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

Defined in Control.Monad.Trans.State.Strict

Methods

liftIO :: IO a -> StateT s m a #

MonadIO m => MonadIO (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.CPS

Methods

liftIO :: IO a -> WriterT w m a #

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

Defined in Control.Monad.Trans.Writer.Lazy

Methods

liftIO :: IO a -> WriterT w m a #

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

Defined in Control.Monad.Trans.Writer.Strict

Methods

liftIO :: IO a -> WriterT w m a #

MonadIO m => MonadIO (ConduitT i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

liftIO :: IO a -> ConduitT i o m a #

MonadIO m => MonadIO (ContT r m) 
Instance details

Defined in Control.Monad.Trans.Cont

Methods

liftIO :: IO a -> ContT r m a #

MonadIO m => MonadIO (RWST r w s m) 
Instance details

Defined in Control.Monad.Trans.RWS.CPS

Methods

liftIO :: IO a -> RWST r w s m a #

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

Defined in Control.Monad.Trans.RWS.Lazy

Methods

liftIO :: IO a -> RWST r w s m a #

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

Defined in Control.Monad.Trans.RWS.Strict

Methods

liftIO :: IO a -> RWST r w s m a #

MonadIO m => MonadIO (Pipe l i o u m) 
Instance details

Defined in Data.Conduit.Internal.Pipe

Methods

liftIO :: IO a -> Pipe l i o u m a #

(.|) :: forall (m :: Type -> Type) a b c r. Monad m => ConduitT a b m () -> ConduitT b c m r -> ConduitT a c m r #

class Generic a #

Minimal complete definition

from, to

Instances

Instances details
Generic FullUnitId 
Instance details

Defined in Distribution.Backpack.FullUnitId

Associated Types

type Rep FullUnitId 
Instance details

Defined in Distribution.Backpack.FullUnitId

type Rep FullUnitId = D1 ('MetaData "FullUnitId" "Distribution.Backpack.FullUnitId" "Cabal-3.10.3.0-f240" 'False) (C1 ('MetaCons "FullUnitId" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ComponentId) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 OpenModuleSubst)))

Methods

from :: FullUnitId -> Rep FullUnitId x

to :: Rep FullUnitId x -> FullUnitId

Generic ModuleShape 
Instance details

Defined in Distribution.Backpack.ModuleShape

Associated Types

type Rep ModuleShape 
Instance details

Defined in Distribution.Backpack.ModuleShape

type Rep ModuleShape = D1 ('MetaData "ModuleShape" "Distribution.Backpack.ModuleShape" "Cabal-3.10.3.0-f240" 'False) (C1 ('MetaCons "ModuleShape" 'PrefixI 'True) (S1 ('MetaSel ('Just "modShapeProvides") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 OpenModuleSubst) :*: S1 ('MetaSel ('Just "modShapeRequires") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Set ModuleName))))

Methods

from :: ModuleShape -> Rep ModuleShape x

to :: Rep ModuleShape x -> ModuleShape

Generic PreModuleShape 
Instance details

Defined in Distribution.Backpack.PreModuleShape

Associated Types

type Rep PreModuleShape 
Instance details

Defined in Distribution.Backpack.PreModuleShape

type Rep PreModuleShape = D1 ('MetaData "PreModuleShape" "Distribution.Backpack.PreModuleShape" "Cabal-3.10.3.0-f240" 'False) (C1 ('MetaCons "PreModuleShape" 'PrefixI 'True) (S1 ('MetaSel ('Just "preModShapeProvides") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Set ModuleName)) :*: S1 ('MetaSel ('Just "preModShapeRequires") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Set ModuleName))))

Methods

from :: PreModuleShape -> Rep PreModuleShape x

to :: Rep PreModuleShape x -> PreModuleShape

Generic ModTime 
Instance details

Defined in Distribution.Compat.Time

Associated Types

type Rep ModTime 
Instance details

Defined in Distribution.Compat.Time

type Rep ModTime = D1 ('MetaData "ModTime" "Distribution.Compat.Time" "Cabal-3.10.3.0-f240" 'True) (C1 ('MetaCons "ModTime" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word64)))

Methods

from :: ModTime -> Rep ModTime x

to :: Rep ModTime x -> ModTime

Generic Z 
Instance details

Defined in Distribution.Simple.Build.Macros.Z

Associated Types

type Rep Z 
Instance details

Defined in Distribution.Simple.Build.Macros.Z

type Rep Z = D1 ('MetaData "Z" "Distribution.Simple.Build.Macros.Z" "Cabal-3.10.3.0-f240" 'False) (C1 ('MetaCons "Z" 'PrefixI 'True) (((S1 ('MetaSel ('Just "zPackages") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [ZPackage]) :*: S1 ('MetaSel ('Just "zTools") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [ZTool])) :*: (S1 ('MetaSel ('Just "zPackageKey") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String) :*: S1 ('MetaSel ('Just "zComponentId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String))) :*: ((S1 ('MetaSel ('Just "zPackageVersion") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Version) :*: S1 ('MetaSel ('Just "zNotNull") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (String -> Bool))) :*: (S1 ('MetaSel ('Just "zManglePkgName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (PackageName -> String)) :*: S1 ('MetaSel ('Just "zMangleStr") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (String -> String))))))

Methods

from :: Z -> Rep Z x

to :: Rep Z x -> Z

Generic ZPackage 
Instance details

Defined in Distribution.Simple.Build.Macros.Z

Associated Types

type Rep ZPackage 
Instance details

Defined in Distribution.Simple.Build.Macros.Z

type Rep ZPackage = D1 ('MetaData "ZPackage" "Distribution.Simple.Build.Macros.Z" "Cabal-3.10.3.0-f240" 'False) (C1 ('MetaCons "ZPackage" 'PrefixI 'True) ((S1 ('MetaSel ('Just "zpkgName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PackageName) :*: S1 ('MetaSel ('Just "zpkgVersion") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Version)) :*: (S1 ('MetaSel ('Just "zpkgX") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String) :*: (S1 ('MetaSel ('Just "zpkgY") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String) :*: S1 ('MetaSel ('Just "zpkgZ") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String)))))

Methods

from :: ZPackage -> Rep ZPackage x

to :: Rep ZPackage x -> ZPackage

Generic ZTool 
Instance details

Defined in Distribution.Simple.Build.Macros.Z

Associated Types

type Rep ZTool 
Instance details

Defined in Distribution.Simple.Build.Macros.Z

type Rep ZTool = D1 ('MetaData "ZTool" "Distribution.Simple.Build.Macros.Z" "Cabal-3.10.3.0-f240" 'False) (C1 ('MetaCons "ZTool" 'PrefixI 'True) ((S1 ('MetaSel ('Just "ztoolName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String) :*: S1 ('MetaSel ('Just "ztoolVersion") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Version)) :*: (S1 ('MetaSel ('Just "ztoolX") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String) :*: (S1 ('MetaSel ('Just "ztoolY") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String) :*: S1 ('MetaSel ('Just "ztoolZ") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String)))))

Methods

from :: ZTool -> Rep ZTool x

to :: Rep ZTool x -> ZTool

Generic Z 
Instance details

Defined in Distribution.Simple.Build.PackageInfoModule.Z

Associated Types

type Rep Z 
Instance details

Defined in Distribution.Simple.Build.PackageInfoModule.Z

type Rep Z = D1 ('MetaData "Z" "Distribution.Simple.Build.PackageInfoModule.Z" "Cabal-3.10.3.0-f240" 'False) (C1 ('MetaCons "Z" 'PrefixI 'True) ((S1 ('MetaSel ('Just "zPackageName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String) :*: (S1 ('MetaSel ('Just "zVersionDigits") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String) :*: S1 ('MetaSel ('Just "zSynopsis") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String))) :*: (S1 ('MetaSel ('Just "zCopyright") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String) :*: (S1 ('MetaSel ('Just "zHomepage") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String) :*: S1 ('MetaSel ('Just "zSupportsNoRebindableSyntax") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)))))

Methods

from :: Z -> Rep Z x

to :: Rep Z x -> Z

Generic Z 
Instance details

Defined in Distribution.Simple.Build.PathsModule.Z

Associated Types

type Rep Z 
Instance details

Defined in Distribution.Simple.Build.PathsModule.Z

type Rep Z = D1 ('MetaData "Z" "Distribution.Simple.Build.PathsModule.Z" "Cabal-3.10.3.0-f240" 'False) (C1 ('MetaCons "Z" 'PrefixI 'True) ((((S1 ('MetaSel ('Just "zPackageName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PackageName) :*: S1 ('MetaSel ('Just "zVersionDigits") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String)) :*: (S1 ('MetaSel ('Just "zSupportsCpp") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "zSupportsNoRebindableSyntax") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool))) :*: ((S1 ('MetaSel ('Just "zAbsolute") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "zRelocatable") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)) :*: (S1 ('MetaSel ('Just "zIsWindows") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: (S1 ('MetaSel ('Just "zIsI386") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "zIsX8664") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool))))) :*: (((S1 ('MetaSel ('Just "zPrefix") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FilePath) :*: S1 ('MetaSel ('Just "zBindir") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FilePath)) :*: (S1 ('MetaSel ('Just "zLibdir") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FilePath) :*: S1 ('MetaSel ('Just "zDynlibdir") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FilePath))) :*: ((S1 ('MetaSel ('Just "zDatadir") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FilePath) :*: S1 ('MetaSel ('Just "zLibexecdir") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FilePath)) :*: (S1 ('MetaSel ('Just "zSysconfdir") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FilePath) :*: (S1 ('MetaSel ('Just "zNot") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Bool -> Bool)) :*: S1 ('MetaSel ('Just "zManglePkgName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (PackageName -> String))))))))

Methods

from :: Z -> Rep Z x

to :: Rep Z x -> Z

Generic BuildTarget 
Instance details

Defined in Distribution.Simple.BuildTarget

Associated Types

type Rep BuildTarget 
Instance details

Defined in Distribution.Simple.BuildTarget

type Rep BuildTarget = D1 ('MetaData "BuildTarget" "Distribution.Simple.BuildTarget" "Cabal-3.10.3.0-f240" 'False) (C1 ('MetaCons "BuildTargetComponent" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ComponentName)) :+: (C1 ('MetaCons "BuildTargetModule" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ComponentName) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ModuleName)) :+: C1 ('MetaCons "BuildTargetFile" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ComponentName) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FilePath))))

Methods

from :: BuildTarget -> Rep BuildTarget x

to :: Rep BuildTarget x -> BuildTarget

Generic Compiler 
Instance details

Defined in Distribution.Simple.Compiler

Associated Types

type Rep Compiler 
Instance details

Defined in Distribution.Simple.Compiler

type Rep Compiler = D1 ('MetaData "Compiler" "Distribution.Simple.Compiler" "Cabal-3.10.3.0-f240" 'False) (C1 ('MetaCons "Compiler" 'PrefixI 'True) ((S1 ('MetaSel ('Just "compilerId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 CompilerId) :*: (S1 ('MetaSel ('Just "compilerAbiTag") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 AbiTag) :*: S1 ('MetaSel ('Just "compilerCompat") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [CompilerId]))) :*: (S1 ('MetaSel ('Just "compilerLanguages") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(Language, CompilerFlag)]) :*: (S1 ('MetaSel ('Just "compilerExtensions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(Extension, Maybe CompilerFlag)]) :*: S1 ('MetaSel ('Just "compilerProperties") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Map String String))))))

Methods

from :: Compiler -> Rep Compiler x

to :: Rep Compiler x -> Compiler

Generic DebugInfoLevel 
Instance details

Defined in Distribution.Simple.Compiler

Associated Types

type Rep DebugInfoLevel 
Instance details

Defined in Distribution.Simple.Compiler

type Rep DebugInfoLevel = D1 ('MetaData "DebugInfoLevel" "Distribution.Simple.Compiler" "Cabal-3.10.3.0-f240" 'False) ((C1 ('MetaCons "NoDebugInfo" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "MinimalDebugInfo" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "NormalDebugInfo" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "MaximalDebugInfo" 'PrefixI 'False) (U1 :: Type -> Type)))

Methods

from :: DebugInfoLevel -> Rep DebugInfoLevel x

to :: Rep DebugInfoLevel x -> DebugInfoLevel

Generic OptimisationLevel 
Instance details

Defined in Distribution.Simple.Compiler

Associated Types

type Rep OptimisationLevel 
Instance details

Defined in Distribution.Simple.Compiler

type Rep OptimisationLevel = D1 ('MetaData "OptimisationLevel" "Distribution.Simple.Compiler" "Cabal-3.10.3.0-f240" 'False) (C1 ('MetaCons "NoOptimisation" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "NormalOptimisation" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "MaximumOptimisation" 'PrefixI 'False) (U1 :: Type -> Type)))

Methods

from :: OptimisationLevel -> Rep OptimisationLevel x

to :: Rep OptimisationLevel x -> OptimisationLevel

Generic PackageDB 
Instance details

Defined in Distribution.Simple.Compiler

Associated Types

type Rep PackageDB 
Instance details

Defined in Distribution.Simple.Compiler

type Rep PackageDB = D1 ('MetaData "PackageDB" "Distribution.Simple.Compiler" "Cabal-3.10.3.0-f240" 'False) (C1 ('MetaCons "GlobalPackageDB" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "UserPackageDB" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "SpecificPackageDB" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FilePath))))

Methods

from :: PackageDB -> Rep PackageDB x

to :: Rep PackageDB x -> PackageDB

Generic ProfDetailLevel 
Instance details

Defined in Distribution.Simple.Compiler

Associated Types

type Rep ProfDetailLevel 
Instance details

Defined in Distribution.Simple.Compiler

type Rep ProfDetailLevel = D1 ('MetaData "ProfDetailLevel" "Distribution.Simple.Compiler" "Cabal-3.10.3.0-f240" 'False) ((C1 ('MetaCons "ProfDetailNone" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "ProfDetailDefault" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ProfDetailExportedFunctions" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "ProfDetailToplevelFunctions" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ProfDetailAllFunctions" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "ProfDetailTopLate" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ProfDetailOther" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String)))))

Methods

from :: ProfDetailLevel -> Rep ProfDetailLevel x

to :: Rep ProfDetailLevel x -> ProfDetailLevel

Generic HaddockArgs 
Instance details

Defined in Distribution.Simple.Haddock

Associated Types

type Rep HaddockArgs 
Instance details

Defined in Distribution.Simple.Haddock

type Rep HaddockArgs = D1 ('MetaData "HaddockArgs" "Distribution.Simple.Haddock" "Cabal-3.10.3.0-f240" 'False) (C1 ('MetaCons "HaddockArgs" 'PrefixI 'True) ((((S1 ('MetaSel ('Just "argInterfaceFile") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag FilePath)) :*: (S1 ('MetaSel ('Just "argPackageName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag PackageIdentifier)) :*: S1 ('MetaSel ('Just "argHideModules") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (All, [ModuleName])))) :*: (S1 ('MetaSel ('Just "argIgnoreExports") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Any) :*: (S1 ('MetaSel ('Just "argLinkSource") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag (Template, Template, Template))) :*: S1 ('MetaSel ('Just "argLinkedSource") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool))))) :*: ((S1 ('MetaSel ('Just "argQuickJump") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: (S1 ('MetaSel ('Just "argCssFile") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag FilePath)) :*: S1 ('MetaSel ('Just "argContents") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag String)))) :*: (S1 ('MetaSel ('Just "argGenContents") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: (S1 ('MetaSel ('Just "argIndex") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag String)) :*: S1 ('MetaSel ('Just "argGenIndex") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)))))) :*: (((S1 ('MetaSel ('Just "argBaseUrl") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag String)) :*: (S1 ('MetaSel ('Just "argVerbose") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Any) :*: S1 ('MetaSel ('Just "argOutput") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag [Output])))) :*: (S1 ('MetaSel ('Just "argInterfaces") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(FilePath, Maybe String, Maybe String, Visibility)]) :*: (S1 ('MetaSel ('Just "argOutputDir") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Directory) :*: S1 ('MetaSel ('Just "argTitle") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag String))))) :*: ((S1 ('MetaSel ('Just "argPrologue") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag String)) :*: (S1 ('MetaSel ('Just "argPrologueFile") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag FilePath)) :*: S1 ('MetaSel ('Just "argGhcOptions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 GhcOptions))) :*: ((S1 ('MetaSel ('Just "argGhcLibDir") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag FilePath)) :*: S1 ('MetaSel ('Just "argReexports") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [OpenModule])) :*: (S1 ('MetaSel ('Just "argTargets") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FilePath]) :*: S1 ('MetaSel ('Just "argLib") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag String))))))))

Methods

from :: HaddockArgs -> Rep HaddockArgs x

to :: Rep HaddockArgs x -> HaddockArgs

Generic CopyDest 
Instance details

Defined in Distribution.Simple.InstallDirs

Associated Types

type Rep CopyDest 
Instance details

Defined in Distribution.Simple.InstallDirs

type Rep CopyDest = D1 ('MetaData "CopyDest" "Distribution.Simple.InstallDirs" "Cabal-3.10.3.0-f240" 'False) (C1 ('MetaCons "NoCopyDest" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "CopyTo" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FilePath)) :+: C1 ('MetaCons "CopyToDb" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FilePath))))

Methods

from :: CopyDest -> Rep CopyDest x

to :: Rep CopyDest x -> CopyDest

Generic PathTemplate 
Instance details

Defined in Distribution.Simple.InstallDirs

Associated Types

type Rep PathTemplate 
Instance details

Defined in Distribution.Simple.InstallDirs

type Rep PathTemplate = D1 ('MetaData "PathTemplate" "Distribution.Simple.InstallDirs" "Cabal-3.10.3.0-f240" 'True) (C1 ('MetaCons "PathTemplate" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [PathComponent])))

Methods

from :: PathTemplate -> Rep PathTemplate x

to :: Rep PathTemplate x -> PathTemplate

Generic PathComponent 
Instance details

Defined in Distribution.Simple.InstallDirs.Internal

Associated Types

type Rep PathComponent 
Instance details

Defined in Distribution.Simple.InstallDirs.Internal

type Rep PathComponent = D1 ('MetaData "PathComponent" "Distribution.Simple.InstallDirs.Internal" "Cabal-3.10.3.0-f240" 'False) (C1 ('MetaCons "Ordinary" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FilePath)) :+: C1 ('MetaCons "Variable" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PathTemplateVariable)))

Methods

from :: PathComponent -> Rep PathComponent x

to :: Rep PathComponent x -> PathComponent

Generic PathTemplateVariable 
Instance details

Defined in Distribution.Simple.InstallDirs.Internal

Associated Types

type Rep PathTemplateVariable 
Instance details

Defined in Distribution.Simple.InstallDirs.Internal

type Rep PathTemplateVariable = D1 ('MetaData "PathTemplateVariable" "Distribution.Simple.InstallDirs.Internal" "Cabal-3.10.3.0-f240" 'False) ((((C1 ('MetaCons "PrefixVar" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "BindirVar" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "LibdirVar" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "LibsubdirVar" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DynlibdirVar" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "DatadirVar" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "DatasubdirVar" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DocdirVar" 'PrefixI 'False) (U1 :: Type -> Type))) :+: (C1 ('MetaCons "HtmldirVar" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "PkgNameVar" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PkgVerVar" 'PrefixI 'False) (U1 :: Type -> Type))))) :+: (((C1 ('MetaCons "PkgIdVar" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LibNameVar" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "CompilerVar" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "OSVar" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ArchVar" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "AbiVar" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "AbiTagVar" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ExecutableNameVar" 'PrefixI 'False) (U1 :: Type -> Type))) :+: (C1 ('MetaCons "TestSuiteNameVar" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "TestSuiteResultVar" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "BenchmarkNameVar" 'PrefixI 'False) (U1 :: Type -> Type))))))

Methods

from :: PathTemplateVariable -> Rep PathTemplateVariable x

to :: Rep PathTemplateVariable x -> PathTemplateVariable

Generic GhcOptions 
Instance details

Defined in Distribution.Simple.Program.GHC

Associated Types

type Rep GhcOptions 
Instance details

Defined in Distribution.Simple.Program.GHC

type Rep GhcOptions = D1 ('MetaData "GhcOptions" "Distribution.Simple.Program.GHC" "Cabal-3.10.3.0-f240" 'False) (C1 ('MetaCons "GhcOptions" 'PrefixI 'True) ((((((S1 ('MetaSel ('Just "ghcOptMode") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag GhcMode)) :*: S1 ('MetaSel ('Just "ghcOptExtra") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String])) :*: (S1 ('MetaSel ('Just "ghcOptExtraDefault") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String]) :*: S1 ('MetaSel ('Just "ghcOptInputFiles") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NubListR FilePath)))) :*: ((S1 ('MetaSel ('Just "ghcOptInputScripts") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NubListR FilePath)) :*: S1 ('MetaSel ('Just "ghcOptInputModules") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NubListR ModuleName))) :*: (S1 ('MetaSel ('Just "ghcOptOutputFile") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag FilePath)) :*: S1 ('MetaSel ('Just "ghcOptOutputDynFile") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag FilePath))))) :*: (((S1 ('MetaSel ('Just "ghcOptSourcePathClear") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: S1 ('MetaSel ('Just "ghcOptSourcePath") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NubListR FilePath))) :*: (S1 ('MetaSel ('Just "ghcOptThisUnitId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag String)) :*: S1 ('MetaSel ('Just "ghcOptThisComponentId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag ComponentId)))) :*: ((S1 ('MetaSel ('Just "ghcOptInstantiatedWith") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(ModuleName, OpenModule)]) :*: S1 ('MetaSel ('Just "ghcOptNoCode") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool))) :*: (S1 ('MetaSel ('Just "ghcOptPackageDBs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PackageDBStack) :*: S1 ('MetaSel ('Just "ghcOptPackages") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NubListR (OpenUnitId, ModuleRenaming))))))) :*: ((((S1 ('MetaSel ('Just "ghcOptHideAllPackages") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: S1 ('MetaSel ('Just "ghcOptWarnMissingHomeModules") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool))) :*: (S1 ('MetaSel ('Just "ghcOptNoAutoLinkPackages") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: S1 ('MetaSel ('Just "ghcOptLinkLibs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FilePath]))) :*: ((S1 ('MetaSel ('Just "ghcOptLinkLibPath") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NubListR FilePath)) :*: S1 ('MetaSel ('Just "ghcOptLinkOptions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String])) :*: (S1 ('MetaSel ('Just "ghcOptLinkFrameworks") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NubListR String)) :*: S1 ('MetaSel ('Just "ghcOptLinkFrameworkDirs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NubListR String))))) :*: (((S1 ('MetaSel ('Just "ghcOptLinkRts") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: S1 ('MetaSel ('Just "ghcOptNoLink") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool))) :*: (S1 ('MetaSel ('Just "ghcOptLinkNoHsMain") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: S1 ('MetaSel ('Just "ghcOptLinkModDefFiles") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NubListR FilePath)))) :*: ((S1 ('MetaSel ('Just "ghcOptCcOptions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String]) :*: S1 ('MetaSel ('Just "ghcOptCxxOptions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String])) :*: (S1 ('MetaSel ('Just "ghcOptAsmOptions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String]) :*: S1 ('MetaSel ('Just "ghcOptCppOptions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String])))))) :*: (((((S1 ('MetaSel ('Just "ghcOptCppIncludePath") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NubListR FilePath)) :*: S1 ('MetaSel ('Just "ghcOptCppIncludes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NubListR FilePath))) :*: (S1 ('MetaSel ('Just "ghcOptFfiIncludes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NubListR FilePath)) :*: S1 ('MetaSel ('Just "ghcOptCcProgram") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag FilePath)))) :*: ((S1 ('MetaSel ('Just "ghcOptLanguage") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Language)) :*: S1 ('MetaSel ('Just "ghcOptExtensions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NubListR Extension))) :*: (S1 ('MetaSel ('Just "ghcOptExtensionMap") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Map Extension (Maybe CompilerFlag))) :*: S1 ('MetaSel ('Just "ghcOptOptimisation") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag GhcOptimisation))))) :*: (((S1 ('MetaSel ('Just "ghcOptDebugInfo") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag DebugInfoLevel)) :*: S1 ('MetaSel ('Just "ghcOptProfilingMode") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool))) :*: (S1 ('MetaSel ('Just "ghcOptProfilingAuto") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag GhcProfAuto)) :*: S1 ('MetaSel ('Just "ghcOptSplitSections") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)))) :*: ((S1 ('MetaSel ('Just "ghcOptSplitObjs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: S1 ('MetaSel ('Just "ghcOptNumJobs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag (Maybe Int)))) :*: (S1 ('MetaSel ('Just "ghcOptHPCDir") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag FilePath)) :*: S1 ('MetaSel ('Just "ghcOptGHCiScripts") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FilePath]))))) :*: ((((S1 ('MetaSel ('Just "ghcOptHiSuffix") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag String)) :*: S1 ('MetaSel ('Just "ghcOptObjSuffix") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag String))) :*: (S1 ('MetaSel ('Just "ghcOptDynHiSuffix") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag String)) :*: S1 ('MetaSel ('Just "ghcOptDynObjSuffix") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag String)))) :*: ((S1 ('MetaSel ('Just "ghcOptHiDir") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag FilePath)) :*: S1 ('MetaSel ('Just "ghcOptObjDir") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag FilePath))) :*: (S1 ('MetaSel ('Just "ghcOptOutputDir") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag FilePath)) :*: S1 ('MetaSel ('Just "ghcOptStubDir") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag FilePath))))) :*: (((S1 ('MetaSel ('Just "ghcOptDynLinkMode") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag GhcDynLinkMode)) :*: S1 ('MetaSel ('Just "ghcOptStaticLib") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool))) :*: (S1 ('MetaSel ('Just "ghcOptShared") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: S1 ('MetaSel ('Just "ghcOptFPic") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)))) :*: ((S1 ('MetaSel ('Just "ghcOptDylibName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag String)) :*: S1 ('MetaSel ('Just "ghcOptRPaths") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NubListR FilePath))) :*: (S1 ('MetaSel ('Just "ghcOptVerbosity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Verbosity)) :*: (S1 ('MetaSel ('Just "ghcOptExtraPath") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NubListR FilePath)) :*: S1 ('MetaSel ('Just "ghcOptCabal") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool))))))))))

Methods

from :: GhcOptions -> Rep GhcOptions x

to :: Rep GhcOptions x -> GhcOptions

Generic ConfiguredProgram 
Instance details

Defined in Distribution.Simple.Program.Types

Associated Types

type Rep ConfiguredProgram 
Instance details

Defined in Distribution.Simple.Program.Types

type Rep ConfiguredProgram = D1 ('MetaData "ConfiguredProgram" "Distribution.Simple.Program.Types" "Cabal-3.10.3.0-f240" 'False) (C1 ('MetaCons "ConfiguredProgram" 'PrefixI 'True) (((S1 ('MetaSel ('Just "programId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String) :*: S1 ('MetaSel ('Just "programVersion") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Version))) :*: (S1 ('MetaSel ('Just "programDefaultArgs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String]) :*: S1 ('MetaSel ('Just "programOverrideArgs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String]))) :*: ((S1 ('MetaSel ('Just "programOverrideEnv") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(String, Maybe String)]) :*: S1 ('MetaSel ('Just "programProperties") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Map String String))) :*: (S1 ('MetaSel ('Just "programLocation") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ProgramLocation) :*: S1 ('MetaSel ('Just "programMonitorFiles") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FilePath])))))

Methods

from :: ConfiguredProgram -> Rep ConfiguredProgram x

to :: Rep ConfiguredProgram x -> ConfiguredProgram

Generic ProgramLocation 
Instance details

Defined in Distribution.Simple.Program.Types

Associated Types

type Rep ProgramLocation 
Instance details

Defined in Distribution.Simple.Program.Types

type Rep ProgramLocation = D1 ('MetaData "ProgramLocation" "Distribution.Simple.Program.Types" "Cabal-3.10.3.0-f240" 'False) (C1 ('MetaCons "UserSpecified" 'PrefixI 'True) (S1 ('MetaSel ('Just "locationPath") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FilePath)) :+: C1 ('MetaCons "FoundOnSystem" 'PrefixI 'True) (S1 ('MetaSel ('Just "locationPath") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FilePath)))

Methods

from :: ProgramLocation -> Rep ProgramLocation x

to :: Rep ProgramLocation x -> ProgramLocation

Generic ProgramSearchPathEntry 
Instance details

Defined in Distribution.Simple.Program.Types

Associated Types

type Rep ProgramSearchPathEntry 
Instance details

Defined in Distribution.Simple.Program.Types

type Rep ProgramSearchPathEntry = D1 ('MetaData "ProgramSearchPathEntry" "Distribution.Simple.Program.Types" "Cabal-3.10.3.0-f240" 'False) (C1 ('MetaCons "ProgramSearchPathDir" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FilePath)) :+: C1 ('MetaCons "ProgramSearchPathDefault" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: ProgramSearchPathEntry -> Rep ProgramSearchPathEntry x

to :: Rep ProgramSearchPathEntry x -> ProgramSearchPathEntry

Generic BenchmarkFlags 
Instance details

Defined in Distribution.Simple.Setup

Associated Types

type Rep BenchmarkFlags 
Instance details

Defined in Distribution.Simple.Setup

type Rep BenchmarkFlags = D1 ('MetaData "BenchmarkFlags" "Distribution.Simple.Setup" "Cabal-3.10.3.0-f240" 'False) (C1 ('MetaCons "BenchmarkFlags" 'PrefixI 'True) (S1 ('MetaSel ('Just "benchmarkDistPref") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag FilePath)) :*: (S1 ('MetaSel ('Just "benchmarkVerbosity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Verbosity)) :*: S1 ('MetaSel ('Just "benchmarkOptions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [PathTemplate]))))

Methods

from :: BenchmarkFlags -> Rep BenchmarkFlags x

to :: Rep BenchmarkFlags x -> BenchmarkFlags

Generic BuildFlags 
Instance details

Defined in Distribution.Simple.Setup

Associated Types

type Rep BuildFlags 
Instance details

Defined in Distribution.Simple.Setup

type Rep BuildFlags = D1 ('MetaData "BuildFlags" "Distribution.Simple.Setup" "Cabal-3.10.3.0-f240" 'False) (C1 ('MetaCons "BuildFlags" 'PrefixI 'True) ((S1 ('MetaSel ('Just "buildProgramPaths") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(String, FilePath)]) :*: (S1 ('MetaSel ('Just "buildProgramArgs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(String, [String])]) :*: S1 ('MetaSel ('Just "buildDistPref") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag FilePath)))) :*: ((S1 ('MetaSel ('Just "buildVerbosity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Verbosity)) :*: S1 ('MetaSel ('Just "buildNumJobs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag (Maybe Int)))) :*: (S1 ('MetaSel ('Just "buildArgs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String]) :*: S1 ('MetaSel ('Just "buildCabalFilePath") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag FilePath))))))

Methods

from :: BuildFlags -> Rep BuildFlags x

to :: Rep BuildFlags x -> BuildFlags

Generic CleanFlags 
Instance details

Defined in Distribution.Simple.Setup

Associated Types

type Rep CleanFlags 
Instance details

Defined in Distribution.Simple.Setup

type Rep CleanFlags = D1 ('MetaData "CleanFlags" "Distribution.Simple.Setup" "Cabal-3.10.3.0-f240" 'False) (C1 ('MetaCons "CleanFlags" 'PrefixI 'True) ((S1 ('MetaSel ('Just "cleanSaveConf") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: S1 ('MetaSel ('Just "cleanDistPref") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag FilePath))) :*: (S1 ('MetaSel ('Just "cleanVerbosity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Verbosity)) :*: S1 ('MetaSel ('Just "cleanCabalFilePath") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag FilePath)))))

Methods

from :: CleanFlags -> Rep CleanFlags x

to :: Rep CleanFlags x -> CleanFlags

Generic ConfigFlags 
Instance details

Defined in Distribution.Simple.Setup

Associated Types

type Rep ConfigFlags 
Instance details

Defined in Distribution.Simple.Setup

type Rep ConfigFlags = D1 ('MetaData "ConfigFlags" "Distribution.Simple.Setup" "Cabal-3.10.3.0-f240" 'False) (C1 ('MetaCons "ConfigFlags" 'PrefixI 'True) (((((S1 ('MetaSel ('Just "configArgs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String]) :*: (S1 ('MetaSel ('Just "configPrograms_") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Option' (Last' ProgramDb))) :*: S1 ('MetaSel ('Just "configProgramPaths") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(String, FilePath)]))) :*: ((S1 ('MetaSel ('Just "configProgramArgs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(String, [String])]) :*: S1 ('MetaSel ('Just "configProgramPathExtra") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NubList FilePath))) :*: (S1 ('MetaSel ('Just "configHcFlavor") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag CompilerFlavor)) :*: S1 ('MetaSel ('Just "configHcPath") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag FilePath))))) :*: ((S1 ('MetaSel ('Just "configHcPkg") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag FilePath)) :*: (S1 ('MetaSel ('Just "configVanillaLib") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: S1 ('MetaSel ('Just "configProfLib") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)))) :*: ((S1 ('MetaSel ('Just "configSharedLib") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: S1 ('MetaSel ('Just "configStaticLib") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool))) :*: (S1 ('MetaSel ('Just "configDynExe") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: S1 ('MetaSel ('Just "configFullyStaticExe") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)))))) :*: (((S1 ('MetaSel ('Just "configProfExe") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: (S1 ('MetaSel ('Just "configProf") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: S1 ('MetaSel ('Just "configProfDetail") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag ProfDetailLevel)))) :*: ((S1 ('MetaSel ('Just "configProfLibDetail") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag ProfDetailLevel)) :*: S1 ('MetaSel ('Just "configConfigureArgs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String])) :*: (S1 ('MetaSel ('Just "configOptimization") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag OptimisationLevel)) :*: S1 ('MetaSel ('Just "configProgPrefix") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag PathTemplate))))) :*: ((S1 ('MetaSel ('Just "configProgSuffix") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag PathTemplate)) :*: (S1 ('MetaSel ('Just "configInstallDirs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (InstallDirs (Flag PathTemplate))) :*: S1 ('MetaSel ('Just "configScratchDir") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag FilePath)))) :*: ((S1 ('MetaSel ('Just "configExtraLibDirs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FilePath]) :*: S1 ('MetaSel ('Just "configExtraLibDirsStatic") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FilePath])) :*: (S1 ('MetaSel ('Just "configExtraFrameworkDirs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FilePath]) :*: S1 ('MetaSel ('Just "configExtraIncludeDirs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FilePath])))))) :*: ((((S1 ('MetaSel ('Just "configIPID") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag String)) :*: (S1 ('MetaSel ('Just "configCID") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag ComponentId)) :*: S1 ('MetaSel ('Just "configDeterministic") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)))) :*: ((S1 ('MetaSel ('Just "configDistPref") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag FilePath)) :*: S1 ('MetaSel ('Just "configCabalFilePath") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag FilePath))) :*: (S1 ('MetaSel ('Just "configVerbosity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Verbosity)) :*: S1 ('MetaSel ('Just "configUserInstall") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool))))) :*: ((S1 ('MetaSel ('Just "configPackageDBs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Maybe PackageDB]) :*: (S1 ('MetaSel ('Just "configGHCiLib") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: S1 ('MetaSel ('Just "configSplitSections") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)))) :*: ((S1 ('MetaSel ('Just "configSplitObjs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: S1 ('MetaSel ('Just "configStripExes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool))) :*: (S1 ('MetaSel ('Just "configStripLibs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: S1 ('MetaSel ('Just "configConstraints") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [PackageVersionConstraint]))))) :*: (((S1 ('MetaSel ('Just "configDependencies") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [GivenComponent]) :*: (S1 ('MetaSel ('Just "configInstantiateWith") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(ModuleName, Module)]) :*: S1 ('MetaSel ('Just "configConfigurationsFlags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FlagAssignment))) :*: ((S1 ('MetaSel ('Just "configTests") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: S1 ('MetaSel ('Just "configBenchmarks") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool))) :*: (S1 ('MetaSel ('Just "configCoverage") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: S1 ('MetaSel ('Just "configLibCoverage") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool))))) :*: ((S1 ('MetaSel ('Just "configExactConfiguration") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: (S1 ('MetaSel ('Just "configFlagError") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag String)) :*: S1 ('MetaSel ('Just "configRelocatable") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)))) :*: ((S1 ('MetaSel ('Just "configDebugInfo") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag DebugInfoLevel)) :*: S1 ('MetaSel ('Just "configDumpBuildInfo") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag DumpBuildInfo))) :*: (S1 ('MetaSel ('Just "configUseResponseFiles") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: S1 ('MetaSel ('Just "configAllowDependingOnPrivateLibs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)))))))))

Methods

from :: ConfigFlags -> Rep ConfigFlags x

to :: Rep ConfigFlags x -> ConfigFlags

Generic CopyFlags 
Instance details

Defined in Distribution.Simple.Setup

Associated Types

type Rep CopyFlags 
Instance details

Defined in Distribution.Simple.Setup

type Rep CopyFlags = D1 ('MetaData "CopyFlags" "Distribution.Simple.Setup" "Cabal-3.10.3.0-f240" 'False) (C1 ('MetaCons "CopyFlags" 'PrefixI 'True) ((S1 ('MetaSel ('Just "copyDest") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag CopyDest)) :*: S1 ('MetaSel ('Just "copyDistPref") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag FilePath))) :*: (S1 ('MetaSel ('Just "copyVerbosity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Verbosity)) :*: (S1 ('MetaSel ('Just "copyArgs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String]) :*: S1 ('MetaSel ('Just "copyCabalFilePath") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag FilePath))))))

Methods

from :: CopyFlags -> Rep CopyFlags x

to :: Rep CopyFlags x -> CopyFlags

Generic GlobalFlags 
Instance details

Defined in Distribution.Simple.Setup

Associated Types

type Rep GlobalFlags 
Instance details

Defined in Distribution.Simple.Setup

type Rep GlobalFlags = D1 ('MetaData "GlobalFlags" "Distribution.Simple.Setup" "Cabal-3.10.3.0-f240" 'False) (C1 ('MetaCons "GlobalFlags" 'PrefixI 'True) (S1 ('MetaSel ('Just "globalVersion") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: S1 ('MetaSel ('Just "globalNumericVersion") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool))))

Methods

from :: GlobalFlags -> Rep GlobalFlags x

to :: Rep GlobalFlags x -> GlobalFlags

Generic HaddockFlags 
Instance details

Defined in Distribution.Simple.Setup

Associated Types

type Rep HaddockFlags 
Instance details

Defined in Distribution.Simple.Setup

type Rep HaddockFlags = D1 ('MetaData "HaddockFlags" "Distribution.Simple.Setup" "Cabal-3.10.3.0-f240" 'False) (C1 ('MetaCons "HaddockFlags" 'PrefixI 'True) ((((S1 ('MetaSel ('Just "haddockProgramPaths") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(String, FilePath)]) :*: (S1 ('MetaSel ('Just "haddockProgramArgs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(String, [String])]) :*: S1 ('MetaSel ('Just "haddockHoogle") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)))) :*: (S1 ('MetaSel ('Just "haddockHtml") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: (S1 ('MetaSel ('Just "haddockHtmlLocation") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag String)) :*: S1 ('MetaSel ('Just "haddockForHackage") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag HaddockTarget))))) :*: ((S1 ('MetaSel ('Just "haddockExecutables") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: (S1 ('MetaSel ('Just "haddockTestSuites") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: S1 ('MetaSel ('Just "haddockBenchmarks") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)))) :*: (S1 ('MetaSel ('Just "haddockForeignLibs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: (S1 ('MetaSel ('Just "haddockInternal") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: S1 ('MetaSel ('Just "haddockCss") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag FilePath)))))) :*: (((S1 ('MetaSel ('Just "haddockLinkedSource") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: (S1 ('MetaSel ('Just "haddockQuickJump") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: S1 ('MetaSel ('Just "haddockHscolourCss") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag FilePath)))) :*: (S1 ('MetaSel ('Just "haddockContents") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag PathTemplate)) :*: (S1 ('MetaSel ('Just "haddockIndex") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag PathTemplate)) :*: S1 ('MetaSel ('Just "haddockDistPref") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag FilePath))))) :*: ((S1 ('MetaSel ('Just "haddockKeepTempFiles") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: (S1 ('MetaSel ('Just "haddockVerbosity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Verbosity)) :*: S1 ('MetaSel ('Just "haddockCabalFilePath") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag FilePath)))) :*: (S1 ('MetaSel ('Just "haddockBaseUrl") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag String)) :*: (S1 ('MetaSel ('Just "haddockLib") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag String)) :*: S1 ('MetaSel ('Just "haddockArgs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String])))))))

Methods

from :: HaddockFlags -> Rep HaddockFlags x

to :: Rep HaddockFlags x -> HaddockFlags

Generic HaddockProjectFlags 
Instance details

Defined in Distribution.Simple.Setup

Associated Types

type Rep HaddockProjectFlags 
Instance details

Defined in Distribution.Simple.Setup

type Rep HaddockProjectFlags = D1 ('MetaData "HaddockProjectFlags" "Distribution.Simple.Setup" "Cabal-3.10.3.0-f240" 'False) (C1 ('MetaCons "HaddockProjectFlags" 'PrefixI 'True) ((((S1 ('MetaSel ('Just "haddockProjectHackage") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: S1 ('MetaSel ('Just "haddockProjectLocal") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool))) :*: (S1 ('MetaSel ('Just "haddockProjectDir") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag String)) :*: (S1 ('MetaSel ('Just "haddockProjectPrologue") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag String)) :*: S1 ('MetaSel ('Just "haddockProjectGenIndex") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool))))) :*: ((S1 ('MetaSel ('Just "haddockProjectGenContents") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: (S1 ('MetaSel ('Just "haddockProjectInterfaces") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag [(FilePath, Maybe FilePath, Maybe FilePath, Visibility)])) :*: S1 ('MetaSel ('Just "haddockProjectProgramPaths") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(String, FilePath)]))) :*: (S1 ('MetaSel ('Just "haddockProjectProgramArgs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(String, [String])]) :*: (S1 ('MetaSel ('Just "haddockProjectHoogle") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: S1 ('MetaSel ('Just "haddockProjectHtmlLocation") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag String)))))) :*: (((S1 ('MetaSel ('Just "haddockProjectExecutables") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: (S1 ('MetaSel ('Just "haddockProjectTestSuites") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: S1 ('MetaSel ('Just "haddockProjectBenchmarks") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)))) :*: (S1 ('MetaSel ('Just "haddockProjectForeignLibs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: (S1 ('MetaSel ('Just "haddockProjectInternal") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: S1 ('MetaSel ('Just "haddockProjectCss") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag FilePath))))) :*: ((S1 ('MetaSel ('Just "haddockProjectLinkedSource") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: (S1 ('MetaSel ('Just "haddockProjectQuickJump") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: S1 ('MetaSel ('Just "haddockProjectHscolourCss") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag FilePath)))) :*: (S1 ('MetaSel ('Just "haddockProjectKeepTempFiles") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: (S1 ('MetaSel ('Just "haddockProjectVerbosity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Verbosity)) :*: S1 ('MetaSel ('Just "haddockProjectLib") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag String))))))))

Methods

from :: HaddockProjectFlags -> Rep HaddockProjectFlags x

to :: Rep HaddockProjectFlags x -> HaddockProjectFlags

Generic HaddockTarget 
Instance details

Defined in Distribution.Simple.Setup

Associated Types

type Rep HaddockTarget 
Instance details

Defined in Distribution.Simple.Setup

type Rep HaddockTarget = D1 ('MetaData "HaddockTarget" "Distribution.Simple.Setup" "Cabal-3.10.3.0-f240" 'False) (C1 ('MetaCons "ForHackage" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ForDevelopment" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: HaddockTarget -> Rep HaddockTarget x

to :: Rep HaddockTarget x -> HaddockTarget

Generic HscolourFlags 
Instance details

Defined in Distribution.Simple.Setup

Associated Types

type Rep HscolourFlags 
Instance details

Defined in Distribution.Simple.Setup

type Rep HscolourFlags = D1 ('MetaData "HscolourFlags" "Distribution.Simple.Setup" "Cabal-3.10.3.0-f240" 'False) (C1 ('MetaCons "HscolourFlags" 'PrefixI 'True) (((S1 ('MetaSel ('Just "hscolourCSS") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag FilePath)) :*: S1 ('MetaSel ('Just "hscolourExecutables") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool))) :*: (S1 ('MetaSel ('Just "hscolourTestSuites") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: S1 ('MetaSel ('Just "hscolourBenchmarks") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)))) :*: ((S1 ('MetaSel ('Just "hscolourForeignLibs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: S1 ('MetaSel ('Just "hscolourDistPref") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag FilePath))) :*: (S1 ('MetaSel ('Just "hscolourVerbosity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Verbosity)) :*: S1 ('MetaSel ('Just "hscolourCabalFilePath") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag FilePath))))))

Methods

from :: HscolourFlags -> Rep HscolourFlags x

to :: Rep HscolourFlags x -> HscolourFlags

Generic InstallFlags 
Instance details

Defined in Distribution.Simple.Setup

Associated Types

type Rep InstallFlags 
Instance details

Defined in Distribution.Simple.Setup

type Rep InstallFlags = D1 ('MetaData "InstallFlags" "Distribution.Simple.Setup" "Cabal-3.10.3.0-f240" 'False) (C1 ('MetaCons "InstallFlags" 'PrefixI 'True) ((S1 ('MetaSel ('Just "installPackageDB") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag PackageDB)) :*: (S1 ('MetaSel ('Just "installDest") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag CopyDest)) :*: S1 ('MetaSel ('Just "installDistPref") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag FilePath)))) :*: ((S1 ('MetaSel ('Just "installUseWrapper") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: S1 ('MetaSel ('Just "installInPlace") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool))) :*: (S1 ('MetaSel ('Just "installVerbosity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Verbosity)) :*: S1 ('MetaSel ('Just "installCabalFilePath") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag FilePath))))))

Methods

from :: InstallFlags -> Rep InstallFlags x

to :: Rep InstallFlags x -> InstallFlags

Generic RegisterFlags 
Instance details

Defined in Distribution.Simple.Setup

Associated Types

type Rep RegisterFlags 
Instance details

Defined in Distribution.Simple.Setup

type Rep RegisterFlags = D1 ('MetaData "RegisterFlags" "Distribution.Simple.Setup" "Cabal-3.10.3.0-f240" 'False) (C1 ('MetaCons "RegisterFlags" 'PrefixI 'True) (((S1 ('MetaSel ('Just "regPackageDB") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag PackageDB)) :*: S1 ('MetaSel ('Just "regGenScript") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool))) :*: (S1 ('MetaSel ('Just "regGenPkgConf") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag (Maybe FilePath))) :*: S1 ('MetaSel ('Just "regInPlace") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)))) :*: ((S1 ('MetaSel ('Just "regDistPref") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag FilePath)) :*: S1 ('MetaSel ('Just "regPrintId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool))) :*: (S1 ('MetaSel ('Just "regVerbosity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Verbosity)) :*: (S1 ('MetaSel ('Just "regArgs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String]) :*: S1 ('MetaSel ('Just "regCabalFilePath") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag FilePath)))))))

Methods

from :: RegisterFlags -> Rep RegisterFlags x

to :: Rep RegisterFlags x -> RegisterFlags

Generic ReplFlags 
Instance details

Defined in Distribution.Simple.Setup

Associated Types

type Rep ReplFlags 
Instance details

Defined in Distribution.Simple.Setup

type Rep ReplFlags = D1 ('MetaData "ReplFlags" "Distribution.Simple.Setup" "Cabal-3.10.3.0-f240" 'False) (C1 ('MetaCons "ReplFlags" 'PrefixI 'True) ((S1 ('MetaSel ('Just "replProgramPaths") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(String, FilePath)]) :*: (S1 ('MetaSel ('Just "replProgramArgs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(String, [String])]) :*: S1 ('MetaSel ('Just "replDistPref") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag FilePath)))) :*: (S1 ('MetaSel ('Just "replVerbosity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Verbosity)) :*: (S1 ('MetaSel ('Just "replReload") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: S1 ('MetaSel ('Just "replReplOptions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ReplOptions)))))

Methods

from :: ReplFlags -> Rep ReplFlags x

to :: Rep ReplFlags x -> ReplFlags

Generic ReplOptions 
Instance details

Defined in Distribution.Simple.Setup

Associated Types

type Rep ReplOptions 
Instance details

Defined in Distribution.Simple.Setup

type Rep ReplOptions = D1 ('MetaData "ReplOptions" "Distribution.Simple.Setup" "Cabal-3.10.3.0-f240" 'False) (C1 ('MetaCons "ReplOptions" 'PrefixI 'True) (S1 ('MetaSel ('Just "replOptionsFlags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String]) :*: S1 ('MetaSel ('Just "replOptionsNoLoad") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool))))

Methods

from :: ReplOptions -> Rep ReplOptions x

to :: Rep ReplOptions x -> ReplOptions

Generic SDistFlags 
Instance details

Defined in Distribution.Simple.Setup

Associated Types

type Rep SDistFlags 
Instance details

Defined in Distribution.Simple.Setup

type Rep SDistFlags = D1 ('MetaData "SDistFlags" "Distribution.Simple.Setup" "Cabal-3.10.3.0-f240" 'False) (C1 ('MetaCons "SDistFlags" 'PrefixI 'True) ((S1 ('MetaSel ('Just "sDistSnapshot") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: S1 ('MetaSel ('Just "sDistDirectory") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag FilePath))) :*: (S1 ('MetaSel ('Just "sDistDistPref") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag FilePath)) :*: (S1 ('MetaSel ('Just "sDistListSources") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag FilePath)) :*: S1 ('MetaSel ('Just "sDistVerbosity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Verbosity))))))

Methods

from :: SDistFlags -> Rep SDistFlags x

to :: Rep SDistFlags x -> SDistFlags

Generic TestFlags 
Instance details

Defined in Distribution.Simple.Setup

Associated Types

type Rep TestFlags 
Instance details

Defined in Distribution.Simple.Setup

type Rep TestFlags = D1 ('MetaData "TestFlags" "Distribution.Simple.Setup" "Cabal-3.10.3.0-f240" 'False) (C1 ('MetaCons "TestFlags" 'PrefixI 'True) (((S1 ('MetaSel ('Just "testDistPref") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag FilePath)) :*: S1 ('MetaSel ('Just "testVerbosity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Verbosity))) :*: (S1 ('MetaSel ('Just "testHumanLog") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag PathTemplate)) :*: S1 ('MetaSel ('Just "testMachineLog") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag PathTemplate)))) :*: ((S1 ('MetaSel ('Just "testShowDetails") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag TestShowDetails)) :*: S1 ('MetaSel ('Just "testKeepTix") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool))) :*: (S1 ('MetaSel ('Just "testWrapper") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag FilePath)) :*: (S1 ('MetaSel ('Just "testFailWhenNoTestSuites") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Flag Bool)) :*: S1 ('MetaSel ('Just "testOptions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [PathTemplate]))))))

Methods

from :: TestFlags -> Rep TestFlags x

to :: Rep TestFlags x -> TestFlags

Generic TestShowDetails 
Instance details

Defined in Distribution.Simple.Setup

Associated Types

type Rep TestShowDetails 
Instance details

Defined in Distribution.Simple.Setup

type Rep TestShowDetails = D1 ('MetaData "TestShowDetails" "Distribution.Simple.Setup" "Cabal-3.10.3.0-f240" 'False) ((C1 ('MetaCons "Never" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Failures" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Always" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Streaming" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Direct" 'PrefixI 'False) (U1 :: Type -> Type))))

Methods

from :: TestShowDetails -> Rep TestShowDetails x

to :: Rep TestShowDetails x -> TestShowDetails

Generic ComponentLocalBuildInfo 
Instance details

Defined in Distribution.Types.ComponentLocalBuildInfo

Associated Types

type Rep ComponentLocalBuildInfo 
Instance details

Defined in Distribution.Types.ComponentLocalBuildInfo

type Rep ComponentLocalBuildInfo = D1 ('MetaData "ComponentLocalBuildInfo" "Distribution.Types.ComponentLocalBuildInfo" "Cabal-3.10.3.0-f240" 'False) ((C1 ('MetaCons "LibComponentLocalBuildInfo" 'PrefixI 'True) (((S1 ('MetaSel ('Just "componentLocalName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ComponentName) :*: (S1 ('MetaSel ('Just "componentComponentId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ComponentId) :*: S1 ('MetaSel ('Just "componentUnitId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UnitId))) :*: (S1 ('MetaSel ('Just "componentIsIndefinite_") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: (S1 ('MetaSel ('Just "componentInstantiatedWith") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(ModuleName, OpenModule)]) :*: S1 ('MetaSel ('Just "componentPackageDeps") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(UnitId, MungedPackageId)])))) :*: ((S1 ('MetaSel ('Just "componentIncludes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(OpenUnitId, ModuleRenaming)]) :*: (S1 ('MetaSel ('Just "componentExeDeps") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [UnitId]) :*: S1 ('MetaSel ('Just "componentInternalDeps") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [UnitId]))) :*: ((S1 ('MetaSel ('Just "componentCompatPackageKey") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String) :*: S1 ('MetaSel ('Just "componentCompatPackageName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MungedPackageName)) :*: (S1 ('MetaSel ('Just "componentExposedModules") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [ExposedModule]) :*: S1 ('MetaSel ('Just "componentIsPublic") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool))))) :+: C1 ('MetaCons "FLibComponentLocalBuildInfo" 'PrefixI 'True) ((S1 ('MetaSel ('Just "componentLocalName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ComponentName) :*: (S1 ('MetaSel ('Just "componentComponentId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ComponentId) :*: S1 ('MetaSel ('Just "componentUnitId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UnitId))) :*: ((S1 ('MetaSel ('Just "componentPackageDeps") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(UnitId, MungedPackageId)]) :*: S1 ('MetaSel ('Just "componentIncludes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(OpenUnitId, ModuleRenaming)])) :*: (S1 ('MetaSel ('Just "componentExeDeps") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [UnitId]) :*: S1 ('MetaSel ('Just "componentInternalDeps") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [UnitId]))))) :+: (C1 ('MetaCons "ExeComponentLocalBuildInfo" 'PrefixI 'True) ((S1 ('MetaSel ('Just "componentLocalName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ComponentName) :*: (S1 ('MetaSel ('Just "componentComponentId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ComponentId) :*: S1 ('MetaSel ('Just "componentUnitId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UnitId))) :*: ((S1 ('MetaSel ('Just "componentPackageDeps") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(UnitId, MungedPackageId)]) :*: S1 ('MetaSel ('Just "componentIncludes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(OpenUnitId, ModuleRenaming)])) :*: (S1 ('MetaSel ('Just "componentExeDeps") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [UnitId]) :*: S1 ('MetaSel ('Just "componentInternalDeps") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [UnitId])))) :+: (C1 ('MetaCons "TestComponentLocalBuildInfo" 'PrefixI 'True) ((S1 ('MetaSel ('Just "componentLocalName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ComponentName) :*: (S1 ('MetaSel ('Just "componentComponentId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ComponentId) :*: S1 ('MetaSel ('Just "componentUnitId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UnitId))) :*: ((S1 ('MetaSel ('Just "componentPackageDeps") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(UnitId, MungedPackageId)]) :*: S1 ('MetaSel ('Just "componentIncludes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(OpenUnitId, ModuleRenaming)])) :*: (S1 ('MetaSel ('Just "componentExeDeps") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [UnitId]) :*: S1 ('MetaSel ('Just "componentInternalDeps") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [UnitId])))) :+: C1 ('MetaCons "BenchComponentLocalBuildInfo" 'PrefixI 'True) ((S1 ('MetaSel ('Just "componentLocalName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ComponentName) :*: (S1 ('MetaSel ('Just "componentComponentId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ComponentId) :*: S1 ('MetaSel ('Just "componentUnitId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UnitId))) :*: ((S1 ('MetaSel ('Just "componentPackageDeps") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(UnitId, MungedPackageId)]) :*: S1 ('MetaSel ('Just "componentIncludes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(OpenUnitId, ModuleRenaming)])) :*: (S1 ('MetaSel ('Just "componentExeDeps") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [UnitId]) :*: S1 ('MetaSel ('Just "componentInternalDeps") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [UnitId])))))))

Methods

from :: ComponentLocalBuildInfo -> Rep ComponentLocalBuildInfo x

to :: Rep ComponentLocalBuildInfo x -> ComponentLocalBuildInfo

Generic DumpBuildInfo 
Instance details

Defined in Distribution.Types.DumpBuildInfo

Associated Types

type Rep DumpBuildInfo 
Instance details

Defined in Distribution.Types.DumpBuildInfo

type Rep DumpBuildInfo = D1 ('MetaData "DumpBuildInfo" "Distribution.Types.DumpBuildInfo" "Cabal-3.10.3.0-f240" 'False) (C1 ('MetaCons "NoDumpBuildInfo" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DumpBuildInfo" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: DumpBuildInfo -> Rep DumpBuildInfo x

to :: Rep DumpBuildInfo x -> DumpBuildInfo

Generic GivenComponent 
Instance details

Defined in Distribution.Types.GivenComponent

Associated Types

type Rep GivenComponent 
Instance details

Defined in Distribution.Types.GivenComponent

type Rep GivenComponent = D1 ('MetaData "GivenComponent" "Distribution.Types.GivenComponent" "Cabal-3.10.3.0-f240" 'False) (C1 ('MetaCons "GivenComponent" 'PrefixI 'True) (S1 ('MetaSel ('Just "givenComponentPackage") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PackageName) :*: (S1 ('MetaSel ('Just "givenComponentName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 LibraryName) :*: S1 ('MetaSel ('Just "givenComponentId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ComponentId))))

Methods

from :: GivenComponent -> Rep GivenComponent x

to :: Rep GivenComponent x -> GivenComponent

Generic LocalBuildInfo 
Instance details

Defined in Distribution.Types.LocalBuildInfo

Associated Types

type Rep LocalBuildInfo 
Instance details

Defined in Distribution.Types.LocalBuildInfo

type Rep LocalBuildInfo = D1 ('MetaData "LocalBuildInfo" "Distribution.Types.LocalBuildInfo" "Cabal-3.10.3.0-f240" 'False) (C1 ('MetaCons "LocalBuildInfo" 'PrefixI 'True) (((((S1 ('MetaSel ('Just "configFlags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ConfigFlags) :*: S1 ('MetaSel ('Just "flagAssignment") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FlagAssignment)) :*: (S1 ('MetaSel ('Just "componentEnabledSpec") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ComponentRequestedSpec) :*: S1 ('MetaSel ('Just "extraConfigArgs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String]))) :*: ((S1 ('MetaSel ('Just "installDirTemplates") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 InstallDirTemplates) :*: S1 ('MetaSel ('Just "compiler") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Compiler)) :*: (S1 ('MetaSel ('Just "hostPlatform") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Platform) :*: (S1 ('MetaSel ('Just "buildDir") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FilePath) :*: S1 ('MetaSel ('Just "cabalFilePath") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe FilePath)))))) :*: (((S1 ('MetaSel ('Just "componentGraph") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Graph ComponentLocalBuildInfo)) :*: S1 ('MetaSel ('Just "componentNameMap") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Map ComponentName [ComponentLocalBuildInfo]))) :*: (S1 ('MetaSel ('Just "installedPkgs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 InstalledPackageIndex) :*: S1 ('MetaSel ('Just "pkgDescrFile") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe FilePath)))) :*: ((S1 ('MetaSel ('Just "localPkgDescr") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PackageDescription) :*: S1 ('MetaSel ('Just "withPrograms") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ProgramDb)) :*: (S1 ('MetaSel ('Just "withPackageDB") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PackageDBStack) :*: (S1 ('MetaSel ('Just "withVanillaLib") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "withProfLib") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)))))) :*: ((((S1 ('MetaSel ('Just "withSharedLib") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "withStaticLib") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)) :*: (S1 ('MetaSel ('Just "withDynExe") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "withFullyStaticExe") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool))) :*: ((S1 ('MetaSel ('Just "withProfExe") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "withProfLibDetail") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ProfDetailLevel)) :*: (S1 ('MetaSel ('Just "withProfExeDetail") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ProfDetailLevel) :*: (S1 ('MetaSel ('Just "withOptimization") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 OptimisationLevel) :*: S1 ('MetaSel ('Just "withDebugInfo") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 DebugInfoLevel))))) :*: (((S1 ('MetaSel ('Just "withGHCiLib") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "splitSections") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)) :*: (S1 ('MetaSel ('Just "splitObjs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: (S1 ('MetaSel ('Just "stripExes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "stripLibs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)))) :*: ((S1 ('MetaSel ('Just "exeCoverage") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "libCoverage") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)) :*: (S1 ('MetaSel ('Just "progPrefix") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PathTemplate) :*: (S1 ('MetaSel ('Just "progSuffix") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PathTemplate) :*: S1 ('MetaSel ('Just "relocatable") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool))))))))

Methods

from :: LocalBuildInfo -> Rep LocalBuildInfo x

to :: Rep LocalBuildInfo x -> LocalBuildInfo

Generic Verbosity 
Instance details

Defined in Distribution.Verbosity

Associated Types

type Rep Verbosity 
Instance details

Defined in Distribution.Verbosity

type Rep Verbosity = D1 ('MetaData "Verbosity" "Distribution.Verbosity" "Cabal-3.10.3.0-f240" 'False) (C1 ('MetaCons "Verbosity" 'PrefixI 'True) (S1 ('MetaSel ('Just "vLevel") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 VerbosityLevel) :*: (S1 ('MetaSel ('Just "vFlags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Set VerbosityFlag)) :*: S1 ('MetaSel ('Just "vQuiet") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool))))

Methods

from :: Verbosity -> Rep Verbosity x

to :: Rep Verbosity x -> Verbosity

Generic VerbosityFlag 
Instance details

Defined in Distribution.Verbosity.Internal

Associated Types

type Rep VerbosityFlag 
Instance details

Defined in Distribution.Verbosity.Internal

type Rep VerbosityFlag = D1 ('MetaData "VerbosityFlag" "Distribution.Verbosity.Internal" "Cabal-3.10.3.0-f240" 'False) ((C1 ('MetaCons "VCallStack" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "VCallSite" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "VNoWrap" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "VMarkOutput" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "VTimestamp" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "VStderr" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "VNoWarn" 'PrefixI 'False) (U1 :: Type -> Type))))

Methods

from :: VerbosityFlag -> Rep VerbosityFlag x

to :: Rep VerbosityFlag x -> VerbosityFlag

Generic VerbosityLevel 
Instance details

Defined in Distribution.Verbosity.Internal

Associated Types

type Rep VerbosityLevel 
Instance details

Defined in Distribution.Verbosity.Internal

type Rep VerbosityLevel = D1 ('MetaData "VerbosityLevel" "Distribution.Verbosity.Internal" "Cabal-3.10.3.0-f240" 'False) ((C1 ('MetaCons "Silent" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Normal" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Verbose" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Deafening" 'PrefixI 'False) (U1 :: Type -> Type)))

Methods

from :: VerbosityLevel -> Rep VerbosityLevel x

to :: Rep VerbosityLevel x -> VerbosityLevel

Generic OpenModule 
Instance details

Defined in Distribution.Backpack

Associated Types

type Rep OpenModule 
Instance details

Defined in Distribution.Backpack

type Rep OpenModule = D1 ('MetaData "OpenModule" "Distribution.Backpack" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "OpenModule" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 OpenUnitId) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ModuleName)) :+: C1 ('MetaCons "OpenModuleVar" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ModuleName)))

Methods

from :: OpenModule -> Rep OpenModule x

to :: Rep OpenModule x -> OpenModule

Generic OpenUnitId 
Instance details

Defined in Distribution.Backpack

Associated Types

type Rep OpenUnitId 
Instance details

Defined in Distribution.Backpack

type Rep OpenUnitId = D1 ('MetaData "OpenUnitId" "Distribution.Backpack" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "IndefFullUnitId" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ComponentId) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 OpenModuleSubst)) :+: C1 ('MetaCons "DefiniteUnitId" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 DefUnitId)))

Methods

from :: OpenUnitId -> Rep OpenUnitId x

to :: Rep OpenUnitId x -> OpenUnitId

Generic CabalSpecVersion 
Instance details

Defined in Distribution.CabalSpecVersion

Associated Types

type Rep CabalSpecVersion 
Instance details

Defined in Distribution.CabalSpecVersion

type Rep CabalSpecVersion = D1 ('MetaData "CabalSpecVersion" "Distribution.CabalSpecVersion" "Cabal-syntax-3.10.3.0-4da5" 'False) ((((C1 ('MetaCons "CabalSpecV1_0" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CabalSpecV1_2" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "CabalSpecV1_4" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CabalSpecV1_6" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "CabalSpecV1_8" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CabalSpecV1_10" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "CabalSpecV1_12" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "CabalSpecV1_18" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CabalSpecV1_20" 'PrefixI 'False) (U1 :: Type -> Type))))) :+: (((C1 ('MetaCons "CabalSpecV1_22" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CabalSpecV1_24" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "CabalSpecV2_0" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CabalSpecV2_2" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "CabalSpecV2_4" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CabalSpecV3_0" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "CabalSpecV3_4" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "CabalSpecV3_6" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CabalSpecV3_8" 'PrefixI 'False) (U1 :: Type -> Type))))))

Methods

from :: CabalSpecVersion -> Rep CabalSpecVersion x

to :: Rep CabalSpecVersion x -> CabalSpecVersion

Generic AbiTag 
Instance details

Defined in Distribution.Compiler

Associated Types

type Rep AbiTag 
Instance details

Defined in Distribution.Compiler

type Rep AbiTag = D1 ('MetaData "AbiTag" "Distribution.Compiler" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "NoAbiTag" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "AbiTag" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String)))

Methods

from :: AbiTag -> Rep AbiTag x

to :: Rep AbiTag x -> AbiTag

Generic CompilerFlavor 
Instance details

Defined in Distribution.Compiler

Associated Types

type Rep CompilerFlavor 
Instance details

Defined in Distribution.Compiler

type Rep CompilerFlavor = D1 ('MetaData "CompilerFlavor" "Distribution.Compiler" "Cabal-syntax-3.10.3.0-4da5" 'False) (((C1 ('MetaCons "GHC" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "GHCJS" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "NHC" 'PrefixI 'False) (U1 :: Type -> Type))) :+: (C1 ('MetaCons "YHC" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Hugs" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "HBC" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "Helium" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "JHC" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LHC" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "UHC" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Eta" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "HaskellSuite" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String)) :+: C1 ('MetaCons "OtherCompiler" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String))))))

Methods

from :: CompilerFlavor -> Rep CompilerFlavor x

to :: Rep CompilerFlavor x -> CompilerFlavor

Generic CompilerId 
Instance details

Defined in Distribution.Compiler

Associated Types

type Rep CompilerId 
Instance details

Defined in Distribution.Compiler

type Rep CompilerId = D1 ('MetaData "CompilerId" "Distribution.Compiler" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "CompilerId" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 CompilerFlavor) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Version)))

Methods

from :: CompilerId -> Rep CompilerId x

to :: Rep CompilerId x -> CompilerId

Generic CompilerInfo 
Instance details

Defined in Distribution.Compiler

Associated Types

type Rep CompilerInfo 
Instance details

Defined in Distribution.Compiler

type Rep CompilerInfo = D1 ('MetaData "CompilerInfo" "Distribution.Compiler" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "CompilerInfo" 'PrefixI 'True) ((S1 ('MetaSel ('Just "compilerInfoId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 CompilerId) :*: S1 ('MetaSel ('Just "compilerInfoAbiTag") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 AbiTag)) :*: (S1 ('MetaSel ('Just "compilerInfoCompat") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe [CompilerId])) :*: (S1 ('MetaSel ('Just "compilerInfoLanguages") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe [Language])) :*: S1 ('MetaSel ('Just "compilerInfoExtensions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe [Extension]))))))

Methods

from :: CompilerInfo -> Rep CompilerInfo x

to :: Rep CompilerInfo x -> CompilerInfo

Generic License 
Instance details

Defined in Distribution.License

Associated Types

type Rep License 
Instance details

Defined in Distribution.License

type Rep License = D1 ('MetaData "License" "Distribution.License" "Cabal-syntax-3.10.3.0-4da5" 'False) (((C1 ('MetaCons "GPL" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Version))) :+: (C1 ('MetaCons "AGPL" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Version))) :+: C1 ('MetaCons "LGPL" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Version))))) :+: ((C1 ('MetaCons "BSD2" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "BSD3" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "BSD4" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "MIT" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: (((C1 ('MetaCons "ISC" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "MPL" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Version))) :+: (C1 ('MetaCons "Apache" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Version))) :+: C1 ('MetaCons "PublicDomain" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "AllRightsReserved" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "UnspecifiedLicense" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "OtherLicense" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "UnknownLicense" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String))))))

Methods

from :: License -> Rep License x

to :: Rep License x -> License

Generic ModuleName 
Instance details

Defined in Distribution.ModuleName

Associated Types

type Rep ModuleName 
Instance details

Defined in Distribution.ModuleName

type Rep ModuleName = D1 ('MetaData "ModuleName" "Distribution.ModuleName" "Cabal-syntax-3.10.3.0-4da5" 'True) (C1 ('MetaCons "ModuleName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ShortText)))

Methods

from :: ModuleName -> Rep ModuleName x

to :: Rep ModuleName x -> ModuleName

Generic PError 
Instance details

Defined in Distribution.Parsec.Error

Associated Types

type Rep PError 
Instance details

Defined in Distribution.Parsec.Error

type Rep PError = D1 ('MetaData "PError" "Distribution.Parsec.Error" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "PError" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Position) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String)))

Methods

from :: PError -> Rep PError x

to :: Rep PError x -> PError

Generic Position 
Instance details

Defined in Distribution.Parsec.Position

Associated Types

type Rep Position 
Instance details

Defined in Distribution.Parsec.Position

type Rep Position = D1 ('MetaData "Position" "Distribution.Parsec.Position" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "Position" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'SourceUnpack 'SourceStrict 'DecidedUnpack) (Rec0 Int) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'SourceUnpack 'SourceStrict 'DecidedUnpack) (Rec0 Int)))

Methods

from :: Position -> Rep Position x

to :: Rep Position x -> Position

Generic PWarnType 
Instance details

Defined in Distribution.Parsec.Warning

Associated Types

type Rep PWarnType 
Instance details

Defined in Distribution.Parsec.Warning

type Rep PWarnType = D1 ('MetaData "PWarnType" "Distribution.Parsec.Warning" "Cabal-syntax-3.10.3.0-4da5" 'False) ((((C1 ('MetaCons "PWTOther" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "PWTUTF" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PWTBoolCase" 'PrefixI 'False) (U1 :: Type -> Type))) :+: (C1 ('MetaCons "PWTVersionTag" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "PWTNewSyntax" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PWTOldSyntax" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "PWTDeprecatedField" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "PWTInvalidSubsection" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PWTUnknownField" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "PWTUnknownSection" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PWTTrailingFields" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "PWTExtraMainIs" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PWTExtraTestModule" 'PrefixI 'False) (U1 :: Type -> Type))))) :+: (((C1 ('MetaCons "PWTExtraBenchmarkModule" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "PWTLexNBSP" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PWTLexBOM" 'PrefixI 'False) (U1 :: Type -> Type))) :+: (C1 ('MetaCons "PWTLexTab" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "PWTQuirkyCabalFile" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PWTDoubleDash" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "PWTMultipleSingularField" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "PWTBuildTypeDefault" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PWTVersionOperator" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "PWTVersionWildcard" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PWTSpecVersion" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "PWTEmptyFilePath" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PWTExperimental" 'PrefixI 'False) (U1 :: Type -> Type))))))

Methods

from :: PWarnType -> Rep PWarnType x

to :: Rep PWarnType x -> PWarnType

Generic PWarning 
Instance details

Defined in Distribution.Parsec.Warning

Associated Types

type Rep PWarning 
Instance details

Defined in Distribution.Parsec.Warning

type Rep PWarning = D1 ('MetaData "PWarning" "Distribution.Parsec.Warning" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "PWarning" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 PWarnType) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Position) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String))))

Methods

from :: PWarning -> Rep PWarning x

to :: Rep PWarning x -> PWarning

Generic License 
Instance details

Defined in Distribution.SPDX.License

Associated Types

type Rep License 
Instance details

Defined in Distribution.SPDX.License

type Rep License = D1 ('MetaData "License" "Distribution.SPDX.License" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "NONE" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "License" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 LicenseExpression)))

Methods

from :: License -> Rep License x

to :: Rep License x -> License

Generic LicenseExceptionId 
Instance details

Defined in Distribution.SPDX.LicenseExceptionId

Associated Types

type Rep LicenseExceptionId 
Instance details

Defined in Distribution.SPDX.LicenseExceptionId

type Rep LicenseExceptionId = D1 ('MetaData "LicenseExceptionId" "Distribution.SPDX.LicenseExceptionId" "Cabal-syntax-3.10.3.0-4da5" 'False) (((((C1 ('MetaCons "DS389_exception" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Autoconf_exception_2_0" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Autoconf_exception_3_0" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Bison_exception_2_2" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Bootloader_exception" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "Classpath_exception_2_0" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CLISP_exception_2_0" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "DigiRule_FOSS_exception" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "ECos_exception_2_0" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Fawkes_Runtime_exception" 'PrefixI 'False) (U1 :: Type -> Type))))) :+: (((C1 ('MetaCons "FLTK_exception" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Font_exception_2_0" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Freertos_exception_2_0" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "GCC_exception_2_0" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "GCC_exception_3_1" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "Gnu_javamail_exception" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "GPL_3_0_linking_exception" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "GPL_3_0_linking_source_exception" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "GPL_CC_1_0" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "I2p_gpl_java_exception" 'PrefixI 'False) (U1 :: Type -> Type)))))) :+: ((((C1 ('MetaCons "LGPL_3_0_linking_exception" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Libtool_exception" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Linux_syscall_note" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "LLVM_exception" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LZMA_exception" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "Mif_exception" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Nokia_Qt_exception_1_1" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "OCaml_LGPL_linking_exception" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "OCCT_exception_1_0" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "OpenJDK_assembly_exception_1_0" 'PrefixI 'False) (U1 :: Type -> Type))))) :+: (((C1 ('MetaCons "Openvpn_openssl_exception" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PS_or_PDF_font_exception_20170817" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Qt_GPL_exception_1_0" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Qt_LGPL_exception_1_1" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Qwt_exception_1_0" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "SHL_2_0" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "SHL_2_1" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Swift_exception" 'PrefixI 'False) (U1 :: Type -> Type))) :+: (C1 ('MetaCons "U_boot_exception_2_0" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Universal_FOSS_exception_1_0" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "WxWindows_exception_3_1" 'PrefixI 'False) (U1 :: Type -> Type)))))))

Methods

from :: LicenseExceptionId -> Rep LicenseExceptionId x

to :: Rep LicenseExceptionId x -> LicenseExceptionId

Generic LicenseExpression 
Instance details

Defined in Distribution.SPDX.LicenseExpression

Associated Types

type Rep LicenseExpression 
Instance details

Defined in Distribution.SPDX.LicenseExpression

type Rep LicenseExpression = D1 ('MetaData "LicenseExpression" "Distribution.SPDX.LicenseExpression" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "ELicense" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SimpleLicenseExpression) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe LicenseExceptionId))) :+: (C1 ('MetaCons "EAnd" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 LicenseExpression) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 LicenseExpression)) :+: C1 ('MetaCons "EOr" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 LicenseExpression) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 LicenseExpression))))

Methods

from :: LicenseExpression -> Rep LicenseExpression x

to :: Rep LicenseExpression x -> LicenseExpression

Generic SimpleLicenseExpression 
Instance details

Defined in Distribution.SPDX.LicenseExpression

Associated Types

type Rep SimpleLicenseExpression 
Instance details

Defined in Distribution.SPDX.LicenseExpression

type Rep SimpleLicenseExpression = D1 ('MetaData "SimpleLicenseExpression" "Distribution.SPDX.LicenseExpression" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "ELicenseId" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 LicenseId)) :+: (C1 ('MetaCons "ELicenseIdPlus" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 LicenseId)) :+: C1 ('MetaCons "ELicenseRef" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 LicenseRef))))

Methods

from :: SimpleLicenseExpression -> Rep SimpleLicenseExpression x

to :: Rep SimpleLicenseExpression x -> SimpleLicenseExpression

Generic LicenseRef 
Instance details

Defined in Distribution.SPDX.LicenseReference

Associated Types

type Rep LicenseRef 
Instance details

Defined in Distribution.SPDX.LicenseReference

type Rep LicenseRef = D1 ('MetaData "LicenseRef" "Distribution.SPDX.LicenseReference" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "LicenseRef" 'PrefixI 'True) (S1 ('MetaSel ('Just "_lrDocument") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe String)) :*: S1 ('MetaSel ('Just "_lrLicense") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 String)))

Methods

from :: LicenseRef -> Rep LicenseRef x

to :: Rep LicenseRef x -> LicenseRef

Generic Arch 
Instance details

Defined in Distribution.System

Associated Types

type Rep Arch 
Instance details

Defined in Distribution.System

type Rep Arch = D1 ('MetaData "Arch" "Distribution.System" "Cabal-syntax-3.10.3.0-4da5" 'False) ((((C1 ('MetaCons "I386" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "X86_64" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "PPC" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "PPC64" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Sparc" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "Arm" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "AArch64" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Mips" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "SH" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "IA64" 'PrefixI 'False) (U1 :: Type -> Type))))) :+: (((C1 ('MetaCons "S390" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "S390X" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Alpha" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Hppa" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Rs6000" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "M68k" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Vax" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "JavaScript" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Wasm32" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "OtherArch" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String)))))))

Methods

from :: Arch -> Rep Arch x

to :: Rep Arch x -> Arch

Generic OS 
Instance details

Defined in Distribution.System

Associated Types

type Rep OS 
Instance details

Defined in Distribution.System

type Rep OS = D1 ('MetaData "OS" "Distribution.System" "Cabal-syntax-3.10.3.0-4da5" 'False) ((((C1 ('MetaCons "Linux" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Windows" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "OSX" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "FreeBSD" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "OpenBSD" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "NetBSD" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "DragonFly" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Solaris" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "AIX" 'PrefixI 'False) (U1 :: Type -> Type))))) :+: (((C1 ('MetaCons "HPUX" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "IRIX" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "HaLVM" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Hurd" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "IOS" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Android" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Ghcjs" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Wasi" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "OtherOS" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String)))))))

Methods

from :: OS -> Rep OS x

to :: Rep OS x -> OS

Generic Platform 
Instance details

Defined in Distribution.System

Associated Types

type Rep Platform 
Instance details

Defined in Distribution.System

type Rep Platform = D1 ('MetaData "Platform" "Distribution.System" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "Platform" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Arch) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 OS)))

Methods

from :: Platform -> Rep Platform x

to :: Rep Platform x -> Platform

Generic AbiDependency 
Instance details

Defined in Distribution.Types.AbiDependency

Associated Types

type Rep AbiDependency 
Instance details

Defined in Distribution.Types.AbiDependency

type Rep AbiDependency = D1 ('MetaData "AbiDependency" "Distribution.Types.AbiDependency" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "AbiDependency" 'PrefixI 'True) (S1 ('MetaSel ('Just "depUnitId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UnitId) :*: S1 ('MetaSel ('Just "depAbiHash") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 AbiHash)))

Methods

from :: AbiDependency -> Rep AbiDependency x

to :: Rep AbiDependency x -> AbiDependency

Generic AbiHash 
Instance details

Defined in Distribution.Types.AbiHash

Associated Types

type Rep AbiHash 
Instance details

Defined in Distribution.Types.AbiHash

type Rep AbiHash = D1 ('MetaData "AbiHash" "Distribution.Types.AbiHash" "Cabal-syntax-3.10.3.0-4da5" 'True) (C1 ('MetaCons "AbiHash" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ShortText)))

Methods

from :: AbiHash -> Rep AbiHash x

to :: Rep AbiHash x -> AbiHash

Generic Benchmark 
Instance details

Defined in Distribution.Types.Benchmark

Associated Types

type Rep Benchmark 
Instance details

Defined in Distribution.Types.Benchmark

type Rep Benchmark = D1 ('MetaData "Benchmark" "Distribution.Types.Benchmark" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "Benchmark" 'PrefixI 'True) (S1 ('MetaSel ('Just "benchmarkName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UnqualComponentName) :*: (S1 ('MetaSel ('Just "benchmarkInterface") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 BenchmarkInterface) :*: S1 ('MetaSel ('Just "benchmarkBuildInfo") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 BuildInfo))))

Methods

from :: Benchmark -> Rep Benchmark x

to :: Rep Benchmark x -> Benchmark

Generic BenchmarkInterface 
Instance details

Defined in Distribution.Types.BenchmarkInterface

Associated Types

type Rep BenchmarkInterface 
Instance details

Defined in Distribution.Types.BenchmarkInterface

type Rep BenchmarkInterface = D1 ('MetaData "BenchmarkInterface" "Distribution.Types.BenchmarkInterface" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "BenchmarkExeV10" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Version) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FilePath)) :+: C1 ('MetaCons "BenchmarkUnsupported" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 BenchmarkType)))

Methods

from :: BenchmarkInterface -> Rep BenchmarkInterface x

to :: Rep BenchmarkInterface x -> BenchmarkInterface

Generic BenchmarkType 
Instance details

Defined in Distribution.Types.BenchmarkType

Associated Types

type Rep BenchmarkType 
Instance details

Defined in Distribution.Types.BenchmarkType

type Rep BenchmarkType = D1 ('MetaData "BenchmarkType" "Distribution.Types.BenchmarkType" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "BenchmarkTypeExe" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Version)) :+: C1 ('MetaCons "BenchmarkTypeUnknown" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Version)))

Methods

from :: BenchmarkType -> Rep BenchmarkType x

to :: Rep BenchmarkType x -> BenchmarkType

Generic BuildInfo 
Instance details

Defined in Distribution.Types.BuildInfo

Associated Types

type Rep BuildInfo 
Instance details

Defined in Distribution.Types.BuildInfo

type Rep BuildInfo = D1 ('MetaData "BuildInfo" "Distribution.Types.BuildInfo" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "BuildInfo" 'PrefixI 'True) (((((S1 ('MetaSel ('Just "buildable") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "buildTools") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [LegacyExeDependency])) :*: (S1 ('MetaSel ('Just "buildToolDepends") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [ExeDependency]) :*: (S1 ('MetaSel ('Just "cppOptions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String]) :*: S1 ('MetaSel ('Just "asmOptions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String])))) :*: ((S1 ('MetaSel ('Just "cmmOptions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String]) :*: (S1 ('MetaSel ('Just "ccOptions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String]) :*: S1 ('MetaSel ('Just "cxxOptions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String]))) :*: (S1 ('MetaSel ('Just "ldOptions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String]) :*: (S1 ('MetaSel ('Just "hsc2hsOptions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String]) :*: S1 ('MetaSel ('Just "pkgconfigDepends") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [PkgconfigDependency]))))) :*: (((S1 ('MetaSel ('Just "frameworks") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String]) :*: (S1 ('MetaSel ('Just "extraFrameworkDirs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String]) :*: S1 ('MetaSel ('Just "asmSources") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FilePath]))) :*: (S1 ('MetaSel ('Just "cmmSources") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FilePath]) :*: (S1 ('MetaSel ('Just "cSources") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FilePath]) :*: S1 ('MetaSel ('Just "cxxSources") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FilePath])))) :*: ((S1 ('MetaSel ('Just "jsSources") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FilePath]) :*: (S1 ('MetaSel ('Just "hsSourceDirs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [SymbolicPath PackageDir SourceDir]) :*: S1 ('MetaSel ('Just "otherModules") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [ModuleName]))) :*: (S1 ('MetaSel ('Just "virtualModules") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [ModuleName]) :*: (S1 ('MetaSel ('Just "autogenModules") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [ModuleName]) :*: S1 ('MetaSel ('Just "defaultLanguage") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Language))))))) :*: ((((S1 ('MetaSel ('Just "otherLanguages") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Language]) :*: S1 ('MetaSel ('Just "defaultExtensions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Extension])) :*: (S1 ('MetaSel ('Just "otherExtensions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Extension]) :*: (S1 ('MetaSel ('Just "oldExtensions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Extension]) :*: S1 ('MetaSel ('Just "extraLibs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String])))) :*: ((S1 ('MetaSel ('Just "extraLibsStatic") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String]) :*: (S1 ('MetaSel ('Just "extraGHCiLibs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String]) :*: S1 ('MetaSel ('Just "extraBundledLibs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String]))) :*: (S1 ('MetaSel ('Just "extraLibFlavours") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String]) :*: (S1 ('MetaSel ('Just "extraDynLibFlavours") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String]) :*: S1 ('MetaSel ('Just "extraLibDirs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String]))))) :*: (((S1 ('MetaSel ('Just "extraLibDirsStatic") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String]) :*: (S1 ('MetaSel ('Just "includeDirs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FilePath]) :*: S1 ('MetaSel ('Just "includes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FilePath]))) :*: (S1 ('MetaSel ('Just "autogenIncludes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FilePath]) :*: (S1 ('MetaSel ('Just "installIncludes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FilePath]) :*: S1 ('MetaSel ('Just "options") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (PerCompilerFlavor [String]))))) :*: ((S1 ('MetaSel ('Just "profOptions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (PerCompilerFlavor [String])) :*: (S1 ('MetaSel ('Just "sharedOptions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (PerCompilerFlavor [String])) :*: S1 ('MetaSel ('Just "staticOptions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (PerCompilerFlavor [String])))) :*: (S1 ('MetaSel ('Just "customFieldsBI") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(String, String)]) :*: (S1 ('MetaSel ('Just "targetBuildDepends") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Dependency]) :*: S1 ('MetaSel ('Just "mixins") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Mixin]))))))))

Methods

from :: BuildInfo -> Rep BuildInfo x

to :: Rep BuildInfo x -> BuildInfo

Generic BuildType 
Instance details

Defined in Distribution.Types.BuildType

Associated Types

type Rep BuildType 
Instance details

Defined in Distribution.Types.BuildType

type Rep BuildType = D1 ('MetaData "BuildType" "Distribution.Types.BuildType" "Cabal-syntax-3.10.3.0-4da5" 'False) ((C1 ('MetaCons "Simple" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Configure" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Make" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Custom" 'PrefixI 'False) (U1 :: Type -> Type)))

Methods

from :: BuildType -> Rep BuildType x

to :: Rep BuildType x -> BuildType

Generic ComponentId 
Instance details

Defined in Distribution.Types.ComponentId

Associated Types

type Rep ComponentId 
Instance details

Defined in Distribution.Types.ComponentId

type Rep ComponentId = D1 ('MetaData "ComponentId" "Distribution.Types.ComponentId" "Cabal-syntax-3.10.3.0-4da5" 'True) (C1 ('MetaCons "ComponentId" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ShortText)))

Methods

from :: ComponentId -> Rep ComponentId x

to :: Rep ComponentId x -> ComponentId

Generic ComponentName 
Instance details

Defined in Distribution.Types.ComponentName

Associated Types

type Rep ComponentName 
Instance details

Defined in Distribution.Types.ComponentName

type Rep ComponentName = D1 ('MetaData "ComponentName" "Distribution.Types.ComponentName" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "CLibName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 LibraryName)) :+: C1 ('MetaCons "CNotLibName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 NotLibComponentName)))

Methods

from :: ComponentName -> Rep ComponentName x

to :: Rep ComponentName x -> ComponentName

Generic NotLibComponentName 
Instance details

Defined in Distribution.Types.ComponentName

Associated Types

type Rep NotLibComponentName 
Instance details

Defined in Distribution.Types.ComponentName

type Rep NotLibComponentName = D1 ('MetaData "NotLibComponentName" "Distribution.Types.ComponentName" "Cabal-syntax-3.10.3.0-4da5" 'False) ((C1 ('MetaCons "CNLFLibName" 'PrefixI 'True) (S1 ('MetaSel ('Just "toCompName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UnqualComponentName)) :+: C1 ('MetaCons "CNLExeName" 'PrefixI 'True) (S1 ('MetaSel ('Just "toCompName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UnqualComponentName))) :+: (C1 ('MetaCons "CNLTestName" 'PrefixI 'True) (S1 ('MetaSel ('Just "toCompName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UnqualComponentName)) :+: C1 ('MetaCons "CNLBenchName" 'PrefixI 'True) (S1 ('MetaSel ('Just "toCompName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UnqualComponentName))))

Methods

from :: NotLibComponentName -> Rep NotLibComponentName x

to :: Rep NotLibComponentName x -> NotLibComponentName

Generic ComponentRequestedSpec 
Instance details

Defined in Distribution.Types.ComponentRequestedSpec

Associated Types

type Rep ComponentRequestedSpec 
Instance details

Defined in Distribution.Types.ComponentRequestedSpec

type Rep ComponentRequestedSpec = D1 ('MetaData "ComponentRequestedSpec" "Distribution.Types.ComponentRequestedSpec" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "ComponentRequestedSpec" 'PrefixI 'True) (S1 ('MetaSel ('Just "testsRequested") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "benchmarksRequested") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)) :+: C1 ('MetaCons "OneComponentRequestedSpec" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ComponentName)))

Methods

from :: ComponentRequestedSpec -> Rep ComponentRequestedSpec x

to :: Rep ComponentRequestedSpec x -> ComponentRequestedSpec

Generic ConfVar 
Instance details

Defined in Distribution.Types.ConfVar

Associated Types

type Rep ConfVar 
Instance details

Defined in Distribution.Types.ConfVar

type Rep ConfVar = D1 ('MetaData "ConfVar" "Distribution.Types.ConfVar" "Cabal-syntax-3.10.3.0-4da5" 'False) ((C1 ('MetaCons "OS" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 OS)) :+: C1 ('MetaCons "Arch" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Arch))) :+: (C1 ('MetaCons "PackageFlag" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FlagName)) :+: C1 ('MetaCons "Impl" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 CompilerFlavor) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 VersionRange))))

Methods

from :: ConfVar -> Rep ConfVar x

to :: Rep ConfVar x -> ConfVar

Generic Dependency 
Instance details

Defined in Distribution.Types.Dependency

Associated Types

type Rep Dependency 
Instance details

Defined in Distribution.Types.Dependency

type Rep Dependency = D1 ('MetaData "Dependency" "Distribution.Types.Dependency" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "Dependency" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PackageName) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 VersionRange) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmptySet LibraryName)))))

Methods

from :: Dependency -> Rep Dependency x

to :: Rep Dependency x -> Dependency

Generic ExeDependency 
Instance details

Defined in Distribution.Types.ExeDependency

Associated Types

type Rep ExeDependency 
Instance details

Defined in Distribution.Types.ExeDependency

type Rep ExeDependency = D1 ('MetaData "ExeDependency" "Distribution.Types.ExeDependency" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "ExeDependency" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PackageName) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UnqualComponentName) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 VersionRange))))

Methods

from :: ExeDependency -> Rep ExeDependency x

to :: Rep ExeDependency x -> ExeDependency

Generic Executable 
Instance details

Defined in Distribution.Types.Executable

Associated Types

type Rep Executable 
Instance details

Defined in Distribution.Types.Executable

type Rep Executable = D1 ('MetaData "Executable" "Distribution.Types.Executable" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "Executable" 'PrefixI 'True) ((S1 ('MetaSel ('Just "exeName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UnqualComponentName) :*: S1 ('MetaSel ('Just "modulePath") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FilePath)) :*: (S1 ('MetaSel ('Just "exeScope") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ExecutableScope) :*: S1 ('MetaSel ('Just "buildInfo") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 BuildInfo))))

Methods

from :: Executable -> Rep Executable x

to :: Rep Executable x -> Executable

Generic ExecutableScope 
Instance details

Defined in Distribution.Types.ExecutableScope

Associated Types

type Rep ExecutableScope 
Instance details

Defined in Distribution.Types.ExecutableScope

type Rep ExecutableScope = D1 ('MetaData "ExecutableScope" "Distribution.Types.ExecutableScope" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "ExecutablePublic" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ExecutablePrivate" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: ExecutableScope -> Rep ExecutableScope x

to :: Rep ExecutableScope x -> ExecutableScope

Generic ExposedModule 
Instance details

Defined in Distribution.Types.ExposedModule

Associated Types

type Rep ExposedModule 
Instance details

Defined in Distribution.Types.ExposedModule

type Rep ExposedModule = D1 ('MetaData "ExposedModule" "Distribution.Types.ExposedModule" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "ExposedModule" 'PrefixI 'True) (S1 ('MetaSel ('Just "exposedName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ModuleName) :*: S1 ('MetaSel ('Just "exposedReexport") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe OpenModule))))

Methods

from :: ExposedModule -> Rep ExposedModule x

to :: Rep ExposedModule x -> ExposedModule

Generic FlagAssignment 
Instance details

Defined in Distribution.Types.Flag

Associated Types

type Rep FlagAssignment 
Instance details

Defined in Distribution.Types.Flag

type Rep FlagAssignment = D1 ('MetaData "FlagAssignment" "Distribution.Types.Flag" "Cabal-syntax-3.10.3.0-4da5" 'True) (C1 ('MetaCons "FlagAssignment" 'PrefixI 'True) (S1 ('MetaSel ('Just "getFlagAssignment") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Map FlagName (Int, Bool)))))

Methods

from :: FlagAssignment -> Rep FlagAssignment x

to :: Rep FlagAssignment x -> FlagAssignment

Generic FlagName 
Instance details

Defined in Distribution.Types.Flag

Associated Types

type Rep FlagName 
Instance details

Defined in Distribution.Types.Flag

type Rep FlagName = D1 ('MetaData "FlagName" "Distribution.Types.Flag" "Cabal-syntax-3.10.3.0-4da5" 'True) (C1 ('MetaCons "FlagName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ShortText)))

Methods

from :: FlagName -> Rep FlagName x

to :: Rep FlagName x -> FlagName

Generic PackageFlag 
Instance details

Defined in Distribution.Types.Flag

Associated Types

type Rep PackageFlag 
Instance details

Defined in Distribution.Types.Flag

type Rep PackageFlag = D1 ('MetaData "PackageFlag" "Distribution.Types.Flag" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "MkPackageFlag" 'PrefixI 'True) ((S1 ('MetaSel ('Just "flagName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FlagName) :*: S1 ('MetaSel ('Just "flagDescription") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String)) :*: (S1 ('MetaSel ('Just "flagDefault") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "flagManual") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool))))

Methods

from :: PackageFlag -> Rep PackageFlag x

to :: Rep PackageFlag x -> PackageFlag

Generic ForeignLib 
Instance details

Defined in Distribution.Types.ForeignLib

Associated Types

type Rep ForeignLib 
Instance details

Defined in Distribution.Types.ForeignLib

type Rep ForeignLib = D1 ('MetaData "ForeignLib" "Distribution.Types.ForeignLib" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "ForeignLib" 'PrefixI 'True) ((S1 ('MetaSel ('Just "foreignLibName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UnqualComponentName) :*: (S1 ('MetaSel ('Just "foreignLibType") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ForeignLibType) :*: S1 ('MetaSel ('Just "foreignLibOptions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [ForeignLibOption]))) :*: ((S1 ('MetaSel ('Just "foreignLibBuildInfo") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 BuildInfo) :*: S1 ('MetaSel ('Just "foreignLibVersionInfo") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe LibVersionInfo))) :*: (S1 ('MetaSel ('Just "foreignLibVersionLinux") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Version)) :*: S1 ('MetaSel ('Just "foreignLibModDefFile") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FilePath])))))

Methods

from :: ForeignLib -> Rep ForeignLib x

to :: Rep ForeignLib x -> ForeignLib

Generic LibVersionInfo 
Instance details

Defined in Distribution.Types.ForeignLib

Associated Types

type Rep LibVersionInfo 
Instance details

Defined in Distribution.Types.ForeignLib

type Rep LibVersionInfo = D1 ('MetaData "LibVersionInfo" "Distribution.Types.ForeignLib" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "LibVersionInfo" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int))))

Methods

from :: LibVersionInfo -> Rep LibVersionInfo x

to :: Rep LibVersionInfo x -> LibVersionInfo

Generic ForeignLibOption 
Instance details

Defined in Distribution.Types.ForeignLibOption

Associated Types

type Rep ForeignLibOption 
Instance details

Defined in Distribution.Types.ForeignLibOption

type Rep ForeignLibOption = D1 ('MetaData "ForeignLibOption" "Distribution.Types.ForeignLibOption" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "ForeignLibStandalone" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: ForeignLibOption -> Rep ForeignLibOption x

to :: Rep ForeignLibOption x -> ForeignLibOption

Generic ForeignLibType 
Instance details

Defined in Distribution.Types.ForeignLibType

Associated Types

type Rep ForeignLibType 
Instance details

Defined in Distribution.Types.ForeignLibType

type Rep ForeignLibType = D1 ('MetaData "ForeignLibType" "Distribution.Types.ForeignLibType" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "ForeignLibNativeShared" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "ForeignLibNativeStatic" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ForeignLibTypeUnknown" 'PrefixI 'False) (U1 :: Type -> Type)))

Methods

from :: ForeignLibType -> Rep ForeignLibType x

to :: Rep ForeignLibType x -> ForeignLibType

Generic GenericPackageDescription 
Instance details

Defined in Distribution.Types.GenericPackageDescription

Associated Types

type Rep GenericPackageDescription 
Instance details

Defined in Distribution.Types.GenericPackageDescription

type Rep GenericPackageDescription = D1 ('MetaData "GenericPackageDescription" "Distribution.Types.GenericPackageDescription" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "GenericPackageDescription" 'PrefixI 'True) (((S1 ('MetaSel ('Just "packageDescription") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PackageDescription) :*: S1 ('MetaSel ('Just "gpdScannedVersion") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Version))) :*: (S1 ('MetaSel ('Just "genPackageFlags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [PackageFlag]) :*: S1 ('MetaSel ('Just "condLibrary") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (CondTree ConfVar [Dependency] Library))))) :*: ((S1 ('MetaSel ('Just "condSubLibraries") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(UnqualComponentName, CondTree ConfVar [Dependency] Library)]) :*: S1 ('MetaSel ('Just "condForeignLibs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(UnqualComponentName, CondTree ConfVar [Dependency] ForeignLib)])) :*: (S1 ('MetaSel ('Just "condExecutables") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(UnqualComponentName, CondTree ConfVar [Dependency] Executable)]) :*: (S1 ('MetaSel ('Just "condTestSuites") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(UnqualComponentName, CondTree ConfVar [Dependency] TestSuite)]) :*: S1 ('MetaSel ('Just "condBenchmarks") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(UnqualComponentName, CondTree ConfVar [Dependency] Benchmark)]))))))

Methods

from :: GenericPackageDescription -> Rep GenericPackageDescription x

to :: Rep GenericPackageDescription x -> GenericPackageDescription

Generic IncludeRenaming 
Instance details

Defined in Distribution.Types.IncludeRenaming

Associated Types

type Rep IncludeRenaming 
Instance details

Defined in Distribution.Types.IncludeRenaming

type Rep IncludeRenaming = D1 ('MetaData "IncludeRenaming" "Distribution.Types.IncludeRenaming" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "IncludeRenaming" 'PrefixI 'True) (S1 ('MetaSel ('Just "includeProvidesRn") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ModuleRenaming) :*: S1 ('MetaSel ('Just "includeRequiresRn") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ModuleRenaming)))

Methods

from :: IncludeRenaming -> Rep IncludeRenaming x

to :: Rep IncludeRenaming x -> IncludeRenaming

Generic InstalledPackageInfo 
Instance details

Defined in Distribution.Types.InstalledPackageInfo

Associated Types

type Rep InstalledPackageInfo 
Instance details

Defined in Distribution.Types.InstalledPackageInfo

type Rep InstalledPackageInfo = D1 ('MetaData "InstalledPackageInfo" "Distribution.Types.InstalledPackageInfo" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "InstalledPackageInfo" 'PrefixI 'True) (((((S1 ('MetaSel ('Just "sourcePackageId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PackageId) :*: S1 ('MetaSel ('Just "sourceLibName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 LibraryName)) :*: (S1 ('MetaSel ('Just "installedComponentId_") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ComponentId) :*: (S1 ('MetaSel ('Just "libVisibility") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 LibraryVisibility) :*: S1 ('MetaSel ('Just "installedUnitId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UnitId)))) :*: ((S1 ('MetaSel ('Just "instantiatedWith") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(ModuleName, OpenModule)]) :*: (S1 ('MetaSel ('Just "compatPackageKey") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String) :*: S1 ('MetaSel ('Just "license") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Either License License)))) :*: (S1 ('MetaSel ('Just "copyright") 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 ShortText) :*: (S1 ('MetaSel ('Just "maintainer") 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 ShortText) :*: S1 ('MetaSel ('Just "author") 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 ShortText))))) :*: (((S1 ('MetaSel ('Just "stability") 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 ShortText) :*: S1 ('MetaSel ('Just "homepage") 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 ShortText)) :*: (S1 ('MetaSel ('Just "pkgUrl") 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 ShortText) :*: (S1 ('MetaSel ('Just "synopsis") 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 ShortText) :*: S1 ('MetaSel ('Just "description") 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 ShortText)))) :*: ((S1 ('MetaSel ('Just "category") 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 ShortText) :*: (S1 ('MetaSel ('Just "abiHash") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 AbiHash) :*: S1 ('MetaSel ('Just "indefinite") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool))) :*: (S1 ('MetaSel ('Just "exposed") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: (S1 ('MetaSel ('Just "exposedModules") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [ExposedModule]) :*: S1 ('MetaSel ('Just "hiddenModules") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [ModuleName])))))) :*: ((((S1 ('MetaSel ('Just "trusted") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "importDirs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FilePath])) :*: (S1 ('MetaSel ('Just "libraryDirs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FilePath]) :*: (S1 ('MetaSel ('Just "libraryDirsStatic") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FilePath]) :*: S1 ('MetaSel ('Just "libraryDynDirs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FilePath])))) :*: ((S1 ('MetaSel ('Just "dataDir") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FilePath) :*: (S1 ('MetaSel ('Just "hsLibraries") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String]) :*: S1 ('MetaSel ('Just "extraLibraries") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String]))) :*: (S1 ('MetaSel ('Just "extraLibrariesStatic") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String]) :*: (S1 ('MetaSel ('Just "extraGHCiLibraries") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String]) :*: S1 ('MetaSel ('Just "includeDirs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FilePath]))))) :*: (((S1 ('MetaSel ('Just "includes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String]) :*: S1 ('MetaSel ('Just "depends") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [UnitId])) :*: (S1 ('MetaSel ('Just "abiDepends") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [AbiDependency]) :*: (S1 ('MetaSel ('Just "ccOptions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String]) :*: S1 ('MetaSel ('Just "cxxOptions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String])))) :*: ((S1 ('MetaSel ('Just "ldOptions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String]) :*: (S1 ('MetaSel ('Just "frameworkDirs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FilePath]) :*: S1 ('MetaSel ('Just "frameworks") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String]))) :*: (S1 ('MetaSel ('Just "haddockInterfaces") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FilePath]) :*: (S1 ('MetaSel ('Just "haddockHTMLs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FilePath]) :*: S1 ('MetaSel ('Just "pkgRoot") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe FilePath)))))))))

Methods

from :: InstalledPackageInfo -> Rep InstalledPackageInfo x

to :: Rep InstalledPackageInfo x -> InstalledPackageInfo

Generic LegacyExeDependency 
Instance details

Defined in Distribution.Types.LegacyExeDependency

Associated Types

type Rep LegacyExeDependency 
Instance details

Defined in Distribution.Types.LegacyExeDependency

type Rep LegacyExeDependency = D1 ('MetaData "LegacyExeDependency" "Distribution.Types.LegacyExeDependency" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "LegacyExeDependency" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 VersionRange)))

Methods

from :: LegacyExeDependency -> Rep LegacyExeDependency x

to :: Rep LegacyExeDependency x -> LegacyExeDependency

Generic Library 
Instance details

Defined in Distribution.Types.Library

Associated Types

type Rep Library 
Instance details

Defined in Distribution.Types.Library

type Rep Library = D1 ('MetaData "Library" "Distribution.Types.Library" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "Library" 'PrefixI 'True) ((S1 ('MetaSel ('Just "libName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 LibraryName) :*: (S1 ('MetaSel ('Just "exposedModules") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [ModuleName]) :*: S1 ('MetaSel ('Just "reexportedModules") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [ModuleReexport]))) :*: ((S1 ('MetaSel ('Just "signatures") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [ModuleName]) :*: S1 ('MetaSel ('Just "libExposed") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)) :*: (S1 ('MetaSel ('Just "libVisibility") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 LibraryVisibility) :*: S1 ('MetaSel ('Just "libBuildInfo") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 BuildInfo)))))

Methods

from :: Library -> Rep Library x

to :: Rep Library x -> Library

Generic LibraryName 
Instance details

Defined in Distribution.Types.LibraryName

Associated Types

type Rep LibraryName 
Instance details

Defined in Distribution.Types.LibraryName

type Rep LibraryName = D1 ('MetaData "LibraryName" "Distribution.Types.LibraryName" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "LMainLibName" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LSubLibName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UnqualComponentName)))

Methods

from :: LibraryName -> Rep LibraryName x

to :: Rep LibraryName x -> LibraryName

Generic LibraryVisibility 
Instance details

Defined in Distribution.Types.LibraryVisibility

Associated Types

type Rep LibraryVisibility 
Instance details

Defined in Distribution.Types.LibraryVisibility

type Rep LibraryVisibility = D1 ('MetaData "LibraryVisibility" "Distribution.Types.LibraryVisibility" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "LibraryVisibilityPublic" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LibraryVisibilityPrivate" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: LibraryVisibility -> Rep LibraryVisibility x

to :: Rep LibraryVisibility x -> LibraryVisibility

Generic Mixin 
Instance details

Defined in Distribution.Types.Mixin

Associated Types

type Rep Mixin 
Instance details

Defined in Distribution.Types.Mixin

type Rep Mixin = D1 ('MetaData "Mixin" "Distribution.Types.Mixin" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "Mixin" 'PrefixI 'True) (S1 ('MetaSel ('Just "mixinPackageName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PackageName) :*: (S1 ('MetaSel ('Just "mixinLibraryName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 LibraryName) :*: S1 ('MetaSel ('Just "mixinIncludeRenaming") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 IncludeRenaming))))

Methods

from :: Mixin -> Rep Mixin x

to :: Rep Mixin x -> Mixin

Generic Module 
Instance details

Defined in Distribution.Types.Module

Associated Types

type Rep Module 
Instance details

Defined in Distribution.Types.Module

type Rep Module = D1 ('MetaData "Module" "Distribution.Types.Module" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "Module" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 DefUnitId) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ModuleName)))

Methods

from :: Module -> Rep Module x

to :: Rep Module x -> Module

Generic ModuleReexport 
Instance details

Defined in Distribution.Types.ModuleReexport

Associated Types

type Rep ModuleReexport 
Instance details

Defined in Distribution.Types.ModuleReexport

type Rep ModuleReexport = D1 ('MetaData "ModuleReexport" "Distribution.Types.ModuleReexport" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "ModuleReexport" 'PrefixI 'True) (S1 ('MetaSel ('Just "moduleReexportOriginalPackage") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe PackageName)) :*: (S1 ('MetaSel ('Just "moduleReexportOriginalName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ModuleName) :*: S1 ('MetaSel ('Just "moduleReexportName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ModuleName))))

Methods

from :: ModuleReexport -> Rep ModuleReexport x

to :: Rep ModuleReexport x -> ModuleReexport

Generic ModuleRenaming 
Instance details

Defined in Distribution.Types.ModuleRenaming

Associated Types

type Rep ModuleRenaming 
Instance details

Defined in Distribution.Types.ModuleRenaming

type Rep ModuleRenaming = D1 ('MetaData "ModuleRenaming" "Distribution.Types.ModuleRenaming" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "ModuleRenaming" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(ModuleName, ModuleName)])) :+: (C1 ('MetaCons "DefaultRenaming" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "HidingRenaming" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [ModuleName]))))

Methods

from :: ModuleRenaming -> Rep ModuleRenaming x

to :: Rep ModuleRenaming x -> ModuleRenaming

Generic MungedPackageId 
Instance details

Defined in Distribution.Types.MungedPackageId

Associated Types

type Rep MungedPackageId 
Instance details

Defined in Distribution.Types.MungedPackageId

type Rep MungedPackageId = D1 ('MetaData "MungedPackageId" "Distribution.Types.MungedPackageId" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "MungedPackageId" 'PrefixI 'True) (S1 ('MetaSel ('Just "mungedName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MungedPackageName) :*: S1 ('MetaSel ('Just "mungedVersion") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Version)))
Generic MungedPackageName 
Instance details

Defined in Distribution.Types.MungedPackageName

Associated Types

type Rep MungedPackageName 
Instance details

Defined in Distribution.Types.MungedPackageName

type Rep MungedPackageName = D1 ('MetaData "MungedPackageName" "Distribution.Types.MungedPackageName" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "MungedPackageName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 PackageName) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 LibraryName)))
Generic PackageDescription 
Instance details

Defined in Distribution.Types.PackageDescription

Associated Types

type Rep PackageDescription 
Instance details

Defined in Distribution.Types.PackageDescription

type Rep PackageDescription = D1 ('MetaData "PackageDescription" "Distribution.Types.PackageDescription" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "PackageDescription" 'PrefixI 'True) ((((S1 ('MetaSel ('Just "specVersion") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 CabalSpecVersion) :*: (S1 ('MetaSel ('Just "package") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PackageIdentifier) :*: S1 ('MetaSel ('Just "licenseRaw") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Either License License)))) :*: ((S1 ('MetaSel ('Just "licenseFiles") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [SymbolicPath PackageDir LicenseFile]) :*: S1 ('MetaSel ('Just "copyright") 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 ShortText)) :*: (S1 ('MetaSel ('Just "maintainer") 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 ShortText) :*: S1 ('MetaSel ('Just "author") 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 ShortText)))) :*: (((S1 ('MetaSel ('Just "stability") 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 ShortText) :*: S1 ('MetaSel ('Just "testedWith") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(CompilerFlavor, VersionRange)])) :*: (S1 ('MetaSel ('Just "homepage") 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 ShortText) :*: S1 ('MetaSel ('Just "pkgUrl") 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 ShortText))) :*: ((S1 ('MetaSel ('Just "bugReports") 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 ShortText) :*: S1 ('MetaSel ('Just "sourceRepos") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [SourceRepo])) :*: (S1 ('MetaSel ('Just "synopsis") 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 ShortText) :*: S1 ('MetaSel ('Just "description") 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 ShortText))))) :*: (((S1 ('MetaSel ('Just "category") 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 ShortText) :*: (S1 ('MetaSel ('Just "customFieldsPD") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(String, String)]) :*: S1 ('MetaSel ('Just "buildTypeRaw") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe BuildType)))) :*: ((S1 ('MetaSel ('Just "setupBuildInfo") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe SetupBuildInfo)) :*: S1 ('MetaSel ('Just "library") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Library))) :*: (S1 ('MetaSel ('Just "subLibraries") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Library]) :*: S1 ('MetaSel ('Just "executables") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Executable])))) :*: (((S1 ('MetaSel ('Just "foreignLibs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [ForeignLib]) :*: S1 ('MetaSel ('Just "testSuites") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [TestSuite])) :*: (S1 ('MetaSel ('Just "benchmarks") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Benchmark]) :*: S1 ('MetaSel ('Just "dataFiles") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FilePath]))) :*: ((S1 ('MetaSel ('Just "dataDir") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FilePath) :*: S1 ('MetaSel ('Just "extraSrcFiles") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FilePath])) :*: (S1 ('MetaSel ('Just "extraTmpFiles") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FilePath]) :*: S1 ('MetaSel ('Just "extraDocFiles") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FilePath])))))))

Methods

from :: PackageDescription -> Rep PackageDescription x

to :: Rep PackageDescription x -> PackageDescription

Generic PackageIdentifier 
Instance details

Defined in Distribution.Types.PackageId

Associated Types

type Rep PackageIdentifier 
Instance details

Defined in Distribution.Types.PackageId

type Rep PackageIdentifier = D1 ('MetaData "PackageIdentifier" "Distribution.Types.PackageId" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "PackageIdentifier" 'PrefixI 'True) (S1 ('MetaSel ('Just "pkgName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PackageName) :*: S1 ('MetaSel ('Just "pkgVersion") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Version)))
Generic PackageName 
Instance details

Defined in Distribution.Types.PackageName

Associated Types

type Rep PackageName 
Instance details

Defined in Distribution.Types.PackageName

type Rep PackageName = D1 ('MetaData "PackageName" "Distribution.Types.PackageName" "Cabal-syntax-3.10.3.0-4da5" 'True) (C1 ('MetaCons "PackageName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ShortText)))

Methods

from :: PackageName -> Rep PackageName x

to :: Rep PackageName x -> PackageName

Generic PackageVersionConstraint 
Instance details

Defined in Distribution.Types.PackageVersionConstraint

Associated Types

type Rep PackageVersionConstraint 
Instance details

Defined in Distribution.Types.PackageVersionConstraint

type Rep PackageVersionConstraint = D1 ('MetaData "PackageVersionConstraint" "Distribution.Types.PackageVersionConstraint" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "PackageVersionConstraint" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PackageName) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 VersionRange)))

Methods

from :: PackageVersionConstraint -> Rep PackageVersionConstraint x

to :: Rep PackageVersionConstraint x -> PackageVersionConstraint

Generic PkgconfigDependency 
Instance details

Defined in Distribution.Types.PkgconfigDependency

Associated Types

type Rep PkgconfigDependency 
Instance details

Defined in Distribution.Types.PkgconfigDependency

type Rep PkgconfigDependency = D1 ('MetaData "PkgconfigDependency" "Distribution.Types.PkgconfigDependency" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "PkgconfigDependency" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PkgconfigName) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PkgconfigVersionRange)))

Methods

from :: PkgconfigDependency -> Rep PkgconfigDependency x

to :: Rep PkgconfigDependency x -> PkgconfigDependency

Generic PkgconfigName 
Instance details

Defined in Distribution.Types.PkgconfigName

Associated Types

type Rep PkgconfigName 
Instance details

Defined in Distribution.Types.PkgconfigName

type Rep PkgconfigName = D1 ('MetaData "PkgconfigName" "Distribution.Types.PkgconfigName" "Cabal-syntax-3.10.3.0-4da5" 'True) (C1 ('MetaCons "PkgconfigName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ShortText)))

Methods

from :: PkgconfigName -> Rep PkgconfigName x

to :: Rep PkgconfigName x -> PkgconfigName

Generic PkgconfigVersion 
Instance details

Defined in Distribution.Types.PkgconfigVersion

Associated Types

type Rep PkgconfigVersion 
Instance details

Defined in Distribution.Types.PkgconfigVersion

type Rep PkgconfigVersion = D1 ('MetaData "PkgconfigVersion" "Distribution.Types.PkgconfigVersion" "Cabal-syntax-3.10.3.0-4da5" 'True) (C1 ('MetaCons "PkgconfigVersion" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ByteString)))

Methods

from :: PkgconfigVersion -> Rep PkgconfigVersion x

to :: Rep PkgconfigVersion x -> PkgconfigVersion

Generic PkgconfigVersionRange 
Instance details

Defined in Distribution.Types.PkgconfigVersionRange

Associated Types

type Rep PkgconfigVersionRange 
Instance details

Defined in Distribution.Types.PkgconfigVersionRange

type Rep PkgconfigVersionRange = D1 ('MetaData "PkgconfigVersionRange" "Distribution.Types.PkgconfigVersionRange" "Cabal-syntax-3.10.3.0-4da5" 'False) (((C1 ('MetaCons "PcAnyVersion" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PcThisVersion" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PkgconfigVersion))) :+: (C1 ('MetaCons "PcLaterVersion" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PkgconfigVersion)) :+: C1 ('MetaCons "PcEarlierVersion" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PkgconfigVersion)))) :+: ((C1 ('MetaCons "PcOrLaterVersion" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PkgconfigVersion)) :+: C1 ('MetaCons "PcOrEarlierVersion" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PkgconfigVersion))) :+: (C1 ('MetaCons "PcUnionVersionRanges" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PkgconfigVersionRange) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PkgconfigVersionRange)) :+: C1 ('MetaCons "PcIntersectVersionRanges" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PkgconfigVersionRange) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PkgconfigVersionRange)))))

Methods

from :: PkgconfigVersionRange -> Rep PkgconfigVersionRange x

to :: Rep PkgconfigVersionRange x -> PkgconfigVersionRange

Generic SetupBuildInfo 
Instance details

Defined in Distribution.Types.SetupBuildInfo

Associated Types

type Rep SetupBuildInfo 
Instance details

Defined in Distribution.Types.SetupBuildInfo

type Rep SetupBuildInfo = D1 ('MetaData "SetupBuildInfo" "Distribution.Types.SetupBuildInfo" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "SetupBuildInfo" 'PrefixI 'True) (S1 ('MetaSel ('Just "setupDepends") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Dependency]) :*: S1 ('MetaSel ('Just "defaultSetupDepends") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)))

Methods

from :: SetupBuildInfo -> Rep SetupBuildInfo x

to :: Rep SetupBuildInfo x -> SetupBuildInfo

Generic KnownRepoType 
Instance details

Defined in Distribution.Types.SourceRepo

Associated Types

type Rep KnownRepoType 
Instance details

Defined in Distribution.Types.SourceRepo

type Rep KnownRepoType = D1 ('MetaData "KnownRepoType" "Distribution.Types.SourceRepo" "Cabal-syntax-3.10.3.0-4da5" 'False) (((C1 ('MetaCons "Darcs" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Git" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "SVN" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CVS" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "Mercurial" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "GnuArch" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Bazaar" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Monotone" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Pijul" 'PrefixI 'False) (U1 :: Type -> Type)))))

Methods

from :: KnownRepoType -> Rep KnownRepoType x

to :: Rep KnownRepoType x -> KnownRepoType

Generic RepoKind 
Instance details

Defined in Distribution.Types.SourceRepo

Associated Types

type Rep RepoKind 
Instance details

Defined in Distribution.Types.SourceRepo

type Rep RepoKind = D1 ('MetaData "RepoKind" "Distribution.Types.SourceRepo" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "RepoHead" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "RepoThis" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "RepoKindUnknown" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String))))

Methods

from :: RepoKind -> Rep RepoKind x

to :: Rep RepoKind x -> RepoKind

Generic RepoType 
Instance details

Defined in Distribution.Types.SourceRepo

Associated Types

type Rep RepoType 
Instance details

Defined in Distribution.Types.SourceRepo

type Rep RepoType = D1 ('MetaData "RepoType" "Distribution.Types.SourceRepo" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "KnownRepoType" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 KnownRepoType)) :+: C1 ('MetaCons "OtherRepoType" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String)))

Methods

from :: RepoType -> Rep RepoType x

to :: Rep RepoType x -> RepoType

Generic SourceRepo 
Instance details

Defined in Distribution.Types.SourceRepo

Associated Types

type Rep SourceRepo 
Instance details

Defined in Distribution.Types.SourceRepo

type Rep SourceRepo = D1 ('MetaData "SourceRepo" "Distribution.Types.SourceRepo" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "SourceRepo" 'PrefixI 'True) ((S1 ('MetaSel ('Just "repoKind") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RepoKind) :*: (S1 ('MetaSel ('Just "repoType") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe RepoType)) :*: S1 ('MetaSel ('Just "repoLocation") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe String)))) :*: ((S1 ('MetaSel ('Just "repoModule") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe String)) :*: S1 ('MetaSel ('Just "repoBranch") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe String))) :*: (S1 ('MetaSel ('Just "repoTag") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe String)) :*: S1 ('MetaSel ('Just "repoSubdir") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe FilePath))))))

Methods

from :: SourceRepo -> Rep SourceRepo x

to :: Rep SourceRepo x -> SourceRepo

Generic TestSuite 
Instance details

Defined in Distribution.Types.TestSuite

Associated Types

type Rep TestSuite 
Instance details

Defined in Distribution.Types.TestSuite

type Rep TestSuite = D1 ('MetaData "TestSuite" "Distribution.Types.TestSuite" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "TestSuite" 'PrefixI 'True) ((S1 ('MetaSel ('Just "testName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UnqualComponentName) :*: S1 ('MetaSel ('Just "testInterface") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 TestSuiteInterface)) :*: (S1 ('MetaSel ('Just "testBuildInfo") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 BuildInfo) :*: S1 ('MetaSel ('Just "testCodeGenerators") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String]))))

Methods

from :: TestSuite -> Rep TestSuite x

to :: Rep TestSuite x -> TestSuite

Generic TestSuiteInterface 
Instance details

Defined in Distribution.Types.TestSuiteInterface

Associated Types

type Rep TestSuiteInterface 
Instance details

Defined in Distribution.Types.TestSuiteInterface

type Rep TestSuiteInterface = D1 ('MetaData "TestSuiteInterface" "Distribution.Types.TestSuiteInterface" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "TestSuiteExeV10" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Version) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FilePath)) :+: (C1 ('MetaCons "TestSuiteLibV09" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Version) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ModuleName)) :+: C1 ('MetaCons "TestSuiteUnsupported" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 TestType))))

Methods

from :: TestSuiteInterface -> Rep TestSuiteInterface x

to :: Rep TestSuiteInterface x -> TestSuiteInterface

Generic TestType 
Instance details

Defined in Distribution.Types.TestType

Associated Types

type Rep TestType 
Instance details

Defined in Distribution.Types.TestType

type Rep TestType = D1 ('MetaData "TestType" "Distribution.Types.TestType" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "TestTypeExe" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Version)) :+: (C1 ('MetaCons "TestTypeLib" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Version)) :+: C1 ('MetaCons "TestTypeUnknown" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Version))))

Methods

from :: TestType -> Rep TestType x

to :: Rep TestType x -> TestType

Generic DefUnitId 
Instance details

Defined in Distribution.Types.UnitId

Associated Types

type Rep DefUnitId 
Instance details

Defined in Distribution.Types.UnitId

type Rep DefUnitId = D1 ('MetaData "DefUnitId" "Distribution.Types.UnitId" "Cabal-syntax-3.10.3.0-4da5" 'True) (C1 ('MetaCons "DefUnitId" 'PrefixI 'True) (S1 ('MetaSel ('Just "unDefUnitId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UnitId)))

Methods

from :: DefUnitId -> Rep DefUnitId x

to :: Rep DefUnitId x -> DefUnitId

Generic UnitId 
Instance details

Defined in Distribution.Types.UnitId

Associated Types

type Rep UnitId 
Instance details

Defined in Distribution.Types.UnitId

type Rep UnitId = D1 ('MetaData "UnitId" "Distribution.Types.UnitId" "Cabal-syntax-3.10.3.0-4da5" 'True) (C1 ('MetaCons "UnitId" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ShortText)))

Methods

from :: UnitId -> Rep UnitId x

to :: Rep UnitId x -> UnitId

Generic UnqualComponentName 
Instance details

Defined in Distribution.Types.UnqualComponentName

Associated Types

type Rep UnqualComponentName 
Instance details

Defined in Distribution.Types.UnqualComponentName

type Rep UnqualComponentName = D1 ('MetaData "UnqualComponentName" "Distribution.Types.UnqualComponentName" "Cabal-syntax-3.10.3.0-4da5" 'True) (C1 ('MetaCons "UnqualComponentName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ShortText)))

Methods

from :: UnqualComponentName -> Rep UnqualComponentName x

to :: Rep UnqualComponentName x -> UnqualComponentName

Generic Version 
Instance details

Defined in Distribution.Types.Version

Associated Types

type Rep Version 
Instance details

Defined in Distribution.Types.Version

type Rep Version = D1 ('MetaData "Version" "Distribution.Types.Version" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "PV0" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'SourceUnpack 'SourceStrict 'DecidedUnpack) (Rec0 Word64)) :+: C1 ('MetaCons "PV1" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Int) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Int])))

Methods

from :: Version -> Rep Version x

to :: Rep Version x -> Version

Generic VersionRange 
Instance details

Defined in Distribution.Types.VersionRange.Internal

Associated Types

type Rep VersionRange 
Instance details

Defined in Distribution.Types.VersionRange.Internal

type Rep VersionRange = D1 ('MetaData "VersionRange" "Distribution.Types.VersionRange.Internal" "Cabal-syntax-3.10.3.0-4da5" 'False) (((C1 ('MetaCons "ThisVersion" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Version)) :+: C1 ('MetaCons "LaterVersion" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Version))) :+: (C1 ('MetaCons "OrLaterVersion" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Version)) :+: C1 ('MetaCons "EarlierVersion" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Version)))) :+: ((C1 ('MetaCons "OrEarlierVersion" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Version)) :+: C1 ('MetaCons "MajorBoundVersion" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Version))) :+: (C1 ('MetaCons "UnionVersionRanges" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 VersionRange) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 VersionRange)) :+: C1 ('MetaCons "IntersectVersionRanges" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 VersionRange) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 VersionRange)))))
Generic ShortText 
Instance details

Defined in Distribution.Utils.ShortText

Associated Types

type Rep ShortText 
Instance details

Defined in Distribution.Utils.ShortText

type Rep ShortText = D1 ('MetaData "ShortText" "Distribution.Utils.ShortText" "Cabal-syntax-3.10.3.0-4da5" 'True) (C1 ('MetaCons "ST" 'PrefixI 'True) (S1 ('MetaSel ('Just "unST") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ShortByteString)))

Methods

from :: ShortText -> Rep ShortText x

to :: Rep ShortText x -> ShortText

Generic Structure 
Instance details

Defined in Distribution.Utils.Structured

Associated Types

type Rep Structure 
Instance details

Defined in Distribution.Utils.Structured

type Rep Structure = D1 ('MetaData "Structure" "Distribution.Utils.Structured" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "Nominal" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 TypeRep) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 TypeVersion)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 TypeName) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Structure]))) :+: (C1 ('MetaCons "Newtype" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 TypeRep) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 TypeVersion)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 TypeName) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Structure))) :+: C1 ('MetaCons "Structure" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 TypeRep) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 TypeVersion)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 TypeName) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SopStructure)))))

Methods

from :: Structure -> Rep Structure x

to :: Rep Structure x -> Structure

Generic Extension 
Instance details

Defined in Language.Haskell.Extension

Associated Types

type Rep Extension 
Instance details

Defined in Language.Haskell.Extension

type Rep Extension = D1 ('MetaData "Extension" "Language.Haskell.Extension" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "EnableExtension" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 KnownExtension)) :+: (C1 ('MetaCons "DisableExtension" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 KnownExtension)) :+: C1 ('MetaCons "UnknownExtension" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String))))

Methods

from :: Extension -> Rep Extension x

to :: Rep Extension x -> Extension

Generic KnownExtension 
Instance details

Defined in Language.Haskell.Extension

Associated Types

type Rep KnownExtension 
Instance details

Defined in Language.Haskell.Extension

type Rep KnownExtension = D1 ('MetaData "KnownExtension" "Language.Haskell.Extension" "Cabal-syntax-3.10.3.0-4da5" 'False) (((((((C1 ('MetaCons "OverlappingInstances" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "UndecidableInstances" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "IncoherentInstances" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DoRec" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "RecursiveDo" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ParallelListComp" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "MultiParamTypeClasses" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "MonomorphismRestriction" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DeepSubsumption" 'PrefixI 'False) (U1 :: Type -> Type))))) :+: (((C1 ('MetaCons "FunctionalDependencies" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Rank2Types" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "RankNTypes" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PolymorphicComponents" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "ExistentialQuantification" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ScopedTypeVariables" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "PatternSignatures" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "ImplicitParams" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "FlexibleContexts" 'PrefixI 'False) (U1 :: Type -> Type)))))) :+: ((((C1 ('MetaCons "FlexibleInstances" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "EmptyDataDecls" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "CPP" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "KindSignatures" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "BangPatterns" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TypeSynonymInstances" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "TemplateHaskell" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "ForeignFunctionInterface" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Arrows" 'PrefixI 'False) (U1 :: Type -> Type))))) :+: (((C1 ('MetaCons "Generics" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ImplicitPrelude" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "NamedFieldPuns" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PatternGuards" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "GeneralizedNewtypeDeriving" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "GeneralisedNewtypeDeriving" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "ExtensibleRecords" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "RestrictedTypeSynonyms" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "HereDocuments" 'PrefixI 'False) (U1 :: Type -> Type))))))) :+: (((((C1 ('MetaCons "MagicHash" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TypeFamilies" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "StandaloneDeriving" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "UnicodeSyntax" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "UnliftedFFITypes" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "InterruptibleFFI" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "CApiFFI" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "LiberalTypeSynonyms" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TypeOperators" 'PrefixI 'False) (U1 :: Type -> Type))))) :+: (((C1 ('MetaCons "RecordWildCards" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "RecordPuns" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "DisambiguateRecordFields" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TraditionalRecordSyntax" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "OverloadedStrings" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "GADTs" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "GADTSyntax" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "MonoPatBinds" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "RelaxedPolyRec" 'PrefixI 'False) (U1 :: Type -> Type)))))) :+: ((((C1 ('MetaCons "ExtendedDefaultRules" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "UnboxedTuples" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "DeriveDataTypeable" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DeriveGeneric" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "DefaultSignatures" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "InstanceSigs" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "ConstrainedClassMethods" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "PackageImports" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ImpredicativeTypes" 'PrefixI 'False) (U1 :: Type -> Type))))) :+: (((C1 ('MetaCons "NewQualifiedOperators" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PostfixOperators" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "QuasiQuotes" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "TransformListComp" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "MonadComprehensions" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "ViewPatterns" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "XmlSyntax" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "RegularPatterns" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "TupleSections" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "GHCForeignImportPrim" 'PrefixI 'False) (U1 :: Type -> Type)))))))) :+: ((((((C1 ('MetaCons "NPlusKPatterns" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DoAndIfThenElse" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "MultiWayIf" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LambdaCase" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "RebindableSyntax" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ExplicitForAll" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "DatatypeContexts" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "MonoLocalBinds" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DeriveFunctor" 'PrefixI 'False) (U1 :: Type -> Type))))) :+: (((C1 ('MetaCons "DeriveTraversable" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DeriveFoldable" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "NondecreasingIndentation" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "SafeImports" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "Safe" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Trustworthy" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Unsafe" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "ConstraintKinds" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PolyKinds" 'PrefixI 'False) (U1 :: Type -> Type)))))) :+: ((((C1 ('MetaCons "DataKinds" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TypeData" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "ParallelArrays" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "RoleAnnotations" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "OverloadedLists" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "EmptyCase" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "AutoDeriveTypeable" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "NegativeLiterals" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "BinaryLiterals" 'PrefixI 'False) (U1 :: Type -> Type))))) :+: (((C1 ('MetaCons "NumDecimals" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "NullaryTypeClasses" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "ExplicitNamespaces" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "AllowAmbiguousTypes" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "JavaScriptFFI" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PatternSynonyms" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "PartialTypeSignatures" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "NamedWildCards" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DeriveAnyClass" 'PrefixI 'False) (U1 :: Type -> Type))))))) :+: (((((C1 ('MetaCons "DeriveLift" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "StaticPointers" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "StrictData" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Strict" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "ApplicativeDo" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DuplicateRecordFields" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "TypeApplications" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "TypeInType" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "UndecidableSuperClasses" 'PrefixI 'False) (U1 :: Type -> Type))))) :+: (((C1 ('MetaCons "MonadFailDesugaring" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TemplateHaskellQuotes" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "OverloadedLabels" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TypeFamilyDependencies" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "DerivingStrategies" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DerivingVia" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "UnboxedSums" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "HexFloatLiterals" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "BlockArguments" 'PrefixI 'False) (U1 :: Type -> Type)))))) :+: ((((C1 ('MetaCons "NumericUnderscores" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "QuantifiedConstraints" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "StarIsType" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "EmptyDataDeriving" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "CUSKs" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ImportQualifiedPost" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "StandaloneKindSignatures" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "UnliftedNewtypes" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LexicalNegation" 'PrefixI 'False) (U1 :: Type -> Type))))) :+: (((C1 ('MetaCons "QualifiedDo" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LinearTypes" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "RequiredTypeArguments" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "FieldSelectors" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "OverloadedRecordDot" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "OverloadedRecordUpdate" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "UnliftedDatatypes" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "AlternativeLayoutRule" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "AlternativeLayoutRuleTransitional" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "RelaxedLayout" 'PrefixI 'False) (U1 :: Type -> Type)))))))))

Methods

from :: KnownExtension -> Rep KnownExtension x

to :: Rep KnownExtension x -> KnownExtension

Generic Language 
Instance details

Defined in Language.Haskell.Extension

Associated Types

type Rep Language 
Instance details

Defined in Language.Haskell.Extension

type Rep Language = D1 ('MetaData "Language" "Language.Haskell.Extension" "Cabal-syntax-3.10.3.0-4da5" 'False) ((C1 ('MetaCons "Haskell98" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Haskell2010" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "GHC2021" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "UnknownLanguage" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String))))

Methods

from :: Language -> Rep Language x

to :: Rep Language x -> Language

Generic Value 
Instance details

Defined in Data.Aeson.Types.Internal

Associated Types

type Rep Value 
Instance details

Defined in Data.Aeson.Types.Internal

type Rep Value = D1 ('MetaData "Value" "Data.Aeson.Types.Internal" "aeson-2.2.3.0-LVN644RDSGV1pDguDpiuz3" 'False) ((C1 ('MetaCons "Object" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Object)) :+: (C1 ('MetaCons "Array" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Array)) :+: C1 ('MetaCons "String" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text)))) :+: (C1 ('MetaCons "Number" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Scientific)) :+: (C1 ('MetaCons "Bool" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Bool)) :+: C1 ('MetaCons "Null" 'PrefixI 'False) (U1 :: Type -> Type))))

Methods

from :: Value -> Rep Value x

to :: Rep Value x -> Value

Generic WarningParserMonoid 
Instance details

Defined in Data.Aeson.WarningParser

Associated Types

type Rep WarningParserMonoid 
Instance details

Defined in Data.Aeson.WarningParser

type Rep WarningParserMonoid = D1 ('MetaData "WarningParserMonoid" "Data.Aeson.WarningParser" "aeson-warning-parser-0.1.1-HtaLudSHgYJ8Il50xygI3" 'False) (C1 ('MetaCons "WarningParserMonoid" 'PrefixI 'True) (S1 ('MetaSel ('Just "wpmExpectedFields") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Set Text)) :*: S1 ('MetaSel ('Just "wpmWarnings") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [JSONWarning])))

Methods

from :: WarningParserMonoid -> Rep WarningParserMonoid x

to :: Rep WarningParserMonoid x -> WarningParserMonoid

Generic All 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep All 
Instance details

Defined in Data.Semigroup.Internal

type Rep All = D1 ('MetaData "All" "Data.Semigroup.Internal" "base" 'True) (C1 ('MetaCons "All" 'PrefixI 'True) (S1 ('MetaSel ('Just "getAll") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)))

Methods

from :: All -> Rep All x

to :: Rep All x -> All

Generic Any 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep Any 
Instance details

Defined in Data.Semigroup.Internal

type Rep Any = D1 ('MetaData "Any" "Data.Semigroup.Internal" "base" 'True) (C1 ('MetaCons "Any" 'PrefixI 'True) (S1 ('MetaSel ('Just "getAny") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)))

Methods

from :: Any -> Rep Any x

to :: Rep Any x -> Any

Generic Version 
Instance details

Defined in Data.Version

Associated Types

type Rep Version 
Instance details

Defined in Data.Version

type Rep Version = D1 ('MetaData "Version" "Data.Version" "base" 'False) (C1 ('MetaCons "Version" 'PrefixI 'True) (S1 ('MetaSel ('Just "versionBranch") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Int]) :*: S1 ('MetaSel ('Just "versionTags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String])))

Methods

from :: Version -> Rep Version x

to :: Rep Version x -> Version

Generic Void 
Instance details

Defined in GHC.Generics

Associated Types

type Rep Void 
Instance details

Defined in GHC.Generics

type Rep Void = D1 ('MetaData "Void" "GHC.Base" "base" 'False) (V1 :: Type -> Type)

Methods

from :: Void -> Rep Void x

to :: Rep Void x -> Void

Generic ByteOrder 
Instance details

Defined in GHC.ByteOrder

Associated Types

type Rep ByteOrder 
Instance details

Defined in GHC.ByteOrder

type Rep ByteOrder = D1 ('MetaData "ByteOrder" "GHC.ByteOrder" "base" 'False) (C1 ('MetaCons "BigEndian" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LittleEndian" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: ByteOrder -> Rep ByteOrder x

to :: Rep ByteOrder x -> ByteOrder

Generic Fingerprint 
Instance details

Defined in GHC.Generics

Associated Types

type Rep Fingerprint 
Instance details

Defined in GHC.Generics

type Rep Fingerprint = D1 ('MetaData "Fingerprint" "GHC.Fingerprint.Type" "base" 'False) (C1 ('MetaCons "Fingerprint" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'SourceUnpack 'SourceStrict 'DecidedUnpack) (Rec0 Word64) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'SourceUnpack 'SourceStrict 'DecidedUnpack) (Rec0 Word64)))

Methods

from :: Fingerprint -> Rep Fingerprint x

to :: Rep Fingerprint x -> Fingerprint

Generic Associativity 
Instance details

Defined in GHC.Generics

Associated Types

type Rep Associativity 
Instance details

Defined in GHC.Generics

type Rep Associativity = D1 ('MetaData "Associativity" "GHC.Generics" "base" 'False) (C1 ('MetaCons "LeftAssociative" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "RightAssociative" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "NotAssociative" 'PrefixI 'False) (U1 :: Type -> Type)))

Methods

from :: Associativity -> Rep Associativity x

to :: Rep Associativity x -> Associativity

Generic DecidedStrictness 
Instance details

Defined in GHC.Generics

Associated Types

type Rep DecidedStrictness 
Instance details

Defined in GHC.Generics

type Rep DecidedStrictness = D1 ('MetaData "DecidedStrictness" "GHC.Generics" "base" 'False) (C1 ('MetaCons "DecidedLazy" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "DecidedStrict" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DecidedUnpack" 'PrefixI 'False) (U1 :: Type -> Type)))

Methods

from :: DecidedStrictness -> Rep DecidedStrictness x

to :: Rep DecidedStrictness x -> DecidedStrictness

Generic Fixity 
Instance details

Defined in GHC.Generics

Associated Types

type Rep Fixity 
Instance details

Defined in GHC.Generics

type Rep Fixity = D1 ('MetaData "Fixity" "GHC.Generics" "base" 'False) (C1 ('MetaCons "Prefix" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Infix" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Associativity) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)))

Methods

from :: Fixity -> Rep Fixity x

to :: Rep Fixity x -> Fixity

Generic SourceStrictness 
Instance details

Defined in GHC.Generics

Associated Types

type Rep SourceStrictness 
Instance details

Defined in GHC.Generics

type Rep SourceStrictness = D1 ('MetaData "SourceStrictness" "GHC.Generics" "base" 'False) (C1 ('MetaCons "NoSourceStrictness" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "SourceLazy" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "SourceStrict" 'PrefixI 'False) (U1 :: Type -> Type)))

Methods

from :: SourceStrictness -> Rep SourceStrictness x

to :: Rep SourceStrictness x -> SourceStrictness

Generic SourceUnpackedness 
Instance details

Defined in GHC.Generics

Associated Types

type Rep SourceUnpackedness 
Instance details

Defined in GHC.Generics

type Rep SourceUnpackedness = D1 ('MetaData "SourceUnpackedness" "GHC.Generics" "base" 'False) (C1 ('MetaCons "NoSourceUnpackedness" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "SourceNoUnpack" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "SourceUnpack" 'PrefixI 'False) (U1 :: Type -> Type)))

Methods

from :: SourceUnpackedness -> Rep SourceUnpackedness x

to :: Rep SourceUnpackedness x -> SourceUnpackedness

Generic ExitCode 
Instance details

Defined in GHC.IO.Exception

Associated Types

type Rep ExitCode 
Instance details

Defined in GHC.IO.Exception

type Rep ExitCode = D1 ('MetaData "ExitCode" "GHC.IO.Exception" "base" 'False) (C1 ('MetaCons "ExitSuccess" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ExitFailure" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)))

Methods

from :: ExitCode -> Rep ExitCode x

to :: Rep ExitCode x -> ExitCode

Generic CCFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep CCFlags 
Instance details

Defined in GHC.RTS.Flags

type Rep CCFlags = D1 ('MetaData "CCFlags" "GHC.RTS.Flags" "base" 'False) (C1 ('MetaCons "CCFlags" 'PrefixI 'True) (S1 ('MetaSel ('Just "doCostCentres") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 DoCostCentres) :*: (S1 ('MetaSel ('Just "profilerTicks") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int) :*: S1 ('MetaSel ('Just "msecsPerTick") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int))))

Methods

from :: CCFlags -> Rep CCFlags x

to :: Rep CCFlags x -> CCFlags

Generic ConcFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep ConcFlags 
Instance details

Defined in GHC.RTS.Flags

type Rep ConcFlags = D1 ('MetaData "ConcFlags" "GHC.RTS.Flags" "base" 'False) (C1 ('MetaCons "ConcFlags" 'PrefixI 'True) (S1 ('MetaSel ('Just "ctxtSwitchTime") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RtsTime) :*: S1 ('MetaSel ('Just "ctxtSwitchTicks") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)))

Methods

from :: ConcFlags -> Rep ConcFlags x

to :: Rep ConcFlags x -> ConcFlags

Generic DebugFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep DebugFlags 
Instance details

Defined in GHC.RTS.Flags

type Rep DebugFlags = D1 ('MetaData "DebugFlags" "GHC.RTS.Flags" "base" 'False) (C1 ('MetaCons "DebugFlags" 'PrefixI 'True) ((((S1 ('MetaSel ('Just "scheduler") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "interpreter") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)) :*: (S1 ('MetaSel ('Just "weak") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "gccafs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool))) :*: ((S1 ('MetaSel ('Just "gc") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "nonmoving_gc") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)) :*: (S1 ('MetaSel ('Just "block_alloc") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "sanity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)))) :*: (((S1 ('MetaSel ('Just "stable") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "prof") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)) :*: (S1 ('MetaSel ('Just "linker") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "apply") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool))) :*: ((S1 ('MetaSel ('Just "stm") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "squeeze") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)) :*: (S1 ('MetaSel ('Just "hpc") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "sparks") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool))))))

Methods

from :: DebugFlags -> Rep DebugFlags x

to :: Rep DebugFlags x -> DebugFlags

Generic DoCostCentres 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep DoCostCentres 
Instance details

Defined in GHC.RTS.Flags

type Rep DoCostCentres = D1 ('MetaData "DoCostCentres" "GHC.RTS.Flags" "base" 'False) ((C1 ('MetaCons "CostCentresNone" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CostCentresSummary" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "CostCentresVerbose" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "CostCentresAll" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CostCentresJSON" 'PrefixI 'False) (U1 :: Type -> Type))))

Methods

from :: DoCostCentres -> Rep DoCostCentres x

to :: Rep DoCostCentres x -> DoCostCentres

Generic DoHeapProfile 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep DoHeapProfile 
Instance details

Defined in GHC.RTS.Flags

type Rep DoHeapProfile = D1 ('MetaData "DoHeapProfile" "GHC.RTS.Flags" "base" 'False) (((C1 ('MetaCons "NoHeapProfiling" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "HeapByCCS" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "HeapByMod" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "HeapByDescr" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "HeapByType" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "HeapByRetainer" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "HeapByLDV" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "HeapByClosureType" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "HeapByInfoTable" 'PrefixI 'False) (U1 :: Type -> Type)))))

Methods

from :: DoHeapProfile -> Rep DoHeapProfile x

to :: Rep DoHeapProfile x -> DoHeapProfile

Generic DoTrace 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep DoTrace 
Instance details

Defined in GHC.RTS.Flags

type Rep DoTrace = D1 ('MetaData "DoTrace" "GHC.RTS.Flags" "base" 'False) (C1 ('MetaCons "TraceNone" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "TraceEventLog" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TraceStderr" 'PrefixI 'False) (U1 :: Type -> Type)))

Methods

from :: DoTrace -> Rep DoTrace x

to :: Rep DoTrace x -> DoTrace

Generic GCFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep GCFlags 
Instance details

Defined in GHC.RTS.Flags

type Rep GCFlags = D1 ('MetaData "GCFlags" "GHC.RTS.Flags" "base" 'False) (C1 ('MetaCons "GCFlags" 'PrefixI 'True) ((((S1 ('MetaSel ('Just "statsFile") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe FilePath)) :*: (S1 ('MetaSel ('Just "giveStats") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 GiveGCStats) :*: S1 ('MetaSel ('Just "maxStkSize") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word32))) :*: ((S1 ('MetaSel ('Just "initialStkSize") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word32) :*: S1 ('MetaSel ('Just "stkChunkSize") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word32)) :*: (S1 ('MetaSel ('Just "stkChunkBufferSize") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word32) :*: S1 ('MetaSel ('Just "maxHeapSize") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word32)))) :*: ((S1 ('MetaSel ('Just "minAllocAreaSize") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word32) :*: (S1 ('MetaSel ('Just "largeAllocLim") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word32) :*: S1 ('MetaSel ('Just "nurseryChunkSize") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word32))) :*: ((S1 ('MetaSel ('Just "minOldGenSize") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word32) :*: S1 ('MetaSel ('Just "heapSizeSuggestion") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word32)) :*: (S1 ('MetaSel ('Just "heapSizeSuggestionAuto") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "oldGenFactor") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Double))))) :*: (((S1 ('MetaSel ('Just "returnDecayFactor") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Double) :*: (S1 ('MetaSel ('Just "pcFreeHeap") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Double) :*: S1 ('MetaSel ('Just "generations") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word32))) :*: ((S1 ('MetaSel ('Just "squeezeUpdFrames") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "compact") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)) :*: (S1 ('MetaSel ('Just "compactThreshold") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Double) :*: S1 ('MetaSel ('Just "sweep") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)))) :*: ((S1 ('MetaSel ('Just "ringBell") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: (S1 ('MetaSel ('Just "idleGCDelayTime") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RtsTime) :*: S1 ('MetaSel ('Just "doIdleGC") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool))) :*: ((S1 ('MetaSel ('Just "heapBase") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word) :*: S1 ('MetaSel ('Just "allocLimitGrace") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word)) :*: (S1 ('MetaSel ('Just "numa") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "numaMask") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word)))))))

Methods

from :: GCFlags -> Rep GCFlags x

to :: Rep GCFlags x -> GCFlags

Generic GiveGCStats 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep GiveGCStats 
Instance details

Defined in GHC.RTS.Flags

type Rep GiveGCStats = D1 ('MetaData "GiveGCStats" "GHC.RTS.Flags" "base" 'False) ((C1 ('MetaCons "NoGCStats" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CollectGCStats" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "OneLineGCStats" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "SummaryGCStats" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "VerboseGCStats" 'PrefixI 'False) (U1 :: Type -> Type))))

Methods

from :: GiveGCStats -> Rep GiveGCStats x

to :: Rep GiveGCStats x -> GiveGCStats

Generic MiscFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep MiscFlags 
Instance details

Defined in GHC.RTS.Flags

type Rep MiscFlags = D1 ('MetaData "MiscFlags" "GHC.RTS.Flags" "base" 'False) (C1 ('MetaCons "MiscFlags" 'PrefixI 'True) (((S1 ('MetaSel ('Just "tickInterval") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RtsTime) :*: (S1 ('MetaSel ('Just "installSignalHandlers") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "installSEHHandlers") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool))) :*: (S1 ('MetaSel ('Just "generateCrashDumpFile") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: (S1 ('MetaSel ('Just "generateStackTrace") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "machineReadable") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)))) :*: ((S1 ('MetaSel ('Just "disableDelayedOsMemoryReturn") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: (S1 ('MetaSel ('Just "internalCounters") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "linkerAlwaysPic") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool))) :*: (S1 ('MetaSel ('Just "linkerMemBase") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word) :*: (S1 ('MetaSel ('Just "ioManager") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 IoSubSystem) :*: S1 ('MetaSel ('Just "numIoWorkerThreads") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word32))))))

Methods

from :: MiscFlags -> Rep MiscFlags x

to :: Rep MiscFlags x -> MiscFlags

Generic ParFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep ParFlags 
Instance details

Defined in GHC.RTS.Flags

type Rep ParFlags = D1 ('MetaData "ParFlags" "GHC.RTS.Flags" "base" 'False) (C1 ('MetaCons "ParFlags" 'PrefixI 'True) (((S1 ('MetaSel ('Just "nCapabilities") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word32) :*: S1 ('MetaSel ('Just "migrate") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)) :*: (S1 ('MetaSel ('Just "maxLocalSparks") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word32) :*: (S1 ('MetaSel ('Just "parGcEnabled") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "parGcGen") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word32)))) :*: ((S1 ('MetaSel ('Just "parGcLoadBalancingEnabled") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "parGcLoadBalancingGen") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word32)) :*: (S1 ('MetaSel ('Just "parGcNoSyncWithIdle") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word32) :*: (S1 ('MetaSel ('Just "parGcThreads") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word32) :*: S1 ('MetaSel ('Just "setAffinity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool))))))

Methods

from :: ParFlags -> Rep ParFlags x

to :: Rep ParFlags x -> ParFlags

Generic ProfFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep ProfFlags 
Instance details

Defined in GHC.RTS.Flags

type Rep ProfFlags = D1 ('MetaData "ProfFlags" "GHC.RTS.Flags" "base" 'False) (C1 ('MetaCons "ProfFlags" 'PrefixI 'True) (((S1 ('MetaSel ('Just "doHeapProfile") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 DoHeapProfile) :*: (S1 ('MetaSel ('Just "heapProfileInterval") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RtsTime) :*: S1 ('MetaSel ('Just "heapProfileIntervalTicks") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word))) :*: ((S1 ('MetaSel ('Just "startHeapProfileAtStartup") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "showCCSOnException") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)) :*: (S1 ('MetaSel ('Just "maxRetainerSetSize") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word) :*: S1 ('MetaSel ('Just "ccsLength") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word)))) :*: ((S1 ('MetaSel ('Just "modSelector") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe String)) :*: (S1 ('MetaSel ('Just "descrSelector") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe String)) :*: S1 ('MetaSel ('Just "typeSelector") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe String)))) :*: ((S1 ('MetaSel ('Just "ccSelector") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe String)) :*: S1 ('MetaSel ('Just "ccsSelector") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe String))) :*: (S1 ('MetaSel ('Just "retainerSelector") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe String)) :*: S1 ('MetaSel ('Just "bioSelector") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe String)))))))

Methods

from :: ProfFlags -> Rep ProfFlags x

to :: Rep ProfFlags x -> ProfFlags

Generic RTSFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep RTSFlags 
Instance details

Defined in GHC.RTS.Flags

type Rep RTSFlags = D1 ('MetaData "RTSFlags" "GHC.RTS.Flags" "base" 'False) (C1 ('MetaCons "RTSFlags" 'PrefixI 'True) (((S1 ('MetaSel ('Just "gcFlags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 GCFlags) :*: S1 ('MetaSel ('Just "concurrentFlags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ConcFlags)) :*: (S1 ('MetaSel ('Just "miscFlags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 MiscFlags) :*: S1 ('MetaSel ('Just "debugFlags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 DebugFlags))) :*: ((S1 ('MetaSel ('Just "costCentreFlags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 CCFlags) :*: S1 ('MetaSel ('Just "profilingFlags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ProfFlags)) :*: (S1 ('MetaSel ('Just "traceFlags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 TraceFlags) :*: (S1 ('MetaSel ('Just "tickyFlags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 TickyFlags) :*: S1 ('MetaSel ('Just "parFlags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ParFlags))))))

Methods

from :: RTSFlags -> Rep RTSFlags x

to :: Rep RTSFlags x -> RTSFlags

Generic TickyFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep TickyFlags 
Instance details

Defined in GHC.RTS.Flags

type Rep TickyFlags = D1 ('MetaData "TickyFlags" "GHC.RTS.Flags" "base" 'False) (C1 ('MetaCons "TickyFlags" 'PrefixI 'True) (S1 ('MetaSel ('Just "showTickyStats") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "tickyFile") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe FilePath))))

Methods

from :: TickyFlags -> Rep TickyFlags x

to :: Rep TickyFlags x -> TickyFlags

Generic TraceFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep TraceFlags 
Instance details

Defined in GHC.RTS.Flags

type Rep TraceFlags = D1 ('MetaData "TraceFlags" "GHC.RTS.Flags" "base" 'False) (C1 ('MetaCons "TraceFlags" 'PrefixI 'True) (((S1 ('MetaSel ('Just "tracing") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 DoTrace) :*: S1 ('MetaSel ('Just "timestamp") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)) :*: (S1 ('MetaSel ('Just "traceScheduler") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "traceGc") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool))) :*: ((S1 ('MetaSel ('Just "traceNonmovingGc") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "sparksSampled") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)) :*: (S1 ('MetaSel ('Just "sparksFull") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "user") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)))))

Methods

from :: TraceFlags -> Rep TraceFlags x

to :: Rep TraceFlags x -> TraceFlags

Generic SrcLoc 
Instance details

Defined in GHC.Generics

Associated Types

type Rep SrcLoc 
Instance details

Defined in GHC.Generics

type Rep SrcLoc = D1 ('MetaData "SrcLoc" "GHC.Stack.Types" "base" 'False) (C1 ('MetaCons "SrcLoc" 'PrefixI 'True) ((S1 ('MetaSel ('Just "srcLocPackage") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Char]) :*: (S1 ('MetaSel ('Just "srcLocModule") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Char]) :*: S1 ('MetaSel ('Just "srcLocFile") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Char]))) :*: ((S1 ('MetaSel ('Just "srcLocStartLine") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int) :*: S1 ('MetaSel ('Just "srcLocStartCol") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)) :*: (S1 ('MetaSel ('Just "srcLocEndLine") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int) :*: S1 ('MetaSel ('Just "srcLocEndCol") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)))))

Methods

from :: SrcLoc -> Rep SrcLoc x

to :: Rep SrcLoc x -> SrcLoc

Generic GCDetails 
Instance details

Defined in GHC.Stats

Associated Types

type Rep GCDetails 
Instance details

Defined in GHC.Stats

type Rep GCDetails = D1 ('MetaData "GCDetails" "GHC.Stats" "base" 'False) (C1 ('MetaCons "GCDetails" 'PrefixI 'True) ((((S1 ('MetaSel ('Just "gcdetails_gen") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word32) :*: S1 ('MetaSel ('Just "gcdetails_threads") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word32)) :*: (S1 ('MetaSel ('Just "gcdetails_allocated_bytes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word64) :*: S1 ('MetaSel ('Just "gcdetails_live_bytes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word64))) :*: ((S1 ('MetaSel ('Just "gcdetails_large_objects_bytes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word64) :*: S1 ('MetaSel ('Just "gcdetails_compact_bytes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word64)) :*: (S1 ('MetaSel ('Just "gcdetails_slop_bytes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word64) :*: S1 ('MetaSel ('Just "gcdetails_mem_in_use_bytes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word64)))) :*: (((S1 ('MetaSel ('Just "gcdetails_copied_bytes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word64) :*: S1 ('MetaSel ('Just "gcdetails_par_max_copied_bytes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word64)) :*: (S1 ('MetaSel ('Just "gcdetails_par_balanced_copied_bytes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word64) :*: S1 ('MetaSel ('Just "gcdetails_block_fragmentation_bytes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word64))) :*: ((S1 ('MetaSel ('Just "gcdetails_sync_elapsed_ns") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RtsTime) :*: S1 ('MetaSel ('Just "gcdetails_cpu_ns") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RtsTime)) :*: (S1 ('MetaSel ('Just "gcdetails_elapsed_ns") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RtsTime) :*: (S1 ('MetaSel ('Just "gcdetails_nonmoving_gc_sync_cpu_ns") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RtsTime) :*: S1 ('MetaSel ('Just "gcdetails_nonmoving_gc_sync_elapsed_ns") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RtsTime)))))))

Methods

from :: GCDetails -> Rep GCDetails x

to :: Rep GCDetails x -> GCDetails

Generic RTSStats 
Instance details

Defined in GHC.Stats

Associated Types

type Rep RTSStats 
Instance details

Defined in GHC.Stats

type Rep RTSStats = D1 ('MetaData "RTSStats" "GHC.Stats" "base" 'False) (C1 ('MetaCons "RTSStats" 'PrefixI 'True) ((((S1 ('MetaSel ('Just "gcs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word32) :*: (S1 ('MetaSel ('Just "major_gcs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word32) :*: S1 ('MetaSel ('Just "allocated_bytes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word64))) :*: ((S1 ('MetaSel ('Just "max_live_bytes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word64) :*: S1 ('MetaSel ('Just "max_large_objects_bytes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word64)) :*: (S1 ('MetaSel ('Just "max_compact_bytes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word64) :*: S1 ('MetaSel ('Just "max_slop_bytes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word64)))) :*: ((S1 ('MetaSel ('Just "max_mem_in_use_bytes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word64) :*: (S1 ('MetaSel ('Just "cumulative_live_bytes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word64) :*: S1 ('MetaSel ('Just "copied_bytes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word64))) :*: ((S1 ('MetaSel ('Just "par_copied_bytes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word64) :*: S1 ('MetaSel ('Just "cumulative_par_max_copied_bytes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word64)) :*: (S1 ('MetaSel ('Just "cumulative_par_balanced_copied_bytes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word64) :*: S1 ('MetaSel ('Just "init_cpu_ns") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RtsTime))))) :*: (((S1 ('MetaSel ('Just "init_elapsed_ns") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RtsTime) :*: (S1 ('MetaSel ('Just "mutator_cpu_ns") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RtsTime) :*: S1 ('MetaSel ('Just "mutator_elapsed_ns") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RtsTime))) :*: ((S1 ('MetaSel ('Just "gc_cpu_ns") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RtsTime) :*: S1 ('MetaSel ('Just "gc_elapsed_ns") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RtsTime)) :*: (S1 ('MetaSel ('Just "cpu_ns") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RtsTime) :*: S1 ('MetaSel ('Just "elapsed_ns") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RtsTime)))) :*: ((S1 ('MetaSel ('Just "nonmoving_gc_sync_cpu_ns") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RtsTime) :*: (S1 ('MetaSel ('Just "nonmoving_gc_sync_elapsed_ns") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RtsTime) :*: S1 ('MetaSel ('Just "nonmoving_gc_sync_max_elapsed_ns") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RtsTime))) :*: ((S1 ('MetaSel ('Just "nonmoving_gc_cpu_ns") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RtsTime) :*: S1 ('MetaSel ('Just "nonmoving_gc_elapsed_ns") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RtsTime)) :*: (S1 ('MetaSel ('Just "nonmoving_gc_max_elapsed_ns") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RtsTime) :*: S1 ('MetaSel ('Just "gc") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 GCDetails)))))))

Methods

from :: RTSStats -> Rep RTSStats x

to :: Rep RTSStats x -> RTSStats

Generic GeneralCategory 
Instance details

Defined in GHC.Generics

Associated Types

type Rep GeneralCategory 
Instance details

Defined in GHC.Generics

type Rep GeneralCategory = D1 ('MetaData "GeneralCategory" "GHC.Unicode" "base" 'False) ((((C1 ('MetaCons "UppercaseLetter" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "LowercaseLetter" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TitlecaseLetter" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "ModifierLetter" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "OtherLetter" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "NonSpacingMark" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "SpacingCombiningMark" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: (((C1 ('MetaCons "EnclosingMark" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DecimalNumber" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "LetterNumber" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "OtherNumber" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "ConnectorPunctuation" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DashPunctuation" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "OpenPunctuation" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ClosePunctuation" 'PrefixI 'False) (U1 :: Type -> Type))))) :+: (((C1 ('MetaCons "InitialQuote" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "FinalQuote" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "OtherPunctuation" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "MathSymbol" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CurrencySymbol" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "ModifierSymbol" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "OtherSymbol" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: (((C1 ('MetaCons "Space" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LineSeparator" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "ParagraphSeparator" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Control" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "Format" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Surrogate" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "PrivateUse" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "NotAssigned" 'PrefixI 'False) (U1 :: Type -> Type))))))

Methods

from :: GeneralCategory -> Rep GeneralCategory x

to :: Rep GeneralCategory x -> GeneralCategory

Generic ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Associated Types

type Rep ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

type Rep ShortByteString = D1 ('MetaData "ShortByteString" "Data.ByteString.Short.Internal" "bytestring-0.12.1.0-bb11" 'True) (C1 ('MetaCons "ShortByteString" 'PrefixI 'True) (S1 ('MetaSel ('Just "unShortByteString") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ByteArray)))
Generic PublicKey 
Instance details

Defined in Crypto.Sign.Ed25519

Associated Types

type Rep PublicKey 
Instance details

Defined in Crypto.Sign.Ed25519

type Rep PublicKey = D1 ('MetaData "PublicKey" "Crypto.Sign.Ed25519" "ed25519-0.0.5.0-FRF1p3xYM8EL5KxCLdRpiz" 'True) (C1 ('MetaCons "PublicKey" 'PrefixI 'True) (S1 ('MetaSel ('Just "unPublicKey") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ByteString)))

Methods

from :: PublicKey -> Rep PublicKey x

to :: Rep PublicKey x -> PublicKey

Generic SecretKey 
Instance details

Defined in Crypto.Sign.Ed25519

Associated Types

type Rep SecretKey 
Instance details

Defined in Crypto.Sign.Ed25519

type Rep SecretKey = D1 ('MetaData "SecretKey" "Crypto.Sign.Ed25519" "ed25519-0.0.5.0-FRF1p3xYM8EL5KxCLdRpiz" 'True) (C1 ('MetaCons "SecretKey" 'PrefixI 'True) (S1 ('MetaSel ('Just "unSecretKey") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ByteString)))

Methods

from :: SecretKey -> Rep SecretKey x

to :: Rep SecretKey x -> SecretKey

Generic Signature 
Instance details

Defined in Crypto.Sign.Ed25519

Associated Types

type Rep Signature 
Instance details

Defined in Crypto.Sign.Ed25519

type Rep Signature = D1 ('MetaData "Signature" "Crypto.Sign.Ed25519" "ed25519-0.0.5.0-FRF1p3xYM8EL5KxCLdRpiz" 'True) (C1 ('MetaCons "Signature" 'PrefixI 'True) (S1 ('MetaSel ('Just "unSignature") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ByteString)))

Methods

from :: Signature -> Rep Signature x

to :: Rep Signature x -> Signature

Generic OsChar 
Instance details

Defined in System.OsString.Internal.Types.Hidden

Associated Types

type Rep OsChar 
Instance details

Defined in System.OsString.Internal.Types.Hidden

type Rep OsChar = D1 ('MetaData "OsChar" "System.OsString.Internal.Types.Hidden" "filepath-1.4.301.0-b305" 'True) (C1 ('MetaCons "OsChar" 'PrefixI 'True) (S1 ('MetaSel ('Just "getOsChar") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PlatformChar)))

Methods

from :: OsChar -> Rep OsChar x

to :: Rep OsChar x -> OsChar

Generic OsString 
Instance details

Defined in System.OsString.Internal.Types.Hidden

Associated Types

type Rep OsString 
Instance details

Defined in System.OsString.Internal.Types.Hidden

type Rep OsString = D1 ('MetaData "OsString" "System.OsString.Internal.Types.Hidden" "filepath-1.4.301.0-b305" 'True) (C1 ('MetaCons "OsString" 'PrefixI 'True) (S1 ('MetaSel ('Just "getOsString") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PlatformString)))

Methods

from :: OsString -> Rep OsString x

to :: Rep OsString x -> OsString

Generic PosixChar 
Instance details

Defined in System.OsString.Internal.Types.Hidden

Associated Types

type Rep PosixChar 
Instance details

Defined in System.OsString.Internal.Types.Hidden

type Rep PosixChar = D1 ('MetaData "PosixChar" "System.OsString.Internal.Types.Hidden" "filepath-1.4.301.0-b305" 'True) (C1 ('MetaCons "PosixChar" 'PrefixI 'True) (S1 ('MetaSel ('Just "getPosixChar") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word8)))

Methods

from :: PosixChar -> Rep PosixChar x

to :: Rep PosixChar x -> PosixChar

Generic PosixString 
Instance details

Defined in System.OsString.Internal.Types.Hidden

Associated Types

type Rep PosixString 
Instance details

Defined in System.OsString.Internal.Types.Hidden

type Rep PosixString = D1 ('MetaData "PosixString" "System.OsString.Internal.Types.Hidden" "filepath-1.4.301.0-b305" 'True) (C1 ('MetaCons "PosixString" 'PrefixI 'True) (S1 ('MetaSel ('Just "getPosixString") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ShortByteString)))

Methods

from :: PosixString -> Rep PosixString x

to :: Rep PosixString x -> PosixString

Generic WindowsChar 
Instance details

Defined in System.OsString.Internal.Types.Hidden

Associated Types

type Rep WindowsChar 
Instance details

Defined in System.OsString.Internal.Types.Hidden

type Rep WindowsChar = D1 ('MetaData "WindowsChar" "System.OsString.Internal.Types.Hidden" "filepath-1.4.301.0-b305" 'True) (C1 ('MetaCons "WindowsChar" 'PrefixI 'True) (S1 ('MetaSel ('Just "getWindowsChar") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word16)))

Methods

from :: WindowsChar -> Rep WindowsChar x

to :: Rep WindowsChar x -> WindowsChar

Generic WindowsString 
Instance details

Defined in System.OsString.Internal.Types.Hidden

Associated Types

type Rep WindowsString 
Instance details

Defined in System.OsString.Internal.Types.Hidden

type Rep WindowsString = D1 ('MetaData "WindowsString" "System.OsString.Internal.Types.Hidden" "filepath-1.4.301.0-b305" 'True) (C1 ('MetaCons "WindowsString" 'PrefixI 'True) (S1 ('MetaSel ('Just "getWindowsString") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ShortByteString)))

Methods

from :: WindowsString -> Rep WindowsString x

to :: Rep WindowsString x -> WindowsString

Generic ForeignSrcLang 
Instance details

Defined in GHC.ForeignSrcLang.Type

Associated Types

type Rep ForeignSrcLang 
Instance details

Defined in GHC.ForeignSrcLang.Type

type Rep ForeignSrcLang = D1 ('MetaData "ForeignSrcLang" "GHC.ForeignSrcLang.Type" "ghc-boot-th-9.8.4-73a9" 'False) ((C1 ('MetaCons "LangC" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "LangCxx" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LangObjc" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "LangObjcxx" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LangAsm" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "LangJs" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "RawObject" 'PrefixI 'False) (U1 :: Type -> Type))))

Methods

from :: ForeignSrcLang -> Rep ForeignSrcLang x

to :: Rep ForeignSrcLang x -> ForeignSrcLang

Generic Extension 
Instance details

Defined in GHC.LanguageExtensions.Type

Associated Types

type Rep Extension 
Instance details

Defined in GHC.LanguageExtensions.Type

type Rep Extension = D1 ('MetaData "Extension" "GHC.LanguageExtensions.Type" "ghc-boot-th-9.8.4-73a9" 'False) (((((((C1 ('MetaCons "Cpp" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "OverlappingInstances" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "UndecidableInstances" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "IncoherentInstances" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "UndecidableSuperClasses" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "MonomorphismRestriction" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "MonoLocalBinds" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DeepSubsumption" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: (((C1 ('MetaCons "RelaxedPolyRec" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ExtendedDefaultRules" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "ForeignFunctionInterface" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "UnliftedFFITypes" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "InterruptibleFFI" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CApiFFI" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "GHCForeignImportPrim" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "JavaScriptFFI" 'PrefixI 'False) (U1 :: Type -> Type))))) :+: ((((C1 ('MetaCons "ParallelArrays" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Arrows" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "TemplateHaskell" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TemplateHaskellQuotes" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "QualifiedDo" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "QuasiQuotes" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "ImplicitParams" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ImplicitPrelude" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: (((C1 ('MetaCons "ScopedTypeVariables" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "AllowAmbiguousTypes" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "UnboxedTuples" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "UnboxedSums" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "UnliftedNewtypes" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "UnliftedDatatypes" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "BangPatterns" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TypeFamilies" 'PrefixI 'False) (U1 :: Type -> Type)))))) :+: (((((C1 ('MetaCons "TypeFamilyDependencies" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TypeInType" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "OverloadedStrings" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "OverloadedLists" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "NumDecimals" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DisambiguateRecordFields" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "RecordWildCards" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "NamedFieldPuns" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: (((C1 ('MetaCons "ViewPatterns" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "GADTs" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "GADTSyntax" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "NPlusKPatterns" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "DoAndIfThenElse" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "BlockArguments" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "RebindableSyntax" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ConstraintKinds" 'PrefixI 'False) (U1 :: Type -> Type))))) :+: ((((C1 ('MetaCons "PolyKinds" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DataKinds" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "TypeData" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "InstanceSigs" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "ApplicativeDo" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LinearTypes" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "StandaloneDeriving" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DeriveDataTypeable" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: (((C1 ('MetaCons "AutoDeriveTypeable" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DeriveFunctor" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "DeriveTraversable" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DeriveFoldable" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "DeriveGeneric" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DefaultSignatures" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "DeriveAnyClass" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DeriveLift" 'PrefixI 'False) (U1 :: Type -> Type))))))) :+: ((((((C1 ('MetaCons "DerivingStrategies" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DerivingVia" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "TypeSynonymInstances" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "FlexibleContexts" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "FlexibleInstances" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ConstrainedClassMethods" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "MultiParamTypeClasses" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "NullaryTypeClasses" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: (((C1 ('MetaCons "FunctionalDependencies" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "UnicodeSyntax" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "ExistentialQuantification" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "MagicHash" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "EmptyDataDecls" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "KindSignatures" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "RoleAnnotations" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ParallelListComp" 'PrefixI 'False) (U1 :: Type -> Type))))) :+: ((((C1 ('MetaCons "TransformListComp" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "MonadComprehensions" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "GeneralizedNewtypeDeriving" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "RecursiveDo" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "PostfixOperators" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TupleSections" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "PatternGuards" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LiberalTypeSynonyms" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: (((C1 ('MetaCons "RankNTypes" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ImpredicativeTypes" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "TypeOperators" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ExplicitNamespaces" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "PackageImports" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ExplicitForAll" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "AlternativeLayoutRule" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "AlternativeLayoutRuleTransitional" 'PrefixI 'False) (U1 :: Type -> Type)))))) :+: (((((C1 ('MetaCons "DatatypeContexts" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "NondecreasingIndentation" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "RelaxedLayout" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TraditionalRecordSyntax" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "LambdaCase" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "MultiWayIf" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "BinaryLiterals" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "NegativeLiterals" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: (((C1 ('MetaCons "HexFloatLiterals" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DuplicateRecordFields" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "OverloadedLabels" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "EmptyCase" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "PatternSynonyms" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PartialTypeSignatures" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "NamedWildCards" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "StaticPointers" 'PrefixI 'False) (U1 :: Type -> Type))))) :+: ((((C1 ('MetaCons "TypeApplications" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Strict" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "StrictData" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "EmptyDataDeriving" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "NumericUnderscores" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "QuantifiedConstraints" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "StarIsType" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ImportQualifiedPost" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: (((C1 ('MetaCons "CUSKs" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "StandaloneKindSignatures" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "LexicalNegation" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "FieldSelectors" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "OverloadedRecordDot" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "OverloadedRecordUpdate" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "TypeAbstractions" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ExtendedLiterals" 'PrefixI 'False) (U1 :: Type -> Type))))))))

Methods

from :: Extension -> Rep Extension x

to :: Rep Extension x -> Extension

Generic Ordering 
Instance details

Defined in GHC.Generics

Associated Types

type Rep Ordering 
Instance details

Defined in GHC.Generics

type Rep Ordering = D1 ('MetaData "Ordering" "GHC.Types" "ghc-prim" 'False) (C1 ('MetaCons "LT" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "EQ" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "GT" 'PrefixI 'False) (U1 :: Type -> Type)))

Methods

from :: Ordering -> Rep Ordering x

to :: Rep Ordering x -> Ordering

Generic Half 
Instance details

Defined in Numeric.Half.Internal

Associated Types

type Rep Half 
Instance details

Defined in Numeric.Half.Internal

type Rep Half = D1 ('MetaData "Half" "Numeric.Half.Internal" "half-0.3.2-HoEbd3b3bksKa6OEJhWBJq" 'True) (C1 ('MetaCons "Half" 'PrefixI 'True) (S1 ('MetaSel ('Just "getHalf") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 CUShort)))

Methods

from :: Half -> Rep Half x

to :: Rep Half x -> Half

Generic Dependencies 
Instance details

Defined in HiFileParser

Associated Types

type Rep Dependencies 
Instance details

Defined in HiFileParser

type Rep Dependencies = D1 ('MetaData "Dependencies" "HiFileParser" "hi-file-parser-0.1.7.0-8mgwDIJ7IuGCGgEHsfNh3Q" 'False) (C1 ('MetaCons "Dependencies" 'PrefixI 'True) ((S1 ('MetaSel ('Just "dmods") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (List (ModuleName, IsBoot))) :*: S1 ('MetaSel ('Just "dpkgs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (List (ModuleName, Bool)))) :*: (S1 ('MetaSel ('Just "dorphs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (List Module)) :*: (S1 ('MetaSel ('Just "dfinsts") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (List Module)) :*: S1 ('MetaSel ('Just "dplugins") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (List ModuleName))))))
Generic Interface 
Instance details

Defined in HiFileParser

Associated Types

type Rep Interface 
Instance details

Defined in HiFileParser

type Rep Interface = D1 ('MetaData "Interface" "HiFileParser" "hi-file-parser-0.1.7.0-8mgwDIJ7IuGCGgEHsfNh3Q" 'False) (C1 ('MetaCons "Interface" 'PrefixI 'True) (S1 ('MetaSel ('Just "deps") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Dependencies) :*: S1 ('MetaSel ('Just "usage") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (List Usage))))

Methods

from :: Interface -> Rep Interface x

to :: Rep Interface x -> Interface

Generic Condition 
Instance details

Defined in Hpack.Config

Associated Types

type Rep Condition 
Instance details

Defined in Hpack.Config

type Rep Condition = D1 ('MetaData "Condition" "Hpack.Config" "hpack-0.37.0-6QOqTVj8oRKEq9TILTOany" 'True) (C1 ('MetaCons "Condition" 'PrefixI 'True) (S1 ('MetaSel ('Just "conditionCondition") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Cond)))

Methods

from :: Condition -> Rep Condition x

to :: Rep Condition x -> Condition

Generic CustomSetupSection 
Instance details

Defined in Hpack.Config

Associated Types

type Rep CustomSetupSection 
Instance details

Defined in Hpack.Config

type Rep CustomSetupSection = D1 ('MetaData "CustomSetupSection" "Hpack.Config" "hpack-0.37.0-6QOqTVj8oRKEq9TILTOany" 'False) (C1 ('MetaCons "CustomSetupSection" 'PrefixI 'True) (S1 ('MetaSel ('Just "customSetupSectionDependencies") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Dependencies))))

Methods

from :: CustomSetupSection -> Rep CustomSetupSection x

to :: Rep CustomSetupSection x -> CustomSetupSection

Generic DefaultsConfig 
Instance details

Defined in Hpack.Config

Associated Types

type Rep DefaultsConfig 
Instance details

Defined in Hpack.Config

type Rep DefaultsConfig = D1 ('MetaData "DefaultsConfig" "Hpack.Config" "hpack-0.37.0-6QOqTVj8oRKEq9TILTOany" 'False) (C1 ('MetaCons "DefaultsConfig" 'PrefixI 'True) (S1 ('MetaSel ('Just "defaultsConfigDefaults") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (List Defaults)))))

Methods

from :: DefaultsConfig -> Rep DefaultsConfig x

to :: Rep DefaultsConfig x -> DefaultsConfig

Generic ExecutableSection 
Instance details

Defined in Hpack.Config

Associated Types

type Rep ExecutableSection 
Instance details

Defined in Hpack.Config

type Rep ExecutableSection = D1 ('MetaData "ExecutableSection" "Hpack.Config" "hpack-0.37.0-6QOqTVj8oRKEq9TILTOany" 'False) (C1 ('MetaCons "ExecutableSection" 'PrefixI 'True) (S1 ('MetaSel ('Just "executableSectionMain") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Alias 'True "main-is" (Last FilePath))) :*: (S1 ('MetaSel ('Just "executableSectionOtherModules") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (List Module))) :*: S1 ('MetaSel ('Just "executableSectionGeneratedOtherModules") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (List Module))))))

Methods

from :: ExecutableSection -> Rep ExecutableSection x

to :: Rep ExecutableSection x -> ExecutableSection

Generic FlagSection 
Instance details

Defined in Hpack.Config

Associated Types

type Rep FlagSection 
Instance details

Defined in Hpack.Config

type Rep FlagSection = D1 ('MetaData "FlagSection" "Hpack.Config" "hpack-0.37.0-6QOqTVj8oRKEq9TILTOany" 'False) (C1 ('MetaCons "FlagSection" 'PrefixI 'True) (S1 ('MetaSel ('Just "_flagSectionDescription") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe String)) :*: (S1 ('MetaSel ('Just "_flagSectionManual") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "_flagSectionDefault") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool))))

Methods

from :: FlagSection -> Rep FlagSection x

to :: Rep FlagSection x -> FlagSection

Generic LibrarySection 
Instance details

Defined in Hpack.Config

Associated Types

type Rep LibrarySection 
Instance details

Defined in Hpack.Config

type Rep LibrarySection = D1 ('MetaData "LibrarySection" "Hpack.Config" "hpack-0.37.0-6QOqTVj8oRKEq9TILTOany" 'False) (C1 ('MetaCons "LibrarySection" 'PrefixI 'True) (((S1 ('MetaSel ('Just "librarySectionExposed") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Bool)) :*: S1 ('MetaSel ('Just "librarySectionVisibility") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe String))) :*: (S1 ('MetaSel ('Just "librarySectionExposedModules") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (List Module))) :*: S1 ('MetaSel ('Just "librarySectionGeneratedExposedModules") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (List Module))))) :*: ((S1 ('MetaSel ('Just "librarySectionOtherModules") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (List Module))) :*: S1 ('MetaSel ('Just "librarySectionGeneratedOtherModules") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (List Module)))) :*: (S1 ('MetaSel ('Just "librarySectionReexportedModules") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (List String))) :*: S1 ('MetaSel ('Just "librarySectionSignatures") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (List String)))))))

Methods

from :: LibrarySection -> Rep LibrarySection x

to :: Rep LibrarySection x -> LibrarySection

Generic Local 
Instance details

Defined in Hpack.Syntax.Defaults

Associated Types

type Rep Local 
Instance details

Defined in Hpack.Syntax.Defaults

type Rep Local = D1 ('MetaData "Local" "Hpack.Syntax.Defaults" "hpack-0.37.0-6QOqTVj8oRKEq9TILTOany" 'False) (C1 ('MetaCons "Local" 'PrefixI 'True) (S1 ('MetaSel ('Just "localLocal") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String)))

Methods

from :: Local -> Rep Local x

to :: Rep Local x -> Local

Generic ParseGithub 
Instance details

Defined in Hpack.Syntax.Defaults

Associated Types

type Rep ParseGithub 
Instance details

Defined in Hpack.Syntax.Defaults

type Rep ParseGithub = D1 ('MetaData "ParseGithub" "Hpack.Syntax.Defaults" "hpack-0.37.0-6QOqTVj8oRKEq9TILTOany" 'False) (C1 ('MetaCons "ParseGithub" 'PrefixI 'True) (S1 ('MetaSel ('Just "parseGithubGithub") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 GithubRepo) :*: (S1 ('MetaSel ('Just "parseGithubRef") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Ref) :*: S1 ('MetaSel ('Just "parseGithubPath") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Path)))))

Methods

from :: ParseGithub -> Rep ParseGithub x

to :: Rep ParseGithub x -> ParseGithub

Generic Tix 
Instance details

Defined in Trace.Hpc.Tix

Associated Types

type Rep Tix 
Instance details

Defined in Trace.Hpc.Tix

type Rep Tix = D1 ('MetaData "Tix" "Trace.Hpc.Tix" "hpc-0.7.0.0-df22" 'False) (C1 ('MetaCons "Tix" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [TixModule])))

Methods

from :: Tix -> Rep Tix x

to :: Rep Tix x -> Tix

Generic TixModule 
Instance details

Defined in Trace.Hpc.Tix

Associated Types

type Rep TixModule 
Instance details

Defined in Trace.Hpc.Tix

type Rep TixModule = D1 ('MetaData "TixModule" "Trace.Hpc.Tix" "hpc-0.7.0.0-df22" 'False) (C1 ('MetaCons "TixModule" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Hash)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Integer]))))

Methods

from :: TixModule -> Rep TixModule x

to :: Rep TixModule x -> TixModule

Generic Hash 
Instance details

Defined in Trace.Hpc.Util

Associated Types

type Rep Hash 
Instance details

Defined in Trace.Hpc.Util

type Rep Hash = D1 ('MetaData "Hash" "Trace.Hpc.Util" "hpc-0.7.0.0-df22" 'True) (C1 ('MetaCons "Hash" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word32)))

Methods

from :: Hash -> Rep Hash x

to :: Rep Hash x -> Hash

Generic ByteRange 
Instance details

Defined in Network.HTTP.Types.Header

Associated Types

type Rep ByteRange 
Instance details

Defined in Network.HTTP.Types.Header

type Rep ByteRange = D1 ('MetaData "ByteRange" "Network.HTTP.Types.Header" "http-types-0.12.4-J8X25gqCRiAEkxsW0y4qRr" 'False) (C1 ('MetaCons "ByteRangeFrom" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Integer)) :+: (C1 ('MetaCons "ByteRangeFromTo" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Integer) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Integer)) :+: C1 ('MetaCons "ByteRangeSuffix" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Integer))))

Methods

from :: ByteRange -> Rep ByteRange x

to :: Rep ByteRange x -> ByteRange

Generic StdMethod 
Instance details

Defined in Network.HTTP.Types.Method

Associated Types

type Rep StdMethod 
Instance details

Defined in Network.HTTP.Types.Method

type Rep StdMethod = D1 ('MetaData "StdMethod" "Network.HTTP.Types.Method" "http-types-0.12.4-J8X25gqCRiAEkxsW0y4qRr" 'False) (((C1 ('MetaCons "GET" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "POST" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "HEAD" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PUT" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "DELETE" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TRACE" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "CONNECT" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "OPTIONS" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PATCH" 'PrefixI 'False) (U1 :: Type -> Type)))))

Methods

from :: StdMethod -> Rep StdMethod x

to :: Rep StdMethod x -> StdMethod

Generic Status 
Instance details

Defined in Network.HTTP.Types.Status

Associated Types

type Rep Status 
Instance details

Defined in Network.HTTP.Types.Status

type Rep Status = D1 ('MetaData "Status" "Network.HTTP.Types.Status" "http-types-0.12.4-J8X25gqCRiAEkxsW0y4qRr" 'False) (C1 ('MetaCons "Status" 'PrefixI 'True) (S1 ('MetaSel ('Just "statusCode") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int) :*: S1 ('MetaSel ('Just "statusMessage") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ByteString)))

Methods

from :: Status -> Rep Status x

to :: Rep Status x -> Status

Generic HttpVersion 
Instance details

Defined in Network.HTTP.Types.Version

Associated Types

type Rep HttpVersion 
Instance details

Defined in Network.HTTP.Types.Version

type Rep HttpVersion = D1 ('MetaData "HttpVersion" "Network.HTTP.Types.Version" "http-types-0.12.4-J8X25gqCRiAEkxsW0y4qRr" 'False) (C1 ('MetaCons "HttpVersion" 'PrefixI 'True) (S1 ('MetaSel ('Just "httpMajor") 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Int) :*: S1 ('MetaSel ('Just "httpMinor") 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Int)))

Methods

from :: HttpVersion -> Rep HttpVersion x

to :: Rep HttpVersion x -> HttpVersion

Generic IP 
Instance details

Defined in Data.IP.Addr

Associated Types

type Rep IP 
Instance details

Defined in Data.IP.Addr

type Rep IP = D1 ('MetaData "IP" "Data.IP.Addr" "iproute-1.7.15-JZpWeHuH1mR314TowNK9ks" 'False) (C1 ('MetaCons "IPv4" 'PrefixI 'True) (S1 ('MetaSel ('Just "ipv4") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedUnpack) (Rec0 IPv4)) :+: C1 ('MetaCons "IPv6" 'PrefixI 'True) (S1 ('MetaSel ('Just "ipv6") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 IPv6)))

Methods

from :: IP -> Rep IP x

to :: Rep IP x -> IP

Generic IPv4 
Instance details

Defined in Data.IP.Addr

Associated Types

type Rep IPv4 
Instance details

Defined in Data.IP.Addr

type Rep IPv4 = D1 ('MetaData "IPv4" "Data.IP.Addr" "iproute-1.7.15-JZpWeHuH1mR314TowNK9ks" 'True) (C1 ('MetaCons "IP4" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 IPv4Addr)))

Methods

from :: IPv4 -> Rep IPv4 x

to :: Rep IPv4 x -> IPv4

Generic IPv6 
Instance details

Defined in Data.IP.Addr

Associated Types

type Rep IPv6 
Instance details

Defined in Data.IP.Addr

type Rep IPv6 = D1 ('MetaData "IPv6" "Data.IP.Addr" "iproute-1.7.15-JZpWeHuH1mR314TowNK9ks" 'True) (C1 ('MetaCons "IP6" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 IPv6Addr)))

Methods

from :: IPv6 -> Rep IPv6 x

to :: Rep IPv6 x -> IPv6

Generic IPRange 
Instance details

Defined in Data.IP.Range

Associated Types

type Rep IPRange 
Instance details

Defined in Data.IP.Range

type Rep IPRange = D1 ('MetaData "IPRange" "Data.IP.Range" "iproute-1.7.15-JZpWeHuH1mR314TowNK9ks" 'False) (C1 ('MetaCons "IPv4Range" 'PrefixI 'True) (S1 ('MetaSel ('Just "ipv4range") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (AddrRange IPv4))) :+: C1 ('MetaCons "IPv6Range" 'PrefixI 'True) (S1 ('MetaSel ('Just "ipv6range") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (AddrRange IPv6))))

Methods

from :: IPRange -> Rep IPRange x

to :: Rep IPRange x -> IPRange

Generic URI 
Instance details

Defined in Network.URI

Associated Types

type Rep URI 
Instance details

Defined in Network.URI

type Rep URI = D1 ('MetaData "URI" "Network.URI" "network-uri-2.6.4.2-F2UsnxbDK7BH8XhFY5000P" 'False) (C1 ('MetaCons "URI" 'PrefixI 'True) ((S1 ('MetaSel ('Just "uriScheme") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String) :*: S1 ('MetaSel ('Just "uriAuthority") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe URIAuth))) :*: (S1 ('MetaSel ('Just "uriPath") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String) :*: (S1 ('MetaSel ('Just "uriQuery") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String) :*: S1 ('MetaSel ('Just "uriFragment") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String)))))

Methods

from :: URI -> Rep URI x

to :: Rep URI x -> URI

Generic URIAuth 
Instance details

Defined in Network.URI

Associated Types

type Rep URIAuth 
Instance details

Defined in Network.URI

type Rep URIAuth = D1 ('MetaData "URIAuth" "Network.URI" "network-uri-2.6.4.2-F2UsnxbDK7BH8XhFY5000P" 'False) (C1 ('MetaCons "URIAuth" 'PrefixI 'True) (S1 ('MetaSel ('Just "uriUserInfo") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String) :*: (S1 ('MetaSel ('Just "uriRegName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String) :*: S1 ('MetaSel ('Just "uriPort") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String))))

Methods

from :: URIAuth -> Rep URIAuth x

to :: Rep URIAuth x -> URIAuth

Generic OsChar 
Instance details

Defined in System.OsString.Internal.Types

Associated Types

type Rep OsChar 
Instance details

Defined in System.OsString.Internal.Types

type Rep OsChar = D1 ('MetaData "OsChar" "System.OsString.Internal.Types" "os-string-2.0.7-LjoE4uZSBZ73BbdeBYQJa6" 'True) (C1 ('MetaCons "OsChar" 'PrefixI 'True) (S1 ('MetaSel ('Just "getOsChar") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PlatformChar)))

Methods

from :: OsChar -> Rep OsChar x

to :: Rep OsChar x -> OsChar

Generic OsString 
Instance details

Defined in System.OsString.Internal.Types

Associated Types

type Rep OsString 
Instance details

Defined in System.OsString.Internal.Types

type Rep OsString = D1 ('MetaData "OsString" "System.OsString.Internal.Types" "os-string-2.0.7-LjoE4uZSBZ73BbdeBYQJa6" 'True) (C1 ('MetaCons "OsString" 'PrefixI 'True) (S1 ('MetaSel ('Just "getOsString") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PlatformString)))

Methods

from :: OsString -> Rep OsString x

to :: Rep OsString x -> OsString

Generic PosixChar 
Instance details

Defined in System.OsString.Internal.Types

Associated Types

type Rep PosixChar 
Instance details

Defined in System.OsString.Internal.Types

type Rep PosixChar = D1 ('MetaData "PosixChar" "System.OsString.Internal.Types" "os-string-2.0.7-LjoE4uZSBZ73BbdeBYQJa6" 'True) (C1 ('MetaCons "PosixChar" 'PrefixI 'True) (S1 ('MetaSel ('Just "getPosixChar") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word8)))

Methods

from :: PosixChar -> Rep PosixChar x

to :: Rep PosixChar x -> PosixChar

Generic PosixString 
Instance details

Defined in System.OsString.Internal.Types

Associated Types

type Rep PosixString 
Instance details

Defined in System.OsString.Internal.Types

type Rep PosixString = D1 ('MetaData "PosixString" "System.OsString.Internal.Types" "os-string-2.0.7-LjoE4uZSBZ73BbdeBYQJa6" 'True) (C1 ('MetaCons "PosixString" 'PrefixI 'True) (S1 ('MetaSel ('Just "getPosixString") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ShortByteString)))

Methods

from :: PosixString -> Rep PosixString x

to :: Rep PosixString x -> PosixString

Generic WindowsChar 
Instance details

Defined in System.OsString.Internal.Types

Associated Types

type Rep WindowsChar 
Instance details

Defined in System.OsString.Internal.Types

type Rep WindowsChar = D1 ('MetaData "WindowsChar" "System.OsString.Internal.Types" "os-string-2.0.7-LjoE4uZSBZ73BbdeBYQJa6" 'True) (C1 ('MetaCons "WindowsChar" 'PrefixI 'True) (S1 ('MetaSel ('Just "getWindowsChar") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word16)))

Methods

from :: WindowsChar -> Rep WindowsChar x

to :: Rep WindowsChar x -> WindowsChar

Generic WindowsString 
Instance details

Defined in System.OsString.Internal.Types

Associated Types

type Rep WindowsString 
Instance details

Defined in System.OsString.Internal.Types

type Rep WindowsString = D1 ('MetaData "WindowsString" "System.OsString.Internal.Types" "os-string-2.0.7-LjoE4uZSBZ73BbdeBYQJa6" 'True) (C1 ('MetaCons "WindowsString" 'PrefixI 'True) (S1 ('MetaSel ('Just "getWindowsString") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ShortByteString)))

Methods

from :: WindowsString -> Rep WindowsString x

to :: Rep WindowsString x -> WindowsString

Generic SHA256 
Instance details

Defined in Pantry.SHA256

Associated Types

type Rep SHA256 
Instance details

Defined in Pantry.SHA256

type Rep SHA256 = D1 ('MetaData "SHA256" "Pantry.SHA256" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'True) (C1 ('MetaCons "SHA256" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bytes32)))

Methods

from :: SHA256 -> Rep SHA256 x

to :: Rep SHA256 x -> SHA256

Generic AggregateRepo 
Instance details

Defined in Pantry.Types

Associated Types

type Rep AggregateRepo 
Instance details

Defined in Pantry.Types

type Rep AggregateRepo = D1 ('MetaData "AggregateRepo" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "AggregateRepo" 'PrefixI 'True) (S1 ('MetaSel ('Just "aRepo") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SimpleRepo) :*: S1 ('MetaSel ('Just "aRepoSubdirs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(Text, RawPackageMetadata)])))

Methods

from :: AggregateRepo -> Rep AggregateRepo x

to :: Rep AggregateRepo x -> AggregateRepo

Generic Archive 
Instance details

Defined in Pantry.Types

Associated Types

type Rep Archive 
Instance details

Defined in Pantry.Types

type Rep Archive = D1 ('MetaData "Archive" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "Archive" 'PrefixI 'True) ((S1 ('MetaSel ('Just "archiveLocation") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 ArchiveLocation) :*: S1 ('MetaSel ('Just "archiveHash") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SHA256)) :*: (S1 ('MetaSel ('Just "archiveSize") 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 FileSize) :*: S1 ('MetaSel ('Just "archiveSubdir") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text))))

Methods

from :: Archive -> Rep Archive x

to :: Rep Archive x -> Archive

Generic ArchiveLocation 
Instance details

Defined in Pantry.Types

Associated Types

type Rep ArchiveLocation 
Instance details

Defined in Pantry.Types

type Rep ArchiveLocation = D1 ('MetaData "ArchiveLocation" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "ALUrl" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text)) :+: C1 ('MetaCons "ALFilePath" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (ResolvedPath File))))
Generic BlobKey 
Instance details

Defined in Pantry.Types

Associated Types

type Rep BlobKey 
Instance details

Defined in Pantry.Types

type Rep BlobKey = D1 ('MetaData "BlobKey" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "BlobKey" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SHA256) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 FileSize)))

Methods

from :: BlobKey -> Rep BlobKey x

to :: Rep BlobKey x -> BlobKey

Generic CabalFileInfo 
Instance details

Defined in Pantry.Types

Associated Types

type Rep CabalFileInfo 
Instance details

Defined in Pantry.Types

type Rep CabalFileInfo = D1 ('MetaData "CabalFileInfo" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "CFILatest" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "CFIHash" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SHA256) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe FileSize))) :+: C1 ('MetaCons "CFIRevision" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Revision))))
Generic FileSize 
Instance details

Defined in Pantry.Types

Associated Types

type Rep FileSize 
Instance details

Defined in Pantry.Types

type Rep FileSize = D1 ('MetaData "FileSize" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'True) (C1 ('MetaCons "FileSize" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word)))

Methods

from :: FileSize -> Rep FileSize x

to :: Rep FileSize x -> FileSize

Generic GlobalHintsLocation 
Instance details

Defined in Pantry.Types

Associated Types

type Rep GlobalHintsLocation 
Instance details

Defined in Pantry.Types

type Rep GlobalHintsLocation = D1 ('MetaData "GlobalHintsLocation" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "GHLUrl" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text)) :+: C1 ('MetaCons "GHLFilePath" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (ResolvedPath File))))
Generic OptionalSubdirs 
Instance details

Defined in Pantry.Types

Associated Types

type Rep OptionalSubdirs 
Instance details

Defined in Pantry.Types

type Rep OptionalSubdirs = D1 ('MetaData "OptionalSubdirs" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "OSSubdirs" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (NonEmpty Text))) :+: C1 ('MetaCons "OSPackageMetadata" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 RawPackageMetadata)))

Methods

from :: OptionalSubdirs -> Rep OptionalSubdirs x

to :: Rep OptionalSubdirs x -> OptionalSubdirs

Generic PackageIdentifierRevision 
Instance details

Defined in Pantry.Types

Associated Types

type Rep PackageIdentifierRevision 
Instance details

Defined in Pantry.Types

type Rep PackageIdentifierRevision = D1 ('MetaData "PackageIdentifierRevision" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "PackageIdentifierRevision" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 PackageName) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Version) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 CabalFileInfo))))
Generic PackageLocation 
Instance details

Defined in Pantry.Types

Associated Types

type Rep PackageLocation 
Instance details

Defined in Pantry.Types

type Rep PackageLocation = D1 ('MetaData "PackageLocation" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "PLImmutable" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 PackageLocationImmutable)) :+: C1 ('MetaCons "PLMutable" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (ResolvedPath Dir))))
Generic PackageLocationImmutable 
Instance details

Defined in Pantry.Types

Associated Types

type Rep PackageLocationImmutable 
Instance details

Defined in Pantry.Types

type Rep PackageLocationImmutable = D1 ('MetaData "PackageLocationImmutable" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "PLIHackage" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 PackageIdentifier) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 BlobKey) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 TreeKey))) :+: (C1 ('MetaCons "PLIArchive" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Archive) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 PackageMetadata)) :+: C1 ('MetaCons "PLIRepo" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Repo) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 PackageMetadata))))
Generic PackageMetadata 
Instance details

Defined in Pantry.Types

Associated Types

type Rep PackageMetadata 
Instance details

Defined in Pantry.Types

type Rep PackageMetadata = D1 ('MetaData "PackageMetadata" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "PackageMetadata" 'PrefixI 'True) (S1 ('MetaSel ('Just "pmIdent") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 PackageIdentifier) :*: S1 ('MetaSel ('Just "pmTreeKey") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 TreeKey)))
Generic RawArchive 
Instance details

Defined in Pantry.Types

Associated Types

type Rep RawArchive 
Instance details

Defined in Pantry.Types

type Rep RawArchive = D1 ('MetaData "RawArchive" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "RawArchive" 'PrefixI 'True) ((S1 ('MetaSel ('Just "raLocation") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 ArchiveLocation) :*: S1 ('MetaSel ('Just "raHash") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe SHA256))) :*: (S1 ('MetaSel ('Just "raSize") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe FileSize)) :*: S1 ('MetaSel ('Just "raSubdir") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text))))

Methods

from :: RawArchive -> Rep RawArchive x

to :: Rep RawArchive x -> RawArchive

Generic RawPackageLocation 
Instance details

Defined in Pantry.Types

Associated Types

type Rep RawPackageLocation 
Instance details

Defined in Pantry.Types

type Rep RawPackageLocation = D1 ('MetaData "RawPackageLocation" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "RPLImmutable" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 RawPackageLocationImmutable)) :+: C1 ('MetaCons "RPLMutable" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (ResolvedPath Dir))))
Generic RawPackageLocationImmutable 
Instance details

Defined in Pantry.Types

Associated Types

type Rep RawPackageLocationImmutable 
Instance details

Defined in Pantry.Types

type Rep RawPackageLocationImmutable = D1 ('MetaData "RawPackageLocationImmutable" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "RPLIHackage" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 PackageIdentifierRevision) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe TreeKey))) :+: (C1 ('MetaCons "RPLIArchive" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 RawArchive) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 RawPackageMetadata)) :+: C1 ('MetaCons "RPLIRepo" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Repo) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 RawPackageMetadata))))
Generic RawPackageMetadata 
Instance details

Defined in Pantry.Types

Associated Types

type Rep RawPackageMetadata 
Instance details

Defined in Pantry.Types

type Rep RawPackageMetadata = D1 ('MetaData "RawPackageMetadata" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "RawPackageMetadata" 'PrefixI 'True) (S1 ('MetaSel ('Just "rpmName") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe PackageName)) :*: (S1 ('MetaSel ('Just "rpmVersion") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe Version)) :*: S1 ('MetaSel ('Just "rpmTreeKey") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe TreeKey)))))
Generic RawSnapshotLayer 
Instance details

Defined in Pantry.Types

Associated Types

type Rep RawSnapshotLayer 
Instance details

Defined in Pantry.Types

type Rep RawSnapshotLayer = D1 ('MetaData "RawSnapshotLayer" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "RawSnapshotLayer" 'PrefixI 'True) (((S1 ('MetaSel ('Just "rslParent") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 RawSnapshotLocation) :*: S1 ('MetaSel ('Just "rslCompiler") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe WantedCompiler))) :*: (S1 ('MetaSel ('Just "rslLocations") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 [RawPackageLocationImmutable]) :*: S1 ('MetaSel ('Just "rslDropPackages") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Set PackageName)))) :*: ((S1 ('MetaSel ('Just "rslFlags") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Map PackageName (Map FlagName Bool))) :*: S1 ('MetaSel ('Just "rslHidden") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Map PackageName Bool))) :*: (S1 ('MetaSel ('Just "rslGhcOptions") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Map PackageName [Text])) :*: S1 ('MetaSel ('Just "rslPublishTime") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe UTCTime))))))
Generic RawSnapshotLocation 
Instance details

Defined in Pantry.Types

Associated Types

type Rep RawSnapshotLocation 
Instance details

Defined in Pantry.Types

type Rep RawSnapshotLocation = D1 ('MetaData "RawSnapshotLocation" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) ((C1 ('MetaCons "RSLCompiler" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 WantedCompiler)) :+: C1 ('MetaCons "RSLUrl" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe BlobKey)))) :+: (C1 ('MetaCons "RSLFilePath" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (ResolvedPath File))) :+: C1 ('MetaCons "RSLSynonym" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SnapName))))
Generic RelFilePath 
Instance details

Defined in Pantry.Types

Associated Types

type Rep RelFilePath 
Instance details

Defined in Pantry.Types

type Rep RelFilePath = D1 ('MetaData "RelFilePath" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'True) (C1 ('MetaCons "RelFilePath" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

Methods

from :: RelFilePath -> Rep RelFilePath x

to :: Rep RelFilePath x -> RelFilePath

Generic Repo 
Instance details

Defined in Pantry.Types

Associated Types

type Rep Repo 
Instance details

Defined in Pantry.Types

type Rep Repo = D1 ('MetaData "Repo" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "Repo" 'PrefixI 'True) ((S1 ('MetaSel ('Just "repoUrl") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Just "repoCommit") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text)) :*: (S1 ('MetaSel ('Just "repoType") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 RepoType) :*: S1 ('MetaSel ('Just "repoSubdir") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text))))

Methods

from :: Repo -> Rep Repo x

to :: Rep Repo x -> Repo

Generic RepoType 
Instance details

Defined in Pantry.Types

Associated Types

type Rep RepoType 
Instance details

Defined in Pantry.Types

type Rep RepoType = D1 ('MetaData "RepoType" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "RepoGit" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "RepoHg" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: RepoType -> Rep RepoType x

to :: Rep RepoType x -> RepoType

Generic Revision 
Instance details

Defined in Pantry.Types

Associated Types

type Rep Revision 
Instance details

Defined in Pantry.Types

type Rep Revision = D1 ('MetaData "Revision" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'True) (C1 ('MetaCons "Revision" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word)))

Methods

from :: Revision -> Rep Revision x

to :: Rep Revision x -> Revision

Generic SimpleRepo 
Instance details

Defined in Pantry.Types

Associated Types

type Rep SimpleRepo 
Instance details

Defined in Pantry.Types

type Rep SimpleRepo = D1 ('MetaData "SimpleRepo" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "SimpleRepo" 'PrefixI 'True) (S1 ('MetaSel ('Just "sRepoUrl") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text) :*: (S1 ('MetaSel ('Just "sRepoCommit") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Just "sRepoType") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 RepoType))))

Methods

from :: SimpleRepo -> Rep SimpleRepo x

to :: Rep SimpleRepo x -> SimpleRepo

Generic SnapName 
Instance details

Defined in Pantry.Types

Associated Types

type Rep SnapName 
Instance details

Defined in Pantry.Types

type Rep SnapName = D1 ('MetaData "SnapName" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "LTS" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Int) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Int)) :+: C1 ('MetaCons "Nightly" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Day)))

Methods

from :: SnapName -> Rep SnapName x

to :: Rep SnapName x -> SnapName

Generic SnapshotLayer 
Instance details

Defined in Pantry.Types

Associated Types

type Rep SnapshotLayer 
Instance details

Defined in Pantry.Types

type Rep SnapshotLayer = D1 ('MetaData "SnapshotLayer" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "SnapshotLayer" 'PrefixI 'True) (((S1 ('MetaSel ('Just "slParent") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SnapshotLocation) :*: S1 ('MetaSel ('Just "slCompiler") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe WantedCompiler))) :*: (S1 ('MetaSel ('Just "slLocations") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 [PackageLocationImmutable]) :*: S1 ('MetaSel ('Just "slDropPackages") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Set PackageName)))) :*: ((S1 ('MetaSel ('Just "slFlags") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Map PackageName (Map FlagName Bool))) :*: S1 ('MetaSel ('Just "slHidden") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Map PackageName Bool))) :*: (S1 ('MetaSel ('Just "slGhcOptions") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Map PackageName [Text])) :*: S1 ('MetaSel ('Just "slPublishTime") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe UTCTime))))))
Generic SnapshotLocation 
Instance details

Defined in Pantry.Types

Associated Types

type Rep SnapshotLocation 
Instance details

Defined in Pantry.Types

type Rep SnapshotLocation = D1 ('MetaData "SnapshotLocation" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "SLCompiler" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 WantedCompiler)) :+: (C1 ('MetaCons "SLUrl" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 BlobKey)) :+: C1 ('MetaCons "SLFilePath" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (ResolvedPath File)))))
Generic TreeKey 
Instance details

Defined in Pantry.Types

Associated Types

type Rep TreeKey 
Instance details

Defined in Pantry.Types

type Rep TreeKey = D1 ('MetaData "TreeKey" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'True) (C1 ('MetaCons "TreeKey" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 BlobKey)))

Methods

from :: TreeKey -> Rep TreeKey x

to :: Rep TreeKey x -> TreeKey

Generic WantedCompiler 
Instance details

Defined in Pantry.Types

Associated Types

type Rep WantedCompiler 
Instance details

Defined in Pantry.Types

type Rep WantedCompiler = D1 ('MetaData "WantedCompiler" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "WCGhc" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Version)) :+: (C1 ('MetaCons "WCGhcGit" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text)) :+: C1 ('MetaCons "WCGhcjs" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Version) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Version))))
Generic Mode 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Associated Types

type Rep Mode 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

type Rep Mode = D1 ('MetaData "Mode" "Text.PrettyPrint.Annotated.HughesPJ" "pretty-1.1.3.6-b6ac" 'False) ((C1 ('MetaCons "PageMode" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ZigZagMode" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "LeftMode" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "OneLineMode" 'PrefixI 'False) (U1 :: Type -> Type)))

Methods

from :: Mode -> Rep Mode x

to :: Rep Mode x -> Mode

Generic Style 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Associated Types

type Rep Style 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

type Rep Style = D1 ('MetaData "Style" "Text.PrettyPrint.Annotated.HughesPJ" "pretty-1.1.3.6-b6ac" 'False) (C1 ('MetaCons "Style" 'PrefixI 'True) (S1 ('MetaSel ('Just "mode") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Mode) :*: (S1 ('MetaSel ('Just "lineLength") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int) :*: S1 ('MetaSel ('Just "ribbonsPerLine") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Float))))

Methods

from :: Style -> Rep Style x

to :: Rep Style x -> Style

Generic TextDetails 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Associated Types

type Rep TextDetails 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

type Rep TextDetails = D1 ('MetaData "TextDetails" "Text.PrettyPrint.Annotated.HughesPJ" "pretty-1.1.3.6-b6ac" 'False) (C1 ('MetaCons "Chr" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'SourceUnpack 'SourceStrict 'DecidedUnpack) (Rec0 Char)) :+: (C1 ('MetaCons "Str" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String)) :+: C1 ('MetaCons "PStr" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String))))

Methods

from :: TextDetails -> Rep TextDetails x

to :: Rep TextDetails x -> TextDetails

Generic Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Associated Types

type Rep Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

type Rep Doc = D1 ('MetaData "Doc" "Text.PrettyPrint.HughesPJ" "pretty-1.1.3.6-b6ac" 'True) (C1 ('MetaCons "Doc" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Doc ()))))

Methods

from :: Doc -> Rep Doc x

to :: Rep Doc x -> Doc

Generic RetryAction 
Instance details

Defined in Control.Retry

Associated Types

type Rep RetryAction 
Instance details

Defined in Control.Retry

type Rep RetryAction = D1 ('MetaData "RetryAction" "Control.Retry" "retry-0.9.3.1-8QnXSPNZP3HA82iRKiPMJ0" 'False) (C1 ('MetaCons "DontRetry" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "ConsultPolicy" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ConsultPolicyOverrideDelay" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int))))

Methods

from :: RetryAction -> Rep RetryAction x

to :: Rep RetryAction x -> RetryAction

Generic RetryStatus 
Instance details

Defined in Control.Retry

Associated Types

type Rep RetryStatus 
Instance details

Defined in Control.Retry

type Rep RetryStatus = D1 ('MetaData "RetryStatus" "Control.Retry" "retry-0.9.3.1-8QnXSPNZP3HA82iRKiPMJ0" 'False) (C1 ('MetaCons "RetryStatus" 'PrefixI 'True) (S1 ('MetaSel ('Just "rsIterNumber") 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Int) :*: (S1 ('MetaSel ('Just "rsCumulativeDelay") 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Int) :*: S1 ('MetaSel ('Just "rsPreviousDelay") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe Int)))))

Methods

from :: RetryStatus -> Rep RetryStatus x

to :: Rep RetryStatus x -> RetryStatus

Generic AllowNewerDeps Source # 
Instance details

Defined in Stack.Types.AllowNewerDeps

Associated Types

type Rep AllowNewerDeps 
Instance details

Defined in Stack.Types.AllowNewerDeps

type Rep AllowNewerDeps = D1 ('MetaData "AllowNewerDeps" "Stack.Types.AllowNewerDeps" "stack-3.1.1-Jkd8kxrin7nLuuv5NJBnEC" 'True) (C1 ('MetaCons "AllowNewerDeps" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [PackageName])))
Generic BuildCache Source # 
Instance details

Defined in Stack.Types.Build

Associated Types

type Rep BuildCache 
Instance details

Defined in Stack.Types.Build

type Rep BuildCache = D1 ('MetaData "BuildCache" "Stack.Types.Build" "stack-3.1.1-Jkd8kxrin7nLuuv5NJBnEC" 'True) (C1 ('MetaCons "BuildCache" 'PrefixI 'True) (S1 ('MetaSel ('Just "times") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Map FilePath FileCacheInfo))))

Methods

from :: BuildCache -> Rep BuildCache x

to :: Rep BuildCache x -> BuildCache

Generic CachePkgSrc Source # 
Instance details

Defined in Stack.Types.Build

Associated Types

type Rep CachePkgSrc 
Instance details

Defined in Stack.Types.Build

type Rep CachePkgSrc = D1 ('MetaData "CachePkgSrc" "Stack.Types.Build" "stack-3.1.1-Jkd8kxrin7nLuuv5NJBnEC" 'False) (C1 ('MetaCons "CacheSrcUpstream" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CacheSrcLocal" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FilePath)))

Methods

from :: CachePkgSrc -> Rep CachePkgSrc x

to :: Rep CachePkgSrc x -> CachePkgSrc

Generic ConfigCache Source # 
Instance details

Defined in Stack.Types.Build

Associated Types

type Rep ConfigCache 
Instance details

Defined in Stack.Types.Build

type Rep ConfigCache = D1 ('MetaData "ConfigCache" "Stack.Types.Build" "stack-3.1.1-Jkd8kxrin7nLuuv5NJBnEC" 'False) (C1 ('MetaCons "ConfigCache" 'PrefixI 'True) ((S1 ('MetaSel ('Just "configureOpts") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 ConfigureOpts) :*: (S1 ('MetaSel ('Just "deps") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Set GhcPkgId)) :*: S1 ('MetaSel ('Just "components") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Set ByteString)))) :*: (S1 ('MetaSel ('Just "buildHaddocks") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Bool) :*: (S1 ('MetaSel ('Just "pkgSrc") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 CachePkgSrc) :*: S1 ('MetaSel ('Just "pathEnvVar") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text)))))

Methods

from :: ConfigCache -> Rep ConfigCache x

to :: Rep ConfigCache x -> ConfigCache

Generic W Source # 
Instance details

Defined in Stack.Types.Build.ConstructPlan

Associated Types

type Rep W 
Instance details

Defined in Stack.Types.Build.ConstructPlan

type Rep W = D1 ('MetaData "W" "Stack.Types.Build.ConstructPlan" "stack-3.1.1-Jkd8kxrin7nLuuv5NJBnEC" 'False) (C1 ('MetaCons "W" 'PrefixI 'True) ((S1 ('MetaSel ('Just "wFinals") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Map PackageName (Either ConstructPlanException Task))) :*: S1 ('MetaSel ('Just "wInstall") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Map StackUnqualCompName InstallLocation))) :*: (S1 ('MetaSel ('Just "wDirty") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Map PackageName Text)) :*: (S1 ('MetaSel ('Just "wWarnings") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 ([StyleDoc] -> [StyleDoc])) :*: S1 ('MetaSel ('Just "wParents") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 ParentMap)))))

Methods

from :: W -> Rep W x

to :: Rep W x -> W

Generic BenchmarkOptsMonoid Source # 
Instance details

Defined in Stack.Types.BuildOptsMonoid

Associated Types

type Rep BenchmarkOptsMonoid 
Instance details

Defined in Stack.Types.BuildOptsMonoid

type Rep BenchmarkOptsMonoid = D1 ('MetaData "BenchmarkOptsMonoid" "Stack.Types.BuildOptsMonoid" "stack-3.1.1-Jkd8kxrin7nLuuv5NJBnEC" 'False) (C1 ('MetaCons "BenchmarkOptsMonoid" 'PrefixI 'True) (S1 ('MetaSel ('Just "additionalArgs") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First String)) :*: S1 ('MetaSel ('Just "disableRun") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First Bool))))
Generic BuildOptsMonoid Source # 
Instance details

Defined in Stack.Types.BuildOptsMonoid

Associated Types

type Rep BuildOptsMonoid 
Instance details

Defined in Stack.Types.BuildOptsMonoid

type Rep BuildOptsMonoid = D1 ('MetaData "BuildOptsMonoid" "Stack.Types.BuildOptsMonoid" "stack-3.1.1-Jkd8kxrin7nLuuv5NJBnEC" 'False) (C1 ('MetaCons "BuildOptsMonoid" 'PrefixI 'True) (((((S1 ('MetaSel ('Just "trace") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Any) :*: S1 ('MetaSel ('Just "profile") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Any)) :*: (S1 ('MetaSel ('Just "noStrip") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Any) :*: S1 ('MetaSel ('Just "libProfile") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstFalse))) :*: ((S1 ('MetaSel ('Just "exeProfile") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstFalse) :*: S1 ('MetaSel ('Just "libStrip") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstTrue)) :*: (S1 ('MetaSel ('Just "exeStrip") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstTrue) :*: S1 ('MetaSel ('Just "buildHaddocks") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstFalse)))) :*: (((S1 ('MetaSel ('Just "haddockOpts") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 HaddockOptsMonoid) :*: S1 ('MetaSel ('Just "openHaddocks") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstFalse)) :*: (S1 ('MetaSel ('Just "haddockDeps") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First Bool)) :*: S1 ('MetaSel ('Just "haddockExecutables") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstFalse))) :*: ((S1 ('MetaSel ('Just "haddockTests") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstFalse) :*: S1 ('MetaSel ('Just "haddockBenchmarks") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstFalse)) :*: (S1 ('MetaSel ('Just "haddockInternal") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstFalse) :*: (S1 ('MetaSel ('Just "haddockHyperlinkSource") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstTrue) :*: S1 ('MetaSel ('Just "haddockForHackage") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstFalse)))))) :*: ((((S1 ('MetaSel ('Just "installExes") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstFalse) :*: S1 ('MetaSel ('Just "installCompilerTool") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstFalse)) :*: (S1 ('MetaSel ('Just "preFetch") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstFalse) :*: S1 ('MetaSel ('Just "keepGoing") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First Bool)))) :*: ((S1 ('MetaSel ('Just "keepTmpFiles") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstFalse) :*: S1 ('MetaSel ('Just "forceDirty") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstFalse)) :*: (S1 ('MetaSel ('Just "tests") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstFalse) :*: S1 ('MetaSel ('Just "testOpts") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 TestOptsMonoid)))) :*: (((S1 ('MetaSel ('Just "benchmarks") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstFalse) :*: S1 ('MetaSel ('Just "benchmarkOpts") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 BenchmarkOptsMonoid)) :*: (S1 ('MetaSel ('Just "reconfigure") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstFalse) :*: S1 ('MetaSel ('Just "cabalVerbose") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First CabalVerbosity)))) :*: ((S1 ('MetaSel ('Just "splitObjs") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstFalse) :*: S1 ('MetaSel ('Just "skipComponents") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 [StackUnqualCompName])) :*: (S1 ('MetaSel ('Just "interleavedOutput") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstTrue) :*: (S1 ('MetaSel ('Just "progressBar") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First ProgressBarFormat)) :*: S1 ('MetaSel ('Just "ddumpDir") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First Text)))))))))
Generic HaddockOptsMonoid Source # 
Instance details

Defined in Stack.Types.BuildOptsMonoid

Associated Types

type Rep HaddockOptsMonoid 
Instance details

Defined in Stack.Types.BuildOptsMonoid

type Rep HaddockOptsMonoid = D1 ('MetaData "HaddockOptsMonoid" "Stack.Types.BuildOptsMonoid" "stack-3.1.1-Jkd8kxrin7nLuuv5NJBnEC" 'True) (C1 ('MetaCons "HaddockOptsMonoid" 'PrefixI 'True) (S1 ('MetaSel ('Just "additionalArgs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String])))
Generic TestOptsMonoid Source # 
Instance details

Defined in Stack.Types.BuildOptsMonoid

Associated Types

type Rep TestOptsMonoid 
Instance details

Defined in Stack.Types.BuildOptsMonoid

type Rep TestOptsMonoid = D1 ('MetaData "TestOptsMonoid" "Stack.Types.BuildOptsMonoid" "stack-3.1.1-Jkd8kxrin7nLuuv5NJBnEC" 'False) (C1 ('MetaCons "TestOptsMonoid" 'PrefixI 'True) ((S1 ('MetaSel ('Just "rerunTests") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstTrue) :*: (S1 ('MetaSel ('Just "additionalArgs") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 [String]) :*: S1 ('MetaSel ('Just "coverage") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstFalse))) :*: (S1 ('MetaSel ('Just "disableRun") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstFalse) :*: (S1 ('MetaSel ('Just "maximumTimeSeconds") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First (Maybe Int))) :*: S1 ('MetaSel ('Just "allowStdin") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstTrue)))))
Generic CasaOptsMonoid Source # 
Instance details

Defined in Stack.Types.Casa

Associated Types

type Rep CasaOptsMonoid 
Instance details

Defined in Stack.Types.Casa

type Rep CasaOptsMonoid = D1 ('MetaData "CasaOptsMonoid" "Stack.Types.Casa" "stack-3.1.1-Jkd8kxrin7nLuuv5NJBnEC" 'False) (C1 ('MetaCons "CasaOptsMonoid" 'PrefixI 'True) (S1 ('MetaSel ('Just "enable") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstTrue) :*: (S1 ('MetaSel ('Just "repoPrefix") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First CasaRepoPrefix)) :*: S1 ('MetaSel ('Just "maxKeysPerRequest") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First Int)))))
Generic ColorWhen Source # 
Instance details

Defined in Stack.Types.ColorWhen

Associated Types

type Rep ColorWhen 
Instance details

Defined in Stack.Types.ColorWhen

type Rep ColorWhen = D1 ('MetaData "ColorWhen" "Stack.Types.ColorWhen" "stack-3.1.1-Jkd8kxrin7nLuuv5NJBnEC" 'False) (C1 ('MetaCons "ColorNever" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "ColorAlways" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ColorAuto" 'PrefixI 'False) (U1 :: Type -> Type)))

Methods

from :: ColorWhen -> Rep ColorWhen x

to :: Rep ColorWhen x -> ColorWhen

Generic ActualCompiler Source # 
Instance details

Defined in Stack.Types.Compiler

Associated Types

type Rep ActualCompiler 
Instance details

Defined in Stack.Types.Compiler

type Rep ActualCompiler = D1 ('MetaData "ActualCompiler" "Stack.Types.Compiler" "stack-3.1.1-Jkd8kxrin7nLuuv5NJBnEC" 'False) (C1 ('MetaCons "ACGhc" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Version)) :+: C1 ('MetaCons "ACGhcGit" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text)))
Generic StackUnqualCompName Source # 
Instance details

Defined in Stack.Types.ComponentUtils

Associated Types

type Rep StackUnqualCompName 
Instance details

Defined in Stack.Types.ComponentUtils

type Rep StackUnqualCompName = D1 ('MetaData "StackUnqualCompName" "Stack.Types.ComponentUtils" "stack-3.1.1-Jkd8kxrin7nLuuv5NJBnEC" 'True) (C1 ('MetaCons "StackUnqualCompName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UnqualComponentName)))
Generic ConfigMonoid Source # 
Instance details

Defined in Stack.Types.ConfigMonoid

Associated Types

type Rep ConfigMonoid 
Instance details

Defined in Stack.Types.ConfigMonoid

type Rep ConfigMonoid = D1 ('MetaData "ConfigMonoid" "Stack.Types.ConfigMonoid" "stack-3.1.1-Jkd8kxrin7nLuuv5NJBnEC" 'False) (C1 ('MetaCons "ConfigMonoid" 'PrefixI 'True) ((((((S1 ('MetaSel ('Just "stackRoot") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First (Path Abs Dir))) :*: S1 ('MetaSel ('Just "workDir") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First (Path Rel Dir)))) :*: (S1 ('MetaSel ('Just "buildOpts") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 BuildOptsMonoid) :*: S1 ('MetaSel ('Just "dockerOpts") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 DockerOptsMonoid))) :*: ((S1 ('MetaSel ('Just "nixOpts") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 NixOptsMonoid) :*: S1 ('MetaSel ('Just "connectionCount") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First Int))) :*: (S1 ('MetaSel ('Just "hideTHLoading") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstTrue) :*: S1 ('MetaSel ('Just "prefixTimestamps") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First Bool))))) :*: (((S1 ('MetaSel ('Just "latestSnapshot") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First Text)) :*: S1 ('MetaSel ('Just "packageIndex") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First PackageIndexConfig))) :*: (S1 ('MetaSel ('Just "systemGHC") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First Bool)) :*: S1 ('MetaSel ('Just "installGHC") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstTrue))) :*: ((S1 ('MetaSel ('Just "skipGHCCheck") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstFalse) :*: S1 ('MetaSel ('Just "skipMsys") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstFalse)) :*: (S1 ('MetaSel ('Just "msysEnvironment") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First MsysEnvironment)) :*: S1 ('MetaSel ('Just "compilerCheck") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First VersionCheck)))))) :*: ((((S1 ('MetaSel ('Just "compilerRepository") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First CompilerRepository)) :*: S1 ('MetaSel ('Just "requireStackVersion") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 IntersectingVersionRange)) :*: (S1 ('MetaSel ('Just "arch") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First String)) :*: S1 ('MetaSel ('Just "ghcVariant") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First GHCVariant)))) :*: ((S1 ('MetaSel ('Just "ghcBuild") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First CompilerBuild)) :*: S1 ('MetaSel ('Just "jobs") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First Int))) :*: (S1 ('MetaSel ('Just "extraIncludeDirs") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 [FilePath]) :*: S1 ('MetaSel ('Just "extraLibDirs") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 [FilePath])))) :*: (((S1 ('MetaSel ('Just "customPreprocessorExts") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 [Text]) :*: S1 ('MetaSel ('Just "overrideGccPath") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First (Path Abs File)))) :*: (S1 ('MetaSel ('Just "overrideHpack") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First FilePath)) :*: S1 ('MetaSel ('Just "hpackForce") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstFalse))) :*: ((S1 ('MetaSel ('Just "concurrentTests") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First Bool)) :*: S1 ('MetaSel ('Just "localBinPath") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First FilePath))) :*: (S1 ('MetaSel ('Just "fileWatchHook") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First FilePath)) :*: (S1 ('MetaSel ('Just "templateParameters") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Map Text Text)) :*: S1 ('MetaSel ('Just "scmInit") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First SCM)))))))) :*: (((((S1 ('MetaSel ('Just "ghcOptionsByName") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (MonoidMap PackageName (Dual [Text]))) :*: S1 ('MetaSel ('Just "ghcOptionsByCat") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (MonoidMap ApplyGhcOptions (Dual [Text])))) :*: (S1 ('MetaSel ('Just "cabalConfigOpts") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (MonoidMap CabalConfigKey (Dual [Text]))) :*: S1 ('MetaSel ('Just "extraPath") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 [Path Abs Dir]))) :*: ((S1 ('MetaSel ('Just "setupInfoLocations") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 [String]) :*: S1 ('MetaSel ('Just "setupInfoInline") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SetupInfo)) :*: (S1 ('MetaSel ('Just "localProgramsBase") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First (Path Abs Dir))) :*: S1 ('MetaSel ('Just "pvpBounds") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First PvpBounds))))) :*: (((S1 ('MetaSel ('Just "modifyCodePage") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstTrue) :*: S1 ('MetaSel ('Just "rebuildGhcOptions") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstFalse)) :*: (S1 ('MetaSel ('Just "applyGhcOptions") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First ApplyGhcOptions)) :*: S1 ('MetaSel ('Just "applyProgOptions") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First ApplyProgOptions)))) :*: ((S1 ('MetaSel ('Just "allowNewer") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First Bool)) :*: S1 ('MetaSel ('Just "allowNewerDeps") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe AllowNewerDeps))) :*: (S1 ('MetaSel ('Just "defaultInitSnapshot") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First (Unresolved AbstractSnapshot))) :*: (S1 ('MetaSel ('Just "defaultTemplate") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First TemplateName)) :*: S1 ('MetaSel ('Just "allowDifferentUser") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First Bool))))))) :*: ((((S1 ('MetaSel ('Just "dumpLogs") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First DumpLogs)) :*: S1 ('MetaSel ('Just "saveHackageCreds") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstTrue)) :*: (S1 ('MetaSel ('Just "hackageBaseUrl") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First Text)) :*: S1 ('MetaSel ('Just "colorWhen") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First ColorWhen)))) :*: ((S1 ('MetaSel ('Just "styles") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 StylesUpdate) :*: S1 ('MetaSel ('Just "hideSourcePaths") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstTrue)) :*: (S1 ('MetaSel ('Just "recommendStackUpgrade") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstTrue) :*: S1 ('MetaSel ('Just "notifyIfNixOnPath") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstFalse)))) :*: (((S1 ('MetaSel ('Just "notifyIfGhcUntested") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstFalse) :*: S1 ('MetaSel ('Just "notifyIfCabalUntested") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstFalse)) :*: (S1 ('MetaSel ('Just "notifyIfArchUnknown") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstTrue) :*: S1 ('MetaSel ('Just "casaOpts") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 CasaOptsMonoid))) :*: ((S1 ('MetaSel ('Just "casaRepoPrefix") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First CasaRepoPrefix)) :*: S1 ('MetaSel ('Just "snapshotLocation") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First Text))) :*: (S1 ('MetaSel ('Just "globalHintsLocation") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First (Unresolved GlobalHintsLocation))) :*: (S1 ('MetaSel ('Just "noRunCompile") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstFalse) :*: S1 ('MetaSel ('Just "stackDeveloperMode") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First Bool))))))))))
Generic ConfigureOpts Source # 
Instance details

Defined in Stack.Types.ConfigureOpts

Associated Types

type Rep ConfigureOpts 
Instance details

Defined in Stack.Types.ConfigureOpts

type Rep ConfigureOpts = D1 ('MetaData "ConfigureOpts" "Stack.Types.ConfigureOpts" "stack-3.1.1-Jkd8kxrin7nLuuv5NJBnEC" 'False) (C1 ('MetaCons "ConfigureOpts" 'PrefixI 'True) (S1 ('MetaSel ('Just "pathRelated") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 [String]) :*: S1 ('MetaSel ('Just "nonPathRelated") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 [String])))
Generic DockerOptsMonoid Source # 
Instance details

Defined in Stack.Types.Docker

Associated Types

type Rep DockerOptsMonoid 
Instance details

Defined in Stack.Types.Docker

type Rep DockerOptsMonoid = D1 ('MetaData "DockerOptsMonoid" "Stack.Types.Docker" "stack-3.1.1-Jkd8kxrin7nLuuv5NJBnEC" 'False) (C1 ('MetaCons "DockerOptsMonoid" 'PrefixI 'True) ((((S1 ('MetaSel ('Just "defaultEnable") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Any) :*: S1 ('MetaSel ('Just "enable") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First Bool))) :*: (S1 ('MetaSel ('Just "repoOrImage") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First DockerMonoidRepoOrImage)) :*: S1 ('MetaSel ('Just "registryLogin") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First Bool)))) :*: ((S1 ('MetaSel ('Just "registryUsername") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First String)) :*: S1 ('MetaSel ('Just "registryPassword") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First String))) :*: (S1 ('MetaSel ('Just "autoPull") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstTrue) :*: (S1 ('MetaSel ('Just "detach") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstFalse) :*: S1 ('MetaSel ('Just "persist") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstFalse))))) :*: (((S1 ('MetaSel ('Just "containerName") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First String)) :*: S1 ('MetaSel ('Just "network") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First String))) :*: (S1 ('MetaSel ('Just "runArgs") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 [String]) :*: S1 ('MetaSel ('Just "mount") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 [Mount]))) :*: ((S1 ('MetaSel ('Just "mountMode") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First String)) :*: S1 ('MetaSel ('Just "env") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 [String])) :*: (S1 ('MetaSel ('Just "stackExe") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First DockerStackExe)) :*: (S1 ('MetaSel ('Just "setUser") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First Bool)) :*: S1 ('MetaSel ('Just "requireDockerVersion") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 IntersectingVersionRange)))))))
Generic ExtraDirs Source # 
Instance details

Defined in Stack.Types.ExtraDirs

Associated Types

type Rep ExtraDirs 
Instance details

Defined in Stack.Types.ExtraDirs

type Rep ExtraDirs = D1 ('MetaData "ExtraDirs" "Stack.Types.ExtraDirs" "stack-3.1.1-Jkd8kxrin7nLuuv5NJBnEC" 'False) (C1 ('MetaCons "ExtraDirs" 'PrefixI 'True) (S1 ('MetaSel ('Just "bins") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 [Path Abs Dir]) :*: (S1 ('MetaSel ('Just "includes") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 [Path Abs Dir]) :*: S1 ('MetaSel ('Just "libs") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 [Path Abs Dir]))))

Methods

from :: ExtraDirs -> Rep ExtraDirs x

to :: Rep ExtraDirs x -> ExtraDirs

Generic GhcPkgId Source # 
Instance details

Defined in Stack.Types.GhcPkgId

Associated Types

type Rep GhcPkgId 
Instance details

Defined in Stack.Types.GhcPkgId

type Rep GhcPkgId = D1 ('MetaData "GhcPkgId" "Stack.Types.GhcPkgId" "stack-3.1.1-Jkd8kxrin7nLuuv5NJBnEC" 'True) (C1 ('MetaCons "GhcPkgId" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UnitId)))

Methods

from :: GhcPkgId -> Rep GhcPkgId x

to :: Rep GhcPkgId x -> GhcPkgId

Generic GlobalOptsMonoid Source # 
Instance details

Defined in Stack.Types.GlobalOptsMonoid

Associated Types

type Rep GlobalOptsMonoid 
Instance details

Defined in Stack.Types.GlobalOptsMonoid

type Rep GlobalOptsMonoid = D1 ('MetaData "GlobalOptsMonoid" "Stack.Types.GlobalOptsMonoid" "stack-3.1.1-Jkd8kxrin7nLuuv5NJBnEC" 'False) (C1 ('MetaCons "GlobalOptsMonoid" 'PrefixI 'True) (((S1 ('MetaSel ('Just "reExecVersion") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First String)) :*: (S1 ('MetaSel ('Just "dockerEntrypoint") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First DockerEntrypoint)) :*: S1 ('MetaSel ('Just "logLevel") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First LogLevel)))) :*: ((S1 ('MetaSel ('Just "timeInLog") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstTrue) :*: S1 ('MetaSel ('Just "rslInLog") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstFalse)) :*: (S1 ('MetaSel ('Just "planInLog") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstFalse) :*: S1 ('MetaSel ('Just "configMonoid") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 ConfigMonoid)))) :*: (((S1 ('MetaSel ('Just "snapshot") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First (Unresolved AbstractSnapshot))) :*: S1 ('MetaSel ('Just "snapshotRoot") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First FilePath))) :*: (S1 ('MetaSel ('Just "compiler") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First WantedCompiler)) :*: S1 ('MetaSel ('Just "terminal") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First Bool)))) :*: ((S1 ('MetaSel ('Just "styles") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 StylesUpdate) :*: S1 ('MetaSel ('Just "termWidthOpt") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First Int))) :*: (S1 ('MetaSel ('Just "stackYaml") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First FilePath)) :*: S1 ('MetaSel ('Just "lockFileBehavior") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First LockFileBehavior)))))))
Generic NixOptsMonoid Source # 
Instance details

Defined in Stack.Types.Nix

Associated Types

type Rep NixOptsMonoid 
Instance details

Defined in Stack.Types.Nix

type Rep NixOptsMonoid = D1 ('MetaData "NixOptsMonoid" "Stack.Types.Nix" "stack-3.1.1-Jkd8kxrin7nLuuv5NJBnEC" 'False) (C1 ('MetaCons "NixOptsMonoid" 'PrefixI 'True) ((S1 ('MetaSel ('Just "enable") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First Bool)) :*: (S1 ('MetaSel ('Just "pureShell") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First Bool)) :*: S1 ('MetaSel ('Just "packages") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First [Text])))) :*: ((S1 ('MetaSel ('Just "initFile") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First FilePath)) :*: S1 ('MetaSel ('Just "shellOptions") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First [Text]))) :*: (S1 ('MetaSel ('Just "path") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (First [Text])) :*: S1 ('MetaSel ('Just "addGCRoots") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 FirstFalse)))))
Generic ExeName Source # 
Instance details

Defined in Stack.Types.Package

Associated Types

type Rep ExeName 
Instance details

Defined in Stack.Types.Package

type Rep ExeName = D1 ('MetaData "ExeName" "Stack.Types.Package" "stack-3.1.1-Jkd8kxrin7nLuuv5NJBnEC" 'True) (C1 ('MetaCons "ExeName" 'PrefixI 'True) (S1 ('MetaSel ('Just "exeName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

Methods

from :: ExeName -> Rep ExeName x

to :: Rep ExeName x -> ExeName

Generic FileCacheInfo Source # 
Instance details

Defined in Stack.Types.Package

Associated Types

type Rep FileCacheInfo 
Instance details

Defined in Stack.Types.Package

type Rep FileCacheInfo = D1 ('MetaData "FileCacheInfo" "Stack.Types.Package" "stack-3.1.1-Jkd8kxrin7nLuuv5NJBnEC" 'True) (C1 ('MetaCons "FileCacheInfo" 'PrefixI 'True) (S1 ('MetaSel ('Just "hash") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SHA256)))
Generic Bytes128 
Instance details

Defined in Data.StaticBytes

Associated Types

type Rep Bytes128 
Instance details

Defined in Data.StaticBytes

type Rep Bytes128 = D1 ('MetaData "Bytes128" "Data.StaticBytes" "static-bytes-0.1.0-6xz0CyKkxS4DYhKtNu708J" 'False) (C1 ('MetaCons "Bytes128" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Bytes64) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Bytes64)))

Methods

from :: Bytes128 -> Rep Bytes128 x

to :: Rep Bytes128 x -> Bytes128

Generic Bytes16 
Instance details

Defined in Data.StaticBytes

Associated Types

type Rep Bytes16 
Instance details

Defined in Data.StaticBytes

type Rep Bytes16 = D1 ('MetaData "Bytes16" "Data.StaticBytes" "static-bytes-0.1.0-6xz0CyKkxS4DYhKtNu708J" 'False) (C1 ('MetaCons "Bytes16" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Bytes8) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Bytes8)))

Methods

from :: Bytes16 -> Rep Bytes16 x

to :: Rep Bytes16 x -> Bytes16

Generic Bytes32 
Instance details

Defined in Data.StaticBytes

Associated Types

type Rep Bytes32 
Instance details

Defined in Data.StaticBytes

type Rep Bytes32 = D1 ('MetaData "Bytes32" "Data.StaticBytes" "static-bytes-0.1.0-6xz0CyKkxS4DYhKtNu708J" 'False) (C1 ('MetaCons "Bytes32" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Bytes16) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Bytes16)))

Methods

from :: Bytes32 -> Rep Bytes32 x

to :: Rep Bytes32 x -> Bytes32

Generic Bytes64 
Instance details

Defined in Data.StaticBytes

Associated Types

type Rep Bytes64 
Instance details

Defined in Data.StaticBytes

type Rep Bytes64 = D1 ('MetaData "Bytes64" "Data.StaticBytes" "static-bytes-0.1.0-6xz0CyKkxS4DYhKtNu708J" 'False) (C1 ('MetaCons "Bytes64" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Bytes32) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Bytes32)))

Methods

from :: Bytes64 -> Rep Bytes64 x

to :: Rep Bytes64 x -> Bytes64

Generic Bytes8 
Instance details

Defined in Data.StaticBytes

Associated Types

type Rep Bytes8 
Instance details

Defined in Data.StaticBytes

type Rep Bytes8 = D1 ('MetaData "Bytes8" "Data.StaticBytes" "static-bytes-0.1.0-6xz0CyKkxS4DYhKtNu708J" 'True) (C1 ('MetaCons "Bytes8" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word64)))

Methods

from :: Bytes8 -> Rep Bytes8 x

to :: Rep Bytes8 x -> Bytes8

Generic AnnLookup 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep AnnLookup 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep AnnLookup = D1 ('MetaData "AnnLookup" "Language.Haskell.TH.Syntax" "template-haskell" 'False) (C1 ('MetaCons "AnnLookupModule" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Module)) :+: C1 ('MetaCons "AnnLookupName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name)))

Methods

from :: AnnLookup -> Rep AnnLookup x

to :: Rep AnnLookup x -> AnnLookup

Generic AnnTarget 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep AnnTarget 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep AnnTarget = D1 ('MetaData "AnnTarget" "Language.Haskell.TH.Syntax" "template-haskell" 'False) (C1 ('MetaCons "ModuleAnnotation" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "TypeAnnotation" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name)) :+: C1 ('MetaCons "ValueAnnotation" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name))))

Methods

from :: AnnTarget -> Rep AnnTarget x

to :: Rep AnnTarget x -> AnnTarget

Generic Bang 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Bang 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep Bang = D1 ('MetaData "Bang" "Language.Haskell.TH.Syntax" "template-haskell" 'False) (C1 ('MetaCons "Bang" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceUnpackedness) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceStrictness)))

Methods

from :: Bang -> Rep Bang x

to :: Rep Bang x -> Bang

Generic BndrVis 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep BndrVis 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep BndrVis = D1 ('MetaData "BndrVis" "Language.Haskell.TH.Syntax" "template-haskell" 'False) (C1 ('MetaCons "BndrReq" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "BndrInvis" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: BndrVis -> Rep BndrVis x

to :: Rep BndrVis x -> BndrVis

Generic Body 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Body 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep Body = D1 ('MetaData "Body" "Language.Haskell.TH.Syntax" "template-haskell" 'False) (C1 ('MetaCons "GuardedB" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(Guard, Exp)])) :+: C1 ('MetaCons "NormalB" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp)))

Methods

from :: Body -> Rep Body x

to :: Rep Body x -> Body

Generic Bytes 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Bytes 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep Bytes = D1 ('MetaData "Bytes" "Language.Haskell.TH.Syntax" "template-haskell" 'False) (C1 ('MetaCons "Bytes" 'PrefixI 'True) (S1 ('MetaSel ('Just "bytesPtr") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (ForeignPtr Word8)) :*: (S1 ('MetaSel ('Just "bytesOffset") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word) :*: S1 ('MetaSel ('Just "bytesSize") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word))))

Methods

from :: Bytes -> Rep Bytes x

to :: Rep Bytes x -> Bytes

Generic Callconv 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Callconv 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep Callconv = D1 ('MetaData "Callconv" "Language.Haskell.TH.Syntax" "template-haskell" 'False) ((C1 ('MetaCons "CCall" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "StdCall" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "CApi" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Prim" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "JavaScript" 'PrefixI 'False) (U1 :: Type -> Type))))

Methods

from :: Callconv -> Rep Callconv x

to :: Rep Callconv x -> Callconv

Generic Clause 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Clause 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep Clause = D1 ('MetaData "Clause" "Language.Haskell.TH.Syntax" "template-haskell" 'False) (C1 ('MetaCons "Clause" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Pat]) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Body) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Dec]))))

Methods

from :: Clause -> Rep Clause x

to :: Rep Clause x -> Clause

Generic Con 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Con 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep Con = D1 ('MetaData "Con" "Language.Haskell.TH.Syntax" "template-haskell" 'False) ((C1 ('MetaCons "NormalC" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [BangType])) :+: (C1 ('MetaCons "RecC" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [VarBangType])) :+: C1 ('MetaCons "InfixC" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 BangType) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 BangType))))) :+: (C1 ('MetaCons "ForallC" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [TyVarBndr Specificity]) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Cxt) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Con))) :+: (C1 ('MetaCons "GadtC" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Name]) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [BangType]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type))) :+: C1 ('MetaCons "RecGadtC" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Name]) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [VarBangType]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type))))))

Methods

from :: Con -> Rep Con x

to :: Rep Con x -> Con

Generic Dec 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Dec 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep Dec = D1 ('MetaData "Dec" "Language.Haskell.TH.Syntax" "template-haskell" 'False) ((((C1 ('MetaCons "FunD" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Clause])) :+: (C1 ('MetaCons "ValD" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Pat) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Body) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Dec]))) :+: C1 ('MetaCons "DataD" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Cxt) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [TyVarBndr BndrVis]))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Kind)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Con]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [DerivClause])))))) :+: (C1 ('MetaCons "NewtypeD" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Cxt) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [TyVarBndr BndrVis]))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Kind)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Con) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [DerivClause])))) :+: (C1 ('MetaCons "TypeDataD" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [TyVarBndr BndrVis])) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Kind)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Con]))) :+: C1 ('MetaCons "TySynD" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [TyVarBndr BndrVis]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type)))))) :+: ((C1 ('MetaCons "ClassD" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Cxt) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [TyVarBndr BndrVis]) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FunDep]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Dec])))) :+: (C1 ('MetaCons "InstanceD" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Overlap)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Cxt)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Dec]))) :+: C1 ('MetaCons "SigD" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type)))) :+: ((C1 ('MetaCons "KiSigD" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Kind)) :+: C1 ('MetaCons "ForeignD" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Foreign))) :+: (C1 ('MetaCons "InfixD" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Fixity) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name)) :+: C1 ('MetaCons "DefaultD" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Type])))))) :+: (((C1 ('MetaCons "PragmaD" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Pragma)) :+: (C1 ('MetaCons "DataFamilyD" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [TyVarBndr BndrVis]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Kind)))) :+: C1 ('MetaCons "DataInstD" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Cxt) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe [TyVarBndr ()])) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Kind)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Con]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [DerivClause])))))) :+: (C1 ('MetaCons "NewtypeInstD" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Cxt) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe [TyVarBndr ()])) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Kind)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Con) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [DerivClause])))) :+: (C1 ('MetaCons "TySynInstD" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 TySynEqn)) :+: C1 ('MetaCons "OpenTypeFamilyD" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 TypeFamilyHead))))) :+: ((C1 ('MetaCons "ClosedTypeFamilyD" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 TypeFamilyHead) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [TySynEqn])) :+: (C1 ('MetaCons "RoleAnnotD" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Role])) :+: C1 ('MetaCons "StandaloneDerivD" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe DerivStrategy)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Cxt) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type))))) :+: ((C1 ('MetaCons "DefaultSigD" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type)) :+: C1 ('MetaCons "PatSynD" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PatSynArgs)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PatSynDir) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Pat)))) :+: (C1 ('MetaCons "PatSynSigD" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PatSynType)) :+: C1 ('MetaCons "ImplicitParamBindD" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp)))))))

Methods

from :: Dec -> Rep Dec x

to :: Rep Dec x -> Dec

Generic DecidedStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep DecidedStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep DecidedStrictness = D1 ('MetaData "DecidedStrictness" "Language.Haskell.TH.Syntax" "template-haskell" 'False) (C1 ('MetaCons "DecidedLazy" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "DecidedStrict" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DecidedUnpack" 'PrefixI 'False) (U1 :: Type -> Type)))

Methods

from :: DecidedStrictness -> Rep DecidedStrictness x

to :: Rep DecidedStrictness x -> DecidedStrictness

Generic DerivClause 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep DerivClause 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep DerivClause = D1 ('MetaData "DerivClause" "Language.Haskell.TH.Syntax" "template-haskell" 'False) (C1 ('MetaCons "DerivClause" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe DerivStrategy)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Cxt)))

Methods

from :: DerivClause -> Rep DerivClause x

to :: Rep DerivClause x -> DerivClause

Generic DerivStrategy 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep DerivStrategy 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep DerivStrategy = D1 ('MetaData "DerivStrategy" "Language.Haskell.TH.Syntax" "template-haskell" 'False) ((C1 ('MetaCons "StockStrategy" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "AnyclassStrategy" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "NewtypeStrategy" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ViaStrategy" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type))))

Methods

from :: DerivStrategy -> Rep DerivStrategy x

to :: Rep DerivStrategy x -> DerivStrategy

Generic DocLoc 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep DocLoc 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep DocLoc = D1 ('MetaData "DocLoc" "Language.Haskell.TH.Syntax" "template-haskell" 'False) ((C1 ('MetaCons "ModuleDoc" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DeclDoc" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name))) :+: (C1 ('MetaCons "ArgDoc" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)) :+: C1 ('MetaCons "InstDoc" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type))))

Methods

from :: DocLoc -> Rep DocLoc x

to :: Rep DocLoc x -> DocLoc

Generic Exp 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Exp 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep Exp = D1 ('MetaData "Exp" "Language.Haskell.TH.Syntax" "template-haskell" 'False) (((((C1 ('MetaCons "VarE" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name)) :+: C1 ('MetaCons "ConE" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name))) :+: (C1 ('MetaCons "LitE" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Lit)) :+: C1 ('MetaCons "AppE" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp)))) :+: ((C1 ('MetaCons "AppTypeE" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type)) :+: C1 ('MetaCons "InfixE" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Exp)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Exp))))) :+: (C1 ('MetaCons "UInfixE" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp))) :+: C1 ('MetaCons "ParensE" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp))))) :+: (((C1 ('MetaCons "LamE" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Pat]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp)) :+: C1 ('MetaCons "LamCaseE" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Match]))) :+: (C1 ('MetaCons "LamCasesE" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Clause])) :+: C1 ('MetaCons "TupE" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Maybe Exp])))) :+: ((C1 ('MetaCons "UnboxedTupE" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Maybe Exp])) :+: C1 ('MetaCons "UnboxedSumE" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SumAlt) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SumArity)))) :+: (C1 ('MetaCons "CondE" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp))) :+: (C1 ('MetaCons "MultiIfE" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(Guard, Exp)])) :+: C1 ('MetaCons "LetE" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Dec]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp))))))) :+: ((((C1 ('MetaCons "CaseE" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Match])) :+: C1 ('MetaCons "DoE" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe ModName)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Stmt]))) :+: (C1 ('MetaCons "MDoE" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe ModName)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Stmt])) :+: C1 ('MetaCons "CompE" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Stmt])))) :+: ((C1 ('MetaCons "ArithSeqE" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Range)) :+: C1 ('MetaCons "ListE" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Exp]))) :+: (C1 ('MetaCons "SigE" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type)) :+: C1 ('MetaCons "RecConE" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FieldExp]))))) :+: (((C1 ('MetaCons "RecUpdE" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FieldExp])) :+: C1 ('MetaCons "StaticE" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp))) :+: (C1 ('MetaCons "UnboundVarE" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name)) :+: C1 ('MetaCons "LabelE" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String)))) :+: ((C1 ('MetaCons "ImplicitParamVarE" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String)) :+: C1 ('MetaCons "GetFieldE" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String))) :+: (C1 ('MetaCons "ProjectionE" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty String))) :+: (C1 ('MetaCons "TypedBracketE" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp)) :+: C1 ('MetaCons "TypedSpliceE" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp))))))))

Methods

from :: Exp -> Rep Exp x

to :: Rep Exp x -> Exp

Generic FamilyResultSig 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep FamilyResultSig 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep FamilyResultSig = D1 ('MetaData "FamilyResultSig" "Language.Haskell.TH.Syntax" "template-haskell" 'False) (C1 ('MetaCons "NoSig" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "KindSig" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Kind)) :+: C1 ('MetaCons "TyVarSig" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (TyVarBndr ())))))

Methods

from :: FamilyResultSig -> Rep FamilyResultSig x

to :: Rep FamilyResultSig x -> FamilyResultSig

Generic Fixity 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Fixity 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep Fixity = D1 ('MetaData "Fixity" "Language.Haskell.TH.Syntax" "template-haskell" 'False) (C1 ('MetaCons "Fixity" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FixityDirection)))

Methods

from :: Fixity -> Rep Fixity x

to :: Rep Fixity x -> Fixity

Generic FixityDirection 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep FixityDirection 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep FixityDirection = D1 ('MetaData "FixityDirection" "Language.Haskell.TH.Syntax" "template-haskell" 'False) (C1 ('MetaCons "InfixL" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "InfixR" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "InfixN" 'PrefixI 'False) (U1 :: Type -> Type)))

Methods

from :: FixityDirection -> Rep FixityDirection x

to :: Rep FixityDirection x -> FixityDirection

Generic Foreign 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Foreign 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep Foreign = D1 ('MetaData "Foreign" "Language.Haskell.TH.Syntax" "template-haskell" 'False) (C1 ('MetaCons "ImportF" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Callconv) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Safety)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type)))) :+: C1 ('MetaCons "ExportF" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Callconv) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type))))

Methods

from :: Foreign -> Rep Foreign x

to :: Rep Foreign x -> Foreign

Generic FunDep 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep FunDep 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep FunDep = D1 ('MetaData "FunDep" "Language.Haskell.TH.Syntax" "template-haskell" 'False) (C1 ('MetaCons "FunDep" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Name]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Name])))

Methods

from :: FunDep -> Rep FunDep x

to :: Rep FunDep x -> FunDep

Generic Guard 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Guard 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep Guard = D1 ('MetaData "Guard" "Language.Haskell.TH.Syntax" "template-haskell" 'False) (C1 ('MetaCons "NormalG" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp)) :+: C1 ('MetaCons "PatG" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Stmt])))

Methods

from :: Guard -> Rep Guard x

to :: Rep Guard x -> Guard

Generic Info 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Info 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep Info = D1 ('MetaData "Info" "Language.Haskell.TH.Syntax" "template-haskell" 'False) (((C1 ('MetaCons "ClassI" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Dec) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [InstanceDec])) :+: C1 ('MetaCons "ClassOpI" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ParentName)))) :+: (C1 ('MetaCons "TyConI" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Dec)) :+: C1 ('MetaCons "FamilyI" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Dec) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [InstanceDec])))) :+: ((C1 ('MetaCons "PrimTyConI" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Arity) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Unlifted))) :+: C1 ('MetaCons "DataConI" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ParentName)))) :+: (C1 ('MetaCons "PatSynI" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PatSynType)) :+: (C1 ('MetaCons "VarI" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Dec)))) :+: C1 ('MetaCons "TyVarI" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type))))))

Methods

from :: Info -> Rep Info x

to :: Rep Info x -> Info

Generic InjectivityAnn 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep InjectivityAnn 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep InjectivityAnn = D1 ('MetaData "InjectivityAnn" "Language.Haskell.TH.Syntax" "template-haskell" 'False) (C1 ('MetaCons "InjectivityAnn" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Name])))

Methods

from :: InjectivityAnn -> Rep InjectivityAnn x

to :: Rep InjectivityAnn x -> InjectivityAnn

Generic Inline 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Inline 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep Inline = D1 ('MetaData "Inline" "Language.Haskell.TH.Syntax" "template-haskell" 'False) (C1 ('MetaCons "NoInline" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Inline" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Inlinable" 'PrefixI 'False) (U1 :: Type -> Type)))

Methods

from :: Inline -> Rep Inline x

to :: Rep Inline x -> Inline

Generic Lit 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Lit 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep Lit = D1 ('MetaData "Lit" "Language.Haskell.TH.Syntax" "template-haskell" 'False) (((C1 ('MetaCons "CharL" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Char)) :+: C1 ('MetaCons "StringL" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String))) :+: (C1 ('MetaCons "IntegerL" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Integer)) :+: (C1 ('MetaCons "RationalL" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Rational)) :+: C1 ('MetaCons "IntPrimL" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Integer))))) :+: ((C1 ('MetaCons "WordPrimL" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Integer)) :+: (C1 ('MetaCons "FloatPrimL" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Rational)) :+: C1 ('MetaCons "DoublePrimL" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Rational)))) :+: (C1 ('MetaCons "StringPrimL" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Word8])) :+: (C1 ('MetaCons "BytesPrimL" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bytes)) :+: C1 ('MetaCons "CharPrimL" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Char))))))

Methods

from :: Lit -> Rep Lit x

to :: Rep Lit x -> Lit

Generic Loc 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Loc 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep Loc = D1 ('MetaData "Loc" "Language.Haskell.TH.Syntax" "template-haskell" 'False) (C1 ('MetaCons "Loc" 'PrefixI 'True) ((S1 ('MetaSel ('Just "loc_filename") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String) :*: S1 ('MetaSel ('Just "loc_package") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String)) :*: (S1 ('MetaSel ('Just "loc_module") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String) :*: (S1 ('MetaSel ('Just "loc_start") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 CharPos) :*: S1 ('MetaSel ('Just "loc_end") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 CharPos)))))

Methods

from :: Loc -> Rep Loc x

to :: Rep Loc x -> Loc

Generic Match 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Match 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep Match = D1 ('MetaData "Match" "Language.Haskell.TH.Syntax" "template-haskell" 'False) (C1 ('MetaCons "Match" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Pat) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Body) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Dec]))))

Methods

from :: Match -> Rep Match x

to :: Rep Match x -> Match

Generic ModName 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep ModName 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep ModName = D1 ('MetaData "ModName" "Language.Haskell.TH.Syntax" "template-haskell" 'True) (C1 ('MetaCons "ModName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String)))

Methods

from :: ModName -> Rep ModName x

to :: Rep ModName x -> ModName

Generic Module 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Module 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep Module = D1 ('MetaData "Module" "Language.Haskell.TH.Syntax" "template-haskell" 'False) (C1 ('MetaCons "Module" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PkgName) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ModName)))

Methods

from :: Module -> Rep Module x

to :: Rep Module x -> Module

Generic ModuleInfo 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep ModuleInfo 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep ModuleInfo = D1 ('MetaData "ModuleInfo" "Language.Haskell.TH.Syntax" "template-haskell" 'False) (C1 ('MetaCons "ModuleInfo" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Module])))

Methods

from :: ModuleInfo -> Rep ModuleInfo x

to :: Rep ModuleInfo x -> ModuleInfo

Generic Name 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Name 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep Name = D1 ('MetaData "Name" "Language.Haskell.TH.Syntax" "template-haskell" 'False) (C1 ('MetaCons "Name" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 OccName) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 NameFlavour)))

Methods

from :: Name -> Rep Name x

to :: Rep Name x -> Name

Generic NameFlavour 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep NameFlavour 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep NameFlavour = D1 ('MetaData "NameFlavour" "Language.Haskell.TH.Syntax" "template-haskell" 'False) ((C1 ('MetaCons "NameS" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "NameQ" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ModName))) :+: (C1 ('MetaCons "NameU" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Uniq)) :+: (C1 ('MetaCons "NameL" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Uniq)) :+: C1 ('MetaCons "NameG" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 NameSpace) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PkgName) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ModName))))))

Methods

from :: NameFlavour -> Rep NameFlavour x

to :: Rep NameFlavour x -> NameFlavour

Generic NameSpace 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep NameSpace 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep NameSpace = D1 ('MetaData "NameSpace" "Language.Haskell.TH.Syntax" "template-haskell" 'False) ((C1 ('MetaCons "VarName" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DataName" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "TcClsName" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "FldName" 'PrefixI 'True) (S1 ('MetaSel ('Just "fldParent") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 String))))

Methods

from :: NameSpace -> Rep NameSpace x

to :: Rep NameSpace x -> NameSpace

Generic OccName 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep OccName 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep OccName = D1 ('MetaData "OccName" "Language.Haskell.TH.Syntax" "template-haskell" 'True) (C1 ('MetaCons "OccName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String)))

Methods

from :: OccName -> Rep OccName x

to :: Rep OccName x -> OccName

Generic Overlap 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Overlap 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep Overlap = D1 ('MetaData "Overlap" "Language.Haskell.TH.Syntax" "template-haskell" 'False) ((C1 ('MetaCons "Overlappable" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Overlapping" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Overlaps" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Incoherent" 'PrefixI 'False) (U1 :: Type -> Type)))

Methods

from :: Overlap -> Rep Overlap x

to :: Rep Overlap x -> Overlap

Generic Pat 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Pat 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep Pat = D1 ('MetaData "Pat" "Language.Haskell.TH.Syntax" "template-haskell" 'False) ((((C1 ('MetaCons "LitP" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Lit)) :+: C1 ('MetaCons "VarP" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name))) :+: (C1 ('MetaCons "TupP" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Pat])) :+: C1 ('MetaCons "UnboxedTupP" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Pat])))) :+: ((C1 ('MetaCons "UnboxedSumP" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Pat) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SumAlt) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SumArity))) :+: C1 ('MetaCons "ConP" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Type]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Pat])))) :+: (C1 ('MetaCons "InfixP" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Pat) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Pat))) :+: C1 ('MetaCons "UInfixP" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Pat) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Pat)))))) :+: (((C1 ('MetaCons "ParensP" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Pat)) :+: C1 ('MetaCons "TildeP" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Pat))) :+: (C1 ('MetaCons "BangP" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Pat)) :+: C1 ('MetaCons "AsP" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Pat)))) :+: ((C1 ('MetaCons "WildP" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "RecP" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FieldPat]))) :+: (C1 ('MetaCons "ListP" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Pat])) :+: (C1 ('MetaCons "SigP" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Pat) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type)) :+: C1 ('MetaCons "ViewP" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Pat)))))))

Methods

from :: Pat -> Rep Pat x

to :: Rep Pat x -> Pat

Generic PatSynArgs 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep PatSynArgs 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep PatSynArgs = D1 ('MetaData "PatSynArgs" "Language.Haskell.TH.Syntax" "template-haskell" 'False) (C1 ('MetaCons "PrefixPatSyn" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Name])) :+: (C1 ('MetaCons "InfixPatSyn" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name)) :+: C1 ('MetaCons "RecordPatSyn" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Name]))))

Methods

from :: PatSynArgs -> Rep PatSynArgs x

to :: Rep PatSynArgs x -> PatSynArgs

Generic PatSynDir 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep PatSynDir 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep PatSynDir = D1 ('MetaData "PatSynDir" "Language.Haskell.TH.Syntax" "template-haskell" 'False) (C1 ('MetaCons "Unidir" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "ImplBidir" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ExplBidir" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Clause]))))

Methods

from :: PatSynDir -> Rep PatSynDir x

to :: Rep PatSynDir x -> PatSynDir

Generic Phases 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Phases 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep Phases = D1 ('MetaData "Phases" "Language.Haskell.TH.Syntax" "template-haskell" 'False) (C1 ('MetaCons "AllPhases" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "FromPhase" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)) :+: C1 ('MetaCons "BeforePhase" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int))))

Methods

from :: Phases -> Rep Phases x

to :: Rep Phases x -> Phases

Generic PkgName 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep PkgName 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep PkgName = D1 ('MetaData "PkgName" "Language.Haskell.TH.Syntax" "template-haskell" 'True) (C1 ('MetaCons "PkgName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String)))

Methods

from :: PkgName -> Rep PkgName x

to :: Rep PkgName x -> PkgName

Generic Pragma 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Pragma 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep Pragma = D1 ('MetaData "Pragma" "Language.Haskell.TH.Syntax" "template-haskell" 'False) (((C1 ('MetaCons "InlineP" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Inline)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 RuleMatch) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Phases))) :+: C1 ('MetaCons "OpaqueP" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name))) :+: (C1 ('MetaCons "SpecialiseP" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Inline)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Phases))) :+: C1 ('MetaCons "SpecialiseInstP" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type)))) :+: ((C1 ('MetaCons "RuleP" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe [TyVarBndr ()])) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [RuleBndr]))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Phases)))) :+: C1 ('MetaCons "AnnP" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 AnnTarget) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp))) :+: (C1 ('MetaCons "LineP" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String)) :+: C1 ('MetaCons "CompleteP" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Name]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Name))))))

Methods

from :: Pragma -> Rep Pragma x

to :: Rep Pragma x -> Pragma

Generic Range 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Range 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep Range = D1 ('MetaData "Range" "Language.Haskell.TH.Syntax" "template-haskell" 'False) ((C1 ('MetaCons "FromR" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp)) :+: C1 ('MetaCons "FromThenR" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp))) :+: (C1 ('MetaCons "FromToR" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp)) :+: C1 ('MetaCons "FromThenToR" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp)))))

Methods

from :: Range -> Rep Range x

to :: Rep Range x -> Range

Generic Role 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Role 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep Role = D1 ('MetaData "Role" "Language.Haskell.TH.Syntax" "template-haskell" 'False) ((C1 ('MetaCons "NominalR" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "RepresentationalR" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "PhantomR" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "InferR" 'PrefixI 'False) (U1 :: Type -> Type)))

Methods

from :: Role -> Rep Role x

to :: Rep Role x -> Role

Generic RuleBndr 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep RuleBndr 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep RuleBndr = D1 ('MetaData "RuleBndr" "Language.Haskell.TH.Syntax" "template-haskell" 'False) (C1 ('MetaCons "RuleVar" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name)) :+: C1 ('MetaCons "TypedRuleVar" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type)))

Methods

from :: RuleBndr -> Rep RuleBndr x

to :: Rep RuleBndr x -> RuleBndr

Generic RuleMatch 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep RuleMatch 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep RuleMatch = D1 ('MetaData "RuleMatch" "Language.Haskell.TH.Syntax" "template-haskell" 'False) (C1 ('MetaCons "ConLike" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "FunLike" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: RuleMatch -> Rep RuleMatch x

to :: Rep RuleMatch x -> RuleMatch

Generic Safety 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Safety 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep Safety = D1 ('MetaData "Safety" "Language.Haskell.TH.Syntax" "template-haskell" 'False) (C1 ('MetaCons "Unsafe" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Safe" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Interruptible" 'PrefixI 'False) (U1 :: Type -> Type)))

Methods

from :: Safety -> Rep Safety x

to :: Rep Safety x -> Safety

Generic SourceStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep SourceStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep SourceStrictness = D1 ('MetaData "SourceStrictness" "Language.Haskell.TH.Syntax" "template-haskell" 'False) (C1 ('MetaCons "NoSourceStrictness" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "SourceLazy" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "SourceStrict" 'PrefixI 'False) (U1 :: Type -> Type)))

Methods

from :: SourceStrictness -> Rep SourceStrictness x

to :: Rep SourceStrictness x -> SourceStrictness

Generic SourceUnpackedness 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep SourceUnpackedness 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep SourceUnpackedness = D1 ('MetaData "SourceUnpackedness" "Language.Haskell.TH.Syntax" "template-haskell" 'False) (C1 ('MetaCons "NoSourceUnpackedness" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "SourceNoUnpack" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "SourceUnpack" 'PrefixI 'False) (U1 :: Type -> Type)))

Methods

from :: SourceUnpackedness -> Rep SourceUnpackedness x

to :: Rep SourceUnpackedness x -> SourceUnpackedness

Generic Specificity 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Specificity 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep Specificity = D1 ('MetaData "Specificity" "Language.Haskell.TH.Syntax" "template-haskell" 'False) (C1 ('MetaCons "SpecifiedSpec" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "InferredSpec" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: Specificity -> Rep Specificity x

to :: Rep Specificity x -> Specificity

Generic Stmt 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Stmt 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep Stmt = D1 ('MetaData "Stmt" "Language.Haskell.TH.Syntax" "template-haskell" 'False) ((C1 ('MetaCons "BindS" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Pat) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp)) :+: C1 ('MetaCons "LetS" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Dec]))) :+: (C1 ('MetaCons "NoBindS" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Exp)) :+: (C1 ('MetaCons "ParS" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [[Stmt]])) :+: C1 ('MetaCons "RecS" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Stmt])))))

Methods

from :: Stmt -> Rep Stmt x

to :: Rep Stmt x -> Stmt

Generic TyLit 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep TyLit 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep TyLit = D1 ('MetaData "TyLit" "Language.Haskell.TH.Syntax" "template-haskell" 'False) (C1 ('MetaCons "NumTyLit" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Integer)) :+: (C1 ('MetaCons "StrTyLit" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String)) :+: C1 ('MetaCons "CharTyLit" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Char))))

Methods

from :: TyLit -> Rep TyLit x

to :: Rep TyLit x -> TyLit

Generic TySynEqn 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep TySynEqn 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep TySynEqn = D1 ('MetaData "TySynEqn" "Language.Haskell.TH.Syntax" "template-haskell" 'False) (C1 ('MetaCons "TySynEqn" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe [TyVarBndr ()])) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type))))

Methods

from :: TySynEqn -> Rep TySynEqn x

to :: Rep TySynEqn x -> TySynEqn

Generic Type 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Type 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep Type = D1 ('MetaData "Type" "Language.Haskell.TH.Syntax" "template-haskell" 'False) ((((C1 ('MetaCons "ForallT" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [TyVarBndr Specificity]) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Cxt) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type))) :+: (C1 ('MetaCons "ForallVisT" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [TyVarBndr ()]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type)) :+: C1 ('MetaCons "AppT" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type)))) :+: ((C1 ('MetaCons "AppKindT" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Kind)) :+: C1 ('MetaCons "SigT" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Kind))) :+: (C1 ('MetaCons "VarT" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name)) :+: C1 ('MetaCons "ConT" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name))))) :+: ((C1 ('MetaCons "PromotedT" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name)) :+: (C1 ('MetaCons "InfixT" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type))) :+: C1 ('MetaCons "UInfixT" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type))))) :+: ((C1 ('MetaCons "PromotedInfixT" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type))) :+: C1 ('MetaCons "PromotedUInfixT" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type)))) :+: (C1 ('MetaCons "ParensT" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type)) :+: C1 ('MetaCons "TupleT" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)))))) :+: (((C1 ('MetaCons "UnboxedTupleT" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)) :+: (C1 ('MetaCons "UnboxedSumT" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SumArity)) :+: C1 ('MetaCons "ArrowT" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "MulArrowT" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "EqualityT" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "ListT" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PromotedTupleT" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int))))) :+: ((C1 ('MetaCons "PromotedNilT" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "PromotedConsT" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "StarT" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "ConstraintT" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LitT" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 TyLit))) :+: (C1 ('MetaCons "WildCardT" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ImplicitParamT" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Type)))))))

Methods

from :: Type -> Rep Type x

to :: Rep Type x -> Type

Generic TypeFamilyHead 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep TypeFamilyHead 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep TypeFamilyHead = D1 ('MetaData "TypeFamilyHead" "Language.Haskell.TH.Syntax" "template-haskell" 'False) (C1 ('MetaCons "TypeFamilyHead" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [TyVarBndr BndrVis])) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FamilyResultSig) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe InjectivityAnn)))))

Methods

from :: TypeFamilyHead -> Rep TypeFamilyHead x

to :: Rep TypeFamilyHead x -> TypeFamilyHead

Generic ConstructorInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep ConstructorInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

type Rep ConstructorInfo = D1 ('MetaData "ConstructorInfo" "Language.Haskell.TH.Datatype" "th-abstraction-0.7.1.0-80oylQNbrmxDZOJexbHcoi" 'False) (C1 ('MetaCons "ConstructorInfo" 'PrefixI 'True) ((S1 ('MetaSel ('Just "constructorName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: (S1 ('MetaSel ('Just "constructorVars") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [TyVarBndrUnit]) :*: S1 ('MetaSel ('Just "constructorContext") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Cxt))) :*: (S1 ('MetaSel ('Just "constructorFields") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Type]) :*: (S1 ('MetaSel ('Just "constructorStrictness") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [FieldStrictness]) :*: S1 ('MetaSel ('Just "constructorVariant") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ConstructorVariant)))))

Methods

from :: ConstructorInfo -> Rep ConstructorInfo x

to :: Rep ConstructorInfo x -> ConstructorInfo

Generic ConstructorVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep ConstructorVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

type Rep ConstructorVariant = D1 ('MetaData "ConstructorVariant" "Language.Haskell.TH.Datatype" "th-abstraction-0.7.1.0-80oylQNbrmxDZOJexbHcoi" 'False) (C1 ('MetaCons "NormalConstructor" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "InfixConstructor" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "RecordConstructor" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Name]))))

Methods

from :: ConstructorVariant -> Rep ConstructorVariant x

to :: Rep ConstructorVariant x -> ConstructorVariant

Generic DatatypeInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep DatatypeInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

type Rep DatatypeInfo = D1 ('MetaData "DatatypeInfo" "Language.Haskell.TH.Datatype" "th-abstraction-0.7.1.0-80oylQNbrmxDZOJexbHcoi" 'False) (C1 ('MetaCons "DatatypeInfo" 'PrefixI 'True) ((S1 ('MetaSel ('Just "datatypeContext") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Cxt) :*: (S1 ('MetaSel ('Just "datatypeName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Just "datatypeVars") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [TyVarBndrUnit]))) :*: ((S1 ('MetaSel ('Just "datatypeInstTypes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Type]) :*: S1 ('MetaSel ('Just "datatypeVariant") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 DatatypeVariant)) :*: (S1 ('MetaSel ('Just "datatypeReturnKind") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Kind) :*: S1 ('MetaSel ('Just "datatypeCons") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [ConstructorInfo])))))

Methods

from :: DatatypeInfo -> Rep DatatypeInfo x

to :: Rep DatatypeInfo x -> DatatypeInfo

Generic DatatypeVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep DatatypeVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

type Rep DatatypeVariant = D1 ('MetaData "DatatypeVariant" "Language.Haskell.TH.Datatype" "th-abstraction-0.7.1.0-80oylQNbrmxDZOJexbHcoi" 'False) ((C1 ('MetaCons "Datatype" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Newtype" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "DataInstance" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "NewtypeInstance" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TypeData" 'PrefixI 'False) (U1 :: Type -> Type))))

Methods

from :: DatatypeVariant -> Rep DatatypeVariant x

to :: Rep DatatypeVariant x -> DatatypeVariant

Generic FieldStrictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep FieldStrictness 
Instance details

Defined in Language.Haskell.TH.Datatype

type Rep FieldStrictness = D1 ('MetaData "FieldStrictness" "Language.Haskell.TH.Datatype" "th-abstraction-0.7.1.0-80oylQNbrmxDZOJexbHcoi" 'False) (C1 ('MetaCons "FieldStrictness" 'PrefixI 'True) (S1 ('MetaSel ('Just "fieldUnpackedness") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Unpackedness) :*: S1 ('MetaSel ('Just "fieldStrictness") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Strictness)))

Methods

from :: FieldStrictness -> Rep FieldStrictness x

to :: Rep FieldStrictness x -> FieldStrictness

Generic Strictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep Strictness 
Instance details

Defined in Language.Haskell.TH.Datatype

type Rep Strictness = D1 ('MetaData "Strictness" "Language.Haskell.TH.Datatype" "th-abstraction-0.7.1.0-80oylQNbrmxDZOJexbHcoi" 'False) (C1 ('MetaCons "UnspecifiedStrictness" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Lazy" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Strict" 'PrefixI 'False) (U1 :: Type -> Type)))

Methods

from :: Strictness -> Rep Strictness x

to :: Rep Strictness x -> Strictness

Generic Unpackedness 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep Unpackedness 
Instance details

Defined in Language.Haskell.TH.Datatype

type Rep Unpackedness = D1 ('MetaData "Unpackedness" "Language.Haskell.TH.Datatype" "th-abstraction-0.7.1.0-80oylQNbrmxDZOJexbHcoi" 'False) (C1 ('MetaCons "UnspecifiedUnpackedness" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "NoUnpack" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Unpack" 'PrefixI 'False) (U1 :: Type -> Type)))

Methods

from :: Unpackedness -> Rep Unpackedness x

to :: Rep Unpackedness x -> Unpackedness

Generic Group 
Instance details

Defined in Network.TLS.Crypto.Types

Associated Types

type Rep Group 
Instance details

Defined in Network.TLS.Crypto.Types

type Rep Group = D1 ('MetaData "Group" "Network.TLS.Crypto.Types" "tls-2.1.1-3Wf7ZNa2isLVb0R1rAIYI" 'True) (C1 ('MetaCons "Group" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word16)))

Methods

from :: Group -> Rep Group x

to :: Rep Group x -> Group

Generic SessionData 
Instance details

Defined in Network.TLS.Types

Associated Types

type Rep SessionData 
Instance details

Defined in Network.TLS.Types

type Rep SessionData = D1 ('MetaData "SessionData" "Network.TLS.Types" "tls-2.1.1-3Wf7ZNa2isLVb0R1rAIYI" 'False) (C1 ('MetaCons "SessionData" 'PrefixI 'True) (((S1 ('MetaSel ('Just "sessionVersion") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedUnpack) (Rec0 Version) :*: S1 ('MetaSel ('Just "sessionCipher") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedUnpack) (Rec0 CipherID)) :*: (S1 ('MetaSel ('Just "sessionCompression") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedUnpack) (Rec0 CompressionID) :*: (S1 ('MetaSel ('Just "sessionClientSNI") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Maybe HostName)) :*: S1 ('MetaSel ('Just "sessionSecret") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 ByteString)))) :*: ((S1 ('MetaSel ('Just "sessionGroup") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Maybe Group)) :*: S1 ('MetaSel ('Just "sessionTicketInfo") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Maybe TLS13TicketInfo))) :*: (S1 ('MetaSel ('Just "sessionALPN") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Maybe ByteString)) :*: (S1 ('MetaSel ('Just "sessionMaxEarlyDataSize") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedUnpack) (Rec0 Int) :*: S1 ('MetaSel ('Just "sessionFlags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [SessionFlag]))))))

Methods

from :: SessionData -> Rep SessionData x

to :: Rep SessionData x -> SessionData

Generic SessionFlag 
Instance details

Defined in Network.TLS.Types

Associated Types

type Rep SessionFlag 
Instance details

Defined in Network.TLS.Types

type Rep SessionFlag = D1 ('MetaData "SessionFlag" "Network.TLS.Types" "tls-2.1.1-3Wf7ZNa2isLVb0R1rAIYI" 'False) (C1 ('MetaCons "SessionEMS" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: SessionFlag -> Rep SessionFlag x

to :: Rep SessionFlag x -> SessionFlag

Generic TLS13TicketInfo 
Instance details

Defined in Network.TLS.Types

Associated Types

type Rep TLS13TicketInfo 
Instance details

Defined in Network.TLS.Types

type Rep TLS13TicketInfo = D1 ('MetaData "TLS13TicketInfo" "Network.TLS.Types" "tls-2.1.1-3Wf7ZNa2isLVb0R1rAIYI" 'False) (C1 ('MetaCons "TLS13TicketInfo" 'PrefixI 'True) ((S1 ('MetaSel ('Just "lifetime") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedUnpack) (Rec0 Second) :*: S1 ('MetaSel ('Just "ageAdd") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedUnpack) (Rec0 Second)) :*: (S1 ('MetaSel ('Just "txrxTime") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedUnpack) (Rec0 Millisecond) :*: S1 ('MetaSel ('Just "estimatedRTT") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Maybe Millisecond)))))

Methods

from :: TLS13TicketInfo -> Rep TLS13TicketInfo x

to :: Rep TLS13TicketInfo x -> TLS13TicketInfo

Generic Version 
Instance details

Defined in Network.TLS.Types

Associated Types

type Rep Version 
Instance details

Defined in Network.TLS.Types

type Rep Version = D1 ('MetaData "Version" "Network.TLS.Types" "tls-2.1.1-3Wf7ZNa2isLVb0R1rAIYI" 'True) (C1 ('MetaCons "Version" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word16)))

Methods

from :: Version -> Rep Version x

to :: Rep Version x -> Version

Generic UnixTime 
Instance details

Defined in Data.UnixTime.Types

Associated Types

type Rep UnixTime 
Instance details

Defined in Data.UnixTime.Types

type Rep UnixTime = D1 ('MetaData "UnixTime" "Data.UnixTime.Types" "unix-time-0.4.16-FpLRNDUrtotIM0QGxBIvaq" 'False) (C1 ('MetaCons "UnixTime" 'PrefixI 'True) (S1 ('MetaSel ('Just "utSeconds") 'SourceUnpack 'SourceStrict 'DecidedUnpack) (Rec0 CTime) :*: S1 ('MetaSel ('Just "utMicroSeconds") 'SourceUnpack 'SourceStrict 'DecidedUnpack) (Rec0 Int32)))

Methods

from :: UnixTime -> Rep UnixTime x

to :: Rep UnixTime x -> UnixTime

Generic ConcException 
Instance details

Defined in UnliftIO.Internals.Async

Associated Types

type Rep ConcException 
Instance details

Defined in UnliftIO.Internals.Async

type Rep ConcException = D1 ('MetaData "ConcException" "UnliftIO.Internals.Async" "unliftio-0.2.25.1-7gT8REVkY8rG0RkBgU6gjd" 'False) (C1 ('MetaCons "EmptyWithNoAlternative" 'PrefixI 'False) (U1 :: Type -> Type))
Generic CompressParams 
Instance details

Defined in Codec.Compression.Zlib.Internal

Associated Types

type Rep CompressParams 
Instance details

Defined in Codec.Compression.Zlib.Internal

type Rep CompressParams = D1 ('MetaData "CompressParams" "Codec.Compression.Zlib.Internal" "zlib-0.7.1.0-4CQEBn7GbFb5AAdGSuqb3A" 'False) (C1 ('MetaCons "CompressParams" 'PrefixI 'True) ((S1 ('MetaSel ('Just "compressLevel") 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 CompressionLevel) :*: (S1 ('MetaSel ('Just "compressMethod") 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Method) :*: S1 ('MetaSel ('Just "compressWindowBits") 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 WindowBits))) :*: ((S1 ('MetaSel ('Just "compressMemoryLevel") 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 MemoryLevel) :*: S1 ('MetaSel ('Just "compressStrategy") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 CompressionStrategy)) :*: (S1 ('MetaSel ('Just "compressBufferSize") 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Int) :*: S1 ('MetaSel ('Just "compressDictionary") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe ByteString))))))

Methods

from :: CompressParams -> Rep CompressParams x

to :: Rep CompressParams x -> CompressParams

Generic DecompressError 
Instance details

Defined in Codec.Compression.Zlib.Internal

Associated Types

type Rep DecompressError 
Instance details

Defined in Codec.Compression.Zlib.Internal

type Rep DecompressError = D1 ('MetaData "DecompressError" "Codec.Compression.Zlib.Internal" "zlib-0.7.1.0-4CQEBn7GbFb5AAdGSuqb3A" 'False) ((C1 ('MetaCons "TruncatedInput" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DictionaryRequired" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "DictionaryMismatch" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DataFormatError" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String))))

Methods

from :: DecompressError -> Rep DecompressError x

to :: Rep DecompressError x -> DecompressError

Generic DecompressParams 
Instance details

Defined in Codec.Compression.Zlib.Internal

Associated Types

type Rep DecompressParams 
Instance details

Defined in Codec.Compression.Zlib.Internal

type Rep DecompressParams = D1 ('MetaData "DecompressParams" "Codec.Compression.Zlib.Internal" "zlib-0.7.1.0-4CQEBn7GbFb5AAdGSuqb3A" 'False) (C1 ('MetaCons "DecompressParams" 'PrefixI 'True) ((S1 ('MetaSel ('Just "decompressWindowBits") 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 WindowBits) :*: S1 ('MetaSel ('Just "decompressBufferSize") 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Int)) :*: (S1 ('MetaSel ('Just "decompressDictionary") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe ByteString)) :*: S1 ('MetaSel ('Just "decompressAllMembers") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool))))

Methods

from :: DecompressParams -> Rep DecompressParams x

to :: Rep DecompressParams x -> DecompressParams

Generic CompressionLevel 
Instance details

Defined in Codec.Compression.Zlib.Stream

Associated Types

type Rep CompressionLevel 
Instance details

Defined in Codec.Compression.Zlib.Stream

type Rep CompressionLevel = D1 ('MetaData "CompressionLevel" "Codec.Compression.Zlib.Stream" "zlib-0.7.1.0-4CQEBn7GbFb5AAdGSuqb3A" 'True) (C1 ('MetaCons "CompressionLevel" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)))

Methods

from :: CompressionLevel -> Rep CompressionLevel x

to :: Rep CompressionLevel x -> CompressionLevel

Generic CompressionStrategy 
Instance details

Defined in Codec.Compression.Zlib.Stream

Associated Types

type Rep CompressionStrategy 
Instance details

Defined in Codec.Compression.Zlib.Stream

type Rep CompressionStrategy = D1 ('MetaData "CompressionStrategy" "Codec.Compression.Zlib.Stream" "zlib-0.7.1.0-4CQEBn7GbFb5AAdGSuqb3A" 'False) ((C1 ('MetaCons "DefaultStrategy" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Filtered" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "HuffmanOnly" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "RLE" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Fixed" 'PrefixI 'False) (U1 :: Type -> Type))))

Methods

from :: CompressionStrategy -> Rep CompressionStrategy x

to :: Rep CompressionStrategy x -> CompressionStrategy

Generic Format 
Instance details

Defined in Codec.Compression.Zlib.Stream

Associated Types

type Rep Format 
Instance details

Defined in Codec.Compression.Zlib.Stream

type Rep Format = D1 ('MetaData "Format" "Codec.Compression.Zlib.Stream" "zlib-0.7.1.0-4CQEBn7GbFb5AAdGSuqb3A" 'False) ((C1 ('MetaCons "GZip" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Zlib" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Raw" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "GZipOrZlib" 'PrefixI 'False) (U1 :: Type -> Type)))

Methods

from :: Format -> Rep Format x

to :: Rep Format x -> Format

Generic MemoryLevel 
Instance details

Defined in Codec.Compression.Zlib.Stream

Associated Types

type Rep MemoryLevel 
Instance details

Defined in Codec.Compression.Zlib.Stream

type Rep MemoryLevel = D1 ('MetaData "MemoryLevel" "Codec.Compression.Zlib.Stream" "zlib-0.7.1.0-4CQEBn7GbFb5AAdGSuqb3A" 'True) (C1 ('MetaCons "MemoryLevel" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)))

Methods

from :: MemoryLevel -> Rep MemoryLevel x

to :: Rep MemoryLevel x -> MemoryLevel

Generic Method 
Instance details

Defined in Codec.Compression.Zlib.Stream

Associated Types

type Rep Method 
Instance details

Defined in Codec.Compression.Zlib.Stream

type Rep Method = D1 ('MetaData "Method" "Codec.Compression.Zlib.Stream" "zlib-0.7.1.0-4CQEBn7GbFb5AAdGSuqb3A" 'False) (C1 ('MetaCons "Deflated" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: Method -> Rep Method x

to :: Rep Method x -> Method

Generic WindowBits 
Instance details

Defined in Codec.Compression.Zlib.Stream

Associated Types

type Rep WindowBits 
Instance details

Defined in Codec.Compression.Zlib.Stream

type Rep WindowBits = D1 ('MetaData "WindowBits" "Codec.Compression.Zlib.Stream" "zlib-0.7.1.0-4CQEBn7GbFb5AAdGSuqb3A" 'True) (C1 ('MetaCons "WindowBits" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)))

Methods

from :: WindowBits -> Rep WindowBits x

to :: Rep WindowBits x -> WindowBits

Generic () 
Instance details

Defined in GHC.Generics

Associated Types

type Rep () 
Instance details

Defined in GHC.Generics

type Rep () = D1 ('MetaData "Unit" "GHC.Tuple.Prim" "ghc-prim" 'False) (C1 ('MetaCons "()" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: () -> Rep () x

to :: Rep () x -> ()

Generic Bool 
Instance details

Defined in GHC.Generics

Associated Types

type Rep Bool 
Instance details

Defined in GHC.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

Generic (Flag a) 
Instance details

Defined in Distribution.Simple.Flag

Associated Types

type Rep (Flag a) 
Instance details

Defined in Distribution.Simple.Flag

type Rep (Flag a) = D1 ('MetaData "Flag" "Distribution.Simple.Flag" "Cabal-3.10.3.0-f240" 'False) (C1 ('MetaCons "Flag" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)) :+: C1 ('MetaCons "NoFlag" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: Flag a -> Rep (Flag a) x

to :: Rep (Flag a) x -> Flag a

Generic (InstallDirs dir) 
Instance details

Defined in Distribution.Simple.InstallDirs

Associated Types

type Rep (InstallDirs dir) 
Instance details

Defined in Distribution.Simple.InstallDirs

type Rep (InstallDirs dir) = D1 ('MetaData "InstallDirs" "Distribution.Simple.InstallDirs" "Cabal-3.10.3.0-f240" 'False) (C1 ('MetaCons "InstallDirs" 'PrefixI 'True) ((((S1 ('MetaSel ('Just "prefix") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 dir) :*: S1 ('MetaSel ('Just "bindir") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 dir)) :*: (S1 ('MetaSel ('Just "libdir") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 dir) :*: S1 ('MetaSel ('Just "libsubdir") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 dir))) :*: ((S1 ('MetaSel ('Just "dynlibdir") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 dir) :*: S1 ('MetaSel ('Just "flibdir") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 dir)) :*: (S1 ('MetaSel ('Just "libexecdir") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 dir) :*: S1 ('MetaSel ('Just "libexecsubdir") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 dir)))) :*: (((S1 ('MetaSel ('Just "includedir") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 dir) :*: S1 ('MetaSel ('Just "datadir") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 dir)) :*: (S1 ('MetaSel ('Just "datasubdir") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 dir) :*: S1 ('MetaSel ('Just "docdir") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 dir))) :*: ((S1 ('MetaSel ('Just "mandir") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 dir) :*: S1 ('MetaSel ('Just "htmldir") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 dir)) :*: (S1 ('MetaSel ('Just "haddockdir") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 dir) :*: S1 ('MetaSel ('Just "sysconfdir") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 dir))))))

Methods

from :: InstallDirs dir -> Rep (InstallDirs dir) x

to :: Rep (InstallDirs dir) x -> InstallDirs dir

Generic (PackageIndex a) 
Instance details

Defined in Distribution.Simple.PackageIndex

Associated Types

type Rep (PackageIndex a) 
Instance details

Defined in Distribution.Simple.PackageIndex

type Rep (PackageIndex a) = D1 ('MetaData "PackageIndex" "Distribution.Simple.PackageIndex" "Cabal-3.10.3.0-f240" 'False) (C1 ('MetaCons "PackageIndex" 'PrefixI 'True) (S1 ('MetaSel ('Just "unitIdIndex") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Map UnitId a)) :*: S1 ('MetaSel ('Just "packageIdIndex") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Map (PackageName, LibraryName) (Map Version [a])))))

Methods

from :: PackageIndex a -> Rep (PackageIndex a) x

to :: Rep (PackageIndex a) x -> PackageIndex a

Generic (NubList a) 
Instance details

Defined in Distribution.Utils.NubList

Associated Types

type Rep (NubList a) 
Instance details

Defined in Distribution.Utils.NubList

type Rep (NubList a) = D1 ('MetaData "NubList" "Distribution.Utils.NubList" "Cabal-3.10.3.0-f240" 'True) (C1 ('MetaCons "NubList" 'PrefixI 'True) (S1 ('MetaSel ('Just "fromNubList") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [a])))

Methods

from :: NubList a -> Rep (NubList a) x

to :: Rep (NubList a) x -> NubList a

Generic (Last' a) 
Instance details

Defined in Distribution.Compat.Semigroup

Associated Types

type Rep (Last' a) 
Instance details

Defined in Distribution.Compat.Semigroup

type Rep (Last' a) = D1 ('MetaData "Last'" "Distribution.Compat.Semigroup" "Cabal-syntax-3.10.3.0-4da5" 'True) (C1 ('MetaCons "Last'" 'PrefixI 'True) (S1 ('MetaSel ('Just "getLast'") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))

Methods

from :: Last' a -> Rep (Last' a) x

to :: Rep (Last' a) x -> Last' a

Generic (Option' a) 
Instance details

Defined in Distribution.Compat.Semigroup

Associated Types

type Rep (Option' a) 
Instance details

Defined in Distribution.Compat.Semigroup

type Rep (Option' a) = D1 ('MetaData "Option'" "Distribution.Compat.Semigroup" "Cabal-syntax-3.10.3.0-4da5" 'True) (C1 ('MetaCons "Option'" 'PrefixI 'True) (S1 ('MetaSel ('Just "getOption'") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe a))))

Methods

from :: Option' a -> Rep (Option' a) x

to :: Rep (Option' a) x -> Option' a

Generic (PerCompilerFlavor v) 
Instance details

Defined in Distribution.Compiler

Associated Types

type Rep (PerCompilerFlavor v) 
Instance details

Defined in Distribution.Compiler

type Rep (PerCompilerFlavor v) = D1 ('MetaData "PerCompilerFlavor" "Distribution.Compiler" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "PerCompilerFlavor" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 v) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 v)))

Methods

from :: PerCompilerFlavor v -> Rep (PerCompilerFlavor v) x

to :: Rep (PerCompilerFlavor v) x -> PerCompilerFlavor v

Generic (Condition c) 
Instance details

Defined in Distribution.Types.Condition

Associated Types

type Rep (Condition c) 
Instance details

Defined in Distribution.Types.Condition

type Rep (Condition c) = D1 ('MetaData "Condition" "Distribution.Types.Condition" "Cabal-syntax-3.10.3.0-4da5" 'False) ((C1 ('MetaCons "Var" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 c)) :+: C1 ('MetaCons "Lit" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool))) :+: (C1 ('MetaCons "CNot" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Condition c))) :+: (C1 ('MetaCons "COr" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Condition c)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Condition c))) :+: C1 ('MetaCons "CAnd" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Condition c)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Condition c))))))

Methods

from :: Condition c -> Rep (Condition c) x

to :: Rep (Condition c) x -> Condition c

Generic (VersionRangeF a) 
Instance details

Defined in Distribution.Types.VersionRange.Internal

Associated Types

type Rep (VersionRangeF a) 
Instance details

Defined in Distribution.Types.VersionRange.Internal

type Rep (VersionRangeF a) = D1 ('MetaData "VersionRangeF" "Distribution.Types.VersionRange.Internal" "Cabal-syntax-3.10.3.0-4da5" 'False) (((C1 ('MetaCons "ThisVersionF" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Version)) :+: C1 ('MetaCons "LaterVersionF" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Version))) :+: (C1 ('MetaCons "OrLaterVersionF" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Version)) :+: C1 ('MetaCons "EarlierVersionF" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Version)))) :+: ((C1 ('MetaCons "OrEarlierVersionF" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Version)) :+: C1 ('MetaCons "MajorBoundVersionF" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Version))) :+: (C1 ('MetaCons "UnionVersionRangesF" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)) :+: C1 ('MetaCons "IntersectVersionRangesF" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))))

Methods

from :: VersionRangeF a -> Rep (VersionRangeF a) x

to :: Rep (VersionRangeF a) x -> VersionRangeF a

Generic (WithJSONWarnings a) 
Instance details

Defined in Data.Aeson.WarningParser

Associated Types

type Rep (WithJSONWarnings a) 
Instance details

Defined in Data.Aeson.WarningParser

type Rep (WithJSONWarnings a) = D1 ('MetaData "WithJSONWarnings" "Data.Aeson.WarningParser" "aeson-warning-parser-0.1.1-HtaLudSHgYJ8Il50xygI3" 'False) (C1 ('MetaCons "WithJSONWarnings" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [JSONWarning])))

Methods

from :: WithJSONWarnings a -> Rep (WithJSONWarnings a) x

to :: Rep (WithJSONWarnings a) x -> WithJSONWarnings a

Generic (ZipList a) 
Instance details

Defined in Control.Applicative

Associated Types

type Rep (ZipList a) 
Instance details

Defined in Control.Applicative

type Rep (ZipList a) = D1 ('MetaData "ZipList" "Control.Applicative" "base" '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

Generic (Complex a) 
Instance details

Defined in Data.Complex

Associated Types

type Rep (Complex a) 
Instance details

Defined in Data.Complex

type Rep (Complex a) = D1 ('MetaData "Complex" "Data.Complex" "base" 'False) (C1 ('MetaCons ":+" ('InfixI 'NotAssociative 6) 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 a)))

Methods

from :: Complex a -> Rep (Complex a) x

to :: Rep (Complex a) x -> Complex a

Generic (Identity a) 
Instance details

Defined in Data.Functor.Identity

Associated Types

type Rep (Identity a) 
Instance details

Defined in Data.Functor.Identity

type Rep (Identity a) = D1 ('MetaData "Identity" "Data.Functor.Identity" "base" 'True) (C1 ('MetaCons "Identity" 'PrefixI 'True) (S1 ('MetaSel ('Just "runIdentity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))

Methods

from :: Identity a -> Rep (Identity a) x

to :: Rep (Identity a) x -> Identity a

Generic (First a) 
Instance details

Defined in Data.Monoid

Associated Types

type Rep (First a) 
Instance details

Defined in Data.Monoid

type Rep (First a) = D1 ('MetaData "First" "Data.Monoid" "base" 'True) (C1 ('MetaCons "First" 'PrefixI 'True) (S1 ('MetaSel ('Just "getFirst") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe a))))

Methods

from :: First a -> Rep (First a) x

to :: Rep (First a) x -> First a

Generic (Last a) 
Instance details

Defined in Data.Monoid

Associated Types

type Rep (Last a) 
Instance details

Defined in Data.Monoid

type Rep (Last a) = D1 ('MetaData "Last" "Data.Monoid" "base" 'True) (C1 ('MetaCons "Last" 'PrefixI 'True) (S1 ('MetaSel ('Just "getLast") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe a))))

Methods

from :: Last a -> Rep (Last a) x

to :: Rep (Last a) x -> Last a

Generic (Down a) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Down a) 
Instance details

Defined in GHC.Generics

type Rep (Down a) = D1 ('MetaData "Down" "Data.Ord" "base" 'True) (C1 ('MetaCons "Down" 'PrefixI 'True) (S1 ('MetaSel ('Just "getDown") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))

Methods

from :: Down a -> Rep (Down a) x

to :: Rep (Down a) x -> Down a

Generic (First a) 
Instance details

Defined in Data.Semigroup

Associated Types

type Rep (First a) 
Instance details

Defined in Data.Semigroup

type Rep (First a) = D1 ('MetaData "First" "Data.Semigroup" "base" 'True) (C1 ('MetaCons "First" 'PrefixI 'True) (S1 ('MetaSel ('Just "getFirst") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))

Methods

from :: First a -> Rep (First a) x

to :: Rep (First a) x -> First a

Generic (Last a) 
Instance details

Defined in Data.Semigroup

Associated Types

type Rep (Last a) 
Instance details

Defined in Data.Semigroup

type Rep (Last a) = D1 ('MetaData "Last" "Data.Semigroup" "base" 'True) (C1 ('MetaCons "Last" 'PrefixI 'True) (S1 ('MetaSel ('Just "getLast") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))

Methods

from :: Last a -> Rep (Last a) x

to :: Rep (Last a) x -> Last a

Generic (Max a) 
Instance details

Defined in Data.Semigroup

Associated Types

type Rep (Max a) 
Instance details

Defined in Data.Semigroup

type Rep (Max a) = D1 ('MetaData "Max" "Data.Semigroup" "base" 'True) (C1 ('MetaCons "Max" 'PrefixI 'True) (S1 ('MetaSel ('Just "getMax") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))

Methods

from :: Max a -> Rep (Max a) x

to :: Rep (Max a) x -> Max a

Generic (Min a) 
Instance details

Defined in Data.Semigroup

Associated Types

type Rep (Min a) 
Instance details

Defined in Data.Semigroup

type Rep (Min a) = D1 ('MetaData "Min" "Data.Semigroup" "base" 'True) (C1 ('MetaCons "Min" 'PrefixI 'True) (S1 ('MetaSel ('Just "getMin") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))

Methods

from :: Min a -> Rep (Min a) x

to :: Rep (Min a) x -> Min a

Generic (WrappedMonoid m) 
Instance details

Defined in Data.Semigroup

Associated Types

type Rep (WrappedMonoid m) 
Instance details

Defined in Data.Semigroup

type Rep (WrappedMonoid m) = D1 ('MetaData "WrappedMonoid" "Data.Semigroup" "base" 'True) (C1 ('MetaCons "WrapMonoid" 'PrefixI 'True) (S1 ('MetaSel ('Just "unwrapMonoid") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 m)))

Methods

from :: WrappedMonoid m -> Rep (WrappedMonoid m) x

to :: Rep (WrappedMonoid m) x -> WrappedMonoid m

Generic (Dual a) 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep (Dual a) 
Instance details

Defined in Data.Semigroup.Internal

type Rep (Dual a) = D1 ('MetaData "Dual" "Data.Semigroup.Internal" "base" 'True) (C1 ('MetaCons "Dual" 'PrefixI 'True) (S1 ('MetaSel ('Just "getDual") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))

Methods

from :: Dual a -> Rep (Dual a) x

to :: Rep (Dual a) x -> Dual a

Generic (Endo a) 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep (Endo a) 
Instance details

Defined in Data.Semigroup.Internal

type Rep (Endo a) = D1 ('MetaData "Endo" "Data.Semigroup.Internal" "base" 'True) (C1 ('MetaCons "Endo" 'PrefixI 'True) (S1 ('MetaSel ('Just "appEndo") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (a -> a))))

Methods

from :: Endo a -> Rep (Endo a) x

to :: Rep (Endo a) x -> Endo a

Generic (Product a) 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep (Product a) 
Instance details

Defined in Data.Semigroup.Internal

type Rep (Product a) = D1 ('MetaData "Product" "Data.Semigroup.Internal" "base" 'True) (C1 ('MetaCons "Product" 'PrefixI 'True) (S1 ('MetaSel ('Just "getProduct") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))

Methods

from :: Product a -> Rep (Product a) x

to :: Rep (Product a) x -> Product a

Generic (Sum a) 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep (Sum a) 
Instance details

Defined in Data.Semigroup.Internal

type Rep (Sum a) = D1 ('MetaData "Sum" "Data.Semigroup.Internal" "base" 'True) (C1 ('MetaCons "Sum" 'PrefixI 'True) (S1 ('MetaSel ('Just "getSum") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))

Methods

from :: Sum a -> Rep (Sum a) x

to :: Rep (Sum a) x -> Sum a

Generic (NonEmpty a) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (NonEmpty a) 
Instance details

Defined in GHC.Generics

type Rep (NonEmpty a) = D1 ('MetaData "NonEmpty" "GHC.Base" "base" 'False) (C1 ('MetaCons ":|" ('InfixI 'RightAssociative 5) 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [a])))

Methods

from :: NonEmpty a -> Rep (NonEmpty a) x

to :: Rep (NonEmpty a) x -> NonEmpty a

Generic (Par1 p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Par1 p) 
Instance details

Defined in GHC.Generics

type Rep (Par1 p) = D1 ('MetaData "Par1" "GHC.Generics" "base" 'True) (C1 ('MetaCons "Par1" 'PrefixI 'True) (S1 ('MetaSel ('Just "unPar1") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 p)))

Methods

from :: Par1 p -> Rep (Par1 p) x

to :: Rep (Par1 p) x -> Par1 p

Generic (SCC vertex) 
Instance details

Defined in Data.Graph

Associated Types

type Rep (SCC vertex) 
Instance details

Defined in Data.Graph

type Rep (SCC vertex) = D1 ('MetaData "SCC" "Data.Graph" "containers-0.6.8-b2d8" 'False) (C1 ('MetaCons "AcyclicSCC" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 vertex)) :+: C1 ('MetaCons "CyclicSCC" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [vertex])))

Methods

from :: SCC vertex -> Rep (SCC vertex) x

to :: Rep (SCC vertex) x -> SCC vertex

Generic (Digit a) 
Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep (Digit a) 
Instance details

Defined in Data.Sequence.Internal

type Rep (Digit a) = D1 ('MetaData "Digit" "Data.Sequence.Internal" "containers-0.6.8-b2d8" 'False) ((C1 ('MetaCons "One" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)) :+: C1 ('MetaCons "Two" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a))) :+: (C1 ('MetaCons "Three" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a))) :+: C1 ('MetaCons "Four" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))))

Methods

from :: Digit a -> Rep (Digit a) x

to :: Rep (Digit a) x -> Digit a

Generic (Elem a) 
Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep (Elem a) 
Instance details

Defined in Data.Sequence.Internal

type Rep (Elem a) = D1 ('MetaData "Elem" "Data.Sequence.Internal" "containers-0.6.8-b2d8" 'True) (C1 ('MetaCons "Elem" 'PrefixI 'True) (S1 ('MetaSel ('Just "getElem") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))

Methods

from :: Elem a -> Rep (Elem a) x

to :: Rep (Elem a) x -> Elem a

Generic (FingerTree a) 
Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep (FingerTree a) 
Instance details

Defined in Data.Sequence.Internal

type Rep (FingerTree a) = D1 ('MetaData "FingerTree" "Data.Sequence.Internal" "containers-0.6.8-b2d8" 'False) (C1 ('MetaCons "EmptyT" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Single" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)) :+: C1 ('MetaCons "Deep" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'SourceUnpack 'SourceStrict 'DecidedUnpack) (Rec0 Int) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Digit a))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (FingerTree (Node a))) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Digit a))))))

Methods

from :: FingerTree a -> Rep (FingerTree a) x

to :: Rep (FingerTree a) x -> FingerTree a

Generic (Node a) 
Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep (Node a) 
Instance details

Defined in Data.Sequence.Internal

type Rep (Node a) = D1 ('MetaData "Node" "Data.Sequence.Internal" "containers-0.6.8-b2d8" 'False) (C1 ('MetaCons "Node2" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'SourceUnpack 'SourceStrict 'DecidedUnpack) (Rec0 Int) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a))) :+: C1 ('MetaCons "Node3" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'SourceUnpack 'SourceStrict 'DecidedUnpack) (Rec0 Int) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a))))

Methods

from :: Node a -> Rep (Node a) x

to :: Rep (Node a) x -> Node a

Generic (ViewL a) 
Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep (ViewL a) 
Instance details

Defined in Data.Sequence.Internal

type Rep (ViewL a) = D1 ('MetaData "ViewL" "Data.Sequence.Internal" "containers-0.6.8-b2d8" 'False) (C1 ('MetaCons "EmptyL" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons ":<" ('InfixI 'RightAssociative 5) 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Seq a))))

Methods

from :: ViewL a -> Rep (ViewL a) x

to :: Rep (ViewL a) x -> ViewL a

Generic (ViewR a) 
Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep (ViewR a) 
Instance details

Defined in Data.Sequence.Internal

type Rep (ViewR a) = D1 ('MetaData "ViewR" "Data.Sequence.Internal" "containers-0.6.8-b2d8" 'False) (C1 ('MetaCons "EmptyR" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons ":>" ('InfixI 'LeftAssociative 5) 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Seq a)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))

Methods

from :: ViewR a -> Rep (ViewR a) x

to :: Rep (ViewR a) x -> ViewR a

Generic (Tree a) 
Instance details

Defined in Data.Tree

Associated Types

type Rep (Tree a) 
Instance details

Defined in Data.Tree

type Rep (Tree a) = D1 ('MetaData "Tree" "Data.Tree" "containers-0.6.8-b2d8" 'False) (C1 ('MetaCons "Node" 'PrefixI 'True) (S1 ('MetaSel ('Just "rootLabel") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "subForest") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Tree a])))

Methods

from :: Tree a -> Rep (Tree a) x

to :: Rep (Tree a) x -> Tree a

Generic (Fix f) 
Instance details

Defined in Data.Fix

Associated Types

type Rep (Fix f) 
Instance details

Defined in Data.Fix

type Rep (Fix f) = D1 ('MetaData "Fix" "Data.Fix" "data-fix-0.3.4-8L32rhurBEr3omLqvQrtWV" 'True) (C1 ('MetaCons "Fix" 'PrefixI 'True) (S1 ('MetaSel ('Just "unFix") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (f (Fix f)))))

Methods

from :: Fix f -> Rep (Fix f) x

to :: Rep (Fix f) x -> Fix f

Generic (SizedSeq a) 
Instance details

Defined in GHC.Data.SizedSeq

Associated Types

type Rep (SizedSeq a) 
Instance details

Defined in GHC.Data.SizedSeq

type Rep (SizedSeq a) = D1 ('MetaData "SizedSeq" "GHC.Data.SizedSeq" "ghc-boot-9.8.4-19c8" 'False) (C1 ('MetaCons "SizedSeq" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'SourceUnpack 'SourceStrict 'DecidedUnpack) (Rec0 Word) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [a])))

Methods

from :: SizedSeq a -> Rep (SizedSeq a) x

to :: Rep (SizedSeq a) x -> SizedSeq a

Generic (HistoriedResponse body) 
Instance details

Defined in Network.HTTP.Client

Associated Types

type Rep (HistoriedResponse body) 
Instance details

Defined in Network.HTTP.Client

type Rep (HistoriedResponse body) = D1 ('MetaData "HistoriedResponse" "Network.HTTP.Client" "http-client-0.7.19-KQ9E2WLMlv48C9Gd6jTAYi" 'False) (C1 ('MetaCons "HistoriedResponse" 'PrefixI 'True) (S1 ('MetaSel ('Just "hrRedirects") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(Request, Response ByteString)]) :*: (S1 ('MetaSel ('Just "hrFinalRequest") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Request) :*: S1 ('MetaSel ('Just "hrFinalResponse") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Response body)))))

Methods

from :: HistoriedResponse body -> Rep (HistoriedResponse body) x

to :: Rep (HistoriedResponse body) x -> HistoriedResponse body

Generic (AddrRange a) 
Instance details

Defined in Data.IP.Range

Associated Types

type Rep (AddrRange a) 
Instance details

Defined in Data.IP.Range

type Rep (AddrRange a) = D1 ('MetaData "AddrRange" "Data.IP.Range" "iproute-1.7.15-JZpWeHuH1mR314TowNK9ks" 'False) (C1 ('MetaCons "AddrRange" 'PrefixI 'True) (S1 ('MetaSel ('Just "addr") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 a) :*: (S1 ('MetaSel ('Just "mask") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 a) :*: S1 ('MetaSel ('Just "mlen") 'SourceUnpack 'SourceStrict 'DecidedUnpack) (Rec0 Int))))

Methods

from :: AddrRange a -> Rep (AddrRange a) x

to :: Rep (AddrRange a) x -> AddrRange a

Generic (ResolvedPath t) 
Instance details

Defined in Pantry.Types

Associated Types

type Rep (ResolvedPath t) 
Instance details

Defined in Pantry.Types

type Rep (ResolvedPath t) = D1 ('MetaData "ResolvedPath" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "ResolvedPath" 'PrefixI 'True) (S1 ('MetaSel ('Just "resolvedRelative") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 RelFilePath) :*: S1 ('MetaSel ('Just "resolvedAbsolute") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Path Abs t))))

Methods

from :: ResolvedPath t -> Rep (ResolvedPath t) x

to :: Rep (ResolvedPath t) x -> ResolvedPath t

Generic (SomeBase t) 
Instance details

Defined in Path.Posix

Associated Types

type Rep (SomeBase t) 
Instance details

Defined in Path.Posix

type Rep (SomeBase t) = D1 ('MetaData "SomeBase" "Path.Posix" "path-0.9.5-CmwvFN5dtyjKIUDzlNEdLE" 'False) (C1 ('MetaCons "Abs" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Path Abs t))) :+: C1 ('MetaCons "Rel" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Path Rel t))))

Methods

from :: SomeBase t -> Rep (SomeBase t) x

to :: Rep (SomeBase t) x -> SomeBase t

Generic (SomeBase t) 
Instance details

Defined in Path.Windows

Associated Types

type Rep (SomeBase t) 
Instance details

Defined in Path.Windows

type Rep (SomeBase t) = D1 ('MetaData "SomeBase" "Path.Windows" "path-0.9.5-CmwvFN5dtyjKIUDzlNEdLE" 'False) (C1 ('MetaCons "Abs" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Path Abs t))) :+: C1 ('MetaCons "Rel" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Path Rel t))))

Methods

from :: SomeBase t -> Rep (SomeBase t) x

to :: Rep (SomeBase t) x -> SomeBase t

(Generic (Key record), Generic record) => Generic (Entity record) 
Instance details

Defined in Database.Persist.Class.PersistEntity

Associated Types

type Rep (Entity record) 
Instance details

Defined in Database.Persist.Class.PersistEntity

type Rep (Entity record) = D1 ('MetaData "Entity" "Database.Persist.Class.PersistEntity" "persistent-2.14.6.3-1gfq6MW00LyH0bAtJDR0Sg" 'False) (C1 ('MetaCons "Entity" 'PrefixI 'True) (S1 ('MetaSel ('Just "entityKey") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Key record)) :*: S1 ('MetaSel ('Just "entityVal") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 record)))

Methods

from :: Entity record -> Rep (Entity record) x

to :: Rep (Entity record) x -> Entity record

Generic (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Associated Types

type Rep (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

type Rep (Doc a) = D1 ('MetaData "Doc" "Text.PrettyPrint.Annotated.HughesPJ" "pretty-1.1.3.6-b6ac" 'False) (((C1 ('MetaCons "Empty" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "NilAbove" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Doc a)))) :+: (C1 ('MetaCons "TextBeside" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (AnnotDetails a)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Doc a))) :+: C1 ('MetaCons "Nest" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'SourceUnpack 'SourceStrict 'DecidedUnpack) (Rec0 Int) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Doc a))))) :+: ((C1 ('MetaCons "Union" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Doc a)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Doc a))) :+: C1 ('MetaCons "NoDoc" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Beside" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Doc a)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Doc a)))) :+: C1 ('MetaCons "Above" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Doc a)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Doc a)))))))

Methods

from :: Doc a -> Rep (Doc a) x

to :: Rep (Doc a) x -> Doc a

Generic (Doc ann) 
Instance details

Defined in Prettyprinter.Internal

Associated Types

type Rep (Doc ann) 
Instance details

Defined in Prettyprinter.Internal

type Rep (Doc ann) = D1 ('MetaData "Doc" "Prettyprinter.Internal" "prettyprinter-1.7.1-69HZb3TFwAH4WjBm9DLwuS" 'False) (((C1 ('MetaCons "Fail" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Empty" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Char" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Char)))) :+: (C1 ('MetaCons "Text" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Int) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text)) :+: (C1 ('MetaCons "Line" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "FlatAlt" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Doc ann)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Doc ann)))))) :+: ((C1 ('MetaCons "Cat" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Doc ann)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Doc ann))) :+: (C1 ('MetaCons "Nest" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Int) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Doc ann))) :+: C1 ('MetaCons "Union" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Doc ann)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Doc ann))))) :+: ((C1 ('MetaCons "Column" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Int -> Doc ann))) :+: C1 ('MetaCons "WithPageWidth" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (PageWidth -> Doc ann)))) :+: (C1 ('MetaCons "Nesting" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Int -> Doc ann))) :+: C1 ('MetaCons "Annotated" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ann) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Doc ann)))))))

Methods

from :: Doc ann -> Rep (Doc ann) x

to :: Rep (Doc ann) x -> Doc ann

Generic (SimpleDocStream ann) 
Instance details

Defined in Prettyprinter.Internal

Associated Types

type Rep (SimpleDocStream ann) 
Instance details

Defined in Prettyprinter.Internal

type Rep (SimpleDocStream ann) = D1 ('MetaData "SimpleDocStream" "Prettyprinter.Internal" "prettyprinter-1.7.1-69HZb3TFwAH4WjBm9DLwuS" 'False) ((C1 ('MetaCons "SFail" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "SEmpty" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "SChar" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Char) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (SimpleDocStream ann))))) :+: ((C1 ('MetaCons "SText" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Int) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (SimpleDocStream ann)))) :+: C1 ('MetaCons "SLine" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Int) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (SimpleDocStream ann)))) :+: (C1 ('MetaCons "SAnnPush" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ann) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (SimpleDocStream ann))) :+: C1 ('MetaCons "SAnnPop" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (SimpleDocStream ann))))))

Methods

from :: SimpleDocStream ann -> Rep (SimpleDocStream ann) x

to :: Rep (SimpleDocStream ann) x -> SimpleDocStream ann

Generic (PrecompiledCache base) Source # 
Instance details

Defined in Stack.Types.Build

Associated Types

type Rep (PrecompiledCache base) 
Instance details

Defined in Stack.Types.Build

type Rep (PrecompiledCache base) = D1 ('MetaData "PrecompiledCache" "Stack.Types.Build" "stack-3.1.1-Jkd8kxrin7nLuuv5NJBnEC" 'False) (C1 ('MetaCons "PrecompiledCache" 'PrefixI 'True) (S1 ('MetaSel ('Just "library") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe (Path base File))) :*: (S1 ('MetaSel ('Just "subLibs") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 [Path base File]) :*: S1 ('MetaSel ('Just "exes") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 [Path base File]))))

Methods

from :: PrecompiledCache base -> Rep (PrecompiledCache base) x

to :: Rep (PrecompiledCache base) x -> PrecompiledCache base

Generic (Maybe a) 
Instance details

Defined in Data.Strict.Maybe

Associated Types

type Rep (Maybe a) 
Instance details

Defined in Data.Strict.Maybe

type Rep (Maybe a) = D1 ('MetaData "Maybe" "Data.Strict.Maybe" "strict-0.5.1-gzmuAqAdvt3TUspeushIr" 'False) (C1 ('MetaCons "Nothing" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Just" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 a)))

Methods

from :: Maybe a -> Rep (Maybe a) x

to :: Rep (Maybe a) x -> Maybe a

Generic (TyVarBndr flag) 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep (TyVarBndr flag) 
Instance details

Defined in Language.Haskell.TH.Syntax

type Rep (TyVarBndr flag) = D1 ('MetaData "TyVarBndr" "Language.Haskell.TH.Syntax" "template-haskell" 'False) (C1 ('MetaCons "PlainTV" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 flag)) :+: C1 ('MetaCons "KindedTV" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Name) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 flag) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Kind))))

Methods

from :: TyVarBndr flag -> Rep (TyVarBndr flag) x

to :: Rep (TyVarBndr flag) x -> TyVarBndr flag

Generic (Maybe a) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Maybe a) 
Instance details

Defined in GHC.Generics

type Rep (Maybe a) = D1 ('MetaData "Maybe" "GHC.Maybe" "base" '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

Generic (Solo a) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Solo a) 
Instance details

Defined in GHC.Generics

type Rep (Solo a) = D1 ('MetaData "Solo" "GHC.Tuple.Prim" "ghc-prim" 'False) (C1 ('MetaCons "MkSolo" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))

Methods

from :: Solo a -> Rep (Solo a) x

to :: Rep (Solo a) x -> Solo a

Generic [a] 
Instance details

Defined in GHC.Generics

Associated Types

type Rep [a] 
Instance details

Defined in GHC.Generics

type Rep [a] = D1 ('MetaData "List" "GHC.Types" "ghc-prim" 'False) (C1 ('MetaCons "[]" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons ":" ('InfixI 'RightAssociative 5) 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [a])))

Methods

from :: [a] -> Rep [a] x

to :: Rep [a] x -> [a]

Generic (SymbolicPath from to) 
Instance details

Defined in Distribution.Utils.Path

Associated Types

type Rep (SymbolicPath from to) 
Instance details

Defined in Distribution.Utils.Path

type Rep (SymbolicPath from to) = D1 ('MetaData "SymbolicPath" "Distribution.Utils.Path" "Cabal-syntax-3.10.3.0-4da5" 'True) (C1 ('MetaCons "SymbolicPath" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FilePath)))

Methods

from :: SymbolicPath from to -> Rep (SymbolicPath from to) x

to :: Rep (SymbolicPath from to) x -> SymbolicPath from to

Generic (WrappedMonad m a) 
Instance details

Defined in Control.Applicative

Associated Types

type Rep (WrappedMonad m a) 
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

Generic (Either a b) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Either a b) 
Instance details

Defined in GHC.Generics

type Rep (Either a b) = D1 ('MetaData "Either" "Data.Either" "base" 'False) (C1 ('MetaCons "Left" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)) :+: C1 ('MetaCons "Right" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 b)))

Methods

from :: Either a b -> Rep (Either a b) x

to :: Rep (Either a b) x -> Either a b

Generic (Proxy t) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Proxy t) 
Instance details

Defined in GHC.Generics

type Rep (Proxy t) = D1 ('MetaData "Proxy" "Data.Proxy" "base" 'False) (C1 ('MetaCons "Proxy" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: Proxy t -> Rep (Proxy t) x

to :: Rep (Proxy t) x -> Proxy t

Generic (Arg a b) 
Instance details

Defined in Data.Semigroup

Associated Types

type Rep (Arg a b) 
Instance details

Defined in Data.Semigroup

type Rep (Arg a b) = D1 ('MetaData "Arg" "Data.Semigroup" "base" 'False) (C1 ('MetaCons "Arg" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 b)))

Methods

from :: Arg a b -> Rep (Arg a b) x

to :: Rep (Arg a b) x -> Arg a b

Generic (U1 p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (U1 p) 
Instance details

Defined in GHC.Generics

type Rep (U1 p) = D1 ('MetaData "U1" "GHC.Generics" "base" 'False) (C1 ('MetaCons "U1" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: U1 p -> Rep (U1 p) x

to :: Rep (U1 p) x -> U1 p

Generic (V1 p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (V1 p) 
Instance details

Defined in GHC.Generics

type Rep (V1 p) = D1 ('MetaData "V1" "GHC.Generics" "base" 'False) (V1 :: Type -> Type)

Methods

from :: V1 p -> Rep (V1 p) x

to :: Rep (V1 p) x -> V1 p

Generic (PackageConfig_ library executable) 
Instance details

Defined in Hpack.Config

Associated Types

type Rep (PackageConfig_ library executable) 
Instance details

Defined in Hpack.Config

type Rep (PackageConfig_ library executable) = D1 ('MetaData "PackageConfig_" "Hpack.Config" "hpack-0.37.0-6QOqTVj8oRKEq9TILTOany" 'False) (C1 ('MetaCons "PackageConfig" 'PrefixI 'True) ((((S1 ('MetaSel ('Just "packageConfigName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe String)) :*: (S1 ('MetaSel ('Just "packageConfigVersion") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe PackageVersion)) :*: S1 ('MetaSel ('Just "packageConfigSynopsis") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe String)))) :*: ((S1 ('MetaSel ('Just "packageConfigDescription") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe String)) :*: S1 ('MetaSel ('Just "packageConfigHomepage") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (Maybe String)))) :*: (S1 ('MetaSel ('Just "packageConfigBugReports") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (Maybe String))) :*: S1 ('MetaSel ('Just "packageConfigCategory") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe String))))) :*: ((S1 ('MetaSel ('Just "packageConfigStability") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe String)) :*: (S1 ('MetaSel ('Just "packageConfigAuthor") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (List String))) :*: S1 ('MetaSel ('Just "packageConfigMaintainer") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (Maybe (List String)))))) :*: ((S1 ('MetaSel ('Just "packageConfigCopyright") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (List String))) :*: S1 ('MetaSel ('Just "packageConfigBuildType") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe BuildType))) :*: (S1 ('MetaSel ('Just "packageConfigLicense") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (Maybe String))) :*: S1 ('MetaSel ('Just "packageConfigLicenseFile") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (List String))))))) :*: (((S1 ('MetaSel ('Just "packageConfigTestedWith") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (List String))) :*: (S1 ('MetaSel ('Just "packageConfigFlags") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (Map String FlagSection))) :*: S1 ('MetaSel ('Just "packageConfigExtraSourceFiles") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (List FilePath))))) :*: ((S1 ('MetaSel ('Just "packageConfigExtraDocFiles") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (List FilePath))) :*: S1 ('MetaSel ('Just "packageConfigDataFiles") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (List FilePath)))) :*: (S1 ('MetaSel ('Just "packageConfigDataDir") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe FilePath)) :*: S1 ('MetaSel ('Just "packageConfigGithub") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe GitHub))))) :*: (((S1 ('MetaSel ('Just "packageConfigGit") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe String)) :*: S1 ('MetaSel ('Just "packageConfigCustomSetup") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe CustomSetupSection))) :*: (S1 ('MetaSel ('Just "packageConfigLibrary") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe library)) :*: S1 ('MetaSel ('Just "packageConfigInternalLibraries") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (Map String library))))) :*: ((S1 ('MetaSel ('Just "packageConfigExecutable") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe executable)) :*: S1 ('MetaSel ('Just "packageConfigExecutables") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (Map String executable)))) :*: (S1 ('MetaSel ('Just "packageConfigTests") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (Map String executable))) :*: S1 ('MetaSel ('Just "packageConfigBenchmarks") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (Map String executable)))))))))

Methods

from :: PackageConfig_ library executable -> Rep (PackageConfig_ library executable) x

to :: Rep (PackageConfig_ library executable) x -> PackageConfig_ library executable

Generic (Path b t) 
Instance details

Defined in Path.Internal.Posix

Associated Types

type Rep (Path b t) 
Instance details

Defined in Path.Internal.Posix

type Rep (Path b t) = D1 ('MetaData "Path" "Path.Internal.Posix" "path-0.9.5-CmwvFN5dtyjKIUDzlNEdLE" 'True) (C1 ('MetaCons "Path" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FilePath)))

Methods

from :: Path b t -> Rep (Path b t) x

to :: Rep (Path b t) x -> Path b t

Generic (Path b t) 
Instance details

Defined in Path.Internal.Windows

Associated Types

type Rep (Path b t) 
Instance details

Defined in Path.Internal.Windows

type Rep (Path b t) = D1 ('MetaData "Path" "Path.Internal.Windows" "path-0.9.5-CmwvFN5dtyjKIUDzlNEdLE" 'True) (C1 ('MetaCons "Path" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FilePath)))

Methods

from :: Path b t -> Rep (Path b t) x

to :: Rep (Path b t) x -> Path b t

Generic (MonoidMap k a) Source # 
Instance details

Defined in Data.Monoid.Map

Associated Types

type Rep (MonoidMap k a) 
Instance details

Defined in Data.Monoid.Map

type Rep (MonoidMap k a) = D1 ('MetaData "MonoidMap" "Data.Monoid.Map" "stack-3.1.1-Jkd8kxrin7nLuuv5NJBnEC" 'True) (C1 ('MetaCons "MonoidMap" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Map k a))))

Methods

from :: MonoidMap k a -> Rep (MonoidMap k a) x

to :: Rep (MonoidMap k a) x -> MonoidMap k a

Generic (Either a b) 
Instance details

Defined in Data.Strict.Either

Associated Types

type Rep (Either a b) 
Instance details

Defined in Data.Strict.Either

type Rep (Either a b) = D1 ('MetaData "Either" "Data.Strict.Either" "strict-0.5.1-gzmuAqAdvt3TUspeushIr" 'False) (C1 ('MetaCons "Left" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 a)) :+: C1 ('MetaCons "Right" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 b)))

Methods

from :: Either a b -> Rep (Either a b) x

to :: Rep (Either a b) x -> Either a b

Generic (These a b) 
Instance details

Defined in Data.Strict.These

Associated Types

type Rep (These a b) 
Instance details

Defined in Data.Strict.These

type Rep (These a b) = D1 ('MetaData "These" "Data.Strict.These" "strict-0.5.1-gzmuAqAdvt3TUspeushIr" 'False) (C1 ('MetaCons "This" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 a)) :+: (C1 ('MetaCons "That" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 b)) :+: C1 ('MetaCons "These" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 b))))

Methods

from :: These a b -> Rep (These a b) x

to :: Rep (These a b) x -> These a b

Generic (Pair a b) 
Instance details

Defined in Data.Strict.Tuple

Associated Types

type Rep (Pair a b) 
Instance details

Defined in Data.Strict.Tuple

type Rep (Pair a b) = D1 ('MetaData "Pair" "Data.Strict.Tuple" "strict-0.5.1-gzmuAqAdvt3TUspeushIr" 'False) (C1 ('MetaCons ":!:" ('InfixI 'NotAssociative 2) 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 b)))

Methods

from :: Pair a b -> Rep (Pair a b) x

to :: Rep (Pair a b) x -> Pair a b

Generic (These a b) 
Instance details

Defined in Data.These

Associated Types

type Rep (These a b) 
Instance details

Defined in Data.These

type Rep (These a b) = D1 ('MetaData "These" "Data.These" "these-1.2.1-DbZnELJ2IRTI8Xi0i4r2hP" 'False) (C1 ('MetaCons "This" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)) :+: (C1 ('MetaCons "That" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 b)) :+: C1 ('MetaCons "These" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 b))))

Methods

from :: These a b -> Rep (These a b) x

to :: Rep (These a b) x -> These a b

Generic (Lift f a) 
Instance details

Defined in Control.Applicative.Lift

Associated Types

type Rep (Lift f a) 
Instance details

Defined in Control.Applicative.Lift

type Rep (Lift f a) = D1 ('MetaData "Lift" "Control.Applicative.Lift" "transformers-0.6.1.0-da7f" 'False) (C1 ('MetaCons "Pure" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)) :+: C1 ('MetaCons "Other" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (f a))))

Methods

from :: Lift f a -> Rep (Lift f a) x

to :: Rep (Lift f a) x -> Lift f a

Generic (MaybeT m a) 
Instance details

Defined in Control.Monad.Trans.Maybe

Associated Types

type Rep (MaybeT m a) 
Instance details

Defined in Control.Monad.Trans.Maybe

type Rep (MaybeT m a) = D1 ('MetaData "MaybeT" "Control.Monad.Trans.Maybe" "transformers-0.6.1.0-da7f" 'True) (C1 ('MetaCons "MaybeT" 'PrefixI 'True) (S1 ('MetaSel ('Just "runMaybeT") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (m (Maybe a)))))

Methods

from :: MaybeT m a -> Rep (MaybeT m a) x

to :: Rep (MaybeT m a) x -> MaybeT m a

Generic (a, b) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b) 
Instance details

Defined in GHC.Generics

type Rep (a, b) = D1 ('MetaData "Tuple2" "GHC.Tuple.Prim" "ghc-prim" 'False) (C1 ('MetaCons "(,)" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 b)))

Methods

from :: (a, b) -> Rep (a, b) x

to :: Rep (a, b) x -> (a, b)

Generic (CondBranch v c a) 
Instance details

Defined in Distribution.Types.CondTree

Associated Types

type Rep (CondBranch v c a) 
Instance details

Defined in Distribution.Types.CondTree

type Rep (CondBranch v c a) = D1 ('MetaData "CondBranch" "Distribution.Types.CondTree" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "CondBranch" 'PrefixI 'True) (S1 ('MetaSel ('Just "condBranchCondition") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Condition v)) :*: (S1 ('MetaSel ('Just "condBranchIfTrue") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (CondTree v c a)) :*: S1 ('MetaSel ('Just "condBranchIfFalse") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (CondTree v c a))))))

Methods

from :: CondBranch v c a -> Rep (CondBranch v c a) x

to :: Rep (CondBranch v c a) x -> CondBranch v c a

Generic (CondTree v c a) 
Instance details

Defined in Distribution.Types.CondTree

Associated Types

type Rep (CondTree v c a) 
Instance details

Defined in Distribution.Types.CondTree

type Rep (CondTree v c a) = D1 ('MetaData "CondTree" "Distribution.Types.CondTree" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "CondNode" 'PrefixI 'True) (S1 ('MetaSel ('Just "condTreeData") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "condTreeConstraints") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 c) :*: S1 ('MetaSel ('Just "condTreeComponents") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [CondBranch v c a]))))

Methods

from :: CondTree v c a -> Rep (CondTree v c a) x

to :: Rep (CondTree v c a) x -> CondTree v c a

Generic (WrappedArrow a b c) 
Instance details

Defined in Control.Applicative

Associated Types

type Rep (WrappedArrow a b c) 
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

Generic (Kleisli m a b) 
Instance details

Defined in Control.Arrow

Associated Types

type Rep (Kleisli m a b) 
Instance details

Defined in Control.Arrow

type Rep (Kleisli m a b) = D1 ('MetaData "Kleisli" "Control.Arrow" "base" 'True) (C1 ('MetaCons "Kleisli" 'PrefixI 'True) (S1 ('MetaSel ('Just "runKleisli") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (a -> m b))))

Methods

from :: Kleisli m a b -> Rep (Kleisli m a b) x

to :: Rep (Kleisli m a b) x -> Kleisli m a b

Generic (Const a b) 
Instance details

Defined in Data.Functor.Const

Associated Types

type Rep (Const a b) 
Instance details

Defined in Data.Functor.Const

type Rep (Const a b) = D1 ('MetaData "Const" "Data.Functor.Const" "base" '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

Generic (Ap f a) 
Instance details

Defined in Data.Monoid

Associated Types

type Rep (Ap f a) 
Instance details

Defined in Data.Monoid

type Rep (Ap f a) = D1 ('MetaData "Ap" "Data.Monoid" "base" 'True) (C1 ('MetaCons "Ap" 'PrefixI 'True) (S1 ('MetaSel ('Just "getAp") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (f a))))

Methods

from :: Ap f a -> Rep (Ap f a) x

to :: Rep (Ap f a) x -> Ap f a

Generic (Alt f a) 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep (Alt f a) 
Instance details

Defined in Data.Semigroup.Internal

type Rep (Alt f a) = D1 ('MetaData "Alt" "Data.Semigroup.Internal" "base" 'True) (C1 ('MetaCons "Alt" 'PrefixI 'True) (S1 ('MetaSel ('Just "getAlt") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (f a))))

Methods

from :: Alt f a -> Rep (Alt f a) x

to :: Rep (Alt f a) x -> Alt f a

Generic (Rec1 f p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Rec1 f p) 
Instance details

Defined in GHC.Generics

type Rep (Rec1 f p) = D1 ('MetaData "Rec1" "GHC.Generics" "base" 'True) (C1 ('MetaCons "Rec1" 'PrefixI 'True) (S1 ('MetaSel ('Just "unRec1") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (f p))))

Methods

from :: Rec1 f p -> Rep (Rec1 f p) x

to :: Rep (Rec1 f p) x -> Rec1 f p

Generic (URec (Ptr ()) p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec (Ptr ()) p) 
Instance details

Defined in GHC.Generics

type Rep (URec (Ptr ()) p) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UAddr" 'PrefixI 'True) (S1 ('MetaSel ('Just "uAddr#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UAddr :: Type -> Type)))

Methods

from :: URec (Ptr ()) p -> Rep (URec (Ptr ()) p) x

to :: Rep (URec (Ptr ()) p) x -> URec (Ptr ()) p

Generic (URec Char p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Char p) 
Instance details

Defined in GHC.Generics

type Rep (URec Char p) = D1 ('MetaData "URec" "GHC.Generics" "base" '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

Generic (URec Double p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Double p) 
Instance details

Defined in GHC.Generics

type Rep (URec Double p) = D1 ('MetaData "URec" "GHC.Generics" "base" '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

Generic (URec Float p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Float p) 
Instance details

Defined in GHC.Generics

type Rep (URec Float p) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UFloat" 'PrefixI 'True) (S1 ('MetaSel ('Just "uFloat#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UFloat :: Type -> Type)))

Methods

from :: URec Float p -> Rep (URec Float p) x

to :: Rep (URec Float p) x -> URec Float p

Generic (URec Int p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Int p) 
Instance details

Defined in GHC.Generics

type Rep (URec Int p) = D1 ('MetaData "URec" "GHC.Generics" "base" '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

Generic (URec Word p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Word p) 
Instance details

Defined in GHC.Generics

type Rep (URec Word p) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UWord" 'PrefixI 'True) (S1 ('MetaSel ('Just "uWord#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UWord :: Type -> Type)))

Methods

from :: URec Word p -> Rep (URec Word p) x

to :: Rep (URec Word p) x -> URec Word p

Generic (Tagged s b) 
Instance details

Defined in Data.Tagged

Associated Types

type Rep (Tagged s b) 
Instance details

Defined in Data.Tagged

type Rep (Tagged s b) = D1 ('MetaData "Tagged" "Data.Tagged" "tagged-0.8.8-GyrslFoLiphJ2P1vvH48n6" 'True) (C1 ('MetaCons "Tagged" 'PrefixI 'True) (S1 ('MetaSel ('Just "unTagged") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 b)))

Methods

from :: Tagged s b -> Rep (Tagged s b) x

to :: Rep (Tagged s b) x -> Tagged s b

Generic (These1 f g a) 
Instance details

Defined in Data.Functor.These

Associated Types

type Rep (These1 f g a) 
Instance details

Defined in Data.Functor.These

type Rep (These1 f g a) = D1 ('MetaData "These1" "Data.Functor.These" "these-1.2.1-DbZnELJ2IRTI8Xi0i4r2hP" 'False) (C1 ('MetaCons "This1" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (f a))) :+: (C1 ('MetaCons "That1" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (g a))) :+: C1 ('MetaCons "These1" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (f a)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (g a)))))

Methods

from :: These1 f g a -> Rep (These1 f g a) x

to :: Rep (These1 f g a) x -> These1 f g a

Generic (Backwards f a) 
Instance details

Defined in Control.Applicative.Backwards

Associated Types

type Rep (Backwards f a) 
Instance details

Defined in Control.Applicative.Backwards

type Rep (Backwards f a) = D1 ('MetaData "Backwards" "Control.Applicative.Backwards" "transformers-0.6.1.0-da7f" 'True) (C1 ('MetaCons "Backwards" 'PrefixI 'True) (S1 ('MetaSel ('Just "forwards") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (f a))))

Methods

from :: Backwards f a -> Rep (Backwards f a) x

to :: Rep (Backwards f a) x -> Backwards f a

Generic (AccumT w m a) 
Instance details

Defined in Control.Monad.Trans.Accum

Associated Types

type Rep (AccumT w m a) 
Instance details

Defined in Control.Monad.Trans.Accum

type Rep (AccumT w m a) = D1 ('MetaData "AccumT" "Control.Monad.Trans.Accum" "transformers-0.6.1.0-da7f" 'True) (C1 ('MetaCons "AccumT" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (w -> m (a, w)))))

Methods

from :: AccumT w m a -> Rep (AccumT w m a) x

to :: Rep (AccumT w m a) x -> AccumT w m a

Generic (ExceptT e m a) 
Instance details

Defined in Control.Monad.Trans.Except

Associated Types

type Rep (ExceptT e m a) 
Instance details

Defined in Control.Monad.Trans.Except

type Rep (ExceptT e m a) = D1 ('MetaData "ExceptT" "Control.Monad.Trans.Except" "transformers-0.6.1.0-da7f" 'True) (C1 ('MetaCons "ExceptT" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (m (Either e a)))))

Methods

from :: ExceptT e m a -> Rep (ExceptT e m a) x

to :: Rep (ExceptT e m a) x -> ExceptT e m a

Generic (IdentityT f a) 
Instance details

Defined in Control.Monad.Trans.Identity

Associated Types

type Rep (IdentityT f a) 
Instance details

Defined in Control.Monad.Trans.Identity

type Rep (IdentityT f a) = D1 ('MetaData "IdentityT" "Control.Monad.Trans.Identity" "transformers-0.6.1.0-da7f" 'True) (C1 ('MetaCons "IdentityT" 'PrefixI 'True) (S1 ('MetaSel ('Just "runIdentityT") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (f a))))

Methods

from :: IdentityT f a -> Rep (IdentityT f a) x

to :: Rep (IdentityT f a) x -> IdentityT f a

Generic (ReaderT r m a) 
Instance details

Defined in Control.Monad.Trans.Reader

Associated Types

type Rep (ReaderT r m a) 
Instance details

Defined in Control.Monad.Trans.Reader

type Rep (ReaderT r m a) = D1 ('MetaData "ReaderT" "Control.Monad.Trans.Reader" "transformers-0.6.1.0-da7f" 'True) (C1 ('MetaCons "ReaderT" 'PrefixI 'True) (S1 ('MetaSel ('Just "runReaderT") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (r -> m a))))

Methods

from :: ReaderT r m a -> Rep (ReaderT r m a) x

to :: Rep (ReaderT r m a) x -> ReaderT r m a

Generic (SelectT r m a) 
Instance details

Defined in Control.Monad.Trans.Select

Associated Types

type Rep (SelectT r m a) 
Instance details

Defined in Control.Monad.Trans.Select

type Rep (SelectT r m a) = D1 ('MetaData "SelectT" "Control.Monad.Trans.Select" "transformers-0.6.1.0-da7f" 'True) (C1 ('MetaCons "SelectT" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ((a -> m r) -> m a))))

Methods

from :: SelectT r m a -> Rep (SelectT r m a) x

to :: Rep (SelectT r m a) x -> SelectT r m a

Generic (StateT s m a) 
Instance details

Defined in Control.Monad.Trans.State.Lazy

Associated Types

type Rep (StateT s m a) 
Instance details

Defined in Control.Monad.Trans.State.Lazy

type Rep (StateT s m a) = D1 ('MetaData "StateT" "Control.Monad.Trans.State.Lazy" "transformers-0.6.1.0-da7f" 'True) (C1 ('MetaCons "StateT" 'PrefixI 'True) (S1 ('MetaSel ('Just "runStateT") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (s -> m (a, s)))))

Methods

from :: StateT s m a -> Rep (StateT s m a) x

to :: Rep (StateT s m a) x -> StateT s m a

Generic (StateT s m a) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Associated Types

type Rep (StateT s m a) 
Instance details

Defined in Control.Monad.Trans.State.Strict

type Rep (StateT s m a) = D1 ('MetaData "StateT" "Control.Monad.Trans.State.Strict" "transformers-0.6.1.0-da7f" 'True) (C1 ('MetaCons "StateT" 'PrefixI 'True) (S1 ('MetaSel ('Just "runStateT") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (s -> m (a, s)))))

Methods

from :: StateT s m a -> Rep (StateT s m a) x

to :: Rep (StateT s m a) x -> StateT s m a

Generic (WriterT w m a) 
Instance details

Defined in Control.Monad.Trans.Writer.CPS

Associated Types

type Rep (WriterT w m a) 
Instance details

Defined in Control.Monad.Trans.Writer.CPS

type Rep (WriterT w m a) = D1 ('MetaData "WriterT" "Control.Monad.Trans.Writer.CPS" "transformers-0.6.1.0-da7f" 'True) (C1 ('MetaCons "WriterT" 'PrefixI 'True) (S1 ('MetaSel ('Just "unWriterT") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (w -> m (a, w)))))

Methods

from :: WriterT w m a -> Rep (WriterT w m a) x

to :: Rep (WriterT w m a) x -> WriterT w m a

Generic (WriterT w m a) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Associated Types

type Rep (WriterT w m a) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

type Rep (WriterT w m a) = D1 ('MetaData "WriterT" "Control.Monad.Trans.Writer.Lazy" "transformers-0.6.1.0-da7f" 'True) (C1 ('MetaCons "WriterT" 'PrefixI 'True) (S1 ('MetaSel ('Just "runWriterT") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (m (a, w)))))

Methods

from :: WriterT w m a -> Rep (WriterT w m a) x

to :: Rep (WriterT w m a) x -> WriterT w m a

Generic (WriterT w m a) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Associated Types

type Rep (WriterT w m a) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

type Rep (WriterT w m a) = D1 ('MetaData "WriterT" "Control.Monad.Trans.Writer.Strict" "transformers-0.6.1.0-da7f" 'True) (C1 ('MetaCons "WriterT" 'PrefixI 'True) (S1 ('MetaSel ('Just "runWriterT") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (m (a, w)))))

Methods

from :: WriterT w m a -> Rep (WriterT w m a) x

to :: Rep (WriterT w m a) x -> WriterT w m a

Generic (Constant a b) 
Instance details

Defined in Data.Functor.Constant

Associated Types

type Rep (Constant a b) 
Instance details

Defined in Data.Functor.Constant

type Rep (Constant a b) = D1 ('MetaData "Constant" "Data.Functor.Constant" "transformers-0.6.1.0-da7f" 'True) (C1 ('MetaCons "Constant" 'PrefixI 'True) (S1 ('MetaSel ('Just "getConstant") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))

Methods

from :: Constant a b -> Rep (Constant a b) x

to :: Rep (Constant a b) x -> Constant a b

Generic (Reverse f a) 
Instance details

Defined in Data.Functor.Reverse

Associated Types

type Rep (Reverse f a) 
Instance details

Defined in Data.Functor.Reverse

type Rep (Reverse f a) = D1 ('MetaData "Reverse" "Data.Functor.Reverse" "transformers-0.6.1.0-da7f" 'True) (C1 ('MetaCons "Reverse" 'PrefixI 'True) (S1 ('MetaSel ('Just "getReverse") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (f a))))

Methods

from :: Reverse f a -> Rep (Reverse f a) x

to :: Rep (Reverse f a) x -> Reverse f a

Generic (a, b, c) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c) 
Instance details

Defined in GHC.Generics

type Rep (a, b, c) = D1 ('MetaData "Tuple3" "GHC.Tuple.Prim" "ghc-prim" 'False) (C1 ('MetaCons "(,,)" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 b) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 c))))

Methods

from :: (a, b, c) -> Rep (a, b, c) x

to :: Rep (a, b, c) x -> (a, b, c)

Generic (Product f g a) 
Instance details

Defined in Data.Functor.Product

Associated Types

type Rep (Product f g a) 
Instance details

Defined in Data.Functor.Product

type Rep (Product f g a) = D1 ('MetaData "Product" "Data.Functor.Product" "base" 'False) (C1 ('MetaCons "Pair" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (f a)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (g a))))

Methods

from :: Product f g a -> Rep (Product f g a) x

to :: Rep (Product f g a) x -> Product f g a

Generic (Sum f g a) 
Instance details

Defined in Data.Functor.Sum

Associated Types

type Rep (Sum f g a) 
Instance details

Defined in Data.Functor.Sum

type Rep (Sum f g a) = D1 ('MetaData "Sum" "Data.Functor.Sum" "base" 'False) (C1 ('MetaCons "InL" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (f a))) :+: C1 ('MetaCons "InR" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (g a))))

Methods

from :: Sum f g a -> Rep (Sum f g a) x

to :: Rep (Sum f g a) x -> Sum f g a

Generic ((f :*: g) p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep ((f :*: g) p) 
Instance details

Defined in GHC.Generics

type Rep ((f :*: g) p) = D1 ('MetaData ":*:" "GHC.Generics" "base" 'False) (C1 ('MetaCons ":*:" ('InfixI 'RightAssociative 6) 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (f p)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (g p))))

Methods

from :: (f :*: g) p -> Rep ((f :*: g) p) x

to :: Rep ((f :*: g) p) x -> (f :*: g) p

Generic ((f :+: g) p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep ((f :+: g) p) 
Instance details

Defined in GHC.Generics

type Rep ((f :+: g) p) = D1 ('MetaData ":+:" "GHC.Generics" "base" 'False) (C1 ('MetaCons "L1" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (f p))) :+: C1 ('MetaCons "R1" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (g p))))

Methods

from :: (f :+: g) p -> Rep ((f :+: g) p) x

to :: Rep ((f :+: g) p) x -> (f :+: g) p

Generic (K1 i c p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (K1 i c p) 
Instance details

Defined in GHC.Generics

type Rep (K1 i c p) = D1 ('MetaData "K1" "GHC.Generics" "base" 'True) (C1 ('MetaCons "K1" 'PrefixI 'True) (S1 ('MetaSel ('Just "unK1") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 c)))

Methods

from :: K1 i c p -> Rep (K1 i c p) x

to :: Rep (K1 i c p) x -> K1 i c p

Generic (ContT r m a) 
Instance details

Defined in Control.Monad.Trans.Cont

Associated Types

type Rep (ContT r m a) 
Instance details

Defined in Control.Monad.Trans.Cont

type Rep (ContT r m a) = D1 ('MetaData "ContT" "Control.Monad.Trans.Cont" "transformers-0.6.1.0-da7f" 'True) (C1 ('MetaCons "ContT" 'PrefixI 'True) (S1 ('MetaSel ('Just "runContT") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ((a -> m r) -> m r))))

Methods

from :: ContT r m a -> Rep (ContT r m a) x

to :: Rep (ContT r m a) x -> ContT r m a

Generic (a, b, c, d) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d) 
Instance details

Defined in GHC.Generics

type Rep (a, b, c, d) = D1 ('MetaData "Tuple4" "GHC.Tuple.Prim" "ghc-prim" 'False) (C1 ('MetaCons "(,,,)" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 b)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 c) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 d))))

Methods

from :: (a, b, c, d) -> Rep (a, b, c, d) x

to :: Rep (a, b, c, d) x -> (a, b, c, d)

Generic (Compose f g a) 
Instance details

Defined in Data.Functor.Compose

Associated Types

type Rep (Compose f g a) 
Instance details

Defined in Data.Functor.Compose

type Rep (Compose f g a) = D1 ('MetaData "Compose" "Data.Functor.Compose" "base" 'True) (C1 ('MetaCons "Compose" 'PrefixI 'True) (S1 ('MetaSel ('Just "getCompose") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (f (g a)))))

Methods

from :: Compose f g a -> Rep (Compose f g a) x

to :: Rep (Compose f g a) x -> Compose f g a

Generic ((f :.: g) p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep ((f :.: g) p) 
Instance details

Defined in GHC.Generics

type Rep ((f :.: g) p) = D1 ('MetaData ":.:" "GHC.Generics" "base" 'True) (C1 ('MetaCons "Comp1" 'PrefixI 'True) (S1 ('MetaSel ('Just "unComp1") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (f (g p)))))

Methods

from :: (f :.: g) p -> Rep ((f :.: g) p) x

to :: Rep ((f :.: g) p) x -> (f :.: g) p

Generic (M1 i c f p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (M1 i c f p) 
Instance details

Defined in GHC.Generics

type Rep (M1 i c f p) = D1 ('MetaData "M1" "GHC.Generics" "base" 'True) (C1 ('MetaCons "M1" 'PrefixI 'True) (S1 ('MetaSel ('Just "unM1") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (f p))))

Methods

from :: M1 i c f p -> Rep (M1 i c f p) x

to :: Rep (M1 i c f p) x -> M1 i c f p

Generic (CommonOptions asmSources cSources cxxSources jsSources a) 
Instance details

Defined in Hpack.Config

Associated Types

type Rep (CommonOptions asmSources cSources cxxSources jsSources a) 
Instance details

Defined in Hpack.Config

type Rep (CommonOptions asmSources cSources cxxSources jsSources a) = D1 ('MetaData "CommonOptions" "Hpack.Config" "hpack-0.37.0-6QOqTVj8oRKEq9TILTOany" 'False) (C1 ('MetaCons "CommonOptions" 'PrefixI 'True) ((((S1 ('MetaSel ('Just "commonOptionsSourceDirs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Alias 'True "hs-source-dirs" (Maybe (List FilePath)))) :*: (S1 ('MetaSel ('Just "commonOptionsDependencies") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Alias 'True "build-depends" (Maybe Dependencies))) :*: S1 ('MetaSel ('Just "commonOptionsPkgConfigDependencies") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Alias 'False "pkgconfig-depends" (Maybe (List String)))))) :*: ((S1 ('MetaSel ('Just "commonOptionsDefaultExtensions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (List String))) :*: S1 ('MetaSel ('Just "commonOptionsOtherExtensions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (List String)))) :*: (S1 ('MetaSel ('Just "commonOptionsLanguage") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Alias 'True "default-language" (Last (Maybe Language)))) :*: S1 ('MetaSel ('Just "commonOptionsGhcOptions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (List GhcOption)))))) :*: (((S1 ('MetaSel ('Just "commonOptionsGhcProfOptions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (List GhcProfOption))) :*: S1 ('MetaSel ('Just "commonOptionsGhcSharedOptions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (List GhcOption)))) :*: (S1 ('MetaSel ('Just "commonOptionsGhcjsOptions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (List GhcjsOption))) :*: S1 ('MetaSel ('Just "commonOptionsCppOptions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (List CppOption))))) :*: ((S1 ('MetaSel ('Just "commonOptionsCcOptions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (List CcOption))) :*: S1 ('MetaSel ('Just "commonOptionsAsmOptions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (List AsmOption)))) :*: (S1 ('MetaSel ('Just "commonOptionsAsmSources") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 asmSources) :*: S1 ('MetaSel ('Just "commonOptionsCSources") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 cSources))))) :*: (((S1 ('MetaSel ('Just "commonOptionsCxxOptions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (List CxxOption))) :*: (S1 ('MetaSel ('Just "commonOptionsCxxSources") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 cxxSources) :*: S1 ('MetaSel ('Just "commonOptionsJsSources") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 jsSources))) :*: ((S1 ('MetaSel ('Just "commonOptionsExtraLibDirs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (List FilePath))) :*: S1 ('MetaSel ('Just "commonOptionsExtraLibraries") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (List FilePath)))) :*: (S1 ('MetaSel ('Just "commonOptionsExtraFrameworksDirs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (List FilePath))) :*: S1 ('MetaSel ('Just "commonOptionsFrameworks") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (List String)))))) :*: (((S1 ('MetaSel ('Just "commonOptionsIncludeDirs") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (List FilePath))) :*: S1 ('MetaSel ('Just "commonOptionsInstallIncludes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (List FilePath)))) :*: (S1 ('MetaSel ('Just "commonOptionsLdOptions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (List LdOption))) :*: S1 ('MetaSel ('Just "commonOptionsBuildable") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Last Bool)))) :*: ((S1 ('MetaSel ('Just "commonOptionsWhen") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (List (ConditionalSection asmSources cSources cxxSources jsSources a)))) :*: S1 ('MetaSel ('Just "commonOptionsBuildTools") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Alias 'True "build-tool-depends" (Maybe BuildTools)))) :*: (S1 ('MetaSel ('Just "commonOptionsSystemBuildTools") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe SystemBuildTools)) :*: S1 ('MetaSel ('Just "commonOptionsVerbatim") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (List Verbatim)))))))))

Methods

from :: CommonOptions asmSources cSources cxxSources jsSources a -> Rep (CommonOptions asmSources cSources cxxSources jsSources a) x

to :: Rep (CommonOptions asmSources cSources cxxSources jsSources a) x -> CommonOptions asmSources cSources cxxSources jsSources a

Generic (ThenElse asmSources cSources cxxSources jsSources a) 
Instance details

Defined in Hpack.Config

Associated Types

type Rep (ThenElse asmSources cSources cxxSources jsSources a) 
Instance details

Defined in Hpack.Config

type Rep (ThenElse asmSources cSources cxxSources jsSources a) = D1 ('MetaData "ThenElse" "Hpack.Config" "hpack-0.37.0-6QOqTVj8oRKEq9TILTOany" 'False) (C1 ('MetaCons "ThenElse" 'PrefixI 'True) (S1 ('MetaSel ('Just "thenElseThen") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (WithCommonOptions asmSources cSources cxxSources jsSources a)) :*: S1 ('MetaSel ('Just "thenElseElse") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (WithCommonOptions asmSources cSources cxxSources jsSources a))))

Methods

from :: ThenElse asmSources cSources cxxSources jsSources a -> Rep (ThenElse asmSources cSources cxxSources jsSources a) x

to :: Rep (ThenElse asmSources cSources cxxSources jsSources a) x -> ThenElse asmSources cSources cxxSources jsSources a

Generic (RWST r w s m a) 
Instance details

Defined in Control.Monad.Trans.RWS.CPS

Associated Types

type Rep (RWST r w s m a) 
Instance details

Defined in Control.Monad.Trans.RWS.CPS

type Rep (RWST r w s m a) = D1 ('MetaData "RWST" "Control.Monad.Trans.RWS.CPS" "transformers-0.6.1.0-da7f" 'True) (C1 ('MetaCons "RWST" 'PrefixI 'True) (S1 ('MetaSel ('Just "unRWST") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (r -> s -> w -> m (a, s, w)))))

Methods

from :: RWST r w s m a -> Rep (RWST r w s m a) x

to :: Rep (RWST r w s m a) x -> RWST r w s m a

Generic (RWST r w s m a) 
Instance details

Defined in Control.Monad.Trans.RWS.Lazy

Associated Types

type Rep (RWST r w s m a) 
Instance details

Defined in Control.Monad.Trans.RWS.Lazy

type Rep (RWST r w s m a) = D1 ('MetaData "RWST" "Control.Monad.Trans.RWS.Lazy" "transformers-0.6.1.0-da7f" 'True) (C1 ('MetaCons "RWST" 'PrefixI 'True) (S1 ('MetaSel ('Just "runRWST") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (r -> s -> m (a, s, w)))))

Methods

from :: RWST r w s m a -> Rep (RWST r w s m a) x

to :: Rep (RWST r w s m a) x -> RWST r w s m a

Generic (RWST r w s m a) 
Instance details

Defined in Control.Monad.Trans.RWS.Strict

Associated Types

type Rep (RWST r w s m a) 
Instance details

Defined in Control.Monad.Trans.RWS.Strict

type Rep (RWST r w s m a) = D1 ('MetaData "RWST" "Control.Monad.Trans.RWS.Strict" "transformers-0.6.1.0-da7f" 'True) (C1 ('MetaCons "RWST" 'PrefixI 'True) (S1 ('MetaSel ('Just "runRWST") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (r -> s -> m (a, s, w)))))

Methods

from :: RWST r w s m a -> Rep (RWST r w s m a) x

to :: Rep (RWST r w s m a) x -> RWST r w s m a

Generic (a, b, c, d, e) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e) 
Instance details

Defined in GHC.Generics

type Rep (a, b, c, d, e) = D1 ('MetaData "Tuple5" "GHC.Tuple.Prim" "ghc-prim" 'False) (C1 ('MetaCons "(,,,,)" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 b)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 c) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 d) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 e)))))

Methods

from :: (a, b, c, d, e) -> Rep (a, b, c, d, e) x

to :: Rep (a, b, c, d, e) x -> (a, b, c, d, e)

Generic (a, b, c, d, e, f) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e, f) 
Instance details

Defined in GHC.Generics

type Rep (a, b, c, d, e, f) = D1 ('MetaData "Tuple6" "GHC.Tuple.Prim" "ghc-prim" 'False) (C1 ('MetaCons "(,,,,,)" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 b) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 c))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 d) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 e) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 f)))))

Methods

from :: (a, b, c, d, e, f) -> Rep (a, b, c, d, e, f) x

to :: Rep (a, b, c, d, e, f) x -> (a, b, c, d, e, f)

Generic (a, b, c, d, e, f, g) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e, f, g) 
Instance details

Defined in GHC.Generics

type Rep (a, b, c, d, e, f, g) = D1 ('MetaData "Tuple7" "GHC.Tuple.Prim" "ghc-prim" 'False) (C1 ('MetaCons "(,,,,,,)" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 b) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 c))) :*: ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 d) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 e)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 f) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 g)))))

Methods

from :: (a, b, c, d, e, f, g) -> Rep (a, b, c, d, e, f, g) x

to :: Rep (a, b, c, d, e, f, g) x -> (a, b, c, d, e, f, g)

Generic (a, b, c, d, e, f, g, h) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e, f, g, h) 
Instance details

Defined in GHC.Generics

type Rep (a, b, c, d, e, f, g, h) = D1 ('MetaData "Tuple8" "GHC.Tuple.Prim" "ghc-prim" 'False) (C1 ('MetaCons "(,,,,,,,)" 'PrefixI 'False) (((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 b)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 c) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 d))) :*: ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 e) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 f)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 g) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 h)))))

Methods

from :: (a, b, c, d, e, f, g, h) -> Rep (a, b, c, d, e, f, g, h) x

to :: Rep (a, b, c, d, e, f, g, h) x -> (a, b, c, d, e, f, g, h)

Generic (a, b, c, d, e, f, g, h, i) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e, f, g, h, i) 
Instance details

Defined in GHC.Generics

type Rep (a, b, c, d, e, f, g, h, i) = D1 ('MetaData "Tuple9" "GHC.Tuple.Prim" "ghc-prim" 'False) (C1 ('MetaCons "(,,,,,,,,)" 'PrefixI 'False) (((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 b)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 c) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 d))) :*: ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 e) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 f)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 g) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 h) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 i))))))

Methods

from :: (a, b, c, d, e, f, g, h, i) -> Rep (a, b, c, d, e, f, g, h, i) x

to :: Rep (a, b, c, d, e, f, g, h, i) x -> (a, b, c, d, e, f, g, h, i)

Generic (a, b, c, d, e, f, g, h, i, j) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e, f, g, h, i, j) 
Instance details

Defined in GHC.Generics

type Rep (a, b, c, d, e, f, g, h, i, j) = D1 ('MetaData "Tuple10" "GHC.Tuple.Prim" "ghc-prim" 'False) (C1 ('MetaCons "(,,,,,,,,,)" 'PrefixI 'False) (((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 b)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 c) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 d) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 e)))) :*: ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 f) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 g)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 h) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 i) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 j))))))

Methods

from :: (a, b, c, d, e, f, g, h, i, j) -> Rep (a, b, c, d, e, f, g, h, i, j) x

to :: Rep (a, b, c, d, e, f, g, h, i, j) x -> (a, b, c, d, e, f, g, h, i, j)

Generic (a, b, c, d, e, f, g, h, i, j, k) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e, f, g, h, i, j, k) 
Instance details

Defined in GHC.Generics

type Rep (a, b, c, d, e, f, g, h, i, j, k) = D1 ('MetaData "Tuple11" "GHC.Tuple.Prim" "ghc-prim" 'False) (C1 ('MetaCons "(,,,,,,,,,,)" 'PrefixI 'False) (((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 b)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 c) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 d) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 e)))) :*: ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 f) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 g) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 h))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 i) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 j) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 k))))))

Methods

from :: (a, b, c, d, e, f, g, h, i, j, k) -> Rep (a, b, c, d, e, f, g, h, i, j, k) x

to :: Rep (a, b, c, d, e, f, g, h, i, j, k) x -> (a, b, c, d, e, f, g, h, i, j, k)

Generic (a, b, c, d, e, f, g, h, i, j, k, l) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e, f, g, h, i, j, k, l) 
Instance details

Defined in GHC.Generics

type Rep (a, b, c, d, e, f, g, h, i, j, k, l) = D1 ('MetaData "Tuple12" "GHC.Tuple.Prim" "ghc-prim" 'False) (C1 ('MetaCons "(,,,,,,,,,,,)" 'PrefixI 'False) (((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 b) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 c))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 d) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 e) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 f)))) :*: ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 g) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 h) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 i))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 j) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 k) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 l))))))

Methods

from :: (a, b, c, d, e, f, g, h, i, j, k, l) -> Rep (a, b, c, d, e, f, g, h, i, j, k, l) x

to :: Rep (a, b, c, d, e, f, g, h, i, j, k, l) x -> (a, b, c, d, e, f, g, h, i, j, k, l)

Generic (a, b, c, d, e, f, g, h, i, j, k, l, m) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e, f, g, h, i, j, k, l, m) 
Instance details

Defined in GHC.Generics

type Rep (a, b, c, d, e, f, g, h, i, j, k, l, m) = D1 ('MetaData "Tuple13" "GHC.Tuple.Prim" "ghc-prim" 'False) (C1 ('MetaCons "(,,,,,,,,,,,,)" 'PrefixI 'False) (((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 b) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 c))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 d) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 e) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 f)))) :*: ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 g) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 h) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 i))) :*: ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 j) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 k)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 l) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 m))))))

Methods

from :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Rep (a, b, c, d, e, f, g, h, i, j, k, l, m) x

to :: Rep (a, b, c, d, e, f, g, h, i, j, k, l, m) x -> (a, b, c, d, e, f, g, h, i, j, k, l, m)

Generic (a, b, c, d, e, f, g, h, i, j, k, l, m, n) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n) 
Instance details

Defined in GHC.Generics

type Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n) = D1 ('MetaData "Tuple14" "GHC.Tuple.Prim" "ghc-prim" 'False) (C1 ('MetaCons "(,,,,,,,,,,,,,)" 'PrefixI 'False) (((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 b) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 c))) :*: ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 d) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 e)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 f) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 g)))) :*: ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 h) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 i) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 j))) :*: ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 k) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 l)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 m) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 n))))))

Methods

from :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n) x

to :: Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n) x -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n)

Generic (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) 
Instance details

Defined in GHC.Generics

type Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) = D1 ('MetaData "Tuple15" "GHC.Tuple.Prim" "ghc-prim" 'False) (C1 ('MetaCons "(,,,,,,,,,,,,,,)" 'PrefixI 'False) (((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 b) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 c))) :*: ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 d) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 e)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 f) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 g)))) :*: (((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 h) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 i)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 j) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 k))) :*: ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 l) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 m)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 n) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 o))))))

Methods

from :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) x

to :: Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) x -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)

type String = [Char] #

data Force Source #

Constructors

Force 
NoForce 

Instances

Instances details
Show Force 
Instance details

Defined in Hpack.Options

Methods

showsPrec :: Int -> Force -> ShowS

show :: Force -> String #

showList :: [Force] -> ShowS

Eq Force 
Instance details

Defined in Hpack.Options

Methods

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

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

class IsString a where #

Methods

fromString :: String -> a #

Instances

Instances details
IsString ModuleName 
Instance details

Defined in Distribution.ModuleName

IsString AbiHash 
Instance details

Defined in Distribution.Types.AbiHash

Methods

fromString :: String -> AbiHash #

IsString ComponentId 
Instance details

Defined in Distribution.Types.ComponentId

Methods

fromString :: String -> ComponentId #

IsString FlagName 
Instance details

Defined in Distribution.Types.Flag

IsString PackageName 
Instance details

Defined in Distribution.Types.PackageName

IsString PkgconfigName 
Instance details

Defined in Distribution.Types.PkgconfigName

Methods

fromString :: String -> PkgconfigName #

IsString UnitId 
Instance details

Defined in Distribution.Types.UnitId

Methods

fromString :: String -> UnitId #

IsString UnqualComponentName 
Instance details

Defined in Distribution.Types.UnqualComponentName

Methods

fromString :: String -> UnqualComponentName #

IsString ShortText 
Instance details

Defined in Distribution.Utils.ShortText

Methods

fromString :: String -> ShortText #

IsString Key 
Instance details

Defined in Data.Aeson.Key

Methods

fromString :: String -> Key #

IsString Value 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fromString :: String -> Value #

IsString JSONWarning 
Instance details

Defined in Data.Aeson.WarningParser

IsString WarningParserMonoid 
Instance details

Defined in Data.Aeson.WarningParser

Methods

fromString :: String -> WarningParserMonoid #

IsString String 
Instance details

Defined in Basement.UTF8.Base

Methods

fromString :: String -> String #

IsString ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

IsString ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Methods

fromString :: String -> ByteString #

IsString ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

IsString ByteArray 
Instance details

Defined in Codec.CBOR.ByteArray

Methods

fromString :: String -> ByteArray #

IsString SlicedByteArray 
Instance details

Defined in Codec.CBOR.ByteArray.Sliced

Methods

fromString :: String -> SlicedByteArray #

IsString ShortText 
Instance details

Defined in GHC.Data.ShortText

Methods

fromString :: String -> ShortText #

IsString Language 
Instance details

Defined in Hpack.Config

IsString Path 
Instance details

Defined in Hpack.Config

Methods

fromString :: String -> Path #

IsString ProgramName 
Instance details

Defined in Hpack.Error

IsString Module 
Instance details

Defined in Hpack.Module

Methods

fromString :: String -> Module #

IsString RequestBody 
Instance details

Defined in Network.HTTP.Client.Types

IsString CheckHexDigest 
Instance details

Defined in Network.HTTP.Download.Verified

IsString IP 
Instance details

Defined in Data.IP.Addr

Methods

fromString :: String -> IP #

IsString IPv4 
Instance details

Defined in Data.IP.Addr

Methods

fromString :: String -> IPv4 #

IsString IPv6 
Instance details

Defined in Data.IP.Addr

Methods

fromString :: String -> IPv6 #

IsString IPRange 
Instance details

Defined in Data.IP.Range

Methods

fromString :: String -> IPRange #

IsString Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Methods

fromString :: String -> Doc #

IsString CmdSpec 
Instance details

Defined in System.Process.Common

Methods

fromString :: String -> CmdSpec #

IsString Utf8Builder 
Instance details

Defined in RIO.Prelude.Display

IsString StyleDoc 
Instance details

Defined in Text.PrettyPrint.Leijen.Extended

IsString StackUnqualCompName Source # 
Instance details

Defined in Stack.Types.ComponentUtils

IsString ExeName Source # 
Instance details

Defined in Stack.Types.Package

Methods

fromString :: String -> ExeName #

IsString Builder 
Instance details

Defined in Data.Text.Internal.Builder

Methods

fromString :: String -> Builder #

IsString ShortText 
Instance details

Defined in Data.Text.Short.Internal

Methods

fromString :: String -> ShortText #

IsString (Encoding' a) 
Instance details

Defined in Data.Aeson.Encoding.Internal

Methods

fromString :: String -> Encoding' a #

IsString (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.Leijen

Methods

fromString :: String -> Doc a #

IsString a => IsString (Identity a) 
Instance details

Defined in Data.String

Methods

fromString :: String -> Identity a #

(IsString s, FoldCase s) => IsString (CI s) 
Instance details

Defined in Data.CaseInsensitive.Internal

Methods

fromString :: String -> CI s #

a ~ Char => IsString (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

fromString :: String -> Seq a #

a ~ Char => IsString (DNonEmpty a) 
Instance details

Defined in Data.DList.DNonEmpty.Internal

Methods

fromString :: String -> DNonEmpty a #

a ~ Char => IsString (DList a) 
Instance details

Defined in Data.DList.Internal

Methods

fromString :: String -> DList a #

(IsString a, Hashable a) => IsString (Hashed a) 
Instance details

Defined in Data.Hashable.Class

Methods

fromString :: String -> Hashed a #

IsString (AddrRange IPv4) 
Instance details

Defined in Data.IP.Range

Methods

fromString :: String -> AddrRange IPv4 #

IsString (AddrRange IPv6) 
Instance details

Defined in Data.IP.Range

Methods

fromString :: String -> AddrRange IPv6 #

IsString (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

fromString :: String -> Doc a #

IsString (Doc ann) 
Instance details

Defined in Prettyprinter.Internal

Methods

fromString :: String -> Doc ann #

a ~ Char => IsString [a] 
Instance details

Defined in Data.String

Methods

fromString :: String -> [a] #

(streamType ~ 'STInput, res ~ ()) => IsString (StreamSpec streamType res) 
Instance details

Defined in System.Process.Typed.Internal

Methods

fromString :: String -> StreamSpec streamType res #

IsString a => IsString (Const a b) 
Instance details

Defined in Data.String

Methods

fromString :: String -> Const a b #

IsString a => IsString (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

fromString :: String -> Tagged s a #

(stdin ~ (), stdout ~ (), stderr ~ ()) => IsString (ProcessConfig stdin stdout stderr) 
Instance details

Defined in System.Process.Typed.Internal

Methods

fromString :: String -> ProcessConfig stdin stdout stderr #

filter :: (a -> Bool) -> [a] -> [a] #

class Foldable (t :: Type -> Type) where #

Minimal complete definition

foldMap | foldr

Methods

fold :: Monoid m => t m -> m #

foldMap :: Monoid m => (a -> m) -> t a -> m #

foldr :: (a -> b -> b) -> b -> t a -> b #

foldl' :: (b -> a -> b) -> b -> t a -> b #

toList :: t a -> [a] #

null :: t a -> Bool #

length :: t a -> Int #

elem :: Eq a => a -> t a -> Bool #

sum :: Num a => t a -> a #

product :: Num a => t a -> a #

Instances

Instances details
Foldable Graph 
Instance details

Defined in Distribution.Compat.Graph

Methods

fold :: Monoid m => Graph m -> m #

foldMap :: Monoid m => (a -> m) -> Graph a -> m #

foldMap' :: Monoid m => (a -> m) -> Graph a -> m

foldr :: (a -> b -> b) -> b -> Graph a -> b #

foldr' :: (a -> b -> b) -> b -> Graph a -> b #

foldl :: (b -> a -> b) -> b -> Graph a -> b

foldl' :: (b -> a -> b) -> b -> Graph a -> b #

foldr1 :: (a -> a -> a) -> Graph a -> a

foldl1 :: (a -> a -> a) -> Graph a -> a

toList :: Graph a -> [a] #

null :: Graph a -> Bool #

length :: Graph a -> Int #

elem :: Eq a => a -> Graph a -> Bool #

maximum :: Ord a => Graph a -> a

minimum :: Ord a => Graph a -> a

sum :: Num a => Graph a -> a #

product :: Num a => Graph a -> a #

Foldable NonEmptySet 
Instance details

Defined in Distribution.Compat.NonEmptySet

Methods

fold :: Monoid m => NonEmptySet m -> m #

foldMap :: Monoid m => (a -> m) -> NonEmptySet a -> m #

foldMap' :: Monoid m => (a -> m) -> NonEmptySet a -> m

foldr :: (a -> b -> b) -> b -> NonEmptySet a -> b #

foldr' :: (a -> b -> b) -> b -> NonEmptySet a -> b #

foldl :: (b -> a -> b) -> b -> NonEmptySet a -> b

foldl' :: (b -> a -> b) -> b -> NonEmptySet a -> b #

foldr1 :: (a -> a -> a) -> NonEmptySet a -> a

foldl1 :: (a -> a -> a) -> NonEmptySet a -> a

toList :: NonEmptySet a -> [a] #

null :: NonEmptySet a -> Bool #

length :: NonEmptySet a -> Int #

elem :: Eq a => a -> NonEmptySet a -> Bool #

maximum :: Ord a => NonEmptySet a -> a

minimum :: Ord a => NonEmptySet a -> a

sum :: Num a => NonEmptySet a -> a #

product :: Num a => NonEmptySet a -> a #

Foldable PerCompilerFlavor 
Instance details

Defined in Distribution.Compiler

Methods

fold :: Monoid m => PerCompilerFlavor m -> m #

foldMap :: Monoid m => (a -> m) -> PerCompilerFlavor a -> m #

foldMap' :: Monoid m => (a -> m) -> PerCompilerFlavor a -> m

foldr :: (a -> b -> b) -> b -> PerCompilerFlavor a -> b #

foldr' :: (a -> b -> b) -> b -> PerCompilerFlavor a -> b #

foldl :: (b -> a -> b) -> b -> PerCompilerFlavor a -> b

foldl' :: (b -> a -> b) -> b -> PerCompilerFlavor a -> b #

foldr1 :: (a -> a -> a) -> PerCompilerFlavor a -> a

foldl1 :: (a -> a -> a) -> PerCompilerFlavor a -> a

toList :: PerCompilerFlavor a -> [a] #

null :: PerCompilerFlavor a -> Bool #

length :: PerCompilerFlavor a -> Int #

elem :: Eq a => a -> PerCompilerFlavor a -> Bool #

maximum :: Ord a => PerCompilerFlavor a -> a

minimum :: Ord a => PerCompilerFlavor a -> a

sum :: Num a => PerCompilerFlavor a -> a #

product :: Num a => PerCompilerFlavor a -> a #

Foldable Field 
Instance details

Defined in Distribution.Fields.Field

Methods

fold :: Monoid m => Field m -> m #

foldMap :: Monoid m => (a -> m) -> Field a -> m #

foldMap' :: Monoid m => (a -> m) -> Field a -> m

foldr :: (a -> b -> b) -> b -> Field a -> b #

foldr' :: (a -> b -> b) -> b -> Field a -> b #

foldl :: (b -> a -> b) -> b -> Field a -> b

foldl' :: (b -> a -> b) -> b -> Field a -> b #

foldr1 :: (a -> a -> a) -> Field a -> a

foldl1 :: (a -> a -> a) -> Field a -> a

toList :: Field a -> [a] #

null :: Field a -> Bool #

length :: Field a -> Int #

elem :: Eq a => a -> Field a -> Bool #

maximum :: Ord a => Field a -> a

minimum :: Ord a => Field a -> a

sum :: Num a => Field a -> a #

product :: Num a => Field a -> a #

Foldable FieldLine 
Instance details

Defined in Distribution.Fields.Field

Methods

fold :: Monoid m => FieldLine m -> m #

foldMap :: Monoid m => (a -> m) -> FieldLine a -> m #

foldMap' :: Monoid m => (a -> m) -> FieldLine a -> m

foldr :: (a -> b -> b) -> b -> FieldLine a -> b #

foldr' :: (a -> b -> b) -> b -> FieldLine a -> b #

foldl :: (b -> a -> b) -> b -> FieldLine a -> b

foldl' :: (b -> a -> b) -> b -> FieldLine a -> b #

foldr1 :: (a -> a -> a) -> FieldLine a -> a

foldl1 :: (a -> a -> a) -> FieldLine a -> a

toList :: FieldLine a -> [a] #

null :: FieldLine a -> Bool #

length :: FieldLine a -> Int #

elem :: Eq a => a -> FieldLine a -> Bool #

maximum :: Ord a => FieldLine a -> a

minimum :: Ord a => FieldLine a -> a

sum :: Num a => FieldLine a -> a #

product :: Num a => FieldLine a -> a #

Foldable Name 
Instance details

Defined in Distribution.Fields.Field

Methods

fold :: Monoid m => Name m -> m #

foldMap :: Monoid m => (a -> m) -> Name a -> m #

foldMap' :: Monoid m => (a -> m) -> Name a -> m

foldr :: (a -> b -> b) -> b -> Name a -> b #

foldr' :: (a -> b -> b) -> b -> Name a -> b #

foldl :: (b -> a -> b) -> b -> Name a -> b

foldl' :: (b -> a -> b) -> b -> Name a -> b #

foldr1 :: (a -> a -> a) -> Name a -> a

foldl1 :: (a -> a -> a) -> Name a -> a

toList :: Name a -> [a] #

null :: Name a -> Bool #

length :: Name a -> Int #

elem :: Eq a => a -> Name a -> Bool #

maximum :: Ord a => Name a -> a

minimum :: Ord a => Name a -> a

sum :: Num a => Name a -> a #

product :: Num a => Name a -> a #

Foldable SectionArg 
Instance details

Defined in Distribution.Fields.Field

Methods

fold :: Monoid m => SectionArg m -> m #

foldMap :: Monoid m => (a -> m) -> SectionArg a -> m #

foldMap' :: Monoid m => (a -> m) -> SectionArg a -> m

foldr :: (a -> b -> b) -> b -> SectionArg a -> b #

foldr' :: (a -> b -> b) -> b -> SectionArg a -> b #

foldl :: (b -> a -> b) -> b -> SectionArg a -> b

foldl' :: (b -> a -> b) -> b -> SectionArg a -> b #

foldr1 :: (a -> a -> a) -> SectionArg a -> a

foldl1 :: (a -> a -> a) -> SectionArg a -> a

toList :: SectionArg a -> [a] #

null :: SectionArg a -> Bool #

length :: SectionArg a -> Int #

elem :: Eq a => a -> SectionArg a -> Bool #

maximum :: Ord a => SectionArg a -> a

minimum :: Ord a => SectionArg a -> a

sum :: Num a => SectionArg a -> a #

product :: Num a => SectionArg a -> a #

Foldable PrettyField 
Instance details

Defined in Distribution.Fields.Pretty

Methods

fold :: Monoid m => PrettyField m -> m #

foldMap :: Monoid m => (a -> m) -> PrettyField a -> m #

foldMap' :: Monoid m => (a -> m) -> PrettyField a -> m

foldr :: (a -> b -> b) -> b -> PrettyField a -> b #

foldr' :: (a -> b -> b) -> b -> PrettyField a -> b #

foldl :: (b -> a -> b) -> b -> PrettyField a -> b

foldl' :: (b -> a -> b) -> b -> PrettyField a -> b #

foldr1 :: (a -> a -> a) -> PrettyField a -> a

foldl1 :: (a -> a -> a) -> PrettyField a -> a

toList :: PrettyField a -> [a] #

null :: PrettyField a -> Bool #

length :: PrettyField a -> Int #

elem :: Eq a => a -> PrettyField a -> Bool #

maximum :: Ord a => PrettyField a -> a

minimum :: Ord a => PrettyField a -> a

sum :: Num a => PrettyField a -> a #

product :: Num a => PrettyField a -> a #

Foldable Condition 
Instance details

Defined in Distribution.Types.Condition

Methods

fold :: Monoid m => Condition m -> m #

foldMap :: Monoid m => (a -> m) -> Condition a -> m #

foldMap' :: Monoid m => (a -> m) -> Condition a -> m

foldr :: (a -> b -> b) -> b -> Condition a -> b #

foldr' :: (a -> b -> b) -> b -> Condition a -> b #

foldl :: (b -> a -> b) -> b -> Condition a -> b

foldl' :: (b -> a -> b) -> b -> Condition a -> b #

foldr1 :: (a -> a -> a) -> Condition a -> a

foldl1 :: (a -> a -> a) -> Condition a -> a

toList :: Condition a -> [a] #

null :: Condition a -> Bool #

length :: Condition a -> Int #

elem :: Eq a => a -> Condition a -> Bool #

maximum :: Ord a => Condition a -> a

minimum :: Ord a => Condition a -> a

sum :: Num a => Condition a -> a #

product :: Num a => Condition a -> a #

Foldable VersionRangeF 
Instance details

Defined in Distribution.Types.VersionRange.Internal

Methods

fold :: Monoid m => VersionRangeF m -> m #

foldMap :: Monoid m => (a -> m) -> VersionRangeF a -> m #

foldMap' :: Monoid m => (a -> m) -> VersionRangeF a -> m

foldr :: (a -> b -> b) -> b -> VersionRangeF a -> b #

foldr' :: (a -> b -> b) -> b -> VersionRangeF a -> b #

foldl :: (b -> a -> b) -> b -> VersionRangeF a -> b

foldl' :: (b -> a -> b) -> b -> VersionRangeF a -> b #

foldr1 :: (a -> a -> a) -> VersionRangeF a -> a

foldl1 :: (a -> a -> a) -> VersionRangeF a -> a

toList :: VersionRangeF a -> [a] #

null :: VersionRangeF a -> Bool #

length :: VersionRangeF a -> Int #

elem :: Eq a => a -> VersionRangeF a -> Bool #

maximum :: Ord a => VersionRangeF a -> a

minimum :: Ord a => VersionRangeF a -> a

sum :: Num a => VersionRangeF a -> a #

product :: Num a => VersionRangeF a -> a #

Foldable KeyMap 
Instance details

Defined in Data.Aeson.KeyMap

Methods

fold :: Monoid m => KeyMap m -> m #

foldMap :: Monoid m => (a -> m) -> KeyMap a -> m #

foldMap' :: Monoid m => (a -> m) -> KeyMap a -> m

foldr :: (a -> b -> b) -> b -> KeyMap a -> b #

foldr' :: (a -> b -> b) -> b -> KeyMap a -> b #

foldl :: (b -> a -> b) -> b -> KeyMap a -> b

foldl' :: (b -> a -> b) -> b -> KeyMap a -> b #

foldr1 :: (a -> a -> a) -> KeyMap a -> a

foldl1 :: (a -> a -> a) -> KeyMap a -> a

toList :: KeyMap a -> [a] #

null :: KeyMap a -> Bool #

length :: KeyMap a -> Int #

elem :: Eq a => a -> KeyMap a -> Bool #

maximum :: Ord a => KeyMap a -> a

minimum :: Ord a => KeyMap a -> a

sum :: Num a => KeyMap a -> a #

product :: Num a => KeyMap a -> a #

Foldable IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fold :: Monoid m => IResult m -> m #

foldMap :: Monoid m => (a -> m) -> IResult a -> m #

foldMap' :: Monoid m => (a -> m) -> IResult a -> m

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

foldr' :: (a -> b -> b) -> b -> IResult a -> b #

foldl :: (b -> a -> b) -> b -> IResult a -> b

foldl' :: (b -> a -> b) -> b -> IResult a -> b #

foldr1 :: (a -> a -> a) -> IResult a -> a

foldl1 :: (a -> a -> a) -> IResult a -> a

toList :: IResult a -> [a] #

null :: IResult a -> Bool #

length :: IResult a -> Int #

elem :: Eq a => a -> IResult a -> Bool #

maximum :: Ord a => IResult a -> a

minimum :: Ord a => IResult a -> a

sum :: Num a => IResult a -> a #

product :: Num a => IResult a -> a #

Foldable Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

fold :: Monoid m => Result m -> m #

foldMap :: Monoid m => (a -> m) -> Result a -> m #

foldMap' :: Monoid m => (a -> m) -> Result a -> m

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

foldr' :: (a -> b -> b) -> b -> Result a -> b #

foldl :: (b -> a -> b) -> b -> Result a -> b

foldl' :: (b -> a -> b) -> b -> Result a -> b #

foldr1 :: (a -> a -> a) -> Result a -> a

foldl1 :: (a -> a -> a) -> Result a -> a

toList :: Result a -> [a] #

null :: Result a -> Bool #

length :: Result a -> Int #

elem :: Eq a => a -> Result a -> Bool #

maximum :: Ord a => Result a -> a

minimum :: Ord a => Result a -> a

sum :: Num a => Result a -> a #

product :: Num a => Result a -> a #

Foldable ZipList 
Instance details

Defined in Control.Applicative

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 #

Foldable Complex 
Instance details

Defined in Data.Complex

Methods

fold :: Monoid m => Complex m -> m #

foldMap :: Monoid m => (a -> m) -> Complex a -> m #

foldMap' :: Monoid m => (a -> m) -> Complex a -> m

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

foldr' :: (a -> b -> b) -> b -> Complex a -> b #

foldl :: (b -> a -> b) -> b -> Complex a -> b

foldl' :: (b -> a -> b) -> b -> Complex a -> b #

foldr1 :: (a -> a -> a) -> Complex a -> a

foldl1 :: (a -> a -> a) -> Complex a -> a

toList :: Complex a -> [a] #

null :: Complex a -> Bool #

length :: Complex a -> Int #

elem :: Eq a => a -> Complex a -> Bool #

maximum :: Ord a => Complex a -> a

minimum :: Ord a => Complex a -> a

sum :: Num a => Complex a -> a #

product :: Num a => Complex a -> a #

Foldable Identity 
Instance details

Defined in Data.Functor.Identity

Methods

fold :: Monoid m => Identity m -> m #

foldMap :: Monoid m => (a -> m) -> Identity a -> m #

foldMap' :: Monoid m => (a -> m) -> Identity a -> m

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

foldr' :: (a -> b -> b) -> b -> Identity a -> b #

foldl :: (b -> a -> b) -> b -> Identity a -> b

foldl' :: (b -> a -> b) -> b -> Identity a -> b #

foldr1 :: (a -> a -> a) -> Identity a -> a

foldl1 :: (a -> a -> a) -> Identity a -> a

toList :: Identity a -> [a] #

null :: Identity a -> Bool #

length :: Identity a -> Int #

elem :: Eq a => a -> Identity a -> Bool #

maximum :: Ord a => Identity a -> a

minimum :: Ord a => Identity a -> a

sum :: Num a => Identity a -> a #

product :: Num a => Identity a -> a #

Foldable First 
Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => First m -> m #

foldMap :: Monoid m => (a -> m) -> First a -> m #

foldMap' :: Monoid m => (a -> m) -> First a -> m

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

foldr' :: (a -> b -> b) -> b -> First a -> b #

foldl :: (b -> a -> b) -> b -> First a -> b

foldl' :: (b -> a -> b) -> b -> First a -> b #

foldr1 :: (a -> a -> a) -> First a -> a

foldl1 :: (a -> a -> a) -> First a -> a

toList :: First a -> [a] #

null :: First a -> Bool #

length :: First a -> Int #

elem :: Eq a => a -> First a -> Bool #

maximum :: Ord a => First a -> a

minimum :: Ord a => First a -> a

sum :: Num a => First a -> a #

product :: Num a => First a -> a #

Foldable Last 
Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Last m -> m #

foldMap :: Monoid m => (a -> m) -> Last a -> m #

foldMap' :: Monoid m => (a -> m) -> Last a -> m

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

foldr' :: (a -> b -> b) -> b -> Last a -> b #

foldl :: (b -> a -> b) -> b -> Last a -> b

foldl' :: (b -> a -> b) -> b -> Last a -> b #

foldr1 :: (a -> a -> a) -> Last a -> a

foldl1 :: (a -> a -> a) -> Last a -> a

toList :: Last a -> [a] #

null :: Last a -> Bool #

length :: Last a -> Int #

elem :: Eq a => a -> Last a -> Bool #

maximum :: Ord a => Last a -> a

minimum :: Ord a => Last a -> a

sum :: Num a => Last a -> a #

product :: Num a => Last a -> a #

Foldable Down 
Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Down m -> m #

foldMap :: Monoid m => (a -> m) -> Down a -> m #

foldMap' :: Monoid m => (a -> m) -> Down a -> m

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

foldr' :: (a -> b -> b) -> b -> Down a -> b #

foldl :: (b -> a -> b) -> b -> Down a -> b

foldl' :: (b -> a -> b) -> b -> Down a -> b #

foldr1 :: (a -> a -> a) -> Down a -> a

foldl1 :: (a -> a -> a) -> Down a -> a

toList :: Down a -> [a] #

null :: Down a -> Bool #

length :: Down a -> Int #

elem :: Eq a => a -> Down a -> Bool #

maximum :: Ord a => Down a -> a

minimum :: Ord a => Down a -> a

sum :: Num a => Down a -> a #

product :: Num a => Down a -> a #

Foldable First 
Instance details

Defined in Data.Semigroup

Methods

fold :: Monoid m => First m -> m #

foldMap :: Monoid m => (a -> m) -> First a -> m #

foldMap' :: Monoid m => (a -> m) -> First a -> m

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

foldr' :: (a -> b -> b) -> b -> First a -> b #

foldl :: (b -> a -> b) -> b -> First a -> b

foldl' :: (b -> a -> b) -> b -> First a -> b #

foldr1 :: (a -> a -> a) -> First a -> a

foldl1 :: (a -> a -> a) -> First a -> a

toList :: First a -> [a] #

null :: First a -> Bool #

length :: First a -> Int #

elem :: Eq a => a -> First a -> Bool #

maximum :: Ord a => First a -> a

minimum :: Ord a => First a -> a

sum :: Num a => First a -> a #

product :: Num a => First a -> a #

Foldable Last 
Instance details

Defined in Data.Semigroup

Methods

fold :: Monoid m => Last m -> m #

foldMap :: Monoid m => (a -> m) -> Last a -> m #

foldMap' :: Monoid m => (a -> m) -> Last a -> m

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

foldr' :: (a -> b -> b) -> b -> Last a -> b #

foldl :: (b -> a -> b) -> b -> Last a -> b

foldl' :: (b -> a -> b) -> b -> Last a -> b #

foldr1 :: (a -> a -> a) -> Last a -> a

foldl1 :: (a -> a -> a) -> Last a -> a

toList :: Last a -> [a] #

null :: Last a -> Bool #

length :: Last a -> Int #

elem :: Eq a => a -> Last a -> Bool #

maximum :: Ord a => Last a -> a

minimum :: Ord a => Last a -> a

sum :: Num a => Last a -> a #

product :: Num a => Last a -> a #

Foldable Max 
Instance details

Defined in Data.Semigroup

Methods

fold :: Monoid m => Max m -> m #

foldMap :: Monoid m => (a -> m) -> Max a -> m #

foldMap' :: Monoid m => (a -> m) -> Max a -> m

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

foldr' :: (a -> b -> b) -> b -> Max a -> b #

foldl :: (b -> a -> b) -> b -> Max a -> b

foldl' :: (b -> a -> b) -> b -> Max a -> b #

foldr1 :: (a -> a -> a) -> Max a -> a

foldl1 :: (a -> a -> a) -> Max a -> a

toList :: Max a -> [a] #

null :: Max a -> Bool #

length :: Max a -> Int #

elem :: Eq a => a -> Max a -> Bool #

maximum :: Ord a => Max a -> a

minimum :: Ord a => Max a -> a

sum :: Num a => Max a -> a #

product :: Num a => Max a -> a #

Foldable Min 
Instance details

Defined in Data.Semigroup

Methods

fold :: Monoid m => Min m -> m #

foldMap :: Monoid m => (a -> m) -> Min a -> m #

foldMap' :: Monoid m => (a -> m) -> Min a -> m

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

foldr' :: (a -> b -> b) -> b -> Min a -> b #

foldl :: (b -> a -> b) -> b -> Min a -> b

foldl' :: (b -> a -> b) -> b -> Min a -> b #

foldr1 :: (a -> a -> a) -> Min a -> a

foldl1 :: (a -> a -> a) -> Min a -> a

toList :: Min a -> [a] #

null :: Min a -> Bool #

length :: Min a -> Int #

elem :: Eq a => a -> Min a -> Bool #

maximum :: Ord a => Min a -> a

minimum :: Ord a => Min a -> a

sum :: Num a => Min a -> a #

product :: Num a => Min a -> a #

Foldable Dual 
Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Dual m -> m #

foldMap :: Monoid m => (a -> m) -> Dual a -> m #

foldMap' :: Monoid m => (a -> m) -> Dual a -> m

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

foldr' :: (a -> b -> b) -> b -> Dual a -> b #

foldl :: (b -> a -> b) -> b -> Dual a -> b

foldl' :: (b -> a -> b) -> b -> Dual a -> b #

foldr1 :: (a -> a -> a) -> Dual a -> a

foldl1 :: (a -> a -> a) -> Dual a -> a

toList :: Dual a -> [a] #

null :: Dual a -> Bool #

length :: Dual a -> Int #

elem :: Eq a => a -> Dual a -> Bool #

maximum :: Ord a => Dual a -> a

minimum :: Ord a => Dual a -> a

sum :: Num a => Dual a -> a #

product :: Num a => Dual a -> a #

Foldable Product 
Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Product m -> m #

foldMap :: Monoid m => (a -> m) -> Product a -> m #

foldMap' :: Monoid m => (a -> m) -> Product a -> m

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

foldr' :: (a -> b -> b) -> b -> Product a -> b #

foldl :: (b -> a -> b) -> b -> Product a -> b

foldl' :: (b -> a -> b) -> b -> Product a -> b #

foldr1 :: (a -> a -> a) -> Product a -> a

foldl1 :: (a -> a -> a) -> Product a -> a

toList :: Product a -> [a] #

null :: Product a -> Bool #

length :: Product a -> Int #

elem :: Eq a => a -> Product a -> Bool #

maximum :: Ord a => Product a -> a

minimum :: Ord a => Product a -> a

sum :: Num a => Product a -> a #

product :: Num a => Product a -> a #

Foldable Sum 
Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Sum m -> m #

foldMap :: Monoid m => (a -> m) -> Sum a -> m #

foldMap' :: Monoid m => (a -> m) -> Sum a -> m

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

foldr' :: (a -> b -> b) -> b -> Sum a -> b #

foldl :: (b -> a -> b) -> b -> Sum a -> b

foldl' :: (b -> a -> b) -> b -> Sum a -> b #

foldr1 :: (a -> a -> a) -> Sum a -> a

foldl1 :: (a -> a -> a) -> Sum a -> a

toList :: Sum a -> [a] #

null :: Sum a -> Bool #

length :: Sum a -> Int #

elem :: Eq a => a -> Sum a -> Bool #

maximum :: Ord a => Sum a -> a

minimum :: Ord a => Sum a -> a

sum :: Num a => Sum a -> a #

product :: Num a => Sum a -> a #

Foldable NonEmpty 
Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => NonEmpty m -> m #

foldMap :: Monoid m => (a -> m) -> NonEmpty a -> m #

foldMap' :: Monoid m => (a -> m) -> NonEmpty a -> m

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

foldr' :: (a -> b -> b) -> b -> NonEmpty a -> b #

foldl :: (b -> a -> b) -> b -> NonEmpty a -> b

foldl' :: (b -> a -> b) -> b -> NonEmpty a -> b #

foldr1 :: (a -> a -> a) -> NonEmpty a -> a

foldl1 :: (a -> a -> a) -> NonEmpty a -> a

toList :: NonEmpty a -> [a] #

null :: NonEmpty a -> Bool #

length :: NonEmpty a -> Int #

elem :: Eq a => a -> NonEmpty a -> Bool #

maximum :: Ord a => NonEmpty a -> a

minimum :: Ord a => NonEmpty a -> a

sum :: Num a => NonEmpty a -> a #

product :: Num a => NonEmpty a -> a #

Foldable Par1 
Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Par1 m -> m #

foldMap :: Monoid m => (a -> m) -> Par1 a -> m #

foldMap' :: Monoid m => (a -> m) -> Par1 a -> m

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

foldr' :: (a -> b -> b) -> b -> Par1 a -> b #

foldl :: (b -> a -> b) -> b -> Par1 a -> b

foldl' :: (b -> a -> b) -> b -> Par1 a -> b #

foldr1 :: (a -> a -> a) -> Par1 a -> a

foldl1 :: (a -> a -> a) -> Par1 a -> a

toList :: Par1 a -> [a] #

null :: Par1 a -> Bool #

length :: Par1 a -> Int #

elem :: Eq a => a -> Par1 a -> Bool #

maximum :: Ord a => Par1 a -> a

minimum :: Ord a => Par1 a -> a

sum :: Num a => Par1 a -> a #

product :: Num a => Par1 a -> a #

Foldable SCC 
Instance details

Defined in Data.Graph

Methods

fold :: Monoid m => SCC m -> m #

foldMap :: Monoid m => (a -> m) -> SCC a -> m #

foldMap' :: Monoid m => (a -> m) -> SCC a -> m

foldr :: (a -> b -> b) -> b -> SCC a -> b #

foldr' :: (a -> b -> b) -> b -> SCC a -> b #

foldl :: (b -> a -> b) -> b -> SCC a -> b

foldl' :: (b -> a -> b) -> b -> SCC a -> b #

foldr1 :: (a -> a -> a) -> SCC a -> a

foldl1 :: (a -> a -> a) -> SCC a -> a

toList :: SCC a -> [a] #

null :: SCC a -> Bool #

length :: SCC a -> Int #

elem :: Eq a => a -> SCC a -> Bool #

maximum :: Ord a => SCC a -> a

minimum :: Ord a => SCC a -> a

sum :: Num a => SCC a -> a #

product :: Num a => SCC a -> a #

Foldable IntMap 
Instance details

Defined in Data.IntMap.Internal

Methods

fold :: Monoid m => IntMap m -> m #

foldMap :: Monoid m => (a -> m) -> IntMap a -> m #

foldMap' :: Monoid m => (a -> m) -> IntMap a -> m

foldr :: (a -> b -> b) -> b -> IntMap a -> b #

foldr' :: (a -> b -> b) -> b -> IntMap a -> b #

foldl :: (b -> a -> b) -> b -> IntMap a -> b

foldl' :: (b -> a -> b) -> b -> IntMap a -> b #

foldr1 :: (a -> a -> a) -> IntMap a -> a

foldl1 :: (a -> a -> a) -> IntMap a -> a

toList :: IntMap a -> [a] #

null :: IntMap a -> Bool #

length :: IntMap a -> Int #

elem :: Eq a => a -> IntMap a -> Bool #

maximum :: Ord a => IntMap a -> a

minimum :: Ord a => IntMap a -> a

sum :: Num a => IntMap a -> a #

product :: Num a => IntMap a -> a #

Foldable Digit 
Instance details

Defined in Data.Sequence.Internal

Methods

fold :: Monoid m => Digit m -> m #

foldMap :: Monoid m => (a -> m) -> Digit a -> m #

foldMap' :: Monoid m => (a -> m) -> Digit a -> m

foldr :: (a -> b -> b) -> b -> Digit a -> b #

foldr' :: (a -> b -> b) -> b -> Digit a -> b #

foldl :: (b -> a -> b) -> b -> Digit a -> b

foldl' :: (b -> a -> b) -> b -> Digit a -> b #

foldr1 :: (a -> a -> a) -> Digit a -> a

foldl1 :: (a -> a -> a) -> Digit a -> a

toList :: Digit a -> [a] #

null :: Digit a -> Bool #

length :: Digit a -> Int #

elem :: Eq a => a -> Digit a -> Bool #

maximum :: Ord a => Digit a -> a

minimum :: Ord a => Digit a -> a

sum :: Num a => Digit a -> a #

product :: Num a => Digit a -> a #

Foldable Elem 
Instance details

Defined in Data.Sequence.Internal

Methods

fold :: Monoid m => Elem m -> m #

foldMap :: Monoid m => (a -> m) -> Elem a -> m #

foldMap' :: Monoid m => (a -> m) -> Elem a -> m

foldr :: (a -> b -> b) -> b -> Elem a -> b #

foldr' :: (a -> b -> b) -> b -> Elem a -> b #

foldl :: (b -> a -> b) -> b -> Elem a -> b

foldl' :: (b -> a -> b) -> b -> Elem a -> b #

foldr1 :: (a -> a -> a) -> Elem a -> a

foldl1 :: (a -> a -> a) -> Elem a -> a

toList :: Elem a -> [a] #

null :: Elem a -> Bool #

length :: Elem a -> Int #

elem :: Eq a => a -> Elem a -> Bool #

maximum :: Ord a => Elem a -> a

minimum :: Ord a => Elem a -> a

sum :: Num a => Elem a -> a #

product :: Num a => Elem a -> a #

Foldable FingerTree 
Instance details

Defined in Data.Sequence.Internal

Methods

fold :: Monoid m => FingerTree m -> m #

foldMap :: Monoid m => (a -> m) -> FingerTree a -> m #

foldMap' :: Monoid m => (a -> m) -> FingerTree a -> m

foldr :: (a -> b -> b) -> b -> FingerTree a -> b #

foldr' :: (a -> b -> b) -> b -> FingerTree a -> b #

foldl :: (b -> a -> b) -> b -> FingerTree a -> b

foldl' :: (b -> a -> b) -> b -> FingerTree a -> b #

foldr1 :: (a -> a -> a) -> FingerTree a -> a

foldl1 :: (a -> a -> a) -> FingerTree a -> a

toList :: FingerTree a -> [a] #

null :: FingerTree a -> Bool #

length :: FingerTree a -> Int #

elem :: Eq a => a -> FingerTree a -> Bool #

maximum :: Ord a => FingerTree a -> a

minimum :: Ord a => FingerTree a -> a

sum :: Num a => FingerTree a -> a #

product :: Num a => FingerTree a -> a #

Foldable Node 
Instance details

Defined in Data.Sequence.Internal

Methods

fold :: Monoid m => Node m -> m #

foldMap :: Monoid m => (a -> m) -> Node a -> m #

foldMap' :: Monoid m => (a -> m) -> Node a -> m

foldr :: (a -> b -> b) -> b -> Node a -> b #

foldr' :: (a -> b -> b) -> b -> Node a -> b #

foldl :: (b -> a -> b) -> b -> Node a -> b

foldl' :: (b -> a -> b) -> b -> Node a -> b #

foldr1 :: (a -> a -> a) -> Node a -> a

foldl1 :: (a -> a -> a) -> Node a -> a

toList :: Node a -> [a] #

null :: Node a -> Bool #

length :: Node a -> Int #

elem :: Eq a => a -> Node a -> Bool #

maximum :: Ord a => Node a -> a

minimum :: Ord a => Node a -> a

sum :: Num a => Node a -> a #

product :: Num a => Node a -> a #

Foldable Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

fold :: Monoid m => Seq m -> m #

foldMap :: Monoid m => (a -> m) -> Seq a -> m #

foldMap' :: Monoid m => (a -> m) -> Seq a -> m

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

foldr' :: (a -> b -> b) -> b -> Seq a -> b #

foldl :: (b -> a -> b) -> b -> Seq a -> b

foldl' :: (b -> a -> b) -> b -> Seq a -> b #

foldr1 :: (a -> a -> a) -> Seq a -> a

foldl1 :: (a -> a -> a) -> Seq a -> a

toList :: Seq a -> [a] #

null :: Seq a -> Bool #

length :: Seq a -> Int #

elem :: Eq a => a -> Seq a -> Bool #

maximum :: Ord a => Seq a -> a

minimum :: Ord a => Seq a -> a

sum :: Num a => Seq a -> a #

product :: Num a => Seq a -> a #

Foldable ViewL 
Instance details

Defined in Data.Sequence.Internal

Methods

fold :: Monoid m => ViewL m -> m #

foldMap :: Monoid m => (a -> m) -> ViewL a -> m #

foldMap' :: Monoid m => (a -> m) -> ViewL a -> m

foldr :: (a -> b -> b) -> b -> ViewL a -> b #

foldr' :: (a -> b -> b) -> b -> ViewL a -> b #

foldl :: (b -> a -> b) -> b -> ViewL a -> b

foldl' :: (b -> a -> b) -> b -> ViewL a -> b #

foldr1 :: (a -> a -> a) -> ViewL a -> a

foldl1 :: (a -> a -> a) -> ViewL a -> a

toList :: ViewL a -> [a] #

null :: ViewL a -> Bool #

length :: ViewL a -> Int #

elem :: Eq a => a -> ViewL a -> Bool #

maximum :: Ord a => ViewL a -> a

minimum :: Ord a => ViewL a -> a

sum :: Num a => ViewL a -> a #

product :: Num a => ViewL a -> a #

Foldable ViewR 
Instance details

Defined in Data.Sequence.Internal

Methods

fold :: Monoid m => ViewR m -> m #

foldMap :: Monoid m => (a -> m) -> ViewR a -> m #

foldMap' :: Monoid m => (a -> m) -> ViewR a -> m

foldr :: (a -> b -> b) -> b -> ViewR a -> b #

foldr' :: (a -> b -> b) -> b -> ViewR a -> b #

foldl :: (b -> a -> b) -> b -> ViewR a -> b

foldl' :: (b -> a -> b) -> b -> ViewR a -> b #

foldr1 :: (a -> a -> a) -> ViewR a -> a

foldl1 :: (a -> a -> a) -> ViewR a -> a

toList :: ViewR a -> [a] #

null :: ViewR a -> Bool #

length :: ViewR a -> Int #

elem :: Eq a => a -> ViewR a -> Bool #

maximum :: Ord a => ViewR a -> a

minimum :: Ord a => ViewR a -> a

sum :: Num a => ViewR a -> a #

product :: Num a => ViewR a -> a #

Foldable Set 
Instance details

Defined in Data.Set.Internal

Methods

fold :: Monoid m => Set m -> m #

foldMap :: Monoid m => (a -> m) -> Set a -> m #

foldMap' :: Monoid m => (a -> m) -> Set a -> m

foldr :: (a -> b -> b) -> b -> Set a -> b #

foldr' :: (a -> b -> b) -> b -> Set a -> b #

foldl :: (b -> a -> b) -> b -> Set a -> b

foldl' :: (b -> a -> b) -> b -> Set a -> b #

foldr1 :: (a -> a -> a) -> Set a -> a

foldl1 :: (a -> a -> a) -> Set a -> a

toList :: Set a -> [a] #

null :: Set a -> Bool #

length :: Set a -> Int #

elem :: Eq a => a -> Set a -> Bool #

maximum :: Ord a => Set a -> a

minimum :: Ord a => Set a -> a

sum :: Num a => Set a -> a #

product :: Num a => Set a -> a #

Foldable Tree 
Instance details

Defined in Data.Tree

Methods

fold :: Monoid m => Tree m -> m #

foldMap :: Monoid m => (a -> m) -> Tree a -> m #

foldMap' :: Monoid m => (a -> m) -> Tree a -> m

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

foldr' :: (a -> b -> b) -> b -> Tree a -> b #

foldl :: (b -> a -> b) -> b -> Tree a -> b

foldl' :: (b -> a -> b) -> b -> Tree a -> b #

foldr1 :: (a -> a -> a) -> Tree a -> a

foldl1 :: (a -> a -> a) -> Tree a -> a

toList :: Tree a -> [a] #

null :: Tree a -> Bool #

length :: Tree a -> Int #

elem :: Eq a => a -> Tree a -> Bool #

maximum :: Ord a => Tree a -> a

minimum :: Ord a => Tree a -> a

sum :: Num a => Tree a -> a #

product :: Num a => Tree a -> a #

Foldable DNonEmpty 
Instance details

Defined in Data.DList.DNonEmpty.Internal

Methods

fold :: Monoid m => DNonEmpty m -> m #

foldMap :: Monoid m => (a -> m) -> DNonEmpty a -> m #

foldMap' :: Monoid m => (a -> m) -> DNonEmpty a -> m

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

foldr' :: (a -> b -> b) -> b -> DNonEmpty a -> b #

foldl :: (b -> a -> b) -> b -> DNonEmpty a -> b

foldl' :: (b -> a -> b) -> b -> DNonEmpty a -> b #

foldr1 :: (a -> a -> a) -> DNonEmpty a -> a

foldl1 :: (a -> a -> a) -> DNonEmpty a -> a

toList :: DNonEmpty a -> [a] #

null :: DNonEmpty a -> Bool #

length :: DNonEmpty a -> Int #

elem :: Eq a => a -> DNonEmpty a -> Bool #

maximum :: Ord a => DNonEmpty a -> a

minimum :: Ord a => DNonEmpty a -> a

sum :: Num a => DNonEmpty a -> a #

product :: Num a => DNonEmpty a -> a #

Foldable DList 
Instance details

Defined in Data.DList.Internal

Methods

fold :: Monoid m => DList m -> m #

foldMap :: Monoid m => (a -> m) -> DList a -> m #

foldMap' :: Monoid m => (a -> m) -> DList a -> m

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

foldr' :: (a -> b -> b) -> b -> DList a -> b #

foldl :: (b -> a -> b) -> b -> DList a -> b

foldl' :: (b -> a -> b) -> b -> DList a -> b #

foldr1 :: (a -> a -> a) -> DList a -> a

foldl1 :: (a -> a -> a) -> DList a -> a

toList :: DList a -> [a] #

null :: DList a -> Bool #

length :: DList a -> Int #

elem :: Eq a => a -> DList a -> Bool #

maximum :: Ord a => DList a -> a

minimum :: Ord a => DList a -> a

sum :: Num a => DList a -> a #

product :: Num a => DList a -> a #

Foldable SizedSeq 
Instance details

Defined in GHC.Data.SizedSeq

Methods

fold :: Monoid m => SizedSeq m -> m #

foldMap :: Monoid m => (a -> m) -> SizedSeq a -> m #

foldMap' :: Monoid m => (a -> m) -> SizedSeq a -> m

foldr :: (a -> b -> b) -> b -> SizedSeq a -> b #

foldr' :: (a -> b -> b) -> b -> SizedSeq a -> b #

foldl :: (b -> a -> b) -> b -> SizedSeq a -> b

foldl' :: (b -> a -> b) -> b -> SizedSeq a -> b #

foldr1 :: (a -> a -> a) -> SizedSeq a -> a

foldl1 :: (a -> a -> a) -> SizedSeq a -> a

toList :: SizedSeq a -> [a] #

null :: SizedSeq a -> Bool #

length :: SizedSeq a -> Int #

elem :: Eq a => a -> SizedSeq a -> Bool #

maximum :: Ord a => SizedSeq a -> a

minimum :: Ord a => SizedSeq a -> a

sum :: Num a => SizedSeq a -> a #

product :: Num a => SizedSeq a -> a #

Foldable Hashed 
Instance details

Defined in Data.Hashable.Class

Methods

fold :: Monoid m => Hashed m -> m #

foldMap :: Monoid m => (a -> m) -> Hashed a -> m #

foldMap' :: Monoid m => (a -> m) -> Hashed a -> m

foldr :: (a -> b -> b) -> b -> Hashed a -> b #

foldr' :: (a -> b -> b) -> b -> Hashed a -> b #

foldl :: (b -> a -> b) -> b -> Hashed a -> b

foldl' :: (b -> a -> b) -> b -> Hashed a -> b #

foldr1 :: (a -> a -> a) -> Hashed a -> a

foldl1 :: (a -> a -> a) -> Hashed a -> a

toList :: Hashed a -> [a] #

null :: Hashed a -> Bool #

length :: Hashed a -> Int #

elem :: Eq a => a -> Hashed a -> Bool #

maximum :: Ord a => Hashed a -> a

minimum :: Ord a => Hashed a -> a

sum :: Num a => Hashed a -> a #

product :: Num a => Hashed a -> a #

Foldable List 
Instance details

Defined in Data.Aeson.Config.Types

Methods

fold :: Monoid m => List m -> m #

foldMap :: Monoid m => (a -> m) -> List a -> m #

foldMap' :: Monoid m => (a -> m) -> List a -> m

foldr :: (a -> b -> b) -> b -> List a -> b #

foldr' :: (a -> b -> b) -> b -> List a -> b #

foldl :: (b -> a -> b) -> b -> List a -> b

foldl' :: (b -> a -> b) -> b -> List a -> b #

foldr1 :: (a -> a -> a) -> List a -> a

foldl1 :: (a -> a -> a) -> List a -> a

toList :: List a -> [a] #

null :: List a -> Bool #

length :: List a -> Int #

elem :: Eq a => a -> List a -> Bool #

maximum :: Ord a => List a -> a

minimum :: Ord a => List a -> a

sum :: Num a => List a -> a #

product :: Num a => List a -> a #

Foldable Conditional 
Instance details

Defined in Hpack.Config

Methods

fold :: Monoid m => Conditional m -> m #

foldMap :: Monoid m => (a -> m) -> Conditional a -> m #

foldMap' :: Monoid m => (a -> m) -> Conditional a -> m

foldr :: (a -> b -> b) -> b -> Conditional a -> b #

foldr' :: (a -> b -> b) -> b -> Conditional a -> b #

foldl :: (b -> a -> b) -> b -> Conditional a -> b

foldl' :: (b -> a -> b) -> b -> Conditional a -> b #

foldr1 :: (a -> a -> a) -> Conditional a -> a

foldl1 :: (a -> a -> a) -> Conditional a -> a

toList :: Conditional a -> [a] #

null :: Conditional a -> Bool #

length :: Conditional a -> Int #

elem :: Eq a => a -> Conditional a -> Bool #

maximum :: Ord a => Conditional a -> a

minimum :: Ord a => Conditional a -> a

sum :: Num a => Conditional a -> a #

product :: Num a => Conditional a -> a #

Foldable Section 
Instance details

Defined in Hpack.Config

Methods

fold :: Monoid m => Section m -> m #

foldMap :: Monoid m => (a -> m) -> Section a -> m #

foldMap' :: Monoid m => (a -> m) -> Section a -> m

foldr :: (a -> b -> b) -> b -> Section a -> b #

foldr' :: (a -> b -> b) -> b -> Section a -> b #

foldl :: (b -> a -> b) -> b -> Section a -> b

foldl' :: (b -> a -> b) -> b -> Section a -> b #

foldr1 :: (a -> a -> a) -> Section a -> a

foldl1 :: (a -> a -> a) -> Section a -> a

toList :: Section a -> [a] #

null :: Section a -> Bool #

length :: Section a -> Int #

elem :: Eq a => a -> Section a -> Bool #

maximum :: Ord a => Section a -> a

minimum :: Ord a => Section a -> a

sum :: Num a => Section a -> a #

product :: Num a => Section a -> a #

Foldable LenientData 
Instance details

Defined in Web.Internal.HttpApiData

Methods

fold :: Monoid m => LenientData m -> m #

foldMap :: Monoid m => (a -> m) -> LenientData a -> m #

foldMap' :: Monoid m => (a -> m) -> LenientData a -> m

foldr :: (a -> b -> b) -> b -> LenientData a -> b #

foldr' :: (a -> b -> b) -> b -> LenientData a -> b #

foldl :: (b -> a -> b) -> b -> LenientData a -> b

foldl' :: (b -> a -> b) -> b -> LenientData a -> b #

foldr1 :: (a -> a -> a) -> LenientData a -> a

foldl1 :: (a -> a -> a) -> LenientData a -> a

toList :: LenientData a -> [a] #

null :: LenientData a -> Bool #

length :: LenientData a -> Int #

elem :: Eq a => a -> LenientData a -> Bool #

maximum :: Ord a => LenientData a -> a

minimum :: Ord a => LenientData a -> a

sum :: Num a => LenientData a -> a #

product :: Num a => LenientData a -> a #

Foldable HistoriedResponse 
Instance details

Defined in Network.HTTP.Client

Methods

fold :: Monoid m => HistoriedResponse m -> m #

foldMap :: Monoid m => (a -> m) -> HistoriedResponse a -> m #

foldMap' :: Monoid m => (a -> m) -> HistoriedResponse a -> m

foldr :: (a -> b -> b) -> b -> HistoriedResponse a -> b #

foldr' :: (a -> b -> b) -> b -> HistoriedResponse a -> b #

foldl :: (b -> a -> b) -> b -> HistoriedResponse a -> b

foldl' :: (b -> a -> b) -> b -> HistoriedResponse a -> b #

foldr1 :: (a -> a -> a) -> HistoriedResponse a -> a

foldl1 :: (a -> a -> a) -> HistoriedResponse a -> a

toList :: HistoriedResponse a -> [a] #

null :: HistoriedResponse a -> Bool #

length :: HistoriedResponse a -> Int #

elem :: Eq a => a -> HistoriedResponse a -> Bool #

maximum :: Ord a => HistoriedResponse a -> a

minimum :: Ord a => HistoriedResponse a -> a

sum :: Num a => HistoriedResponse a -> a #

product :: Num a => HistoriedResponse a -> a #

Foldable Response 
Instance details

Defined in Network.HTTP.Client.Types

Methods

fold :: Monoid m => Response m -> m #

foldMap :: Monoid m => (a -> m) -> Response a -> m #

foldMap' :: Monoid m => (a -> m) -> Response a -> m

foldr :: (a -> b -> b) -> b -> Response a -> b #

foldr' :: (a -> b -> b) -> b -> Response a -> b #

foldl :: (b -> a -> b) -> b -> Response a -> b

foldl' :: (b -> a -> b) -> b -> Response a -> b #

foldr1 :: (a -> a -> a) -> Response a -> a

foldl1 :: (a -> a -> a) -> Response a -> a

toList :: Response a -> [a] #

null :: Response a -> Bool #

length :: Response a -> Int #

elem :: Eq a => a -> Response a -> Bool #

maximum :: Ord a => Response a -> a

minimum :: Ord a => Response a -> a

sum :: Num a => Response a -> a #

product :: Num a => Response a -> a #

Foldable SimpleDocStream 
Instance details

Defined in Prettyprinter.Internal

Methods

fold :: Monoid m => SimpleDocStream m -> m #

foldMap :: Monoid m => (a -> m) -> SimpleDocStream a -> m #

foldMap' :: Monoid m => (a -> m) -> SimpleDocStream a -> m

foldr :: (a -> b -> b) -> b -> SimpleDocStream a -> b #

foldr' :: (a -> b -> b) -> b -> SimpleDocStream a -> b #

foldl :: (b -> a -> b) -> b -> SimpleDocStream a -> b

foldl' :: (b -> a -> b) -> b -> SimpleDocStream a -> b #

foldr1 :: (a -> a -> a) -> SimpleDocStream a -> a

foldl1 :: (a -> a -> a) -> SimpleDocStream a -> a

toList :: SimpleDocStream a -> [a] #

null :: SimpleDocStream a -> Bool #

length :: SimpleDocStream a -> Int #

elem :: Eq a => a -> SimpleDocStream a -> Bool #

maximum :: Ord a => SimpleDocStream a -> a

minimum :: Ord a => SimpleDocStream a -> a

sum :: Num a => SimpleDocStream a -> a #

product :: Num a => SimpleDocStream a -> a #

Foldable Array 
Instance details

Defined in Data.Primitive.Array

Methods

fold :: Monoid m => Array m -> m #

foldMap :: Monoid m => (a -> m) -> Array a -> m #

foldMap' :: Monoid m => (a -> m) -> Array a -> m

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

foldr' :: (a -> b -> b) -> b -> Array a -> b #

foldl :: (b -> a -> b) -> b -> Array a -> b

foldl' :: (b -> a -> b) -> b -> Array a -> b #

foldr1 :: (a -> a -> a) -> Array a -> a

foldl1 :: (a -> a -> a) -> Array a -> a

toList :: Array a -> [a] #

null :: Array a -> Bool #

length :: Array a -> Int #

elem :: Eq a => a -> Array a -> Bool #

maximum :: Ord a => Array a -> a

minimum :: Ord a => Array a -> a

sum :: Num a => Array a -> a #

product :: Num a => Array a -> a #

Foldable SmallArray 
Instance details

Defined in Data.Primitive.SmallArray

Methods

fold :: Monoid m => SmallArray m -> m #

foldMap :: Monoid m => (a -> m) -> SmallArray a -> m #

foldMap' :: Monoid m => (a -> m) -> SmallArray a -> m

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

foldr' :: (a -> b -> b) -> b -> SmallArray a -> b #

foldl :: (b -> a -> b) -> b -> SmallArray a -> b

foldl' :: (b -> a -> b) -> b -> SmallArray a -> b #

foldr1 :: (a -> a -> a) -> SmallArray a -> a

foldl1 :: (a -> a -> a) -> SmallArray a -> a

toList :: SmallArray a -> [a] #

null :: SmallArray a -> Bool #

length :: SmallArray a -> Int #

elem :: Eq a => a -> SmallArray a -> Bool #

maximum :: Ord a => SmallArray a -> a

minimum :: Ord a => SmallArray a -> a

sum :: Num a => SmallArray a -> a #

product :: Num a => SmallArray a -> a #

Foldable CompCollection Source # 
Instance details

Defined in Stack.Types.CompCollection

Methods

fold :: Monoid m => CompCollection m -> m #

foldMap :: Monoid m => (a -> m) -> CompCollection a -> m #

foldMap' :: Monoid m => (a -> m) -> CompCollection a -> m

foldr :: (a -> b -> b) -> b -> CompCollection a -> b #

foldr' :: (a -> b -> b) -> b -> CompCollection a -> b #

foldl :: (b -> a -> b) -> b -> CompCollection a -> b

foldl' :: (b -> a -> b) -> b -> CompCollection a -> b #

foldr1 :: (a -> a -> a) -> CompCollection a -> a

foldl1 :: (a -> a -> a) -> CompCollection a -> a

toList :: CompCollection a -> [a] #

null :: CompCollection a -> Bool #

length :: CompCollection a -> Int #

elem :: Eq a => a -> CompCollection a -> Bool #

maximum :: Ord a => CompCollection a -> a

minimum :: Ord a => CompCollection a -> a

sum :: Num a => CompCollection a -> a #

product :: Num a => CompCollection a -> a #

Foldable Maybe 
Instance details

Defined in Data.Strict.Maybe

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 #

Foldable TyVarBndr 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

fold :: Monoid m => TyVarBndr m -> m #

foldMap :: Monoid m => (a -> m) -> TyVarBndr a -> m #

foldMap' :: Monoid m => (a -> m) -> TyVarBndr a -> m

foldr :: (a -> b -> b) -> b -> TyVarBndr a -> b #

foldr' :: (a -> b -> b) -> b -> TyVarBndr a -> b #

foldl :: (b -> a -> b) -> b -> TyVarBndr a -> b

foldl' :: (b -> a -> b) -> b -> TyVarBndr a -> b #

foldr1 :: (a -> a -> a) -> TyVarBndr a -> a

foldl1 :: (a -> a -> a) -> TyVarBndr a -> a

toList :: TyVarBndr a -> [a] #

null :: TyVarBndr a -> Bool #

length :: TyVarBndr a -> Int #

elem :: Eq a => a -> TyVarBndr a -> Bool #

maximum :: Ord a => TyVarBndr a -> a

minimum :: Ord a => TyVarBndr a -> a

sum :: Num a => TyVarBndr a -> a #

product :: Num a => TyVarBndr a -> a #

Foldable HashSet 
Instance details

Defined in Data.HashSet.Internal

Methods

fold :: Monoid m => HashSet m -> m #

foldMap :: Monoid m => (a -> m) -> HashSet a -> m #

foldMap' :: Monoid m => (a -> m) -> HashSet a -> m

foldr :: (a -> b -> b) -> b -> HashSet a -> b #

foldr' :: (a -> b -> b) -> b -> HashSet a -> b #

foldl :: (b -> a -> b) -> b -> HashSet a -> b

foldl' :: (b -> a -> b) -> b -> HashSet a -> b #

foldr1 :: (a -> a -> a) -> HashSet a -> a

foldl1 :: (a -> a -> a) -> HashSet a -> a

toList :: HashSet a -> [a] #

null :: HashSet a -> Bool #

length :: HashSet a -> Int #

elem :: Eq a => a -> HashSet a -> Bool #

maximum :: Ord a => HashSet a -> a

minimum :: Ord a => HashSet a -> a

sum :: Num a => HashSet a -> a #

product :: Num a => HashSet a -> a #

Foldable Vector 
Instance details

Defined in Data.Vector

Methods

fold :: Monoid m => Vector m -> m #

foldMap :: Monoid m => (a -> m) -> Vector a -> m #

foldMap' :: Monoid m => (a -> m) -> Vector a -> m

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

foldr' :: (a -> b -> b) -> b -> Vector a -> b #

foldl :: (b -> a -> b) -> b -> Vector a -> b

foldl' :: (b -> a -> b) -> b -> Vector a -> b #

foldr1 :: (a -> a -> a) -> Vector a -> a

foldl1 :: (a -> a -> a) -> Vector a -> a

toList :: Vector a -> [a] #

null :: Vector a -> Bool #

length :: Vector a -> Int #

elem :: Eq a => a -> Vector a -> Bool #

maximum :: Ord a => Vector a -> a

minimum :: Ord a => Vector a -> a

sum :: Num a => Vector a -> a #

product :: Num a => Vector a -> a #

Foldable Vector 
Instance details

Defined in Data.Vector.Strict

Methods

fold :: Monoid m => Vector m -> m #

foldMap :: Monoid m => (a -> m) -> Vector a -> m #

foldMap' :: Monoid m => (a -> m) -> Vector a -> m

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

foldr' :: (a -> b -> b) -> b -> Vector a -> b #

foldl :: (b -> a -> b) -> b -> Vector a -> b

foldl' :: (b -> a -> b) -> b -> Vector a -> b #

foldr1 :: (a -> a -> a) -> Vector a -> a

foldl1 :: (a -> a -> a) -> Vector a -> a

toList :: Vector a -> [a] #

null :: Vector a -> Bool #

length :: Vector a -> Int #

elem :: Eq a => a -> Vector a -> Bool #

maximum :: Ord a => Vector a -> a

minimum :: Ord a => Vector a -> a

sum :: Num a => Vector a -> a #

product :: Num a => Vector a -> a #

Foldable Maybe 
Instance details

Defined in 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 #

Foldable Solo 
Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Solo m -> m #

foldMap :: Monoid m => (a -> m) -> Solo a -> m #

foldMap' :: Monoid m => (a -> m) -> Solo a -> m

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

foldr' :: (a -> b -> b) -> b -> Solo a -> b #

foldl :: (b -> a -> b) -> b -> Solo a -> b

foldl' :: (b -> a -> b) -> b -> Solo a -> b #

foldr1 :: (a -> a -> a) -> Solo a -> a

foldl1 :: (a -> a -> a) -> Solo a -> a

toList :: Solo a -> [a] #

null :: Solo a -> Bool #

length :: Solo a -> Int #

elem :: Eq a => a -> Solo a -> Bool #

maximum :: Ord a => Solo a -> a

minimum :: Ord a => Solo a -> a

sum :: Num a => Solo a -> a #

product :: Num a => Solo a -> a #

Foldable [] 
Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => [m] -> m #

foldMap :: Monoid m => (a -> m) -> [a] -> m #

foldMap' :: Monoid m => (a -> m) -> [a] -> m

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

foldr' :: (a -> b -> b) -> b -> [a] -> b #

foldl :: (b -> a -> b) -> b -> [a] -> b

foldl' :: (b -> a -> b) -> b -> [a] -> b #

foldr1 :: (a -> a -> a) -> [a] -> a

foldl1 :: (a -> a -> a) -> [a] -> a

toList :: [a] -> [a] #

null :: [a] -> Bool #

length :: [a] -> Int #

elem :: Eq a => a -> [a] -> Bool #

maximum :: Ord a => [a] -> a

minimum :: Ord a => [a] -> a

sum :: Num a => [a] -> a #

product :: Num a => [a] -> a #

Foldable (TkArray k) 
Instance details

Defined in Data.Aeson.Decoding.Tokens

Methods

fold :: Monoid m => TkArray k m -> m #

foldMap :: Monoid m => (a -> m) -> TkArray k a -> m #

foldMap' :: Monoid m => (a -> m) -> TkArray k a -> m

foldr :: (a -> b -> b) -> b -> TkArray k a -> b #

foldr' :: (a -> b -> b) -> b -> TkArray k a -> b #

foldl :: (b -> a -> b) -> b -> TkArray k a -> b

foldl' :: (b -> a -> b) -> b -> TkArray k a -> b #

foldr1 :: (a -> a -> a) -> TkArray k a -> a

foldl1 :: (a -> a -> a) -> TkArray k a -> a

toList :: TkArray k a -> [a] #

null :: TkArray k a -> Bool #

length :: TkArray k a -> Int #

elem :: Eq a => a -> TkArray k a -> Bool #

maximum :: Ord a => TkArray k a -> a

minimum :: Ord a => TkArray k a -> a

sum :: Num a => TkArray k a -> a #

product :: Num a => TkArray k a -> a #

Foldable (TkRecord k) 
Instance details

Defined in Data.Aeson.Decoding.Tokens

Methods

fold :: Monoid m => TkRecord k m -> m #

foldMap :: Monoid m => (a -> m) -> TkRecord k a -> m #

foldMap' :: Monoid m => (a -> m) -> TkRecord k a -> m

foldr :: (a -> b -> b) -> b -> TkRecord k a -> b #

foldr' :: (a -> b -> b) -> b -> TkRecord k a -> b #

foldl :: (b -> a -> b) -> b -> TkRecord k a -> b

foldl' :: (b -> a -> b) -> b -> TkRecord k a -> b #

foldr1 :: (a -> a -> a) -> TkRecord k a -> a

foldl1 :: (a -> a -> a) -> TkRecord k a -> a

toList :: TkRecord k a -> [a] #

null :: TkRecord k a -> Bool #

length :: TkRecord k a -> Int #

elem :: Eq a => a -> TkRecord k a -> Bool #

maximum :: Ord a => TkRecord k a -> a

minimum :: Ord a => TkRecord k a -> a

sum :: Num a => TkRecord k a -> a #

product :: Num a => TkRecord k a -> a #

Foldable (Tokens k) 
Instance details

Defined in Data.Aeson.Decoding.Tokens

Methods

fold :: Monoid m => Tokens k m -> m #

foldMap :: Monoid m => (a -> m) -> Tokens k a -> m #

foldMap' :: Monoid m => (a -> m) -> Tokens k a -> m

foldr :: (a -> b -> b) -> b -> Tokens k a -> b #

foldr' :: (a -> b -> b) -> b -> Tokens k a -> b #

foldl :: (b -> a -> b) -> b -> Tokens k a -> b

foldl' :: (b -> a -> b) -> b -> Tokens k a -> b #

foldr1 :: (a -> a -> a) -> Tokens k a -> a

foldl1 :: (a -> a -> a) -> Tokens k a -> a

toList :: Tokens k a -> [a] #

null :: Tokens k a -> Bool #

length :: Tokens k a -> Int #

elem :: Eq a => a -> Tokens k a -> Bool #

maximum :: Ord a => Tokens k a -> a

minimum :: Ord a => Tokens k a -> a

sum :: Num a => Tokens k a -> a #

product :: Num a => Tokens k a -> a #

Foldable (Either a) 
Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Either a m -> m #

foldMap :: Monoid m => (a0 -> m) -> Either a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> Either a a0 -> m

foldr :: (a0 -> b -> b) -> b -> Either a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Either a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> Either a a0 -> b

foldl' :: (b -> a0 -> b) -> b -> Either a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Either a a0 -> a0

foldl1 :: (a0 -> a0 -> a0) -> Either a a0 -> a0

toList :: Either a a0 -> [a0] #

null :: Either a a0 -> Bool #

length :: Either a a0 -> Int #

elem :: Eq a0 => a0 -> Either a a0 -> Bool #

maximum :: Ord a0 => Either a a0 -> a0

minimum :: Ord a0 => Either a a0 -> a0

sum :: Num a0 => Either a a0 -> a0 #

product :: Num a0 => Either a a0 -> a0 #

Foldable (Proxy :: Type -> Type) 
Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Proxy m -> m #

foldMap :: Monoid m => (a -> m) -> Proxy a -> m #

foldMap' :: Monoid m => (a -> m) -> Proxy a -> m

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

foldr' :: (a -> b -> b) -> b -> Proxy a -> b #

foldl :: (b -> a -> b) -> b -> Proxy a -> b

foldl' :: (b -> a -> b) -> b -> Proxy a -> b #

foldr1 :: (a -> a -> a) -> Proxy a -> a

foldl1 :: (a -> a -> a) -> Proxy a -> a

toList :: Proxy a -> [a] #

null :: Proxy a -> Bool #

length :: Proxy a -> Int #

elem :: Eq a => a -> Proxy a -> Bool #

maximum :: Ord a => Proxy a -> a

minimum :: Ord a => Proxy a -> a

sum :: Num a => Proxy a -> a #

product :: Num a => Proxy a -> a #

Foldable (Arg a) 
Instance details

Defined in Data.Semigroup

Methods

fold :: Monoid m => Arg a m -> m #

foldMap :: Monoid m => (a0 -> m) -> Arg a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> Arg a a0 -> m

foldr :: (a0 -> b -> b) -> b -> Arg a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Arg a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> Arg a a0 -> b

foldl' :: (b -> a0 -> b) -> b -> Arg a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Arg a a0 -> a0

foldl1 :: (a0 -> a0 -> a0) -> Arg a a0 -> a0

toList :: Arg a a0 -> [a0] #

null :: Arg a a0 -> Bool #

length :: Arg a a0 -> Int #

elem :: Eq a0 => a0 -> Arg a a0 -> Bool #

maximum :: Ord a0 => Arg a a0 -> a0

minimum :: Ord a0 => Arg a a0 -> a0

sum :: Num a0 => Arg a a0 -> a0 #

product :: Num a0 => Arg a a0 -> a0 #

Foldable (Array i) 
Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Array i m -> m #

foldMap :: Monoid m => (a -> m) -> Array i a -> m #

foldMap' :: Monoid m => (a -> m) -> Array i a -> m

foldr :: (a -> b -> b) -> b -> Array i a -> b #

foldr' :: (a -> b -> b) -> b -> Array i a -> b #

foldl :: (b -> a -> b) -> b -> Array i a -> b

foldl' :: (b -> a -> b) -> b -> Array i a -> b #

foldr1 :: (a -> a -> a) -> Array i a -> a

foldl1 :: (a -> a -> a) -> Array i a -> a

toList :: Array i a -> [a] #

null :: Array i a -> Bool #

length :: Array i a -> Int #

elem :: Eq a => a -> Array i a -> Bool #

maximum :: Ord a => Array i a -> a

minimum :: Ord a => Array i a -> a

sum :: Num a => Array i a -> a #

product :: Num a => Array i a -> a #

Foldable (U1 :: Type -> Type) 
Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => U1 m -> m #

foldMap :: Monoid m => (a -> m) -> U1 a -> m #

foldMap' :: Monoid m => (a -> m) -> U1 a -> m

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

foldr' :: (a -> b -> b) -> b -> U1 a -> b #

foldl :: (b -> a -> b) -> b -> U1 a -> b

foldl' :: (b -> a -> b) -> b -> U1 a -> b #

foldr1 :: (a -> a -> a) -> U1 a -> a

foldl1 :: (a -> a -> a) -> U1 a -> a

toList :: U1 a -> [a] #

null :: U1 a -> Bool #

length :: U1 a -> Int #

elem :: Eq a => a -> U1 a -> Bool #

maximum :: Ord a => U1 a -> a

minimum :: Ord a => U1 a -> a

sum :: Num a => U1 a -> a #

product :: Num a => U1 a -> a #

Foldable (UAddr :: Type -> Type) 
Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => UAddr m -> m #

foldMap :: Monoid m => (a -> m) -> UAddr a -> m #

foldMap' :: Monoid m => (a -> m) -> UAddr a -> m

foldr :: (a -> b -> b) -> b -> UAddr a -> b #

foldr' :: (a -> b -> b) -> b -> UAddr a -> b #

foldl :: (b -> a -> b) -> b -> UAddr a -> b

foldl' :: (b -> a -> b) -> b -> UAddr a -> b #

foldr1 :: (a -> a -> a) -> UAddr a -> a

foldl1 :: (a -> a -> a) -> UAddr a -> a

toList :: UAddr a -> [a] #

null :: UAddr a -> Bool #

length :: UAddr a -> Int #

elem :: Eq a => a -> UAddr a -> Bool #

maximum :: Ord a => UAddr a -> a

minimum :: Ord a => UAddr a -> a

sum :: Num a => UAddr a -> a #

product :: Num a => UAddr a -> a #

Foldable (UChar :: Type -> Type) 
Instance details

Defined in 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 #

Foldable (UDouble :: Type -> Type) 
Instance details

Defined in 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 #

Foldable (UFloat :: Type -> Type) 
Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => UFloat m -> m #

foldMap :: Monoid m => (a -> m) -> UFloat a -> m #

foldMap' :: Monoid m => (a -> m) -> UFloat a -> m

foldr :: (a -> b -> b) -> b -> UFloat a -> b #

foldr' :: (a -> b -> b) -> b -> UFloat a -> b #

foldl :: (b -> a -> b) -> b -> UFloat a -> b

foldl' :: (b -> a -> b) -> b -> UFloat a -> b #

foldr1 :: (a -> a -> a) -> UFloat a -> a

foldl1 :: (a -> a -> a) -> UFloat a -> a

toList :: UFloat a -> [a] #

null :: UFloat a -> Bool #

length :: UFloat a -> Int #

elem :: Eq a => a -> UFloat a -> Bool #

maximum :: Ord a => UFloat a -> a

minimum :: Ord a => UFloat a -> a

sum :: Num a => UFloat a -> a #

product :: Num a => UFloat a -> a #

Foldable (UInt :: Type -> Type) 
Instance details

Defined in 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 #

Foldable (UWord :: Type -> Type) 
Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => UWord m -> m #

foldMap :: Monoid m => (a -> m) -> UWord a -> m #

foldMap' :: Monoid m => (a -> m) -> UWord a -> m

foldr :: (a -> b -> b) -> b -> UWord a -> b #

foldr' :: (a -> b -> b) -> b -> UWord a -> b #

foldl :: (b -> a -> b) -> b -> UWord a -> b

foldl' :: (b -> a -> b) -> b -> UWord a -> b #

foldr1 :: (a -> a -> a) -> UWord a -> a

foldl1 :: (a -> a -> a) -> UWord a -> a

toList :: UWord a -> [a] #

null :: UWord a -> Bool #

length :: UWord a -> Int #

elem :: Eq a => a -> UWord a -> Bool #

maximum :: Ord a => UWord a -> a

minimum :: Ord a => UWord a -> a

sum :: Num a => UWord a -> a #

product :: Num a => UWord a -> a #

Foldable (V1 :: Type -> Type) 
Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => V1 m -> m #

foldMap :: Monoid m => (a -> m) -> V1 a -> m #

foldMap' :: Monoid m => (a -> m) -> V1 a -> m

foldr :: (a -> b -> b) -> b -> V1 a -> b #

foldr' :: (a -> b -> b) -> b -> V1 a -> b #

foldl :: (b -> a -> b) -> b -> V1 a -> b

foldl' :: (b -> a -> b) -> b -> V1 a -> b #

foldr1 :: (a -> a -> a) -> V1 a -> a

foldl1 :: (a -> a -> a) -> V1 a -> a

toList :: V1 a -> [a] #

null :: V1 a -> Bool #

length :: V1 a -> Int #

elem :: Eq a => a -> V1 a -> Bool #

maximum :: Ord a => V1 a -> a

minimum :: Ord a => V1 a -> a

sum :: Num a => V1 a -> a #

product :: Num a => V1 a -> a #

Foldable (Map k) 
Instance details

Defined in Data.Map.Internal

Methods

fold :: Monoid m => Map k m -> m #

foldMap :: Monoid m => (a -> m) -> Map k a -> m #

foldMap' :: Monoid m => (a -> m) -> Map k a -> m

foldr :: (a -> b -> b) -> b -> Map k a -> b #

foldr' :: (a -> b -> b) -> b -> Map k a -> b #

foldl :: (b -> a -> b) -> b -> Map k a -> b

foldl' :: (b -> a -> b) -> b -> Map k a -> b #

foldr1 :: (a -> a -> a) -> Map k a -> a

foldl1 :: (a -> a -> a) -> Map k a -> a

toList :: Map k a -> [a] #

null :: Map k a -> Bool #

length :: Map k a -> Int #

elem :: Eq a => a -> Map k a -> Bool #

maximum :: Ord a => Map k a -> a

minimum :: Ord a => Map k a -> a

sum :: Num a => Map k a -> a #

product :: Num a => Map k a -> a #

Foldable m => Foldable (CatchT m) 
Instance details

Defined in Control.Monad.Catch.Pure

Methods

fold :: Monoid m0 => CatchT m m0 -> m0 #

foldMap :: Monoid m0 => (a -> m0) -> CatchT m a -> m0 #

foldMap' :: Monoid m0 => (a -> m0) -> CatchT m a -> m0

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

foldr' :: (a -> b -> b) -> b -> CatchT m a -> b #

foldl :: (b -> a -> b) -> b -> CatchT m a -> b

foldl' :: (b -> a -> b) -> b -> CatchT m a -> b #

foldr1 :: (a -> a -> a) -> CatchT m a -> a

foldl1 :: (a -> a -> a) -> CatchT m a -> a

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

null :: CatchT m a -> Bool #

length :: CatchT m a -> Int #

elem :: Eq a => a -> CatchT m a -> Bool #

maximum :: Ord a => CatchT m a -> a

minimum :: Ord a => CatchT m a -> a

sum :: Num a => CatchT m a -> a #

product :: Num a => CatchT m a -> a #

Foldable (DbOpenMode mode) 
Instance details

Defined in GHC.Unit.Database

Methods

fold :: Monoid m => DbOpenMode mode m -> m #

foldMap :: Monoid m => (a -> m) -> DbOpenMode mode a -> m #

foldMap' :: Monoid m => (a -> m) -> DbOpenMode mode a -> m

foldr :: (a -> b -> b) -> b -> DbOpenMode mode a -> b #

foldr' :: (a -> b -> b) -> b -> DbOpenMode mode a -> b #

foldl :: (b -> a -> b) -> b -> DbOpenMode mode a -> b

foldl' :: (b -> a -> b) -> b -> DbOpenMode mode a -> b #

foldr1 :: (a -> a -> a) -> DbOpenMode mode a -> a

foldl1 :: (a -> a -> a) -> DbOpenMode mode a -> a

toList :: DbOpenMode mode a -> [a] #

null :: DbOpenMode mode a -> Bool #

length :: DbOpenMode mode a -> Int #

elem :: Eq a => a -> DbOpenMode mode a -> Bool #

maximum :: Ord a => DbOpenMode mode a -> a

minimum :: Ord a => DbOpenMode mode a -> a

sum :: Num a => DbOpenMode mode a -> a #

product :: Num a => DbOpenMode mode a -> a #

Foldable (Product a) 
Instance details

Defined in Data.Aeson.Config.Types

Methods

fold :: Monoid m => Product a m -> m #

foldMap :: Monoid m => (a0 -> m) -> Product a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> Product a a0 -> m

foldr :: (a0 -> b -> b) -> b -> Product a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Product a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> Product a a0 -> b

foldl' :: (b -> a0 -> b) -> b -> Product a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Product a a0 -> a0

foldl1 :: (a0 -> a0 -> a0) -> Product a a0 -> a0

toList :: Product a a0 -> [a0] #

null :: Product a a0 -> Bool #

length :: Product a a0 -> Int #

elem :: Eq a0 => a0 -> Product a a0 -> Bool #

maximum :: Ord a0 => Product a a0 -> a0

minimum :: Ord a0 => Product a a0 -> a0

sum :: Num a0 => Product a a0 -> a0 #

product :: Num a0 => Product a a0 -> a0 #

MonoFoldable mono => Foldable (WrappedMono mono) 
Instance details

Defined in Data.MonoTraversable

Methods

fold :: Monoid m => WrappedMono mono m -> m #

foldMap :: Monoid m => (a -> m) -> WrappedMono mono a -> m #

foldMap' :: Monoid m => (a -> m) -> WrappedMono mono a -> m

foldr :: (a -> b -> b) -> b -> WrappedMono mono a -> b #

foldr' :: (a -> b -> b) -> b -> WrappedMono mono a -> b #

foldl :: (b -> a -> b) -> b -> WrappedMono mono a -> b

foldl' :: (b -> a -> b) -> b -> WrappedMono mono a -> b #

foldr1 :: (a -> a -> a) -> WrappedMono mono a -> a

foldl1 :: (a -> a -> a) -> WrappedMono mono a -> a

toList :: WrappedMono mono a -> [a] #

null :: WrappedMono mono a -> Bool #

length :: WrappedMono mono a -> Int #

elem :: Eq a => a -> WrappedMono mono a -> Bool #

maximum :: Ord a => WrappedMono mono a -> a

minimum :: Ord a => WrappedMono mono a -> a

sum :: Num a => WrappedMono mono a -> a #

product :: Num a => WrappedMono mono a -> a #

Foldable f => Foldable (WrappedPoly f) 
Instance details

Defined in Data.MonoTraversable

Methods

fold :: Monoid m => WrappedPoly f m -> m #

foldMap :: Monoid m => (a -> m) -> WrappedPoly f a -> m #

foldMap' :: Monoid m => (a -> m) -> WrappedPoly f a -> m

foldr :: (a -> b -> b) -> b -> WrappedPoly f a -> b #

foldr' :: (a -> b -> b) -> b -> WrappedPoly f a -> b #

foldl :: (b -> a -> b) -> b -> WrappedPoly f a -> b

foldl' :: (b -> a -> b) -> b -> WrappedPoly f a -> b #

foldr1 :: (a -> a -> a) -> WrappedPoly f a -> a

foldl1 :: (a -> a -> a) -> WrappedPoly f a -> a

toList :: WrappedPoly f a -> [a] #

null :: WrappedPoly f a -> Bool #

length :: WrappedPoly f a -> Int #

elem :: Eq a => a -> WrappedPoly f a -> Bool #

maximum :: Ord a => WrappedPoly f a -> a

minimum :: Ord a => WrappedPoly f a -> a

sum :: Num a => WrappedPoly f a -> a #

product :: Num a => WrappedPoly f a -> a #

Foldable (Either e) 
Instance details

Defined in Data.Strict.Either

Methods

fold :: Monoid m => Either e m -> m #

foldMap :: Monoid m => (a -> m) -> Either e a -> m #

foldMap' :: Monoid m => (a -> m) -> Either e a -> m

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

foldr' :: (a -> b -> b) -> b -> Either e a -> b #

foldl :: (b -> a -> b) -> b -> Either e a -> b

foldl' :: (b -> a -> b) -> b -> Either e a -> b #

foldr1 :: (a -> a -> a) -> Either e a -> a

foldl1 :: (a -> a -> a) -> Either e a -> a

toList :: Either e a -> [a] #

null :: Either e a -> Bool #

length :: Either e a -> Int #

elem :: Eq a => a -> Either e a -> Bool #

maximum :: Ord a => Either e a -> a

minimum :: Ord a => Either e a -> a

sum :: Num a => Either e a -> a #

product :: Num a => Either e a -> a #

Foldable (These a) 
Instance details

Defined in Data.Strict.These

Methods

fold :: Monoid m => These a m -> m #

foldMap :: Monoid m => (a0 -> m) -> These a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> These a a0 -> m

foldr :: (a0 -> b -> b) -> b -> These a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> These a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> These a a0 -> b

foldl' :: (b -> a0 -> b) -> b -> These a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> These a a0 -> a0

foldl1 :: (a0 -> a0 -> a0) -> These a a0 -> a0

toList :: These a a0 -> [a0] #

null :: These a a0 -> Bool #

length :: These a a0 -> Int #

elem :: Eq a0 => a0 -> These a a0 -> Bool #

maximum :: Ord a0 => These a a0 -> a0

minimum :: Ord a0 => These a a0 -> a0

sum :: Num a0 => These a a0 -> a0 #

product :: Num a0 => These a a0 -> a0 #

Foldable (Pair e) 
Instance details

Defined in Data.Strict.Tuple

Methods

fold :: Monoid m => Pair e m -> m #

foldMap :: Monoid m => (a -> m) -> Pair e a -> m #

foldMap' :: Monoid m => (a -> m) -> Pair e a -> m

foldr :: (a -> b -> b) -> b -> Pair e a -> b #

foldr' :: (a -> b -> b) -> b -> Pair e a -> b #

foldl :: (b -> a -> b) -> b -> Pair e a -> b

foldl' :: (b -> a -> b) -> b -> Pair e a -> b #

foldr1 :: (a -> a -> a) -> Pair e a -> a

foldl1 :: (a -> a -> a) -> Pair e a -> a

toList :: Pair e a -> [a] #

null :: Pair e a -> Bool #

length :: Pair e a -> Int #

elem :: Eq a => a -> Pair e a -> Bool #

maximum :: Ord a => Pair e a -> a

minimum :: Ord a => Pair e a -> a

sum :: Num a => Pair e a -> a #

product :: Num a => Pair e a -> a #

Foldable (These a) 
Instance details

Defined in Data.These

Methods

fold :: Monoid m => These a m -> m #

foldMap :: Monoid m => (a0 -> m) -> These a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> These a a0 -> m

foldr :: (a0 -> b -> b) -> b -> These a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> These a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> These a a0 -> b

foldl' :: (b -> a0 -> b) -> b -> These a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> These a a0 -> a0

foldl1 :: (a0 -> a0 -> a0) -> These a a0 -> a0

toList :: These a a0 -> [a0] #

null :: These a a0 -> Bool #

length :: These a a0 -> Int #

elem :: Eq a0 => a0 -> These a a0 -> Bool #

maximum :: Ord a0 => These a a0 -> a0

minimum :: Ord a0 => These a a0 -> a0

sum :: Num a0 => These a a0 -> a0 #

product :: Num a0 => These a a0 -> a0 #

Foldable f => Foldable (Lift f) 
Instance details

Defined in Control.Applicative.Lift

Methods

fold :: Monoid m => Lift f m -> m #

foldMap :: Monoid m => (a -> m) -> Lift f a -> m #

foldMap' :: Monoid m => (a -> m) -> Lift f a -> m

foldr :: (a -> b -> b) -> b -> Lift f a -> b #

foldr' :: (a -> b -> b) -> b -> Lift f a -> b #

foldl :: (b -> a -> b) -> b -> Lift f a -> b

foldl' :: (b -> a -> b) -> b -> Lift f a -> b #

foldr1 :: (a -> a -> a) -> Lift f a -> a

foldl1 :: (a -> a -> a) -> Lift f a -> a

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

null :: Lift f a -> Bool #

length :: Lift f a -> Int #

elem :: Eq a => a -> Lift f a -> Bool #

maximum :: Ord a => Lift f a -> a

minimum :: Ord a => Lift f a -> a

sum :: Num a => Lift f a -> a #

product :: Num a => Lift f a -> a #

Foldable f => Foldable (MaybeT f) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

fold :: Monoid m => MaybeT f m -> m #

foldMap :: Monoid m => (a -> m) -> MaybeT f a -> m #

foldMap' :: Monoid m => (a -> m) -> MaybeT f a -> m

foldr :: (a -> b -> b) -> b -> MaybeT f a -> b #

foldr' :: (a -> b -> b) -> b -> MaybeT f a -> b #

foldl :: (b -> a -> b) -> b -> MaybeT f a -> b

foldl' :: (b -> a -> b) -> b -> MaybeT f a -> b #

foldr1 :: (a -> a -> a) -> MaybeT f a -> a

foldl1 :: (a -> a -> a) -> MaybeT f a -> a

toList :: MaybeT f a -> [a] #

null :: MaybeT f a -> Bool #

length :: MaybeT f a -> Int #

elem :: Eq a => a -> MaybeT f a -> Bool #

maximum :: Ord a => MaybeT f a -> a

minimum :: Ord a => MaybeT f a -> a

sum :: Num a => MaybeT f a -> a #

product :: Num a => MaybeT f a -> a #

Foldable (HashMap k) 
Instance details

Defined in Data.HashMap.Internal

Methods

fold :: Monoid m => HashMap k m -> m #

foldMap :: Monoid m => (a -> m) -> HashMap k a -> m #

foldMap' :: Monoid m => (a -> m) -> HashMap k a -> m

foldr :: (a -> b -> b) -> b -> HashMap k a -> b #

foldr' :: (a -> b -> b) -> b -> HashMap k a -> b #

foldl :: (b -> a -> b) -> b -> HashMap k a -> b

foldl' :: (b -> a -> b) -> b -> HashMap k a -> b #

foldr1 :: (a -> a -> a) -> HashMap k a -> a

foldl1 :: (a -> a -> a) -> HashMap k a -> a

toList :: HashMap k a -> [a] #

null :: HashMap k a -> Bool #

length :: HashMap k a -> Int #

elem :: Eq a => a -> HashMap k a -> Bool #

maximum :: Ord a => HashMap k a -> a

minimum :: Ord a => HashMap k a -> a

sum :: Num a => HashMap k a -> a #

product :: Num a => HashMap k a -> a #

Foldable ((,) a) 
Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => (a, m) -> m #

foldMap :: Monoid m => (a0 -> m) -> (a, a0) -> m #

foldMap' :: Monoid m => (a0 -> m) -> (a, a0) -> m

foldr :: (a0 -> b -> b) -> b -> (a, a0) -> b #

foldr' :: (a0 -> b -> b) -> b -> (a, a0) -> b #

foldl :: (b -> a0 -> b) -> b -> (a, a0) -> b

foldl' :: (b -> a0 -> b) -> b -> (a, a0) -> b #

foldr1 :: (a0 -> a0 -> a0) -> (a, a0) -> a0

foldl1 :: (a0 -> a0 -> a0) -> (a, a0) -> a0

toList :: (a, a0) -> [a0] #

null :: (a, a0) -> Bool #

length :: (a, a0) -> Int #

elem :: Eq a0 => a0 -> (a, a0) -> Bool #

maximum :: Ord a0 => (a, a0) -> a0

minimum :: Ord a0 => (a, a0) -> a0

sum :: Num a0 => (a, a0) -> a0 #

product :: Num a0 => (a, a0) -> a0 #

Foldable (CondBranch v c) 
Instance details

Defined in Distribution.Types.CondTree

Methods

fold :: Monoid m => CondBranch v c m -> m #

foldMap :: Monoid m => (a -> m) -> CondBranch v c a -> m #

foldMap' :: Monoid m => (a -> m) -> CondBranch v c a -> m

foldr :: (a -> b -> b) -> b -> CondBranch v c a -> b #

foldr' :: (a -> b -> b) -> b -> CondBranch v c a -> b #

foldl :: (b -> a -> b) -> b -> CondBranch v c a -> b

foldl' :: (b -> a -> b) -> b -> CondBranch v c a -> b #

foldr1 :: (a -> a -> a) -> CondBranch v c a -> a

foldl1 :: (a -> a -> a) -> CondBranch v c a -> a

toList :: CondBranch v c a -> [a] #

null :: CondBranch v c a -> Bool #

length :: CondBranch v c a -> Int #

elem :: Eq a => a -> CondBranch v c a -> Bool #

maximum :: Ord a => CondBranch v c a -> a

minimum :: Ord a => CondBranch v c a -> a

sum :: Num a => CondBranch v c a -> a #

product :: Num a => CondBranch v c a -> a #

Foldable (CondTree v c) 
Instance details

Defined in Distribution.Types.CondTree

Methods

fold :: Monoid m => CondTree v c m -> m #

foldMap :: Monoid m => (a -> m) -> CondTree v c a -> m #

foldMap' :: Monoid m => (a -> m) -> CondTree v c a -> m

foldr :: (a -> b -> b) -> b -> CondTree v c a -> b #

foldr' :: (a -> b -> b) -> b -> CondTree v c a -> b #

foldl :: (b -> a -> b) -> b -> CondTree v c a -> b

foldl' :: (b -> a -> b) -> b -> CondTree v c a -> b #

foldr1 :: (a -> a -> a) -> CondTree v c a -> a

foldl1 :: (a -> a -> a) -> CondTree v c a -> a

toList :: CondTree v c a -> [a] #

null :: CondTree v c a -> Bool #

length :: CondTree v c a -> Int #

elem :: Eq a => a -> CondTree v c a -> Bool #

maximum :: Ord a => CondTree v c a -> a

minimum :: Ord a => CondTree v c a -> a

sum :: Num a => CondTree v c a -> a #

product :: Num a => CondTree v c a -> a #

Foldable (Const m :: Type -> Type) 
Instance details

Defined in 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 #

Foldable f => Foldable (Ap f) 
Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Ap f m -> m #

foldMap :: Monoid m => (a -> m) -> Ap f a -> m #

foldMap' :: Monoid m => (a -> m) -> Ap f a -> m

foldr :: (a -> b -> b) -> b -> Ap f a -> b #

foldr' :: (a -> b -> b) -> b -> Ap f a -> b #

foldl :: (b -> a -> b) -> b -> Ap f a -> b

foldl' :: (b -> a -> b) -> b -> Ap f a -> b #

foldr1 :: (a -> a -> a) -> Ap f a -> a

foldl1 :: (a -> a -> a) -> Ap f a -> a

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

null :: Ap f a -> Bool #

length :: Ap f a -> Int #

elem :: Eq a => a -> Ap f a -> Bool #

maximum :: Ord a => Ap f a -> a

minimum :: Ord a => Ap f a -> a

sum :: Num a => Ap f a -> a #

product :: Num a => Ap f a -> a #

Foldable f => Foldable (Alt f) 
Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Alt f m -> m #

foldMap :: Monoid m => (a -> m) -> Alt f a -> m #

foldMap' :: Monoid m => (a -> m) -> Alt f a -> m

foldr :: (a -> b -> b) -> b -> Alt f a -> b #

foldr' :: (a -> b -> b) -> b -> Alt f a -> b #

foldl :: (b -> a -> b) -> b -> Alt f a -> b

foldl' :: (b -> a -> b) -> b -> Alt f a -> b #

foldr1 :: (a -> a -> a) -> Alt f a -> a

foldl1 :: (a -> a -> a) -> Alt f a -> a

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

null :: Alt f a -> Bool #

length :: Alt f a -> Int #

elem :: Eq a => a -> Alt f a -> Bool #

maximum :: Ord a => Alt f a -> a

minimum :: Ord a => Alt f a -> a

sum :: Num a => Alt f a -> a #

product :: Num a => Alt f a -> a #

Foldable f => Foldable (Rec1 f) 
Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Rec1 f m -> m #

foldMap :: Monoid m => (a -> m) -> Rec1 f a -> m #

foldMap' :: Monoid m => (a -> m) -> Rec1 f a -> m

foldr :: (a -> b -> b) -> b -> Rec1 f a -> b #

foldr' :: (a -> b -> b) -> b -> Rec1 f a -> b #

foldl :: (b -> a -> b) -> b -> Rec1 f a -> b

foldl' :: (b -> a -> b) -> b -> Rec1 f a -> b #

foldr1 :: (a -> a -> a) -> Rec1 f a -> a

foldl1 :: (a -> a -> a) -> Rec1 f a -> a

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

null :: Rec1 f a -> Bool #

length :: Rec1 f a -> Int #

elem :: Eq a => a -> Rec1 f a -> Bool #

maximum :: Ord a => Rec1 f a -> a

minimum :: Ord a => Rec1 f a -> a

sum :: Num a => Rec1 f a -> a #

product :: Num a => Rec1 f a -> a #

Foldable (Tagged s) 
Instance details

Defined in Data.Tagged

Methods

fold :: Monoid m => Tagged s m -> m #

foldMap :: Monoid m => (a -> m) -> Tagged s a -> m #

foldMap' :: Monoid m => (a -> m) -> Tagged s a -> m

foldr :: (a -> b -> b) -> b -> Tagged s a -> b #

foldr' :: (a -> b -> b) -> b -> Tagged s a -> b #

foldl :: (b -> a -> b) -> b -> Tagged s a -> b

foldl' :: (b -> a -> b) -> b -> Tagged s a -> b #

foldr1 :: (a -> a -> a) -> Tagged s a -> a

foldl1 :: (a -> a -> a) -> Tagged s a -> a

toList :: Tagged s a -> [a] #

null :: Tagged s a -> Bool #

length :: Tagged s a -> Int #

elem :: Eq a => a -> Tagged s a -> Bool #

maximum :: Ord a => Tagged s a -> a

minimum :: Ord a => Tagged s a -> a

sum :: Num a => Tagged s a -> a #

product :: Num a => Tagged s a -> a #

Foldable (GenEntries tarPath linkTarget) 
Instance details

Defined in Codec.Archive.Tar.Types

Methods

fold :: Monoid m => GenEntries tarPath linkTarget m -> m #

foldMap :: Monoid m => (a -> m) -> GenEntries tarPath linkTarget a -> m #

foldMap' :: Monoid m => (a -> m) -> GenEntries tarPath linkTarget a -> m

foldr :: (a -> b -> b) -> b -> GenEntries tarPath linkTarget a -> b #

foldr' :: (a -> b -> b) -> b -> GenEntries tarPath linkTarget a -> b #

foldl :: (b -> a -> b) -> b -> GenEntries tarPath linkTarget a -> b

foldl' :: (b -> a -> b) -> b -> GenEntries tarPath linkTarget a -> b #

foldr1 :: (a -> a -> a) -> GenEntries tarPath linkTarget a -> a

foldl1 :: (a -> a -> a) -> GenEntries tarPath linkTarget a -> a

toList :: GenEntries tarPath linkTarget a -> [a] #

null :: GenEntries tarPath linkTarget a -> Bool #

length :: GenEntries tarPath linkTarget a -> Int #

elem :: Eq a => a -> GenEntries tarPath linkTarget a -> Bool #

maximum :: Ord a => GenEntries tarPath linkTarget a -> a

minimum :: Ord a => GenEntries tarPath linkTarget a -> a

sum :: Num a => GenEntries tarPath linkTarget a -> a #

product :: Num a => GenEntries tarPath linkTarget a -> a #

(Foldable f, Foldable g) => Foldable (These1 f g) 
Instance details

Defined in Data.Functor.These

Methods

fold :: Monoid m => These1 f g m -> m #

foldMap :: Monoid m => (a -> m) -> These1 f g a -> m #

foldMap' :: Monoid m => (a -> m) -> These1 f g a -> m

foldr :: (a -> b -> b) -> b -> These1 f g a -> b #

foldr' :: (a -> b -> b) -> b -> These1 f g a -> b #

foldl :: (b -> a -> b) -> b -> These1 f g a -> b

foldl' :: (b -> a -> b) -> b -> These1 f g a -> b #

foldr1 :: (a -> a -> a) -> These1 f g a -> a

foldl1 :: (a -> a -> a) -> These1 f g a -> a

toList :: These1 f g a -> [a] #

null :: These1 f g a -> Bool #

length :: These1 f g a -> Int #

elem :: Eq a => a -> These1 f g a -> Bool #

maximum :: Ord a => These1 f g a -> a

minimum :: Ord a => These1 f g a -> a

sum :: Num a => These1 f g a -> a #

product :: Num a => These1 f g a -> a #

Foldable f => Foldable (Backwards f) 
Instance details

Defined in Control.Applicative.Backwards

Methods

fold :: Monoid m => Backwards f m -> m #

foldMap :: Monoid m => (a -> m) -> Backwards f a -> m #

foldMap' :: Monoid m => (a -> m) -> Backwards f a -> m

foldr :: (a -> b -> b) -> b -> Backwards f a -> b #

foldr' :: (a -> b -> b) -> b -> Backwards f a -> b #

foldl :: (b -> a -> b) -> b -> Backwards f a -> b

foldl' :: (b -> a -> b) -> b -> Backwards f a -> b #

foldr1 :: (a -> a -> a) -> Backwards f a -> a

foldl1 :: (a -> a -> a) -> Backwards f a -> a

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

null :: Backwards f a -> Bool #

length :: Backwards f a -> Int #

elem :: Eq a => a -> Backwards f a -> Bool #

maximum :: Ord a => Backwards f a -> a

minimum :: Ord a => Backwards f a -> a

sum :: Num a => Backwards f a -> a #

product :: Num a => Backwards f a -> a #

Foldable f => Foldable (ExceptT e f) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

fold :: Monoid m => ExceptT e f m -> m #

foldMap :: Monoid m => (a -> m) -> ExceptT e f a -> m #

foldMap' :: Monoid m => (a -> m) -> ExceptT e f a -> m

foldr :: (a -> b -> b) -> b -> ExceptT e f a -> b #

foldr' :: (a -> b -> b) -> b -> ExceptT e f a -> b #

foldl :: (b -> a -> b) -> b -> ExceptT e f a -> b

foldl' :: (b -> a -> b) -> b -> ExceptT e f a -> b #

foldr1 :: (a -> a -> a) -> ExceptT e f a -> a

foldl1 :: (a -> a -> a) -> ExceptT e f a -> a

toList :: ExceptT e f a -> [a] #

null :: ExceptT e f a -> Bool #

length :: ExceptT e f a -> Int #

elem :: Eq a => a -> ExceptT e f a -> Bool #

maximum :: Ord a => ExceptT e f a -> a

minimum :: Ord a => ExceptT e f a -> a

sum :: Num a => ExceptT e f a -> a #

product :: Num a => ExceptT e f a -> a #

Foldable f => Foldable (IdentityT f) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

fold :: Monoid m => IdentityT f m -> m #

foldMap :: Monoid m => (a -> m) -> IdentityT f a -> m #

foldMap' :: Monoid m => (a -> m) -> IdentityT f a -> m

foldr :: (a -> b -> b) -> b -> IdentityT f a -> b #

foldr' :: (a -> b -> b) -> b -> IdentityT f a -> b #

foldl :: (b -> a -> b) -> b -> IdentityT f a -> b

foldl' :: (b -> a -> b) -> b -> IdentityT f a -> b #

foldr1 :: (a -> a -> a) -> IdentityT f a -> a

foldl1 :: (a -> a -> a) -> IdentityT f a -> a

toList :: IdentityT f a -> [a] #

null :: IdentityT f a -> Bool #

length :: IdentityT f a -> Int #

elem :: Eq a => a -> IdentityT f a -> Bool #

maximum :: Ord a => IdentityT f a -> a

minimum :: Ord a => IdentityT f a -> a

sum :: Num a => IdentityT f a -> a #

product :: Num a => IdentityT f a -> a #

Foldable f => Foldable (WriterT w f) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

fold :: Monoid m => WriterT w f m -> m #

foldMap :: Monoid m => (a -> m) -> WriterT w f a -> m #

foldMap' :: Monoid m => (a -> m) -> WriterT w f a -> m

foldr :: (a -> b -> b) -> b -> WriterT w f a -> b #

foldr' :: (a -> b -> b) -> b -> WriterT w f a -> b #

foldl :: (b -> a -> b) -> b -> WriterT w f a -> b

foldl' :: (b -> a -> b) -> b -> WriterT w f a -> b #

foldr1 :: (a -> a -> a) -> WriterT w f a -> a

foldl1 :: (a -> a -> a) -> WriterT w f a -> a

toList :: WriterT w f a -> [a] #

null :: WriterT w f a -> Bool #

length :: WriterT w f a -> Int #

elem :: Eq a => a -> WriterT w f a -> Bool #

maximum :: Ord a => WriterT w f a -> a

minimum :: Ord a => WriterT w f a -> a

sum :: Num a => WriterT w f a -> a #

product :: Num a => WriterT w f a -> a #

Foldable f => Foldable (WriterT w f) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

fold :: Monoid m => WriterT w f m -> m #

foldMap :: Monoid m => (a -> m) -> WriterT w f a -> m #

foldMap' :: Monoid m => (a -> m) -> WriterT w f a -> m

foldr :: (a -> b -> b) -> b -> WriterT w f a -> b #

foldr' :: (a -> b -> b) -> b -> WriterT w f a -> b #

foldl :: (b -> a -> b) -> b -> WriterT w f a -> b

foldl' :: (b -> a -> b) -> b -> WriterT w f a -> b #

foldr1 :: (a -> a -> a) -> WriterT w f a -> a

foldl1 :: (a -> a -> a) -> WriterT w f a -> a

toList :: WriterT w f a -> [a] #

null :: WriterT w f a -> Bool #

length :: WriterT w f a -> Int #

elem :: Eq a => a -> WriterT w f a -> Bool #

maximum :: Ord a => WriterT w f a -> a

minimum :: Ord a => WriterT w f a -> a

sum :: Num a => WriterT w f a -> a #

product :: Num a => WriterT w f a -> a #

Foldable (Constant a :: Type -> Type) 
Instance details

Defined in Data.Functor.Constant

Methods

fold :: Monoid m => Constant a m -> m #

foldMap :: Monoid m => (a0 -> m) -> Constant a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> Constant a a0 -> m

foldr :: (a0 -> b -> b) -> b -> Constant a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Constant a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> Constant a a0 -> b

foldl' :: (b -> a0 -> b) -> b -> Constant a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Constant a a0 -> a0

foldl1 :: (a0 -> a0 -> a0) -> Constant a a0 -> a0

toList :: Constant a a0 -> [a0] #

null :: Constant a a0 -> Bool #

length :: Constant a a0 -> Int #

elem :: Eq a0 => a0 -> Constant a a0 -> Bool #

maximum :: Ord a0 => Constant a a0 -> a0

minimum :: Ord a0 => Constant a a0 -> a0

sum :: Num a0 => Constant a a0 -> a0 #

product :: Num a0 => Constant a a0 -> a0 #

Foldable f => Foldable (Reverse f) 
Instance details

Defined in Data.Functor.Reverse

Methods

fold :: Monoid m => Reverse f m -> m #

foldMap :: Monoid m => (a -> m) -> Reverse f a -> m #

foldMap' :: Monoid m => (a -> m) -> Reverse f a -> m

foldr :: (a -> b -> b) -> b -> Reverse f a -> b #

foldr' :: (a -> b -> b) -> b -> Reverse f a -> b #

foldl :: (b -> a -> b) -> b -> Reverse f a -> b

foldl' :: (b -> a -> b) -> b -> Reverse f a -> b #

foldr1 :: (a -> a -> a) -> Reverse f a -> a

foldl1 :: (a -> a -> a) -> Reverse f a -> a

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

null :: Reverse f a -> Bool #

length :: Reverse f a -> Int #

elem :: Eq a => a -> Reverse f a -> Bool #

maximum :: Ord a => Reverse f a -> a

minimum :: Ord a => Reverse f a -> a

sum :: Num a => Reverse f a -> a #

product :: Num a => Reverse f a -> a #

(Foldable f, Foldable g) => Foldable (Product f g) 
Instance details

Defined in Data.Functor.Product

Methods

fold :: Monoid m => Product f g m -> m #

foldMap :: Monoid m => (a -> m) -> Product f g a -> m #

foldMap' :: Monoid m => (a -> m) -> Product f g a -> m

foldr :: (a -> b -> b) -> b -> Product f g a -> b #

foldr' :: (a -> b -> b) -> b -> Product f g a -> b #

foldl :: (b -> a -> b) -> b -> Product f g a -> b

foldl' :: (b -> a -> b) -> b -> Product f g a -> b #

foldr1 :: (a -> a -> a) -> Product f g a -> a

foldl1 :: (a -> a -> a) -> Product f g a -> a

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

null :: Product f g a -> Bool #

length :: Product f g a -> Int #

elem :: Eq a => a -> Product f g a -> Bool #

maximum :: Ord a => Product f g a -> a

minimum :: Ord a => Product f g a -> a

sum :: Num a => Product f g a -> a #

product :: Num a => Product f g a -> a #

(Foldable f, Foldable g) => Foldable (Sum f g) 
Instance details

Defined in Data.Functor.Sum

Methods

fold :: Monoid m => Sum f g m -> m #

foldMap :: Monoid m => (a -> m) -> Sum f g a -> m #

foldMap' :: Monoid m => (a -> m) -> Sum f g a -> m

foldr :: (a -> b -> b) -> b -> Sum f g a -> b #

foldr' :: (a -> b -> b) -> b -> Sum f g a -> b #

foldl :: (b -> a -> b) -> b -> Sum f g a -> b

foldl' :: (b -> a -> b) -> b -> Sum f g a -> b #

foldr1 :: (a -> a -> a) -> Sum f g a -> a

foldl1 :: (a -> a -> a) -> Sum f g a -> a

toList :: Sum f g a -> [a] #

null :: Sum f g a -> Bool #

length :: Sum f g a -> Int #

elem :: Eq a => a -> Sum f g a -> Bool #

maximum :: Ord a => Sum f g a -> a

minimum :: Ord a => Sum f g a -> a

sum :: Num a => Sum f g a -> a #

product :: Num a => Sum f g a -> a #

(Foldable f, Foldable g) => Foldable (f :*: g) 
Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => (f :*: g) m -> m #

foldMap :: Monoid m => (a -> m) -> (f :*: g) a -> m #

foldMap' :: Monoid m => (a -> m) -> (f :*: g) a -> m

foldr :: (a -> b -> b) -> b -> (f :*: g) a -> b #

foldr' :: (a -> b -> b) -> b -> (f :*: g) a -> b #

foldl :: (b -> a -> b) -> b -> (f :*: g) a -> b

foldl' :: (b -> a -> b) -> b -> (f :*: g) a -> b #

foldr1 :: (a -> a -> a) -> (f :*: g) a -> a

foldl1 :: (a -> a -> a) -> (f :*: g) a -> a

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

null :: (f :*: g) a -> Bool #

length :: (f :*: g) a -> Int #

elem :: Eq a => a -> (f :*: g) a -> Bool #

maximum :: Ord a => (f :*: g) a -> a

minimum :: Ord a => (f :*: g) a -> a

sum :: Num a => (f :*: g) a -> a #

product :: Num a => (f :*: g) a -> a #

(Foldable f, Foldable g) => Foldable (f :+: g) 
Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => (f :+: g) m -> m #

foldMap :: Monoid m => (a -> m) -> (f :+: g) a -> m #

foldMap' :: Monoid m => (a -> m) -> (f :+: g) a -> m

foldr :: (a -> b -> b) -> b -> (f :+: g) a -> b #

foldr' :: (a -> b -> b) -> b -> (f :+: g) a -> b #

foldl :: (b -> a -> b) -> b -> (f :+: g) a -> b

foldl' :: (b -> a -> b) -> b -> (f :+: g) a -> b #

foldr1 :: (a -> a -> a) -> (f :+: g) a -> a

foldl1 :: (a -> a -> a) -> (f :+: g) a -> a

toList :: (f :+: g) a -> [a] #

null :: (f :+: g) a -> Bool #

length :: (f :+: g) a -> Int #

elem :: Eq a => a -> (f :+: g) a -> Bool #

maximum :: Ord a => (f :+: g) a -> a

minimum :: Ord a => (f :+: g) a -> a

sum :: Num a => (f :+: g) a -> a #

product :: Num a => (f :+: g) a -> a #

Foldable (K1 i c :: Type -> Type) 
Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => K1 i c m -> m #

foldMap :: Monoid m => (a -> m) -> K1 i c a -> m #

foldMap' :: Monoid m => (a -> m) -> K1 i c a -> m

foldr :: (a -> b -> b) -> b -> K1 i c a -> b #

foldr' :: (a -> b -> b) -> b -> K1 i c a -> b #

foldl :: (b -> a -> b) -> b -> K1 i c a -> b

foldl' :: (b -> a -> b) -> b -> K1 i c a -> b #

foldr1 :: (a -> a -> a) -> K1 i c a -> a

foldl1 :: (a -> a -> a) -> K1 i c a -> a

toList :: K1 i c a -> [a] #

null :: K1 i c a -> Bool #

length :: K1 i c a -> Int #

elem :: Eq a => a -> K1 i c a -> Bool #

maximum :: Ord a => K1 i c a -> a

minimum :: Ord a => K1 i c a -> a

sum :: Num a => K1 i c a -> a #

product :: Num a => K1 i c a -> a #

(Foldable f, Foldable g) => Foldable (Compose f g) 
Instance details

Defined in Data.Functor.Compose

Methods

fold :: Monoid m => Compose f g m -> m #

foldMap :: Monoid m => (a -> m) -> Compose f g a -> m #

foldMap' :: Monoid m => (a -> m) -> Compose f g a -> m

foldr :: (a -> b -> b) -> b -> Compose f g a -> b #

foldr' :: (a -> b -> b) -> b -> Compose f g a -> b #

foldl :: (b -> a -> b) -> b -> Compose f g a -> b

foldl' :: (b -> a -> b) -> b -> Compose f g a -> b #

foldr1 :: (a -> a -> a) -> Compose f g a -> a

foldl1 :: (a -> a -> a) -> Compose f g a -> a

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

null :: Compose f g a -> Bool #

length :: Compose f g a -> Int #

elem :: Eq a => a -> Compose f g a -> Bool #

maximum :: Ord a => Compose f g a -> a

minimum :: Ord a => Compose f g a -> a

sum :: Num a => Compose f g a -> a #

product :: Num a => Compose f g a -> a #

(Foldable f, Foldable g) => Foldable (f :.: g) 
Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => (f :.: g) m -> m #

foldMap :: Monoid m => (a -> m) -> (f :.: g) a -> m #

foldMap' :: Monoid m => (a -> m) -> (f :.: g) a -> m

foldr :: (a -> b -> b) -> b -> (f :.: g) a -> b #

foldr' :: (a -> b -> b) -> b -> (f :.: g) a -> b #

foldl :: (b -> a -> b) -> b -> (f :.: g) a -> b

foldl' :: (b -> a -> b) -> b -> (f :.: g) a -> b #

foldr1 :: (a -> a -> a) -> (f :.: g) a -> a

foldl1 :: (a -> a -> a) -> (f :.: g) a -> a

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

null :: (f :.: g) a -> Bool #

length :: (f :.: g) a -> Int #

elem :: Eq a => a -> (f :.: g) a -> Bool #

maximum :: Ord a => (f :.: g) a -> a

minimum :: Ord a => (f :.: g) a -> a

sum :: Num a => (f :.: g) a -> a #

product :: Num a => (f :.: g) a -> a #

Foldable f => Foldable (M1 i c f) 
Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => M1 i c f m -> m #

foldMap :: Monoid m => (a -> m) -> M1 i c f a -> m #

foldMap' :: Monoid m => (a -> m) -> M1 i c f a -> m

foldr :: (a -> b -> b) -> b -> M1 i c f a -> b #

foldr' :: (a -> b -> b) -> b -> M1 i c f a -> b #

foldl :: (b -> a -> b) -> b -> M1 i c f a -> b

foldl' :: (b -> a -> b) -> b -> M1 i c f a -> b #

foldr1 :: (a -> a -> a) -> M1 i c f a -> a

foldl1 :: (a -> a -> a) -> M1 i c f a -> a

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

null :: M1 i c f a -> Bool #

length :: M1 i c f a -> Int #

elem :: Eq a => a -> M1 i c f a -> Bool #

maximum :: Ord a => M1 i c f a -> a

minimum :: Ord a => M1 i c f a -> a

sum :: Num a => M1 i c f a -> a #

product :: Num a => M1 i c f a -> a #

lookup :: Eq a => a -> [(a, b)] -> Maybe b #

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

mapMaybe :: (a -> Maybe b) -> [a] -> [b] #

class (Functor t, Foldable t) => Traversable (t :: Type -> Type) where #

Minimal complete definition

traverse | sequenceA

Methods

traverse :: Applicative f => (a -> f b) -> t a -> f (t b) #

sequenceA :: Applicative f => t (f a) -> f (t a) #

mapM :: Monad m => (a -> m b) -> t a -> m (t b) #

sequence :: Monad m => t (m a) -> m (t a) #

Instances

Instances details
Traversable PerCompilerFlavor 
Instance details

Defined in Distribution.Compiler

Methods

traverse :: Applicative f => (a -> f b) -> PerCompilerFlavor a -> f (PerCompilerFlavor b) #

sequenceA :: Applicative f => PerCompilerFlavor (f a) -> f (PerCompilerFlavor a) #

mapM :: Monad m => (a -> m b) -> PerCompilerFlavor a -> m (PerCompilerFlavor b) #

sequence :: Monad m => PerCompilerFlavor (m a) -> m (PerCompilerFlavor a) #

Traversable Field 
Instance details

Defined in Distribution.Fields.Field

Methods

traverse :: Applicative f => (a -> f b) -> Field a -> f (Field b) #

sequenceA :: Applicative f => Field (f a) -> f (Field a) #

mapM :: Monad m => (a -> m b) -> Field a -> m (Field b) #

sequence :: Monad m => Field (m a) -> m (Field a) #

Traversable FieldLine 
Instance details

Defined in Distribution.Fields.Field

Methods

traverse :: Applicative f => (a -> f b) -> FieldLine a -> f (FieldLine b) #

sequenceA :: Applicative f => FieldLine (f a) -> f (FieldLine a) #

mapM :: Monad m => (a -> m b) -> FieldLine a -> m (FieldLine b) #

sequence :: Monad m => FieldLine (m a) -> m (FieldLine a) #

Traversable Name 
Instance details

Defined in Distribution.Fields.Field

Methods

traverse :: Applicative f => (a -> f b) -> Name a -> f (Name b) #

sequenceA :: Applicative f => Name (f a) -> f (Name a) #

mapM :: Monad m => (a -> m b) -> Name a -> m (Name b) #

sequence :: Monad m => Name (m a) -> m (Name a) #

Traversable SectionArg 
Instance details

Defined in Distribution.Fields.Field

Methods

traverse :: Applicative f => (a -> f b) -> SectionArg a -> f (SectionArg b) #

sequenceA :: Applicative f => SectionArg (f a) -> f (SectionArg a) #

mapM :: Monad m => (a -> m b) -> SectionArg a -> m (SectionArg b) #

sequence :: Monad m => SectionArg (m a) -> m (SectionArg a) #

Traversable PrettyField 
Instance details

Defined in Distribution.Fields.Pretty

Methods

traverse :: Applicative f => (a -> f b) -> PrettyField a -> f (PrettyField b) #

sequenceA :: Applicative f => PrettyField (f a) -> f (PrettyField a) #

mapM :: Monad m => (a -> m b) -> PrettyField a -> m (PrettyField b) #

sequence :: Monad m => PrettyField (m a) -> m (PrettyField a) #

Traversable Condition 
Instance details

Defined in Distribution.Types.Condition

Methods

traverse :: Applicative f => (a -> f b) -> Condition a -> f (Condition b) #

sequenceA :: Applicative f => Condition (f a) -> f (Condition a) #

mapM :: Monad m => (a -> m b) -> Condition a -> m (Condition b) #

sequence :: Monad m => Condition (m a) -> m (Condition a) #

Traversable VersionRangeF 
Instance details

Defined in Distribution.Types.VersionRange.Internal

Methods

traverse :: Applicative f => (a -> f b) -> VersionRangeF a -> f (VersionRangeF b) #

sequenceA :: Applicative f => VersionRangeF (f a) -> f (VersionRangeF a) #

mapM :: Monad m => (a -> m b) -> VersionRangeF a -> m (VersionRangeF b) #

sequence :: Monad m => VersionRangeF (m a) -> m (VersionRangeF a) #

Traversable KeyMap 
Instance details

Defined in Data.Aeson.KeyMap

Methods

traverse :: Applicative f => (a -> f b) -> KeyMap a -> f (KeyMap b) #

sequenceA :: Applicative f => KeyMap (f a) -> f (KeyMap a) #

mapM :: Monad m => (a -> m b) -> KeyMap a -> m (KeyMap b) #

sequence :: Monad m => KeyMap (m a) -> m (KeyMap a) #

Traversable IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

traverse :: Applicative f => (a -> f b) -> IResult a -> f (IResult b) #

sequenceA :: Applicative f => IResult (f a) -> f (IResult a) #

mapM :: Monad m => (a -> m b) -> IResult a -> m (IResult b) #

sequence :: Monad m => IResult (m a) -> m (IResult a) #

Traversable Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

traverse :: Applicative f => (a -> f b) -> Result a -> f (Result b) #

sequenceA :: Applicative f => Result (f a) -> f (Result a) #

mapM :: Monad m => (a -> m b) -> Result a -> m (Result b) #

sequence :: Monad m => Result (m a) -> m (Result a) #

Traversable ZipList 
Instance details

Defined in Data.Traversable

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) #

Traversable Complex 
Instance details

Defined in Data.Complex

Methods

traverse :: Applicative f => (a -> f b) -> Complex a -> f (Complex b) #

sequenceA :: Applicative f => Complex (f a) -> f (Complex a) #

mapM :: Monad m => (a -> m b) -> Complex a -> m (Complex b) #

sequence :: Monad m => Complex (m a) -> m (Complex a) #

Traversable Identity 
Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Identity a -> f (Identity b) #

sequenceA :: Applicative f => Identity (f a) -> f (Identity a) #

mapM :: Monad m => (a -> m b) -> Identity a -> m (Identity b) #

sequence :: Monad m => Identity (m a) -> m (Identity a) #

Traversable First 
Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> First a -> f (First b) #

sequenceA :: Applicative f => First (f a) -> f (First a) #

mapM :: Monad m => (a -> m b) -> First a -> m (First b) #

sequence :: Monad m => First (m a) -> m (First a) #

Traversable Last 
Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Last a -> f (Last b) #

sequenceA :: Applicative f => Last (f a) -> f (Last a) #

mapM :: Monad m => (a -> m b) -> Last a -> m (Last b) #

sequence :: Monad m => Last (m a) -> m (Last a) #

Traversable Down 
Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Down a -> f (Down b) #

sequenceA :: Applicative f => Down (f a) -> f (Down a) #

mapM :: Monad m => (a -> m b) -> Down a -> m (Down b) #

sequence :: Monad m => Down (m a) -> m (Down a) #

Traversable First 
Instance details

Defined in Data.Semigroup

Methods

traverse :: Applicative f => (a -> f b) -> First a -> f (First b) #

sequenceA :: Applicative f => First (f a) -> f (First a) #

mapM :: Monad m => (a -> m b) -> First a -> m (First b) #

sequence :: Monad m => First (m a) -> m (First a) #

Traversable Last 
Instance details

Defined in Data.Semigroup

Methods

traverse :: Applicative f => (a -> f b) -> Last a -> f (Last b) #

sequenceA :: Applicative f => Last (f a) -> f (Last a) #

mapM :: Monad m => (a -> m b) -> Last a -> m (Last b) #

sequence :: Monad m => Last (m a) -> m (Last a) #

Traversable Max 
Instance details

Defined in Data.Semigroup

Methods

traverse :: Applicative f => (a -> f b) -> Max a -> f (Max b) #

sequenceA :: Applicative f => Max (f a) -> f (Max a) #

mapM :: Monad m => (a -> m b) -> Max a -> m (Max b) #

sequence :: Monad m => Max (m a) -> m (Max a) #

Traversable Min 
Instance details

Defined in Data.Semigroup

Methods

traverse :: Applicative f => (a -> f b) -> Min a -> f (Min b) #

sequenceA :: Applicative f => Min (f a) -> f (Min a) #

mapM :: Monad m => (a -> m b) -> Min a -> m (Min b) #

sequence :: Monad m => Min (m a) -> m (Min a) #

Traversable Dual 
Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Dual a -> f (Dual b) #

sequenceA :: Applicative f => Dual (f a) -> f (Dual a) #

mapM :: Monad m => (a -> m b) -> Dual a -> m (Dual b) #

sequence :: Monad m => Dual (m a) -> m (Dual a) #

Traversable Product 
Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Product a -> f (Product b) #

sequenceA :: Applicative f => Product (f a) -> f (Product a) #

mapM :: Monad m => (a -> m b) -> Product a -> m (Product b) #

sequence :: Monad m => Product (m a) -> m (Product a) #

Traversable Sum 
Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Sum a -> f (Sum b) #

sequenceA :: Applicative f => Sum (f a) -> f (Sum a) #

mapM :: Monad m => (a -> m b) -> Sum a -> m (Sum b) #

sequence :: Monad m => Sum (m a) -> m (Sum a) #

Traversable NonEmpty 
Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> NonEmpty a -> f (NonEmpty b) #

sequenceA :: Applicative f => NonEmpty (f a) -> f (NonEmpty a) #

mapM :: Monad m => (a -> m b) -> NonEmpty a -> m (NonEmpty b) #

sequence :: Monad m => NonEmpty (m a) -> m (NonEmpty a) #

Traversable Par1 
Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Par1 a -> f (Par1 b) #

sequenceA :: Applicative f => Par1 (f a) -> f (Par1 a) #

mapM :: Monad m => (a -> m b) -> Par1 a -> m (Par1 b) #

sequence :: Monad m => Par1 (m a) -> m (Par1 a) #

Traversable SCC 
Instance details

Defined in Data.Graph

Methods

traverse :: Applicative f => (a -> f b) -> SCC a -> f (SCC b) #

sequenceA :: Applicative f => SCC (f a) -> f (SCC a) #

mapM :: Monad m => (a -> m b) -> SCC a -> m (SCC b) #

sequence :: Monad m => SCC (m a) -> m (SCC a) #

Traversable IntMap 
Instance details

Defined in Data.IntMap.Internal

Methods

traverse :: Applicative f => (a -> f b) -> IntMap a -> f (IntMap b) #

sequenceA :: Applicative f => IntMap (f a) -> f (IntMap a) #

mapM :: Monad m => (a -> m b) -> IntMap a -> m (IntMap b) #

sequence :: Monad m => IntMap (m a) -> m (IntMap a) #

Traversable Digit 
Instance details

Defined in Data.Sequence.Internal

Methods

traverse :: Applicative f => (a -> f b) -> Digit a -> f (Digit b) #

sequenceA :: Applicative f => Digit (f a) -> f (Digit a) #

mapM :: Monad m => (a -> m b) -> Digit a -> m (Digit b) #

sequence :: Monad m => Digit (m a) -> m (Digit a) #

Traversable Elem 
Instance details

Defined in Data.Sequence.Internal

Methods

traverse :: Applicative f => (a -> f b) -> Elem a -> f (Elem b) #

sequenceA :: Applicative f => Elem (f a) -> f (Elem a) #

mapM :: Monad m => (a -> m b) -> Elem a -> m (Elem b) #

sequence :: Monad m => Elem (m a) -> m (Elem a) #

Traversable FingerTree 
Instance details

Defined in Data.Sequence.Internal

Methods

traverse :: Applicative f => (a -> f b) -> FingerTree a -> f (FingerTree b) #

sequenceA :: Applicative f => FingerTree (f a) -> f (FingerTree a) #

mapM :: Monad m => (a -> m b) -> FingerTree a -> m (FingerTree b) #

sequence :: Monad m => FingerTree (m a) -> m (FingerTree a) #

Traversable Node 
Instance details

Defined in Data.Sequence.Internal

Methods

traverse :: Applicative f => (a -> f b) -> Node a -> f (Node b) #

sequenceA :: Applicative f => Node (f a) -> f (Node a) #

mapM :: Monad m => (a -> m b) -> Node a -> m (Node b) #

sequence :: Monad m => Node (m a) -> m (Node a) #

Traversable Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

traverse :: Applicative f => (a -> f b) -> Seq a -> f (Seq b) #

sequenceA :: Applicative f => Seq (f a) -> f (Seq a) #

mapM :: Monad m => (a -> m b) -> Seq a -> m (Seq b) #

sequence :: Monad m => Seq (m a) -> m (Seq a) #

Traversable ViewL 
Instance details

Defined in Data.Sequence.Internal

Methods

traverse :: Applicative f => (a -> f b) -> ViewL a -> f (ViewL b) #

sequenceA :: Applicative f => ViewL (f a) -> f (ViewL a) #

mapM :: Monad m => (a -> m b) -> ViewL a -> m (ViewL b) #

sequence :: Monad m => ViewL (m a) -> m (ViewL a) #

Traversable ViewR 
Instance details

Defined in Data.Sequence.Internal

Methods

traverse :: Applicative f => (a -> f b) -> ViewR a -> f (ViewR b) #

sequenceA :: Applicative f => ViewR (f a) -> f (ViewR a) #

mapM :: Monad m => (a -> m b) -> ViewR a -> m (ViewR b) #

sequence :: Monad m => ViewR (m a) -> m (ViewR a) #

Traversable Tree 
Instance details

Defined in Data.Tree

Methods

traverse :: Applicative f => (a -> f b) -> Tree a -> f (Tree b) #

sequenceA :: Applicative f => Tree (f a) -> f (Tree a) #

mapM :: Monad m => (a -> m b) -> Tree a -> m (Tree b) #

sequence :: Monad m => Tree (m a) -> m (Tree a) #

Traversable DList 
Instance details

Defined in Data.DList.Internal

Methods

traverse :: Applicative f => (a -> f b) -> DList a -> f (DList b) #

sequenceA :: Applicative f => DList (f a) -> f (DList a) #

mapM :: Monad m => (a -> m b) -> DList a -> m (DList b) #

sequence :: Monad m => DList (m a) -> m (DList a) #

Traversable SizedSeq 
Instance details

Defined in GHC.Data.SizedSeq

Methods

traverse :: Applicative f => (a -> f b) -> SizedSeq a -> f (SizedSeq b) #

sequenceA :: Applicative f => SizedSeq (f a) -> f (SizedSeq a) #

mapM :: Monad m => (a -> m b) -> SizedSeq a -> m (SizedSeq b) #

sequence :: Monad m => SizedSeq (m a) -> m (SizedSeq a) #

Traversable List 
Instance details

Defined in Data.Aeson.Config.Types

Methods

traverse :: Applicative f => (a -> f b) -> List a -> f (List b) #

sequenceA :: Applicative f => List (f a) -> f (List a) #

mapM :: Monad m => (a -> m b) -> List a -> m (List b) #

sequence :: Monad m => List (m a) -> m (List a) #

Traversable Conditional 
Instance details

Defined in Hpack.Config

Methods

traverse :: Applicative f => (a -> f b) -> Conditional a -> f (Conditional b) #

sequenceA :: Applicative f => Conditional (f a) -> f (Conditional a) #

mapM :: Monad m => (a -> m b) -> Conditional a -> m (Conditional b) #

sequence :: Monad m => Conditional (m a) -> m (Conditional a) #

Traversable Section 
Instance details

Defined in Hpack.Config

Methods

traverse :: Applicative f => (a -> f b) -> Section a -> f (Section b) #

sequenceA :: Applicative f => Section (f a) -> f (Section a) #

mapM :: Monad m => (a -> m b) -> Section a -> m (Section b) #

sequence :: Monad m => Section (m a) -> m (Section a) #

Traversable LenientData 
Instance details

Defined in Web.Internal.HttpApiData

Methods

traverse :: Applicative f => (a -> f b) -> LenientData a -> f (LenientData b) #

sequenceA :: Applicative f => LenientData (f a) -> f (LenientData a) #

mapM :: Monad m => (a -> m b) -> LenientData a -> m (LenientData b) #

sequence :: Monad m => LenientData (m a) -> m (LenientData a) #

Traversable HistoriedResponse 
Instance details

Defined in Network.HTTP.Client

Methods

traverse :: Applicative f => (a -> f b) -> HistoriedResponse a -> f (HistoriedResponse b) #

sequenceA :: Applicative f => HistoriedResponse (f a) -> f (HistoriedResponse a) #

mapM :: Monad m => (a -> m b) -> HistoriedResponse a -> m (HistoriedResponse b) #

sequence :: Monad m => HistoriedResponse (m a) -> m (HistoriedResponse a) #

Traversable Response 
Instance details

Defined in Network.HTTP.Client.Types

Methods

traverse :: Applicative f => (a -> f b) -> Response a -> f (Response b) #

sequenceA :: Applicative f => Response (f a) -> f (Response a) #

mapM :: Monad m => (a -> m b) -> Response a -> m (Response b) #

sequence :: Monad m => Response (m a) -> m (Response a) #

Traversable SimpleDocStream 
Instance details

Defined in Prettyprinter.Internal

Methods

traverse :: Applicative f => (a -> f b) -> SimpleDocStream a -> f (SimpleDocStream b) #

sequenceA :: Applicative f => SimpleDocStream (f a) -> f (SimpleDocStream a) #

mapM :: Monad m => (a -> m b) -> SimpleDocStream a -> m (SimpleDocStream b) #

sequence :: Monad m => SimpleDocStream (m a) -> m (SimpleDocStream a) #

Traversable Array 
Instance details

Defined in Data.Primitive.Array

Methods

traverse :: Applicative f => (a -> f b) -> Array a -> f (Array b) #

sequenceA :: Applicative f => Array (f a) -> f (Array a) #

mapM :: Monad m => (a -> m b) -> Array a -> m (Array b) #

sequence :: Monad m => Array (m a) -> m (Array a) #

Traversable SmallArray 
Instance details

Defined in Data.Primitive.SmallArray

Methods

traverse :: Applicative f => (a -> f b) -> SmallArray a -> f (SmallArray b) #

sequenceA :: Applicative f => SmallArray (f a) -> f (SmallArray a) #

mapM :: Monad m => (a -> m b) -> SmallArray a -> m (SmallArray b) #

sequence :: Monad m => SmallArray (m a) -> m (SmallArray a) #

Traversable Maybe 
Instance details

Defined in Data.Strict.Maybe

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) #

Traversable TyVarBndr 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> TyVarBndr a -> f (TyVarBndr b) #

sequenceA :: Applicative f => TyVarBndr (f a) -> f (TyVarBndr a) #

mapM :: Monad m => (a -> m b) -> TyVarBndr a -> m (TyVarBndr b) #

sequence :: Monad m => TyVarBndr (m a) -> m (TyVarBndr a) #

Traversable Vector 
Instance details

Defined in Data.Vector

Methods

traverse :: Applicative f => (a -> f b) -> Vector a -> f (Vector b) #

sequenceA :: Applicative f => Vector (f a) -> f (Vector a) #

mapM :: Monad m => (a -> m b) -> Vector a -> m (Vector b) #

sequence :: Monad m => Vector (m a) -> m (Vector a) #

Traversable Vector 
Instance details

Defined in Data.Vector.Strict

Methods

traverse :: Applicative f => (a -> f b) -> Vector a -> f (Vector b) #

sequenceA :: Applicative f => Vector (f a) -> f (Vector a) #

mapM :: Monad m => (a -> m b) -> Vector a -> m (Vector b) #

sequence :: Monad m => Vector (m a) -> m (Vector a) #

Traversable Maybe 
Instance details

Defined in 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) #

Traversable Solo 
Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Solo a -> f (Solo b) #

sequenceA :: Applicative f => Solo (f a) -> f (Solo a) #

mapM :: Monad m => (a -> m b) -> Solo a -> m (Solo b) #

sequence :: Monad m => Solo (m a) -> m (Solo a) #

Traversable [] 
Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> [a] -> f [b] #

sequenceA :: Applicative f => [f a] -> f [a] #

mapM :: Monad m => (a -> m b) -> [a] -> m [b] #

sequence :: Monad m => [m a] -> m [a] #

Traversable (TkArray k) 
Instance details

Defined in Data.Aeson.Decoding.Tokens

Methods

traverse :: Applicative f => (a -> f b) -> TkArray k a -> f (TkArray k b) #

sequenceA :: Applicative f => TkArray k (f a) -> f (TkArray k a) #

mapM :: Monad m => (a -> m b) -> TkArray k a -> m (TkArray k b) #

sequence :: Monad m => TkArray k (m a) -> m (TkArray k a) #

Traversable (TkRecord k) 
Instance details

Defined in Data.Aeson.Decoding.Tokens

Methods

traverse :: Applicative f => (a -> f b) -> TkRecord k a -> f (TkRecord k b) #

sequenceA :: Applicative f => TkRecord k (f a) -> f (TkRecord k a) #

mapM :: Monad m => (a -> m b) -> TkRecord k a -> m (TkRecord k b) #

sequence :: Monad m => TkRecord k (m a) -> m (TkRecord k a) #

Traversable (Tokens k) 
Instance details

Defined in Data.Aeson.Decoding.Tokens

Methods

traverse :: Applicative f => (a -> f b) -> Tokens k a -> f (Tokens k b) #

sequenceA :: Applicative f => Tokens k (f a) -> f (Tokens k a) #

mapM :: Monad m => (a -> m b) -> Tokens k a -> m (Tokens k b) #

sequence :: Monad m => Tokens k (m a) -> m (Tokens k a) #

Traversable (Either a) 
Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a0 -> f b) -> Either a a0 -> f (Either a b) #

sequenceA :: Applicative f => Either a (f a0) -> f (Either a a0) #

mapM :: Monad m => (a0 -> m b) -> Either a a0 -> m (Either a b) #

sequence :: Monad m => Either a (m a0) -> m (Either a a0) #

Traversable (Proxy :: Type -> Type) 
Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Proxy a -> f (Proxy b) #

sequenceA :: Applicative f => Proxy (f a) -> f (Proxy a) #

mapM :: Monad m => (a -> m b) -> Proxy a -> m (Proxy b) #

sequence :: Monad m => Proxy (m a) -> m (Proxy a) #

Traversable (Arg a) 
Instance details

Defined in Data.Semigroup

Methods

traverse :: Applicative f => (a0 -> f b) -> Arg a a0 -> f (Arg a b) #

sequenceA :: Applicative f => Arg a (f a0) -> f (Arg a a0) #

mapM :: Monad m => (a0 -> m b) -> Arg a a0 -> m (Arg a b) #

sequence :: Monad m => Arg a (m a0) -> m (Arg a a0) #

Ix i => Traversable (Array i) 
Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Array i a -> f (Array i b) #

sequenceA :: Applicative f => Array i (f a) -> f (Array i a) #

mapM :: Monad m => (a -> m b) -> Array i a -> m (Array i b) #

sequence :: Monad m => Array i (m a) -> m (Array i a) #

Traversable (U1 :: Type -> Type) 
Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> U1 a -> f (U1 b) #

sequenceA :: Applicative f => U1 (f a) -> f (U1 a) #

mapM :: Monad m => (a -> m b) -> U1 a -> m (U1 b) #

sequence :: Monad m => U1 (m a) -> m (U1 a) #

Traversable (UAddr :: Type -> Type) 
Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> UAddr a -> f (UAddr b) #

sequenceA :: Applicative f => UAddr (f a) -> f (UAddr a) #

mapM :: Monad m => (a -> m b) -> UAddr a -> m (UAddr b) #

sequence :: Monad m => UAddr (m a) -> m (UAddr a) #

Traversable (UChar :: Type -> Type) 
Instance details

Defined in 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) #

Traversable (UDouble :: Type -> Type) 
Instance details

Defined in 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) #

Traversable (UFloat :: Type -> Type) 
Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> UFloat a -> f (UFloat b) #

sequenceA :: Applicative f => UFloat (f a) -> f (UFloat a) #

mapM :: Monad m => (a -> m b) -> UFloat a -> m (UFloat b) #

sequence :: Monad m => UFloat (m a) -> m (UFloat a) #

Traversable (UInt :: Type -> Type) 
Instance details

Defined in 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) #

Traversable (UWord :: Type -> Type) 
Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> UWord a -> f (UWord b) #

sequenceA :: Applicative f => UWord (f a) -> f (UWord a) #

mapM :: Monad m => (a -> m b) -> UWord a -> m (UWord b) #

sequence :: Monad m => UWord (m a) -> m (UWord a) #

Traversable (V1 :: Type -> Type) 
Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> V1 a -> f (V1 b) #

sequenceA :: Applicative f => V1 (f a) -> f (V1 a) #

mapM :: Monad m => (a -> m b) -> V1 a -> m (V1 b) #

sequence :: Monad m => V1 (m a) -> m (V1 a) #

Traversable (Map k) 
Instance details

Defined in Data.Map.Internal

Methods

traverse :: Applicative f => (a -> f b) -> Map k a -> f (Map k b) #

sequenceA :: Applicative f => Map k (f a) -> f (Map k a) #

mapM :: Monad m => (a -> m b) -> Map k a -> m (Map k b) #

sequence :: Monad m => Map k (m a) -> m (Map k a) #

(Monad m, Traversable m) => Traversable (CatchT m) 
Instance details

Defined in Control.Monad.Catch.Pure

Methods

traverse :: Applicative f => (a -> f b) -> CatchT m a -> f (CatchT m b) #

sequenceA :: Applicative f => CatchT m (f a) -> f (CatchT m a) #

mapM :: Monad m0 => (a -> m0 b) -> CatchT m a -> m0 (CatchT m b) #

sequence :: Monad m0 => CatchT m (m0 a) -> m0 (CatchT m a) #

Traversable (DbOpenMode mode) 
Instance details

Defined in GHC.Unit.Database

Methods

traverse :: Applicative f => (a -> f b) -> DbOpenMode mode a -> f (DbOpenMode mode b) #

sequenceA :: Applicative f => DbOpenMode mode (f a) -> f (DbOpenMode mode a) #

mapM :: Monad m => (a -> m b) -> DbOpenMode mode a -> m (DbOpenMode mode b) #

sequence :: Monad m => DbOpenMode mode (m a) -> m (DbOpenMode mode a) #

Traversable (Product a) 
Instance details

Defined in Data.Aeson.Config.Types

Methods

traverse :: Applicative f => (a0 -> f b) -> Product a a0 -> f (Product a b) #

sequenceA :: Applicative f => Product a (f a0) -> f (Product a a0) #

mapM :: Monad m => (a0 -> m b) -> Product a a0 -> m (Product a b) #

sequence :: Monad m => Product a (m a0) -> m (Product a a0) #

Traversable (Either e) 
Instance details

Defined in Data.Strict.Either

Methods

traverse :: Applicative f => (a -> f b) -> Either e a -> f (Either e b) #

sequenceA :: Applicative f => Either e (f a) -> f (Either e a) #

mapM :: Monad m => (a -> m b) -> Either e a -> m (Either e b) #

sequence :: Monad m => Either e (m a) -> m (Either e a) #

Traversable (These a) 
Instance details

Defined in Data.Strict.These

Methods

traverse :: Applicative f => (a0 -> f b) -> These a a0 -> f (These a b) #

sequenceA :: Applicative f => These a (f a0) -> f (These a a0) #

mapM :: Monad m => (a0 -> m b) -> These a a0 -> m (These a b) #

sequence :: Monad m => These a (m a0) -> m (These a a0) #

Traversable (Pair e) 
Instance details

Defined in Data.Strict.Tuple

Methods

traverse :: Applicative f => (a -> f b) -> Pair e a -> f (Pair e b) #

sequenceA :: Applicative f => Pair e (f a) -> f (Pair e a) #

mapM :: Monad m => (a -> m b) -> Pair e a -> m (Pair e b) #

sequence :: Monad m => Pair e (m a) -> m (Pair e a) #

Traversable (These a) 
Instance details

Defined in Data.These

Methods

traverse :: Applicative f => (a0 -> f b) -> These a a0 -> f (These a b) #

sequenceA :: Applicative f => These a (f a0) -> f (These a a0) #

mapM :: Monad m => (a0 -> m b) -> These a a0 -> m (These a b) #

sequence :: Monad m => These a (m a0) -> m (These a a0) #

Traversable f => Traversable (Lift f) 
Instance details

Defined in Control.Applicative.Lift

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Lift f a -> f0 (Lift f b) #

sequenceA :: Applicative f0 => Lift f (f0 a) -> f0 (Lift f a) #

mapM :: Monad m => (a -> m b) -> Lift f a -> m (Lift f b) #

sequence :: Monad m => Lift f (m a) -> m (Lift f a) #

Traversable f => Traversable (MaybeT f) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

traverse :: Applicative f0 => (a -> f0 b) -> MaybeT f a -> f0 (MaybeT f b) #

sequenceA :: Applicative f0 => MaybeT f (f0 a) -> f0 (MaybeT f a) #

mapM :: Monad m => (a -> m b) -> MaybeT f a -> m (MaybeT f b) #

sequence :: Monad m => MaybeT f (m a) -> m (MaybeT f a) #

Traversable (HashMap k) 
Instance details

Defined in Data.HashMap.Internal

Methods

traverse :: Applicative f => (a -> f b) -> HashMap k a -> f (HashMap k b) #

sequenceA :: Applicative f => HashMap k (f a) -> f (HashMap k a) #

mapM :: Monad m => (a -> m b) -> HashMap k a -> m (HashMap k b) #

sequence :: Monad m => HashMap k (m a) -> m (HashMap k a) #

Traversable ((,) a) 
Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a0 -> f b) -> (a, a0) -> f (a, b) #

sequenceA :: Applicative f => (a, f a0) -> f (a, a0) #

mapM :: Monad m => (a0 -> m b) -> (a, a0) -> m (a, b) #

sequence :: Monad m => (a, m a0) -> m (a, a0) #

Traversable (CondBranch v c) 
Instance details

Defined in Distribution.Types.CondTree

Methods

traverse :: Applicative f => (a -> f b) -> CondBranch v c a -> f (CondBranch v c b) #

sequenceA :: Applicative f => CondBranch v c (f a) -> f (CondBranch v c a) #

mapM :: Monad m => (a -> m b) -> CondBranch v c a -> m (CondBranch v c b) #

sequence :: Monad m => CondBranch v c (m a) -> m (CondBranch v c a) #

Traversable (CondTree v c) 
Instance details

Defined in Distribution.Types.CondTree

Methods

traverse :: Applicative f => (a -> f b) -> CondTree v c a -> f (CondTree v c b) #

sequenceA :: Applicative f => CondTree v c (f a) -> f (CondTree v c a) #

mapM :: Monad m => (a -> m b) -> CondTree v c a -> m (CondTree v c b) #

sequence :: Monad m => CondTree v c (m a) -> m (CondTree v c a) #

Traversable (Const m :: Type -> Type) 
Instance details

Defined in 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) #

Traversable f => Traversable (Ap f) 
Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Ap f a -> f0 (Ap f b) #

sequenceA :: Applicative f0 => Ap f (f0 a) -> f0 (Ap f a) #

mapM :: Monad m => (a -> m b) -> Ap f a -> m (Ap f b) #

sequence :: Monad m => Ap f (m a) -> m (Ap f a) #

Traversable f => Traversable (Alt f) 
Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Alt f a -> f0 (Alt f b) #

sequenceA :: Applicative f0 => Alt f (f0 a) -> f0 (Alt f a) #

mapM :: Monad m => (a -> m b) -> Alt f a -> m (Alt f b) #

sequence :: Monad m => Alt f (m a) -> m (Alt f a) #

Traversable f => Traversable (Rec1 f) 
Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Rec1 f a -> f0 (Rec1 f b) #

sequenceA :: Applicative f0 => Rec1 f (f0 a) -> f0 (Rec1 f a) #

mapM :: Monad m => (a -> m b) -> Rec1 f a -> m (Rec1 f b) #

sequence :: Monad m => Rec1 f (m a) -> m (Rec1 f a) #

Traversable (Tagged s) 
Instance details

Defined in Data.Tagged

Methods

traverse :: Applicative f => (a -> f b) -> Tagged s a -> f (Tagged s b) #

sequenceA :: Applicative f => Tagged s (f a) -> f (Tagged s a) #

mapM :: Monad m => (a -> m b) -> Tagged s a -> m (Tagged s b) #

sequence :: Monad m => Tagged s (m a) -> m (Tagged s a) #

Traversable (GenEntries tarPath linkTarget) 
Instance details

Defined in Codec.Archive.Tar.Types

Methods

traverse :: Applicative f => (a -> f b) -> GenEntries tarPath linkTarget a -> f (GenEntries tarPath linkTarget b) #

sequenceA :: Applicative f => GenEntries tarPath linkTarget (f a) -> f (GenEntries tarPath linkTarget a) #

mapM :: Monad m => (a -> m b) -> GenEntries tarPath linkTarget a -> m (GenEntries tarPath linkTarget b) #

sequence :: Monad m => GenEntries tarPath linkTarget (m a) -> m (GenEntries tarPath linkTarget a) #

(Traversable f, Traversable g) => Traversable (These1 f g) 
Instance details

Defined in Data.Functor.These

Methods

traverse :: Applicative f0 => (a -> f0 b) -> These1 f g a -> f0 (These1 f g b) #

sequenceA :: Applicative f0 => These1 f g (f0 a) -> f0 (These1 f g a) #

mapM :: Monad m => (a -> m b) -> These1 f g a -> m (These1 f g b) #

sequence :: Monad m => These1 f g (m a) -> m (These1 f g a) #

Traversable f => Traversable (Backwards f) 
Instance details

Defined in Control.Applicative.Backwards

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Backwards f a -> f0 (Backwards f b) #

sequenceA :: Applicative f0 => Backwards f (f0 a) -> f0 (Backwards f a) #

mapM :: Monad m => (a -> m b) -> Backwards f a -> m (Backwards f b) #

sequence :: Monad m => Backwards f (m a) -> m (Backwards f a) #

Traversable f => Traversable (ExceptT e f) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

traverse :: Applicative f0 => (a -> f0 b) -> ExceptT e f a -> f0 (ExceptT e f b) #

sequenceA :: Applicative f0 => ExceptT e f (f0 a) -> f0 (ExceptT e f a) #

mapM :: Monad m => (a -> m b) -> ExceptT e f a -> m (ExceptT e f b) #

sequence :: Monad m => ExceptT e f (m a) -> m (ExceptT e f a) #

Traversable f => Traversable (IdentityT f) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

traverse :: Applicative f0 => (a -> f0 b) -> IdentityT f a -> f0 (IdentityT f b) #

sequenceA :: Applicative f0 => IdentityT f (f0 a) -> f0 (IdentityT f a) #

mapM :: Monad m => (a -> m b) -> IdentityT f a -> m (IdentityT f b) #

sequence :: Monad m => IdentityT f (m a) -> m (IdentityT f a) #

Traversable f => Traversable (WriterT w f) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

traverse :: Applicative f0 => (a -> f0 b) -> WriterT w f a -> f0 (WriterT w f b) #

sequenceA :: Applicative f0 => WriterT w f (f0 a) -> f0 (WriterT w f a) #

mapM :: Monad m => (a -> m b) -> WriterT w f a -> m (WriterT w f b) #

sequence :: Monad m => WriterT w f (m a) -> m (WriterT w f a) #

Traversable f => Traversable (WriterT w f) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

traverse :: Applicative f0 => (a -> f0 b) -> WriterT w f a -> f0 (WriterT w f b) #

sequenceA :: Applicative f0 => WriterT w f (f0 a) -> f0 (WriterT w f a) #

mapM :: Monad m => (a -> m b) -> WriterT w f a -> m (WriterT w f b) #

sequence :: Monad m => WriterT w f (m a) -> m (WriterT w f a) #

Traversable (Constant a :: Type -> Type) 
Instance details

Defined in Data.Functor.Constant

Methods

traverse :: Applicative f => (a0 -> f b) -> Constant a a0 -> f (Constant a b) #

sequenceA :: Applicative f => Constant a (f a0) -> f (Constant a a0) #

mapM :: Monad m => (a0 -> m b) -> Constant a a0 -> m (Constant a b) #

sequence :: Monad m => Constant a (m a0) -> m (Constant a a0) #

Traversable f => Traversable (Reverse f) 
Instance details

Defined in Data.Functor.Reverse

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Reverse f a -> f0 (Reverse f b) #

sequenceA :: Applicative f0 => Reverse f (f0 a) -> f0 (Reverse f a) #

mapM :: Monad m => (a -> m b) -> Reverse f a -> m (Reverse f b) #

sequence :: Monad m => Reverse f (m a) -> m (Reverse f a) #

(Traversable f, Traversable g) => Traversable (Product f g) 
Instance details

Defined in Data.Functor.Product

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Product f g a -> f0 (Product f g b) #

sequenceA :: Applicative f0 => Product f g (f0 a) -> f0 (Product f g a) #

mapM :: Monad m => (a -> m b) -> Product f g a -> m (Product f g b) #

sequence :: Monad m => Product f g (m a) -> m (Product f g a) #

(Traversable f, Traversable g) => Traversable (Sum f g) 
Instance details

Defined in Data.Functor.Sum

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Sum f g a -> f0 (Sum f g b) #

sequenceA :: Applicative f0 => Sum f g (f0 a) -> f0 (Sum f g a) #

mapM :: Monad m => (a -> m b) -> Sum f g a -> m (Sum f g b) #

sequence :: Monad m => Sum f g (m a) -> m (Sum f g a) #

(Traversable f, Traversable g) => Traversable (f :*: g) 
Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f0 => (a -> f0 b) -> (f :*: g) a -> f0 ((f :*: g) b) #

sequenceA :: Applicative f0 => (f :*: g) (f0 a) -> f0 ((f :*: g) a) #

mapM :: Monad m => (a -> m b) -> (f :*: g) a -> m ((f :*: g) b) #

sequence :: Monad m => (f :*: g) (m a) -> m ((f :*: g) a) #

(Traversable f, Traversable g) => Traversable (f :+: g) 
Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f0 => (a -> f0 b) -> (f :+: g) a -> f0 ((f :+: g) b) #

sequenceA :: Applicative f0 => (f :+: g) (f0 a) -> f0 ((f :+: g) a) #

mapM :: Monad m => (a -> m b) -> (f :+: g) a -> m ((f :+: g) b) #

sequence :: Monad m => (f :+: g) (m a) -> m ((f :+: g) a) #

Traversable (K1 i c :: Type -> Type) 
Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> K1 i c a -> f (K1 i c b) #

sequenceA :: Applicative f => K1 i c (f a) -> f (K1 i c a) #

mapM :: Monad m => (a -> m b) -> K1 i c a -> m (K1 i c b) #

sequence :: Monad m => K1 i c (m a) -> m (K1 i c a) #

(Traversable f, Traversable g) => Traversable (Compose f g) 
Instance details

Defined in Data.Functor.Compose

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Compose f g a -> f0 (Compose f g b) #

sequenceA :: Applicative f0 => Compose f g (f0 a) -> f0 (Compose f g a) #

mapM :: Monad m => (a -> m b) -> Compose f g a -> m (Compose f g b) #

sequence :: Monad m => Compose f g (m a) -> m (Compose f g a) #

(Traversable f, Traversable g) => Traversable (f :.: g) 
Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f0 => (a -> f0 b) -> (f :.: g) a -> f0 ((f :.: g) b) #

sequenceA :: Applicative f0 => (f :.: g) (f0 a) -> f0 ((f :.: g) a) #

mapM :: Monad m => (a -> m b) -> (f :.: g) a -> m ((f :.: g) b) #

sequence :: Monad m => (f :.: g) (m a) -> m ((f :.: g) a) #

Traversable f => Traversable (M1 i c f) 
Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f0 => (a -> f0 b) -> M1 i c f a -> f0 (M1 i c f b) #

sequenceA :: Applicative f0 => M1 i c f (f0 a) -> f0 (M1 i c f a) #

mapM :: Monad m => (a -> m b) -> M1 i c f a -> m (M1 i c f b) #

sequence :: Monad m => M1 i c f (m a) -> m (M1 i c f a) #

optional :: Alternative f => f a -> f (Maybe a) #

(>>>) :: forall {k} cat (a :: k) (b :: k) (c :: k). Category cat => cat a b -> cat b c -> cat a c #

(<$!>) :: Monad m => (a -> b) -> m a -> m b #

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

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

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

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

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

forever :: Applicative f => f a -> f b #

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

mfilter :: MonadPlus m => (a -> Bool) -> m a -> m a #

replicateM_ :: Applicative m => Int -> m a -> m () #

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

zipWithM :: Applicative m => (a -> b -> m c) -> [a] -> [b] -> m [c] #

zipWithM_ :: Applicative m => (a -> b -> m c) -> [a] -> [b] -> m () #

all :: Foldable t => (a -> Bool) -> t a -> Bool #

and :: Foldable t => t Bool -> Bool #

any :: Foldable t => (a -> Bool) -> t a -> Bool #

asum :: (Foldable t, Alternative f) => t (f a) -> f a #

concat :: Foldable t => t [a] -> [a] #

concatMap :: Foldable t => (a -> [b]) -> t a -> [b] #

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

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

msum :: (Foldable t, MonadPlus m) => t (m a) -> m a #

notElem :: (Foldable t, Eq a) => a -> t a -> Bool #

or :: Foldable t => t Bool -> Bool #

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

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

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

forM :: (Traversable t, Monad m) => t a -> (a -> m b) -> m (t b) #

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

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

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

liftA :: Applicative f => (a -> b) -> f a -> f b #

liftA3 :: Applicative f => (a -> b -> c -> d) -> f a -> f b -> f c -> f d #

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

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

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

break :: (a -> Bool) -> [a] -> ([a], [a]) #

drop :: Int -> [a] -> [a] #

dropWhile :: (a -> Bool) -> [a] -> [a] #

replicate :: Int -> a -> [a] #

reverse :: [a] -> [a] #

span :: (a -> Bool) -> [a] -> ([a], [a]) #

take :: Int -> [a] -> [a] #

takeWhile :: (a -> Bool) -> [a] -> [a] #

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

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

class Category a => Arrow (a :: Type -> Type -> Type) where #

Minimal complete definition

arr, (first | (***))

Methods

(***) :: a b c -> a b' c' -> a (b, b') (c, c') #

(&&&) :: a b c -> a b c' -> a b (c, c') #

Instances

Instances details
Monad m => Arrow (Kleisli m) 
Instance details

Defined in Control.Arrow

Methods

arr :: (b -> c) -> Kleisli m b c

first :: Kleisli m b c -> Kleisli m (b, d) (c, d)

second :: Kleisli m b c -> Kleisli m (d, b) (d, c)

(***) :: Kleisli m b c -> Kleisli m b' c' -> Kleisli m (b, b') (c, c') #

(&&&) :: Kleisli m b c -> Kleisli m b c' -> Kleisli m b (c, c') #

Applicative f => Arrow (A f) 
Instance details

Defined in Options.Applicative.Arrows

Methods

arr :: (b -> c) -> A f b c

first :: A f b c -> A f (b, d) (c, d)

second :: A f b c -> A f (d, b) (d, c)

(***) :: A f b c -> A f b' c' -> A f (b, b') (c, c') #

(&&&) :: A f b c -> A f b c' -> A f b (c, c') #

Arrow (->) 
Instance details

Defined in Control.Arrow

Methods

arr :: (b -> c) -> b -> c

first :: (b -> c) -> (b, d) -> (c, d)

second :: (b -> c) -> (d, b) -> (d, c)

(***) :: (b -> c) -> (b' -> c') -> (b, b') -> (c, c') #

(&&&) :: (b -> c) -> (b -> c') -> b -> (c, c') #

class Monad m => MonadFail (m :: Type -> Type) where #

Methods

fail :: String -> m a #

Instances

Instances details
MonadFail ParsecParser 
Instance details

Defined in Distribution.Parsec

Methods

fail :: String -> ParsecParser a #

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 P 
Instance details

Defined in Text.ParserCombinators.ReadP

Methods

fail :: String -> P a #

MonadFail ReadP 
Instance details

Defined in Text.ParserCombinators.ReadP

Methods

fail :: String -> ReadP a #

MonadFail ReadPrec 
Instance details

Defined in Text.ParserCombinators.ReadPrec

Methods

fail :: String -> ReadPrec a #

MonadFail DList 
Instance details

Defined in Data.DList.Internal

Methods

fail :: String -> DList a #

MonadFail IO 
Instance details

Defined in Control.Monad.Fail

Methods

fail :: String -> IO 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 
Instance details

Defined in Data.Vector

Methods

fail :: String -> Vector a #

MonadFail Vector 
Instance details

Defined in Data.Vector.Strict

Methods

fail :: String -> Vector a #

MonadFail YamlParser 
Instance details

Defined in Data.Yaml.Parser

Methods

fail :: String -> YamlParser a #

MonadFail Stream 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

fail :: String -> Stream a #

MonadFail Maybe 
Instance details

Defined in Control.Monad.Fail

Methods

fail :: String -> Maybe a #

MonadFail [] 
Instance details

Defined in 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 (ZeptoT m) 
Instance details

Defined in Data.Attoparsec.Zepto

Methods

fail :: String -> ZeptoT m a #

Monad m => MonadFail (CatchT m) 
Instance details

Defined in Control.Monad.Catch.Pure

Methods

fail :: String -> CatchT m a #

MonadFail (Parser byteArray) 
Instance details

Defined in Data.ByteArray.Parse

Methods

fail :: String -> Parser byteArray a #

MonadFail m => MonadFail (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

fail :: String -> LoggingT m a #

MonadFail m => MonadFail (NoLoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

fail :: String -> NoLoggingT m a #

MonadFail m => MonadFail (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

fail :: String -> ResourceT m a #

Monad m => MonadFail (QuoteToQuasi m) 
Instance details

Defined in Language.Haskell.TH.Syntax.Compat

Methods

fail :: String -> QuoteToQuasi m a #

Monad m => MonadFail (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

fail :: String -> MaybeT m a #

MonadFail f => MonadFail (Ap f) 
Instance details

Defined in Data.Monoid

Methods

fail :: String -> Ap f a #

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

Defined in Lens.Micro

Methods

fail :: String -> StateT s m 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) 
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 #

class (forall a. Functor (p a)) => Bifunctor (p :: Type -> Type -> Type) where #

Minimal complete definition

bimap | first, second

Methods

bimap :: (a -> b) -> (c -> d) -> p a c -> p b d #

first :: (a -> b) -> p a c -> p b c #

second :: (b -> c) -> p a b -> p a c #

Instances

Instances details
Bifunctor TkArray 
Instance details

Defined in Data.Aeson.Decoding.Tokens

Methods

bimap :: (a -> b) -> (c -> d) -> TkArray a c -> TkArray b d #

first :: (a -> b) -> TkArray a c -> TkArray b c #

second :: (b -> c) -> TkArray a b -> TkArray a c #

Bifunctor TkRecord 
Instance details

Defined in Data.Aeson.Decoding.Tokens

Methods

bimap :: (a -> b) -> (c -> d) -> TkRecord a c -> TkRecord b d #

first :: (a -> b) -> TkRecord a c -> TkRecord b c #

second :: (b -> c) -> TkRecord a b -> TkRecord a c #

Bifunctor Tokens 
Instance details

Defined in Data.Aeson.Decoding.Tokens

Methods

bimap :: (a -> b) -> (c -> d) -> Tokens a c -> Tokens b d #

first :: (a -> b) -> Tokens a c -> Tokens b c #

second :: (b -> c) -> Tokens a b -> Tokens a c #

Bifunctor ConcurrentlyE 
Instance details

Defined in Control.Concurrent.Async.Internal

Methods

bimap :: (a -> b) -> (c -> d) -> ConcurrentlyE a c -> ConcurrentlyE b d #

first :: (a -> b) -> ConcurrentlyE a c -> ConcurrentlyE b c #

second :: (b -> c) -> ConcurrentlyE a b -> ConcurrentlyE a c #

Bifunctor Either 
Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> Either a c -> Either b d #

first :: (a -> b) -> Either a c -> Either b c #

second :: (b -> c) -> Either a b -> Either a c #

Bifunctor Arg 
Instance details

Defined in Data.Semigroup

Methods

bimap :: (a -> b) -> (c -> d) -> Arg a c -> Arg b d #

first :: (a -> b) -> Arg a c -> Arg b c #

second :: (b -> c) -> Arg a b -> Arg a c #

Bifunctor Product 
Instance details

Defined in Data.Aeson.Config.Types

Methods

bimap :: (a -> b) -> (c -> d) -> Product a c -> Product b d #

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

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

Bifunctor Either 
Instance details

Defined in Data.Strict.Either

Methods

bimap :: (a -> b) -> (c -> d) -> Either a c -> Either b d #

first :: (a -> b) -> Either a c -> Either b c #

second :: (b -> c) -> Either a b -> Either a c #

Bifunctor These 
Instance details

Defined in Data.Strict.These

Methods

bimap :: (a -> b) -> (c -> d) -> These a c -> These b d #

first :: (a -> b) -> These a c -> These b c #

second :: (b -> c) -> These a b -> These a c #

Bifunctor Pair 
Instance details

Defined in Data.Strict.Tuple

Methods

bimap :: (a -> b) -> (c -> d) -> Pair a c -> Pair b d #

first :: (a -> b) -> Pair a c -> Pair b c #

second :: (b -> c) -> Pair a b -> Pair a c #

Bifunctor These 
Instance details

Defined in Data.These

Methods

bimap :: (a -> b) -> (c -> d) -> These a c -> These b d #

first :: (a -> b) -> These a c -> These b c #

second :: (b -> c) -> These a b -> These a c #

Bifunctor (,) 
Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> (a, c) -> (b, d) #

first :: (a -> b) -> (a, c) -> (b, c) #

second :: (b -> c) -> (a, b) -> (a, c) #

Bifunctor (Const :: Type -> Type -> Type) 
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 #

Bifunctor (Tagged :: Type -> Type -> Type) 
Instance details

Defined in Data.Tagged

Methods

bimap :: (a -> b) -> (c -> d) -> Tagged a c -> Tagged b d #

first :: (a -> b) -> Tagged a c -> Tagged b c #

second :: (b -> c) -> Tagged a b -> Tagged a c #

Bifunctor (Constant :: Type -> Type -> Type) 
Instance details

Defined in Data.Functor.Constant

Methods

bimap :: (a -> b) -> (c -> d) -> Constant a c -> Constant b d #

first :: (a -> b) -> Constant a c -> Constant b c #

second :: (b -> c) -> Constant a b -> Constant a c #

Bifunctor ((,,) x1) 
Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> (x1, a, c) -> (x1, b, d) #

first :: (a -> b) -> (x1, a, c) -> (x1, b, c) #

second :: (b -> c) -> (x1, a, b) -> (x1, a, c) #

Bifunctor (K1 i :: Type -> Type -> Type) 
Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> K1 i a c -> K1 i b d #

first :: (a -> b) -> K1 i a c -> K1 i b c #

second :: (b -> c) -> K1 i a b -> K1 i a c #

Bifunctor ((,,,) x1 x2) 
Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> (x1, x2, a, c) -> (x1, x2, b, d) #

first :: (a -> b) -> (x1, x2, a, c) -> (x1, x2, b, c) #

second :: (b -> c) -> (x1, x2, a, b) -> (x1, x2, a, c) #

Bifunctor ((,,,,) x1 x2 x3) 
Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> (x1, x2, x3, a, c) -> (x1, x2, x3, b, d) #

first :: (a -> b) -> (x1, x2, x3, a, c) -> (x1, x2, x3, b, c) #

second :: (b -> c) -> (x1, x2, x3, a, b) -> (x1, x2, x3, a, c) #

Bifunctor ((,,,,,) x1 x2 x3 x4) 
Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> (x1, x2, x3, x4, a, c) -> (x1, x2, x3, x4, b, d) #

first :: (a -> b) -> (x1, x2, x3, x4, a, c) -> (x1, x2, x3, x4, b, c) #

second :: (b -> c) -> (x1, x2, x3, x4, a, b) -> (x1, x2, x3, x4, a, c) #

Bifunctor ((,,,,,,) x1 x2 x3 x4 x5) 
Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> (x1, x2, x3, x4, x5, a, c) -> (x1, x2, x3, x4, x5, b, d) #

first :: (a -> b) -> (x1, x2, x3, x4, x5, a, c) -> (x1, x2, x3, x4, x5, b, c) #

second :: (b -> c) -> (x1, x2, x3, x4, x5, a, b) -> (x1, x2, x3, x4, x5, a, c) #

newtype Const a (b :: k) #

Constructors

Const 

Fields

Instances

Instances details
Generic1 (Const a :: k -> Type) 
Instance details

Defined in Data.Functor.Const

Associated Types

type Rep1 (Const a :: k -> Type) 
Instance details

Defined in Data.Functor.Const

type Rep1 (Const a :: k -> Type) = D1 ('MetaData "Const" "Data.Functor.Const" "base" '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

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) 
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) 
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) 
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) 
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) 
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) 
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) 
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) 
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

Foldable (Const m :: Type -> Type) 
Instance details

Defined in 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 #

Eq a => Eq1 (Const a :: Type -> Type) 
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) 
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) 
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) 
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

Traversable (Const m :: Type -> Type) 
Instance details

Defined in 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) #

Monoid m => Applicative (Const m :: Type -> Type) 
Instance details

Defined in 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) 
Instance details

Defined in Data.Functor.Const

Methods

fmap :: (a -> b) -> Const m a -> Const m b #

(<$) :: a -> Const m b -> Const m a #

NFData a => NFData1 (Const a :: Type -> Type) 
Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a0 -> ()) -> Const a a0 -> ()

GFoldable (Const m :: Type -> Type) 
Instance details

Defined in Generics.Deriving.Foldable

Methods

gfoldMap :: Monoid m0 => (a -> m0) -> Const m a -> m0

gfold :: Monoid m0 => Const m m0 -> m0

gfoldr :: (a -> b -> b) -> b -> Const m a -> b

gfoldr' :: (a -> b -> b) -> b -> Const m a -> b

gfoldl :: (a -> b -> a) -> a -> Const m b -> a

gfoldl' :: (a -> b -> a) -> a -> Const m b -> a

gfoldr1 :: (a -> a -> a) -> Const m a -> a

gfoldl1 :: (a -> a -> a) -> Const m a -> a

GFunctor (Const m :: Type -> Type) 
Instance details

Defined in Generics.Deriving.Functor

Methods

gmap :: (a -> b) -> Const m a -> Const m b

GTraversable (Const m :: Type -> Type) 
Instance details

Defined in Generics.Deriving.Traversable

Methods

gtraverse :: Applicative f => (a -> f b) -> Const m a -> f (Const m b)

gsequenceA :: Applicative f => Const m (f a) -> f (Const m a)

gmapM :: Monad m0 => (a -> m0 b) -> Const m a -> m0 (Const m b)

gsequence :: 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

Methods

parseJSON :: Value -> Parser (Const a b)

parseJSONList :: Value -> Parser [Const a b]

omittedField :: Maybe (Const a b)

(FromJSON a, FromJSONKey a) => FromJSONKey (Const a b) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction (Const a b)

fromJSONKeyList :: FromJSONKeyFunction [Const a b]

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

Methods

toJSONKey :: ToJSONKeyFunction (Const a b)

toJSONKeyList :: ToJSONKeyFunction [Const a b]

(Typeable k, Data a, Typeable b) => Data (Const a b) 
Instance details

Defined in 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) 
Instance details

Defined in Data.String

Methods

fromString :: String -> Const a b #

Storable a => Storable (Const a b) 
Instance details

Defined in 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 ()

Monoid a => Monoid (Const a b) 
Instance details

Defined in 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) 
Instance details

Defined in 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) 
Instance details

Defined in 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) 
Instance details

Defined in Data.Functor.Const

Bounded a => Bounded (Const a b) 
Instance details

Defined in Data.Functor.Const

Methods

minBound :: Const a b #

maxBound :: Const a b #

Enum a => Enum (Const a b) 
Instance details

Defined in 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) 
Instance details

Defined in 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) 
Instance details

Defined in 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 #

Generic (Const a b) 
Instance details

Defined in Data.Functor.Const

Associated Types

type Rep (Const a b) 
Instance details

Defined in Data.Functor.Const

type Rep (Const a b) = D1 ('MetaData "Const" "Data.Functor.Const" "base" '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) 
Instance details

Defined in 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) 
Instance details

Defined in 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) 
Instance details

Defined in Data.Functor.Const

Methods

readsPrec :: Int -> ReadS (Const a b)

readList :: ReadS [Const a b]

readPrec :: ReadPrec (Const a b)

readListPrec :: ReadPrec [Const a b]

Fractional a => Fractional (Const a b) 
Instance details

Defined in 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) 
Instance details

Defined in 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) 
Instance details

Defined in Data.Functor.Const

Methods

toRational :: Const a b -> Rational #

RealFrac a => RealFrac (Const a b) 
Instance details

Defined in 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) 
Instance details

Defined in Data.Functor.Const

Methods

showsPrec :: Int -> Const a b -> ShowS

show :: Const a b -> String #

showList :: [Const a b] -> ShowS

NFData a => NFData (Const a b) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Const a b -> () #

GEnum a => GEnum (Const a b) 
Instance details

Defined in Generics.Deriving.Enum

Methods

genum :: [Const a b]

GEq a => GEq (Const a b) 
Instance details

Defined in Generics.Deriving.Eq

Methods

geq :: Const a b -> Const a b -> Bool

GMonoid a => GMonoid (Const a b) 
Instance details

Defined in Generics.Deriving.Monoid.Internal

Methods

gmempty :: Const a b

gmappend :: Const a b -> Const a b -> Const a b

gmconcat :: [Const a b] -> Const a b

GShow a => GShow (Const a b) 
Instance details

Defined in Generics.Deriving.Show

Methods

gshowsPrec :: Int -> Const a b -> ShowS

gshows :: Const a b -> ShowS

gshow :: Const a b -> String

gshowList :: [Const a b] -> ShowS

Eq a => Eq (Const a b) 
Instance details

Defined in Data.Functor.Const

Methods

(==) :: Const a b -> Const a b -> Bool #

(/=) :: Const a b -> Const a b -> Bool #

Ord a => Ord (Const a b) 
Instance details

Defined in 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

FromHttpApiData a => FromHttpApiData (Const a b) 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData a => ToHttpApiData (Const a b) 
Instance details

Defined in Web.Internal.HttpApiData

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

type Rep1 (Const a :: k -> Type) 
Instance details

Defined in Data.Functor.Const

type Rep1 (Const a :: k -> Type) = D1 ('MetaData "Const" "Data.Functor.Const" "base" '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) 
Instance details

Defined in Data.Functor.Const

type Rep (Const a b) = D1 ('MetaData "Const" "Data.Functor.Const" "base" 'True) (C1 ('MetaCons "Const" 'PrefixI 'True) (S1 ('MetaSel ('Just "getConst") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 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 Applicative f => Alternative (f :: Type -> Type) where #

Minimal complete definition

empty, (<|>)

Methods

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

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

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

Instances

Instances details
Alternative Match 
Instance details

Defined in Distribution.Simple.BuildTarget

Methods

empty :: Match a

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

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

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

Alternative ParsecParser 
Instance details

Defined in Distribution.Parsec

Methods

empty :: ParsecParser a

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

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

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

Alternative Condition 
Instance details

Defined in Distribution.Types.Condition

Methods

empty :: Condition a

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

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

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

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 Concurrently 
Instance details

Defined in Control.Concurrent.Async.Internal

Methods

empty :: Concurrently a

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

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

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

Alternative ZipList 
Instance details

Defined in Control.Applicative

Methods

empty :: ZipList a

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

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

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

Alternative STM 
Instance details

Defined in GHC.Conc.Sync

Methods

empty :: STM a

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

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

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

Alternative P 
Instance details

Defined in 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 
Instance details

Defined in Text.ParserCombinators.ReadP

Methods

empty :: ReadP a

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

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

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

Alternative ReadPrec 
Instance details

Defined in Text.ParserCombinators.ReadPrec

Methods

empty :: ReadPrec a

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

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

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

Alternative Seq 
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 IO 
Instance details

Defined in GHC.Base

Methods

empty :: IO a

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

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

many :: IO a -> IO [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

Methods

empty :: Completion a

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

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

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

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 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

Methods

empty :: SmallArray a

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

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

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

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 Vector 
Instance details

Defined in Data.Vector.Strict

Methods

empty :: Vector a

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

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

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

Alternative YamlParser 
Instance details

Defined in Data.Yaml.Parser

Methods

empty :: YamlParser a

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

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

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

Alternative Maybe 
Instance details

Defined in GHC.Base

Methods

empty :: Maybe a

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

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

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

Alternative [] 
Instance details

Defined in GHC.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] #

Monad m => Alternative (ZeptoT m) 
Instance details

Defined in Data.Attoparsec.Zepto

Methods

empty :: ZeptoT m a

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

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

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

MonadPlus m => Alternative (WrappedMonad m) 
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] #

ArrowPlus a => Alternative (ArrowMonad a) 
Instance details

Defined in 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) 
Instance details

Defined in 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) 
Instance details

Defined in GHC.Generics

Methods

empty :: U1 a

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

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

many :: U1 a -> U1 [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 (Parser byteArray) 
Instance details

Defined in Data.ByteArray.Parse

Methods

empty :: Parser byteArray a

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

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

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

Alternative m => Alternative (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

empty :: LoggingT m a

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

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

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

Alternative m => Alternative (NoLoggingT m) 
Instance details

Defined in Control.Monad.Logger

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] #

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] #

Alternative m => Alternative (ResourceT m) 
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] #

Alternative f => Alternative (Lift f) 
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) 
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) 
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] #

Monoid fail => Alternative (Progress step fail) 
Instance details

Defined in Distribution.Utils.Progress

Methods

empty :: Progress step fail a

(<|>) :: Progress step fail a -> Progress step fail a -> Progress step fail a #

some :: Progress step fail a -> Progress step fail [a] #

many :: Progress step fail a -> Progress step fail [a] #

(ArrowZero a, ArrowPlus a) => Alternative (WrappedArrow a b) 
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] #

Alternative m => Alternative (Kleisli m a) 
Instance details

Defined in 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) 
Instance details

Defined in 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) 
Instance details

Defined in 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) 
Instance details

Defined in GHC.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) 
Instance details

Defined in GHC.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 f => Alternative (Backwards 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) 
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) 
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) 
Instance details

Defined in GHC.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) 
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) 
Instance details

Defined in GHC.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) 
Instance details

Defined in GHC.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] #

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

Minimal complete definition

pure, ((<*>) | liftA2)

Methods

pure :: a -> f a #

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

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

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

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

Instances

Instances details
Applicative InstM 
Instance details

Defined in Distribution.Backpack.ReadyComponent

Methods

pure :: a -> InstM a #

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

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

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

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

Applicative Match 
Instance details

Defined in Distribution.Simple.BuildTarget

Methods

pure :: a -> Match a #

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

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

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

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

Applicative Flag 
Instance details

Defined in Distribution.Simple.Flag

Methods

pure :: a -> Flag a #

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

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

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

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

Applicative LogProgress 
Instance details

Defined in Distribution.Utils.LogProgress

Methods

pure :: a -> LogProgress a #

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

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

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

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

Applicative Lex 
Instance details

Defined in Distribution.Fields.LexerMonad

Methods

pure :: a -> Lex a #

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

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

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

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

Applicative ParseResult 
Instance details

Defined in Distribution.Fields.ParseResult

Methods

pure :: a -> ParseResult a #

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

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

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

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

Applicative ParsecParser 
Instance details

Defined in Distribution.Parsec

Methods

pure :: a -> ParsecParser a #

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

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

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

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

Applicative Condition 
Instance details

Defined in Distribution.Types.Condition

Methods

pure :: a -> Condition a #

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

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

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

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

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 Concurrently 
Instance details

Defined in Control.Concurrent.Async.Internal

Methods

pure :: a -> Concurrently a #

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

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

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

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

Applicative ZipList 
Instance details

Defined in Control.Applicative

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 Complex 
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 Identity 
Instance details

Defined in 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 
Instance details

Defined in 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 
Instance details

Defined in 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 
Instance details

Defined in 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 First 
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 
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 
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 
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 Dual 
Instance details

Defined in 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 
Instance details

Defined in 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 
Instance details

Defined in 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 NonEmpty 
Instance details

Defined in GHC.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 
Instance details

Defined in GHC.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 NoIO 
Instance details

Defined in GHC.GHCi

Methods

pure :: a -> NoIO a #

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

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

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

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

Applicative Par1 
Instance details

Defined in GHC.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 
Instance details

Defined in 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 
Instance details

Defined in 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 ReadPrec 
Instance details

Defined in Text.ParserCombinators.ReadPrec

Methods

pure :: a -> ReadPrec a #

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

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

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

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

Applicative Put 
Instance details

Defined in Data.ByteString.Builder.Internal

Methods

pure :: a -> Put a #

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

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

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

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

Applicative Seq 
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

Methods

pure :: a -> CryptoFailable a #

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

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

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

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

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 IO 
Instance details

Defined in GHC.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 SubM 
Instance details

Defined in Text.Mustache.Internal.Types

Methods

pure :: a -> SubM a #

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

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

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

(<*) :: SubM a -> SubM b -> SubM 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

Methods

pure :: a -> ParserResult a #

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

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

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

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

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 Unresolved 
Instance details

Defined in Pantry.Types

Methods

pure :: a -> Unresolved a #

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

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

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

(<*) :: Unresolved a -> Unresolved b -> Unresolved 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 PprM 
Instance details

Defined in Language.Haskell.TH.PprLib

Methods

pure :: a -> PprM a #

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

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

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

(<*) :: PprM a -> PprM b -> PprM 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 Cleanup 
Instance details

Defined in System.Process.Typed.Internal

Methods

pure :: a -> Cleanup a #

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

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

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

(<*) :: Cleanup a -> Cleanup b -> Cleanup 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 Memoized 
Instance details

Defined in UnliftIO.Memoize

Methods

pure :: a -> Memoized a #

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

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

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

(<*) :: Memoized a -> Memoized b -> Memoized 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 Id 
Instance details

Defined in Data.Vector.Fusion.Util

Methods

pure :: a -> Id a #

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

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

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

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

Applicative Vector 
Instance details

Defined in Data.Vector.Strict

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 YamlParser 
Instance details

Defined in Data.Yaml.Parser

Methods

pure :: a -> YamlParser a #

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

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

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

(<*) :: YamlParser a -> YamlParser b -> YamlParser 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 
Instance details

Defined in GHC.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 
Instance details

Defined in GHC.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 [] 
Instance details

Defined in GHC.Base

Methods

pure :: a -> [a] #

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

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

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

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

Applicative (FieldDescrs s) 
Instance details

Defined in Distribution.FieldGrammar.FieldDescrs

Methods

pure :: a -> FieldDescrs s a #

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

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

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

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

Applicative (ParsecFieldGrammar s) 
Instance details

Defined in Distribution.FieldGrammar.Parsec

Methods

pure :: a -> ParsecFieldGrammar s a #

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

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

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

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

Applicative (PrettyFieldGrammar s) 
Instance details

Defined in Distribution.FieldGrammar.Pretty

Methods

pure :: a -> PrettyFieldGrammar s a #

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

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

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

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

Applicative (ConcurrentlyE e) 
Instance details

Defined in Control.Concurrent.Async.Internal

Methods

pure :: a -> ConcurrentlyE e a #

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

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

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

(<*) :: ConcurrentlyE e a -> ConcurrentlyE e b -> ConcurrentlyE e 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 (ZeptoT m) 
Instance details

Defined in Data.Attoparsec.Zepto

Methods

pure :: a -> ZeptoT m a #

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

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

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

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

Monad m => Applicative (WrappedMonad m) 
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 #

Arrow a => Applicative (ArrowMonad a) 
Instance details

Defined in 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) 
Instance details

Defined in 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 (StateL s) 
Instance details

Defined in Data.Functor.Utils

Methods

pure :: a -> StateL s a #

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

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

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

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

Applicative (StateR s) 
Instance details

Defined in Data.Functor.Utils

Methods

pure :: a -> StateR s a #

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

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

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

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

Applicative (Proxy :: Type -> Type) 
Instance details

Defined in 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) 
Instance details

Defined in GHC.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 (ST s) 
Instance details

Defined in GHC.ST

Methods

pure :: a -> ST s a #

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

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

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

(<*) :: ST s a -> ST s b -> ST s 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 #

DRG gen => Applicative (MonadPseudoRandom gen) 
Instance details

Defined in Crypto.Random.Types

Methods

pure :: a -> MonadPseudoRandom gen a #

(<*>) :: MonadPseudoRandom gen (a -> b) -> MonadPseudoRandom gen a -> MonadPseudoRandom gen b #

liftA2 :: (a -> b -> c) -> MonadPseudoRandom gen a -> MonadPseudoRandom gen b -> MonadPseudoRandom gen c #

(*>) :: MonadPseudoRandom gen a -> MonadPseudoRandom gen b -> MonadPseudoRandom gen b #

(<*) :: MonadPseudoRandom gen a -> MonadPseudoRandom gen b -> MonadPseudoRandom gen 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 #

Applicative (Parser byteArray) 
Instance details

Defined in Data.ByteArray.Parse

Methods

pure :: a -> Parser byteArray a #

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

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

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

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

Applicative m => Applicative (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

pure :: a -> LoggingT m a #

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

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

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

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

Applicative m => Applicative (NoLoggingT m) 
Instance details

Defined in Control.Monad.Logger

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 m => Applicative (WriterLoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

pure :: a -> WriterLoggingT m a #

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

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

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

(<*) :: WriterLoggingT m a -> WriterLoggingT m b -> WriterLoggingT m 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 #

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 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 (MemoizedWith env) Source # 
Instance details

Defined in Stack.Types.Package

Methods

pure :: a -> MemoizedWith env a #

(<*>) :: MemoizedWith env (a -> b) -> MemoizedWith env a -> MemoizedWith env b #

liftA2 :: (a -> b -> c) -> MemoizedWith env a -> MemoizedWith env b -> MemoizedWith env c #

(*>) :: MemoizedWith env a -> MemoizedWith env b -> MemoizedWith env b #

(<*) :: MemoizedWith env a -> MemoizedWith env b -> MemoizedWith env 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 #

Applicative m => Applicative (QuoteToQuasi m) 
Instance details

Defined in Language.Haskell.TH.Syntax.Compat

Methods

pure :: a -> QuoteToQuasi m a #

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

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

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

(<*) :: QuoteToQuasi m a -> QuoteToQuasi m b -> QuoteToQuasi m 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) 
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) 
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) 
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) 
Instance details

Defined in GHC.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) #

Monad m => Applicative (StateM s m) 
Instance details

Defined in Distribution.Utils.MapAccum

Methods

pure :: a -> StateM s m a #

(<*>) :: StateM s m (a -> b) -> StateM s m a -> StateM s m b #

liftA2 :: (a -> b -> c) -> StateM s m a -> StateM s m b -> StateM s m c #

(*>) :: StateM s m a -> StateM s m b -> StateM s m b #

(<*) :: StateM s m a -> StateM s m b -> StateM s m a #

Applicative (Progress step fail) 
Instance details

Defined in Distribution.Utils.Progress

Methods

pure :: a -> Progress step fail a #

(<*>) :: Progress step fail (a -> b) -> Progress step fail a -> Progress step fail b #

liftA2 :: (a -> b -> c) -> Progress step fail a -> Progress step fail b -> Progress step fail c #

(*>) :: Progress step fail a -> Progress step fail b -> Progress step fail b #

(<*) :: Progress step fail a -> Progress step fail b -> Progress step fail a #

Arrow a => Applicative (WrappedArrow a b) 
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 #

Applicative m => Applicative (Kleisli m a) 
Instance details

Defined in 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) 
Instance details

Defined in 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 #

Monad m => Applicative (StateT s m) 
Instance details

Defined in Data.Functor.Utils

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 #

Applicative f => Applicative (Ap f) 
Instance details

Defined in 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) 
Instance details

Defined in 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) 
Instance details

Defined in GHC.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) 
Instance details

Defined in GHC.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 #

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) 
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 #

Applicative (Bazaar a b) 
Instance details

Defined in Lens.Micro

Methods

pure :: a0 -> Bazaar a b a0 #

(<*>) :: Bazaar a b (a0 -> b0) -> Bazaar a b a0 -> Bazaar a b b0 #

liftA2 :: (a0 -> b0 -> c) -> Bazaar a b a0 -> Bazaar a b b0 -> Bazaar a b c #

(*>) :: Bazaar a b a0 -> Bazaar a b b0 -> Bazaar a b b0 #

(<*) :: Bazaar a b a0 -> Bazaar a b b0 -> Bazaar a b a0 #

(Functor m, Monad m) => Applicative (StateT s m) 
Instance details

Defined in Lens.Micro

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 #

(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) 
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) 
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 (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) 
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) 
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) 
Instance details

Defined in GHC.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) 
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 f, Applicative g) => Applicative (f :*: g) 
Instance details

Defined in GHC.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) 
Instance details

Defined in GHC.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 (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) 
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) 
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 #

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) 
Instance details

Defined in GHC.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) 
Instance details

Defined in GHC.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) 
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 #

(Applicative f, Applicative g) => Applicative (f :.: g) 
Instance details

Defined in GHC.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) 
Instance details

Defined in GHC.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 #

(Monad f, Applicative f) => Applicative (WhenMatched f k x y) 
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 #

(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 #

(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 #

Minimal complete definition

fmap

Methods

fmap :: (a -> b) -> f a -> f b #

(<$) :: a -> f b -> f a #

Instances

Instances details
Functor InstM 
Instance details

Defined in Distribution.Backpack.ReadyComponent

Methods

fmap :: (a -> b) -> InstM a -> InstM b #

(<$) :: a -> InstM b -> InstM a #

Functor ReadE 
Instance details

Defined in Distribution.ReadE

Methods

fmap :: (a -> b) -> ReadE a -> ReadE b #

(<$) :: a -> ReadE b -> ReadE a #

Functor Match 
Instance details

Defined in Distribution.Simple.BuildTarget

Methods

fmap :: (a -> b) -> Match a -> Match b #

(<$) :: a -> Match b -> Match a #

Functor CommandParse 
Instance details

Defined in Distribution.Simple.Command

Methods

fmap :: (a -> b) -> CommandParse a -> CommandParse b #

(<$) :: a -> CommandParse b -> CommandParse a #

Functor Flag 
Instance details

Defined in Distribution.Simple.Flag

Methods

fmap :: (a -> b) -> Flag a -> Flag b #

(<$) :: a -> Flag b -> Flag a #

Functor GlobResult 
Instance details

Defined in Distribution.Simple.Glob

Methods

fmap :: (a -> b) -> GlobResult a -> GlobResult b #

(<$) :: a -> GlobResult b -> GlobResult a #

Functor InstallDirs 
Instance details

Defined in Distribution.Simple.InstallDirs

Methods

fmap :: (a -> b) -> InstallDirs a -> InstallDirs b #

(<$) :: a -> InstallDirs b -> InstallDirs a #

Functor AnnotatedId 
Instance details

Defined in Distribution.Types.AnnotatedId

Methods

fmap :: (a -> b) -> AnnotatedId a -> AnnotatedId b #

(<$) :: a -> AnnotatedId b -> AnnotatedId a #

Functor LogProgress 
Instance details

Defined in Distribution.Utils.LogProgress

Methods

fmap :: (a -> b) -> LogProgress a -> LogProgress b #

(<$) :: a -> LogProgress b -> LogProgress a #

Functor Last' 
Instance details

Defined in Distribution.Compat.Semigroup

Methods

fmap :: (a -> b) -> Last' a -> Last' b #

(<$) :: a -> Last' b -> Last' a #

Functor Option' 
Instance details

Defined in Distribution.Compat.Semigroup

Methods

fmap :: (a -> b) -> Option' a -> Option' b #

(<$) :: a -> Option' b -> Option' a #

Functor PerCompilerFlavor 
Instance details

Defined in Distribution.Compiler

Methods

fmap :: (a -> b) -> PerCompilerFlavor a -> PerCompilerFlavor b #

(<$) :: a -> PerCompilerFlavor b -> PerCompilerFlavor a #

Functor NamelessField 
Instance details

Defined in Distribution.FieldGrammar.Parsec

Methods

fmap :: (a -> b) -> NamelessField a -> NamelessField b #

(<$) :: a -> NamelessField b -> NamelessField a #

Functor Section 
Instance details

Defined in Distribution.FieldGrammar.Parsec

Methods

fmap :: (a -> b) -> Section a -> Section b #

(<$) :: a -> Section b -> Section a #

Functor Field 
Instance details

Defined in Distribution.Fields.Field

Methods

fmap :: (a -> b) -> Field a -> Field b #

(<$) :: a -> Field b -> Field a #

Functor FieldLine 
Instance details

Defined in Distribution.Fields.Field

Methods

fmap :: (a -> b) -> FieldLine a -> FieldLine b #

(<$) :: a -> FieldLine b -> FieldLine a #

Functor Name 
Instance details

Defined in Distribution.Fields.Field

Methods

fmap :: (a -> b) -> Name a -> Name b #

(<$) :: a -> Name b -> Name a #

Functor SectionArg 
Instance details

Defined in Distribution.Fields.Field

Methods

fmap :: (a -> b) -> SectionArg a -> SectionArg b #

(<$) :: a -> SectionArg b -> SectionArg a #

Functor Lex 
Instance details

Defined in Distribution.Fields.LexerMonad

Methods

fmap :: (a -> b) -> Lex a -> Lex b #

(<$) :: a -> Lex b -> Lex a #

Functor ParseResult 
Instance details

Defined in Distribution.Fields.ParseResult

Methods

fmap :: (a -> b) -> ParseResult a -> ParseResult b #

(<$) :: a -> ParseResult b -> ParseResult a #

Functor PrettyField 
Instance details

Defined in Distribution.Fields.Pretty

Methods

fmap :: (a -> b) -> PrettyField a -> PrettyField b #

(<$) :: a -> PrettyField b -> PrettyField a #

Functor ParsecParser 
Instance details

Defined in Distribution.Parsec

Methods

fmap :: (a -> b) -> ParsecParser a -> ParsecParser b #

(<$) :: a -> ParsecParser b -> ParsecParser a #

Functor Condition 
Instance details

Defined in Distribution.Types.Condition

Methods

fmap :: (a -> b) -> Condition a -> Condition b #

(<$) :: a -> Condition b -> Condition a #

Functor VersionRangeF 
Instance details

Defined in Distribution.Types.VersionRange.Internal

Methods

fmap :: (a -> b) -> VersionRangeF a -> VersionRangeF b #

(<$) :: a -> VersionRangeF b -> VersionRangeF 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 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fmap :: (a -> b) -> FromJSONKeyFunction a -> FromJSONKeyFunction b #

(<$) :: a -> FromJSONKeyFunction b -> FromJSONKeyFunction a #

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 Doc 
Instance details

Defined in Text.PrettyPrint.Annotated.Leijen

Methods

fmap :: (a -> b) -> Doc a -> Doc b #

(<$) :: a -> Doc b -> Doc a #

Functor SimpleDoc 
Instance details

Defined in Text.PrettyPrint.Annotated.Leijen

Methods

fmap :: (a -> b) -> SimpleDoc a -> SimpleDoc b #

(<$) :: a -> SimpleDoc b -> SimpleDoc a #

Functor Async 
Instance details

Defined in Control.Concurrent.Async.Internal

Methods

fmap :: (a -> b) -> Async a -> Async b #

(<$) :: a -> Async b -> Async a #

Functor Concurrently 
Instance details

Defined in Control.Concurrent.Async.Internal

Methods

fmap :: (a -> b) -> Concurrently a -> Concurrently b #

(<$) :: a -> Concurrently b -> Concurrently a #

Functor Result 
Instance details

Defined in Data.Attoparsec.ByteString.Lazy

Methods

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

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

Functor Result 
Instance details

Defined in Data.Attoparsec.Text.Lazy

Methods

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

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

Functor ZipList 
Instance details

Defined in Control.Applicative

Methods

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

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

Functor Handler 
Instance details

Defined in Control.Exception

Methods

fmap :: (a -> b) -> Handler a -> Handler b #

(<$) :: a -> Handler b -> Handler a #

Functor Complex 
Instance details

Defined in Data.Complex

Methods

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

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

Functor Identity 
Instance details

Defined in Data.Functor.Identity

Methods

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

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

Functor First 
Instance details

Defined in Data.Monoid

Methods

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

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

Functor Last 
Instance details

Defined in Data.Monoid

Methods

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

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

Functor Down 
Instance details

Defined in Data.Ord

Methods

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

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

Functor First 
Instance details

Defined in Data.Semigroup

Methods

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

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

Functor Last 
Instance details

Defined in Data.Semigroup

Methods

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

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

Functor Max 
Instance details

Defined in Data.Semigroup

Methods

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

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

Functor Min 
Instance details

Defined in Data.Semigroup

Methods

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

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

Functor Dual 
Instance details

Defined in Data.Semigroup.Internal

Methods

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

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

Functor Product 
Instance details

Defined in Data.Semigroup.Internal

Methods

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

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

Functor Sum 
Instance details

Defined in Data.Semigroup.Internal

Methods

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

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

Functor NonEmpty 
Instance details

Defined in GHC.Base

Methods

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

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

Functor STM 
Instance details

Defined in GHC.Conc.Sync

Methods

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

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

Functor NoIO 
Instance details

Defined in GHC.GHCi

Methods

fmap :: (a -> b) -> NoIO a -> NoIO b #

(<$) :: a -> NoIO b -> NoIO a #

Functor Par1 
Instance details

Defined in GHC.Generics

Methods

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

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

Functor ArgDescr 
Instance details

Defined in System.Console.GetOpt

Methods

fmap :: (a -> b) -> ArgDescr a -> ArgDescr b #

(<$) :: a -> ArgDescr b -> ArgDescr a #

Functor ArgOrder 
Instance details

Defined in System.Console.GetOpt

Methods

fmap :: (a -> b) -> ArgOrder a -> ArgOrder b #

(<$) :: a -> ArgOrder b -> ArgOrder a #

Functor OptDescr 
Instance details

Defined in System.Console.GetOpt

Methods

fmap :: (a -> b) -> OptDescr a -> OptDescr b #

(<$) :: a -> OptDescr b -> OptDescr a #

Functor P 
Instance details

Defined in Text.ParserCombinators.ReadP

Methods

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

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

Functor ReadP 
Instance details

Defined in Text.ParserCombinators.ReadP

Methods

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

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

Functor ReadPrec 
Instance details

Defined in Text.ParserCombinators.ReadPrec

Methods

fmap :: (a -> b) -> ReadPrec a -> ReadPrec b #

(<$) :: a -> ReadPrec b -> ReadPrec a #

Functor Put 
Instance details

Defined in Data.ByteString.Builder.Internal

Methods

fmap :: (a -> b) -> Put a -> Put b #

(<$) :: a -> Put b -> Put 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 
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 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 SizedSeq 
Instance details

Defined in GHC.Data.SizedSeq

Methods

fmap :: (a -> b) -> SizedSeq a -> SizedSeq b #

(<$) :: a -> SizedSeq b -> SizedSeq a #

Functor IO 
Instance details

Defined in GHC.Base

Methods

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

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

Functor List 
Instance details

Defined in Data.Aeson.Config.Types

Methods

fmap :: (a -> b) -> List a -> List b #

(<$) :: a -> List b -> List a #

Functor Conditional 
Instance details

Defined in Hpack.Config

Methods

fmap :: (a -> b) -> Conditional a -> Conditional b #

(<$) :: a -> Conditional b -> Conditional a #

Functor Section 
Instance details

Defined in Hpack.Config

Methods

fmap :: (a -> b) -> Section a -> Section b #

(<$) :: a -> Section b -> Section a #

Functor LenientData 
Instance details

Defined in Web.Internal.HttpApiData

Methods

fmap :: (a -> b) -> LenientData a -> LenientData b #

(<$) :: a -> LenientData b -> LenientData a #

Functor HistoriedResponse 
Instance details

Defined in Network.HTTP.Client

Methods

fmap :: (a -> b) -> HistoriedResponse a -> HistoriedResponse b #

(<$) :: a -> HistoriedResponse b -> HistoriedResponse a #

Functor Response 
Instance details

Defined in Network.HTTP.Client.Types

Methods

fmap :: (a -> b) -> Response a -> Response b #

(<$) :: a -> Response b -> Response a #

Functor SubM 
Instance details

Defined in Text.Mustache.Internal.Types

Methods

fmap :: (a -> b) -> SubM a -> SubM b #

(<$) :: a -> SubM b -> SubM 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 Unresolved 
Instance details

Defined in Pantry.Types

Methods

fmap :: (a -> b) -> Unresolved a -> Unresolved b #

(<$) :: a -> Unresolved b -> Unresolved 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 
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 
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 Maybe 
Instance details

Defined in Data.Strict.Maybe

Methods

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

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

Functor PprM 
Instance details

Defined in Language.Haskell.TH.PprLib

Methods

fmap :: (a -> b) -> PprM a -> PprM b #

(<$) :: a -> PprM b -> PprM 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 Cleanup 
Instance details

Defined in System.Process.Typed.Internal

Methods

fmap :: (a -> b) -> Cleanup a -> Cleanup b #

(<$) :: a -> Cleanup b -> Cleanup 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 Memoized 
Instance details

Defined in UnliftIO.Memoize

Methods

fmap :: (a -> b) -> Memoized a -> Memoized b #

(<$) :: a -> Memoized b -> Memoized a #

Functor Vector 
Instance details

Defined in Data.Vector

Methods

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

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

Functor Id 
Instance details

Defined in Data.Vector.Fusion.Util

Methods

fmap :: (a -> b) -> Id a -> Id b #

(<$) :: a -> Id b -> Id a #

Functor Vector 
Instance details

Defined in Data.Vector.Strict

Methods

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

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

Functor YamlParser 
Instance details

Defined in Data.Yaml.Parser

Methods

fmap :: (a -> b) -> YamlParser a -> YamlParser b #

(<$) :: a -> YamlParser b -> YamlParser 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 
Instance details

Defined in GHC.Base

Methods

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

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

Functor Solo 
Instance details

Defined in GHC.Base

Methods

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

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

Functor [] 
Instance details

Defined in GHC.Base

Methods

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

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

Functor (Node k) 
Instance details

Defined in Distribution.Compat.Graph

Methods

fmap :: (a -> b) -> Node k a -> Node k b #

(<$) :: a -> Node k b -> Node k a #

Functor (FieldDescrs s) 
Instance details

Defined in Distribution.FieldGrammar.FieldDescrs

Methods

fmap :: (a -> b) -> FieldDescrs s a -> FieldDescrs s b #

(<$) :: a -> FieldDescrs s b -> FieldDescrs s a #

Functor (ParsecFieldGrammar s) 
Instance details

Defined in Distribution.FieldGrammar.Parsec

Methods

fmap :: (a -> b) -> ParsecFieldGrammar s a -> ParsecFieldGrammar s b #

(<$) :: a -> ParsecFieldGrammar s b -> ParsecFieldGrammar s a #

Functor (PrettyFieldGrammar s) 
Instance details

Defined in Distribution.FieldGrammar.Pretty

Methods

fmap :: (a -> b) -> PrettyFieldGrammar s a -> PrettyFieldGrammar s b #

(<$) :: a -> PrettyFieldGrammar s b -> PrettyFieldGrammar s 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 (ConcurrentlyE e) 
Instance details

Defined in Control.Concurrent.Async.Internal

Methods

fmap :: (a -> b) -> ConcurrentlyE e a -> ConcurrentlyE e b #

(<$) :: a -> ConcurrentlyE e b -> ConcurrentlyE e 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 (ZeptoT m) 
Instance details

Defined in Data.Attoparsec.Zepto

Methods

fmap :: (a -> b) -> ZeptoT m a -> ZeptoT m b #

(<$) :: a -> ZeptoT m b -> ZeptoT m a #

Monad m => Functor (WrappedMonad m) 
Instance details

Defined in Control.Applicative

Methods

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

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

Arrow a => Functor (ArrowMonad a) 
Instance details

Defined in Control.Arrow

Methods

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

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

Functor (Either a) 
Instance details

Defined in Data.Either

Methods

fmap :: (a0 -> b) -> Either a a0 -> Either a b #

(<$) :: a0 -> Either a b -> Either a a0 #

Functor (StateL s) 
Instance details

Defined in Data.Functor.Utils

Methods

fmap :: (a -> b) -> StateL s a -> StateL s b #

(<$) :: a -> StateL s b -> StateL s a #

Functor (StateR s) 
Instance details

Defined in Data.Functor.Utils

Methods

fmap :: (a -> b) -> StateR s a -> StateR s b #

(<$) :: a -> StateR s b -> StateR s a #

Functor (Proxy :: Type -> Type) 
Instance details

Defined in Data.Proxy

Methods

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

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

Functor (Arg a) 
Instance details

Defined in Data.Semigroup

Methods

fmap :: (a0 -> b) -> Arg a a0 -> Arg a b #

(<$) :: a0 -> Arg a b -> Arg a a0 #

Functor (Array i) 
Instance details

Defined in GHC.Arr

Methods

fmap :: (a -> b) -> Array i a -> Array i b #

(<$) :: a -> Array i b -> Array i a #

Functor (U1 :: Type -> Type) 
Instance details

Defined in GHC.Generics

Methods

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

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

Functor (V1 :: Type -> Type) 
Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> V1 a -> V1 b #

(<$) :: a -> V1 b -> V1 a #

Functor (ST s) 
Instance details

Defined in GHC.ST

Methods

fmap :: (a -> b) -> ST s a -> ST s b #

(<$) :: a -> ST s b -> ST s a #

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 #

DRG gen => Functor (MonadPseudoRandom gen) 
Instance details

Defined in Crypto.Random.Types

Methods

fmap :: (a -> b) -> MonadPseudoRandom gen a -> MonadPseudoRandom gen b #

(<$) :: a -> MonadPseudoRandom gen b -> MonadPseudoRandom gen 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 (DbOpenMode mode) 
Instance details

Defined in GHC.Unit.Database

Methods

fmap :: (a -> b) -> DbOpenMode mode a -> DbOpenMode mode b #

(<$) :: a -> DbOpenMode mode b -> DbOpenMode mode a #

Functor (Product a) 
Instance details

Defined in Data.Aeson.Config.Types

Methods

fmap :: (a0 -> b) -> Product a a0 -> Product a b #

(<$) :: a0 -> Product a b -> Product a a0 #

Functor (Parser byteArray) 
Instance details

Defined in Data.ByteArray.Parse

Methods

fmap :: (a -> b) -> Parser byteArray a -> Parser byteArray b #

(<$) :: a -> Parser byteArray b -> Parser byteArray a #

Functor m => Functor (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

fmap :: (a -> b) -> LoggingT m a -> LoggingT m b #

(<$) :: a -> LoggingT m b -> LoggingT m a #

Functor m => Functor (NoLoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

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

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

Functor m => Functor (WriterLoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

fmap :: (a -> b) -> WriterLoggingT m a -> WriterLoggingT m b #

(<$) :: a -> WriterLoggingT m b -> WriterLoggingT m 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 #

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 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 (MonoidMap k) Source # 
Instance details

Defined in Data.Monoid.Map

Methods

fmap :: (a -> b) -> MonoidMap k a -> MonoidMap k b #

(<$) :: a -> MonoidMap k b -> MonoidMap k a #

Functor (MemoizedWith env) Source # 
Instance details

Defined in Stack.Types.Package

Methods

fmap :: (a -> b) -> MemoizedWith env a -> MemoizedWith env b #

(<$) :: a -> MemoizedWith env b -> MemoizedWith env 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 m => Functor (QuoteToQuasi m) 
Instance details

Defined in Language.Haskell.TH.Syntax.Compat

Methods

fmap :: (a -> b) -> QuoteToQuasi m a -> QuoteToQuasi m b #

(<$) :: a -> QuoteToQuasi m b -> QuoteToQuasi m 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 (StreamSpec streamType) 
Instance details

Defined in System.Process.Typed.Internal

Methods

fmap :: (a -> b) -> StreamSpec streamType a -> StreamSpec streamType b #

(<$) :: a -> StreamSpec streamType b -> StreamSpec streamType 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) 
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) 
Instance details

Defined in GHC.Base

Methods

fmap :: (a0 -> b) -> (a, a0) -> (a, b) #

(<$) :: a0 -> (a, b) -> (a, a0) #

Functor m => Functor (StateM s m) 
Instance details

Defined in Distribution.Utils.MapAccum

Methods

fmap :: (a -> b) -> StateM s m a -> StateM s m b #

(<$) :: a -> StateM s m b -> StateM s m a #

Functor (Progress step fail) 
Instance details

Defined in Distribution.Utils.Progress

Methods

fmap :: (a -> b) -> Progress step fail a -> Progress step fail b #

(<$) :: a -> Progress step fail b -> Progress step fail a #

Functor (Pretext a b) 
Instance details

Defined in Distribution.Compat.Lens

Methods

fmap :: (a0 -> b0) -> Pretext a b a0 -> Pretext a b b0 #

(<$) :: a0 -> Pretext a b b0 -> Pretext a b a0 #

Functor (CondBranch v c) 
Instance details

Defined in Distribution.Types.CondTree

Methods

fmap :: (a -> b) -> CondBranch v c a -> CondBranch v c b #

(<$) :: a -> CondBranch v c b -> CondBranch v c a #

Functor (CondTree v c) 
Instance details

Defined in Distribution.Types.CondTree

Methods

fmap :: (a -> b) -> CondTree v c a -> CondTree v c b #

(<$) :: a -> CondTree v c b -> CondTree v c a #

Arrow a => Functor (WrappedArrow a b) 
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 #

Functor m => Functor (Kleisli m a) 
Instance details

Defined in 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) 
Instance details

Defined in Data.Functor.Const

Methods

fmap :: (a -> b) -> Const m a -> Const m b #

(<$) :: a -> Const m b -> Const m a #

Monad m => Functor (StateT s m) 
Instance details

Defined in Data.Functor.Utils

Methods

fmap :: (a -> b) -> StateT s m a -> StateT s m b #

(<$) :: a -> StateT s m b -> StateT s m a #

Functor f => Functor (Ap f) 
Instance details

Defined in Data.Monoid

Methods

fmap :: (a -> b) -> Ap f a -> Ap f b #

(<$) :: a -> Ap f b -> Ap f a #

Functor f => Functor (Alt f) 
Instance details

Defined in 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) 
Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> Generically1 f a -> Generically1 f b #

(<$) :: a -> Generically1 f b -> Generically1 f a #

Functor f => Functor (Rec1 f) 
Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> Rec1 f a -> Rec1 f b #

(<$) :: a -> Rec1 f b -> Rec1 f a #

Functor (URec (Ptr ()) :: Type -> Type) 
Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> URec (Ptr ()) a -> URec (Ptr ()) b #

(<$) :: a -> URec (Ptr ()) b -> URec (Ptr ()) a #

Functor (URec Char :: Type -> Type) 
Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> URec Char a -> URec Char b #

(<$) :: a -> URec Char b -> URec Char a #

Functor (URec Double :: Type -> Type) 
Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> URec Double a -> URec Double b #

(<$) :: a -> URec Double b -> URec Double a #

Functor (URec Float :: Type -> Type) 
Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> URec Float a -> URec Float b #

(<$) :: a -> URec Float b -> URec Float a #

Functor (URec Int :: Type -> Type) 
Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> URec Int a -> URec Int b #

(<$) :: a -> URec Int b -> URec Int a #

Functor (URec Word :: Type -> Type) 
Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> URec Word a -> URec Word b #

(<$) :: a -> URec Word b -> URec Word 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 #

Functor (Step s o) 
Instance details

Defined in Data.Conduit.Internal.Fusion

Methods

fmap :: (a -> b) -> Step s o a -> Step s o b #

(<$) :: a -> Step s o b -> Step s o a #

(Applicative f, Monad f) => Functor (WhenMissing f x) 
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 (Alias deprecated alias) 
Instance details

Defined in Data.Aeson.Config.FromValue

Methods

fmap :: (a -> b) -> Alias deprecated alias a -> Alias deprecated alias b #

(<$) :: a -> Alias deprecated alias b -> Alias deprecated alias a #

Functor (Bazaar a b) 
Instance details

Defined in Lens.Micro

Methods

fmap :: (a0 -> b0) -> Bazaar a b a0 -> Bazaar a b b0 #

(<$) :: a0 -> Bazaar a b b0 -> Bazaar a b a0 #

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

Defined in Lens.Micro

Methods

fmap :: (a -> b) -> StateT s m a -> StateT s m b #

(<$) :: a -> StateT s m b -> StateT s 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) 
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) 
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 (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 (GenEntries tarPath linkTarget) 
Instance details

Defined in Codec.Archive.Tar.Types

Methods

fmap :: (a -> b) -> GenEntries tarPath linkTarget a -> GenEntries tarPath linkTarget b #

(<$) :: a -> GenEntries tarPath linkTarget b -> GenEntries tarPath linkTarget 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) 
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) 
Instance details

Defined in Data.Functor.Reverse

Methods

fmap :: (a -> b) -> Reverse f a -> Reverse f b #

(<$) :: a -> Reverse f b -> Reverse f a #

Monad m => Functor (Bundle m v) 
Instance details

Defined in Data.Vector.Fusion.Bundle.Monadic

Methods

fmap :: (a -> b) -> Bundle m v a -> Bundle m v b #

(<$) :: a -> Bundle m v b -> Bundle m v a #

Functor ((,,) a b) 
Instance details

Defined in GHC.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) 
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) 
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 f, Functor g) => Functor (f :*: g) 
Instance details

Defined in GHC.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) 
Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> (f :+: g) a -> (f :+: g) b #

(<$) :: a -> (f :+: g) b -> (f :+: g) a #

Functor (K1 i c :: Type -> Type) 
Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> K1 i c a -> K1 i c b #

(<$) :: a -> K1 i c b -> K1 i c 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) 
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) 
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 (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) 
Instance details

Defined in GHC.Base

Methods

fmap :: (a0 -> b0) -> (a, b, c, a0) -> (a, b, c, b0) #

(<$) :: a0 -> (a, b, c, b0) -> (a, b, c, a0) #

Functor ((->) r) 
Instance details

Defined in GHC.Base

Methods

fmap :: (a -> b) -> (r -> a) -> r -> b #

(<$) :: a -> (r -> b) -> r -> a #

(Functor f, Functor g) => Functor (Compose f g) 
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 f, Functor g) => Functor (f :.: g) 
Instance details

Defined in GHC.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) 
Instance details

Defined in GHC.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 f => Functor (WhenMatched f k x y) 
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 (CommonOptions asmSources cSources cxxSources jsSources) 
Instance details

Defined in Hpack.Config

Methods

fmap :: (a -> b) -> CommonOptions asmSources cSources cxxSources jsSources a -> CommonOptions asmSources cSources cxxSources jsSources b #

(<$) :: a -> CommonOptions asmSources cSources cxxSources jsSources b -> CommonOptions asmSources cSources cxxSources jsSources a #

Functor (ConditionalSection asmSources cSources cxxSources jsSources) 
Instance details

Defined in Hpack.Config

Methods

fmap :: (a -> b) -> ConditionalSection asmSources cSources cxxSources jsSources a -> ConditionalSection asmSources cSources cxxSources jsSources b #

(<$) :: a -> ConditionalSection asmSources cSources cxxSources jsSources b -> ConditionalSection asmSources cSources cxxSources jsSources a #

Functor (ThenElse asmSources cSources cxxSources jsSources) 
Instance details

Defined in Hpack.Config

Methods

fmap :: (a -> b) -> ThenElse asmSources cSources cxxSources jsSources a -> ThenElse asmSources cSources cxxSources jsSources b #

(<$) :: a -> ThenElse asmSources cSources cxxSources jsSources b -> ThenElse asmSources cSources cxxSources jsSources 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 #

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) 
Instance details

Defined in GHC.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 #

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) 
Instance details

Defined in GHC.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 ((,,,,,,) a b c d e f) 
Instance details

Defined in GHC.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) #

class Applicative m => Monad (m :: Type -> Type) where #

Minimal complete definition

(>>=)

Methods

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

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

return :: a -> m a #

Instances

Instances details
Monad InstM 
Instance details

Defined in Distribution.Backpack.ReadyComponent

Methods

(>>=) :: InstM a -> (a -> InstM b) -> InstM b #

(>>) :: InstM a -> InstM b -> InstM b #

return :: a -> InstM a #

Monad Match 
Instance details

Defined in Distribution.Simple.BuildTarget

Methods

(>>=) :: Match a -> (a -> Match b) -> Match b #

(>>) :: Match a -> Match b -> Match b #

return :: a -> Match a #

Monad LogProgress 
Instance details

Defined in Distribution.Utils.LogProgress

Methods

(>>=) :: LogProgress a -> (a -> LogProgress b) -> LogProgress b #

(>>) :: LogProgress a -> LogProgress b -> LogProgress b #

return :: a -> LogProgress a #

Monad Lex 
Instance details

Defined in Distribution.Fields.LexerMonad

Methods

(>>=) :: Lex a -> (a -> Lex b) -> Lex b #

(>>) :: Lex a -> Lex b -> Lex b #

return :: a -> Lex a #

Monad ParseResult 
Instance details

Defined in Distribution.Fields.ParseResult

Methods

(>>=) :: ParseResult a -> (a -> ParseResult b) -> ParseResult b #

(>>) :: ParseResult a -> ParseResult b -> ParseResult b #

return :: a -> ParseResult a #

Monad ParsecParser 
Instance details

Defined in Distribution.Parsec

Methods

(>>=) :: ParsecParser a -> (a -> ParsecParser b) -> ParsecParser b #

(>>) :: ParsecParser a -> ParsecParser b -> ParsecParser b #

return :: a -> ParsecParser a #

Monad Condition 
Instance details

Defined in Distribution.Types.Condition

Methods

(>>=) :: Condition a -> (a -> Condition b) -> Condition b #

(>>) :: Condition a -> Condition b -> Condition b #

return :: a -> Condition a #

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 
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 Identity 
Instance details

Defined in Data.Functor.Identity

Methods

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

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

return :: a -> Identity a #

Monad First 
Instance details

Defined in Data.Monoid

Methods

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

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

return :: a -> First a #

Monad Last 
Instance details

Defined in Data.Monoid

Methods

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

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

return :: a -> Last a #

Monad Down 
Instance details

Defined in Data.Ord

Methods

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

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

return :: a -> Down a #

Monad First 
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 
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 
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 
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 Dual 
Instance details

Defined in Data.Semigroup.Internal

Methods

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

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

return :: a -> Dual a #

Monad Product 
Instance details

Defined in Data.Semigroup.Internal

Methods

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

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

return :: a -> Product a #

Monad Sum 
Instance details

Defined in Data.Semigroup.Internal

Methods

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

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

return :: a -> Sum a #

Monad NonEmpty 
Instance details

Defined in GHC.Base

Methods

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

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

return :: a -> NonEmpty a #

Monad STM 
Instance details

Defined in GHC.Conc.Sync

Methods

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

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

return :: a -> STM a #

Monad NoIO 
Instance details

Defined in GHC.GHCi

Methods

(>>=) :: NoIO a -> (a -> NoIO b) -> NoIO b #

(>>) :: NoIO a -> NoIO b -> NoIO b #

return :: a -> NoIO a #

Monad Par1 
Instance details

Defined in GHC.Generics

Methods

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

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

return :: a -> Par1 a #

Monad P 
Instance details

Defined in Text.ParserCombinators.ReadP

Methods

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

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

return :: a -> P a #

Monad ReadP 
Instance details

Defined in Text.ParserCombinators.ReadP

Methods

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

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

return :: a -> ReadP a #

Monad ReadPrec 
Instance details

Defined in Text.ParserCombinators.ReadPrec

Methods

(>>=) :: ReadPrec a -> (a -> ReadPrec b) -> ReadPrec b #

(>>) :: ReadPrec a -> ReadPrec b -> ReadPrec b #

return :: a -> ReadPrec a #

Monad Put 
Instance details

Defined in Data.ByteString.Builder.Internal

Methods

(>>=) :: Put a -> (a -> Put b) -> Put b #

(>>) :: Put a -> Put b -> Put b #

return :: a -> Put 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

Methods

(>>=) :: CryptoFailable a -> (a -> CryptoFailable b) -> CryptoFailable b #

(>>) :: CryptoFailable a -> CryptoFailable b -> CryptoFailable b #

return :: a -> CryptoFailable a #

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 IO 
Instance details

Defined in GHC.Base

Methods

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

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

return :: a -> IO a #

Monad SubM 
Instance details

Defined in Text.Mustache.Internal.Types

Methods

(>>=) :: SubM a -> (a -> SubM b) -> SubM b #

(>>) :: SubM a -> SubM b -> SubM b #

return :: a -> SubM 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

Methods

(>>=) :: ParserResult a -> (a -> ParserResult b) -> ParserResult b #

(>>) :: ParserResult a -> ParserResult b -> ParserResult b #

return :: a -> ParserResult a #

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 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 PprM 
Instance details

Defined in Language.Haskell.TH.PprLib

Methods

(>>=) :: PprM a -> (a -> PprM b) -> PprM b #

(>>) :: PprM a -> PprM b -> PprM b #

return :: a -> PprM 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 Memoized 
Instance details

Defined in UnliftIO.Memoize

Methods

(>>=) :: Memoized a -> (a -> Memoized b) -> Memoized b #

(>>) :: Memoized a -> Memoized b -> Memoized b #

return :: a -> Memoized 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 Id 
Instance details

Defined in Data.Vector.Fusion.Util

Methods

(>>=) :: Id a -> (a -> Id b) -> Id b #

(>>) :: Id a -> Id b -> Id b #

return :: a -> Id a #

Monad Vector 
Instance details

Defined in Data.Vector.Strict

Methods

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

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

return :: a -> Vector a #

Monad YamlParser 
Instance details

Defined in Data.Yaml.Parser

Methods

(>>=) :: YamlParser a -> (a -> YamlParser b) -> YamlParser b #

(>>) :: YamlParser a -> YamlParser b -> YamlParser b #

return :: a -> YamlParser 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 
Instance details

Defined in GHC.Base

Methods

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

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

return :: a -> Maybe a #

Monad Solo 
Instance details

Defined in GHC.Base

Methods

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

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

return :: a -> Solo a #

Monad [] 
Instance details

Defined in GHC.Base

Methods

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

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

return :: a -> [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 (ZeptoT m) 
Instance details

Defined in Data.Attoparsec.Zepto

Methods

(>>=) :: ZeptoT m a -> (a -> ZeptoT m b) -> ZeptoT m b #

(>>) :: ZeptoT m a -> ZeptoT m b -> ZeptoT m b #

return :: a -> ZeptoT m a #

Monad m => Monad (WrappedMonad m) 
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 #

ArrowApply a => Monad (ArrowMonad a) 
Instance details

Defined in 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) 
Instance details

Defined in 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) 
Instance details

Defined in Data.Proxy

Methods

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

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

return :: a -> Proxy a #

Monad (U1 :: Type -> Type) 
Instance details

Defined in GHC.Generics

Methods

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

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

return :: a -> U1 a #

Monad (ST s) 
Instance details

Defined in GHC.ST

Methods

(>>=) :: ST s a -> (a -> ST s b) -> ST s b #

(>>) :: ST s a -> ST s b -> ST s b #

return :: a -> ST s 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 #

DRG gen => Monad (MonadPseudoRandom gen) 
Instance details

Defined in Crypto.Random.Types

Methods

(>>=) :: MonadPseudoRandom gen a -> (a -> MonadPseudoRandom gen b) -> MonadPseudoRandom gen b #

(>>) :: MonadPseudoRandom gen a -> MonadPseudoRandom gen b -> MonadPseudoRandom gen b #

return :: a -> MonadPseudoRandom gen 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 #

Monad (Parser byteArray) 
Instance details

Defined in Data.ByteArray.Parse

Methods

(>>=) :: Parser byteArray a -> (a -> Parser byteArray b) -> Parser byteArray b #

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

return :: a -> Parser byteArray a #

Monad m => Monad (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

(>>=) :: LoggingT m a -> (a -> LoggingT m b) -> LoggingT m b #

(>>) :: LoggingT m a -> LoggingT m b -> LoggingT m b #

return :: a -> LoggingT m a #

Monad m => Monad (NoLoggingT m) 
Instance details

Defined in Control.Monad.Logger

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 m => Monad (WriterLoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

(>>=) :: WriterLoggingT m a -> (a -> WriterLoggingT m b) -> WriterLoggingT m b #

(>>) :: WriterLoggingT m a -> WriterLoggingT m b -> WriterLoggingT m b #

return :: a -> WriterLoggingT m 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 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 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 (MemoizedWith env) Source # 
Instance details

Defined in Stack.Types.Package

Methods

(>>=) :: MemoizedWith env a -> (a -> MemoizedWith env b) -> MemoizedWith env b #

(>>) :: MemoizedWith env a -> MemoizedWith env b -> MemoizedWith env b #

return :: a -> MemoizedWith env 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 #

Monad m => Monad (QuoteToQuasi m) 
Instance details

Defined in Language.Haskell.TH.Syntax.Compat

Methods

(>>=) :: QuoteToQuasi m a -> (a -> QuoteToQuasi m b) -> QuoteToQuasi m b #

(>>) :: QuoteToQuasi m a -> QuoteToQuasi m b -> QuoteToQuasi m b #

return :: a -> QuoteToQuasi m 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) 
Instance details

Defined in GHC.Base

Methods

(>>=) :: (a, a0) -> (a0 -> (a, b)) -> (a, b) #

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

return :: a0 -> (a, a0) #

Monad (Progress step fail) 
Instance details

Defined in Distribution.Utils.Progress

Methods

(>>=) :: Progress step fail a -> (a -> Progress step fail b) -> Progress step fail b #

(>>) :: Progress step fail a -> Progress step fail b -> Progress step fail b #

return :: a -> Progress step fail a #

Monad m => Monad (Kleisli m a) 
Instance details

Defined in 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 m => Monad (StateT s m) 
Instance details

Defined in Data.Functor.Utils

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 f => Monad (Ap f) 
Instance details

Defined in 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) 
Instance details

Defined in 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) 
Instance details

Defined in GHC.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 #

(Applicative f, Monad f) => Monad (WhenMissing f x) 
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 #

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

Defined in Lens.Micro

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 (t m) => Monad (LiftingAccum t m) 
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) 
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 (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) 
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) 
Instance details

Defined in GHC.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) 
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 f, Monad g) => Monad (f :*: g) 
Instance details

Defined in GHC.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 (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) 
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) 
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 (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) 
Instance details

Defined in GHC.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) 
Instance details

Defined in GHC.Base

Methods

(>>=) :: (r -> a) -> (a -> r -> b) -> r -> b #

(>>) :: (r -> a) -> (r -> b) -> r -> b #

return :: a -> r -> a #

Monad f => Monad (M1 i c f) 
Instance details

Defined in GHC.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 f, Applicative f) => Monad (WhenMatched f k x y) 
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 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 #

Minimal complete definition

Nothing

Methods

mzero :: m a #

mplus :: m a -> m a -> m a #

Instances

Instances details
MonadPlus Match 
Instance details

Defined in Distribution.Simple.BuildTarget

Methods

mzero :: Match a #

mplus :: Match a -> Match a -> Match a #

MonadPlus ParsecParser 
Instance details

Defined in Distribution.Parsec

Methods

mzero :: ParsecParser a #

mplus :: ParsecParser a -> ParsecParser a -> ParsecParser a #

MonadPlus Condition 
Instance details

Defined in Distribution.Types.Condition

Methods

mzero :: Condition a #

mplus :: Condition a -> Condition a -> Condition a #

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 STM 
Instance details

Defined in GHC.Conc.Sync

Methods

mzero :: STM a #

mplus :: STM a -> STM a -> STM a #

MonadPlus P 
Instance details

Defined in Text.ParserCombinators.ReadP

Methods

mzero :: P a #

mplus :: P a -> P a -> P a #

MonadPlus ReadP 
Instance details

Defined in Text.ParserCombinators.ReadP

Methods

mzero :: ReadP a #

mplus :: ReadP a -> ReadP a -> ReadP a #

MonadPlus ReadPrec 
Instance details

Defined in Text.ParserCombinators.ReadPrec

Methods

mzero :: ReadPrec a #

mplus :: ReadPrec a -> ReadPrec a -> ReadPrec 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 IO 
Instance details

Defined in GHC.Base

Methods

mzero :: IO a #

mplus :: IO a -> IO a -> IO 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

Methods

mzero :: Completion a #

mplus :: Completion a -> Completion a -> Completion a #

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 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

Methods

mzero :: SmallArray a #

mplus :: SmallArray a -> SmallArray a -> SmallArray a #

MonadPlus Vector 
Instance details

Defined in Data.Vector

Methods

mzero :: Vector a #

mplus :: Vector a -> Vector a -> Vector a #

MonadPlus Vector 
Instance details

Defined in Data.Vector.Strict

Methods

mzero :: Vector a #

mplus :: Vector a -> Vector a -> Vector a #

MonadPlus YamlParser 
Instance details

Defined in Data.Yaml.Parser

Methods

mzero :: YamlParser a #

mplus :: YamlParser a -> YamlParser a -> YamlParser a #

MonadPlus Maybe 
Instance details

Defined in GHC.Base

Methods

mzero :: Maybe a #

mplus :: Maybe a -> Maybe a -> Maybe a #

MonadPlus [] 
Instance details

Defined in GHC.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 (ZeptoT m) 
Instance details

Defined in Data.Attoparsec.Zepto

Methods

mzero :: ZeptoT m a #

mplus :: ZeptoT m a -> ZeptoT m a -> ZeptoT m a #

(ArrowApply a, ArrowPlus a) => MonadPlus (ArrowMonad a) 
Instance details

Defined in Control.Arrow

Methods

mzero :: ArrowMonad a a0 #

mplus :: ArrowMonad a a0 -> ArrowMonad a a0 -> ArrowMonad a a0 #

MonadPlus (Proxy :: Type -> Type) 
Instance details

Defined in Data.Proxy

Methods

mzero :: Proxy a #

mplus :: Proxy a -> Proxy a -> Proxy a #

MonadPlus (U1 :: Type -> Type) 
Instance details

Defined in GHC.Generics

Methods

mzero :: U1 a #

mplus :: U1 a -> U1 a -> U1 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 (Parser byteArray) 
Instance details

Defined in Data.ByteArray.Parse

Methods

mzero :: Parser byteArray a #

mplus :: Parser byteArray a -> Parser byteArray a -> Parser byteArray 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 #

MonadPlus m => MonadPlus (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

mzero :: ResourceT m a #

mplus :: ResourceT m a -> ResourceT m a -> ResourceT 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 #

MonadPlus m => MonadPlus (Kleisli m a) 
Instance details

Defined in 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) 
Instance details

Defined in Data.Monoid

Methods

mzero :: Ap f a #

mplus :: Ap f a -> Ap f a -> Ap f a #

MonadPlus f => MonadPlus (Alt f) 
Instance details

Defined in Data.Semigroup.Internal

Methods

mzero :: Alt f a #

mplus :: Alt f a -> Alt f a -> Alt f a #

MonadPlus f => MonadPlus (Rec1 f) 
Instance details

Defined in GHC.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) 
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) 
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) 
Instance details

Defined in GHC.Generics

Methods

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

mplus :: (f :*: g) a -> (f :*: g) a -> (f :*: g) a #

MonadPlus f => MonadPlus (M1 i c f) 
Instance details

Defined in GHC.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 #

Minimal complete definition

mempty | mconcat

Methods

mempty :: a #

mappend :: a -> a -> a #

mconcat :: [a] -> a #

Instances

Instances details
Monoid CDialect 
Instance details

Defined in Distribution.Simple.CCompiler

Methods

mempty :: CDialect #

mappend :: CDialect -> CDialect -> CDialect #

mconcat :: [CDialect] -> CDialect #

Monoid Directory 
Instance details

Defined in Distribution.Simple.Haddock

Methods

mempty :: Directory #

mappend :: Directory -> Directory -> Directory #

mconcat :: [Directory] -> Directory #

Monoid HaddockArgs 
Instance details

Defined in Distribution.Simple.Haddock

Methods

mempty :: HaddockArgs #

mappend :: HaddockArgs -> HaddockArgs -> HaddockArgs #

mconcat :: [HaddockArgs] -> HaddockArgs #

Monoid GhcOptions 
Instance details

Defined in Distribution.Simple.Program.GHC

Methods

mempty :: GhcOptions #

mappend :: GhcOptions -> GhcOptions -> GhcOptions #

mconcat :: [GhcOptions] -> GhcOptions #

Monoid BenchmarkFlags 
Instance details

Defined in Distribution.Simple.Setup

Methods

mempty :: BenchmarkFlags #

mappend :: BenchmarkFlags -> BenchmarkFlags -> BenchmarkFlags #

mconcat :: [BenchmarkFlags] -> BenchmarkFlags #

Monoid BuildFlags 
Instance details

Defined in Distribution.Simple.Setup

Methods

mempty :: BuildFlags #

mappend :: BuildFlags -> BuildFlags -> BuildFlags #

mconcat :: [BuildFlags] -> BuildFlags #

Monoid CleanFlags 
Instance details

Defined in Distribution.Simple.Setup

Methods

mempty :: CleanFlags #

mappend :: CleanFlags -> CleanFlags -> CleanFlags #

mconcat :: [CleanFlags] -> CleanFlags #

Monoid ConfigFlags 
Instance details

Defined in Distribution.Simple.Setup

Methods

mempty :: ConfigFlags #

mappend :: ConfigFlags -> ConfigFlags -> ConfigFlags #

mconcat :: [ConfigFlags] -> ConfigFlags #

Monoid CopyFlags 
Instance details

Defined in Distribution.Simple.Setup

Methods

mempty :: CopyFlags #

mappend :: CopyFlags -> CopyFlags -> CopyFlags #

mconcat :: [CopyFlags] -> CopyFlags #

Monoid GlobalFlags 
Instance details

Defined in Distribution.Simple.Setup

Methods

mempty :: GlobalFlags #

mappend :: GlobalFlags -> GlobalFlags -> GlobalFlags #

mconcat :: [GlobalFlags] -> GlobalFlags #

Monoid HaddockFlags 
Instance details

Defined in Distribution.Simple.Setup

Methods

mempty :: HaddockFlags #

mappend :: HaddockFlags -> HaddockFlags -> HaddockFlags #

mconcat :: [HaddockFlags] -> HaddockFlags #

Monoid HaddockProjectFlags 
Instance details

Defined in Distribution.Simple.Setup

Methods

mempty :: HaddockProjectFlags #

mappend :: HaddockProjectFlags -> HaddockProjectFlags -> HaddockProjectFlags #

mconcat :: [HaddockProjectFlags] -> HaddockProjectFlags #

Monoid HscolourFlags 
Instance details

Defined in Distribution.Simple.Setup

Methods

mempty :: HscolourFlags #

mappend :: HscolourFlags -> HscolourFlags -> HscolourFlags #

mconcat :: [HscolourFlags] -> HscolourFlags #

Monoid InstallFlags 
Instance details

Defined in Distribution.Simple.Setup

Methods

mempty :: InstallFlags #

mappend :: InstallFlags -> InstallFlags -> InstallFlags #

mconcat :: [InstallFlags] -> InstallFlags #

Monoid RegisterFlags 
Instance details

Defined in Distribution.Simple.Setup

Methods

mempty :: RegisterFlags #

mappend :: RegisterFlags -> RegisterFlags -> RegisterFlags #

mconcat :: [RegisterFlags] -> RegisterFlags #

Monoid ReplFlags 
Instance details

Defined in Distribution.Simple.Setup

Methods

mempty :: ReplFlags #

mappend :: ReplFlags -> ReplFlags -> ReplFlags #

mconcat :: [ReplFlags] -> ReplFlags #

Monoid ReplOptions 
Instance details

Defined in Distribution.Simple.Setup

Methods

mempty :: ReplOptions #

mappend :: ReplOptions -> ReplOptions -> ReplOptions #

mconcat :: [ReplOptions] -> ReplOptions #

Monoid SDistFlags 
Instance details

Defined in Distribution.Simple.Setup

Methods

mempty :: SDistFlags #

mappend :: SDistFlags -> SDistFlags -> SDistFlags #

mconcat :: [SDistFlags] -> SDistFlags #

Monoid TestFlags 
Instance details

Defined in Distribution.Simple.Setup

Methods

mempty :: TestFlags #

mappend :: TestFlags -> TestFlags -> TestFlags #

mconcat :: [TestFlags] -> TestFlags #

Monoid TestShowDetails 
Instance details

Defined in Distribution.Simple.Setup

Methods

mempty :: TestShowDetails #

mappend :: TestShowDetails -> TestShowDetails -> TestShowDetails #

mconcat :: [TestShowDetails] -> TestShowDetails #

Monoid PDTagged 
Instance details

Defined in Distribution.PackageDescription.Configuration

Methods

mempty :: PDTagged #

mappend :: PDTagged -> PDTagged -> PDTagged #

mconcat :: [PDTagged] -> PDTagged #

Monoid Benchmark 
Instance details

Defined in Distribution.Types.Benchmark

Methods

mempty :: Benchmark #

mappend :: Benchmark -> Benchmark -> Benchmark #

mconcat :: [Benchmark] -> Benchmark #

Monoid BenchmarkInterface 
Instance details

Defined in Distribution.Types.BenchmarkInterface

Methods

mempty :: BenchmarkInterface #

mappend :: BenchmarkInterface -> BenchmarkInterface -> BenchmarkInterface #

mconcat :: [BenchmarkInterface] -> BenchmarkInterface #

Monoid BuildInfo 
Instance details

Defined in Distribution.Types.BuildInfo

Methods

mempty :: BuildInfo #

mappend :: BuildInfo -> BuildInfo -> BuildInfo #

mconcat :: [BuildInfo] -> BuildInfo #

Monoid DependencyMap 
Instance details

Defined in Distribution.Types.DependencyMap

Methods

mempty :: DependencyMap #

mappend :: DependencyMap -> DependencyMap -> DependencyMap #

mconcat :: [DependencyMap] -> DependencyMap #

Monoid Executable 
Instance details

Defined in Distribution.Types.Executable

Methods

mempty :: Executable #

mappend :: Executable -> Executable -> Executable #

mconcat :: [Executable] -> Executable #

Monoid ExecutableScope 
Instance details

Defined in Distribution.Types.ExecutableScope

Methods

mempty :: ExecutableScope #

mappend :: ExecutableScope -> ExecutableScope -> ExecutableScope #

mconcat :: [ExecutableScope] -> ExecutableScope #

Monoid FlagAssignment 
Instance details

Defined in Distribution.Types.Flag

Methods

mempty :: FlagAssignment #

mappend :: FlagAssignment -> FlagAssignment -> FlagAssignment #

mconcat :: [FlagAssignment] -> FlagAssignment #

Monoid ForeignLib 
Instance details

Defined in Distribution.Types.ForeignLib

Methods

mempty :: ForeignLib #

mappend :: ForeignLib -> ForeignLib -> ForeignLib #

mconcat :: [ForeignLib] -> ForeignLib #

Monoid ForeignLibType 
Instance details

Defined in Distribution.Types.ForeignLibType

Methods

mempty :: ForeignLibType #

mappend :: ForeignLibType -> ForeignLibType -> ForeignLibType #

mconcat :: [ForeignLibType] -> ForeignLibType #

Monoid Library 
Instance details

Defined in Distribution.Types.Library

Methods

mempty :: Library #

mappend :: Library -> Library -> Library #

mconcat :: [Library] -> Library #

Monoid LibraryVisibility 
Instance details

Defined in Distribution.Types.LibraryVisibility

Methods

mempty :: LibraryVisibility #

mappend :: LibraryVisibility -> LibraryVisibility -> LibraryVisibility #

mconcat :: [LibraryVisibility] -> LibraryVisibility #

Monoid SetupBuildInfo 
Instance details

Defined in Distribution.Types.SetupBuildInfo

Methods

mempty :: SetupBuildInfo #

mappend :: SetupBuildInfo -> SetupBuildInfo -> SetupBuildInfo #

mconcat :: [SetupBuildInfo] -> SetupBuildInfo #

Monoid TestSuite 
Instance details

Defined in Distribution.Types.TestSuite

Methods

mempty :: TestSuite #

mappend :: TestSuite -> TestSuite -> TestSuite #

mconcat :: [TestSuite] -> TestSuite #

Monoid TestSuiteInterface 
Instance details

Defined in Distribution.Types.TestSuiteInterface

Methods

mempty :: TestSuiteInterface #

mappend :: TestSuiteInterface -> TestSuiteInterface -> TestSuiteInterface #

mconcat :: [TestSuiteInterface] -> TestSuiteInterface #

Monoid UnqualComponentName 
Instance details

Defined in Distribution.Types.UnqualComponentName

Methods

mempty :: UnqualComponentName #

mappend :: UnqualComponentName -> UnqualComponentName -> UnqualComponentName #

mconcat :: [UnqualComponentName] -> UnqualComponentName #

Monoid ShortText 
Instance details

Defined in Distribution.Utils.ShortText

Methods

mempty :: ShortText #

mappend :: ShortText -> ShortText -> ShortText #

mconcat :: [ShortText] -> ShortText #

Monoid Series 
Instance details

Defined in Data.Aeson.Encoding.Internal

Methods

mempty :: Series #

mappend :: Series -> Series -> Series #

mconcat :: [Series] -> Series #

Monoid Key 
Instance details

Defined in Data.Aeson.Key

Methods

mempty :: Key #

mappend :: Key -> Key -> Key #

mconcat :: [Key] -> Key #

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 
Instance details

Defined in Data.Array.Byte

Methods

mempty :: ByteArray #

mappend :: ByteArray -> ByteArray -> ByteArray #

mconcat :: [ByteArray] -> ByteArray #

Monoid All 
Instance details

Defined in Data.Semigroup.Internal

Methods

mempty :: All #

mappend :: All -> All -> All #

mconcat :: [All] -> All #

Monoid Any 
Instance details

Defined in Data.Semigroup.Internal

Methods

mempty :: Any #

mappend :: Any -> Any -> Any #

mconcat :: [Any] -> Any #

Monoid String 
Instance details

Defined in Basement.UTF8.Base

Methods

mempty :: String #

mappend :: String -> String -> String #

mconcat :: [String] -> String #

Monoid Builder 
Instance details

Defined in Data.ByteString.Builder.Internal

Monoid ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

Monoid ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Methods

mempty :: ByteString #

mappend :: ByteString -> ByteString -> ByteString #

mconcat :: [ByteString] -> ByteString #

Monoid ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Monoid IntSet 
Instance details

Defined in Data.IntSet.Internal

Monoid SharedSecret 
Instance details

Defined in Crypto.ECC

Methods

mempty :: SharedSecret #

mappend :: SharedSecret -> SharedSecret -> SharedSecret #

mconcat :: [SharedSecret] -> SharedSecret #

Monoid Unit 
Instance details

Defined in Control.DeepSeq

Methods

mempty :: Unit #

mappend :: Unit -> Unit -> Unit #

mconcat :: [Unit] -> Unit #

Monoid OsString 
Instance details

Defined in System.OsString.Internal.Types.Hidden

Methods

mempty :: OsString #

mappend :: OsString -> OsString -> OsString #

mconcat :: [OsString] -> OsString #

Monoid PosixString 
Instance details

Defined in System.OsString.Internal.Types.Hidden

Methods

mempty :: PosixString #

mappend :: PosixString -> PosixString -> PosixString #

mconcat :: [PosixString] -> PosixString #

Monoid WindowsString 
Instance details

Defined in System.OsString.Internal.Types.Hidden

Methods

mempty :: WindowsString #

mappend :: WindowsString -> WindowsString -> WindowsString #

mconcat :: [WindowsString] -> WindowsString #

Monoid ShortText 
Instance details

Defined in GHC.Data.ShortText

Methods

mempty :: ShortText #

mappend :: ShortText -> ShortText -> ShortText #

mconcat :: [ShortText] -> ShortText #

Monoid Ordering 
Instance details

Defined in GHC.Base

Monoid Empty 
Instance details

Defined in Hpack.Config

Methods

mempty :: Empty #

mappend :: Empty -> Empty -> Empty #

mconcat :: [Empty] -> Empty #

Monoid ExecutableSection 
Instance details

Defined in Hpack.Config

Methods

mempty :: ExecutableSection #

mappend :: ExecutableSection -> ExecutableSection -> ExecutableSection #

mconcat :: [ExecutableSection] -> ExecutableSection #

Monoid LibrarySection 
Instance details

Defined in Hpack.Config

Methods

mempty :: LibrarySection #

mappend :: LibrarySection -> LibrarySection -> LibrarySection #

mconcat :: [LibrarySection] -> LibrarySection #

Monoid BuildTools 
Instance details

Defined in Hpack.Syntax.BuildTools

Methods

mempty :: BuildTools #

mappend :: BuildTools -> BuildTools -> BuildTools #

mconcat :: [BuildTools] -> BuildTools #

Monoid SystemBuildTools 
Instance details

Defined in Hpack.Syntax.BuildTools

Monoid Dependencies 
Instance details

Defined in Hpack.Syntax.Dependencies

Monoid CookieJar 
Instance details

Defined in Network.HTTP.Client.Types

Methods

mempty :: CookieJar #

mappend :: CookieJar -> CookieJar -> CookieJar #

mconcat :: [CookieJar] -> CookieJar #

Monoid RequestBody 
Instance details

Defined in Network.HTTP.Client.Types

Monoid PrefsMod 
Instance details

Defined in Options.Applicative.Builder

Methods

mempty :: PrefsMod #

mappend :: PrefsMod -> PrefsMod -> PrefsMod #

mconcat :: [PrefsMod] -> PrefsMod #

Monoid ParserHelp 
Instance details

Defined in Options.Applicative.Help.Types

Methods

mempty :: ParserHelp #

mappend :: ParserHelp -> ParserHelp -> ParserHelp #

mconcat :: [ParserHelp] -> ParserHelp #

Monoid Completer 
Instance details

Defined in Options.Applicative.Types

Methods

mempty :: Completer #

mappend :: Completer -> Completer -> Completer #

mconcat :: [Completer] -> Completer #

Monoid ParseError 
Instance details

Defined in Options.Applicative.Types

Methods

mempty :: ParseError #

mappend :: ParseError -> ParseError -> ParseError #

mconcat :: [ParseError] -> ParseError #

Monoid OsString 
Instance details

Defined in System.OsString.Internal.Types

Methods

mempty :: OsString #

mappend :: OsString -> OsString -> OsString #

mconcat :: [OsString] -> OsString #

Monoid PosixString 
Instance details

Defined in System.OsString.Internal.Types

Methods

mempty :: PosixString #

mappend :: PosixString -> PosixString -> PosixString #

mconcat :: [PosixString] -> PosixString #

Monoid WindowsString 
Instance details

Defined in System.OsString.Internal.Types

Methods

mempty :: WindowsString #

mappend :: WindowsString -> WindowsString -> WindowsString #

mconcat :: [WindowsString] -> WindowsString #

Monoid EntityConstraintDefs 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

mempty :: EntityConstraintDefs #

mappend :: EntityConstraintDefs -> EntityConstraintDefs -> EntityConstraintDefs #

mconcat :: [EntityConstraintDefs] -> EntityConstraintDefs #

Monoid Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Methods

mempty :: Doc #

mappend :: Doc -> Doc -> Doc #

mconcat :: [Doc] -> Doc #

Monoid AnsiStyle 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

mempty :: AnsiStyle #

mappend :: AnsiStyle -> AnsiStyle -> AnsiStyle #

mconcat :: [AnsiStyle] -> AnsiStyle #

Monoid Utf8Builder 
Instance details

Defined in RIO.Prelude.Display

Monoid LogFunc 
Instance details

Defined in RIO.Prelude.Logger

Monoid StylesUpdate 
Instance details

Defined in RIO.PrettyPrint.StylesUpdate

Monoid AnsiAnn 
Instance details

Defined in Text.PrettyPrint.Leijen.Extended

Methods

mempty :: AnsiAnn #

mappend :: AnsiAnn -> AnsiAnn -> AnsiAnn #

mconcat :: [AnsiAnn] -> AnsiAnn #

Monoid StyleAnn 
Instance details

Defined in Text.PrettyPrint.Leijen.Extended

Methods

mempty :: StyleAnn #

mappend :: StyleAnn -> StyleAnn -> StyleAnn #

mconcat :: [StyleAnn] -> StyleAnn #

Monoid StyleDoc 
Instance details

Defined in Text.PrettyPrint.Leijen.Extended

Monoid GhciScript Source # 
Instance details

Defined in Stack.Ghci.Script

Monoid FirstFalse Source # 
Instance details

Defined in Stack.Prelude

Monoid FirstTrue Source # 
Instance details

Defined in Stack.Prelude

Monoid AllowNewerDeps Source # 
Instance details

Defined in Stack.Types.AllowNewerDeps

Monoid MissingPresentDeps Source # 
Instance details

Defined in Stack.Types.Build.ConstructPlan

Monoid W Source # 
Instance details

Defined in Stack.Types.Build.ConstructPlan

Methods

mempty :: W #

mappend :: W -> W -> W #

mconcat :: [W] -> W #

Monoid BenchmarkOptsMonoid Source # 
Instance details

Defined in Stack.Types.BuildOptsMonoid

Monoid BuildOptsMonoid Source # 
Instance details

Defined in Stack.Types.BuildOptsMonoid

Monoid HaddockOptsMonoid Source # 
Instance details

Defined in Stack.Types.BuildOptsMonoid

Monoid TestOptsMonoid Source # 
Instance details

Defined in Stack.Types.BuildOptsMonoid

Monoid CasaOptsMonoid Source #

Left-biased combine Casa configurations options

Instance details

Defined in Stack.Types.Casa

Monoid ConfigMonoid Source # 
Instance details

Defined in Stack.Types.ConfigMonoid

Monoid DockerOptsMonoid Source #

Left-biased combine Docker options

Instance details

Defined in Stack.Types.Docker

Monoid ExtraDirs Source # 
Instance details

Defined in Stack.Types.ExtraDirs

Monoid GlobalOptsMonoid Source # 
Instance details

Defined in Stack.Types.GlobalOptsMonoid

Monoid InstallLocation Source # 
Instance details

Defined in Stack.Types.Installed

Monoid IsMutable Source # 
Instance details

Defined in Stack.Types.IsMutable

Monoid NixOptsMonoid Source #

Left-biased combine Nix options

Instance details

Defined in Stack.Types.Nix

Monoid PackageComponentFile Source # 
Instance details

Defined in Stack.Types.PackageFile

Monoid SetupInfo Source # 
Instance details

Defined in Stack.Types.SetupInfo

Monoid IntersectingVersionRange Source # 
Instance details

Defined in Stack.Types.Version

Monoid Builder 
Instance details

Defined in Data.Text.Internal.Builder

Methods

mempty :: Builder #

mappend :: Builder -> Builder -> Builder #

mconcat :: [Builder] -> Builder #

Monoid StrictBuilder 
Instance details

Defined in Data.Text.Internal.StrictBuilder

Methods

mempty :: StrictBuilder #

mappend :: StrictBuilder -> StrictBuilder -> StrictBuilder #

mconcat :: [StrictBuilder] -> StrictBuilder #

Monoid ShortText 
Instance details

Defined in Data.Text.Short.Internal

Methods

mempty :: ShortText #

mappend :: ShortText -> ShortText -> ShortText #

mconcat :: [ShortText] -> ShortText #

Monoid StatxFlags 
Instance details

Defined in System.Posix.Files.Common

Methods

mempty :: StatxFlags #

mappend :: StatxFlags -> StatxFlags -> StatxFlags #

mconcat :: [StatxFlags] -> StatxFlags #

Monoid StatxMask 
Instance details

Defined in System.Posix.Files.Common

Methods

mempty :: StatxMask #

mappend :: StatxMask -> StatxMask -> StatxMask #

mconcat :: [StatxMask] -> StatxMask #

Monoid () 
Instance details

Defined in GHC.Base

Methods

mempty :: () #

mappend :: () -> () -> () #

mconcat :: [()] -> () #

Monoid (Flag a) 
Instance details

Defined in Distribution.Simple.Flag

Methods

mempty :: Flag a #

mappend :: Flag a -> Flag a -> Flag a #

mconcat :: [Flag a] -> Flag a #

(Semigroup dir, Monoid dir) => Monoid (InstallDirs dir) 
Instance details

Defined in Distribution.Simple.InstallDirs

Methods

mempty :: InstallDirs dir #

mappend :: InstallDirs dir -> InstallDirs dir -> InstallDirs dir #

mconcat :: [InstallDirs dir] -> InstallDirs dir #

Monoid (PackageIndex InstalledPackageInfo) 
Instance details

Defined in Distribution.Simple.PackageIndex

Methods

mempty :: PackageIndex InstalledPackageInfo #

mappend :: PackageIndex InstalledPackageInfo -> PackageIndex InstalledPackageInfo -> PackageIndex InstalledPackageInfo #

mconcat :: [PackageIndex InstalledPackageInfo] -> PackageIndex InstalledPackageInfo #

Ord a => Monoid (NubList a) 
Instance details

Defined in Distribution.Utils.NubList

Methods

mempty :: NubList a #

mappend :: NubList a -> NubList a -> NubList a #

mconcat :: [NubList a] -> NubList a #

Ord a => Monoid (NubListR a) 
Instance details

Defined in Distribution.Utils.NubList

Methods

mempty :: NubListR a #

mappend :: NubListR a -> NubListR a -> NubListR a #

mconcat :: [NubListR a] -> NubListR a #

Monoid (DList a) 
Instance details

Defined in Distribution.Compat.DList

Methods

mempty :: DList a #

mappend :: DList a -> DList a -> DList a #

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

Semigroup a => Monoid (Option' a) 
Instance details

Defined in Distribution.Compat.Semigroup

Methods

mempty :: Option' a #

mappend :: Option' a -> Option' a -> Option' a #

mconcat :: [Option' a] -> Option' a #

(Semigroup a, Monoid a) => Monoid (PerCompilerFlavor a) 
Instance details

Defined in Distribution.Compiler

Methods

mempty :: PerCompilerFlavor a #

mappend :: PerCompilerFlavor a -> PerCompilerFlavor a -> PerCompilerFlavor a #

mconcat :: [PerCompilerFlavor a] -> PerCompilerFlavor a #

Semigroup d => Monoid (DepTestRslt d) 
Instance details

Defined in Distribution.PackageDescription.Configuration

Methods

mempty :: DepTestRslt d #

mappend :: DepTestRslt d -> DepTestRslt d -> DepTestRslt d #

mconcat :: [DepTestRslt d] -> DepTestRslt d #

Monoid (Condition a) 
Instance details

Defined in Distribution.Types.Condition

Methods

mempty :: Condition a #

mappend :: Condition a -> Condition a -> Condition a #

mconcat :: [Condition a] -> Condition a #

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

(Semigroup a, Monoid a) => Monoid (Concurrently a) 
Instance details

Defined in Control.Concurrent.Async.Internal

Methods

mempty :: Concurrently a #

mappend :: Concurrently a -> Concurrently a -> Concurrently a #

mconcat :: [Concurrently a] -> Concurrently a #

FiniteBits a => Monoid (And a) 
Instance details

Defined in Data.Bits

Methods

mempty :: And a #

mappend :: And a -> And a -> And a #

mconcat :: [And a] -> And a #

FiniteBits a => Monoid (Iff a) 
Instance details

Defined in Data.Bits

Methods

mempty :: Iff a #

mappend :: Iff a -> Iff a -> Iff a #

mconcat :: [Iff a] -> Iff a #

Bits a => Monoid (Ior a) 
Instance details

Defined in Data.Bits

Methods

mempty :: Ior a #

mappend :: Ior a -> Ior a -> Ior a #

mconcat :: [Ior a] -> Ior a #

Bits a => Monoid (Xor a) 
Instance details

Defined in Data.Bits

Methods

mempty :: Xor a #

mappend :: Xor a -> Xor a -> Xor a #

mconcat :: [Xor a] -> Xor a #

Monoid (Comparison a) 
Instance details

Defined in Data.Functor.Contravariant

Methods

mempty :: Comparison a #

mappend :: Comparison a -> Comparison a -> Comparison a #

mconcat :: [Comparison a] -> Comparison a #

Monoid (Equivalence a) 
Instance details

Defined in Data.Functor.Contravariant

Methods

mempty :: Equivalence a #

mappend :: Equivalence a -> Equivalence a -> Equivalence a #

mconcat :: [Equivalence a] -> Equivalence a #

Monoid (Predicate a) 
Instance details

Defined in Data.Functor.Contravariant

Methods

mempty :: Predicate a #

mappend :: Predicate a -> Predicate a -> Predicate a #

mconcat :: [Predicate a] -> Predicate a #

Monoid a => Monoid (Identity a) 
Instance details

Defined in Data.Functor.Identity

Methods

mempty :: Identity a #

mappend :: Identity a -> Identity a -> Identity a #

mconcat :: [Identity a] -> Identity a #

Ord a => Monoid (Max a) 
Instance details

Defined in Data.Functor.Utils

Methods

mempty :: Max a #

mappend :: Max a -> Max a -> Max a #

mconcat :: [Max a] -> Max a #

Ord a => Monoid (Min a) 
Instance details

Defined in Data.Functor.Utils

Methods

mempty :: Min a #

mappend :: Min a -> Min a -> Min a #

mconcat :: [Min a] -> Min a #

Monoid (First a) 
Instance details

Defined in Data.Monoid

Methods

mempty :: First a #

mappend :: First a -> First a -> First a #

mconcat :: [First a] -> First a #

Monoid (Last a) 
Instance details

Defined in Data.Monoid

Methods

mempty :: Last a #

mappend :: Last a -> Last a -> Last a #

mconcat :: [Last a] -> Last a #

Monoid a => Monoid (Down a) 
Instance details

Defined in Data.Ord

Methods

mempty :: Down a #

mappend :: Down a -> Down a -> Down a #

mconcat :: [Down a] -> Down a #

(Ord a, Bounded a) => Monoid (Max a) 
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) 
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) 
Instance details

Defined in Data.Semigroup

Methods

mempty :: WrappedMonoid m #

mappend :: WrappedMonoid m -> WrappedMonoid m -> WrappedMonoid m #

mconcat :: [WrappedMonoid m] -> WrappedMonoid m #

Monoid a => Monoid (Dual a) 
Instance details

Defined in Data.Semigroup.Internal

Methods

mempty :: Dual a #

mappend :: Dual a -> Dual a -> Dual a #

mconcat :: [Dual a] -> Dual a #

Monoid (Endo a) 
Instance details

Defined in Data.Semigroup.Internal

Methods

mempty :: Endo a #

mappend :: Endo a -> Endo a -> Endo a #

mconcat :: [Endo a] -> Endo a #

Num a => Monoid (Product a) 
Instance details

Defined in Data.Semigroup.Internal

Methods

mempty :: Product a #

mappend :: Product a -> Product a -> Product a #

mconcat :: [Product a] -> Product a #

Num a => Monoid (Sum a) 
Instance details

Defined in Data.Semigroup.Internal

Methods

mempty :: Sum a #

mappend :: Sum a -> Sum a -> Sum a #

mconcat :: [Sum a] -> Sum a #

Monoid a => Monoid (STM a) 
Instance details

Defined in GHC.Conc.Sync

Methods

mempty :: STM a #

mappend :: STM a -> STM a -> STM a #

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

(Generic a, Monoid (Rep a ())) => Monoid (Generically a) 
Instance details

Defined in GHC.Generics

Methods

mempty :: Generically a #

mappend :: Generically a -> Generically a -> Generically a #

mconcat :: [Generically a] -> Generically a #

Monoid p => Monoid (Par1 p) 
Instance details

Defined in GHC.Generics

Methods

mempty :: Par1 p #

mappend :: Par1 p -> Par1 p -> Par1 p #

mconcat :: [Par1 p] -> Par1 p #

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 s => Monoid (CI s) 
Instance details

Defined in Data.CaseInsensitive.Internal

Methods

mempty :: CI s #

mappend :: CI s -> CI s -> CI s #

mconcat :: [CI s] -> CI s #

Num a => Monoid (AlphaColour a) 
Instance details

Defined in Data.Colour.Internal

Methods

mempty :: AlphaColour a #

mappend :: AlphaColour a -> AlphaColour a -> AlphaColour a #

mconcat :: [AlphaColour a] -> AlphaColour a #

Num a => Monoid (Colour a) 
Instance details

Defined in Data.Colour.Internal

Methods

mempty :: Colour a #

mappend :: Colour a -> Colour a -> Colour a #

mconcat :: [Colour a] -> Colour a #

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 a => Monoid (IO a) 
Instance details

Defined in GHC.Base

Methods

mempty :: IO a #

mappend :: IO a -> IO a -> IO a #

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

Monoid (List a) 
Instance details

Defined in Data.Aeson.Config.Types

Methods

mempty :: List a #

mappend :: List a -> List a -> List a #

mconcat :: [List a] -> List 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 #

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

Methods

mempty :: DefaultProp a #

mappend :: DefaultProp a -> DefaultProp a -> DefaultProp a #

mconcat :: [DefaultProp a] -> DefaultProp a #

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 (SetOnceAtMost a) 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

mempty :: SetOnceAtMost a #

mappend :: SetOnceAtMost a -> SetOnceAtMost a -> SetOnceAtMost a #

mconcat :: [SetOnceAtMost a] -> SetOnceAtMost 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) 
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) 
Instance details

Defined in Data.Primitive.PrimArray

Methods

mempty :: PrimArray a #

mappend :: PrimArray a -> PrimArray a -> PrimArray a #

mconcat :: [PrimArray a] -> PrimArray a #

Monoid (SmallArray a) 
Instance details

Defined in Data.Primitive.SmallArray

Methods

mempty :: SmallArray a #

mappend :: SmallArray a -> SmallArray a -> SmallArray a #

mconcat :: [SmallArray a] -> SmallArray a #

Monad m => Monoid (RetryPolicyM m) 
Instance details

Defined in Control.Retry

Methods

mempty :: RetryPolicyM m #

mappend :: RetryPolicyM m -> RetryPolicyM m -> RetryPolicyM m #

mconcat :: [RetryPolicyM m] -> RetryPolicyM m #

Monoid (GLogFunc msg) 
Instance details

Defined in RIO.Prelude.Logger

Methods

mempty :: GLogFunc msg #

mappend :: GLogFunc msg -> GLogFunc msg -> GLogFunc msg #

mconcat :: [GLogFunc msg] -> GLogFunc msg #

Monoid (CompCollection component) Source # 
Instance details

Defined in Stack.Types.CompCollection

Methods

mempty :: CompCollection component #

mappend :: CompCollection component -> CompCollection component -> CompCollection component #

mconcat :: [CompCollection component] -> CompCollection component #

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) 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

mempty :: Q a #

mappend :: Q a -> Q a -> Q a #

mconcat :: [Q a] -> Q a #

Monoid (Validity k) 
Instance details

Defined in Data.HashMap.Internal.Debug

Methods

mempty :: Validity k #

mappend :: Validity k -> Validity k -> Validity k #

mconcat :: [Validity k] -> Validity k #

(Hashable a, Eq a) => Monoid (HashSet a) 
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 #

Monoid (Vector a) 
Instance details

Defined in Data.Vector.Strict

Methods

mempty :: Vector a #

mappend :: Vector a -> Vector a -> Vector a #

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

Monoid (YamlParser a) 
Instance details

Defined in Data.Yaml.Parser

Methods

mempty :: YamlParser a #

mappend :: YamlParser a -> YamlParser a -> YamlParser a #

mconcat :: [YamlParser a] -> YamlParser a #

Semigroup a => Monoid (Maybe a) 
Instance details

Defined in GHC.Base

Methods

mempty :: Maybe a #

mappend :: Maybe a -> Maybe a -> Maybe a #

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

Monoid a => Monoid (Solo a) 
Instance details

Defined in GHC.Base

Methods

mempty :: Solo a #

mappend :: Solo a -> Solo a -> Solo a #

mconcat :: [Solo a] -> Solo a #

Monoid [a] 
Instance details

Defined in GHC.Base

Methods

mempty :: [a] #

mappend :: [a] -> [a] -> [a] #

mconcat :: [[a]] -> [a] #

(Semigroup a, Monoid a) => Monoid (ConcurrentlyE e a) 
Instance details

Defined in Control.Concurrent.Async.Internal

Methods

mempty :: ConcurrentlyE e a #

mappend :: ConcurrentlyE e a -> ConcurrentlyE e a -> ConcurrentlyE e a #

mconcat :: [ConcurrentlyE e a] -> ConcurrentlyE e 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 #

Monad m => Monoid (ZeptoT m a) 
Instance details

Defined in Data.Attoparsec.Zepto

Methods

mempty :: ZeptoT m a #

mappend :: ZeptoT m a -> ZeptoT m a -> ZeptoT m a #

mconcat :: [ZeptoT m a] -> ZeptoT m a #

Monoid a => Monoid (Op a b) 
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 #

Monoid (Proxy s) 
Instance details

Defined in Data.Proxy

Methods

mempty :: Proxy s #

mappend :: Proxy s -> Proxy s -> Proxy s #

mconcat :: [Proxy s] -> Proxy s #

Monoid (U1 p) 
Instance details

Defined in GHC.Generics

Methods

mempty :: U1 p #

mappend :: U1 p -> U1 p -> U1 p #

mconcat :: [U1 p] -> U1 p #

Monoid a => Monoid (ST s a) 
Instance details

Defined in GHC.ST

Methods

mempty :: ST s a #

mappend :: ST s a -> ST s a -> ST s a #

mconcat :: [ST s a] -> ST s a #

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 #

(Semigroup a, Semigroup b, Monoid a, Monoid b) => Monoid (Product a b) 
Instance details

Defined in Data.Aeson.Config.Types

Methods

mempty :: Product a b #

mappend :: Product a b -> Product a b -> Product a b #

mconcat :: [Product a b] -> Product a b #

Applicative f => Monoid (Traversed a f) 
Instance details

Defined in Lens.Micro

Methods

mempty :: Traversed a f #

mappend :: Traversed a f -> Traversed a f -> Traversed a f #

mconcat :: [Traversed a f] -> Traversed a f #

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 #

(Applicative m, Monoid a) => Monoid (LoggingT m a) 
Instance details

Defined in Control.Monad.Logger

Methods

mempty :: LoggingT m a #

mappend :: LoggingT m a -> LoggingT m a -> LoggingT m a #

mconcat :: [LoggingT m a] -> LoggingT m a #

(Applicative m, Monoid a) => Monoid (NoLoggingT m a) 
Instance details

Defined in Control.Monad.Logger

Methods

mempty :: NoLoggingT m a #

mappend :: NoLoggingT m a -> NoLoggingT m a -> NoLoggingT m a #

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

(Applicative m, Monoid a) => Monoid (WriterLoggingT m a) 
Instance details

Defined in Control.Monad.Logger

Methods

mempty :: WriterLoggingT m a #

mappend :: WriterLoggingT m a -> WriterLoggingT m a -> WriterLoggingT m a #

mconcat :: [WriterLoggingT m a] -> WriterLoggingT m a #

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 #

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 #

(Ord k, Semigroup a) => Monoid (MonoidMap k a) Source # 
Instance details

Defined in Data.Monoid.Map

Methods

mempty :: MonoidMap k a #

mappend :: MonoidMap k a -> MonoidMap k a -> MonoidMap k a #

mconcat :: [MonoidMap k a] -> MonoidMap k 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) 
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) 
Instance details

Defined in UnliftIO.Internals.Async

(Eq k, Hashable k) => Monoid (HashMap k v) 
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) 
Instance details

Defined in GHC.Base

Methods

mempty :: (a, b) #

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

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

Monoid b => Monoid (a -> b) 
Instance details

Defined in GHC.Base

Methods

mempty :: a -> b #

mappend :: (a -> b) -> (a -> b) -> a -> b #

mconcat :: [a -> b] -> a -> b #

(Semigroup a, Semigroup c, Monoid a, Monoid c) => Monoid (CondTree v c a) 
Instance details

Defined in Distribution.Types.CondTree

Methods

mempty :: CondTree v c a #

mappend :: CondTree v c a -> CondTree v c a -> CondTree v c a #

mconcat :: [CondTree v c a] -> CondTree v c a #

Monoid a => Monoid (Const a b) 
Instance details

Defined in 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) 
Instance details

Defined in 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) 
Instance details

Defined in 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) 
Instance details

Defined in GHC.Generics

Methods

mempty :: Rec1 f p #

mappend :: Rec1 f p -> Rec1 f p -> Rec1 f p #

mconcat :: [Rec1 f p] -> Rec1 f p #

Monoid a => Monoid (Alias deprecated alias a) 
Instance details

Defined in Data.Aeson.Config.FromValue

Methods

mempty :: Alias deprecated alias a #

mappend :: Alias deprecated alias a -> Alias deprecated alias a -> Alias deprecated alias a #

mconcat :: [Alias deprecated alias a] -> Alias deprecated alias 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 #

(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 (GenEntries tarPath linkTarget e) 
Instance details

Defined in Codec.Archive.Tar.Types

Methods

mempty :: GenEntries tarPath linkTarget e #

mappend :: GenEntries tarPath linkTarget e -> GenEntries tarPath linkTarget e -> GenEntries tarPath linkTarget e #

mconcat :: [GenEntries tarPath linkTarget e] -> GenEntries tarPath linkTarget e #

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) 
Instance details

Defined in GHC.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) 
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 #

(Monoid (f p), Monoid (g p)) => Monoid ((f :*: g) p) 
Instance details

Defined in GHC.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) 
Instance details

Defined in GHC.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 #

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 a, Monoid b, Monoid c, Monoid d) => Monoid (a, b, c, d) 
Instance details

Defined in GHC.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) 
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) 
Instance details

Defined in GHC.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) 
Instance details

Defined in GHC.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 #

(Semigroup asmSources, Semigroup cSources, Semigroup cxxSources, Semigroup jsSources, Monoid asmSources, Monoid cSources, Monoid cxxSources, Monoid jsSources) => Monoid (CommonOptions asmSources cSources cxxSources jsSources a) 
Instance details

Defined in Hpack.Config

Methods

mempty :: CommonOptions asmSources cSources cxxSources jsSources a #

mappend :: CommonOptions asmSources cSources cxxSources jsSources a -> CommonOptions asmSources cSources cxxSources jsSources a -> CommonOptions asmSources cSources cxxSources jsSources a #

mconcat :: [CommonOptions asmSources cSources cxxSources jsSources a] -> CommonOptions asmSources cSources cxxSources jsSources a #

(Monoid a, Monoid b, Monoid c, Monoid d, Monoid e) => Monoid (a, b, c, d, e) 
Instance details

Defined in GHC.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 #

Minimal complete definition

(<>) | sconcat

Methods

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

Instances

Instances details
Semigroup CDialect 
Instance details

Defined in Distribution.Simple.CCompiler

Methods

(<>) :: CDialect -> CDialect -> CDialect #

sconcat :: NonEmpty CDialect -> CDialect

stimes :: Integral b => b -> CDialect -> CDialect

Semigroup Directory 
Instance details

Defined in Distribution.Simple.Haddock

Methods

(<>) :: Directory -> Directory -> Directory #

sconcat :: NonEmpty Directory -> Directory

stimes :: Integral b => b -> Directory -> Directory

Semigroup HaddockArgs 
Instance details

Defined in Distribution.Simple.Haddock

Methods

(<>) :: HaddockArgs -> HaddockArgs -> HaddockArgs #

sconcat :: NonEmpty HaddockArgs -> HaddockArgs

stimes :: Integral b => b -> HaddockArgs -> HaddockArgs

Semigroup GhcOptions 
Instance details

Defined in Distribution.Simple.Program.GHC

Methods

(<>) :: GhcOptions -> GhcOptions -> GhcOptions #

sconcat :: NonEmpty GhcOptions -> GhcOptions

stimes :: Integral b => b -> GhcOptions -> GhcOptions

Semigroup BenchmarkFlags 
Instance details

Defined in Distribution.Simple.Setup

Methods

(<>) :: BenchmarkFlags -> BenchmarkFlags -> BenchmarkFlags #

sconcat :: NonEmpty BenchmarkFlags -> BenchmarkFlags

stimes :: Integral b => b -> BenchmarkFlags -> BenchmarkFlags

Semigroup BuildFlags 
Instance details

Defined in Distribution.Simple.Setup

Methods

(<>) :: BuildFlags -> BuildFlags -> BuildFlags #

sconcat :: NonEmpty BuildFlags -> BuildFlags

stimes :: Integral b => b -> BuildFlags -> BuildFlags

Semigroup CleanFlags 
Instance details

Defined in Distribution.Simple.Setup

Methods

(<>) :: CleanFlags -> CleanFlags -> CleanFlags #

sconcat :: NonEmpty CleanFlags -> CleanFlags

stimes :: Integral b => b -> CleanFlags -> CleanFlags

Semigroup ConfigFlags 
Instance details

Defined in Distribution.Simple.Setup

Methods

(<>) :: ConfigFlags -> ConfigFlags -> ConfigFlags #

sconcat :: NonEmpty ConfigFlags -> ConfigFlags

stimes :: Integral b => b -> ConfigFlags -> ConfigFlags

Semigroup CopyFlags 
Instance details

Defined in Distribution.Simple.Setup

Methods

(<>) :: CopyFlags -> CopyFlags -> CopyFlags #

sconcat :: NonEmpty CopyFlags -> CopyFlags

stimes :: Integral b => b -> CopyFlags -> CopyFlags

Semigroup GlobalFlags 
Instance details

Defined in Distribution.Simple.Setup

Methods

(<>) :: GlobalFlags -> GlobalFlags -> GlobalFlags #

sconcat :: NonEmpty GlobalFlags -> GlobalFlags

stimes :: Integral b => b -> GlobalFlags -> GlobalFlags

Semigroup HaddockFlags 
Instance details

Defined in Distribution.Simple.Setup

Methods

(<>) :: HaddockFlags -> HaddockFlags -> HaddockFlags #

sconcat :: NonEmpty HaddockFlags -> HaddockFlags

stimes :: Integral b => b -> HaddockFlags -> HaddockFlags

Semigroup HaddockProjectFlags 
Instance details

Defined in Distribution.Simple.Setup

Methods

(<>) :: HaddockProjectFlags -> HaddockProjectFlags -> HaddockProjectFlags #

sconcat :: NonEmpty HaddockProjectFlags -> HaddockProjectFlags

stimes :: Integral b => b -> HaddockProjectFlags -> HaddockProjectFlags

Semigroup HscolourFlags 
Instance details

Defined in Distribution.Simple.Setup

Methods

(<>) :: HscolourFlags -> HscolourFlags -> HscolourFlags #

sconcat :: NonEmpty HscolourFlags -> HscolourFlags

stimes :: Integral b => b -> HscolourFlags -> HscolourFlags

Semigroup InstallFlags 
Instance details

Defined in Distribution.Simple.Setup

Methods

(<>) :: InstallFlags -> InstallFlags -> InstallFlags #

sconcat :: NonEmpty InstallFlags -> InstallFlags

stimes :: Integral b => b -> InstallFlags -> InstallFlags

Semigroup RegisterFlags 
Instance details

Defined in Distribution.Simple.Setup

Methods

(<>) :: RegisterFlags -> RegisterFlags -> RegisterFlags #

sconcat :: NonEmpty RegisterFlags -> RegisterFlags

stimes :: Integral b => b -> RegisterFlags -> RegisterFlags

Semigroup ReplFlags 
Instance details

Defined in Distribution.Simple.Setup

Methods

(<>) :: ReplFlags -> ReplFlags -> ReplFlags #

sconcat :: NonEmpty ReplFlags -> ReplFlags

stimes :: Integral b => b -> ReplFlags -> ReplFlags

Semigroup ReplOptions 
Instance details

Defined in Distribution.Simple.Setup

Methods

(<>) :: ReplOptions -> ReplOptions -> ReplOptions #

sconcat :: NonEmpty ReplOptions -> ReplOptions

stimes :: Integral b => b -> ReplOptions -> ReplOptions

Semigroup SDistFlags 
Instance details

Defined in Distribution.Simple.Setup

Methods

(<>) :: SDistFlags -> SDistFlags -> SDistFlags #

sconcat :: NonEmpty SDistFlags -> SDistFlags

stimes :: Integral b => b -> SDistFlags -> SDistFlags

Semigroup TestFlags 
Instance details

Defined in Distribution.Simple.Setup

Methods

(<>) :: TestFlags -> TestFlags -> TestFlags #

sconcat :: NonEmpty TestFlags -> TestFlags

stimes :: Integral b => b -> TestFlags -> TestFlags

Semigroup TestShowDetails 
Instance details

Defined in Distribution.Simple.Setup

Methods

(<>) :: TestShowDetails -> TestShowDetails -> TestShowDetails #

sconcat :: NonEmpty TestShowDetails -> TestShowDetails

stimes :: Integral b => b -> TestShowDetails -> TestShowDetails

Semigroup Margin 
Instance details

Defined in Distribution.Fields.Pretty

Methods

(<>) :: Margin -> Margin -> Margin #

sconcat :: NonEmpty Margin -> Margin

stimes :: Integral b => b -> Margin -> Margin

Semigroup DepMapUnion 
Instance details

Defined in Distribution.PackageDescription.Configuration

Methods

(<>) :: DepMapUnion -> DepMapUnion -> DepMapUnion #

sconcat :: NonEmpty DepMapUnion -> DepMapUnion

stimes :: Integral b => b -> DepMapUnion -> DepMapUnion

Semigroup PDTagged 
Instance details

Defined in Distribution.PackageDescription.Configuration

Methods

(<>) :: PDTagged -> PDTagged -> PDTagged #

sconcat :: NonEmpty PDTagged -> PDTagged

stimes :: Integral b => b -> PDTagged -> PDTagged

Semigroup Benchmark 
Instance details

Defined in Distribution.Types.Benchmark

Methods

(<>) :: Benchmark -> Benchmark -> Benchmark #

sconcat :: NonEmpty Benchmark -> Benchmark

stimes :: Integral b => b -> Benchmark -> Benchmark

Semigroup BenchmarkInterface 
Instance details

Defined in Distribution.Types.BenchmarkInterface

Methods

(<>) :: BenchmarkInterface -> BenchmarkInterface -> BenchmarkInterface #

sconcat :: NonEmpty BenchmarkInterface -> BenchmarkInterface

stimes :: Integral b => b -> BenchmarkInterface -> BenchmarkInterface

Semigroup BuildInfo 
Instance details

Defined in Distribution.Types.BuildInfo

Methods

(<>) :: BuildInfo -> BuildInfo -> BuildInfo #

sconcat :: NonEmpty BuildInfo -> BuildInfo

stimes :: Integral b => b -> BuildInfo -> BuildInfo

Semigroup Component 
Instance details

Defined in Distribution.Types.Component

Methods

(<>) :: Component -> Component -> Component #

sconcat :: NonEmpty Component -> Component

stimes :: Integral b => b -> Component -> Component

Semigroup DependencyMap 
Instance details

Defined in Distribution.Types.DependencyMap

Methods

(<>) :: DependencyMap -> DependencyMap -> DependencyMap #

sconcat :: NonEmpty DependencyMap -> DependencyMap

stimes :: Integral b => b -> DependencyMap -> DependencyMap

Semigroup Executable 
Instance details

Defined in Distribution.Types.Executable

Methods

(<>) :: Executable -> Executable -> Executable #

sconcat :: NonEmpty Executable -> Executable

stimes :: Integral b => b -> Executable -> Executable

Semigroup ExecutableScope 
Instance details

Defined in Distribution.Types.ExecutableScope

Methods

(<>) :: ExecutableScope -> ExecutableScope -> ExecutableScope #

sconcat :: NonEmpty ExecutableScope -> ExecutableScope

stimes :: Integral b => b -> ExecutableScope -> ExecutableScope

Semigroup FlagAssignment 
Instance details

Defined in Distribution.Types.Flag

Methods

(<>) :: FlagAssignment -> FlagAssignment -> FlagAssignment #

sconcat :: NonEmpty FlagAssignment -> FlagAssignment

stimes :: Integral b => b -> FlagAssignment -> FlagAssignment

Semigroup ForeignLib 
Instance details

Defined in Distribution.Types.ForeignLib

Methods

(<>) :: ForeignLib -> ForeignLib -> ForeignLib #

sconcat :: NonEmpty ForeignLib -> ForeignLib

stimes :: Integral b => b -> ForeignLib -> ForeignLib

Semigroup ForeignLibType 
Instance details

Defined in Distribution.Types.ForeignLibType

Methods

(<>) :: ForeignLibType -> ForeignLibType -> ForeignLibType #

sconcat :: NonEmpty ForeignLibType -> ForeignLibType

stimes :: Integral b => b -> ForeignLibType -> ForeignLibType

Semigroup Library 
Instance details

Defined in Distribution.Types.Library

Methods

(<>) :: Library -> Library -> Library #

sconcat :: NonEmpty Library -> Library

stimes :: Integral b => b -> Library -> Library

Semigroup LibraryVisibility 
Instance details

Defined in Distribution.Types.LibraryVisibility

Methods

(<>) :: LibraryVisibility -> LibraryVisibility -> LibraryVisibility #

sconcat :: NonEmpty LibraryVisibility -> LibraryVisibility

stimes :: Integral b => b -> LibraryVisibility -> LibraryVisibility

Semigroup SetupBuildInfo 
Instance details

Defined in Distribution.Types.SetupBuildInfo

Methods

(<>) :: SetupBuildInfo -> SetupBuildInfo -> SetupBuildInfo #

sconcat :: NonEmpty SetupBuildInfo -> SetupBuildInfo

stimes :: Integral b => b -> SetupBuildInfo -> SetupBuildInfo

Semigroup TestSuite 
Instance details

Defined in Distribution.Types.TestSuite

Methods

(<>) :: TestSuite -> TestSuite -> TestSuite #

sconcat :: NonEmpty TestSuite -> TestSuite

stimes :: Integral b => b -> TestSuite -> TestSuite

Semigroup TestSuiteInterface 
Instance details

Defined in Distribution.Types.TestSuiteInterface

Methods

(<>) :: TestSuiteInterface -> TestSuiteInterface -> TestSuiteInterface #

sconcat :: NonEmpty TestSuiteInterface -> TestSuiteInterface

stimes :: Integral b => b -> TestSuiteInterface -> TestSuiteInterface

Semigroup UnqualComponentName 
Instance details

Defined in Distribution.Types.UnqualComponentName

Methods

(<>) :: UnqualComponentName -> UnqualComponentName -> UnqualComponentName #

sconcat :: NonEmpty UnqualComponentName -> UnqualComponentName

stimes :: Integral b => b -> UnqualComponentName -> UnqualComponentName

Semigroup ShortText 
Instance details

Defined in Distribution.Utils.ShortText

Methods

(<>) :: ShortText -> ShortText -> ShortText #

sconcat :: NonEmpty ShortText -> ShortText

stimes :: Integral b => b -> ShortText -> ShortText

Semigroup Series 
Instance details

Defined in Data.Aeson.Encoding.Internal

Methods

(<>) :: Series -> Series -> Series #

sconcat :: NonEmpty Series -> Series

stimes :: Integral b => b -> Series -> Series

Semigroup Key 
Instance details

Defined in Data.Aeson.Key

Methods

(<>) :: Key -> Key -> Key #

sconcat :: NonEmpty Key -> Key

stimes :: Integral b => b -> Key -> Key

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 
Instance details

Defined in Data.Array.Byte

Methods

(<>) :: ByteArray -> ByteArray -> ByteArray #

sconcat :: NonEmpty ByteArray -> ByteArray

stimes :: Integral b => b -> ByteArray -> ByteArray

Semigroup All 
Instance details

Defined in Data.Semigroup.Internal

Methods

(<>) :: All -> All -> All #

sconcat :: NonEmpty All -> All

stimes :: Integral b => b -> All -> All

Semigroup Any 
Instance details

Defined in Data.Semigroup.Internal

Methods

(<>) :: Any -> Any -> Any #

sconcat :: NonEmpty Any -> Any

stimes :: Integral b => b -> Any -> Any

Semigroup Void 
Instance details

Defined in GHC.Base

Methods

(<>) :: Void -> Void -> Void #

sconcat :: NonEmpty Void -> Void

stimes :: Integral b => b -> Void -> Void

Semigroup String 
Instance details

Defined in Basement.UTF8.Base

Methods

(<>) :: String -> String -> String #

sconcat :: NonEmpty String -> String

stimes :: Integral b => b -> String -> String

Semigroup Builder 
Instance details

Defined in Data.ByteString.Builder.Internal

Semigroup ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

Semigroup ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Methods

(<>) :: ByteString -> ByteString -> ByteString #

sconcat :: NonEmpty ByteString -> ByteString

stimes :: Integral b => b -> ByteString -> ByteString

Semigroup ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Semigroup IntSet 
Instance details

Defined in Data.IntSet.Internal

Semigroup SharedSecret 
Instance details

Defined in Crypto.ECC

Methods

(<>) :: SharedSecret -> SharedSecret -> SharedSecret #

sconcat :: NonEmpty SharedSecret -> SharedSecret

stimes :: Integral b => b -> SharedSecret -> SharedSecret

Semigroup Unit 
Instance details

Defined in Control.DeepSeq

Methods

(<>) :: Unit -> Unit -> Unit #

sconcat :: NonEmpty Unit -> Unit

stimes :: Integral b => b -> Unit -> Unit

Semigroup OsString 
Instance details

Defined in System.OsString.Internal.Types.Hidden

Methods

(<>) :: OsString -> OsString -> OsString #

sconcat :: NonEmpty OsString -> OsString

stimes :: Integral b => b -> OsString -> OsString

Semigroup PosixString 
Instance details

Defined in System.OsString.Internal.Types.Hidden

Methods

(<>) :: PosixString -> PosixString -> PosixString #

sconcat :: NonEmpty PosixString -> PosixString

stimes :: Integral b => b -> PosixString -> PosixString

Semigroup WindowsString 
Instance details

Defined in System.OsString.Internal.Types.Hidden

Methods

(<>) :: WindowsString -> WindowsString -> WindowsString #

sconcat :: NonEmpty WindowsString -> WindowsString

stimes :: Integral b => b -> WindowsString -> WindowsString

Semigroup ShortText 
Instance details

Defined in GHC.Data.ShortText

Methods

(<>) :: ShortText -> ShortText -> ShortText #

sconcat :: NonEmpty ShortText -> ShortText

stimes :: Integral b => b -> ShortText -> ShortText

Semigroup Ordering 
Instance details

Defined in GHC.Base

Semigroup Empty 
Instance details

Defined in Hpack.Config

Methods

(<>) :: Empty -> Empty -> Empty #

sconcat :: NonEmpty Empty -> Empty

stimes :: Integral b => b -> Empty -> Empty

Semigroup ExecutableSection 
Instance details

Defined in Hpack.Config

Methods

(<>) :: ExecutableSection -> ExecutableSection -> ExecutableSection #

sconcat :: NonEmpty ExecutableSection -> ExecutableSection

stimes :: Integral b => b -> ExecutableSection -> ExecutableSection

Semigroup LibrarySection 
Instance details

Defined in Hpack.Config

Methods

(<>) :: LibrarySection -> LibrarySection -> LibrarySection #

sconcat :: NonEmpty LibrarySection -> LibrarySection

stimes :: Integral b => b -> LibrarySection -> LibrarySection

Semigroup BuildTools 
Instance details

Defined in Hpack.Syntax.BuildTools

Methods

(<>) :: BuildTools -> BuildTools -> BuildTools #

sconcat :: NonEmpty BuildTools -> BuildTools

stimes :: Integral b => b -> BuildTools -> BuildTools

Semigroup SystemBuildTools 
Instance details

Defined in Hpack.Syntax.BuildTools

Semigroup Dependencies 
Instance details

Defined in Hpack.Syntax.Dependencies

Semigroup CookieJar 
Instance details

Defined in Network.HTTP.Client.Types

Methods

(<>) :: CookieJar -> CookieJar -> CookieJar #

sconcat :: NonEmpty CookieJar -> CookieJar

stimes :: Integral b => b -> CookieJar -> CookieJar

Semigroup RequestBody 
Instance details

Defined in Network.HTTP.Client.Types

Semigroup PrefsMod 
Instance details

Defined in Options.Applicative.Builder

Methods

(<>) :: PrefsMod -> PrefsMod -> PrefsMod #

sconcat :: NonEmpty PrefsMod -> PrefsMod

stimes :: Integral b => b -> PrefsMod -> PrefsMod

Semigroup ParserHelp 
Instance details

Defined in Options.Applicative.Help.Types

Methods

(<>) :: ParserHelp -> ParserHelp -> ParserHelp #

sconcat :: NonEmpty ParserHelp -> ParserHelp

stimes :: Integral b => b -> ParserHelp -> ParserHelp

Semigroup Completer 
Instance details

Defined in Options.Applicative.Types

Methods

(<>) :: Completer -> Completer -> Completer #

sconcat :: NonEmpty Completer -> Completer

stimes :: Integral b => b -> Completer -> Completer

Semigroup ParseError 
Instance details

Defined in Options.Applicative.Types

Methods

(<>) :: ParseError -> ParseError -> ParseError #

sconcat :: NonEmpty ParseError -> ParseError

stimes :: Integral b => b -> ParseError -> ParseError

Semigroup OsString 
Instance details

Defined in System.OsString.Internal.Types

Methods

(<>) :: OsString -> OsString -> OsString #

sconcat :: NonEmpty OsString -> OsString

stimes :: Integral b => b -> OsString -> OsString

Semigroup PosixString 
Instance details

Defined in System.OsString.Internal.Types

Methods

(<>) :: PosixString -> PosixString -> PosixString #

sconcat :: NonEmpty PosixString -> PosixString

stimes :: Integral b => b -> PosixString -> PosixString

Semigroup WindowsString 
Instance details

Defined in System.OsString.Internal.Types

Methods

(<>) :: WindowsString -> WindowsString -> WindowsString #

sconcat :: NonEmpty WindowsString -> WindowsString

stimes :: Integral b => b -> WindowsString -> WindowsString

Semigroup EntityConstraintDefs 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

(<>) :: EntityConstraintDefs -> EntityConstraintDefs -> EntityConstraintDefs #

sconcat :: NonEmpty EntityConstraintDefs -> EntityConstraintDefs

stimes :: Integral b => b -> EntityConstraintDefs -> EntityConstraintDefs

Semigroup LinesWithComments 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

(<>) :: LinesWithComments -> LinesWithComments -> LinesWithComments #

sconcat :: NonEmpty LinesWithComments -> LinesWithComments

stimes :: Integral b => b -> LinesWithComments -> LinesWithComments

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 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

(<>) :: AnsiStyle -> AnsiStyle -> AnsiStyle #

sconcat :: NonEmpty AnsiStyle -> AnsiStyle

stimes :: Integral b => b -> AnsiStyle -> AnsiStyle

Semigroup Utf8Builder 
Instance details

Defined in RIO.Prelude.Display

Semigroup LogFunc 
Instance details

Defined in RIO.Prelude.Logger

Semigroup StylesUpdate 
Instance details

Defined in RIO.PrettyPrint.StylesUpdate

Semigroup Style 
Instance details

Defined in RIO.PrettyPrint.Types

Methods

(<>) :: Style -> Style -> Style #

sconcat :: NonEmpty Style -> Style

stimes :: Integral b => b -> Style -> Style

Semigroup AnsiAnn 
Instance details

Defined in Text.PrettyPrint.Leijen.Extended

Methods

(<>) :: AnsiAnn -> AnsiAnn -> AnsiAnn #

sconcat :: NonEmpty AnsiAnn -> AnsiAnn

stimes :: Integral b => b -> AnsiAnn -> AnsiAnn

Semigroup StyleAnn 
Instance details

Defined in Text.PrettyPrint.Leijen.Extended

Methods

(<>) :: StyleAnn -> StyleAnn -> StyleAnn #

sconcat :: NonEmpty StyleAnn -> StyleAnn

stimes :: Integral b => b -> StyleAnn -> StyleAnn

Semigroup StyleDoc 
Instance details

Defined in Text.PrettyPrint.Leijen.Extended

Semigroup GhciScript Source # 
Instance details

Defined in Stack.Ghci.Script

Semigroup FirstFalse Source # 
Instance details

Defined in Stack.Prelude

Semigroup FirstTrue Source # 
Instance details

Defined in Stack.Prelude

Semigroup AllowNewerDeps Source # 
Instance details

Defined in Stack.Types.AllowNewerDeps

Semigroup MissingPresentDeps Source # 
Instance details

Defined in Stack.Types.Build.ConstructPlan

Semigroup W Source # 
Instance details

Defined in Stack.Types.Build.ConstructPlan

Methods

(<>) :: W -> W -> W #

sconcat :: NonEmpty W -> W

stimes :: Integral b => b -> W -> W

Semigroup BenchmarkOptsMonoid Source # 
Instance details

Defined in Stack.Types.BuildOptsMonoid

Semigroup BuildOptsMonoid Source # 
Instance details

Defined in Stack.Types.BuildOptsMonoid

Semigroup HaddockOptsMonoid Source # 
Instance details

Defined in Stack.Types.BuildOptsMonoid

Semigroup TestOptsMonoid Source # 
Instance details

Defined in Stack.Types.BuildOptsMonoid

Semigroup CasaOptsMonoid Source #

Left-biased combine Casa configuration options

Instance details

Defined in Stack.Types.Casa

Semigroup ConfigMonoid Source # 
Instance details

Defined in Stack.Types.ConfigMonoid

Semigroup DockerOptsMonoid Source #

Left-biased combine Docker options

Instance details

Defined in Stack.Types.Docker

Semigroup ExtraDirs Source # 
Instance details

Defined in Stack.Types.ExtraDirs

Semigroup GlobalOptsMonoid Source # 
Instance details

Defined in Stack.Types.GlobalOptsMonoid

Semigroup InstallLocation Source # 
Instance details

Defined in Stack.Types.Installed

Semigroup IsMutable Source # 
Instance details

Defined in Stack.Types.IsMutable

Semigroup NixOptsMonoid Source #

Left-biased combine Nix options

Instance details

Defined in Stack.Types.Nix

Semigroup PackageComponentFile Source # 
Instance details

Defined in Stack.Types.PackageFile

Semigroup SetupInfo Source #

For the siGHCs field maps are deeply merged. For all fields the values from the first SetupInfo win.

Instance details

Defined in Stack.Types.SetupInfo

Semigroup IntersectingVersionRange Source # 
Instance details

Defined in Stack.Types.Version

Semigroup Builder 
Instance details

Defined in Data.Text.Internal.Builder

Methods

(<>) :: Builder -> Builder -> Builder #

sconcat :: NonEmpty Builder -> Builder

stimes :: Integral b => b -> Builder -> Builder

Semigroup StrictBuilder 
Instance details

Defined in Data.Text.Internal.StrictBuilder

Methods

(<>) :: StrictBuilder -> StrictBuilder -> StrictBuilder #

sconcat :: NonEmpty StrictBuilder -> StrictBuilder

stimes :: Integral b => b -> StrictBuilder -> StrictBuilder

Semigroup ShortText 
Instance details

Defined in Data.Text.Short.Internal

Methods

(<>) :: ShortText -> ShortText -> ShortText #

sconcat :: NonEmpty ShortText -> ShortText

stimes :: Integral b => b -> ShortText -> ShortText

Semigroup StatxFlags 
Instance details

Defined in System.Posix.Files.Common

Methods

(<>) :: StatxFlags -> StatxFlags -> StatxFlags #

sconcat :: NonEmpty StatxFlags -> StatxFlags

stimes :: Integral b => b -> StatxFlags -> StatxFlags

Semigroup StatxMask 
Instance details

Defined in System.Posix.Files.Common

Methods

(<>) :: StatxMask -> StatxMask -> StatxMask #

sconcat :: NonEmpty StatxMask -> StatxMask

stimes :: Integral b => b -> StatxMask -> StatxMask

Semigroup MergedValue 
Instance details

Defined in Data.Yaml.Config

Methods

(<>) :: MergedValue -> MergedValue -> MergedValue #

sconcat :: NonEmpty MergedValue -> MergedValue

stimes :: Integral b => b -> MergedValue -> MergedValue

Semigroup () 
Instance details

Defined in GHC.Base

Methods

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

sconcat :: NonEmpty () -> ()

stimes :: Integral b => b -> () -> ()

Semigroup (Flag a) 
Instance details

Defined in Distribution.Simple.Flag

Methods

(<>) :: Flag a -> Flag a -> Flag a #

sconcat :: NonEmpty (Flag a) -> Flag a

stimes :: Integral b => b -> Flag a -> Flag a

Semigroup dir => Semigroup (InstallDirs dir) 
Instance details

Defined in Distribution.Simple.InstallDirs

Methods

(<>) :: InstallDirs dir -> InstallDirs dir -> InstallDirs dir #

sconcat :: NonEmpty (InstallDirs dir) -> InstallDirs dir

stimes :: Integral b => b -> InstallDirs dir -> InstallDirs dir

Semigroup (PackageIndex InstalledPackageInfo) 
Instance details

Defined in Distribution.Simple.PackageIndex

Methods

(<>) :: PackageIndex InstalledPackageInfo -> PackageIndex InstalledPackageInfo -> PackageIndex InstalledPackageInfo #

sconcat :: NonEmpty (PackageIndex InstalledPackageInfo) -> PackageIndex InstalledPackageInfo

stimes :: Integral b => b -> PackageIndex InstalledPackageInfo -> PackageIndex InstalledPackageInfo

Ord a => Semigroup (NubList a) 
Instance details

Defined in Distribution.Utils.NubList

Methods

(<>) :: NubList a -> NubList a -> NubList a #

sconcat :: NonEmpty (NubList a) -> NubList a

stimes :: Integral b => b -> NubList a -> NubList a

Ord a => Semigroup (NubListR a) 
Instance details

Defined in Distribution.Utils.NubList

Methods

(<>) :: NubListR a -> NubListR a -> NubListR a #

sconcat :: NonEmpty (NubListR a) -> NubListR a

stimes :: Integral b => b -> NubListR a -> NubListR a

Semigroup (DList a) 
Instance details

Defined in Distribution.Compat.DList

Methods

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

sconcat :: NonEmpty (DList a) -> DList a

stimes :: Integral b => b -> DList a -> DList a

Ord a => Semigroup (NonEmptySet a) 
Instance details

Defined in Distribution.Compat.NonEmptySet

Methods

(<>) :: NonEmptySet a -> NonEmptySet a -> NonEmptySet a #

sconcat :: NonEmpty (NonEmptySet a) -> NonEmptySet a

stimes :: Integral b => b -> NonEmptySet a -> NonEmptySet a

Semigroup (First' a) 
Instance details

Defined in Distribution.Compat.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) 
Instance details

Defined in Distribution.Compat.Semigroup

Methods

(<>) :: Last' a -> Last' a -> Last' a #

sconcat :: NonEmpty (Last' a) -> Last' a

stimes :: Integral b => b -> Last' a -> Last' a

Semigroup a => Semigroup (Option' a) 
Instance details

Defined in Distribution.Compat.Semigroup

Methods

(<>) :: Option' a -> Option' a -> Option' a #

sconcat :: NonEmpty (Option' a) -> Option' a

stimes :: Integral b => b -> Option' a -> Option' a

Semigroup a => Semigroup (PerCompilerFlavor a) 
Instance details

Defined in Distribution.Compiler

Methods

(<>) :: PerCompilerFlavor a -> PerCompilerFlavor a -> PerCompilerFlavor a #

sconcat :: NonEmpty (PerCompilerFlavor a) -> PerCompilerFlavor a

stimes :: Integral b => b -> PerCompilerFlavor a -> PerCompilerFlavor a

Semigroup d => Semigroup (DepTestRslt d) 
Instance details

Defined in Distribution.PackageDescription.Configuration

Methods

(<>) :: DepTestRslt d -> DepTestRslt d -> DepTestRslt d #

sconcat :: NonEmpty (DepTestRslt d) -> DepTestRslt d

stimes :: Integral b => b -> DepTestRslt d -> DepTestRslt d

Semigroup (Condition a) 
Instance details

Defined in Distribution.Types.Condition

Methods

(<>) :: Condition a -> Condition a -> Condition a #

sconcat :: NonEmpty (Condition a) -> Condition a

stimes :: Integral b => b -> Condition a -> Condition a

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 a => Semigroup (Concurrently a) 
Instance details

Defined in Control.Concurrent.Async.Internal

Methods

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

sconcat :: NonEmpty (Concurrently a) -> Concurrently a

stimes :: Integral b => b -> Concurrently a -> Concurrently a

Bits a => Semigroup (And a) 
Instance details

Defined in Data.Bits

Methods

(<>) :: And a -> And a -> And a #

sconcat :: NonEmpty (And a) -> And a

stimes :: Integral b => b -> And a -> And a

FiniteBits a => Semigroup (Iff a) 
Instance details

Defined in Data.Bits

Methods

(<>) :: Iff a -> Iff a -> Iff a #

sconcat :: NonEmpty (Iff a) -> Iff a

stimes :: Integral b => b -> Iff a -> Iff a

Bits a => Semigroup (Ior a) 
Instance details

Defined in Data.Bits

Methods

(<>) :: Ior a -> Ior a -> Ior a #

sconcat :: NonEmpty (Ior a) -> Ior a

stimes :: Integral b => b -> Ior a -> Ior a

Bits a => Semigroup (Xor a) 
Instance details

Defined in Data.Bits

Methods

(<>) :: Xor a -> Xor a -> Xor a #

sconcat :: NonEmpty (Xor a) -> Xor a

stimes :: Integral b => b -> Xor a -> Xor a

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) 
Instance details

Defined in Data.Functor.Contravariant

Methods

(<>) :: Comparison a -> Comparison a -> Comparison a #

sconcat :: NonEmpty (Comparison a) -> Comparison a

stimes :: Integral b => b -> Comparison a -> Comparison a

Semigroup (Equivalence a) 
Instance details

Defined in Data.Functor.Contravariant

Methods

(<>) :: Equivalence a -> Equivalence a -> Equivalence a #

sconcat :: NonEmpty (Equivalence a) -> Equivalence a

stimes :: Integral b => b -> Equivalence a -> Equivalence a

Semigroup (Predicate 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 a => Semigroup (Identity a) 
Instance details

Defined in Data.Functor.Identity

Methods

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

sconcat :: NonEmpty (Identity a) -> Identity a

stimes :: Integral b => b -> Identity a -> Identity a

Ord a => Semigroup (Max a) 
Instance details

Defined in Data.Functor.Utils

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) 
Instance details

Defined in Data.Functor.Utils

Methods

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

sconcat :: NonEmpty (Min a) -> Min a

stimes :: Integral b => b -> Min a -> Min a

Semigroup (First a) 
Instance details

Defined in 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) 
Instance details

Defined in 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) 
Instance details

Defined in Data.Ord

Methods

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

sconcat :: NonEmpty (Down a) -> Down a

stimes :: Integral b => b -> Down a -> Down a

Semigroup (First a) 
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) 
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) 
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) 
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) 
Instance details

Defined in Data.Semigroup

Methods

(<>) :: WrappedMonoid m -> WrappedMonoid m -> WrappedMonoid m #

sconcat :: NonEmpty (WrappedMonoid m) -> WrappedMonoid m

stimes :: Integral b => b -> WrappedMonoid m -> WrappedMonoid m

Semigroup a => Semigroup (Dual a) 
Instance details

Defined in 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) 
Instance details

Defined in 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) 
Instance details

Defined in 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) 
Instance details

Defined in Data.Semigroup.Internal

Methods

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

sconcat :: NonEmpty (Sum a) -> Sum a

stimes :: Integral b => b -> Sum a -> Sum a

Semigroup (NonEmpty a) 
Instance details

Defined in GHC.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) 
Instance details

Defined in GHC.Conc.Sync

Methods

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

sconcat :: NonEmpty (STM a) -> STM a

stimes :: Integral b => b -> STM a -> STM a

(Generic a, Semigroup (Rep a ())) => Semigroup (Generically a) 
Instance details

Defined in GHC.Generics

Methods

(<>) :: Generically a -> Generically a -> Generically a #

sconcat :: NonEmpty (Generically a) -> Generically a

stimes :: Integral b => b -> Generically a -> Generically a

Semigroup p => Semigroup (Par1 p) 
Instance details

Defined in GHC.Generics

Methods

(<>) :: Par1 p -> Par1 p -> Par1 p #

sconcat :: NonEmpty (Par1 p) -> Par1 p

stimes :: Integral b => b -> Par1 p -> Par1 p

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 s => Semigroup (CI s) 
Instance details

Defined in Data.CaseInsensitive.Internal

Methods

(<>) :: CI s -> CI s -> CI s #

sconcat :: NonEmpty (CI s) -> CI s

stimes :: Integral b => b -> CI s -> CI s

Num a => Semigroup (AlphaColour a) 
Instance details

Defined in Data.Colour.Internal

Methods

(<>) :: AlphaColour a -> AlphaColour a -> AlphaColour a #

sconcat :: NonEmpty (AlphaColour a) -> AlphaColour a

stimes :: Integral b => b -> AlphaColour a -> AlphaColour a

Num a => Semigroup (Colour a) 
Instance details

Defined in Data.Colour.Internal

Methods

(<>) :: Colour a -> Colour a -> Colour a #

sconcat :: NonEmpty (Colour a) -> Colour a

stimes :: Integral b => b -> Colour a -> Colour a

Semigroup (IntMap a) 
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) 
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

Methods

(<>) :: Intersection a -> Intersection a -> Intersection a #

sconcat :: NonEmpty (Intersection a) -> Intersection a

stimes :: Integral b => b -> Intersection a -> Intersection a

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) 
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 a => Semigroup (IO a) 
Instance details

Defined in GHC.Base

Methods

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

sconcat :: NonEmpty (IO a) -> IO a

stimes :: Integral b => b -> IO a -> IO a

Semigroup (List a) 
Instance details

Defined in Data.Aeson.Config.Types

Methods

(<>) :: List a -> List a -> List a #

sconcat :: NonEmpty (List a) -> List a

stimes :: Integral b => b -> List a -> List 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

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

Methods

(<>) :: DefaultProp a -> DefaultProp a -> DefaultProp a #

sconcat :: NonEmpty (DefaultProp a) -> DefaultProp a

stimes :: Integral b => b -> DefaultProp a -> DefaultProp a

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 (SingleOrNot a) 
Instance details

Defined in Pantry

Methods

(<>) :: SingleOrNot a -> SingleOrNot a -> SingleOrNot a #

sconcat :: NonEmpty (SingleOrNot a) -> SingleOrNot a

stimes :: Integral b => b -> SingleOrNot a -> SingleOrNot a

Semigroup (SetOnceAtMost a) 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

(<>) :: SetOnceAtMost a -> SetOnceAtMost a -> SetOnceAtMost a #

sconcat :: NonEmpty (SetOnceAtMost a) -> SetOnceAtMost a

stimes :: Integral b => b -> SetOnceAtMost a -> SetOnceAtMost 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) 
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) 
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) 
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) 
Instance details

Defined in Data.Primitive.SmallArray

Methods

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

sconcat :: NonEmpty (SmallArray a) -> SmallArray a

stimes :: Integral b => b -> SmallArray a -> SmallArray a

Monad m => Semigroup (RetryPolicyM m) 
Instance details

Defined in Control.Retry

Methods

(<>) :: RetryPolicyM m -> RetryPolicyM m -> RetryPolicyM m #

sconcat :: NonEmpty (RetryPolicyM m) -> RetryPolicyM m

stimes :: Integral b => b -> RetryPolicyM m -> RetryPolicyM m

Semigroup (GLogFunc msg) 
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

Semigroup (CompCollection component) Source # 
Instance details

Defined in Stack.Types.CompCollection

Methods

(<>) :: CompCollection component -> CompCollection component -> CompCollection component #

sconcat :: NonEmpty (CompCollection component) -> CompCollection component

stimes :: Integral b => b -> CompCollection component -> CompCollection component

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) 
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

Semigroup (Validity k) 
Instance details

Defined in Data.HashMap.Internal.Debug

Methods

(<>) :: Validity k -> Validity k -> Validity k #

sconcat :: NonEmpty (Validity k) -> Validity k

stimes :: Integral b => b -> Validity k -> Validity k

(Hashable a, Eq a) => Semigroup (HashSet a) 
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 (Vector a) 
Instance details

Defined in Data.Vector.Strict

Methods

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

sconcat :: NonEmpty (Vector a) -> Vector a

stimes :: Integral b => b -> Vector a -> Vector a

Semigroup (YamlParser a) 
Instance details

Defined in Data.Yaml.Parser

Methods

(<>) :: YamlParser a -> YamlParser a -> YamlParser a #

sconcat :: NonEmpty (YamlParser a) -> YamlParser a

stimes :: Integral b => b -> YamlParser a -> YamlParser a

Semigroup a => Semigroup (Maybe a) 
Instance details

Defined in GHC.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) 
Instance details

Defined in GHC.Base

Methods

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

sconcat :: NonEmpty (Solo a) -> Solo a

stimes :: Integral b => b -> Solo a -> Solo a

Semigroup [a] 
Instance details

Defined in GHC.Base

Methods

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

sconcat :: NonEmpty [a] -> [a]

stimes :: Integral b => b -> [a] -> [a]

Semigroup a => Semigroup (ConcurrentlyE e a) 
Instance details

Defined in Control.Concurrent.Async.Internal

Methods

(<>) :: ConcurrentlyE e a -> ConcurrentlyE e a -> ConcurrentlyE e a #

sconcat :: NonEmpty (ConcurrentlyE e a) -> ConcurrentlyE e a

stimes :: Integral b => b -> ConcurrentlyE e a -> ConcurrentlyE e 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

Monad m => Semigroup (ZeptoT m a) 
Instance details

Defined in Data.Attoparsec.Zepto

Methods

(<>) :: ZeptoT m a -> ZeptoT m a -> ZeptoT m a #

sconcat :: NonEmpty (ZeptoT m a) -> ZeptoT m a

stimes :: Integral b => b -> ZeptoT m a -> ZeptoT m a

Semigroup (Either a b) 
Instance details

Defined in 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 a => Semigroup (Op a b) 
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

Semigroup (Proxy s) 
Instance details

Defined in 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) 
Instance details

Defined in GHC.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) 
Instance details

Defined in GHC.Generics

Methods

(<>) :: V1 p -> V1 p -> V1 p #

sconcat :: NonEmpty (V1 p) -> V1 p

stimes :: Integral b => b -> V1 p -> V1 p

Semigroup a => Semigroup (ST s a) 
Instance details

Defined in GHC.ST

Methods

(<>) :: ST s a -> ST s a -> ST s a #

sconcat :: NonEmpty (ST s a) -> ST s a

stimes :: Integral b => b -> ST s a -> ST s a

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 a, Semigroup b) => Semigroup (Product a b) 
Instance details

Defined in Data.Aeson.Config.Types

Methods

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

sconcat :: NonEmpty (Product a b) -> Product a b

stimes :: Integral b0 => b0 -> Product a b -> Product a b

Applicative f => Semigroup (Traversed a f) 
Instance details

Defined in Lens.Micro

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

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

(Applicative m, Semigroup a) => Semigroup (LoggingT m a) 
Instance details

Defined in Control.Monad.Logger

Methods

(<>) :: LoggingT m a -> LoggingT m a -> LoggingT m a #

sconcat :: NonEmpty (LoggingT m a) -> LoggingT m a

stimes :: Integral b => b -> LoggingT m a -> LoggingT m a

(Applicative m, Semigroup a) => Semigroup (NoLoggingT m a) 
Instance details

Defined in Control.Monad.Logger

Methods

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

sconcat :: NonEmpty (NoLoggingT m a) -> NoLoggingT m a

stimes :: Integral b => b -> NoLoggingT m a -> NoLoggingT m a

(Applicative m, Semigroup a) => Semigroup (WriterLoggingT m a) 
Instance details

Defined in Control.Monad.Logger

Methods

(<>) :: WriterLoggingT m a -> WriterLoggingT m a -> WriterLoggingT m a #

sconcat :: NonEmpty (WriterLoggingT m a) -> WriterLoggingT m a

stimes :: Integral b => b -> WriterLoggingT m a -> WriterLoggingT m a

Semigroup (Mod f a) 
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

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

(Ord k, Semigroup a) => Semigroup (MonoidMap k a) Source # 
Instance details

Defined in Data.Monoid.Map

Methods

(<>) :: MonoidMap k a -> MonoidMap k a -> MonoidMap k a #

sconcat :: NonEmpty (MonoidMap k a) -> MonoidMap k a

stimes :: Integral b => b -> MonoidMap k a -> MonoidMap k 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) 
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) 
Instance details

Defined in UnliftIO.Internals.Async

(Eq k, Hashable k) => Semigroup (HashMap k v) 
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) 
Instance details

Defined in GHC.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) 
Instance details

Defined in GHC.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 c) => Semigroup (CondTree v c a) 
Instance details

Defined in Distribution.Types.CondTree

Methods

(<>) :: CondTree v c a -> CondTree v c a -> CondTree v c a #

sconcat :: NonEmpty (CondTree v c a) -> CondTree v c a

stimes :: Integral b => b -> CondTree v c a -> CondTree v c a

Semigroup a => Semigroup (Const a b) 
Instance details

Defined in 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) 
Instance details

Defined in 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) 
Instance details

Defined in 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) 
Instance details

Defined in GHC.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

Semigroup a => Semigroup (Alias deprecated alias a) 
Instance details

Defined in Data.Aeson.Config.FromValue

Methods

(<>) :: Alias deprecated alias a -> Alias deprecated alias a -> Alias deprecated alias a #

sconcat :: NonEmpty (Alias deprecated alias a) -> Alias deprecated alias a

stimes :: Integral b => b -> Alias deprecated alias a -> Alias deprecated alias 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

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 (GenEntries tarPath linkTarget e) 
Instance details

Defined in Codec.Archive.Tar.Types

Methods

(<>) :: GenEntries tarPath linkTarget e -> GenEntries tarPath linkTarget e -> GenEntries tarPath linkTarget e #

sconcat :: NonEmpty (GenEntries tarPath linkTarget e) -> GenEntries tarPath linkTarget e

stimes :: Integral b => b -> GenEntries tarPath linkTarget e -> GenEntries tarPath linkTarget e

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) 
Instance details

Defined in GHC.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) 
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

(Semigroup (f p), Semigroup (g p)) => Semigroup ((f :*: g) p) 
Instance details

Defined in GHC.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) 
Instance details

Defined in GHC.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

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 a, Semigroup b, Semigroup c, Semigroup d) => Semigroup (a, b, c, d) 
Instance details

Defined in GHC.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) 
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) 
Instance details

Defined in GHC.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) 
Instance details

Defined in GHC.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

(Semigroup asmSources, Semigroup cSources, Semigroup cxxSources, Semigroup jsSources) => Semigroup (CommonOptions asmSources cSources cxxSources jsSources a) 
Instance details

Defined in Hpack.Config

Methods

(<>) :: CommonOptions asmSources cSources cxxSources jsSources a -> CommonOptions asmSources cSources cxxSources jsSources a -> CommonOptions asmSources cSources cxxSources jsSources a #

sconcat :: NonEmpty (CommonOptions asmSources cSources cxxSources jsSources a) -> CommonOptions asmSources cSources cxxSources jsSources a

stimes :: Integral b => b -> CommonOptions asmSources cSources cxxSources jsSources a -> CommonOptions asmSources cSources cxxSources jsSources a

(Semigroup a, Semigroup b, Semigroup c, Semigroup d, Semigroup e) => Semigroup (a, b, c, d, e) 
Instance details

Defined in GHC.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 (Typeable e, Show e) => Exception e where #

Minimal complete definition

Nothing

Instances

Instances details
Exception ConfigStateFileError 
Instance details

Defined in Distribution.Simple.Configure

Methods

toException :: ConfigStateFileError -> SomeException #

fromException :: SomeException -> Maybe ConfigStateFileError #

displayException :: ConfigStateFileError -> String #

Exception AesonException 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

toException :: AesonException -> SomeException #

fromException :: SomeException -> Maybe AesonException #

displayException :: AesonException -> String #

Exception AsyncCancelled 
Instance details

Defined in Control.Concurrent.Async.Internal

Exception ExceptionInLinkedThread 
Instance details

Defined in Control.Concurrent.Async.Internal

Methods

toException :: ExceptionInLinkedThread -> SomeException #

fromException :: SomeException -> Maybe ExceptionInLinkedThread #

displayException :: ExceptionInLinkedThread -> String #

Exception NestedAtomically 
Instance details

Defined in Control.Exception.Base

Methods

toException :: NestedAtomically -> SomeException #

fromException :: SomeException -> Maybe NestedAtomically #

displayException :: NestedAtomically -> String #

Exception NoMatchingContinuationPrompt 
Instance details

Defined in Control.Exception.Base

Methods

toException :: NoMatchingContinuationPrompt -> SomeException #

fromException :: SomeException -> Maybe NoMatchingContinuationPrompt #

displayException :: NoMatchingContinuationPrompt -> String #

Exception NoMethodError 
Instance details

Defined in Control.Exception.Base

Methods

toException :: NoMethodError -> SomeException #

fromException :: SomeException -> Maybe NoMethodError #

displayException :: NoMethodError -> String #

Exception NonTermination 
Instance details

Defined in Control.Exception.Base

Methods

toException :: NonTermination -> SomeException #

fromException :: SomeException -> Maybe NonTermination #

displayException :: NonTermination -> String #

Exception PatternMatchFail 
Instance details

Defined in Control.Exception.Base

Methods

toException :: PatternMatchFail -> SomeException #

fromException :: SomeException -> Maybe PatternMatchFail #

displayException :: PatternMatchFail -> String #

Exception RecConError 
Instance details

Defined in Control.Exception.Base

Methods

toException :: RecConError -> SomeException #

fromException :: SomeException -> Maybe RecConError #

displayException :: RecConError -> String #

Exception RecSelError 
Instance details

Defined in Control.Exception.Base

Methods

toException :: RecSelError -> SomeException #

fromException :: SomeException -> Maybe RecSelError #

displayException :: RecSelError -> String #

Exception RecUpdError 
Instance details

Defined in Control.Exception.Base

Methods

toException :: RecUpdError -> SomeException #

fromException :: SomeException -> Maybe RecUpdError #

displayException :: RecUpdError -> String #

Exception TypeError 
Instance details

Defined in Control.Exception.Base

Methods

toException :: TypeError -> SomeException #

fromException :: SomeException -> Maybe TypeError #

displayException :: TypeError -> String #

Exception Dynamic 
Instance details

Defined in Data.Dynamic

Methods

toException :: Dynamic -> SomeException #

fromException :: SomeException -> Maybe Dynamic #

displayException :: Dynamic -> String #

Exception Void 
Instance details

Defined in GHC.Exception.Type

Exception ErrorCall 
Instance details

Defined in GHC.Exception

Methods

toException :: ErrorCall -> SomeException #

fromException :: SomeException -> Maybe ErrorCall #

displayException :: ErrorCall -> String #

Exception ArithException 
Instance details

Defined in GHC.Exception.Type

Methods

toException :: ArithException -> SomeException #

fromException :: SomeException -> Maybe ArithException #

displayException :: ArithException -> String #

Exception SomeException 
Instance details

Defined in GHC.Exception.Type

Exception AllocationLimitExceeded 
Instance details

Defined in GHC.IO.Exception

Methods

toException :: AllocationLimitExceeded -> SomeException #

fromException :: SomeException -> Maybe AllocationLimitExceeded #

displayException :: AllocationLimitExceeded -> String #

Exception ArrayException 
Instance details

Defined in GHC.IO.Exception

Methods

toException :: ArrayException -> SomeException #

fromException :: SomeException -> Maybe ArrayException #

displayException :: ArrayException -> String #

Exception AssertionFailed 
Instance details

Defined in GHC.IO.Exception

Methods

toException :: AssertionFailed -> SomeException #

fromException :: SomeException -> Maybe AssertionFailed #

displayException :: AssertionFailed -> String #

Exception AsyncException 
Instance details

Defined in GHC.IO.Exception

Methods

toException :: AsyncException -> SomeException #

fromException :: SomeException -> Maybe AsyncException #

displayException :: AsyncException -> String #

Exception BlockedIndefinitelyOnMVar 
Instance details

Defined in GHC.IO.Exception

Methods

toException :: BlockedIndefinitelyOnMVar -> SomeException #

fromException :: SomeException -> Maybe BlockedIndefinitelyOnMVar #

displayException :: BlockedIndefinitelyOnMVar -> String #

Exception BlockedIndefinitelyOnSTM 
Instance details

Defined in GHC.IO.Exception

Methods

toException :: BlockedIndefinitelyOnSTM -> SomeException #

fromException :: SomeException -> Maybe BlockedIndefinitelyOnSTM #

displayException :: BlockedIndefinitelyOnSTM -> String #

Exception CompactionFailed 
Instance details

Defined in GHC.IO.Exception

Methods

toException :: CompactionFailed -> SomeException #

fromException :: SomeException -> Maybe CompactionFailed #

displayException :: CompactionFailed -> String #

Exception Deadlock 
Instance details

Defined in GHC.IO.Exception

Methods

toException :: Deadlock -> SomeException #

fromException :: SomeException -> Maybe Deadlock #

displayException :: Deadlock -> String #

Exception ExitCode 
Instance details

Defined in GHC.IO.Exception

Exception FixIOException 
Instance details

Defined in GHC.IO.Exception

Methods

toException :: FixIOException -> SomeException #

fromException :: SomeException -> Maybe FixIOException #

displayException :: FixIOException -> String #

Exception IOException 
Instance details

Defined in GHC.IO.Exception

Exception SomeAsyncException 
Instance details

Defined in GHC.IO.Exception

Exception IOPortException 
Instance details

Defined in GHC.IOPort

Methods

toException :: IOPortException -> SomeException #

fromException :: SomeException -> Maybe IOPortException #

displayException :: IOPortException -> String #

Exception Timeout 
Instance details

Defined in System.Timeout

Methods

toException :: Timeout -> SomeException #

fromException :: SomeException -> Maybe Timeout #

displayException :: Timeout -> String #

Exception ASCII7_Invalid 
Instance details

Defined in Basement.String.Encoding.ASCII7

Methods

toException :: ASCII7_Invalid -> SomeException #

fromException :: SomeException -> Maybe ASCII7_Invalid #

displayException :: ASCII7_Invalid -> String #

Exception ISO_8859_1_Invalid 
Instance details

Defined in Basement.String.Encoding.ISO_8859_1

Methods

toException :: ISO_8859_1_Invalid -> SomeException #

fromException :: SomeException -> Maybe ISO_8859_1_Invalid #

displayException :: ISO_8859_1_Invalid -> String #

Exception UTF16_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF16

Methods

toException :: UTF16_Invalid -> SomeException #

fromException :: SomeException -> Maybe UTF16_Invalid #

displayException :: UTF16_Invalid -> String #

Exception UTF32_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF32

Methods

toException :: UTF32_Invalid -> SomeException #

fromException :: SomeException -> Maybe UTF32_Invalid #

displayException :: UTF32_Invalid -> String #

Exception SizeOverflowException 
Instance details

Defined in Data.ByteString.Internal.Type

Methods

toException :: SizeOverflowException -> SomeException #

fromException :: SomeException -> Maybe SizeOverflowException #

displayException :: SizeOverflowException -> String #

Exception PullException 
Instance details

Defined in Casa.Client

Exception PushException 
Instance details

Defined in Casa.Client

Exception CompanionDone 
Instance details

Defined in Control.Concurrent.Companion

Methods

toException :: CompanionDone -> SomeException #

fromException :: SomeException -> Maybe CompanionDone #

displayException :: CompanionDone -> String #

Exception ParseError 
Instance details

Defined in Data.Conduit.Attoparsec

Methods

toException :: ParseError -> SomeException #

fromException :: SomeException -> Maybe ParseError #

displayException :: ParseError -> String #

Exception SinkStorableException 
Instance details

Defined in Data.Conduit.Binary

Methods

toException :: SinkStorableException -> SomeException #

fromException :: SomeException -> Maybe SinkStorableException #

displayException :: SinkStorableException -> String #

Exception TextException 
Instance details

Defined in Data.Conduit.Text

Methods

toException :: TextException -> SomeException #

fromException :: SomeException -> Maybe TextException #

displayException :: TextException -> String #

Exception CryptoError 
Instance details

Defined in Crypto.Error.Types

Methods

toException :: CryptoError -> SomeException #

fromException :: SomeException -> Maybe CryptoError #

displayException :: CryptoError -> String #

Exception CoprimesAssertionError 
Instance details

Defined in Crypto.Number.ModArithmetic

Methods

toException :: CoprimesAssertionError -> SomeException #

fromException :: SomeException -> Maybe CoprimesAssertionError #

displayException :: CoprimesAssertionError -> String #

Exception ModulusAssertionError 
Instance details

Defined in Crypto.Number.ModArithmetic

Methods

toException :: ModulusAssertionError -> SomeException #

fromException :: SomeException -> Maybe ModulusAssertionError #

displayException :: ModulusAssertionError -> String #

Exception Timeout 
Instance details

Defined in System.Time.Extra

Methods

toException :: Timeout -> SomeException #

fromException :: SomeException -> Maybe Timeout #

displayException :: Timeout -> String #

Exception GitHashException 
Instance details

Defined in GitHash

Methods

toException :: GitHashException -> SomeException #

fromException :: SomeException -> Maybe GitHashException #

displayException :: GitHashException -> String #

Exception EncapsulatedPopperException 
Instance details

Defined in Network.HTTP.Client.Request

Methods

toException :: EncapsulatedPopperException -> SomeException #

fromException :: SomeException -> Maybe EncapsulatedPopperException #

displayException :: EncapsulatedPopperException -> String #

Exception HttpException 
Instance details

Defined in Network.HTTP.Client.Types

Exception HttpExceptionContentWrapper 
Instance details

Defined in Network.HTTP.Client.Types

Methods

toException :: HttpExceptionContentWrapper -> SomeException #

fromException :: SomeException -> Maybe HttpExceptionContentWrapper #

displayException :: HttpExceptionContentWrapper -> String #

Exception DigestAuthException 
Instance details

Defined in Network.HTTP.Client.TLS

Methods

toException :: DigestAuthException -> SomeException #

fromException :: SomeException -> Maybe DigestAuthException #

displayException :: DigestAuthException -> String #

Exception JSONException 
Instance details

Defined in Network.HTTP.Simple

Methods

toException :: JSONException -> SomeException #

fromException :: SomeException -> Maybe JSONException #

displayException :: JSONException -> String #

Exception DownloadException 
Instance details

Defined in Network.HTTP.Download

Exception VerifiedDownloadException 
Instance details

Defined in Network.HTTP.Download.Verified

Exception VerifyFileException 
Instance details

Defined in Network.HTTP.Download.Verified

Methods

toException :: VerifyFileException -> SomeException #

fromException :: SomeException -> Maybe VerifyFileException #

displayException :: VerifyFileException -> String #

Exception ToEventRawException 
Instance details

Defined in Text.Libyaml

Methods

toException :: ToEventRawException -> SomeException #

fromException :: SomeException -> Maybe ToEventRawException #

displayException :: ToEventRawException -> String #

Exception YamlException 
Instance details

Defined in Text.Libyaml

Methods

toException :: YamlException -> SomeException #

fromException :: SomeException -> Maybe YamlException #

displayException :: YamlException -> String #

Exception NullError 
Instance details

Defined in Data.NonNull

Methods

toException :: NullError -> SomeException #

fromException :: SomeException -> Maybe NullError #

displayException :: NullError -> String #

Exception LoadCachedTreeException 
Instance details

Defined in Pantry.Storage

Methods

toException :: LoadCachedTreeException -> SomeException #

fromException :: SomeException -> Maybe LoadCachedTreeException #

displayException :: LoadCachedTreeException -> String #

Exception SHA256Exception 
Instance details

Defined in Pantry.SHA256

Methods

toException :: SHA256Exception -> SomeException #

fromException :: SomeException -> Maybe SHA256Exception #

displayException :: SHA256Exception -> String #

Exception PantryException 
Instance details

Defined in Pantry.Types

Exception ParseError 
Instance details

Defined in Text.Parsec.Error

Methods

toException :: ParseError -> SomeException #

fromException :: SomeException -> Maybe ParseError #

displayException :: ParseError -> String #

Exception PathException 
Instance details

Defined in Path.Posix

Methods

toException :: PathException -> SomeException #

fromException :: SomeException -> Maybe PathException #

displayException :: PathException -> String #

Exception PathException 
Instance details

Defined in Path.Windows

Methods

toException :: PathException -> SomeException #

fromException :: SomeException -> Maybe PathException #

displayException :: PathException -> String #

Exception PersistUnsafeMigrationException 
Instance details

Defined in Database.Persist.Sql.Migration

Methods

toException :: PersistUnsafeMigrationException -> SomeException #

fromException :: SomeException -> Maybe PersistUnsafeMigrationException #

displayException :: PersistUnsafeMigrationException -> String #

Exception OnlyUniqueException 
Instance details

Defined in Database.Persist.Types.Base

Methods

toException :: OnlyUniqueException -> SomeException #

fromException :: SomeException -> Maybe OnlyUniqueException #

displayException :: OnlyUniqueException -> String #

Exception PersistException 
Instance details

Defined in Database.Persist.Types.Base

Methods

toException :: PersistException -> SomeException #

fromException :: SomeException -> Maybe PersistException #

displayException :: PersistException -> String #

Exception UpdateException 
Instance details

Defined in Database.Persist.Types.Base

Methods

toException :: UpdateException -> SomeException #

fromException :: SomeException -> Maybe UpdateException #

displayException :: UpdateException -> String #

Exception SqliteException 
Instance details

Defined in Database.Sqlite

Methods

toException :: SqliteException -> SomeException #

fromException :: SomeException -> Maybe SqliteException #

displayException :: SqliteException -> String #

Exception ProjectTemplateException 
Instance details

Defined in Text.ProjectTemplate

Exception InvalidAccess 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

toException :: InvalidAccess -> SomeException #

fromException :: SomeException -> Maybe InvalidAccess #

displayException :: InvalidAccess -> String #

Exception ResourceCleanupException 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

toException :: ResourceCleanupException -> SomeException #

fromException :: SomeException -> Maybe ResourceCleanupException #

displayException :: ResourceCleanupException -> String #

Exception ProcessException 
Instance details

Defined in RIO.Process

Methods

toException :: ProcessException -> SomeException #

fromException :: SomeException -> Maybe ProcessException #

displayException :: ProcessException -> String #

Exception PrettyException 
Instance details

Defined in RIO.PrettyPrint.PrettyException

Exception AsyncExceptionWrapper 
Instance details

Defined in Control.Exception.Safe

Exception StringException 
Instance details

Defined in Control.Exception.Safe

Methods

toException :: StringException -> SomeException #

fromException :: SomeException -> Maybe StringException #

displayException :: StringException -> String #

Exception SyncExceptionWrapper 
Instance details

Defined in Control.Exception.Safe

Exception BuildPlanException Source # 
Instance details

Defined in Stack.BuildPlan

Exception ConfigDockerException Source # 
Instance details

Defined in Stack.Config.Docker

Exception GhciException Source # 
Instance details

Defined in Stack.Ghci

Exception GhciPrettyException Source # 
Instance details

Defined in Stack.Ghci

Exception BuildException Source # 
Instance details

Defined in Stack.Types.Build.Exception

Exception BuildPrettyException Source # 
Instance details

Defined in Stack.Types.Build.Exception

Exception CompilerException Source # 
Instance details

Defined in Stack.Types.Compiler

Exception ConfigException Source # 
Instance details

Defined in Stack.Types.Config.Exception

Exception ConfigPrettyException Source # 
Instance details

Defined in Stack.Types.Config.Exception

Exception ParseAbsolutePathException Source # 
Instance details

Defined in Stack.Types.Config.Exception

Exception DockerException Source # 
Instance details

Defined in Stack.Types.Docker

Exception PackageException Source # 
Instance details

Defined in Stack.Types.Package

Exception StoragePrettyException Source # 
Instance details

Defined in Stack.Types.Storage

Exception PagerException Source # 
Instance details

Defined in System.Process.Pager

Exception StaticBytesException 
Instance details

Defined in Data.StaticBytes

Exception FormatError 
Instance details

Defined in Codec.Archive.Tar.Read

Methods

toException :: FormatError -> SomeException #

fromException :: SomeException -> Maybe FormatError #

displayException :: FormatError -> String #

Exception LinkTargetException 
Instance details

Defined in Codec.Archive.Tar.Types

Methods

toException :: LinkTargetException -> SomeException #

fromException :: SomeException -> Maybe LinkTargetException #

displayException :: LinkTargetException -> String #

Exception TarCreateException 
Instance details

Defined in Data.Conduit.Tar.Types

Methods

toException :: TarCreateException -> SomeException #

fromException :: SomeException -> Maybe TarCreateException #

displayException :: TarCreateException -> String #

Exception TarException 
Instance details

Defined in Data.Conduit.Tar.Types

Methods

toException :: TarException -> SomeException #

fromException :: SomeException -> Maybe TarException #

displayException :: TarException -> String #

Exception UnicodeException 
Instance details

Defined in Data.Text.Encoding.Error

Exception ByteStringOutputException 
Instance details

Defined in System.Process.Typed.Internal

Methods

toException :: ByteStringOutputException -> SomeException #

fromException :: SomeException -> Maybe ByteStringOutputException #

displayException :: ByteStringOutputException -> String #

Exception ExitCodeException 
Instance details

Defined in System.Process.Typed.Internal

Methods

toException :: ExitCodeException -> SomeException #

fromException :: SomeException -> Maybe ExitCodeException #

displayException :: ExitCodeException -> String #

Exception StringException 
Instance details

Defined in UnliftIO.Exception

Exception ConcException 
Instance details

Defined in UnliftIO.Internals.Async

Exception ParseException 
Instance details

Defined in Data.Yaml.Internal

Exception YamlParseException 
Instance details

Defined in Data.Yaml.Parser

Methods

toException :: YamlParseException -> SomeException #

fromException :: SomeException -> Maybe YamlParseException #

displayException :: YamlParseException -> String #

Exception DecompressError 
Instance details

Defined in Codec.Compression.Zlib.Internal

Methods

toException :: DecompressError -> SomeException #

fromException :: SomeException -> Maybe DecompressError #

displayException :: DecompressError -> String #

data Text #

Instances

Instances details
Structured Text 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy Text -> Structure

structureHash' :: Tagged Text MD5

FromJSON Text 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Text

parseJSONList :: Value -> Parser [Text]

omittedField :: Maybe Text

FromJSONKey Text 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction Text

fromJSONKeyList :: FromJSONKeyFunction [Text]

ToJSON Text 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Text -> Value

toEncoding :: Text -> Encoding

toJSONList :: [Text] -> Value

toEncodingList :: [Text] -> Encoding

omitField :: Text -> Bool

ToJSONKey Text 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction Text

toJSONKeyList :: ToJSONKeyFunction [Text]

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

FoldCase Text 
Instance details

Defined in Data.CaseInsensitive.Internal

Methods

foldCase :: Text -> Text

foldCaseList :: [Text] -> [Text]

AttoparsecInput Text 
Instance details

Defined in Data.Conduit.Attoparsec

Methods

parseA :: Parser Text b -> Text -> IResult Text b

feedA :: IResult Text b -> Text -> IResult Text b

empty :: Text

isNull :: Text -> Bool

getLinesCols :: Text -> Position

stripFromEnd :: Text -> Text -> Text

Hashable Text 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Text -> Int

hash :: Text -> Int

FromValue Text 
Instance details

Defined in Data.Aeson.Config.FromValue

FromHttpApiData Text 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Text 
Instance details

Defined in Web.Internal.HttpApiData

QueryKeyLike Text 
Instance details

Defined in Network.HTTP.Types.QueryLike

QueryValueLike Text 
Instance details

Defined in Network.HTTP.Types.QueryLike

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

Methods

intersperse :: Element Text -> Text -> Text

reverse :: Text -> Text

find :: (Element Text -> Bool) -> Text -> Maybe (Element Text)

sortBy :: (Element Text -> Element Text -> Ordering) -> Text -> Text

cons :: Element Text -> Text -> Text

snoc :: Text -> Element Text -> Text

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)

ToMustache Text 
Instance details

Defined in Text.Mustache.Internal.Types

PathPiece Text 
Instance details

Defined in Web.PathPieces

PersistField Text 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Text -> PersistValue

fromPersistValue :: PersistValue -> Either Text Text

PersistFieldSql Text 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Text -> SqlType

Pretty Text 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Text -> Doc ann

prettyList :: [Text] -> Doc ann

Display Text 
Instance details

Defined in RIO.Prelude.Display

ToYaml Text 
Instance details

Defined in Data.Yaml.Builder

Methods

toYaml :: Text -> YamlBuilder

FromYaml Text 
Instance details

Defined in Data.Yaml.Parser

Methods

fromYaml :: YamlValue -> YamlParser Text

LazySequence Text Text 
Instance details

Defined in Data.Sequences

Methods

toChunks :: Text -> [Text]

fromChunks :: [Text] -> Text

toStrict :: Text -> Text

fromStrict :: Text -> Text

Utf8 Text ByteString 
Instance details

Defined in Data.Sequences

SymbolToField "commit" RepoCache Text 
Instance details

Defined in Pantry.Storage

Methods

symbolToField :: EntityField RepoCache Text

SymbolToField "preferred" PreferredVersions Text 
Instance details

Defined in Pantry.Storage

Methods

symbolToField :: EntityField PreferredVersions Text

SymbolToField "subdir" ArchiveCache Text 
Instance details

Defined in Pantry.Storage

Methods

symbolToField :: EntityField ArchiveCache Text

SymbolToField "subdir" RepoCache Text 
Instance details

Defined in Pantry.Storage

Methods

symbolToField :: EntityField RepoCache Text

SymbolToField "url" ArchiveCache Text 
Instance details

Defined in Pantry.Storage

Methods

symbolToField :: EntityField ArchiveCache Text

SymbolToField "url" RepoCache Text 
Instance details

Defined in Pantry.Storage

Methods

symbolToField :: EntityField RepoCache Text

SymbolToField "url" UrlBlob Text 
Instance details

Defined in Pantry.Storage

Methods

symbolToField :: EntityField UrlBlob Text

ToMustache ω => ToMustache (Map Text ω) 
Instance details

Defined in Text.Mustache.Internal.Types

ToMustache ω => ToMustache (HashMap Text ω) 
Instance details

Defined in Text.Mustache.Internal.Types

ToMustache (STree -> SubM STree) 
Instance details

Defined in Text.Mustache.Internal.Types

PersistField v => PersistField (Map Text v) 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Map Text v -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Map Text v)

PersistFieldSql v => PersistFieldSql (Map Text v) 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy (Map Text v) -> SqlType

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 Element Text 
Instance details

Defined in Data.MonoTraversable

type Element Text = Char
type Index Text 
Instance details

Defined in Data.Sequences

type Index Text = Int

data Void #

Instances

Instances details
FromJSON Void 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Void

parseJSONList :: Value -> Parser [Void]

omittedField :: Maybe Void

FromJSONKey Void 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction Void

fromJSONKeyList :: FromJSONKeyFunction [Void]

ToJSON Void 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Void -> Value

toEncoding :: Void -> Encoding

toJSONList :: [Void] -> Value

toEncodingList :: [Void] -> Encoding

omitField :: Void -> Bool

ToJSONKey Void 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction Void

toJSONKeyList :: ToJSONKeyFunction [Void]

Data Void 
Instance details

Defined in Data.Data

Methods

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

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

toConstr :: Void -> Constr #

dataTypeOf :: Void -> DataType #

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

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

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

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

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

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

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

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

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

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

Semigroup Void 
Instance details

Defined in GHC.Base

Methods

(<>) :: Void -> Void -> Void #

sconcat :: NonEmpty Void -> Void

stimes :: Integral b => b -> Void -> Void

Exception Void 
Instance details

Defined in GHC.Exception.Type

Generic Void 
Instance details

Defined in GHC.Generics

Associated Types

type Rep Void 
Instance details

Defined in GHC.Generics

type Rep Void = D1 ('MetaData "Void" "GHC.Base" "base" 'False) (V1 :: Type -> Type)

Methods

from :: Void -> Rep Void x

to :: Rep Void x -> Void

Ix Void 
Instance details

Defined in GHC.Ix

Methods

range :: (Void, Void) -> [Void]

index :: (Void, Void) -> Void -> Int

unsafeIndex :: (Void, Void) -> Void -> Int

inRange :: (Void, Void) -> Void -> Bool

rangeSize :: (Void, Void) -> Int

unsafeRangeSize :: (Void, Void) -> Int

Read Void 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS Void

readList :: ReadS [Void]

readPrec :: ReadPrec Void

readListPrec :: ReadPrec [Void]

Show Void 
Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Void -> ShowS

show :: Void -> String #

showList :: [Void] -> ShowS

Binary Void 
Instance details

Defined in Data.Binary.Class

Methods

put :: Void -> Put

get :: Get Void

putList :: [Void] -> Put

NFData Void 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Void -> () #

GEq Void 
Instance details

Defined in Generics.Deriving.Eq

Methods

geq :: Void -> Void -> Bool

GShow Void 
Instance details

Defined in Generics.Deriving.Show

Methods

gshowsPrec :: Int -> Void -> ShowS

gshows :: Void -> ShowS

gshow :: Void -> String

gshowList :: [Void] -> ShowS

Eq Void 
Instance details

Defined in GHC.Base

Methods

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

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

Ord Void 
Instance details

Defined in GHC.Base

Methods

compare :: Void -> Void -> Ordering #

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

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

(>) :: Void -> Void -> Bool #

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

max :: Void -> Void -> Void #

min :: Void -> Void -> Void #

Hashable Void 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Void -> Int

hash :: Void -> Int

FromHttpApiData Void 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Void 
Instance details

Defined in Web.Internal.HttpApiData

Pretty Void 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Void -> Doc ann

prettyList :: [Void] -> Doc ann

Lift Void 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Void -> m Exp

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

type Rep Void 
Instance details

Defined in GHC.Generics

type Rep Void = D1 ('MetaData "Void" "GHC.Base" "base" 'False) (V1 :: Type -> Type)

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

assert :: Bool -> a -> a #

data NonEmpty a #

Constructors

a :| [a] 

Instances

Instances details
FromJSON1 NonEmpty 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: Maybe a -> (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (NonEmpty a)

liftParseJSONList :: Maybe a -> (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [NonEmpty a]

liftOmittedField :: Maybe a -> Maybe (NonEmpty a)

ToJSON1 NonEmpty 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> NonEmpty a -> Value

liftToJSONList :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> [NonEmpty a] -> Value

liftToEncoding :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> NonEmpty a -> Encoding

liftToEncodingList :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> [NonEmpty a] -> Encoding

liftOmitField :: (a -> Bool) -> NonEmpty a -> Bool

MonadFix NonEmpty 
Instance details

Defined in Control.Monad.Fix

Methods

mfix :: (a -> NonEmpty a) -> NonEmpty a

MonadZip NonEmpty 
Instance details

Defined in Control.Monad.Zip

Methods

mzip :: NonEmpty a -> NonEmpty b -> NonEmpty (a, b)

mzipWith :: (a -> b -> c) -> NonEmpty a -> NonEmpty b -> NonEmpty c

munzip :: NonEmpty (a, b) -> (NonEmpty a, NonEmpty b)

Foldable NonEmpty 
Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => NonEmpty m -> m #

foldMap :: Monoid m => (a -> m) -> NonEmpty a -> m #

foldMap' :: Monoid m => (a -> m) -> NonEmpty a -> m

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

foldr' :: (a -> b -> b) -> b -> NonEmpty a -> b #

foldl :: (b -> a -> b) -> b -> NonEmpty a -> b

foldl' :: (b -> a -> b) -> b -> NonEmpty a -> b #

foldr1 :: (a -> a -> a) -> NonEmpty a -> a

foldl1 :: (a -> a -> a) -> NonEmpty a -> a

toList :: NonEmpty a -> [a] #

null :: NonEmpty a -> Bool #

length :: NonEmpty a -> Int #

elem :: Eq a => a -> NonEmpty a -> Bool #

maximum :: Ord a => NonEmpty a -> a

minimum :: Ord a => NonEmpty a -> a

sum :: Num a => NonEmpty a -> a #

product :: Num a => NonEmpty a -> a #

Foldable1 NonEmpty 
Instance details

Defined in Data.Foldable1

Methods

fold1 :: Semigroup m => NonEmpty m -> m

foldMap1 :: Semigroup m => (a -> m) -> NonEmpty a -> m

foldMap1' :: Semigroup m => (a -> m) -> NonEmpty a -> m

toNonEmpty :: NonEmpty a -> NonEmpty a

maximum :: Ord a => NonEmpty a -> a

minimum :: Ord a => NonEmpty a -> a

head :: NonEmpty a -> a

last :: NonEmpty a -> a

foldrMap1 :: (a -> b) -> (a -> b -> b) -> NonEmpty a -> b

foldlMap1' :: (a -> b) -> (b -> a -> b) -> NonEmpty a -> b

foldlMap1 :: (a -> b) -> (b -> a -> b) -> NonEmpty a -> b

foldrMap1' :: (a -> b) -> (a -> b -> b) -> NonEmpty a -> b

Eq1 NonEmpty 
Instance details

Defined in Data.Functor.Classes

Methods

liftEq :: (a -> b -> Bool) -> NonEmpty a -> NonEmpty b -> Bool

Ord1 NonEmpty 
Instance details

Defined in Data.Functor.Classes

Methods

liftCompare :: (a -> b -> Ordering) -> NonEmpty a -> NonEmpty b -> Ordering

Read1 NonEmpty 
Instance details

Defined in Data.Functor.Classes

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (NonEmpty a)

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [NonEmpty a]

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (NonEmpty a)

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [NonEmpty a]

Show1 NonEmpty 
Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> NonEmpty a -> ShowS

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [NonEmpty a] -> ShowS

Traversable NonEmpty 
Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> NonEmpty a -> f (NonEmpty b) #

sequenceA :: Applicative f => NonEmpty (f a) -> f (NonEmpty a) #

mapM :: Monad m => (a -> m b) -> NonEmpty a -> m (NonEmpty b) #

sequence :: Monad m => NonEmpty (m a) -> m (NonEmpty a) #

Applicative NonEmpty 
Instance details

Defined in GHC.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 #

Functor NonEmpty 
Instance details

Defined in GHC.Base

Methods

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

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

Monad NonEmpty 
Instance details

Defined in GHC.Base

Methods

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

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

return :: a -> NonEmpty a #

NFData1 NonEmpty 
Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> NonEmpty a -> ()

GFoldable NonEmpty 
Instance details

Defined in Generics.Deriving.Foldable

Methods

gfoldMap :: Monoid m => (a -> m) -> NonEmpty a -> m

gfold :: Monoid m => NonEmpty m -> m

gfoldr :: (a -> b -> b) -> b -> NonEmpty a -> b

gfoldr' :: (a -> b -> b) -> b -> NonEmpty a -> b

gfoldl :: (a -> b -> a) -> a -> NonEmpty b -> a

gfoldl' :: (a -> b -> a) -> a -> NonEmpty b -> a

gfoldr1 :: (a -> a -> a) -> NonEmpty a -> a

gfoldl1 :: (a -> a -> a) -> NonEmpty a -> a

GFunctor NonEmpty 
Instance details

Defined in Generics.Deriving.Functor

Methods

gmap :: (a -> b) -> NonEmpty a -> NonEmpty b

GTraversable NonEmpty 
Instance details

Defined in Generics.Deriving.Traversable

Methods

gtraverse :: Applicative f => (a -> f b) -> NonEmpty a -> f (NonEmpty b)

gsequenceA :: Applicative f => NonEmpty (f a) -> f (NonEmpty a)

gmapM :: Monad m => (a -> m b) -> NonEmpty a -> m (NonEmpty b)

gsequence :: Monad m => NonEmpty (m a) -> m (NonEmpty a)

Hashable1 NonEmpty 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> NonEmpty a -> Int

GetAddrInfo NonEmpty 
Instance details

Defined in Network.Socket.Info

Methods

getAddrInfo :: Maybe AddrInfo -> Maybe HostName -> Maybe ServiceName -> IO (NonEmpty AddrInfo)

Generic1 NonEmpty 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 NonEmpty 
Instance details

Defined in GHC.Generics

type Rep1 NonEmpty = D1 ('MetaData "NonEmpty" "GHC.Base" "base" 'False) (C1 ('MetaCons ":|" ('InfixI 'RightAssociative 5) 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 [])))

Methods

from1 :: NonEmpty a -> Rep1 NonEmpty a

to1 :: Rep1 NonEmpty a -> NonEmpty a

Lift a => Lift (NonEmpty a :: Type) 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => NonEmpty a -> m Exp

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

Structured a => Structured (NonEmpty a) 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy (NonEmpty a) -> Structure

structureHash' :: Tagged (NonEmpty a) MD5

FromJSON (WithJSONWarnings (Unresolved (NonEmpty RawPackageLocation))) 
Instance details

Defined in Pantry.Types

FromJSON (WithJSONWarnings (Unresolved (NonEmpty RawPackageLocationImmutable))) 
Instance details

Defined in Pantry.Types

FromJSON a => FromJSON (NonEmpty a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (NonEmpty a)

parseJSONList :: Value -> Parser [NonEmpty a]

omittedField :: Maybe (NonEmpty a)

ToJSON a => ToJSON (NonEmpty a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: NonEmpty a -> Value

toEncoding :: NonEmpty a -> Encoding

toJSONList :: [NonEmpty a] -> Value

toEncodingList :: [NonEmpty a] -> Encoding

omitField :: NonEmpty a -> Bool

Data a => Data (NonEmpty a) 
Instance details

Defined in Data.Data

Methods

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

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

toConstr :: NonEmpty a -> Constr #

dataTypeOf :: NonEmpty a -> DataType #

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

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

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

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

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

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

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

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

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

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

Semigroup (NonEmpty a) 
Instance details

Defined in GHC.Base

Methods

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

sconcat :: NonEmpty (NonEmpty a) -> NonEmpty a

stimes :: Integral b => b -> NonEmpty a -> NonEmpty a

Generic (NonEmpty a) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (NonEmpty a) 
Instance details

Defined in GHC.Generics

type Rep (NonEmpty a) = D1 ('MetaData "NonEmpty" "GHC.Base" "base" 'False) (C1 ('MetaCons ":|" ('InfixI 'RightAssociative 5) 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [a])))

Methods

from :: NonEmpty a -> Rep (NonEmpty a) x

to :: Rep (NonEmpty a) x -> NonEmpty a

IsList (NonEmpty a) 
Instance details

Defined in GHC.IsList

Associated Types

type Item (NonEmpty a) 
Instance details

Defined in GHC.IsList

type Item (NonEmpty a) = a

Methods

fromList :: [Item (NonEmpty a)] -> NonEmpty a

fromListN :: Int -> [Item (NonEmpty a)] -> NonEmpty a

toList :: NonEmpty a -> [Item (NonEmpty a)]

Read a => Read (NonEmpty a) 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (NonEmpty a)

readList :: ReadS [NonEmpty a]

readPrec :: ReadPrec (NonEmpty a)

readListPrec :: ReadPrec [NonEmpty a]

Show a => Show (NonEmpty a) 
Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> NonEmpty a -> ShowS

show :: NonEmpty a -> String #

showList :: [NonEmpty a] -> ShowS

Binary a => Binary (NonEmpty a) 
Instance details

Defined in Data.Binary.Class

Methods

put :: NonEmpty a -> Put

get :: Get (NonEmpty a)

putList :: [NonEmpty a] -> Put

NFData a => NFData (NonEmpty a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: NonEmpty a -> () #

GEnum a => GEnum (NonEmpty a) 
Instance details

Defined in Generics.Deriving.Enum

Methods

genum :: [NonEmpty a]

(GEq a, GEnum a, GIx a) => GIx (NonEmpty a) 
Instance details

Defined in Generics.Deriving.Enum

Methods

range :: (NonEmpty a, NonEmpty a) -> [NonEmpty a]

index :: (NonEmpty a, NonEmpty a) -> NonEmpty a -> Int

inRange :: (NonEmpty a, NonEmpty a) -> NonEmpty a -> Bool

GEq a => GEq (NonEmpty a) 
Instance details

Defined in Generics.Deriving.Eq

Methods

geq :: NonEmpty a -> NonEmpty a -> Bool

GShow a => GShow (NonEmpty a) 
Instance details

Defined in Generics.Deriving.Show

Methods

gshowsPrec :: Int -> NonEmpty a -> ShowS

gshows :: NonEmpty a -> ShowS

gshow :: NonEmpty a -> String

gshowList :: [NonEmpty a] -> ShowS

Eq a => Eq (NonEmpty a) 
Instance details

Defined in GHC.Base

Methods

(==) :: NonEmpty a -> NonEmpty a -> Bool #

(/=) :: NonEmpty a -> NonEmpty a -> Bool #

Ord a => Ord (NonEmpty a) 
Instance details

Defined in GHC.Base

Methods

compare :: NonEmpty a -> NonEmpty a -> Ordering #

(<) :: NonEmpty a -> NonEmpty a -> Bool #

(<=) :: NonEmpty a -> NonEmpty a -> Bool #

(>) :: NonEmpty a -> NonEmpty a -> Bool #

(>=) :: NonEmpty a -> NonEmpty a -> Bool #

max :: NonEmpty a -> NonEmpty a -> NonEmpty a #

min :: NonEmpty a -> NonEmpty a -> NonEmpty a #

Hashable a => Hashable (NonEmpty a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> NonEmpty a -> Int

hash :: NonEmpty a -> Int

Ixed (NonEmpty a) 
Instance details

Defined in Lens.Micro.Internal

Methods

ix :: Index (NonEmpty a) -> Traversal' (NonEmpty a) (IxValue (NonEmpty a))

GrowingAppend (NonEmpty a) 
Instance details

Defined in Data.MonoTraversable

MonoFoldable (NonEmpty a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (NonEmpty a) -> m) -> NonEmpty a -> m

ofoldr :: (Element (NonEmpty a) -> b -> b) -> b -> NonEmpty a -> b

ofoldl' :: (a0 -> Element (NonEmpty a) -> a0) -> a0 -> NonEmpty a -> a0

otoList :: NonEmpty a -> [Element (NonEmpty a)]

oall :: (Element (NonEmpty a) -> Bool) -> NonEmpty a -> Bool

oany :: (Element (NonEmpty a) -> Bool) -> NonEmpty a -> Bool

onull :: NonEmpty a -> Bool

olength :: NonEmpty a -> Int

olength64 :: NonEmpty a -> Int64

ocompareLength :: Integral i => NonEmpty a -> i -> Ordering

otraverse_ :: Applicative f => (Element (NonEmpty a) -> f b) -> NonEmpty a -> f ()

ofor_ :: Applicative f => NonEmpty a -> (Element (NonEmpty a) -> f b) -> f ()

omapM_ :: Applicative m => (Element (NonEmpty a) -> m ()) -> NonEmpty a -> m ()

oforM_ :: Applicative m => NonEmpty a -> (Element (NonEmpty a) -> m ()) -> m ()

ofoldlM :: Monad m => (a0 -> Element (NonEmpty a) -> m a0) -> a0 -> NonEmpty a -> m a0

ofoldMap1Ex :: Semigroup m => (Element (NonEmpty a) -> m) -> NonEmpty a -> m

ofoldr1Ex :: (Element (NonEmpty a) -> Element (NonEmpty a) -> Element (NonEmpty a)) -> NonEmpty a -> Element (NonEmpty a)

ofoldl1Ex' :: (Element (NonEmpty a) -> Element (NonEmpty a) -> Element (NonEmpty a)) -> NonEmpty a -> Element (NonEmpty a)

headEx :: NonEmpty a -> Element (NonEmpty a)

lastEx :: NonEmpty a -> Element (NonEmpty a)

unsafeHead :: NonEmpty a -> Element (NonEmpty a)

unsafeLast :: NonEmpty a -> Element (NonEmpty a)

maximumByEx :: (Element (NonEmpty a) -> Element (NonEmpty a) -> Ordering) -> NonEmpty a -> Element (NonEmpty a)

minimumByEx :: (Element (NonEmpty a) -> Element (NonEmpty a) -> Ordering) -> NonEmpty a -> Element (NonEmpty a)

oelem :: Element (NonEmpty a) -> NonEmpty a -> Bool

onotElem :: Element (NonEmpty a) -> NonEmpty a -> Bool

MonoFunctor (NonEmpty a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (NonEmpty a) -> Element (NonEmpty a)) -> NonEmpty a -> NonEmpty a

MonoPointed (NonEmpty a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (NonEmpty a) -> NonEmpty a

MonoTraversable (NonEmpty a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (NonEmpty a) -> f (Element (NonEmpty a))) -> NonEmpty a -> f (NonEmpty a)

omapM :: Applicative m => (Element (NonEmpty a) -> m (Element (NonEmpty a))) -> NonEmpty a -> m (NonEmpty a)

SemiSequence (NonEmpty a) 
Instance details

Defined in Data.Sequences

Associated Types

type Index (NonEmpty a) 
Instance details

Defined in Data.Sequences

type Index (NonEmpty a) = Int

Methods

intersperse :: Element (NonEmpty a) -> NonEmpty a -> NonEmpty a

reverse :: NonEmpty a -> NonEmpty a

find :: (Element (NonEmpty a) -> Bool) -> NonEmpty a -> Maybe (Element (NonEmpty a))

sortBy :: (Element (NonEmpty a) -> Element (NonEmpty a) -> Ordering) -> NonEmpty a -> NonEmpty a

cons :: Element (NonEmpty a) -> NonEmpty a -> NonEmpty a

snoc :: NonEmpty a -> Element (NonEmpty a) -> NonEmpty a

Pretty a => Pretty (NonEmpty a) 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: NonEmpty a -> Doc ann

prettyList :: [NonEmpty a] -> Doc ann

Each (NonEmpty a) (NonEmpty b) a b 
Instance details

Defined in Lens.Micro.Internal

Methods

each :: Traversal (NonEmpty a) (NonEmpty b) a b

Newtype (NonEmpty a) (NonEmpty' sep wrapper a) 
Instance details

Defined in Distribution.FieldGrammar.Newtypes

Methods

pack :: NonEmpty a -> NonEmpty' sep wrapper a

unpack :: NonEmpty' sep wrapper a -> NonEmpty a

type Rep1 NonEmpty 
Instance details

Defined in GHC.Generics

type Rep1 NonEmpty = D1 ('MetaData "NonEmpty" "GHC.Base" "base" 'False) (C1 ('MetaCons ":|" ('InfixI 'RightAssociative 5) 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 [])))
type Rep (NonEmpty a) 
Instance details

Defined in GHC.Generics

type Rep (NonEmpty a) = D1 ('MetaData "NonEmpty" "GHC.Base" "base" 'False) (C1 ('MetaCons ":|" ('InfixI 'RightAssociative 5) 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [a])))
type Item (NonEmpty a) 
Instance details

Defined in GHC.IsList

type Item (NonEmpty a) = a
type Index (NonEmpty a) 
Instance details

Defined in Lens.Micro.Internal

type Index (NonEmpty a) = Int
type IxValue (NonEmpty a) 
Instance details

Defined in Lens.Micro.Internal

type IxValue (NonEmpty a) = a
type Element (NonEmpty a) 
Instance details

Defined in Data.MonoTraversable

type Element (NonEmpty a) = a
type Index (NonEmpty a) 
Instance details

Defined in Data.Sequences

type Index (NonEmpty a) = Int

withTempFile :: MonadUnliftIO m => FilePath -> String -> (FilePath -> Handle -> m a) -> m a #

data IO a #

Instances

Instances details
MonadFail IO 
Instance details

Defined in Control.Monad.Fail

Methods

fail :: String -> IO a #

MonadFix IO 
Instance details

Defined in Control.Monad.Fix

Methods

mfix :: (a -> IO a) -> IO a

MonadIO IO 
Instance details

Defined in Control.Monad.IO.Class

Methods

liftIO :: IO a -> IO a #

Alternative IO 
Instance details

Defined in GHC.Base

Methods

empty :: IO a

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

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

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

Applicative IO 
Instance details

Defined in GHC.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 #

Functor IO 
Instance details

Defined in GHC.Base

Methods

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

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

Monad IO 
Instance details

Defined in GHC.Base

Methods

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

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

return :: a -> IO a #

MonadPlus IO 
Instance details

Defined in GHC.Base

Methods

mzero :: IO a #

mplus :: IO a -> IO a -> IO a #

GHCiSandboxIO IO 
Instance details

Defined in GHC.GHCi

Methods

ghciStepIO :: IO a -> IO a

PrimMonad IO 
Instance details

Defined in Basement.Monad

Associated Types

type PrimState IO 
Instance details

Defined in Basement.Monad

type PrimState IO = RealWorld
type PrimVar IO 
Instance details

Defined in Basement.Monad

type PrimVar IO = IORef

Methods

primitive :: (State# (PrimState IO) -> (# State# (PrimState IO), a #)) -> IO a

primThrow :: Exception e => e -> IO a

unPrimMonad :: IO a -> State# (PrimState IO) -> (# State# (PrimState IO), a #)

primVarNew :: a -> IO (PrimVar IO a)

primVarRead :: PrimVar IO a -> IO a

primVarWrite :: PrimVar IO a -> a -> IO ()

MonadActive IO 
Instance details

Defined in Data.Conduit.Lazy

Methods

monadActive :: IO Bool

MonadRandom IO 
Instance details

Defined in Crypto.Random.Types

Methods

getRandomBytes :: ByteArray byteArray => Int -> IO byteArray

MonadCatch IO 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: (HasCallStack, Exception e) => IO a -> (e -> IO a) -> IO a

MonadMask IO 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: HasCallStack => ((forall a. IO a -> IO a) -> IO b) -> IO b

uninterruptibleMask :: HasCallStack => ((forall a. IO a -> IO a) -> IO b) -> IO b

generalBracket :: HasCallStack => IO a -> (a -> ExitCase b -> IO c) -> (a -> IO b) -> IO (b, c)

MonadThrow IO 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: (HasCallStack, Exception e) => e -> IO a #

GFunctor IO 
Instance details

Defined in Generics.Deriving.Functor

Methods

gmap :: (a -> b) -> IO a -> IO b

PrimBase IO 
Instance details

Defined in Control.Monad.Primitive

Methods

internal :: IO a -> State# (PrimState IO) -> (# State# (PrimState IO), a #)

PrimMonad IO 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState IO 
Instance details

Defined in Control.Monad.Primitive

type PrimState IO = RealWorld

Methods

primitive :: (State# (PrimState IO) -> (# State# (PrimState IO), a #)) -> IO a #

Quasi IO 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

qNewName :: String -> IO Name

qReport :: Bool -> String -> IO ()

qRecover :: IO a -> IO a -> IO a

qLookupName :: Bool -> String -> IO (Maybe Name)

qReify :: Name -> IO Info

qReifyFixity :: Name -> IO (Maybe Fixity)

qReifyType :: Name -> IO Type

qReifyInstances :: Name -> [Type] -> IO [Dec]

qReifyRoles :: Name -> IO [Role]

qReifyAnnotations :: Data a => AnnLookup -> IO [a]

qReifyModule :: Module -> IO ModuleInfo

qReifyConStrictness :: Name -> IO [DecidedStrictness]

qLocation :: IO Loc

qRunIO :: IO a -> IO a

qGetPackageRoot :: IO FilePath

qAddDependentFile :: FilePath -> IO ()

qAddTempFile :: String -> IO FilePath

qAddTopDecls :: [Dec] -> IO ()

qAddForeignFilePath :: ForeignSrcLang -> String -> IO ()

qAddModFinalizer :: Q () -> IO ()

qAddCorePlugin :: String -> IO ()

qGetQ :: Typeable a => IO (Maybe a)

qPutQ :: Typeable a => a -> IO ()

qIsExtEnabled :: Extension -> IO Bool

qExtsEnabled :: IO [Extension]

qPutDoc :: DocLoc -> String -> IO ()

qGetDoc :: DocLoc -> IO (Maybe String)

Quote IO 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

newName :: String -> IO Name

MonadUnliftIO IO 
Instance details

Defined in Control.Monad.IO.Unlift

Methods

withRunInIO :: ((forall a. IO a -> IO a) -> IO b) -> IO b #

MonadBaseControl IO IO 
Instance details

Defined in Control.Monad.Trans.Control

Associated Types

type StM IO a 
Instance details

Defined in Control.Monad.Trans.Control

type StM IO a = a

Methods

liftBaseWith :: (RunInBase IO IO -> IO a) -> IO a

restoreM :: StM IO a -> IO a

MonadError IOException IO 
Instance details

Defined in Control.Monad.Error.Class

Methods

throwError :: IOException -> IO a

catchError :: IO a -> (IOException -> IO a) -> IO a

MArray IOUArray Int16 IO 
Instance details

Defined in Data.Array.IO.Internals

Methods

getBounds :: Ix i => IOUArray i Int16 -> IO (i, i)

getNumElements :: Ix i => IOUArray i Int16 -> IO Int

newArray :: Ix i => (i, i) -> Int16 -> IO (IOUArray i Int16)

newArray_ :: Ix i => (i, i) -> IO (IOUArray i Int16)

unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Int16)

unsafeRead :: Ix i => IOUArray i Int16 -> Int -> IO Int16

unsafeWrite :: Ix i => IOUArray i Int16 -> Int -> Int16 -> IO ()

MArray IOUArray Int32 IO 
Instance details

Defined in Data.Array.IO.Internals

Methods

getBounds :: Ix i => IOUArray i Int32 -> IO (i, i)

getNumElements :: Ix i => IOUArray i Int32 -> IO Int

newArray :: Ix i => (i, i) -> Int32 -> IO (IOUArray i Int32)

newArray_ :: Ix i => (i, i) -> IO (IOUArray i Int32)

unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Int32)

unsafeRead :: Ix i => IOUArray i Int32 -> Int -> IO Int32

unsafeWrite :: Ix i => IOUArray i Int32 -> Int -> Int32 -> IO ()

MArray IOUArray Int64 IO 
Instance details

Defined in Data.Array.IO.Internals

Methods

getBounds :: Ix i => IOUArray i Int64 -> IO (i, i)

getNumElements :: Ix i => IOUArray i Int64 -> IO Int

newArray :: Ix i => (i, i) -> Int64 -> IO (IOUArray i Int64)

newArray_ :: Ix i => (i, i) -> IO (IOUArray i Int64)

unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Int64)

unsafeRead :: Ix i => IOUArray i Int64 -> Int -> IO Int64

unsafeWrite :: Ix i => IOUArray i Int64 -> Int -> Int64 -> IO ()

MArray IOUArray Int8 IO 
Instance details

Defined in Data.Array.IO.Internals

Methods

getBounds :: Ix i => IOUArray i Int8 -> IO (i, i)

getNumElements :: Ix i => IOUArray i Int8 -> IO Int

newArray :: Ix i => (i, i) -> Int8 -> IO (IOUArray i Int8)

newArray_ :: Ix i => (i, i) -> IO (IOUArray i Int8)

unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Int8)

unsafeRead :: Ix i => IOUArray i Int8 -> Int -> IO Int8

unsafeWrite :: Ix i => IOUArray i Int8 -> Int -> Int8 -> IO ()

MArray IOUArray Word16 IO 
Instance details

Defined in Data.Array.IO.Internals

Methods

getBounds :: Ix i => IOUArray i Word16 -> IO (i, i)

getNumElements :: Ix i => IOUArray i Word16 -> IO Int

newArray :: Ix i => (i, i) -> Word16 -> IO (IOUArray i Word16)

newArray_ :: Ix i => (i, i) -> IO (IOUArray i Word16)

unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Word16)

unsafeRead :: Ix i => IOUArray i Word16 -> Int -> IO Word16

unsafeWrite :: Ix i => IOUArray i Word16 -> Int -> Word16 -> IO ()

MArray IOUArray Word32 IO 
Instance details

Defined in Data.Array.IO.Internals

Methods

getBounds :: Ix i => IOUArray i Word32 -> IO (i, i)

getNumElements :: Ix i => IOUArray i Word32 -> IO Int

newArray :: Ix i => (i, i) -> Word32 -> IO (IOUArray i Word32)

newArray_ :: Ix i => (i, i) -> IO (IOUArray i Word32)

unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Word32)

unsafeRead :: Ix i => IOUArray i Word32 -> Int -> IO Word32

unsafeWrite :: Ix i => IOUArray i Word32 -> Int -> Word32 -> IO ()

MArray IOUArray Word64 IO 
Instance details

Defined in Data.Array.IO.Internals

Methods

getBounds :: Ix i => IOUArray i Word64 -> IO (i, i)

getNumElements :: Ix i => IOUArray i Word64 -> IO Int

newArray :: Ix i => (i, i) -> Word64 -> IO (IOUArray i Word64)

newArray_ :: Ix i => (i, i) -> IO (IOUArray i Word64)

unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Word64)

unsafeRead :: Ix i => IOUArray i Word64 -> Int -> IO Word64

unsafeWrite :: Ix i => IOUArray i Word64 -> Int -> Word64 -> IO ()

MArray IOUArray Word8 IO 
Instance details

Defined in Data.Array.IO.Internals

Methods

getBounds :: Ix i => IOUArray i Word8 -> IO (i, i)

getNumElements :: Ix i => IOUArray i Word8 -> IO Int

newArray :: Ix i => (i, i) -> Word8 -> IO (IOUArray i Word8)

newArray_ :: Ix i => (i, i) -> IO (IOUArray i Word8)

unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Word8)

unsafeRead :: Ix i => IOUArray i Word8 -> Int -> IO Word8

unsafeWrite :: Ix i => IOUArray i Word8 -> Int -> Word8 -> IO ()

MArray IOUArray Bool IO 
Instance details

Defined in Data.Array.IO.Internals

Methods

getBounds :: Ix i => IOUArray i Bool -> IO (i, i)

getNumElements :: Ix i => IOUArray i Bool -> IO Int

newArray :: Ix i => (i, i) -> Bool -> IO (IOUArray i Bool)

newArray_ :: Ix i => (i, i) -> IO (IOUArray i Bool)

unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Bool)

unsafeRead :: Ix i => IOUArray i Bool -> Int -> IO Bool

unsafeWrite :: Ix i => IOUArray i Bool -> Int -> Bool -> IO ()

MArray IOUArray Char IO 
Instance details

Defined in Data.Array.IO.Internals

Methods

getBounds :: Ix i => IOUArray i Char -> IO (i, i)

getNumElements :: Ix i => IOUArray i Char -> IO Int

newArray :: Ix i => (i, i) -> Char -> IO (IOUArray i Char)

newArray_ :: Ix i => (i, i) -> IO (IOUArray i Char)

unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Char)

unsafeRead :: Ix i => IOUArray i Char -> Int -> IO Char

unsafeWrite :: Ix i => IOUArray i Char -> Int -> Char -> IO ()

MArray IOUArray Double IO 
Instance details

Defined in Data.Array.IO.Internals

Methods

getBounds :: Ix i => IOUArray i Double -> IO (i, i)

getNumElements :: Ix i => IOUArray i Double -> IO Int

newArray :: Ix i => (i, i) -> Double -> IO (IOUArray i Double)

newArray_ :: Ix i => (i, i) -> IO (IOUArray i Double)

unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Double)

unsafeRead :: Ix i => IOUArray i Double -> Int -> IO Double

unsafeWrite :: Ix i => IOUArray i Double -> Int -> Double -> IO ()

MArray IOUArray Float IO 
Instance details

Defined in Data.Array.IO.Internals

Methods

getBounds :: Ix i => IOUArray i Float -> IO (i, i)

getNumElements :: Ix i => IOUArray i Float -> IO Int

newArray :: Ix i => (i, i) -> Float -> IO (IOUArray i Float)

newArray_ :: Ix i => (i, i) -> IO (IOUArray i Float)

unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Float)

unsafeRead :: Ix i => IOUArray i Float -> Int -> IO Float

unsafeWrite :: Ix i => IOUArray i Float -> Int -> Float -> IO ()

MArray IOUArray Int IO 
Instance details

Defined in Data.Array.IO.Internals

Methods

getBounds :: Ix i => IOUArray i Int -> IO (i, i)

getNumElements :: Ix i => IOUArray i Int -> IO Int

newArray :: Ix i => (i, i) -> Int -> IO (IOUArray i Int)

newArray_ :: Ix i => (i, i) -> IO (IOUArray i Int)

unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Int)

unsafeRead :: Ix i => IOUArray i Int -> Int -> IO Int

unsafeWrite :: Ix i => IOUArray i Int -> Int -> Int -> IO ()

MArray IOUArray Word IO 
Instance details

Defined in Data.Array.IO.Internals

Methods

getBounds :: Ix i => IOUArray i Word -> IO (i, i)

getNumElements :: Ix i => IOUArray i Word -> IO Int

newArray :: Ix i => (i, i) -> Word -> IO (IOUArray i Word)

newArray_ :: Ix i => (i, i) -> IO (IOUArray i Word)

unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Word)

unsafeRead :: Ix i => IOUArray i Word -> Int -> IO Word

unsafeWrite :: Ix i => IOUArray i Word -> Int -> Word -> IO ()

Storable e => MArray StorableArray e IO 
Instance details

Defined in Data.Array.Storable.Internals

Methods

getBounds :: Ix i => StorableArray i e -> IO (i, i)

getNumElements :: Ix i => StorableArray i e -> IO Int

newArray :: Ix i => (i, i) -> e -> IO (StorableArray i e)

newArray_ :: Ix i => (i, i) -> IO (StorableArray i e)

unsafeNewArray_ :: Ix i => (i, i) -> IO (StorableArray i e)

unsafeRead :: Ix i => StorableArray i e -> Int -> IO e

unsafeWrite :: Ix i => StorableArray i e -> Int -> e -> IO ()

MArray IOArray e IO 
Instance details

Defined in Data.Array.Base

Methods

getBounds :: Ix i => IOArray i e -> IO (i, i)

getNumElements :: Ix i => IOArray i e -> IO Int

newArray :: Ix i => (i, i) -> e -> IO (IOArray i e)

newArray_ :: Ix i => (i, i) -> IO (IOArray i e)

unsafeNewArray_ :: Ix i => (i, i) -> IO (IOArray i e)

unsafeRead :: Ix i => IOArray i e -> Int -> IO e

unsafeWrite :: Ix i => IOArray i e -> Int -> e -> IO ()

MArray TArray e IO 
Instance details

Defined in Control.Concurrent.STM.TArray

Methods

getBounds :: Ix i => TArray i e -> IO (i, i)

getNumElements :: Ix i => TArray i e -> IO Int

newArray :: Ix i => (i, i) -> e -> IO (TArray i e)

newArray_ :: Ix i => (i, i) -> IO (TArray i e)

unsafeNewArray_ :: Ix i => (i, i) -> IO (TArray i e)

unsafeRead :: Ix i => TArray i e -> Int -> IO e

unsafeWrite :: Ix i => TArray i e -> Int -> e -> IO ()

MArray IOUArray (FunPtr a) IO 
Instance details

Defined in Data.Array.IO.Internals

Methods

getBounds :: Ix i => IOUArray i (FunPtr a) -> IO (i, i)

getNumElements :: Ix i => IOUArray i (FunPtr a) -> IO Int

newArray :: Ix i => (i, i) -> FunPtr a -> IO (IOUArray i (FunPtr a))

newArray_ :: Ix i => (i, i) -> IO (IOUArray i (FunPtr a))

unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i (FunPtr a))

unsafeRead :: Ix i => IOUArray i (FunPtr a) -> Int -> IO (FunPtr a)

unsafeWrite :: Ix i => IOUArray i (FunPtr a) -> Int -> FunPtr a -> IO ()

MArray IOUArray (Ptr a) IO 
Instance details

Defined in Data.Array.IO.Internals

Methods

getBounds :: Ix i => IOUArray i (Ptr a) -> IO (i, i)

getNumElements :: Ix i => IOUArray i (Ptr a) -> IO Int

newArray :: Ix i => (i, i) -> Ptr a -> IO (IOUArray i (Ptr a))

newArray_ :: Ix i => (i, i) -> IO (IOUArray i (Ptr a))

unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i (Ptr a))

unsafeRead :: Ix i => IOUArray i (Ptr a) -> Int -> IO (Ptr a)

unsafeWrite :: Ix i => IOUArray i (Ptr a) -> Int -> Ptr a -> IO ()

MArray IOUArray (StablePtr a) IO 
Instance details

Defined in Data.Array.IO.Internals

Methods

getBounds :: Ix i => IOUArray i (StablePtr a) -> IO (i, i)

getNumElements :: Ix i => IOUArray i (StablePtr a) -> IO Int

newArray :: Ix i => (i, i) -> StablePtr a -> IO (IOUArray i (StablePtr a))

newArray_ :: Ix i => (i, i) -> IO (IOUArray i (StablePtr a))

unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i (StablePtr a))

unsafeRead :: Ix i => IOUArray i (StablePtr a) -> Int -> IO (StablePtr a)

unsafeWrite :: Ix i => IOUArray i (StablePtr a) -> Int -> StablePtr a -> IO ()

Monoid a => Monoid (IO a) 
Instance details

Defined in GHC.Base

Methods

mempty :: IO a #

mappend :: IO a -> IO a -> IO a #

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

Semigroup a => Semigroup (IO a) 
Instance details

Defined in GHC.Base

Methods

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

sconcat :: NonEmpty (IO a) -> IO a

stimes :: Integral b => b -> IO a -> IO a

a ~ () => HPrintfType (IO a) 
Instance details

Defined in Text.Printf

Methods

hspr :: Handle -> String -> [UPrintf] -> IO a

a ~ () => PrintfType (IO a) 
Instance details

Defined in Text.Printf

Methods

spr :: String -> [UPrintf] -> IO a

MonoFunctor (IO a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (IO a) -> Element (IO a)) -> IO a -> IO a

MonoPointed (IO a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (IO a) -> IO a

type PrimState IO 
Instance details

Defined in Basement.Monad

type PrimState IO = RealWorld
type PrimVar IO 
Instance details

Defined in Basement.Monad

type PrimVar IO = IORef
type PrimState IO 
Instance details

Defined in Control.Monad.Primitive

type PrimState IO = RealWorld
type StM IO a 
Instance details

Defined in Control.Monad.Trans.Control

type StM IO a = a
type Element (IO a) 
Instance details

Defined in Data.MonoTraversable

type Element (IO a) = a

newtype Any #

Constructors

Any 

Fields

Instances

Instances details
FromJSON Any 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Any

parseJSONList :: Value -> Parser [Any]

omittedField :: Maybe Any

ToJSON Any 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Any -> Value

toEncoding :: Any -> Encoding

toJSONList :: [Any] -> Value

toEncodingList :: [Any] -> Encoding

omitField :: Any -> Bool

Data Any 
Instance details

Defined in Data.Data

Methods

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

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

toConstr :: Any -> Constr #

dataTypeOf :: Any -> DataType #

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

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

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

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

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

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

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

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

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

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

Monoid Any 
Instance details

Defined in Data.Semigroup.Internal

Methods

mempty :: Any #

mappend :: Any -> Any -> Any #

mconcat :: [Any] -> Any #

Semigroup Any 
Instance details

Defined in Data.Semigroup.Internal

Methods

(<>) :: Any -> Any -> Any #

sconcat :: NonEmpty Any -> Any

stimes :: Integral b => b -> Any -> Any

Bounded Any 
Instance details

Defined in Data.Semigroup.Internal

Methods

minBound :: Any #

maxBound :: Any #

Generic Any 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep Any 
Instance details

Defined in Data.Semigroup.Internal

type Rep Any = D1 ('MetaData "Any" "Data.Semigroup.Internal" "base" 'True) (C1 ('MetaCons "Any" 'PrefixI 'True) (S1 ('MetaSel ('Just "getAny") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)))

Methods

from :: Any -> Rep Any x

to :: Rep Any x -> Any

Read Any 
Instance details

Defined in Data.Semigroup.Internal

Methods

readsPrec :: Int -> ReadS Any

readList :: ReadS [Any]

readPrec :: ReadPrec Any

readListPrec :: ReadPrec [Any]

Show Any 
Instance details

Defined in Data.Semigroup.Internal

Methods

showsPrec :: Int -> Any -> ShowS

show :: Any -> String #

showList :: [Any] -> ShowS

Binary Any 
Instance details

Defined in Data.Binary.Class

Methods

put :: Any -> Put

get :: Get Any

putList :: [Any] -> Put

NFData Any 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Any -> () #

GEnum Any 
Instance details

Defined in Generics.Deriving.Enum

Methods

genum :: [Any]

GIx Any 
Instance details

Defined in Generics.Deriving.Enum

Methods

range :: (Any, Any) -> [Any]

index :: (Any, Any) -> Any -> Int

inRange :: (Any, Any) -> Any -> Bool

GEq Any 
Instance details

Defined in Generics.Deriving.Eq

Methods

geq :: Any -> Any -> Bool

GMonoid Any 
Instance details

Defined in Generics.Deriving.Monoid.Internal

Methods

gmempty :: Any

gmappend :: Any -> Any -> Any

gmconcat :: [Any] -> Any

GShow Any 
Instance details

Defined in Generics.Deriving.Show

Methods

gshowsPrec :: Int -> Any -> ShowS

gshows :: Any -> ShowS

gshow :: Any -> String

gshowList :: [Any] -> ShowS

Eq Any 
Instance details

Defined in Data.Semigroup.Internal

Methods

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

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

Ord Any 
Instance details

Defined in Data.Semigroup.Internal

Methods

compare :: Any -> Any -> Ordering #

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

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

(>) :: Any -> Any -> Bool #

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

max :: Any -> Any -> Any #

min :: Any -> Any -> Any #

FromHttpApiData Any 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Any 
Instance details

Defined in Web.Internal.HttpApiData

Unbox Any 
Instance details

Defined in Data.Vector.Unboxed.Base

Vector Vector Any 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: Mutable Vector s Any -> ST s (Vector Any)

basicUnsafeThaw :: Vector Any -> ST s (Mutable Vector s Any)

basicLength :: Vector Any -> Int

basicUnsafeSlice :: Int -> Int -> Vector Any -> Vector Any

basicUnsafeIndexM :: Vector Any -> Int -> Box Any

basicUnsafeCopy :: Mutable Vector s Any -> Vector Any -> ST s ()

elemseq :: Vector Any -> Any -> b -> b

MVector MVector Any 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s Any -> Int

basicUnsafeSlice :: Int -> Int -> MVector s Any -> MVector s Any

basicOverlaps :: MVector s Any -> MVector s Any -> Bool

basicUnsafeNew :: Int -> ST s (MVector s Any)

basicInitialize :: MVector s Any -> ST s ()

basicUnsafeReplicate :: Int -> Any -> ST s (MVector s Any)

basicUnsafeRead :: MVector s Any -> Int -> ST s Any

basicUnsafeWrite :: MVector s Any -> Int -> Any -> ST s ()

basicClear :: MVector s Any -> ST s ()

basicSet :: MVector s Any -> Any -> ST s ()

basicUnsafeCopy :: MVector s Any -> MVector s Any -> ST s ()

basicUnsafeMove :: MVector s Any -> MVector s Any -> ST s ()

basicUnsafeGrow :: MVector s Any -> Int -> ST s (MVector s Any)

type Rep Any 
Instance details

Defined in Data.Semigroup.Internal

type Rep Any = D1 ('MetaData "Any" "Data.Semigroup.Internal" "base" 'True) (C1 ('MetaCons "Any" 'PrefixI 'True) (S1 ('MetaSel ('Just "getAny") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)))
newtype Vector Any 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector Any = V_Any (Vector Bool)
newtype MVector s Any 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Any = MV_Any (MVector s Bool)

threadWaitRead :: MonadIO m => Fd -> m () #

threadWaitWrite :: MonadIO m => Fd -> m () #

dupChan :: MonadIO m => Chan a -> m (Chan a) #

getChanContents :: MonadIO m => Chan a -> m [a] #

newChan :: MonadIO m => m (Chan a) #

readChan :: MonadIO m => Chan a -> m a #

writeChan :: MonadIO m => Chan a -> a -> m () #

writeList2Chan :: MonadIO m => Chan a -> [a] -> m () #

mkWeakMVar :: MonadUnliftIO m => MVar a -> m () -> m (Weak (MVar a)) #

modifyMVar :: MonadUnliftIO m => MVar a -> (a -> m (a, b)) -> m b #

modifyMVarMasked :: MonadUnliftIO m => MVar a -> (a -> m (a, b)) -> m b #

modifyMVarMasked_ :: MonadUnliftIO m => MVar a -> (a -> m a) -> m () #

modifyMVar_ :: MonadUnliftIO m => MVar a -> (a -> m a) -> m () #

swapMVar :: MonadIO m => MVar a -> a -> m a #

withMVar :: MonadUnliftIO m => MVar a -> (a -> m b) -> m b #

withMVarMasked :: MonadUnliftIO m => MVar a -> (a -> m b) -> m b #

newQSem :: MonadIO m => Int -> m QSem #

signalQSem :: MonadIO m => QSem -> m () #

waitQSem :: MonadIO m => QSem -> m () #

newQSemN :: MonadIO m => Int -> m QSemN #

signalQSemN :: MonadIO m => QSemN -> Int -> m () #

waitQSemN :: MonadIO m => QSemN -> Int -> m () #

catches :: MonadUnliftIO m => m a -> [Handler m a] -> m a #

bracket :: MonadUnliftIO m => m a -> (a -> m b) -> (a -> m c) -> m c #

bracketOnError :: MonadUnliftIO m => m a -> (a -> m b) -> (a -> m c) -> m c #

bracket_ :: MonadUnliftIO m => m a -> m b -> m c -> m c #

catchJust :: (MonadUnliftIO m, Exception e) => (e -> Maybe b) -> m a -> (b -> m a) -> m a #

finally :: MonadUnliftIO m => m a -> m b -> m a #

handle :: (MonadUnliftIO m, Exception e) => (e -> m a) -> m a -> m a #

handleJust :: (MonadUnliftIO m, Exception e) => (e -> Maybe b) -> (b -> m a) -> m a -> m a #

onException :: MonadUnliftIO m => m a -> m b -> m a #

try :: (MonadUnliftIO m, Exception e) => m a -> m (Either e a) #

tryJust :: (MonadUnliftIO m, Exception e) => (e -> Maybe b) -> m a -> m (Either b a) #

bool :: a -> a -> Bool -> a #

either :: (a -> c) -> (b -> c) -> Either a b -> c #

fromLeft :: a -> Either a b -> a #

fromRight :: b -> Either a b -> b #

isLeft :: Either a b -> Bool #

isRight :: Either a b -> Bool #

lefts :: [Either a b] -> [a] #

partitionEithers :: [Either a b] -> ([a], [b]) #

rights :: [Either a b] -> [b] #

for_ :: (Foldable t, Applicative f) => t a -> (a -> f b) -> f () #

sequenceA_ :: (Foldable t, Applicative f) => t (f a) -> f () #

traverse_ :: (Foldable t, Applicative f) => (a -> f b) -> t a -> f () #

(&) :: a -> (a -> b) -> b #

fix :: (a -> a) -> a #

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

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

(<&>) :: Functor f => f a -> (a -> b) -> f b #

atomicModifyIORef :: MonadIO m => IORef a -> (a -> (a, b)) -> m b #

atomicWriteIORef :: MonadIO m => IORef a -> a -> m () #

mkWeakIORef :: MonadUnliftIO m => IORef a -> m () -> m (Weak (IORef a)) #

modifyIORef :: MonadIO m => IORef a -> (a -> a) -> m () #

modifyIORef' :: MonadIO m => IORef a -> (a -> a) -> m () #

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

fromMaybe :: a -> Maybe a -> a #

isJust :: Maybe a -> Bool #

listToMaybe :: [a] -> Maybe a #

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

maybeToList :: Maybe a -> [a] #

comparing :: Ord a => (b -> a) -> b -> b -> Ordering #

for :: (Traversable t, Applicative f) => t a -> (a -> f b) -> f (t b) #

curry :: ((a, b) -> c) -> a -> b -> c #

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

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

uncurry :: (a -> b -> c) -> (a, b) -> c #

trace :: Text -> a -> a #

traceEvent :: Text -> a -> a #

traceEventIO :: MonadIO m => Text -> m () #

traceIO :: MonadIO m => Text -> m () #

traceM :: Applicative f => Text -> f () #

traceMarker :: Text -> a -> a #

traceMarkerIO :: MonadIO m => Text -> m () #

traceShow :: Show a => a -> b -> b #

traceShowId :: Show a => a -> a #

traceShowM :: (Show a, Applicative f) => a -> f () #

traceStack :: Text -> a -> a #

($!) :: (a -> b) -> a -> b #

absurd :: Void -> a #

asTypeOf :: a -> a -> a #

const :: a -> b -> a #

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

threadDelay :: MonadIO m => Int -> m () #

atomically :: MonadIO m => STM a -> m a #

newTVar :: a -> STM (TVar a) #

newTVarIO :: MonadIO m => a -> m (TVar a) #

orElse :: STM a -> STM a -> STM a #

readTVar :: TVar a -> STM a #

readTVarIO :: MonadIO m => TVar a -> m a #

throwTo :: (Exception e, MonadIO m) => ThreadId -> e -> m () #

writeTVar :: TVar a -> a -> STM () #

error :: HasCallStack => [Char] -> a #

catch :: (MonadUnliftIO m, Exception e) => m a -> (e -> m a) -> m a #

evaluate :: MonadIO m => a -> m a #

mask :: MonadUnliftIO m => ((forall a. m a -> m a) -> m b) -> m b #

mask_ :: MonadUnliftIO m => m a -> m a #

throwIO :: (MonadIO m, Exception e) => e -> m a #

uninterruptibleMask :: MonadUnliftIO m => ((forall a. m a -> m a) -> m b) -> m b #

hClose :: MonadIO m => Handle -> m () #

hFlush :: MonadIO m => Handle -> m () #

hIsEOF :: MonadIO m => Handle -> m Bool #

hIsOpen :: MonadIO m => Handle -> m Bool #

hSeek :: MonadIO m => Handle -> SeekMode -> Integer -> m () #

hSetEcho :: MonadIO m => Handle -> Bool -> m () #

hSetFileSize :: MonadIO m => Handle -> Integer -> m () #

withBinaryFile :: MonadUnliftIO m => FilePath -> IOMode -> (Handle -> m a) -> m a #

withFile :: MonadUnliftIO m => FilePath -> IOMode -> (Handle -> m a) -> m a #

atomicModifyIORef' :: MonadIO m => IORef a -> (a -> (a, b)) -> m b #

newIORef :: MonadIO m => a -> m (IORef a) #

readIORef :: MonadIO m => IORef a -> m a #

writeIORef :: MonadIO m => IORef a -> a -> m () #

isEmptyMVar :: MonadIO m => MVar a -> m Bool #

newEmptyMVar :: MonadIO m => m (MVar a) #

newMVar :: MonadIO m => a -> m (MVar a) #

putMVar :: MonadIO m => MVar a -> a -> m () #

readMVar :: MonadIO m => MVar a -> m a #

takeMVar :: MonadIO m => MVar a -> m a #

tryPutMVar :: MonadIO m => MVar a -> a -> m Bool #

tryReadMVar :: MonadIO m => MVar a -> m (Maybe a) #

tryTakeMVar :: MonadIO m => MVar a -> m (Maybe a) #

subtract :: Num a => a -> a -> a #

(^) :: (Num a, Integral b) => a -> b -> a #

(^^) :: (Fractional a, Integral b) => a -> b -> a #

even :: Integral a => a -> Bool #

fromIntegral :: (Integral a, Num b) => a -> b #

gcd :: Integral a => a -> a -> a #

lcm :: Integral a => a -> a -> a #

odd :: Integral a => a -> Bool #

realToFrac :: (Real a, Fractional b) => a -> b #

runST :: (forall s. ST s a) -> a #

exitFailure :: MonadIO m => m a #

exitSuccess :: MonadIO m => m a #

exitWith :: MonadIO m => ExitCode -> m a #

hReady :: MonadIO m => Handle -> m Bool #

timeout :: MonadUnliftIO m => Int -> m a -> m (Maybe a) #

readMaybe :: Read a => String -> Maybe a #

(&&) :: Bool -> Bool -> Bool #

not :: Bool -> Bool #

(||) :: Bool -> Bool -> Bool #

seq :: a -> b -> b #

class Category (cat :: k -> k -> Type) #

Minimal complete definition

id, (.)

Instances

Instances details
Category Op 
Instance details

Defined in Data.Functor.Contravariant

Methods

id :: Op a a

(.) :: Op b c -> Op a b -> Op a c

Monad m => Category (Kleisli m :: Type -> Type -> Type) 
Instance details

Defined in Control.Arrow

Methods

id :: Kleisli m a a

(.) :: Kleisli m b c -> Kleisli m a b -> Kleisli m a c

(Applicative f, Monad f) => Category (WhenMissing f :: Type -> Type -> Type) 
Instance details

Defined in Data.IntMap.Internal

Methods

id :: WhenMissing f a a

(.) :: WhenMissing f b c -> WhenMissing f a b -> WhenMissing f a c

Applicative f => Category (A f :: Type -> Type -> Type) 
Instance details

Defined in Options.Applicative.Arrows

Methods

id :: A f a a

(.) :: A f b c -> A f a b -> A f a c

Category (Coercion :: k -> k -> Type) 
Instance details

Defined in Control.Category

Methods

id :: forall (a :: k). Coercion a a

(.) :: forall (b :: k) (c :: k) (a :: k). Coercion b c -> Coercion a b -> Coercion a c

Category ((:~:) :: k -> k -> Type) 
Instance details

Defined in Control.Category

Methods

id :: forall (a :: k). a :~: a

(.) :: forall (b :: k) (c :: k) (a :: k). (b :~: c) -> (a :~: b) -> a :~: c

(Monad f, Applicative f) => Category (WhenMatched f x :: Type -> Type -> Type) 
Instance details

Defined in Data.IntMap.Internal

Methods

id :: WhenMatched f x a a

(.) :: WhenMatched f x b c -> WhenMatched f x a b -> WhenMatched f x a c

(Applicative f, Monad f) => Category (WhenMissing f k :: Type -> Type -> Type) 
Instance details

Defined in Data.Map.Internal

Methods

id :: WhenMissing f k a a

(.) :: WhenMissing f k b c -> WhenMissing f k a b -> WhenMissing f k a c

Category (->) 
Instance details

Defined in Control.Category

Methods

id :: a -> a

(.) :: (b -> c) -> (a -> b) -> a -> c

Category ((:~~:) :: k -> k -> Type) 
Instance details

Defined in Control.Category

Methods

id :: forall (a :: k). a :~~: a

(.) :: forall (b :: k) (c :: k) (a :: k). (b :~~: c) -> (a :~~: b) -> a :~~: c

(Monad f, Applicative f) => Category (WhenMatched f k x :: Type -> Type -> Type) 
Instance details

Defined in Data.Map.Internal

Methods

id :: WhenMatched f k x a a

(.) :: WhenMatched f k x b c -> WhenMatched f k x a b -> WhenMatched f k x a c

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

id :: a -> a #

data Chan a #

Instances

Instances details
Eq (Chan a) 
Instance details

Defined in Control.Concurrent.Chan

Methods

(==) :: Chan a -> Chan a -> Bool #

(/=) :: Chan a -> Chan a -> Bool #

data QSem #

data QSemN #

data Handler (m :: Type -> Type) a #

Constructors

Exception e => Handler (e -> m a) 

Instances

Instances details
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 #

class Typeable a => Data a where #

Minimal complete definition

gunfold, toConstr, dataTypeOf

Methods

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

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

toConstr :: a -> Constr #

dataTypeOf :: a -> DataType #

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

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

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

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

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

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

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

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

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

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

Instances

Instances details
Data OpenModule 
Instance details

Defined in Distribution.Backpack

Methods

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

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

toConstr :: OpenModule -> Constr #

dataTypeOf :: OpenModule -> DataType #

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

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

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

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

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

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

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

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

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

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

Data OpenUnitId 
Instance details

Defined in Distribution.Backpack

Methods

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

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

toConstr :: OpenUnitId -> Constr #

dataTypeOf :: OpenUnitId -> DataType #

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

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

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

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

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

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

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

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

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

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

Data CabalSpecVersion 
Instance details

Defined in Distribution.CabalSpecVersion

Methods

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

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

toConstr :: CabalSpecVersion -> Constr #

dataTypeOf :: CabalSpecVersion -> DataType #

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

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

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

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

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

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

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

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

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

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

Data CompilerFlavor 
Instance details

Defined in Distribution.Compiler

Methods

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

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

toConstr :: CompilerFlavor -> Constr #

dataTypeOf :: CompilerFlavor -> DataType #

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

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

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

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

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

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

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

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

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

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

Data License 
Instance details

Defined in Distribution.License

Methods

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

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

toConstr :: License -> Constr #

dataTypeOf :: License -> DataType #

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

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

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

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

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

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

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

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

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

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

Data ModuleName 
Instance details

Defined in Distribution.ModuleName

Methods

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

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

toConstr :: ModuleName -> Constr #

dataTypeOf :: ModuleName -> DataType #

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

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

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

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

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

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

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

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

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

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

Data License 
Instance details

Defined in Distribution.SPDX.License

Methods

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

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

toConstr :: License -> Constr #

dataTypeOf :: License -> DataType #

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

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

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

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

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

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

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

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

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

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

Data LicenseExceptionId 
Instance details

Defined in Distribution.SPDX.LicenseExceptionId

Methods

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

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

toConstr :: LicenseExceptionId -> Constr #

dataTypeOf :: LicenseExceptionId -> DataType #

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

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

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

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

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

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

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

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

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

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

Data LicenseExpression 
Instance details

Defined in Distribution.SPDX.LicenseExpression

Methods

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

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

toConstr :: LicenseExpression -> Constr #

dataTypeOf :: LicenseExpression -> DataType #

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

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

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

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

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

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

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

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

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

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

Data SimpleLicenseExpression 
Instance details

Defined in Distribution.SPDX.LicenseExpression

Methods

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

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

toConstr :: SimpleLicenseExpression -> Constr #

dataTypeOf :: SimpleLicenseExpression -> DataType #

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

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

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

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

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

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

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

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

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

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

Data LicenseId 
Instance details

Defined in Distribution.SPDX.LicenseId

Methods

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

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

toConstr :: LicenseId -> Constr #

dataTypeOf :: LicenseId -> DataType #

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

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

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

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

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

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

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

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

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

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

Data LicenseRef 
Instance details

Defined in Distribution.SPDX.LicenseReference

Methods

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

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

toConstr :: LicenseRef -> Constr #

dataTypeOf :: LicenseRef -> DataType #

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

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

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

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

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

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

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

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

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

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

Data Arch 
Instance details

Defined in Distribution.System

Methods

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

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

toConstr :: Arch -> Constr #

dataTypeOf :: Arch -> DataType #

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

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

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

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

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

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

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

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

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

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

Data OS 
Instance details

Defined in Distribution.System

Methods

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

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

toConstr :: OS -> Constr #

dataTypeOf :: OS -> DataType #

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

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OS) #

gmapT :: (forall b. Data b => b -> b) -> OS -> OS #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OS -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OS -> r #

gmapQ :: (forall d. Data d => d -> u) -> OS -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OS -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OS -> m OS #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OS -> m OS #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OS -> m OS #

Data Platform 
Instance details

Defined in Distribution.System

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Platform -> c Platform #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Platform #

toConstr :: Platform -> Constr #

dataTypeOf :: Platform -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Platform) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Platform) #

gmapT :: (forall b. Data b => b -> b) -> Platform -> Platform #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Platform -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Platform -> r #

gmapQ :: (forall d. Data d => d -> u) -> Platform -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Platform -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Platform -> m Platform #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Platform -> m Platform #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Platform -> m Platform #

Data Benchmark 
Instance details

Defined in Distribution.Types.Benchmark

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Benchmark -> c Benchmark #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Benchmark #

toConstr :: Benchmark -> Constr #

dataTypeOf :: Benchmark -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Benchmark) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Benchmark) #

gmapT :: (forall b. Data b => b -> b) -> Benchmark -> Benchmark #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Benchmark -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Benchmark -> r #

gmapQ :: (forall d. Data d => d -> u) -> Benchmark -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Benchmark -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Benchmark -> m Benchmark #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Benchmark -> m Benchmark #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Benchmark -> m Benchmark #

Data BenchmarkInterface 
Instance details

Defined in Distribution.Types.BenchmarkInterface

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BenchmarkInterface -> c BenchmarkInterface #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BenchmarkInterface #

toConstr :: BenchmarkInterface -> Constr #

dataTypeOf :: BenchmarkInterface -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BenchmarkInterface) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BenchmarkInterface) #

gmapT :: (forall b. Data b => b -> b) -> BenchmarkInterface -> BenchmarkInterface #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BenchmarkInterface -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BenchmarkInterface -> r #

gmapQ :: (forall d. Data d => d -> u) -> BenchmarkInterface -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BenchmarkInterface -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BenchmarkInterface -> m BenchmarkInterface #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BenchmarkInterface -> m BenchmarkInterface #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BenchmarkInterface -> m BenchmarkInterface #

Data BenchmarkType 
Instance details

Defined in Distribution.Types.BenchmarkType

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BenchmarkType -> c BenchmarkType #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BenchmarkType #

toConstr :: BenchmarkType -> Constr #

dataTypeOf :: BenchmarkType -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BenchmarkType) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BenchmarkType) #

gmapT :: (forall b. Data b => b -> b) -> BenchmarkType -> BenchmarkType #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BenchmarkType -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BenchmarkType -> r #

gmapQ :: (forall d. Data d => d -> u) -> BenchmarkType -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BenchmarkType -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BenchmarkType -> m BenchmarkType #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BenchmarkType -> m BenchmarkType #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BenchmarkType -> m BenchmarkType #

Data BuildInfo 
Instance details

Defined in Distribution.Types.BuildInfo

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BuildInfo -> c BuildInfo #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BuildInfo #

toConstr :: BuildInfo -> Constr #

dataTypeOf :: BuildInfo -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BuildInfo) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BuildInfo) #

gmapT :: (forall b. Data b => b -> b) -> BuildInfo -> BuildInfo #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BuildInfo -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BuildInfo -> r #

gmapQ :: (forall d. Data d => d -> u) -> BuildInfo -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BuildInfo -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BuildInfo -> m BuildInfo #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildInfo -> m BuildInfo #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildInfo -> m BuildInfo #

Data BuildType 
Instance details

Defined in Distribution.Types.BuildType

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BuildType -> c BuildType #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BuildType #

toConstr :: BuildType -> Constr #

dataTypeOf :: BuildType -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BuildType) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BuildType) #

gmapT :: (forall b. Data b => b -> b) -> BuildType -> BuildType #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BuildType -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BuildType -> r #

gmapQ :: (forall d. Data d => d -> u) -> BuildType -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BuildType -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BuildType -> m BuildType #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildType -> m BuildType #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildType -> m BuildType #

Data ComponentId 
Instance details

Defined in Distribution.Types.ComponentId

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ComponentId -> c ComponentId #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ComponentId #

toConstr :: ComponentId -> Constr #

dataTypeOf :: ComponentId -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ComponentId) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ComponentId) #

gmapT :: (forall b. Data b => b -> b) -> ComponentId -> ComponentId #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ComponentId -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ComponentId -> r #

gmapQ :: (forall d. Data d => d -> u) -> ComponentId -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ComponentId -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ComponentId -> m ComponentId #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ComponentId -> m ComponentId #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ComponentId -> m ComponentId #

Data ConfVar 
Instance details

Defined in Distribution.Types.ConfVar

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ConfVar -> c ConfVar #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ConfVar #

toConstr :: ConfVar -> Constr #

dataTypeOf :: ConfVar -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ConfVar) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ConfVar) #

gmapT :: (forall b. Data b => b -> b) -> ConfVar -> ConfVar #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ConfVar -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ConfVar -> r #

gmapQ :: (forall d. Data d => d -> u) -> ConfVar -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ConfVar -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ConfVar -> m ConfVar #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ConfVar -> m ConfVar #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ConfVar -> m ConfVar #

Data Dependency 
Instance details

Defined in Distribution.Types.Dependency

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Dependency -> c Dependency #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Dependency #

toConstr :: Dependency -> Constr #

dataTypeOf :: Dependency -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Dependency) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Dependency) #

gmapT :: (forall b. Data b => b -> b) -> Dependency -> Dependency #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Dependency -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Dependency -> r #

gmapQ :: (forall d. Data d => d -> u) -> Dependency -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Dependency -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Dependency -> m Dependency #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Dependency -> m Dependency #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Dependency -> m Dependency #

Data ExeDependency 
Instance details

Defined in Distribution.Types.ExeDependency

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ExeDependency -> c ExeDependency #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ExeDependency #

toConstr :: ExeDependency -> Constr #

dataTypeOf :: ExeDependency -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ExeDependency) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ExeDependency) #

gmapT :: (forall b. Data b => b -> b) -> ExeDependency -> ExeDependency #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ExeDependency -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ExeDependency -> r #

gmapQ :: (forall d. Data d => d -> u) -> ExeDependency -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ExeDependency -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ExeDependency -> m ExeDependency #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ExeDependency -> m ExeDependency #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ExeDependency -> m ExeDependency #

Data Executable 
Instance details

Defined in Distribution.Types.Executable

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Executable -> c Executable #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Executable #

toConstr :: Executable -> Constr #

dataTypeOf :: Executable -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Executable) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Executable) #

gmapT :: (forall b. Data b => b -> b) -> Executable -> Executable #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Executable -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Executable -> r #

gmapQ :: (forall d. Data d => d -> u) -> Executable -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Executable -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Executable -> m Executable #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Executable -> m Executable #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Executable -> m Executable #

Data ExecutableScope 
Instance details

Defined in Distribution.Types.ExecutableScope

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ExecutableScope -> c ExecutableScope #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ExecutableScope #

toConstr :: ExecutableScope -> Constr #

dataTypeOf :: ExecutableScope -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ExecutableScope) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ExecutableScope) #

gmapT :: (forall b. Data b => b -> b) -> ExecutableScope -> ExecutableScope #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ExecutableScope -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ExecutableScope -> r #

gmapQ :: (forall d. Data d => d -> u) -> ExecutableScope -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ExecutableScope -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ExecutableScope -> m ExecutableScope #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ExecutableScope -> m ExecutableScope #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ExecutableScope -> m ExecutableScope #

Data FlagName 
Instance details

Defined in Distribution.Types.Flag

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FlagName -> c FlagName #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FlagName #

toConstr :: FlagName -> Constr #

dataTypeOf :: FlagName -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c FlagName) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FlagName) #

gmapT :: (forall b. Data b => b -> b) -> FlagName -> FlagName #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FlagName -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FlagName -> r #

gmapQ :: (forall d. Data d => d -> u) -> FlagName -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FlagName -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FlagName -> m FlagName #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FlagName -> m FlagName #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FlagName -> m FlagName #

Data PackageFlag 
Instance details

Defined in Distribution.Types.Flag

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PackageFlag -> c PackageFlag #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PackageFlag #

toConstr :: PackageFlag -> Constr #

dataTypeOf :: PackageFlag -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PackageFlag) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PackageFlag) #

gmapT :: (forall b. Data b => b -> b) -> PackageFlag -> PackageFlag #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PackageFlag -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PackageFlag -> r #

gmapQ :: (forall d. Data d => d -> u) -> PackageFlag -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PackageFlag -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PackageFlag -> m PackageFlag #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PackageFlag -> m PackageFlag #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PackageFlag -> m PackageFlag #

Data ForeignLib 
Instance details

Defined in Distribution.Types.ForeignLib

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ForeignLib -> c ForeignLib #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ForeignLib #

toConstr :: ForeignLib -> Constr #

dataTypeOf :: ForeignLib -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ForeignLib) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ForeignLib) #

gmapT :: (forall b. Data b => b -> b) -> ForeignLib -> ForeignLib #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ForeignLib -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ForeignLib -> r #

gmapQ :: (forall d. Data d => d -> u) -> ForeignLib -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ForeignLib -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ForeignLib -> m ForeignLib #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ForeignLib -> m ForeignLib #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ForeignLib -> m ForeignLib #

Data LibVersionInfo 
Instance details

Defined in Distribution.Types.ForeignLib

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LibVersionInfo -> c LibVersionInfo #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c LibVersionInfo #

toConstr :: LibVersionInfo -> Constr #

dataTypeOf :: LibVersionInfo -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LibVersionInfo) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c LibVersionInfo) #

gmapT :: (forall b. Data b => b -> b) -> LibVersionInfo -> LibVersionInfo #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LibVersionInfo -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LibVersionInfo -> r #

gmapQ :: (forall d. Data d => d -> u) -> LibVersionInfo -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> LibVersionInfo -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> LibVersionInfo -> m LibVersionInfo #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LibVersionInfo -> m LibVersionInfo #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LibVersionInfo -> m LibVersionInfo #

Data ForeignLibOption 
Instance details

Defined in Distribution.Types.ForeignLibOption

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ForeignLibOption -> c ForeignLibOption #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ForeignLibOption #

toConstr :: ForeignLibOption -> Constr #

dataTypeOf :: ForeignLibOption -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ForeignLibOption) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ForeignLibOption) #

gmapT :: (forall b. Data b => b -> b) -> ForeignLibOption -> ForeignLibOption #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ForeignLibOption -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ForeignLibOption -> r #

gmapQ :: (forall d. Data d => d -> u) -> ForeignLibOption -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ForeignLibOption -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ForeignLibOption -> m ForeignLibOption #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ForeignLibOption -> m ForeignLibOption #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ForeignLibOption -> m ForeignLibOption #

Data ForeignLibType 
Instance details

Defined in Distribution.Types.ForeignLibType

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ForeignLibType -> c ForeignLibType #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ForeignLibType #

toConstr :: ForeignLibType -> Constr #

dataTypeOf :: ForeignLibType -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ForeignLibType) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ForeignLibType) #

gmapT :: (forall b. Data b => b -> b) -> ForeignLibType -> ForeignLibType #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ForeignLibType -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ForeignLibType -> r #

gmapQ :: (forall d. Data d => d -> u) -> ForeignLibType -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ForeignLibType -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ForeignLibType -> m ForeignLibType #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ForeignLibType -> m ForeignLibType #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ForeignLibType -> m ForeignLibType #

Data GenericPackageDescription 
Instance details

Defined in Distribution.Types.GenericPackageDescription

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GenericPackageDescription -> c GenericPackageDescription #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c GenericPackageDescription #

toConstr :: GenericPackageDescription -> Constr #

dataTypeOf :: GenericPackageDescription -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c GenericPackageDescription) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c GenericPackageDescription) #

gmapT :: (forall b. Data b => b -> b) -> GenericPackageDescription -> GenericPackageDescription #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GenericPackageDescription -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GenericPackageDescription -> r #

gmapQ :: (forall d. Data d => d -> u) -> GenericPackageDescription -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GenericPackageDescription -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GenericPackageDescription -> m GenericPackageDescription #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GenericPackageDescription -> m GenericPackageDescription #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GenericPackageDescription -> m GenericPackageDescription #

Data IncludeRenaming 
Instance details

Defined in Distribution.Types.IncludeRenaming

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IncludeRenaming -> c IncludeRenaming #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IncludeRenaming #

toConstr :: IncludeRenaming -> Constr #

dataTypeOf :: IncludeRenaming -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IncludeRenaming) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IncludeRenaming) #

gmapT :: (forall b. Data b => b -> b) -> IncludeRenaming -> IncludeRenaming #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IncludeRenaming -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IncludeRenaming -> r #

gmapQ :: (forall d. Data d => d -> u) -> IncludeRenaming -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IncludeRenaming -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IncludeRenaming -> m IncludeRenaming #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IncludeRenaming -> m IncludeRenaming #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IncludeRenaming -> m IncludeRenaming #

Data LegacyExeDependency 
Instance details

Defined in Distribution.Types.LegacyExeDependency

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LegacyExeDependency -> c LegacyExeDependency #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c LegacyExeDependency #

toConstr :: LegacyExeDependency -> Constr #

dataTypeOf :: LegacyExeDependency -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LegacyExeDependency) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c LegacyExeDependency) #

gmapT :: (forall b. Data b => b -> b) -> LegacyExeDependency -> LegacyExeDependency #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LegacyExeDependency -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LegacyExeDependency -> r #

gmapQ :: (forall d. Data d => d -> u) -> LegacyExeDependency -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> LegacyExeDependency -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> LegacyExeDependency -> m LegacyExeDependency #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LegacyExeDependency -> m LegacyExeDependency #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LegacyExeDependency -> m LegacyExeDependency #

Data Library 
Instance details

Defined in Distribution.Types.Library

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Library -> c Library #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Library #

toConstr :: Library -> Constr #

dataTypeOf :: Library -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Library) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Library) #

gmapT :: (forall b. Data b => b -> b) -> Library -> Library #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Library -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Library -> r #

gmapQ :: (forall d. Data d => d -> u) -> Library -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Library -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Library -> m Library #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Library -> m Library #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Library -> m Library #

Data LibraryName 
Instance details

Defined in Distribution.Types.LibraryName

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LibraryName -> c LibraryName #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c LibraryName #

toConstr :: LibraryName -> Constr #

dataTypeOf :: LibraryName -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LibraryName) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c LibraryName) #

gmapT :: (forall b. Data b => b -> b) -> LibraryName -> LibraryName #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LibraryName -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LibraryName -> r #

gmapQ :: (forall d. Data d => d -> u) -> LibraryName -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> LibraryName -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> LibraryName -> m LibraryName #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LibraryName -> m LibraryName #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LibraryName -> m LibraryName #

Data LibraryVisibility 
Instance details

Defined in Distribution.Types.LibraryVisibility

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LibraryVisibility -> c LibraryVisibility #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c LibraryVisibility #

toConstr :: LibraryVisibility -> Constr #

dataTypeOf :: LibraryVisibility -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LibraryVisibility) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c LibraryVisibility) #

gmapT :: (forall b. Data b => b -> b) -> LibraryVisibility -> LibraryVisibility #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LibraryVisibility -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LibraryVisibility -> r #

gmapQ :: (forall d. Data d => d -> u) -> LibraryVisibility -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> LibraryVisibility -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> LibraryVisibility -> m LibraryVisibility #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LibraryVisibility -> m LibraryVisibility #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LibraryVisibility -> m LibraryVisibility #

Data Mixin 
Instance details

Defined in Distribution.Types.Mixin

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Mixin -> c Mixin #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Mixin #

toConstr :: Mixin -> Constr #

dataTypeOf :: Mixin -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Mixin) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Mixin) #

gmapT :: (forall b. Data b => b -> b) -> Mixin -> Mixin #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Mixin -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Mixin -> r #

gmapQ :: (forall d. Data d => d -> u) -> Mixin -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Mixin -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Mixin -> m Mixin #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Mixin -> m Mixin #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Mixin -> m Mixin #

Data Module 
Instance details

Defined in Distribution.Types.Module

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Module -> c Module #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Module #

toConstr :: Module -> Constr #

dataTypeOf :: Module -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Module) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Module) #

gmapT :: (forall b. Data b => b -> b) -> Module -> Module #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Module -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Module -> r #

gmapQ :: (forall d. Data d => d -> u) -> Module -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Module -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Module -> m Module #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Module -> m Module #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Module -> m Module #

Data ModuleReexport 
Instance details

Defined in Distribution.Types.ModuleReexport

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ModuleReexport -> c ModuleReexport #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ModuleReexport #

toConstr :: ModuleReexport -> Constr #

dataTypeOf :: ModuleReexport -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ModuleReexport) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ModuleReexport) #

gmapT :: (forall b. Data b => b -> b) -> ModuleReexport -> ModuleReexport #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ModuleReexport -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ModuleReexport -> r #

gmapQ :: (forall d. Data d => d -> u) -> ModuleReexport -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ModuleReexport -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ModuleReexport -> m ModuleReexport #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ModuleReexport -> m ModuleReexport #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ModuleReexport -> m ModuleReexport #

Data ModuleRenaming 
Instance details

Defined in Distribution.Types.ModuleRenaming

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ModuleRenaming -> c ModuleRenaming #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ModuleRenaming #

toConstr :: ModuleRenaming -> Constr #

dataTypeOf :: ModuleRenaming -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ModuleRenaming) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ModuleRenaming) #

gmapT :: (forall b. Data b => b -> b) -> ModuleRenaming -> ModuleRenaming #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ModuleRenaming -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ModuleRenaming -> r #

gmapQ :: (forall d. Data d => d -> u) -> ModuleRenaming -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ModuleRenaming -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ModuleRenaming -> m ModuleRenaming #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ModuleRenaming -> m ModuleRenaming #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ModuleRenaming -> m ModuleRenaming #

Data MungedPackageId 
Instance details

Defined in Distribution.Types.MungedPackageId

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> MungedPackageId -> c MungedPackageId #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c MungedPackageId #

toConstr :: MungedPackageId -> Constr #

dataTypeOf :: MungedPackageId -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c MungedPackageId) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c MungedPackageId) #

gmapT :: (forall b. Data b => b -> b) -> MungedPackageId -> MungedPackageId #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> MungedPackageId -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> MungedPackageId -> r #

gmapQ :: (forall d. Data d => d -> u) -> MungedPackageId -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> MungedPackageId -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> MungedPackageId -> m MungedPackageId #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> MungedPackageId -> m MungedPackageId #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> MungedPackageId -> m MungedPackageId #

Data MungedPackageName 
Instance details

Defined in Distribution.Types.MungedPackageName

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> MungedPackageName -> c MungedPackageName #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c MungedPackageName #

toConstr :: MungedPackageName -> Constr #

dataTypeOf :: MungedPackageName -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c MungedPackageName) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c MungedPackageName) #

gmapT :: (forall b. Data b => b -> b) -> MungedPackageName -> MungedPackageName #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> MungedPackageName -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> MungedPackageName -> r #

gmapQ :: (forall d. Data d => d -> u) -> MungedPackageName -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> MungedPackageName -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> MungedPackageName -> m MungedPackageName #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> MungedPackageName -> m MungedPackageName #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> MungedPackageName -> m MungedPackageName #

Data PackageDescription 
Instance details

Defined in Distribution.Types.PackageDescription

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PackageDescription -> c PackageDescription #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PackageDescription #

toConstr :: PackageDescription -> Constr #

dataTypeOf :: PackageDescription -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PackageDescription) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PackageDescription) #

gmapT :: (forall b. Data b => b -> b) -> PackageDescription -> PackageDescription #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PackageDescription -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PackageDescription -> r #

gmapQ :: (forall d. Data d => d -> u) -> PackageDescription -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PackageDescription -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PackageDescription -> m PackageDescription #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PackageDescription -> m PackageDescription #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PackageDescription -> m PackageDescription #

Data PackageIdentifier 
Instance details

Defined in Distribution.Types.PackageId

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PackageIdentifier -> c PackageIdentifier #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PackageIdentifier #

toConstr :: PackageIdentifier -> Constr #

dataTypeOf :: PackageIdentifier -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PackageIdentifier) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PackageIdentifier) #

gmapT :: (forall b. Data b => b -> b) -> PackageIdentifier -> PackageIdentifier #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PackageIdentifier -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PackageIdentifier -> r #

gmapQ :: (forall d. Data d => d -> u) -> PackageIdentifier -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PackageIdentifier -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PackageIdentifier -> m PackageIdentifier #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PackageIdentifier -> m PackageIdentifier #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PackageIdentifier -> m PackageIdentifier #

Data PackageName 
Instance details

Defined in Distribution.Types.PackageName

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PackageName -> c PackageName #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PackageName #

toConstr :: PackageName -> Constr #

dataTypeOf :: PackageName -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PackageName) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PackageName) #

gmapT :: (forall b. Data b => b -> b) -> PackageName -> PackageName #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PackageName -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PackageName -> r #

gmapQ :: (forall d. Data d => d -> u) -> PackageName -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PackageName -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PackageName -> m PackageName #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PackageName -> m PackageName #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PackageName -> m PackageName #

Data PackageVersionConstraint 
Instance details

Defined in Distribution.Types.PackageVersionConstraint

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PackageVersionConstraint -> c PackageVersionConstraint #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PackageVersionConstraint #

toConstr :: PackageVersionConstraint -> Constr #

dataTypeOf :: PackageVersionConstraint -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PackageVersionConstraint) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PackageVersionConstraint) #

gmapT :: (forall b. Data b => b -> b) -> PackageVersionConstraint -> PackageVersionConstraint #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PackageVersionConstraint -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PackageVersionConstraint -> r #

gmapQ :: (forall d. Data d => d -> u) -> PackageVersionConstraint -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PackageVersionConstraint -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PackageVersionConstraint -> m PackageVersionConstraint #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PackageVersionConstraint -> m PackageVersionConstraint #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PackageVersionConstraint -> m PackageVersionConstraint #

Data PkgconfigDependency 
Instance details

Defined in Distribution.Types.PkgconfigDependency

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PkgconfigDependency -> c PkgconfigDependency #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PkgconfigDependency #

toConstr :: PkgconfigDependency -> Constr #

dataTypeOf :: PkgconfigDependency -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PkgconfigDependency) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PkgconfigDependency) #

gmapT :: (forall b. Data b => b -> b) -> PkgconfigDependency -> PkgconfigDependency #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PkgconfigDependency -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PkgconfigDependency -> r #

gmapQ :: (forall d. Data d => d -> u) -> PkgconfigDependency -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PkgconfigDependency -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PkgconfigDependency -> m PkgconfigDependency #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PkgconfigDependency -> m PkgconfigDependency #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PkgconfigDependency -> m PkgconfigDependency #

Data PkgconfigName 
Instance details

Defined in Distribution.Types.PkgconfigName

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PkgconfigName -> c PkgconfigName #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PkgconfigName #

toConstr :: PkgconfigName -> Constr #

dataTypeOf :: PkgconfigName -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PkgconfigName) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PkgconfigName) #

gmapT :: (forall b. Data b => b -> b) -> PkgconfigName -> PkgconfigName #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PkgconfigName -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PkgconfigName -> r #

gmapQ :: (forall d. Data d => d -> u) -> PkgconfigName -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PkgconfigName -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PkgconfigName -> m PkgconfigName #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PkgconfigName -> m PkgconfigName #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PkgconfigName -> m PkgconfigName #

Data PkgconfigVersion 
Instance details

Defined in Distribution.Types.PkgconfigVersion

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PkgconfigVersion -> c PkgconfigVersion #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PkgconfigVersion #

toConstr :: PkgconfigVersion -> Constr #

dataTypeOf :: PkgconfigVersion -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PkgconfigVersion) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PkgconfigVersion) #

gmapT :: (forall b. Data b => b -> b) -> PkgconfigVersion -> PkgconfigVersion #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PkgconfigVersion -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PkgconfigVersion -> r #

gmapQ :: (forall d. Data d => d -> u) -> PkgconfigVersion -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PkgconfigVersion -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PkgconfigVersion -> m PkgconfigVersion #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PkgconfigVersion -> m PkgconfigVersion #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PkgconfigVersion -> m PkgconfigVersion #

Data PkgconfigVersionRange 
Instance details

Defined in Distribution.Types.PkgconfigVersionRange

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PkgconfigVersionRange -> c PkgconfigVersionRange #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PkgconfigVersionRange #

toConstr :: PkgconfigVersionRange -> Constr #

dataTypeOf :: PkgconfigVersionRange -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PkgconfigVersionRange) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PkgconfigVersionRange) #

gmapT :: (forall b. Data b => b -> b) -> PkgconfigVersionRange -> PkgconfigVersionRange #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PkgconfigVersionRange -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PkgconfigVersionRange -> r #

gmapQ :: (forall d. Data d => d -> u) -> PkgconfigVersionRange -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PkgconfigVersionRange -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PkgconfigVersionRange -> m PkgconfigVersionRange #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PkgconfigVersionRange -> m PkgconfigVersionRange #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PkgconfigVersionRange -> m PkgconfigVersionRange #

Data SetupBuildInfo 
Instance details

Defined in Distribution.Types.SetupBuildInfo

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SetupBuildInfo -> c SetupBuildInfo #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SetupBuildInfo #

toConstr :: SetupBuildInfo -> Constr #

dataTypeOf :: SetupBuildInfo -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SetupBuildInfo) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SetupBuildInfo) #

gmapT :: (forall b. Data b => b -> b) -> SetupBuildInfo -> SetupBuildInfo #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SetupBuildInfo -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SetupBuildInfo -> r #

gmapQ :: (forall d. Data d => d -> u) -> SetupBuildInfo -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SetupBuildInfo -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SetupBuildInfo -> m SetupBuildInfo #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SetupBuildInfo -> m SetupBuildInfo #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SetupBuildInfo -> m SetupBuildInfo #

Data KnownRepoType 
Instance details

Defined in Distribution.Types.SourceRepo

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> KnownRepoType -> c KnownRepoType #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c KnownRepoType #

toConstr :: KnownRepoType -> Constr #

dataTypeOf :: KnownRepoType -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c KnownRepoType) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c KnownRepoType) #

gmapT :: (forall b. Data b => b -> b) -> KnownRepoType -> KnownRepoType #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> KnownRepoType -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> KnownRepoType -> r #

gmapQ :: (forall d. Data d => d -> u) -> KnownRepoType -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> KnownRepoType -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> KnownRepoType -> m KnownRepoType #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> KnownRepoType -> m KnownRepoType #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> KnownRepoType -> m KnownRepoType #

Data RepoKind 
Instance details

Defined in Distribution.Types.SourceRepo

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RepoKind -> c RepoKind #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RepoKind #

toConstr :: RepoKind -> Constr #

dataTypeOf :: RepoKind -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RepoKind) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RepoKind) #

gmapT :: (forall b. Data b => b -> b) -> RepoKind -> RepoKind #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RepoKind -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RepoKind -> r #

gmapQ :: (forall d. Data d => d -> u) -> RepoKind -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> RepoKind -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RepoKind -> m RepoKind #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RepoKind -> m RepoKind #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RepoKind -> m RepoKind #

Data RepoType 
Instance details

Defined in Distribution.Types.SourceRepo

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RepoType -> c RepoType #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RepoType #

toConstr :: RepoType -> Constr #

dataTypeOf :: RepoType -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RepoType) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RepoType) #

gmapT :: (forall b. Data b => b -> b) -> RepoType -> RepoType #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RepoType -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RepoType -> r #

gmapQ :: (forall d. Data d => d -> u) -> RepoType -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> RepoType -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RepoType -> m RepoType #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RepoType -> m RepoType #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RepoType -> m RepoType #

Data SourceRepo 
Instance details

Defined in Distribution.Types.SourceRepo

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SourceRepo -> c SourceRepo #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SourceRepo #

toConstr :: SourceRepo -> Constr #

dataTypeOf :: SourceRepo -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SourceRepo) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SourceRepo) #

gmapT :: (forall b. Data b => b -> b) -> SourceRepo -> SourceRepo #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SourceRepo -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SourceRepo -> r #

gmapQ :: (forall d. Data d => d -> u) -> SourceRepo -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SourceRepo -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SourceRepo -> m SourceRepo #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SourceRepo -> m SourceRepo #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SourceRepo -> m SourceRepo #

Data TestSuite 
Instance details

Defined in Distribution.Types.TestSuite

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TestSuite -> c TestSuite #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TestSuite #

toConstr :: TestSuite -> Constr #

dataTypeOf :: TestSuite -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TestSuite) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TestSuite) #

gmapT :: (forall b. Data b => b -> b) -> TestSuite -> TestSuite #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TestSuite -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TestSuite -> r #

gmapQ :: (forall d. Data d => d -> u) -> TestSuite -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TestSuite -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TestSuite -> m TestSuite #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TestSuite -> m TestSuite #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TestSuite -> m TestSuite #

Data TestSuiteInterface 
Instance details

Defined in Distribution.Types.TestSuiteInterface

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TestSuiteInterface -> c TestSuiteInterface #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TestSuiteInterface #

toConstr :: TestSuiteInterface -> Constr #

dataTypeOf :: TestSuiteInterface -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TestSuiteInterface) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TestSuiteInterface) #

gmapT :: (forall b. Data b => b -> b) -> TestSuiteInterface -> TestSuiteInterface #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TestSuiteInterface -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TestSuiteInterface -> r #

gmapQ :: (forall d. Data d => d -> u) -> TestSuiteInterface -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TestSuiteInterface -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TestSuiteInterface -> m TestSuiteInterface #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TestSuiteInterface -> m TestSuiteInterface #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TestSuiteInterface -> m TestSuiteInterface #

Data TestType 
Instance details

Defined in Distribution.Types.TestType

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TestType -> c TestType #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TestType #

toConstr :: TestType -> Constr #

dataTypeOf :: TestType -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TestType) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TestType) #

gmapT :: (forall b. Data b => b -> b) -> TestType -> TestType #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TestType -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TestType -> r #

gmapQ :: (forall d. Data d => d -> u) -> TestType -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TestType -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TestType -> m TestType #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TestType -> m TestType #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TestType -> m TestType #

Data DefUnitId 
Instance details

Defined in Distribution.Types.UnitId

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DefUnitId -> c DefUnitId #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DefUnitId #

toConstr :: DefUnitId -> Constr #

dataTypeOf :: DefUnitId -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DefUnitId) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DefUnitId) #

gmapT :: (forall b. Data b => b -> b) -> DefUnitId -> DefUnitId #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DefUnitId -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DefUnitId -> r #

gmapQ :: (forall d. Data d => d -> u) -> DefUnitId -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DefUnitId -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DefUnitId -> m DefUnitId #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DefUnitId -> m DefUnitId #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DefUnitId -> m DefUnitId #

Data UnitId 
Instance details

Defined in Distribution.Types.UnitId

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UnitId -> c UnitId #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UnitId #

toConstr :: UnitId -> Constr #

dataTypeOf :: UnitId -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UnitId) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UnitId) #

gmapT :: (forall b. Data b => b -> b) -> UnitId -> UnitId #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UnitId -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UnitId -> r #

gmapQ :: (forall d. Data d => d -> u) -> UnitId -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UnitId -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UnitId -> m UnitId #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UnitId -> m UnitId #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UnitId -> m UnitId #

Data UnqualComponentName 
Instance details

Defined in Distribution.Types.UnqualComponentName

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UnqualComponentName -> c UnqualComponentName #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UnqualComponentName #

toConstr :: UnqualComponentName -> Constr #

dataTypeOf :: UnqualComponentName -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UnqualComponentName) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UnqualComponentName) #

gmapT :: (forall b. Data b => b -> b) -> UnqualComponentName -> UnqualComponentName #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UnqualComponentName -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UnqualComponentName -> r #

gmapQ :: (forall d. Data d => d -> u) -> UnqualComponentName -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UnqualComponentName -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UnqualComponentName -> m UnqualComponentName #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UnqualComponentName -> m UnqualComponentName #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UnqualComponentName -> m UnqualComponentName #

Data Version 
Instance details

Defined in Distribution.Types.Version

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Version -> c Version #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Version #

toConstr :: Version -> Constr #

dataTypeOf :: Version -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Version) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Version) #

gmapT :: (forall b. Data b => b -> b) -> Version -> Version #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Version -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Version -> r #

gmapQ :: (forall d. Data d => d -> u) -> Version -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Version -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Version -> m Version #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Version -> m Version #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Version -> m Version #

Data VersionRange 
Instance details

Defined in Distribution.Types.VersionRange.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> VersionRange -> c VersionRange #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c VersionRange #

toConstr :: VersionRange -> Constr #

dataTypeOf :: VersionRange -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c VersionRange) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c VersionRange) #

gmapT :: (forall b. Data b => b -> b) -> VersionRange -> VersionRange #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> VersionRange -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> VersionRange -> r #

gmapQ :: (forall d. Data d => d -> u) -> VersionRange -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> VersionRange -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> VersionRange -> m VersionRange #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> VersionRange -> m VersionRange #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> VersionRange -> m VersionRange #

Data LicenseFile 
Instance details

Defined in Distribution.Utils.Path

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LicenseFile -> c LicenseFile #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c LicenseFile #

toConstr :: LicenseFile -> Constr #

dataTypeOf :: LicenseFile -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LicenseFile) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c LicenseFile) #

gmapT :: (forall b. Data b => b -> b) -> LicenseFile -> LicenseFile #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LicenseFile -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LicenseFile -> r #

gmapQ :: (forall d. Data d => d -> u) -> LicenseFile -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> LicenseFile -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> LicenseFile -> m LicenseFile #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LicenseFile -> m LicenseFile #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LicenseFile -> m LicenseFile #

Data PackageDir 
Instance details

Defined in Distribution.Utils.Path

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PackageDir -> c PackageDir #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PackageDir #

toConstr :: PackageDir -> Constr #

dataTypeOf :: PackageDir -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PackageDir) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PackageDir) #

gmapT :: (forall b. Data b => b -> b) -> PackageDir -> PackageDir #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PackageDir -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PackageDir -> r #

gmapQ :: (forall d. Data d => d -> u) -> PackageDir -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PackageDir -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PackageDir -> m PackageDir #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PackageDir -> m PackageDir #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PackageDir -> m PackageDir #

Data SourceDir 
Instance details

Defined in Distribution.Utils.Path

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SourceDir -> c SourceDir #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SourceDir #

toConstr :: SourceDir -> Constr #

dataTypeOf :: SourceDir -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SourceDir) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SourceDir) #

gmapT :: (forall b. Data b => b -> b) -> SourceDir -> SourceDir #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SourceDir -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SourceDir -> r #

gmapQ :: (forall d. Data d => d -> u) -> SourceDir -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SourceDir -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SourceDir -> m SourceDir #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SourceDir -> m SourceDir #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SourceDir -> m SourceDir #

Data ShortText 
Instance details

Defined in Distribution.Utils.ShortText

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ShortText -> c ShortText #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ShortText #

toConstr :: ShortText -> Constr #

dataTypeOf :: ShortText -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ShortText) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ShortText) #

gmapT :: (forall b. Data b => b -> b) -> ShortText -> ShortText #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ShortText -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ShortText -> r #

gmapQ :: (forall d. Data d => d -> u) -> ShortText -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ShortText -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ShortText -> m ShortText #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ShortText -> m ShortText #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ShortText -> m ShortText #

Data Extension 
Instance details

Defined in Language.Haskell.Extension

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Extension -> c Extension #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Extension #

toConstr :: Extension -> Constr #

dataTypeOf :: Extension -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Extension) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Extension) #

gmapT :: (forall b. Data b => b -> b) -> Extension -> Extension #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Extension -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Extension -> r #

gmapQ :: (forall d. Data d => d -> u) -> Extension -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Extension -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Extension -> m Extension #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Extension -> m Extension #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Extension -> m Extension #

Data KnownExtension 
Instance details

Defined in Language.Haskell.Extension

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> KnownExtension -> c KnownExtension #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c KnownExtension #

toConstr :: KnownExtension -> Constr #

dataTypeOf :: KnownExtension -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c KnownExtension) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c KnownExtension) #

gmapT :: (forall b. Data b => b -> b) -> KnownExtension -> KnownExtension #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> KnownExtension -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> KnownExtension -> r #

gmapQ :: (forall d. Data d => d -> u) -> KnownExtension -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> KnownExtension -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> KnownExtension -> m KnownExtension #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> KnownExtension -> m KnownExtension #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> KnownExtension -> m KnownExtension #

Data Language 
Instance details

Defined in Language.Haskell.Extension

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Language -> c Language #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Language #

toConstr :: Language -> Constr #

dataTypeOf :: Language -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Language) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Language) #

gmapT :: (forall b. Data b => b -> b) -> Language -> Language #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Language -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Language -> r #

gmapQ :: (forall d. Data d => d -> u) -> Language -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Language -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Language -> m Language #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Language -> m Language #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Language -> m Language #

Data Key 
Instance details

Defined in Data.Aeson.Key

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Key -> c Key #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Key #

toConstr :: Key -> Constr #

dataTypeOf :: Key -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Key) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Key) #

gmapT :: (forall b. Data b => b -> b) -> Key -> Key #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Key -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Key -> r #

gmapQ :: (forall d. Data d => d -> u) -> Key -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Key -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Key -> m Key #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Key -> m Key #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Key -> m Key #

Data Value 
Instance details

Defined in Data.Aeson.Types.Internal

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 #

Data Number 
Instance details

Defined in Data.Attoparsec.Number

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Number -> c Number #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Number #

toConstr :: Number -> Constr #

dataTypeOf :: Number -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Number) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Number) #

gmapT :: (forall b. Data b => b -> b) -> Number -> Number #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Number -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Number -> r #

gmapQ :: (forall d. Data d => d -> u) -> Number -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Number -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Number -> m Number #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Number -> m Number #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Number -> m Number #

Data ByteArray 
Instance details

Defined in Data.Array.Byte

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ByteArray -> c ByteArray #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ByteArray #

toConstr :: ByteArray -> Constr #

dataTypeOf :: ByteArray -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ByteArray) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ByteArray) #

gmapT :: (forall b. Data b => b -> b) -> ByteArray -> ByteArray #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ByteArray -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ByteArray -> r #

gmapQ :: (forall d. Data d => d -> u) -> ByteArray -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ByteArray -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ByteArray -> m ByteArray #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ByteArray -> m ByteArray #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ByteArray -> m ByteArray #

Data All 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> All -> c All #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c All #

toConstr :: All -> Constr #

dataTypeOf :: All -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c All) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c All) #

gmapT :: (forall b. Data b => b -> b) -> All -> All #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> All -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> All -> r #

gmapQ :: (forall d. Data d => d -> u) -> All -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> All -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> All -> m All #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> All -> m All #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> All -> m All #

Data Any 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Any -> c Any #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Any #

toConstr :: Any -> Constr #

dataTypeOf :: Any -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Any) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Any) #

gmapT :: (forall b. Data b => b -> b) -> Any -> Any #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Any -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Any -> r #

gmapQ :: (forall d. Data d => d -> u) -> Any -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Any -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Any -> m Any #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Any -> m Any #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Any -> m Any #

Data Version 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Version -> c Version #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Version #

toConstr :: Version -> Constr #

dataTypeOf :: Version -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Version) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Version) #

gmapT :: (forall b. Data b => b -> b) -> Version -> Version #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Version -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Version -> r #

gmapQ :: (forall d. Data d => d -> u) -> Version -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Version -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Version -> m Version #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Version -> m Version #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Version -> m Version #

Data IntPtr 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IntPtr -> c IntPtr #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IntPtr #

toConstr :: IntPtr -> Constr #

dataTypeOf :: IntPtr -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IntPtr) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IntPtr) #

gmapT :: (forall b. Data b => b -> b) -> IntPtr -> IntPtr #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IntPtr -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IntPtr -> r #

gmapQ :: (forall d. Data d => d -> u) -> IntPtr -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IntPtr -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IntPtr -> m IntPtr #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IntPtr -> m IntPtr #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IntPtr -> m IntPtr #

Data WordPtr 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> WordPtr -> c WordPtr #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c WordPtr #

toConstr :: WordPtr -> Constr #

dataTypeOf :: WordPtr -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c WordPtr) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c WordPtr) #

gmapT :: (forall b. Data b => b -> b) -> WordPtr -> WordPtr #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WordPtr -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WordPtr -> r #

gmapQ :: (forall d. Data d => d -> u) -> WordPtr -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> WordPtr -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> WordPtr -> m WordPtr #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> WordPtr -> m WordPtr #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> WordPtr -> m WordPtr #

Data Void 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Void -> c Void #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Void #

toConstr :: Void -> Constr #

dataTypeOf :: Void -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Void) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Void) #

gmapT :: (forall b. Data b => b -> b) -> Void -> Void #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Void -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Void -> r #

gmapQ :: (forall d. Data d => d -> u) -> Void -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Void -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Void -> m Void #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Void -> m Void #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Void -> m Void #

Data SpecConstrAnnotation 
Instance details

Defined in GHC.Exts

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SpecConstrAnnotation -> c SpecConstrAnnotation #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SpecConstrAnnotation #

toConstr :: SpecConstrAnnotation -> Constr #

dataTypeOf :: SpecConstrAnnotation -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SpecConstrAnnotation) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SpecConstrAnnotation) #

gmapT :: (forall b. Data b => b -> b) -> SpecConstrAnnotation -> SpecConstrAnnotation #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SpecConstrAnnotation -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SpecConstrAnnotation -> r #

gmapQ :: (forall d. Data d => d -> u) -> SpecConstrAnnotation -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SpecConstrAnnotation -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SpecConstrAnnotation -> m SpecConstrAnnotation #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SpecConstrAnnotation -> m SpecConstrAnnotation #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SpecConstrAnnotation -> m SpecConstrAnnotation #

Data Associativity 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Associativity -> c Associativity #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Associativity #

toConstr :: Associativity -> Constr #

dataTypeOf :: Associativity -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Associativity) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Associativity) #

gmapT :: (forall b. Data b => b -> b) -> Associativity -> Associativity #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Associativity -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Associativity -> r #

gmapQ :: (forall d. Data d => d -> u) -> Associativity -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Associativity -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Associativity -> m Associativity #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Associativity -> m Associativity #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Associativity -> m Associativity #

Data DecidedStrictness 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DecidedStrictness -> c DecidedStrictness #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DecidedStrictness #

toConstr :: DecidedStrictness -> Constr #

dataTypeOf :: DecidedStrictness -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DecidedStrictness) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DecidedStrictness) #

gmapT :: (forall b. Data b => b -> b) -> DecidedStrictness -> DecidedStrictness #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DecidedStrictness -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DecidedStrictness -> r #

gmapQ :: (forall d. Data d => d -> u) -> DecidedStrictness -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DecidedStrictness -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DecidedStrictness -> m DecidedStrictness #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DecidedStrictness -> m DecidedStrictness #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DecidedStrictness -> m DecidedStrictness #

Data Fixity 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Fixity -> c Fixity #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Fixity #

toConstr :: Fixity -> Constr #

dataTypeOf :: Fixity -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Fixity) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Fixity) #

gmapT :: (forall b. Data b => b -> b) -> Fixity -> Fixity #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Fixity -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Fixity -> r #

gmapQ :: (forall d. Data d => d -> u) -> Fixity -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Fixity -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Fixity -> m Fixity #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Fixity -> m Fixity #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Fixity -> m Fixity #

Data SourceStrictness 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SourceStrictness -> c SourceStrictness #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SourceStrictness #

toConstr :: SourceStrictness -> Constr #

dataTypeOf :: SourceStrictness -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SourceStrictness) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SourceStrictness) #

gmapT :: (forall b. Data b => b -> b) -> SourceStrictness -> SourceStrictness #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SourceStrictness -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SourceStrictness -> r #

gmapQ :: (forall d. Data d => d -> u) -> SourceStrictness -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SourceStrictness -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SourceStrictness -> m SourceStrictness #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SourceStrictness -> m SourceStrictness #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SourceStrictness -> m SourceStrictness #

Data SourceUnpackedness 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SourceUnpackedness -> c SourceUnpackedness #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SourceUnpackedness #

toConstr :: SourceUnpackedness -> Constr #

dataTypeOf :: SourceUnpackedness -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SourceUnpackedness) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SourceUnpackedness) #

gmapT :: (forall b. Data b => b -> b) -> SourceUnpackedness -> SourceUnpackedness #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SourceUnpackedness -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SourceUnpackedness -> r #

gmapQ :: (forall d. Data d => d -> u) -> SourceUnpackedness -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SourceUnpackedness -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SourceUnpackedness -> m SourceUnpackedness #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SourceUnpackedness -> m SourceUnpackedness #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SourceUnpackedness -> m SourceUnpackedness #

Data Int16 
Instance details

Defined in 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 #

Data Int32 
Instance details

Defined in 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 #

Data Int64 
Instance details

Defined in 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 #

Data Int8 
Instance details

Defined in 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 #

Data Word16 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Word16 -> c Word16 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Word16 #

toConstr :: Word16 -> Constr #

dataTypeOf :: Word16 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Word16) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Word16) #

gmapT :: (forall b. Data b => b -> b) -> Word16 -> Word16 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Word16 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Word16 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Word16 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Word16 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Word16 -> m Word16 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Word16 -> m Word16 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Word16 -> m Word16 #

Data Word32 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Word32 -> c Word32 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Word32 #

toConstr :: Word32 -> Constr #

dataTypeOf :: Word32 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Word32) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Word32) #

gmapT :: (forall b. Data b => b -> b) -> Word32 -> Word32 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Word32 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Word32 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Word32 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Word32 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Word32 -> m Word32 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Word32 -> m Word32 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Word32 -> m Word32 #

Data Word64 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Word64 -> c Word64 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Word64 #

toConstr :: Word64 -> Constr #

dataTypeOf :: Word64 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Word64) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Word64) #

gmapT :: (forall b. Data b => b -> b) -> Word64 -> Word64 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Word64 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Word64 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Word64 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Word64 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Word64 -> m Word64 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Word64 -> m Word64 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Word64 -> m Word64 #

Data Word8 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Word8 -> c Word8 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Word8 #

toConstr :: Word8 -> Constr #

dataTypeOf :: Word8 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Word8) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Word8) #

gmapT :: (forall b. Data b => b -> b) -> Word8 -> Word8 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Word8 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Word8 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Word8 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Word8 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Word8 -> m Word8 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Word8 -> m Word8 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Word8 -> m Word8 #

Data Encoding 
Instance details

Defined in Basement.String

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Encoding -> c Encoding #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Encoding #

toConstr :: Encoding -> Constr #

dataTypeOf :: Encoding -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Encoding) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Encoding) #

gmapT :: (forall b. Data b => b -> b) -> Encoding -> Encoding #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Encoding -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Encoding -> r #

gmapQ :: (forall d. Data d => d -> u) -> Encoding -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Encoding -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Encoding -> m Encoding #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Encoding -> m Encoding #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Encoding -> m Encoding #

Data String 
Instance details

Defined in Basement.UTF8.Base

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> String -> c String #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c String #

toConstr :: String -> Constr #

dataTypeOf :: String -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c String) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c String) #

gmapT :: (forall b. Data b => b -> b) -> String -> String #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> String -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> String -> r #

gmapQ :: (forall d. Data d => d -> u) -> String -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> String -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> String -> m String #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> String -> m String #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> String -> m String #

Data ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ByteString -> c ByteString #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ByteString #

toConstr :: ByteString -> Constr #

dataTypeOf :: ByteString -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ByteString) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ByteString) #

gmapT :: (forall b. Data b => b -> b) -> ByteString -> ByteString #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ByteString -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ByteString -> r #

gmapQ :: (forall d. Data d => d -> u) -> ByteString -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ByteString -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ByteString -> m ByteString #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ByteString -> m ByteString #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ByteString -> m ByteString #

Data ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ByteString -> c ByteString #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ByteString #

toConstr :: ByteString -> Constr #

dataTypeOf :: ByteString -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ByteString) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ByteString) #

gmapT :: (forall b. Data b => b -> b) -> ByteString -> ByteString #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ByteString -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ByteString -> r #

gmapQ :: (forall d. Data d => d -> u) -> ByteString -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ByteString -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ByteString -> m ByteString #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ByteString -> m ByteString #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ByteString -> m ByteString #

Data ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ShortByteString -> c ShortByteString #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ShortByteString #

toConstr :: ShortByteString -> Constr #

dataTypeOf :: ShortByteString -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ShortByteString) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ShortByteString) #

gmapT :: (forall b. Data b => b -> b) -> ShortByteString -> ShortByteString #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ShortByteString -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ShortByteString -> r #

gmapQ :: (forall d. Data d => d -> u) -> ShortByteString -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ShortByteString -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ShortByteString -> m ShortByteString #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ShortByteString -> m ShortByteString #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ShortByteString -> m ShortByteString #

Data IntSet 
Instance details

Defined in Data.IntSet.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IntSet -> c IntSet #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IntSet #

toConstr :: IntSet -> Constr #

dataTypeOf :: IntSet -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IntSet) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IntSet) #

gmapT :: (forall b. Data b => b -> b) -> IntSet -> IntSet #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IntSet -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IntSet -> r #

gmapQ :: (forall d. Data d => d -> u) -> IntSet -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IntSet -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IntSet -> m IntSet #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IntSet -> m IntSet #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IntSet -> m IntSet #

Data Curve_Edwards25519 
Instance details

Defined in Crypto.ECC

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Curve_Edwards25519 -> c Curve_Edwards25519 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Curve_Edwards25519 #

toConstr :: Curve_Edwards25519 -> Constr #

dataTypeOf :: Curve_Edwards25519 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Curve_Edwards25519) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Curve_Edwards25519) #

gmapT :: (forall b. Data b => b -> b) -> Curve_Edwards25519 -> Curve_Edwards25519 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Curve_Edwards25519 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Curve_Edwards25519 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Curve_Edwards25519 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Curve_Edwards25519 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Curve_Edwards25519 -> m Curve_Edwards25519 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Curve_Edwards25519 -> m Curve_Edwards25519 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Curve_Edwards25519 -> m Curve_Edwards25519 #

Data Curve_P256R1 
Instance details

Defined in Crypto.ECC

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Curve_P256R1 -> c Curve_P256R1 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Curve_P256R1 #

toConstr :: Curve_P256R1 -> Constr #

dataTypeOf :: Curve_P256R1 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Curve_P256R1) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Curve_P256R1) #

gmapT :: (forall b. Data b => b -> b) -> Curve_P256R1 -> Curve_P256R1 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Curve_P256R1 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Curve_P256R1 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Curve_P256R1 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Curve_P256R1 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Curve_P256R1 -> m Curve_P256R1 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Curve_P256R1 -> m Curve_P256R1 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Curve_P256R1 -> m Curve_P256R1 #

Data Curve_P384R1 
Instance details

Defined in Crypto.ECC

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Curve_P384R1 -> c Curve_P384R1 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Curve_P384R1 #

toConstr :: Curve_P384R1 -> Constr #

dataTypeOf :: Curve_P384R1 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Curve_P384R1) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Curve_P384R1) #

gmapT :: (forall b. Data b => b -> b) -> Curve_P384R1 -> Curve_P384R1 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Curve_P384R1 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Curve_P384R1 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Curve_P384R1 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Curve_P384R1 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Curve_P384R1 -> m Curve_P384R1 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Curve_P384R1 -> m Curve_P384R1 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Curve_P384R1 -> m Curve_P384R1 #

Data Curve_P521R1 
Instance details

Defined in Crypto.ECC

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Curve_P521R1 -> c Curve_P521R1 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Curve_P521R1 #

toConstr :: Curve_P521R1 -> Constr #

dataTypeOf :: Curve_P521R1 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Curve_P521R1) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Curve_P521R1) #

gmapT :: (forall b. Data b => b -> b) -> Curve_P521R1 -> Curve_P521R1 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Curve_P521R1 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Curve_P521R1 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Curve_P521R1 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Curve_P521R1 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Curve_P521R1 -> m Curve_P521R1 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Curve_P521R1 -> m Curve_P521R1 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Curve_P521R1 -> m Curve_P521R1 #

Data Curve_X25519 
Instance details

Defined in Crypto.ECC

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Curve_X25519 -> c Curve_X25519 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Curve_X25519 #

toConstr :: Curve_X25519 -> Constr #

dataTypeOf :: Curve_X25519 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Curve_X25519) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Curve_X25519) #

gmapT :: (forall b. Data b => b -> b) -> Curve_X25519 -> Curve_X25519 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Curve_X25519 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Curve_X25519 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Curve_X25519 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Curve_X25519 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Curve_X25519 -> m Curve_X25519 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Curve_X25519 -> m Curve_X25519 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Curve_X25519 -> m Curve_X25519 #

Data Curve_X448 
Instance details

Defined in Crypto.ECC

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Curve_X448 -> c Curve_X448 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Curve_X448 #

toConstr :: Curve_X448 -> Constr #

dataTypeOf :: Curve_X448 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Curve_X448) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Curve_X448) #

gmapT :: (forall b. Data b => b -> b) -> Curve_X448 -> Curve_X448 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Curve_X448 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Curve_X448 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Curve_X448 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Curve_X448 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Curve_X448 -> m Curve_X448 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Curve_X448 -> m Curve_X448 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Curve_X448 -> m Curve_X448 #

Data CryptoError 
Instance details

Defined in Crypto.Error.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CryptoError -> c CryptoError #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CryptoError #

toConstr :: CryptoError -> Constr #

dataTypeOf :: CryptoError -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CryptoError) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CryptoError) #

gmapT :: (forall b. Data b => b -> b) -> CryptoError -> CryptoError #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CryptoError -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CryptoError -> r #

gmapQ :: (forall d. Data d => d -> u) -> CryptoError -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CryptoError -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CryptoError -> m CryptoError #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CryptoError -> m CryptoError #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CryptoError -> m CryptoError #

Data Blake2b_160 
Instance details

Defined in Crypto.Hash.Blake2b

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Blake2b_160 -> c Blake2b_160 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Blake2b_160 #

toConstr :: Blake2b_160 -> Constr #

dataTypeOf :: Blake2b_160 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Blake2b_160) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Blake2b_160) #

gmapT :: (forall b. Data b => b -> b) -> Blake2b_160 -> Blake2b_160 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Blake2b_160 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Blake2b_160 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Blake2b_160 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Blake2b_160 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Blake2b_160 -> m Blake2b_160 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2b_160 -> m Blake2b_160 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2b_160 -> m Blake2b_160 #

Data Blake2b_224 
Instance details

Defined in Crypto.Hash.Blake2b

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Blake2b_224 -> c Blake2b_224 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Blake2b_224 #

toConstr :: Blake2b_224 -> Constr #

dataTypeOf :: Blake2b_224 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Blake2b_224) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Blake2b_224) #

gmapT :: (forall b. Data b => b -> b) -> Blake2b_224 -> Blake2b_224 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Blake2b_224 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Blake2b_224 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Blake2b_224 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Blake2b_224 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Blake2b_224 -> m Blake2b_224 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2b_224 -> m Blake2b_224 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2b_224 -> m Blake2b_224 #

Data Blake2b_256 
Instance details

Defined in Crypto.Hash.Blake2b

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Blake2b_256 -> c Blake2b_256 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Blake2b_256 #

toConstr :: Blake2b_256 -> Constr #

dataTypeOf :: Blake2b_256 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Blake2b_256) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Blake2b_256) #

gmapT :: (forall b. Data b => b -> b) -> Blake2b_256 -> Blake2b_256 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Blake2b_256 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Blake2b_256 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Blake2b_256 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Blake2b_256 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Blake2b_256 -> m Blake2b_256 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2b_256 -> m Blake2b_256 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2b_256 -> m Blake2b_256 #

Data Blake2b_384 
Instance details

Defined in Crypto.Hash.Blake2b

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Blake2b_384 -> c Blake2b_384 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Blake2b_384 #

toConstr :: Blake2b_384 -> Constr #

dataTypeOf :: Blake2b_384 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Blake2b_384) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Blake2b_384) #

gmapT :: (forall b. Data b => b -> b) -> Blake2b_384 -> Blake2b_384 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Blake2b_384 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Blake2b_384 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Blake2b_384 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Blake2b_384 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Blake2b_384 -> m Blake2b_384 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2b_384 -> m Blake2b_384 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2b_384 -> m Blake2b_384 #

Data Blake2b_512 
Instance details

Defined in Crypto.Hash.Blake2b

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Blake2b_512 -> c Blake2b_512 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Blake2b_512 #

toConstr :: Blake2b_512 -> Constr #

dataTypeOf :: Blake2b_512 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Blake2b_512) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Blake2b_512) #

gmapT :: (forall b. Data b => b -> b) -> Blake2b_512 -> Blake2b_512 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Blake2b_512 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Blake2b_512 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Blake2b_512 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Blake2b_512 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Blake2b_512 -> m Blake2b_512 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2b_512 -> m Blake2b_512 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2b_512 -> m Blake2b_512 #

Data Blake2bp_512 
Instance details

Defined in Crypto.Hash.Blake2bp

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Blake2bp_512 -> c Blake2bp_512 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Blake2bp_512 #

toConstr :: Blake2bp_512 -> Constr #

dataTypeOf :: Blake2bp_512 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Blake2bp_512) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Blake2bp_512) #

gmapT :: (forall b. Data b => b -> b) -> Blake2bp_512 -> Blake2bp_512 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Blake2bp_512 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Blake2bp_512 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Blake2bp_512 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Blake2bp_512 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Blake2bp_512 -> m Blake2bp_512 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2bp_512 -> m Blake2bp_512 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2bp_512 -> m Blake2bp_512 #

Data Blake2s_160 
Instance details

Defined in Crypto.Hash.Blake2s

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Blake2s_160 -> c Blake2s_160 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Blake2s_160 #

toConstr :: Blake2s_160 -> Constr #

dataTypeOf :: Blake2s_160 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Blake2s_160) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Blake2s_160) #

gmapT :: (forall b. Data b => b -> b) -> Blake2s_160 -> Blake2s_160 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Blake2s_160 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Blake2s_160 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Blake2s_160 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Blake2s_160 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Blake2s_160 -> m Blake2s_160 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2s_160 -> m Blake2s_160 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2s_160 -> m Blake2s_160 #

Data Blake2s_224 
Instance details

Defined in Crypto.Hash.Blake2s

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Blake2s_224 -> c Blake2s_224 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Blake2s_224 #

toConstr :: Blake2s_224 -> Constr #

dataTypeOf :: Blake2s_224 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Blake2s_224) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Blake2s_224) #

gmapT :: (forall b. Data b => b -> b) -> Blake2s_224 -> Blake2s_224 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Blake2s_224 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Blake2s_224 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Blake2s_224 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Blake2s_224 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Blake2s_224 -> m Blake2s_224 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2s_224 -> m Blake2s_224 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2s_224 -> m Blake2s_224 #

Data Blake2s_256 
Instance details

Defined in Crypto.Hash.Blake2s

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Blake2s_256 -> c Blake2s_256 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Blake2s_256 #

toConstr :: Blake2s_256 -> Constr #

dataTypeOf :: Blake2s_256 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Blake2s_256) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Blake2s_256) #

gmapT :: (forall b. Data b => b -> b) -> Blake2s_256 -> Blake2s_256 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Blake2s_256 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Blake2s_256 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Blake2s_256 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Blake2s_256 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Blake2s_256 -> m Blake2s_256 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2s_256 -> m Blake2s_256 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2s_256 -> m Blake2s_256 #

Data Blake2sp_224 
Instance details

Defined in Crypto.Hash.Blake2sp

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Blake2sp_224 -> c Blake2sp_224 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Blake2sp_224 #

toConstr :: Blake2sp_224 -> Constr #

dataTypeOf :: Blake2sp_224 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Blake2sp_224) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Blake2sp_224) #

gmapT :: (forall b. Data b => b -> b) -> Blake2sp_224 -> Blake2sp_224 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Blake2sp_224 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Blake2sp_224 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Blake2sp_224 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Blake2sp_224 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Blake2sp_224 -> m Blake2sp_224 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2sp_224 -> m Blake2sp_224 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2sp_224 -> m Blake2sp_224 #

Data Blake2sp_256 
Instance details

Defined in Crypto.Hash.Blake2sp

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Blake2sp_256 -> c Blake2sp_256 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Blake2sp_256 #

toConstr :: Blake2sp_256 -> Constr #

dataTypeOf :: Blake2sp_256 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Blake2sp_256) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Blake2sp_256) #

gmapT :: (forall b. Data b => b -> b) -> Blake2sp_256 -> Blake2sp_256 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Blake2sp_256 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Blake2sp_256 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Blake2sp_256 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Blake2sp_256 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Blake2sp_256 -> m Blake2sp_256 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2sp_256 -> m Blake2sp_256 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2sp_256 -> m Blake2sp_256 #

Data Keccak_224 
Instance details

Defined in Crypto.Hash.Keccak

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Keccak_224 -> c Keccak_224 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Keccak_224 #

toConstr :: Keccak_224 -> Constr #

dataTypeOf :: Keccak_224 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Keccak_224) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Keccak_224) #

gmapT :: (forall b. Data b => b -> b) -> Keccak_224 -> Keccak_224 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Keccak_224 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Keccak_224 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Keccak_224 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Keccak_224 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Keccak_224 -> m Keccak_224 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Keccak_224 -> m Keccak_224 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Keccak_224 -> m Keccak_224 #

Data Keccak_256 
Instance details

Defined in Crypto.Hash.Keccak

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Keccak_256 -> c Keccak_256 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Keccak_256 #

toConstr :: Keccak_256 -> Constr #

dataTypeOf :: Keccak_256 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Keccak_256) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Keccak_256) #

gmapT :: (forall b. Data b => b -> b) -> Keccak_256 -> Keccak_256 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Keccak_256 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Keccak_256 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Keccak_256 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Keccak_256 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Keccak_256 -> m Keccak_256 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Keccak_256 -> m Keccak_256 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Keccak_256 -> m Keccak_256 #

Data Keccak_384 
Instance details

Defined in Crypto.Hash.Keccak

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Keccak_384 -> c Keccak_384 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Keccak_384 #

toConstr :: Keccak_384 -> Constr #

dataTypeOf :: Keccak_384 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Keccak_384) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Keccak_384) #

gmapT :: (forall b. Data b => b -> b) -> Keccak_384 -> Keccak_384 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Keccak_384 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Keccak_384 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Keccak_384 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Keccak_384 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Keccak_384 -> m Keccak_384 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Keccak_384 -> m Keccak_384 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Keccak_384 -> m Keccak_384 #

Data Keccak_512 
Instance details

Defined in Crypto.Hash.Keccak

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Keccak_512 -> c Keccak_512 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Keccak_512 #

toConstr :: Keccak_512 -> Constr #

dataTypeOf :: Keccak_512 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Keccak_512) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Keccak_512) #

gmapT :: (forall b. Data b => b -> b) -> Keccak_512 -> Keccak_512 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Keccak_512 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Keccak_512 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Keccak_512 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Keccak_512 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Keccak_512 -> m Keccak_512 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Keccak_512 -> m Keccak_512 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Keccak_512 -> m Keccak_512 #

Data MD2 
Instance details

Defined in Crypto.Hash.MD2

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> MD2 -> c MD2 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c MD2 #

toConstr :: MD2 -> Constr #

dataTypeOf :: MD2 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c MD2) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c MD2) #

gmapT :: (forall b. Data b => b -> b) -> MD2 -> MD2 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> MD2 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> MD2 -> r #

gmapQ :: (forall d. Data d => d -> u) -> MD2 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> MD2 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> MD2 -> m MD2 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> MD2 -> m MD2 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> MD2 -> m MD2 #

Data MD4 
Instance details

Defined in Crypto.Hash.MD4

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> MD4 -> c MD4 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c MD4 #

toConstr :: MD4 -> Constr #

dataTypeOf :: MD4 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c MD4) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c MD4) #

gmapT :: (forall b. Data b => b -> b) -> MD4 -> MD4 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> MD4 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> MD4 -> r #

gmapQ :: (forall d. Data d => d -> u) -> MD4 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> MD4 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> MD4 -> m MD4 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> MD4 -> m MD4 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> MD4 -> m MD4 #

Data MD5 
Instance details

Defined in Crypto.Hash.MD5

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> MD5 -> c MD5 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c MD5 #

toConstr :: MD5 -> Constr #

dataTypeOf :: MD5 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c MD5) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c MD5) #

gmapT :: (forall b. Data b => b -> b) -> MD5 -> MD5 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> MD5 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> MD5 -> r #

gmapQ :: (forall d. Data d => d -> u) -> MD5 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> MD5 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> MD5 -> m MD5 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> MD5 -> m MD5 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> MD5 -> m MD5 #

Data RIPEMD160 
Instance details

Defined in Crypto.Hash.RIPEMD160

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RIPEMD160 -> c RIPEMD160 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RIPEMD160 #

toConstr :: RIPEMD160 -> Constr #

dataTypeOf :: RIPEMD160 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RIPEMD160) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RIPEMD160) #

gmapT :: (forall b. Data b => b -> b) -> RIPEMD160 -> RIPEMD160 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RIPEMD160 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RIPEMD160 -> r #

gmapQ :: (forall d. Data d => d -> u) -> RIPEMD160 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> RIPEMD160 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RIPEMD160 -> m RIPEMD160 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RIPEMD160 -> m RIPEMD160 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RIPEMD160 -> m RIPEMD160 #

Data SHA1 
Instance details

Defined in Crypto.Hash.SHA1

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SHA1 -> c SHA1 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SHA1 #

toConstr :: SHA1 -> Constr #

dataTypeOf :: SHA1 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SHA1) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SHA1) #

gmapT :: (forall b. Data b => b -> b) -> SHA1 -> SHA1 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SHA1 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SHA1 -> r #

gmapQ :: (forall d. Data d => d -> u) -> SHA1 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SHA1 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SHA1 -> m SHA1 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA1 -> m SHA1 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA1 -> m SHA1 #

Data SHA224 
Instance details

Defined in Crypto.Hash.SHA224

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SHA224 -> c SHA224 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SHA224 #

toConstr :: SHA224 -> Constr #

dataTypeOf :: SHA224 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SHA224) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SHA224) #

gmapT :: (forall b. Data b => b -> b) -> SHA224 -> SHA224 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SHA224 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SHA224 -> r #

gmapQ :: (forall d. Data d => d -> u) -> SHA224 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SHA224 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SHA224 -> m SHA224 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA224 -> m SHA224 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA224 -> m SHA224 #

Data SHA256 
Instance details

Defined in Crypto.Hash.SHA256

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SHA256 -> c SHA256 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SHA256 #

toConstr :: SHA256 -> Constr #

dataTypeOf :: SHA256 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SHA256) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SHA256) #

gmapT :: (forall b. Data b => b -> b) -> SHA256 -> SHA256 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SHA256 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SHA256 -> r #

gmapQ :: (forall d. Data d => d -> u) -> SHA256 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SHA256 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SHA256 -> m SHA256 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA256 -> m SHA256 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA256 -> m SHA256 #

Data SHA3_224 
Instance details

Defined in Crypto.Hash.SHA3

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SHA3_224 -> c SHA3_224 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SHA3_224 #

toConstr :: SHA3_224 -> Constr #

dataTypeOf :: SHA3_224 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SHA3_224) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SHA3_224) #

gmapT :: (forall b. Data b => b -> b) -> SHA3_224 -> SHA3_224 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SHA3_224 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SHA3_224 -> r #

gmapQ :: (forall d. Data d => d -> u) -> SHA3_224 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SHA3_224 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SHA3_224 -> m SHA3_224 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA3_224 -> m SHA3_224 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA3_224 -> m SHA3_224 #

Data SHA3_256 
Instance details

Defined in Crypto.Hash.SHA3

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SHA3_256 -> c SHA3_256 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SHA3_256 #

toConstr :: SHA3_256 -> Constr #

dataTypeOf :: SHA3_256 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SHA3_256) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SHA3_256) #

gmapT :: (forall b. Data b => b -> b) -> SHA3_256 -> SHA3_256 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SHA3_256 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SHA3_256 -> r #

gmapQ :: (forall d. Data d => d -> u) -> SHA3_256 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SHA3_256 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SHA3_256 -> m SHA3_256 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA3_256 -> m SHA3_256 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA3_256 -> m SHA3_256 #

Data SHA3_384 
Instance details

Defined in Crypto.Hash.SHA3

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SHA3_384 -> c SHA3_384 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SHA3_384 #

toConstr :: SHA3_384 -> Constr #

dataTypeOf :: SHA3_384 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SHA3_384) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SHA3_384) #

gmapT :: (forall b. Data b => b -> b) -> SHA3_384 -> SHA3_384 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SHA3_384 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SHA3_384 -> r #

gmapQ :: (forall d. Data d => d -> u) -> SHA3_384 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SHA3_384 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SHA3_384 -> m SHA3_384 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA3_384 -> m SHA3_384 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA3_384 -> m SHA3_384 #

Data SHA3_512 
Instance details

Defined in Crypto.Hash.SHA3

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SHA3_512 -> c SHA3_512 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SHA3_512 #

toConstr :: SHA3_512 -> Constr #

dataTypeOf :: SHA3_512 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SHA3_512) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SHA3_512) #

gmapT :: (forall b. Data b => b -> b) -> SHA3_512 -> SHA3_512 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SHA3_512 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SHA3_512 -> r #

gmapQ :: (forall d. Data d => d -> u) -> SHA3_512 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SHA3_512 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SHA3_512 -> m SHA3_512 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA3_512 -> m SHA3_512 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA3_512 -> m SHA3_512 #

Data SHA384 
Instance details

Defined in Crypto.Hash.SHA384

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SHA384 -> c SHA384 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SHA384 #

toConstr :: SHA384 -> Constr #

dataTypeOf :: SHA384 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SHA384) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SHA384) #

gmapT :: (forall b. Data b => b -> b) -> SHA384 -> SHA384 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SHA384 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SHA384 -> r #

gmapQ :: (forall d. Data d => d -> u) -> SHA384 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SHA384 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SHA384 -> m SHA384 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA384 -> m SHA384 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA384 -> m SHA384 #

Data SHA512 
Instance details

Defined in Crypto.Hash.SHA512

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SHA512 -> c SHA512 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SHA512 #

toConstr :: SHA512 -> Constr #

dataTypeOf :: SHA512 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SHA512) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SHA512) #

gmapT :: (forall b. Data b => b -> b) -> SHA512 -> SHA512 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SHA512 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SHA512 -> r #

gmapQ :: (forall d. Data d => d -> u) -> SHA512 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SHA512 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SHA512 -> m SHA512 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA512 -> m SHA512 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA512 -> m SHA512 #

Data SHA512t_224 
Instance details

Defined in Crypto.Hash.SHA512t

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SHA512t_224 -> c SHA512t_224 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SHA512t_224 #

toConstr :: SHA512t_224 -> Constr #

dataTypeOf :: SHA512t_224 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SHA512t_224) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SHA512t_224) #

gmapT :: (forall b. Data b => b -> b) -> SHA512t_224 -> SHA512t_224 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SHA512t_224 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SHA512t_224 -> r #

gmapQ :: (forall d. Data d => d -> u) -> SHA512t_224 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SHA512t_224 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SHA512t_224 -> m SHA512t_224 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA512t_224 -> m SHA512t_224 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA512t_224 -> m SHA512t_224 #

Data SHA512t_256 
Instance details

Defined in Crypto.Hash.SHA512t

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SHA512t_256 -> c SHA512t_256 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SHA512t_256 #

toConstr :: SHA512t_256 -> Constr #

dataTypeOf :: SHA512t_256 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SHA512t_256) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SHA512t_256) #

gmapT :: (forall b. Data b => b -> b) -> SHA512t_256 -> SHA512t_256 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SHA512t_256 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SHA512t_256 -> r #

gmapQ :: (forall d. Data d => d -> u) -> SHA512t_256 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SHA512t_256 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SHA512t_256 -> m SHA512t_256 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA512t_256 -> m SHA512t_256 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA512t_256 -> m SHA512t_256 #

Data Skein256_224 
Instance details

Defined in Crypto.Hash.Skein256

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Skein256_224 -> c Skein256_224 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Skein256_224 #

toConstr :: Skein256_224 -> Constr #

dataTypeOf :: Skein256_224 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Skein256_224) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Skein256_224) #

gmapT :: (forall b. Data b => b -> b) -> Skein256_224 -> Skein256_224 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Skein256_224 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Skein256_224 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Skein256_224 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Skein256_224 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Skein256_224 -> m Skein256_224 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Skein256_224 -> m Skein256_224 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Skein256_224 -> m Skein256_224 #

Data Skein256_256 
Instance details

Defined in Crypto.Hash.Skein256

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Skein256_256 -> c Skein256_256 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Skein256_256 #

toConstr :: Skein256_256 -> Constr #

dataTypeOf :: Skein256_256 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Skein256_256) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Skein256_256) #

gmapT :: (forall b. Data b => b -> b) -> Skein256_256 -> Skein256_256 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Skein256_256 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Skein256_256 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Skein256_256 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Skein256_256 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Skein256_256 -> m Skein256_256 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Skein256_256 -> m Skein256_256 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Skein256_256 -> m Skein256_256 #

Data Skein512_224 
Instance details

Defined in Crypto.Hash.Skein512

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Skein512_224 -> c Skein512_224 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Skein512_224 #

toConstr :: Skein512_224 -> Constr #

dataTypeOf :: Skein512_224 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Skein512_224) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Skein512_224) #

gmapT :: (forall b. Data b => b -> b) -> Skein512_224 -> Skein512_224 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Skein512_224 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Skein512_224 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Skein512_224 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Skein512_224 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Skein512_224 -> m Skein512_224 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Skein512_224 -> m Skein512_224 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Skein512_224 -> m Skein512_224 #

Data Skein512_256 
Instance details

Defined in Crypto.Hash.Skein512

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Skein512_256 -> c Skein512_256 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Skein512_256 #

toConstr :: Skein512_256 -> Constr #

dataTypeOf :: Skein512_256 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Skein512_256) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Skein512_256) #

gmapT :: (forall b. Data b => b -> b) -> Skein512_256 -> Skein512_256 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Skein512_256 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Skein512_256 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Skein512_256 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Skein512_256 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Skein512_256 -> m Skein512_256 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Skein512_256 -> m Skein512_256 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Skein512_256 -> m Skein512_256 #

Data Skein512_384 
Instance details

Defined in Crypto.Hash.Skein512

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Skein512_384 -> c Skein512_384 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Skein512_384 #

toConstr :: Skein512_384 -> Constr #

dataTypeOf :: Skein512_384 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Skein512_384) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Skein512_384) #

gmapT :: (forall b. Data b => b -> b) -> Skein512_384 -> Skein512_384 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Skein512_384 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Skein512_384 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Skein512_384 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Skein512_384 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Skein512_384 -> m Skein512_384 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Skein512_384 -> m Skein512_384 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Skein512_384 -> m Skein512_384 #

Data Skein512_512 
Instance details

Defined in Crypto.Hash.Skein512

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Skein512_512 -> c Skein512_512 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Skein512_512 #

toConstr :: Skein512_512 -> Constr #

dataTypeOf :: Skein512_512 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Skein512_512) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Skein512_512) #

gmapT :: (forall b. Data b => b -> b) -> Skein512_512 -> Skein512_512 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Skein512_512 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Skein512_512 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Skein512_512 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Skein512_512 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Skein512_512 -> m Skein512_512 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Skein512_512 -> m Skein512_512 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Skein512_512 -> m Skein512_512 #

Data Tiger 
Instance details

Defined in Crypto.Hash.Tiger

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Tiger -> c Tiger #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Tiger #

toConstr :: Tiger -> Constr #

dataTypeOf :: Tiger -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Tiger) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Tiger) #

gmapT :: (forall b. Data b => b -> b) -> Tiger -> Tiger #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Tiger -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Tiger -> r #

gmapQ :: (forall d. Data d => d -> u) -> Tiger -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Tiger -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Tiger -> m Tiger #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Tiger -> m Tiger #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Tiger -> m Tiger #

Data Whirlpool 
Instance details

Defined in Crypto.Hash.Whirlpool

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Whirlpool -> c Whirlpool #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Whirlpool #

toConstr :: Whirlpool -> Constr #

dataTypeOf :: Whirlpool -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Whirlpool) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Whirlpool) #

gmapT :: (forall b. Data b => b -> b) -> Whirlpool -> Whirlpool #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Whirlpool -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Whirlpool -> r #

gmapQ :: (forall d. Data d => d -> u) -> Whirlpool -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Whirlpool -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Whirlpool -> m Whirlpool #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Whirlpool -> m Whirlpool #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Whirlpool -> m Whirlpool #

Data Params 
Instance details

Defined in Crypto.PubKey.DH

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Params -> c Params #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Params #

toConstr :: Params -> Constr #

dataTypeOf :: Params -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Params) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Params) #

gmapT :: (forall b. Data b => b -> b) -> Params -> Params #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Params -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Params -> r #

gmapQ :: (forall d. Data d => d -> u) -> Params -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Params -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Params -> m Params #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Params -> m Params #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Params -> m Params #

Data KeyPair 
Instance details

Defined in Crypto.PubKey.DSA

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> KeyPair -> c KeyPair #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c KeyPair #

toConstr :: KeyPair -> Constr #

dataTypeOf :: KeyPair -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c KeyPair) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c KeyPair) #

gmapT :: (forall b. Data b => b -> b) -> KeyPair -> KeyPair #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> KeyPair -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> KeyPair -> r #

gmapQ :: (forall d. Data d => d -> u) -> KeyPair -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> KeyPair -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> KeyPair -> m KeyPair #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> KeyPair -> m KeyPair #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> KeyPair -> m KeyPair #

Data Params 
Instance details

Defined in Crypto.PubKey.DSA

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Params -> c Params #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Params #

toConstr :: Params -> Constr #

dataTypeOf :: Params -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Params) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Params) #

gmapT :: (forall b. Data b => b -> b) -> Params -> Params #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Params -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Params -> r #

gmapQ :: (forall d. Data d => d -> u) -> Params -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Params -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Params -> m Params #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Params -> m Params #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Params -> m Params #

Data PrivateKey 
Instance details

Defined in Crypto.PubKey.DSA

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PrivateKey -> c PrivateKey #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PrivateKey #

toConstr :: PrivateKey -> Constr #

dataTypeOf :: PrivateKey -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PrivateKey) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PrivateKey) #

gmapT :: (forall b. Data b => b -> b) -> PrivateKey -> PrivateKey #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PrivateKey -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PrivateKey -> r #

gmapQ :: (forall d. Data d => d -> u) -> PrivateKey -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PrivateKey -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PrivateKey -> m PrivateKey #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PrivateKey -> m PrivateKey #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PrivateKey -> m PrivateKey #

Data PublicKey 
Instance details

Defined in Crypto.PubKey.DSA

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PublicKey -> c PublicKey #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PublicKey #

toConstr :: PublicKey -> Constr #

dataTypeOf :: PublicKey -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PublicKey) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PublicKey) #

gmapT :: (forall b. Data b => b -> b) -> PublicKey -> PublicKey #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PublicKey -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PublicKey -> r #

gmapQ :: (forall d. Data d => d -> u) -> PublicKey -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PublicKey -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PublicKey -> m PublicKey #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PublicKey -> m PublicKey #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PublicKey -> m PublicKey #

Data Signature 
Instance details

Defined in Crypto.PubKey.DSA

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Signature -> c Signature #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Signature #

toConstr :: Signature -> Constr #

dataTypeOf :: Signature -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Signature) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Signature) #

gmapT :: (forall b. Data b => b -> b) -> Signature -> Signature #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Signature -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Signature -> r #

gmapQ :: (forall d. Data d => d -> u) -> Signature -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Signature -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Signature -> m Signature #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Signature -> m Signature #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Signature -> m Signature #

Data ExtendedSignature 
Instance details

Defined in Crypto.PubKey.ECC.ECDSA

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ExtendedSignature -> c ExtendedSignature #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ExtendedSignature #

toConstr :: ExtendedSignature -> Constr #

dataTypeOf :: ExtendedSignature -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ExtendedSignature) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ExtendedSignature) #

gmapT :: (forall b. Data b => b -> b) -> ExtendedSignature -> ExtendedSignature #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ExtendedSignature -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ExtendedSignature -> r #

gmapQ :: (forall d. Data d => d -> u) -> ExtendedSignature -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ExtendedSignature -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ExtendedSignature -> m ExtendedSignature #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ExtendedSignature -> m ExtendedSignature #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ExtendedSignature -> m ExtendedSignature #

Data KeyPair 
Instance details

Defined in Crypto.PubKey.ECC.ECDSA

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> KeyPair -> c KeyPair #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c KeyPair #

toConstr :: KeyPair -> Constr #

dataTypeOf :: KeyPair -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c KeyPair) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c KeyPair) #

gmapT :: (forall b. Data b => b -> b) -> KeyPair -> KeyPair #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> KeyPair -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> KeyPair -> r #

gmapQ :: (forall d. Data d => d -> u) -> KeyPair -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> KeyPair -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> KeyPair -> m KeyPair #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> KeyPair -> m KeyPair #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> KeyPair -> m KeyPair #

Data PrivateKey 
Instance details

Defined in Crypto.PubKey.ECC.ECDSA

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PrivateKey -> c PrivateKey #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PrivateKey #

toConstr :: PrivateKey -> Constr #

dataTypeOf :: PrivateKey -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PrivateKey) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PrivateKey) #

gmapT :: (forall b. Data b => b -> b) -> PrivateKey -> PrivateKey #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PrivateKey -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PrivateKey -> r #

gmapQ :: (forall d. Data d => d -> u) -> PrivateKey -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PrivateKey -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PrivateKey -> m PrivateKey #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PrivateKey -> m PrivateKey #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PrivateKey -> m PrivateKey #

Data PublicKey 
Instance details

Defined in Crypto.PubKey.ECC.ECDSA

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PublicKey -> c PublicKey #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PublicKey #

toConstr :: PublicKey -> Constr #

dataTypeOf :: PublicKey -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PublicKey) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PublicKey) #

gmapT :: (forall b. Data b => b -> b) -> PublicKey -> PublicKey #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PublicKey -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PublicKey -> r #

gmapQ :: (forall d. Data d => d -> u) -> PublicKey -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PublicKey -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PublicKey -> m PublicKey #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PublicKey -> m PublicKey #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PublicKey -> m PublicKey #

Data Signature 
Instance details

Defined in Crypto.PubKey.ECC.ECDSA

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Signature -> c Signature #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Signature #

toConstr :: Signature -> Constr #

dataTypeOf :: Signature -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Signature) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Signature) #

gmapT :: (forall b. Data b => b -> b) -> Signature -> Signature #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Signature -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Signature -> r #

gmapQ :: (forall d. Data d => d -> u) -> Signature -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Signature -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Signature -> m Signature #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Signature -> m Signature #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Signature -> m Signature #

Data Curve 
Instance details

Defined in Crypto.PubKey.ECC.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Curve -> c Curve #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Curve #

toConstr :: Curve -> Constr #

dataTypeOf :: Curve -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Curve) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Curve) #

gmapT :: (forall b. Data b => b -> b) -> Curve -> Curve #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Curve -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Curve -> r #

gmapQ :: (forall d. Data d => d -> u) -> Curve -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Curve -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Curve -> m Curve #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Curve -> m Curve #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Curve -> m Curve #

Data CurveBinary 
Instance details

Defined in Crypto.PubKey.ECC.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CurveBinary -> c CurveBinary #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CurveBinary #

toConstr :: CurveBinary -> Constr #

dataTypeOf :: CurveBinary -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CurveBinary) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CurveBinary) #

gmapT :: (forall b. Data b => b -> b) -> CurveBinary -> CurveBinary #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CurveBinary -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CurveBinary -> r #

gmapQ :: (forall d. Data d => d -> u) -> CurveBinary -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CurveBinary -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CurveBinary -> m CurveBinary #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CurveBinary -> m CurveBinary #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CurveBinary -> m CurveBinary #

Data CurveCommon 
Instance details

Defined in Crypto.PubKey.ECC.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CurveCommon -> c CurveCommon #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CurveCommon #

toConstr :: CurveCommon -> Constr #

dataTypeOf :: CurveCommon -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CurveCommon) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CurveCommon) #

gmapT :: (forall b. Data b => b -> b) -> CurveCommon -> CurveCommon #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CurveCommon -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CurveCommon -> r #

gmapQ :: (forall d. Data d => d -> u) -> CurveCommon -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CurveCommon -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CurveCommon -> m CurveCommon #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CurveCommon -> m CurveCommon #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CurveCommon -> m CurveCommon #

Data CurveName 
Instance details

Defined in Crypto.PubKey.ECC.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CurveName -> c CurveName #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CurveName #

toConstr :: CurveName -> Constr #

dataTypeOf :: CurveName -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CurveName) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CurveName) #

gmapT :: (forall b. Data b => b -> b) -> CurveName -> CurveName #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CurveName -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CurveName -> r #

gmapQ :: (forall d. Data d => d -> u) -> CurveName -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CurveName -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CurveName -> m CurveName #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CurveName -> m CurveName #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CurveName -> m CurveName #

Data CurvePrime 
Instance details

Defined in Crypto.PubKey.ECC.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CurvePrime -> c CurvePrime #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CurvePrime #

toConstr :: CurvePrime -> Constr #

dataTypeOf :: CurvePrime -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CurvePrime) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CurvePrime) #

gmapT :: (forall b. Data b => b -> b) -> CurvePrime -> CurvePrime #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CurvePrime -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CurvePrime -> r #

gmapQ :: (forall d. Data d => d -> u) -> CurvePrime -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CurvePrime -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CurvePrime -> m CurvePrime #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CurvePrime -> m CurvePrime #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CurvePrime -> m CurvePrime #

Data Point 
Instance details

Defined in Crypto.PubKey.ECC.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Point -> c Point #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Point #

toConstr :: Point -> Constr #

dataTypeOf :: Point -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Point) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Point) #

gmapT :: (forall b. Data b => b -> b) -> Point -> Point #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Point -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Point -> r #

gmapQ :: (forall d. Data d => d -> u) -> Point -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Point -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Point -> m Point #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Point -> m Point #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Point -> m Point #

Data KeyPair 
Instance details

Defined in Crypto.PubKey.RSA.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> KeyPair -> c KeyPair #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c KeyPair #

toConstr :: KeyPair -> Constr #

dataTypeOf :: KeyPair -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c KeyPair) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c KeyPair) #

gmapT :: (forall b. Data b => b -> b) -> KeyPair -> KeyPair #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> KeyPair -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> KeyPair -> r #

gmapQ :: (forall d. Data d => d -> u) -> KeyPair -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> KeyPair -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> KeyPair -> m KeyPair #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> KeyPair -> m KeyPair #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> KeyPair -> m KeyPair #

Data PrivateKey 
Instance details

Defined in Crypto.PubKey.RSA.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PrivateKey -> c PrivateKey #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PrivateKey #

toConstr :: PrivateKey -> Constr #

dataTypeOf :: PrivateKey -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PrivateKey) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PrivateKey) #

gmapT :: (forall b. Data b => b -> b) -> PrivateKey -> PrivateKey #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PrivateKey -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PrivateKey -> r #

gmapQ :: (forall d. Data d => d -> u) -> PrivateKey -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PrivateKey -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PrivateKey -> m PrivateKey #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PrivateKey -> m PrivateKey #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PrivateKey -> m PrivateKey #

Data PublicKey 
Instance details

Defined in Crypto.PubKey.RSA.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PublicKey -> c PublicKey #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PublicKey #

toConstr :: PublicKey -> Constr #

dataTypeOf :: PublicKey -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PublicKey) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PublicKey) #

gmapT :: (forall b. Data b => b -> b) -> PublicKey -> PublicKey #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PublicKey -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PublicKey -> r #

gmapQ :: (forall d. Data d => d -> u) -> PublicKey -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PublicKey -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PublicKey -> m PublicKey #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PublicKey -> m PublicKey #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PublicKey -> m PublicKey #

Data PrivateKey 
Instance details

Defined in Crypto.PubKey.Rabin.Basic

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PrivateKey -> c PrivateKey #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PrivateKey #

toConstr :: PrivateKey -> Constr #

dataTypeOf :: PrivateKey -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PrivateKey) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PrivateKey) #

gmapT :: (forall b. Data b => b -> b) -> PrivateKey -> PrivateKey #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PrivateKey -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PrivateKey -> r #

gmapQ :: (forall d. Data d => d -> u) -> PrivateKey -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PrivateKey -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PrivateKey -> m PrivateKey #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PrivateKey -> m PrivateKey #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PrivateKey -> m PrivateKey #

Data PublicKey 
Instance details

Defined in Crypto.PubKey.Rabin.Basic

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PublicKey -> c PublicKey #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PublicKey #

toConstr :: PublicKey -> Constr #

dataTypeOf :: PublicKey -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PublicKey) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PublicKey) #

gmapT :: (forall b. Data b => b -> b) -> PublicKey -> PublicKey #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PublicKey -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PublicKey -> r #

gmapQ :: (forall d. Data d => d -> u) -> PublicKey -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PublicKey -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PublicKey -> m PublicKey #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PublicKey -> m PublicKey #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PublicKey -> m PublicKey #

Data Signature 
Instance details

Defined in Crypto.PubKey.Rabin.Basic

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Signature -> c Signature #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Signature #

toConstr :: Signature -> Constr #

dataTypeOf :: Signature -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Signature) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Signature) #

gmapT :: (forall b. Data b => b -> b) -> Signature -> Signature #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Signature -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Signature -> r #

gmapQ :: (forall d. Data d => d -> u) -> Signature -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Signature -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Signature -> m Signature #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Signature -> m Signature #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Signature -> m Signature #

Data PrivateKey 
Instance details

Defined in Crypto.PubKey.Rabin.Modified

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PrivateKey -> c PrivateKey #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PrivateKey #

toConstr :: PrivateKey -> Constr #

dataTypeOf :: PrivateKey -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PrivateKey) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PrivateKey) #

gmapT :: (forall b. Data b => b -> b) -> PrivateKey -> PrivateKey #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PrivateKey -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PrivateKey -> r #

gmapQ :: (forall d. Data d => d -> u) -> PrivateKey -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PrivateKey -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PrivateKey -> m PrivateKey #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PrivateKey -> m PrivateKey #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PrivateKey -> m PrivateKey #

Data PublicKey 
Instance details

Defined in Crypto.PubKey.Rabin.Modified

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PublicKey -> c PublicKey #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PublicKey #

toConstr :: PublicKey -> Constr #

dataTypeOf :: PublicKey -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PublicKey) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PublicKey) #

gmapT :: (forall b. Data b => b -> b) -> PublicKey -> PublicKey #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PublicKey -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PublicKey -> r #

gmapQ :: (forall d. Data d => d -> u) -> PublicKey -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PublicKey -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PublicKey -> m PublicKey #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PublicKey -> m PublicKey #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PublicKey -> m PublicKey #

Data PrivateKey 
Instance details

Defined in Crypto.PubKey.Rabin.RW

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PrivateKey -> c PrivateKey #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PrivateKey #

toConstr :: PrivateKey -> Constr #

dataTypeOf :: PrivateKey -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PrivateKey) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PrivateKey) #

gmapT :: (forall b. Data b => b -> b) -> PrivateKey -> PrivateKey #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PrivateKey -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PrivateKey -> r #

gmapQ :: (forall d. Data d => d -> u) -> PrivateKey -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PrivateKey -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PrivateKey -> m PrivateKey #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PrivateKey -> m PrivateKey #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PrivateKey -> m PrivateKey #

Data PublicKey 
Instance details

Defined in Crypto.PubKey.Rabin.RW

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PublicKey -> c PublicKey #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PublicKey #

toConstr :: PublicKey -> Constr #

dataTypeOf :: PublicKey -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PublicKey) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PublicKey) #

gmapT :: (forall b. Data b => b -> b) -> PublicKey -> PublicKey #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PublicKey -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PublicKey -> r #

gmapQ :: (forall d. Data d => d -> u) -> PublicKey -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PublicKey -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PublicKey -> m PublicKey #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PublicKey -> m PublicKey #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PublicKey -> m PublicKey #

Data ProcessorOption 
Instance details

Defined in Crypto.System.CPU

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ProcessorOption -> c ProcessorOption #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ProcessorOption #

toConstr :: ProcessorOption -> Constr #

dataTypeOf :: ProcessorOption -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ProcessorOption) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ProcessorOption) #

gmapT :: (forall b. Data b => b -> b) -> ProcessorOption -> ProcessorOption #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ProcessorOption -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ProcessorOption -> r #

gmapQ :: (forall d. Data d => d -> u) -> ProcessorOption -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ProcessorOption -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ProcessorOption -> m ProcessorOption #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ProcessorOption -> m ProcessorOption #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ProcessorOption -> m ProcessorOption #

Data Ordering 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Ordering -> c Ordering #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Ordering #

toConstr :: Ordering -> Constr #

dataTypeOf :: Ordering -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Ordering) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Ordering) #

gmapT :: (forall b. Data b => b -> b) -> Ordering -> Ordering #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Ordering -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Ordering -> r #

gmapQ :: (forall d. Data d => d -> u) -> Ordering -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Ordering -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Ordering -> m Ordering #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Ordering -> m Ordering #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Ordering -> m Ordering #

Data ByteRange 
Instance details

Defined in Network.HTTP.Types.Header

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ByteRange -> c ByteRange #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ByteRange #

toConstr :: ByteRange -> Constr #

dataTypeOf :: ByteRange -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ByteRange) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ByteRange) #

gmapT :: (forall b. Data b => b -> b) -> ByteRange -> ByteRange #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ByteRange -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ByteRange -> r #

gmapQ :: (forall d. Data d => d -> u) -> ByteRange -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ByteRange -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ByteRange -> m ByteRange #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ByteRange -> m ByteRange #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ByteRange -> m ByteRange #

Data StdMethod 
Instance details

Defined in Network.HTTP.Types.Method

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> StdMethod -> c StdMethod #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c StdMethod #

toConstr :: StdMethod -> Constr #

dataTypeOf :: StdMethod -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c StdMethod) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c StdMethod) #

gmapT :: (forall b. Data b => b -> b) -> StdMethod -> StdMethod #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> StdMethod -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> StdMethod -> r #

gmapQ :: (forall d. Data d => d -> u) -> StdMethod -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> StdMethod -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> StdMethod -> m StdMethod #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> StdMethod -> m StdMethod #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> StdMethod -> m StdMethod #

Data Status 
Instance details

Defined in Network.HTTP.Types.Status

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Status -> c Status #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Status #

toConstr :: Status -> Constr #

dataTypeOf :: Status -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Status) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Status) #

gmapT :: (forall b. Data b => b -> b) -> Status -> Status #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Status -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Status -> r #

gmapQ :: (forall d. Data d => d -> u) -> Status -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Status -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Status -> m Status #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Status -> m Status #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Status -> m Status #

Data HttpVersion 
Instance details

Defined in Network.HTTP.Types.Version

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> HttpVersion -> c HttpVersion #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c HttpVersion #

toConstr :: HttpVersion -> Constr #

dataTypeOf :: HttpVersion -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c HttpVersion) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c HttpVersion) #

gmapT :: (forall b. Data b => b -> b) -> HttpVersion -> HttpVersion #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HttpVersion -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HttpVersion -> r #

gmapQ :: (forall d. Data d => d -> u) -> HttpVersion -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> HttpVersion -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> HttpVersion -> m HttpVersion #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HttpVersion -> m HttpVersion #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HttpVersion -> m HttpVersion #

Data IP 
Instance details

Defined in Data.IP.Addr

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IP -> c IP #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IP #

toConstr :: IP -> Constr #

dataTypeOf :: IP -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IP) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IP) #

gmapT :: (forall b. Data b => b -> b) -> IP -> IP #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IP -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IP -> r #

gmapQ :: (forall d. Data d => d -> u) -> IP -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IP -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IP -> m IP #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IP -> m IP #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IP -> m IP #

Data IPv4 
Instance details

Defined in Data.IP.Addr

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IPv4 -> c IPv4 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IPv4 #

toConstr :: IPv4 -> Constr #

dataTypeOf :: IPv4 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IPv4) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IPv4) #

gmapT :: (forall b. Data b => b -> b) -> IPv4 -> IPv4 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IPv4 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IPv4 -> r #

gmapQ :: (forall d. Data d => d -> u) -> IPv4 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IPv4 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IPv4 -> m IPv4 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IPv4 -> m IPv4 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IPv4 -> m IPv4 #

Data IPv6 
Instance details

Defined in Data.IP.Addr

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IPv6 -> c IPv6 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IPv6 #

toConstr :: IPv6 -> Constr #

dataTypeOf :: IPv6 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IPv6) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IPv6) #

gmapT :: (forall b. Data b => b -> b) -> IPv6 -> IPv6 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IPv6 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IPv6 -> r #

gmapQ :: (forall d. Data d => d -> u) -> IPv6 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IPv6 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IPv6 -> m IPv6 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IPv6 -> m IPv6 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IPv6 -> m IPv6 #

Data IPRange 
Instance details

Defined in Data.IP.Range

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IPRange -> c IPRange #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IPRange #

toConstr :: IPRange -> Constr #

dataTypeOf :: IPRange -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IPRange) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IPRange) #

gmapT :: (forall b. Data b => b -> b) -> IPRange -> IPRange #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IPRange -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IPRange -> r #

gmapQ :: (forall d. Data d => d -> u) -> IPRange -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IPRange -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IPRange -> m IPRange #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IPRange -> m IPRange #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IPRange -> m IPRange #

Data MappingStyle 
Instance details

Defined in Text.Libyaml

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> MappingStyle -> c MappingStyle #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c MappingStyle #

toConstr :: MappingStyle -> Constr #

dataTypeOf :: MappingStyle -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c MappingStyle) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c MappingStyle) #

gmapT :: (forall b. Data b => b -> b) -> MappingStyle -> MappingStyle #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> MappingStyle -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> MappingStyle -> r #

gmapQ :: (forall d. Data d => d -> u) -> MappingStyle -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> MappingStyle -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> MappingStyle -> m MappingStyle #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> MappingStyle -> m MappingStyle #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> MappingStyle -> m MappingStyle #

Data SequenceStyle 
Instance details

Defined in Text.Libyaml

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SequenceStyle -> c SequenceStyle #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SequenceStyle #

toConstr :: SequenceStyle -> Constr #

dataTypeOf :: SequenceStyle -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SequenceStyle) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SequenceStyle) #

gmapT :: (forall b. Data b => b -> b) -> SequenceStyle -> SequenceStyle #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SequenceStyle -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SequenceStyle -> r #

gmapQ :: (forall d. Data d => d -> u) -> SequenceStyle -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SequenceStyle -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SequenceStyle -> m SequenceStyle #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SequenceStyle -> m SequenceStyle #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SequenceStyle -> m SequenceStyle #

Data Style 
Instance details

Defined in Text.Libyaml

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Style -> c Style #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Style #

toConstr :: Style -> Constr #

dataTypeOf :: Style -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Style) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Style) #

gmapT :: (forall b. Data b => b -> b) -> Style -> Style #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Style -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Style -> r #

gmapQ :: (forall d. Data d => d -> u) -> Style -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Style -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Style -> m Style #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Style -> m Style #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Style -> m Style #

Data Tag 
Instance details

Defined in Text.Libyaml

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Tag -> c Tag #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Tag #

toConstr :: Tag -> Constr #

dataTypeOf :: Tag -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Tag) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Tag) #

gmapT :: (forall b. Data b => b -> b) -> Tag -> Tag #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Tag -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Tag -> r #

gmapQ :: (forall d. Data d => d -> u) -> Tag -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Tag -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Tag -> m Tag #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Tag -> m Tag #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Tag -> m Tag #

Data URI 
Instance details

Defined in Network.URI

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> URI -> c URI #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c URI #

toConstr :: URI -> Constr #

dataTypeOf :: URI -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c URI) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c URI) #

gmapT :: (forall b. Data b => b -> b) -> URI -> URI #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> URI -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> URI -> r #

gmapQ :: (forall d. Data d => d -> u) -> URI -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> URI -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> URI -> m URI #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> URI -> m URI #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> URI -> m URI #

Data URIAuth 
Instance details

Defined in Network.URI

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> URIAuth -> c URIAuth #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c URIAuth #

toConstr :: URIAuth -> Constr #

dataTypeOf :: URIAuth -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c URIAuth) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c URIAuth) #

gmapT :: (forall b. Data b => b -> b) -> URIAuth -> URIAuth #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> URIAuth -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> URIAuth -> r #

gmapQ :: (forall d. Data d => d -> u) -> URIAuth -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> URIAuth -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> URIAuth -> m URIAuth #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> URIAuth -> m URIAuth #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> URIAuth -> m URIAuth #

Data SHA256 
Instance details

Defined in Pantry.SHA256

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SHA256 -> c SHA256 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SHA256 #

toConstr :: SHA256 -> Constr #

dataTypeOf :: SHA256 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SHA256) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SHA256) #

gmapT :: (forall b. Data b => b -> b) -> SHA256 -> SHA256 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SHA256 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SHA256 -> r #

gmapQ :: (forall d. Data d => d -> u) -> SHA256 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SHA256 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SHA256 -> m SHA256 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA256 -> m SHA256 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA256 -> m SHA256 #

Data Revision 
Instance details

Defined in Pantry.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Revision -> c Revision #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Revision #

toConstr :: Revision -> Constr #

dataTypeOf :: Revision -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Revision) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Revision) #

gmapT :: (forall b. Data b => b -> b) -> Revision -> Revision #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Revision -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Revision -> r #

gmapQ :: (forall d. Data d => d -> u) -> Revision -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Revision -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Revision -> m Revision #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Revision -> m Revision #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Revision -> m Revision #

Data Abs 
Instance details

Defined in Path.Posix

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Abs -> c Abs #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Abs #

toConstr :: Abs -> Constr #

dataTypeOf :: Abs -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Abs) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Abs) #

gmapT :: (forall b. Data b => b -> b) -> Abs -> Abs #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Abs -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Abs -> r #

gmapQ :: (forall d. Data d => d -> u) -> Abs -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Abs -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Abs -> m Abs #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Abs -> m Abs #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Abs -> m Abs #

Data Dir 
Instance details

Defined in Path.Posix

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Dir -> c Dir #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Dir #

toConstr :: Dir -> Constr #

dataTypeOf :: Dir -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Dir) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Dir) #

gmapT :: (forall b. Data b => b -> b) -> Dir -> Dir #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Dir -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Dir -> r #

gmapQ :: (forall d. Data d => d -> u) -> Dir -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Dir -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Dir -> m Dir #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Dir -> m Dir #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Dir -> m Dir #

Data File 
Instance details

Defined in Path.Posix

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> File -> c File #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c File #

toConstr :: File -> Constr #

dataTypeOf :: File -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c File) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c File) #

gmapT :: (forall b. Data b => b -> b) -> File -> File #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> File -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> File -> r #

gmapQ :: (forall d. Data d => d -> u) -> File -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> File -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> File -> m File #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> File -> m File #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> File -> m File #

Data Rel 
Instance details

Defined in Path.Posix

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Rel -> c Rel #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Rel #

toConstr :: Rel -> Constr #

dataTypeOf :: Rel -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Rel) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Rel) #

gmapT :: (forall b. Data b => b -> b) -> Rel -> Rel #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Rel -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Rel -> r #

gmapQ :: (forall d. Data d => d -> u) -> Rel -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Rel -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Rel -> m Rel #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Rel -> m Rel #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Rel -> m Rel #

Data Abs 
Instance details

Defined in Path.Windows

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Abs -> c Abs #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Abs #

toConstr :: Abs -> Constr #

dataTypeOf :: Abs -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Abs) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Abs) #

gmapT :: (forall b. Data b => b -> b) -> Abs -> Abs #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Abs -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Abs -> r #

gmapQ :: (forall d. Data d => d -> u) -> Abs -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Abs -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Abs -> m Abs #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Abs -> m Abs #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Abs -> m Abs #

Data Dir 
Instance details

Defined in Path.Windows

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Dir -> c Dir #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Dir #

toConstr :: Dir -> Constr #

dataTypeOf :: Dir -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Dir) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Dir) #

gmapT :: (forall b. Data b => b -> b) -> Dir -> Dir #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Dir -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Dir -> r #

gmapQ :: (forall d. Data d => d -> u) -> Dir -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Dir -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Dir -> m Dir #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Dir -> m Dir #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Dir -> m Dir #

Data File 
Instance details

Defined in Path.Windows

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> File -> c File #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c File #

toConstr :: File -> Constr #

dataTypeOf :: File -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c File) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c File) #

gmapT :: (forall b. Data b => b -> b) -> File -> File #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> File -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> File -> r #

gmapQ :: (forall d. Data d => d -> u) -> File -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> File -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> File -> m File #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> File -> m File #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> File -> m File #

Data Rel 
Instance details

Defined in Path.Windows

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Rel -> c Rel #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Rel #

toConstr :: Rel -> Constr #

dataTypeOf :: Rel -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Rel) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Rel) #

gmapT :: (forall b. Data b => b -> b) -> Rel -> Rel #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Rel -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Rel -> r #

gmapQ :: (forall d. Data d => d -> u) -> Rel -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Rel -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Rel -> m Rel #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Rel -> m Rel #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Rel -> m Rel #

Data Scientific 
Instance details

Defined in Data.Scientific

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Scientific -> c Scientific #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Scientific #

toConstr :: Scientific -> Constr #

dataTypeOf :: Scientific -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Scientific) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Scientific) #

gmapT :: (forall b. Data b => b -> b) -> Scientific -> Scientific #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Scientific -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Scientific -> r #

gmapQ :: (forall d. Data d => d -> u) -> Scientific -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Scientific -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Scientific -> m Scientific #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Scientific -> m Scientific #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Scientific -> m Scientific #

Data CachePkgSrc Source # 
Instance details

Defined in Stack.Types.Build

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CachePkgSrc -> c CachePkgSrc #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CachePkgSrc #

toConstr :: CachePkgSrc -> Constr #

dataTypeOf :: CachePkgSrc -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CachePkgSrc) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CachePkgSrc) #

gmapT :: (forall b. Data b => b -> b) -> CachePkgSrc -> CachePkgSrc #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CachePkgSrc -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CachePkgSrc -> r #

gmapQ :: (forall d. Data d => d -> u) -> CachePkgSrc -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CachePkgSrc -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CachePkgSrc -> m CachePkgSrc #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CachePkgSrc -> m CachePkgSrc #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CachePkgSrc -> m CachePkgSrc #

Data ConfigCache Source # 
Instance details

Defined in Stack.Types.Build

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ConfigCache -> c ConfigCache #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ConfigCache #

toConstr :: ConfigCache -> Constr #

dataTypeOf :: ConfigCache -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ConfigCache) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ConfigCache) #

gmapT :: (forall b. Data b => b -> b) -> ConfigCache -> ConfigCache #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ConfigCache -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ConfigCache -> r #

gmapQ :: (forall d. Data d => d -> u) -> ConfigCache -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ConfigCache -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ConfigCache -> m ConfigCache #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ConfigCache -> m ConfigCache #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ConfigCache -> m ConfigCache #

Data ActualCompiler Source # 
Instance details

Defined in Stack.Types.Compiler

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ActualCompiler -> c ActualCompiler #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ActualCompiler #

toConstr :: ActualCompiler -> Constr #

dataTypeOf :: ActualCompiler -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ActualCompiler) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ActualCompiler) #

gmapT :: (forall b. Data b => b -> b) -> ActualCompiler -> ActualCompiler #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ActualCompiler -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ActualCompiler -> r #

gmapQ :: (forall d. Data d => d -> u) -> ActualCompiler -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ActualCompiler -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ActualCompiler -> m ActualCompiler #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ActualCompiler -> m ActualCompiler #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ActualCompiler -> m ActualCompiler #

Data StackUnqualCompName Source # 
Instance details

Defined in Stack.Types.ComponentUtils

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> StackUnqualCompName -> c StackUnqualCompName #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c StackUnqualCompName #

toConstr :: StackUnqualCompName -> Constr #

dataTypeOf :: StackUnqualCompName -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c StackUnqualCompName) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c StackUnqualCompName) #

gmapT :: (forall b. Data b => b -> b) -> StackUnqualCompName -> StackUnqualCompName #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> StackUnqualCompName -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> StackUnqualCompName -> r #

gmapQ :: (forall d. Data d => d -> u) -> StackUnqualCompName -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> StackUnqualCompName -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> StackUnqualCompName -> m StackUnqualCompName #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> StackUnqualCompName -> m StackUnqualCompName #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> StackUnqualCompName -> m StackUnqualCompName #

Data ConfigureOpts Source # 
Instance details

Defined in Stack.Types.ConfigureOpts

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ConfigureOpts -> c ConfigureOpts #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ConfigureOpts #

toConstr :: ConfigureOpts -> Constr #

dataTypeOf :: ConfigureOpts -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ConfigureOpts) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ConfigureOpts) #

gmapT :: (forall b. Data b => b -> b) -> ConfigureOpts -> ConfigureOpts #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ConfigureOpts -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ConfigureOpts -> r #

gmapQ :: (forall d. Data d => d -> u) -> ConfigureOpts -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ConfigureOpts -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ConfigureOpts -> m ConfigureOpts #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ConfigureOpts -> m ConfigureOpts #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ConfigureOpts -> m ConfigureOpts #

Data GhcPkgId Source # 
Instance details

Defined in Stack.Types.GhcPkgId

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GhcPkgId -> c GhcPkgId #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c GhcPkgId #

toConstr :: GhcPkgId -> Constr #

dataTypeOf :: GhcPkgId -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c GhcPkgId) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c GhcPkgId) #

gmapT :: (forall b. Data b => b -> b) -> GhcPkgId -> GhcPkgId #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GhcPkgId -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GhcPkgId -> r #

gmapQ :: (forall d. Data d => d -> u) -> GhcPkgId -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GhcPkgId -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GhcPkgId -> m GhcPkgId #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GhcPkgId -> m GhcPkgId #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GhcPkgId -> m GhcPkgId #

Data ExeName Source # 
Instance details

Defined in Stack.Types.Package

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ExeName -> c ExeName #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ExeName #

toConstr :: ExeName -> Constr #

dataTypeOf :: ExeName -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ExeName) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ExeName) #

gmapT :: (forall b. Data b => b -> b) -> ExeName -> ExeName #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ExeName -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ExeName -> r #

gmapQ :: (forall d. Data d => d -> u) -> ExeName -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ExeName -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ExeName -> m ExeName #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ExeName -> m ExeName #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ExeName -> m ExeName #

Data Bytes128 
Instance details

Defined in Data.StaticBytes

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Bytes128 -> c Bytes128 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Bytes128 #

toConstr :: Bytes128 -> Constr #

dataTypeOf :: Bytes128 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Bytes128) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Bytes128) #

gmapT :: (forall b. Data b => b -> b) -> Bytes128 -> Bytes128 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Bytes128 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Bytes128 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Bytes128 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Bytes128 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Bytes128 -> m Bytes128 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Bytes128 -> m Bytes128 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Bytes128 -> m Bytes128 #

Data Bytes16 
Instance details

Defined in Data.StaticBytes

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Bytes16 -> c Bytes16 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Bytes16 #

toConstr :: Bytes16 -> Constr #

dataTypeOf :: Bytes16 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Bytes16) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Bytes16) #

gmapT :: (forall b. Data b => b -> b) -> Bytes16 -> Bytes16 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Bytes16 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Bytes16 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Bytes16 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Bytes16 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Bytes16 -> m Bytes16 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Bytes16 -> m Bytes16 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Bytes16 -> m Bytes16 #

Data Bytes32 
Instance details

Defined in Data.StaticBytes

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Bytes32 -> c Bytes32 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Bytes32 #

toConstr :: Bytes32 -> Constr #

dataTypeOf :: Bytes32 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Bytes32) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Bytes32) #

gmapT :: (forall b. Data b => b -> b) -> Bytes32 -> Bytes32 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Bytes32 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Bytes32 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Bytes32 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Bytes32 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Bytes32 -> m Bytes32 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Bytes32 -> m Bytes32 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Bytes32 -> m Bytes32 #

Data Bytes64 
Instance details

Defined in Data.StaticBytes

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Bytes64 -> c Bytes64 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Bytes64 #

toConstr :: Bytes64 -> Constr #

dataTypeOf :: Bytes64 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Bytes64) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Bytes64) #

gmapT :: (forall b. Data b => b -> b) -> Bytes64 -> Bytes64 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Bytes64 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Bytes64 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Bytes64 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Bytes64 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Bytes64 -> m Bytes64 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Bytes64 -> m Bytes64 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Bytes64 -> m Bytes64 #

Data Bytes8 
Instance details

Defined in Data.StaticBytes

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Bytes8 -> c Bytes8 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Bytes8 #

toConstr :: Bytes8 -> Constr #

dataTypeOf :: Bytes8 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Bytes8) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Bytes8) #

gmapT :: (forall b. Data b => b -> b) -> Bytes8 -> Bytes8 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Bytes8 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Bytes8 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Bytes8 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Bytes8 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Bytes8 -> m Bytes8 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Bytes8 -> m Bytes8 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Bytes8 -> m Bytes8 #

Data AnnLookup 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AnnLookup -> c AnnLookup #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AnnLookup #

toConstr :: AnnLookup -> Constr #

dataTypeOf :: AnnLookup -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AnnLookup) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AnnLookup) #

gmapT :: (forall b. Data b => b -> b) -> AnnLookup -> AnnLookup #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AnnLookup -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AnnLookup -> r #

gmapQ :: (forall d. Data d => d -> u) -> AnnLookup -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AnnLookup -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AnnLookup -> m AnnLookup #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnLookup -> m AnnLookup #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnLookup -> m AnnLookup #

Data AnnTarget 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AnnTarget -> c AnnTarget #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AnnTarget #

toConstr :: AnnTarget -> Constr #

dataTypeOf :: AnnTarget -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AnnTarget) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AnnTarget) #

gmapT :: (forall b. Data b => b -> b) -> AnnTarget -> AnnTarget #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AnnTarget -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AnnTarget -> r #

gmapQ :: (forall d. Data d => d -> u) -> AnnTarget -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AnnTarget -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AnnTarget -> m AnnTarget #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnTarget -> m AnnTarget #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnTarget -> m AnnTarget #

Data Bang 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Bang -> c Bang #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Bang #

toConstr :: Bang -> Constr #

dataTypeOf :: Bang -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Bang) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Bang) #

gmapT :: (forall b. Data b => b -> b) -> Bang -> Bang #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Bang -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Bang -> r #

gmapQ :: (forall d. Data d => d -> u) -> Bang -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Bang -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Bang -> m Bang #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Bang -> m Bang #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Bang -> m Bang #

Data BndrVis 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BndrVis -> c BndrVis #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BndrVis #

toConstr :: BndrVis -> Constr #

dataTypeOf :: BndrVis -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BndrVis) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BndrVis) #

gmapT :: (forall b. Data b => b -> b) -> BndrVis -> BndrVis #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BndrVis -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BndrVis -> r #

gmapQ :: (forall d. Data d => d -> u) -> BndrVis -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BndrVis -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BndrVis -> m BndrVis #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BndrVis -> m BndrVis #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BndrVis -> m BndrVis #

Data Body 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Body -> c Body #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Body #

toConstr :: Body -> Constr #

dataTypeOf :: Body -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Body) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Body) #

gmapT :: (forall b. Data b => b -> b) -> Body -> Body #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Body -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Body -> r #

gmapQ :: (forall d. Data d => d -> u) -> Body -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Body -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Body -> m Body #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Body -> m Body #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Body -> m Body #

Data Bytes 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Bytes -> c Bytes #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Bytes #

toConstr :: Bytes -> Constr #

dataTypeOf :: Bytes -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Bytes) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Bytes) #

gmapT :: (forall b. Data b => b -> b) -> Bytes -> Bytes #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Bytes -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Bytes -> r #

gmapQ :: (forall d. Data d => d -> u) -> Bytes -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Bytes -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Bytes -> m Bytes #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Bytes -> m Bytes #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Bytes -> m Bytes #

Data Callconv 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Callconv -> c Callconv #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Callconv #

toConstr :: Callconv -> Constr #

dataTypeOf :: Callconv -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Callconv) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Callconv) #

gmapT :: (forall b. Data b => b -> b) -> Callconv -> Callconv #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Callconv -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Callconv -> r #

gmapQ :: (forall d. Data d => d -> u) -> Callconv -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Callconv -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Callconv -> m Callconv #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Callconv -> m Callconv #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Callconv -> m Callconv #

Data Clause 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Clause -> c Clause #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Clause #

toConstr :: Clause -> Constr #

dataTypeOf :: Clause -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Clause) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Clause) #

gmapT :: (forall b. Data b => b -> b) -> Clause -> Clause #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Clause -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Clause -> r #

gmapQ :: (forall d. Data d => d -> u) -> Clause -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Clause -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Clause -> m Clause #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Clause -> m Clause #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Clause -> m Clause #

Data Con 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Con -> c Con #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Con #

toConstr :: Con -> Constr #

dataTypeOf :: Con -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Con) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Con) #

gmapT :: (forall b. Data b => b -> b) -> Con -> Con #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Con -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Con -> r #

gmapQ :: (forall d. Data d => d -> u) -> Con -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Con -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Con -> m Con #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Con -> m Con #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Con -> m Con #

Data Dec 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Dec -> c Dec #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Dec #

toConstr :: Dec -> Constr #

dataTypeOf :: Dec -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Dec) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Dec) #

gmapT :: (forall b. Data b => b -> b) -> Dec -> Dec #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Dec -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Dec -> r #

gmapQ :: (forall d. Data d => d -> u) -> Dec -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Dec -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Dec -> m Dec #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Dec -> m Dec #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Dec -> m Dec #

Data DecidedStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DecidedStrictness -> c DecidedStrictness #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DecidedStrictness #

toConstr :: DecidedStrictness -> Constr #

dataTypeOf :: DecidedStrictness -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DecidedStrictness) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DecidedStrictness) #

gmapT :: (forall b. Data b => b -> b) -> DecidedStrictness -> DecidedStrictness #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DecidedStrictness -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DecidedStrictness -> r #

gmapQ :: (forall d. Data d => d -> u) -> DecidedStrictness -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DecidedStrictness -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DecidedStrictness -> m DecidedStrictness #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DecidedStrictness -> m DecidedStrictness #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DecidedStrictness -> m DecidedStrictness #

Data DerivClause 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DerivClause -> c DerivClause #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DerivClause #

toConstr :: DerivClause -> Constr #

dataTypeOf :: DerivClause -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DerivClause) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DerivClause) #

gmapT :: (forall b. Data b => b -> b) -> DerivClause -> DerivClause #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DerivClause -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DerivClause -> r #

gmapQ :: (forall d. Data d => d -> u) -> DerivClause -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DerivClause -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DerivClause -> m DerivClause #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DerivClause -> m DerivClause #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DerivClause -> m DerivClause #

Data DerivStrategy 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DerivStrategy -> c DerivStrategy #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DerivStrategy #

toConstr :: DerivStrategy -> Constr #

dataTypeOf :: DerivStrategy -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DerivStrategy) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DerivStrategy) #

gmapT :: (forall b. Data b => b -> b) -> DerivStrategy -> DerivStrategy #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DerivStrategy -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DerivStrategy -> r #

gmapQ :: (forall d. Data d => d -> u) -> DerivStrategy -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DerivStrategy -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DerivStrategy -> m DerivStrategy #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DerivStrategy -> m DerivStrategy #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DerivStrategy -> m DerivStrategy #

Data DocLoc 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DocLoc -> c DocLoc #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DocLoc #

toConstr :: DocLoc -> Constr #

dataTypeOf :: DocLoc -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DocLoc) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DocLoc) #

gmapT :: (forall b. Data b => b -> b) -> DocLoc -> DocLoc #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DocLoc -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DocLoc -> r #

gmapQ :: (forall d. Data d => d -> u) -> DocLoc -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DocLoc -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DocLoc -> m DocLoc #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DocLoc -> m DocLoc #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DocLoc -> m DocLoc #

Data Exp 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Exp -> c Exp #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Exp #

toConstr :: Exp -> Constr #

dataTypeOf :: Exp -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Exp) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Exp) #

gmapT :: (forall b. Data b => b -> b) -> Exp -> Exp #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Exp -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Exp -> r #

gmapQ :: (forall d. Data d => d -> u) -> Exp -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Exp -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Exp -> m Exp #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Exp -> m Exp #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Exp -> m Exp #

Data FamilyResultSig 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FamilyResultSig -> c FamilyResultSig #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FamilyResultSig #

toConstr :: FamilyResultSig -> Constr #

dataTypeOf :: FamilyResultSig -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c FamilyResultSig) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FamilyResultSig) #

gmapT :: (forall b. Data b => b -> b) -> FamilyResultSig -> FamilyResultSig #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FamilyResultSig -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FamilyResultSig -> r #

gmapQ :: (forall d. Data d => d -> u) -> FamilyResultSig -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FamilyResultSig -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FamilyResultSig -> m FamilyResultSig #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FamilyResultSig -> m FamilyResultSig #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FamilyResultSig -> m FamilyResultSig #

Data Fixity 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Fixity -> c Fixity #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Fixity #

toConstr :: Fixity -> Constr #

dataTypeOf :: Fixity -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Fixity) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Fixity) #

gmapT :: (forall b. Data b => b -> b) -> Fixity -> Fixity #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Fixity -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Fixity -> r #

gmapQ :: (forall d. Data d => d -> u) -> Fixity -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Fixity -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Fixity -> m Fixity #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Fixity -> m Fixity #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Fixity -> m Fixity #

Data FixityDirection 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FixityDirection -> c FixityDirection #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FixityDirection #

toConstr :: FixityDirection -> Constr #

dataTypeOf :: FixityDirection -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c FixityDirection) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FixityDirection) #

gmapT :: (forall b. Data b => b -> b) -> FixityDirection -> FixityDirection #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FixityDirection -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FixityDirection -> r #

gmapQ :: (forall d. Data d => d -> u) -> FixityDirection -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FixityDirection -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FixityDirection -> m FixityDirection #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FixityDirection -> m FixityDirection #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FixityDirection -> m FixityDirection #

Data Foreign 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Foreign -> c Foreign #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Foreign #

toConstr :: Foreign -> Constr #

dataTypeOf :: Foreign -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Foreign) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Foreign) #

gmapT :: (forall b. Data b => b -> b) -> Foreign -> Foreign #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Foreign -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Foreign -> r #

gmapQ :: (forall d. Data d => d -> u) -> Foreign -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Foreign -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Foreign -> m Foreign #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Foreign -> m Foreign #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Foreign -> m Foreign #

Data FunDep 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FunDep -> c FunDep #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FunDep #

toConstr :: FunDep -> Constr #

dataTypeOf :: FunDep -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c FunDep) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FunDep) #

gmapT :: (forall b. Data b => b -> b) -> FunDep -> FunDep #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FunDep -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FunDep -> r #

gmapQ :: (forall d. Data d => d -> u) -> FunDep -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FunDep -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FunDep -> m FunDep #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FunDep -> m FunDep #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FunDep -> m FunDep #

Data Guard 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Guard -> c Guard #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Guard #

toConstr :: Guard -> Constr #

dataTypeOf :: Guard -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Guard) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Guard) #

gmapT :: (forall b. Data b => b -> b) -> Guard -> Guard #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Guard -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Guard -> r #

gmapQ :: (forall d. Data d => d -> u) -> Guard -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Guard -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Guard -> m Guard #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Guard -> m Guard #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Guard -> m Guard #

Data Info 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Info -> c Info #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Info #

toConstr :: Info -> Constr #

dataTypeOf :: Info -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Info) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Info) #

gmapT :: (forall b. Data b => b -> b) -> Info -> Info #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Info -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Info -> r #

gmapQ :: (forall d. Data d => d -> u) -> Info -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Info -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Info -> m Info #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Info -> m Info #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Info -> m Info #

Data InjectivityAnn 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> InjectivityAnn -> c InjectivityAnn #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c InjectivityAnn #

toConstr :: InjectivityAnn -> Constr #

dataTypeOf :: InjectivityAnn -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c InjectivityAnn) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c InjectivityAnn) #

gmapT :: (forall b. Data b => b -> b) -> InjectivityAnn -> InjectivityAnn #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> InjectivityAnn -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> InjectivityAnn -> r #

gmapQ :: (forall d. Data d => d -> u) -> InjectivityAnn -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> InjectivityAnn -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> InjectivityAnn -> m InjectivityAnn #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> InjectivityAnn -> m InjectivityAnn #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> InjectivityAnn -> m InjectivityAnn #

Data Inline 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Inline -> c Inline #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Inline #

toConstr :: Inline -> Constr #

dataTypeOf :: Inline -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Inline) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Inline) #

gmapT :: (forall b. Data b => b -> b) -> Inline -> Inline #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Inline -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Inline -> r #

gmapQ :: (forall d. Data d => d -> u) -> Inline -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Inline -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Inline -> m Inline #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Inline -> m Inline #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Inline -> m Inline #

Data Lit 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Lit -> c Lit #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Lit #

toConstr :: Lit -> Constr #

dataTypeOf :: Lit -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Lit) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Lit) #

gmapT :: (forall b. Data b => b -> b) -> Lit -> Lit #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Lit -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Lit -> r #

gmapQ :: (forall d. Data d => d -> u) -> Lit -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Lit -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Lit -> m Lit #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Lit -> m Lit #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Lit -> m Lit #

Data Loc 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Loc -> c Loc #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Loc #

toConstr :: Loc -> Constr #

dataTypeOf :: Loc -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Loc) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Loc) #

gmapT :: (forall b. Data b => b -> b) -> Loc -> Loc #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Loc -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Loc -> r #

gmapQ :: (forall d. Data d => d -> u) -> Loc -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Loc -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Loc -> m Loc #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Loc -> m Loc #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Loc -> m Loc #

Data Match 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Match -> c Match #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Match #

toConstr :: Match -> Constr #

dataTypeOf :: Match -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Match) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Match) #

gmapT :: (forall b. Data b => b -> b) -> Match -> Match #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Match -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Match -> r #

gmapQ :: (forall d. Data d => d -> u) -> Match -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Match -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Match -> m Match #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Match -> m Match #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Match -> m Match #

Data ModName 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ModName -> c ModName #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ModName #

toConstr :: ModName -> Constr #

dataTypeOf :: ModName -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ModName) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ModName) #

gmapT :: (forall b. Data b => b -> b) -> ModName -> ModName #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ModName -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ModName -> r #

gmapQ :: (forall d. Data d => d -> u) -> ModName -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ModName -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ModName -> m ModName #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ModName -> m ModName #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ModName -> m ModName #

Data Module 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Module -> c Module #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Module #

toConstr :: Module -> Constr #

dataTypeOf :: Module -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Module) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Module) #

gmapT :: (forall b. Data b => b -> b) -> Module -> Module #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Module -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Module -> r #

gmapQ :: (forall d. Data d => d -> u) -> Module -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Module -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Module -> m Module #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Module -> m Module #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Module -> m Module #

Data ModuleInfo 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ModuleInfo -> c ModuleInfo #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ModuleInfo #

toConstr :: ModuleInfo -> Constr #

dataTypeOf :: ModuleInfo -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ModuleInfo) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ModuleInfo) #

gmapT :: (forall b. Data b => b -> b) -> ModuleInfo -> ModuleInfo #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ModuleInfo -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ModuleInfo -> r #

gmapQ :: (forall d. Data d => d -> u) -> ModuleInfo -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ModuleInfo -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ModuleInfo -> m ModuleInfo #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ModuleInfo -> m ModuleInfo #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ModuleInfo -> m ModuleInfo #

Data Name 
Instance details

Defined in Language.Haskell.TH.Syntax

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 #

Data NameFlavour 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NameFlavour -> c NameFlavour #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NameFlavour #

toConstr :: NameFlavour -> Constr #

dataTypeOf :: NameFlavour -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NameFlavour) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NameFlavour) #

gmapT :: (forall b. Data b => b -> b) -> NameFlavour -> NameFlavour #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NameFlavour -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NameFlavour -> r #

gmapQ :: (forall d. Data d => d -> u) -> NameFlavour -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> NameFlavour -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NameFlavour -> m NameFlavour #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NameFlavour -> m NameFlavour #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NameFlavour -> m NameFlavour #

Data NameSpace 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NameSpace -> c NameSpace #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NameSpace #

toConstr :: NameSpace -> Constr #

dataTypeOf :: NameSpace -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NameSpace) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NameSpace) #

gmapT :: (forall b. Data b => b -> b) -> NameSpace -> NameSpace #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NameSpace -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NameSpace -> r #

gmapQ :: (forall d. Data d => d -> u) -> NameSpace -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> NameSpace -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NameSpace -> m NameSpace #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NameSpace -> m NameSpace #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NameSpace -> m NameSpace #

Data OccName 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OccName -> c OccName #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OccName #

toConstr :: OccName -> Constr #

dataTypeOf :: OccName -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OccName) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OccName) #

gmapT :: (forall b. Data b => b -> b) -> OccName -> OccName #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OccName -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OccName -> r #

gmapQ :: (forall d. Data d => d -> u) -> OccName -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OccName -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OccName -> m OccName #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OccName -> m OccName #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OccName -> m OccName #

Data Overlap 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Overlap -> c Overlap #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Overlap #

toConstr :: Overlap -> Constr #

dataTypeOf :: Overlap -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Overlap) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Overlap) #

gmapT :: (forall b. Data b => b -> b) -> Overlap -> Overlap #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Overlap -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Overlap -> r #

gmapQ :: (forall d. Data d => d -> u) -> Overlap -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Overlap -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Overlap -> m Overlap #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Overlap -> m Overlap #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Overlap -> m Overlap #

Data Pat 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Pat -> c Pat #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Pat #

toConstr :: Pat -> Constr #

dataTypeOf :: Pat -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Pat) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Pat) #

gmapT :: (forall b. Data b => b -> b) -> Pat -> Pat #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Pat -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Pat -> r #

gmapQ :: (forall d. Data d => d -> u) -> Pat -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Pat -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Pat -> m Pat #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Pat -> m Pat #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Pat -> m Pat #

Data PatSynArgs 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PatSynArgs -> c PatSynArgs #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PatSynArgs #

toConstr :: PatSynArgs -> Constr #

dataTypeOf :: PatSynArgs -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PatSynArgs) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PatSynArgs) #

gmapT :: (forall b. Data b => b -> b) -> PatSynArgs -> PatSynArgs #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PatSynArgs -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PatSynArgs -> r #

gmapQ :: (forall d. Data d => d -> u) -> PatSynArgs -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PatSynArgs -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PatSynArgs -> m PatSynArgs #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PatSynArgs -> m PatSynArgs #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PatSynArgs -> m PatSynArgs #

Data PatSynDir 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PatSynDir -> c PatSynDir #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PatSynDir #

toConstr :: PatSynDir -> Constr #

dataTypeOf :: PatSynDir -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PatSynDir) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PatSynDir) #

gmapT :: (forall b. Data b => b -> b) -> PatSynDir -> PatSynDir #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PatSynDir -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PatSynDir -> r #

gmapQ :: (forall d. Data d => d -> u) -> PatSynDir -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PatSynDir -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PatSynDir -> m PatSynDir #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PatSynDir -> m PatSynDir #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PatSynDir -> m PatSynDir #

Data Phases 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Phases -> c Phases #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Phases #

toConstr :: Phases -> Constr #

dataTypeOf :: Phases -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Phases) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Phases) #

gmapT :: (forall b. Data b => b -> b) -> Phases -> Phases #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Phases -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Phases -> r #

gmapQ :: (forall d. Data d => d -> u) -> Phases -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Phases -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Phases -> m Phases #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Phases -> m Phases #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Phases -> m Phases #

Data PkgName 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PkgName -> c PkgName #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PkgName #

toConstr :: PkgName -> Constr #

dataTypeOf :: PkgName -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PkgName) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PkgName) #

gmapT :: (forall b. Data b => b -> b) -> PkgName -> PkgName #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PkgName -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PkgName -> r #

gmapQ :: (forall d. Data d => d -> u) -> PkgName -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PkgName -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PkgName -> m PkgName #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PkgName -> m PkgName #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PkgName -> m PkgName #

Data Pragma 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Pragma -> c Pragma #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Pragma #

toConstr :: Pragma -> Constr #

dataTypeOf :: Pragma -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Pragma) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Pragma) #

gmapT :: (forall b. Data b => b -> b) -> Pragma -> Pragma #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Pragma -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Pragma -> r #

gmapQ :: (forall d. Data d => d -> u) -> Pragma -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Pragma -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Pragma -> m Pragma #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Pragma -> m Pragma #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Pragma -> m Pragma #

Data Range 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Range -> c Range #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Range #

toConstr :: Range -> Constr #

dataTypeOf :: Range -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Range) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Range) #

gmapT :: (forall b. Data b => b -> b) -> Range -> Range #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Range -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Range -> r #

gmapQ :: (forall d. Data d => d -> u) -> Range -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Range -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Range -> m Range #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Range -> m Range #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Range -> m Range #

Data Role 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Role -> c Role #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Role #

toConstr :: Role -> Constr #

dataTypeOf :: Role -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Role) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Role) #

gmapT :: (forall b. Data b => b -> b) -> Role -> Role #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Role -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Role -> r #

gmapQ :: (forall d. Data d => d -> u) -> Role -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Role -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Role -> m Role #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Role -> m Role #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Role -> m Role #

Data RuleBndr 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RuleBndr -> c RuleBndr #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RuleBndr #

toConstr :: RuleBndr -> Constr #

dataTypeOf :: RuleBndr -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RuleBndr) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RuleBndr) #

gmapT :: (forall b. Data b => b -> b) -> RuleBndr -> RuleBndr #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RuleBndr -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RuleBndr -> r #

gmapQ :: (forall d. Data d => d -> u) -> RuleBndr -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> RuleBndr -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RuleBndr -> m RuleBndr #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RuleBndr -> m RuleBndr #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RuleBndr -> m RuleBndr #

Data RuleMatch 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RuleMatch -> c RuleMatch #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RuleMatch #

toConstr :: RuleMatch -> Constr #

dataTypeOf :: RuleMatch -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RuleMatch) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RuleMatch) #

gmapT :: (forall b. Data b => b -> b) -> RuleMatch -> RuleMatch #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RuleMatch -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RuleMatch -> r #

gmapQ :: (forall d. Data d => d -> u) -> RuleMatch -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> RuleMatch -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RuleMatch -> m RuleMatch #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RuleMatch -> m RuleMatch #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RuleMatch -> m RuleMatch #

Data Safety 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Safety -> c Safety #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Safety #

toConstr :: Safety -> Constr #

dataTypeOf :: Safety -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Safety) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Safety) #

gmapT :: (forall b. Data b => b -> b) -> Safety -> Safety #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Safety -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Safety -> r #

gmapQ :: (forall d. Data d => d -> u) -> Safety -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Safety -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Safety -> m Safety #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Safety -> m Safety #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Safety -> m Safety #

Data SourceStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SourceStrictness -> c SourceStrictness #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SourceStrictness #

toConstr :: SourceStrictness -> Constr #

dataTypeOf :: SourceStrictness -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SourceStrictness) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SourceStrictness) #

gmapT :: (forall b. Data b => b -> b) -> SourceStrictness -> SourceStrictness #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SourceStrictness -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SourceStrictness -> r #

gmapQ :: (forall d. Data d => d -> u) -> SourceStrictness -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SourceStrictness -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SourceStrictness -> m SourceStrictness #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SourceStrictness -> m SourceStrictness #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SourceStrictness -> m SourceStrictness #

Data SourceUnpackedness 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SourceUnpackedness -> c SourceUnpackedness #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SourceUnpackedness #

toConstr :: SourceUnpackedness -> Constr #

dataTypeOf :: SourceUnpackedness -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SourceUnpackedness) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SourceUnpackedness) #

gmapT :: (forall b. Data b => b -> b) -> SourceUnpackedness -> SourceUnpackedness #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SourceUnpackedness -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SourceUnpackedness -> r #

gmapQ :: (forall d. Data d => d -> u) -> SourceUnpackedness -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SourceUnpackedness -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SourceUnpackedness -> m SourceUnpackedness #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SourceUnpackedness -> m SourceUnpackedness #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SourceUnpackedness -> m SourceUnpackedness #

Data Specificity 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Specificity -> c Specificity #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Specificity #

toConstr :: Specificity -> Constr #

dataTypeOf :: Specificity -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Specificity) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Specificity) #

gmapT :: (forall b. Data b => b -> b) -> Specificity -> Specificity #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Specificity -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Specificity -> r #

gmapQ :: (forall d. Data d => d -> u) -> Specificity -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Specificity -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Specificity -> m Specificity #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Specificity -> m Specificity #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Specificity -> m Specificity #

Data Stmt 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Stmt -> c Stmt #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Stmt #

toConstr :: Stmt -> Constr #

dataTypeOf :: Stmt -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Stmt) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Stmt) #

gmapT :: (forall b. Data b => b -> b) -> Stmt -> Stmt #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Stmt -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Stmt -> r #

gmapQ :: (forall d. Data d => d -> u) -> Stmt -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Stmt -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Stmt -> m Stmt #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Stmt -> m Stmt #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Stmt -> m Stmt #

Data TyLit 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TyLit -> c TyLit #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TyLit #

toConstr :: TyLit -> Constr #

dataTypeOf :: TyLit -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TyLit) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TyLit) #

gmapT :: (forall b. Data b => b -> b) -> TyLit -> TyLit #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TyLit -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TyLit -> r #

gmapQ :: (forall d. Data d => d -> u) -> TyLit -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TyLit -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TyLit -> m TyLit #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TyLit -> m TyLit #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TyLit -> m TyLit #

Data TySynEqn 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TySynEqn -> c TySynEqn #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TySynEqn #

toConstr :: TySynEqn -> Constr #

dataTypeOf :: TySynEqn -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TySynEqn) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TySynEqn) #

gmapT :: (forall b. Data b => b -> b) -> TySynEqn -> TySynEqn #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TySynEqn -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TySynEqn -> r #

gmapQ :: (forall d. Data d => d -> u) -> TySynEqn -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TySynEqn -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TySynEqn -> m TySynEqn #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TySynEqn -> m TySynEqn #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TySynEqn -> m TySynEqn #

Data Type 
Instance details

Defined in Language.Haskell.TH.Syntax

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 #

Data TypeFamilyHead 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TypeFamilyHead -> c TypeFamilyHead #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TypeFamilyHead #

toConstr :: TypeFamilyHead -> Constr #

dataTypeOf :: TypeFamilyHead -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TypeFamilyHead) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TypeFamilyHead) #

gmapT :: (forall b. Data b => b -> b) -> TypeFamilyHead -> TypeFamilyHead #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TypeFamilyHead -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TypeFamilyHead -> r #

gmapQ :: (forall d. Data d => d -> u) -> TypeFamilyHead -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TypeFamilyHead -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TypeFamilyHead -> m TypeFamilyHead #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TypeFamilyHead -> m TypeFamilyHead #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TypeFamilyHead -> m TypeFamilyHead #

Data ShortText 
Instance details

Defined in Data.Text.Short.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ShortText -> c ShortText #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ShortText #

toConstr :: ShortText -> Constr #

dataTypeOf :: ShortText -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ShortText) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ShortText) #

gmapT :: (forall b. Data b => b -> b) -> ShortText -> ShortText #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ShortText -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ShortText -> r #

gmapQ :: (forall d. Data d => d -> u) -> ShortText -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ShortText -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ShortText -> m ShortText #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ShortText -> m ShortText #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ShortText -> m ShortText #

Data ConstructorInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ConstructorInfo -> c ConstructorInfo #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ConstructorInfo #

toConstr :: ConstructorInfo -> Constr #

dataTypeOf :: ConstructorInfo -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ConstructorInfo) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ConstructorInfo) #

gmapT :: (forall b. Data b => b -> b) -> ConstructorInfo -> ConstructorInfo #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ConstructorInfo -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ConstructorInfo -> r #

gmapQ :: (forall d. Data d => d -> u) -> ConstructorInfo -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ConstructorInfo -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ConstructorInfo -> m ConstructorInfo #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ConstructorInfo -> m ConstructorInfo #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ConstructorInfo -> m ConstructorInfo #

Data ConstructorVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ConstructorVariant -> c ConstructorVariant #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ConstructorVariant #

toConstr :: ConstructorVariant -> Constr #

dataTypeOf :: ConstructorVariant -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ConstructorVariant) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ConstructorVariant) #

gmapT :: (forall b. Data b => b -> b) -> ConstructorVariant -> ConstructorVariant #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ConstructorVariant -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ConstructorVariant -> r #

gmapQ :: (forall d. Data d => d -> u) -> ConstructorVariant -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ConstructorVariant -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ConstructorVariant -> m ConstructorVariant #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ConstructorVariant -> m ConstructorVariant #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ConstructorVariant -> m ConstructorVariant #

Data DatatypeInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DatatypeInfo -> c DatatypeInfo #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DatatypeInfo #

toConstr :: DatatypeInfo -> Constr #

dataTypeOf :: DatatypeInfo -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DatatypeInfo) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DatatypeInfo) #

gmapT :: (forall b. Data b => b -> b) -> DatatypeInfo -> DatatypeInfo #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DatatypeInfo -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DatatypeInfo -> r #

gmapQ :: (forall d. Data d => d -> u) -> DatatypeInfo -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DatatypeInfo -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DatatypeInfo -> m DatatypeInfo #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DatatypeInfo -> m DatatypeInfo #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DatatypeInfo -> m DatatypeInfo #

Data DatatypeVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DatatypeVariant -> c DatatypeVariant #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DatatypeVariant #

toConstr :: DatatypeVariant -> Constr #

dataTypeOf :: DatatypeVariant -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DatatypeVariant) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DatatypeVariant) #

gmapT :: (forall b. Data b => b -> b) -> DatatypeVariant -> DatatypeVariant #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DatatypeVariant -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DatatypeVariant -> r #

gmapQ :: (forall d. Data d => d -> u) -> DatatypeVariant -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DatatypeVariant -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DatatypeVariant -> m DatatypeVariant #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DatatypeVariant -> m DatatypeVariant #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DatatypeVariant -> m DatatypeVariant #

Data FieldStrictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FieldStrictness -> c FieldStrictness #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FieldStrictness #

toConstr :: FieldStrictness -> Constr #

dataTypeOf :: FieldStrictness -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c FieldStrictness) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FieldStrictness) #

gmapT :: (forall b. Data b => b -> b) -> FieldStrictness -> FieldStrictness #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FieldStrictness -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FieldStrictness -> r #

gmapQ :: (forall d. Data d => d -> u) -> FieldStrictness -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FieldStrictness -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FieldStrictness -> m FieldStrictness #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FieldStrictness -> m FieldStrictness #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FieldStrictness -> m FieldStrictness #

Data Strictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Strictness -> c Strictness #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Strictness #

toConstr :: Strictness -> Constr #

dataTypeOf :: Strictness -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Strictness) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Strictness) #

gmapT :: (forall b. Data b => b -> b) -> Strictness -> Strictness #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Strictness -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Strictness -> r #

gmapQ :: (forall d. Data d => d -> u) -> Strictness -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Strictness -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Strictness -> m Strictness #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Strictness -> m Strictness #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Strictness -> m Strictness #

Data Unpackedness 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Unpackedness -> c Unpackedness #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Unpackedness #

toConstr :: Unpackedness -> Constr #

dataTypeOf :: Unpackedness -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Unpackedness) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Unpackedness) #

gmapT :: (forall b. Data b => b -> b) -> Unpackedness -> Unpackedness #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Unpackedness -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Unpackedness -> r #

gmapQ :: (forall d. Data d => d -> u) -> Unpackedness -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Unpackedness -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Unpackedness -> m Unpackedness #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Unpackedness -> m Unpackedness #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Unpackedness -> m Unpackedness #

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 #

Data Month 
Instance details

Defined in Data.Time.Calendar.Month

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Month -> c Month #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Month #

toConstr :: Month -> Constr #

dataTypeOf :: Month -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Month) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Month) #

gmapT :: (forall b. Data b => b -> b) -> Month -> Month #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Month -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Month -> r #

gmapQ :: (forall d. Data d => d -> u) -> Month -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Month -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Month -> m Month #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Month -> m Month #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Month -> m Month #

Data Quarter 
Instance details

Defined in Data.Time.Calendar.Quarter

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Quarter -> c Quarter #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Quarter #

toConstr :: Quarter -> Constr #

dataTypeOf :: Quarter -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Quarter) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Quarter) #

gmapT :: (forall b. Data b => b -> b) -> Quarter -> Quarter #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Quarter -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Quarter -> r #

gmapQ :: (forall d. Data d => d -> u) -> Quarter -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Quarter -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Quarter -> m Quarter #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Quarter -> m Quarter #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Quarter -> m Quarter #

Data QuarterOfYear 
Instance details

Defined in Data.Time.Calendar.Quarter

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> QuarterOfYear -> c QuarterOfYear #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c QuarterOfYear #

toConstr :: QuarterOfYear -> Constr #

dataTypeOf :: QuarterOfYear -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c QuarterOfYear) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c QuarterOfYear) #

gmapT :: (forall b. Data b => b -> b) -> QuarterOfYear -> QuarterOfYear #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> QuarterOfYear -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> QuarterOfYear -> r #

gmapQ :: (forall d. Data d => d -> u) -> QuarterOfYear -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> QuarterOfYear -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> QuarterOfYear -> m QuarterOfYear #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> QuarterOfYear -> m QuarterOfYear #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> QuarterOfYear -> m QuarterOfYear #

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 #

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 #

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 #

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 #

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 #

Data UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UUID -> c UUID #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UUID #

toConstr :: UUID -> Constr #

dataTypeOf :: UUID -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UUID) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UUID) #

gmapT :: (forall b. Data b => b -> b) -> UUID -> UUID #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UUID -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UUID -> r #

gmapQ :: (forall d. Data d => d -> u) -> UUID -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UUID -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UUID -> m UUID #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UUID -> m UUID #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UUID -> m UUID #

Data Integer 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Integer -> c Integer #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Integer #

toConstr :: Integer -> Constr #

dataTypeOf :: Integer -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Integer) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Integer) #

gmapT :: (forall b. Data b => b -> b) -> Integer -> Integer #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Integer -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Integer -> r #

gmapQ :: (forall d. Data d => d -> u) -> Integer -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Integer -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Integer -> m Integer #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Integer -> m Integer #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Integer -> m Integer #

Data Natural 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Natural -> c Natural #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Natural #

toConstr :: Natural -> Constr #

dataTypeOf :: Natural -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Natural) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Natural) #

gmapT :: (forall b. Data b => b -> b) -> Natural -> Natural #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Natural -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Natural -> r #

gmapQ :: (forall d. Data d => d -> u) -> Natural -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Natural -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Natural -> m Natural #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Natural -> m Natural #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Natural -> m Natural #

Data () 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> () -> c () #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c () #

toConstr :: () -> Constr #

dataTypeOf :: () -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ()) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ()) #

gmapT :: (forall b. Data b => b -> b) -> () -> () #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> () -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> () -> r #

gmapQ :: (forall d. Data d => d -> u) -> () -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> () -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> () -> m () #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> () -> m () #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> () -> m () #

Data Bool 
Instance details

Defined in 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 #

Data Char 
Instance details

Defined in 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 #

Data Double 
Instance details

Defined in 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 #

Data Float 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Float -> c Float #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Float #

toConstr :: Float -> Constr #

dataTypeOf :: Float -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Float) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Float) #

gmapT :: (forall b. Data b => b -> b) -> Float -> Float #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Float -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Float -> r #

gmapQ :: (forall d. Data d => d -> u) -> Float -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Float -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Float -> m Float #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Float -> m Float #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Float -> m Float #

Data Int 
Instance details

Defined in 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 #

Data Word 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Word -> c Word #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Word #

toConstr :: Word -> Constr #

dataTypeOf :: Word -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Word) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Word) #

gmapT :: (forall b. Data b => b -> b) -> Word -> Word #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Word -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Word -> r #

gmapQ :: (forall d. Data d => d -> u) -> Word -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Word -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Word -> m Word #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Word -> m Word #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Word -> m Word #

(Data a, Ord a) => Data (NonEmptySet a) 
Instance details

Defined in Distribution.Compat.NonEmptySet

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NonEmptySet a -> c (NonEmptySet a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (NonEmptySet a) #

toConstr :: NonEmptySet a -> Constr #

dataTypeOf :: NonEmptySet a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (NonEmptySet a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (NonEmptySet a)) #

gmapT :: (forall b. Data b => b -> b) -> NonEmptySet a -> NonEmptySet a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NonEmptySet a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NonEmptySet a -> r #

gmapQ :: (forall d. Data d => d -> u) -> NonEmptySet a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> NonEmptySet a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NonEmptySet a -> m (NonEmptySet a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NonEmptySet a -> m (NonEmptySet a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NonEmptySet a -> m (NonEmptySet a) #

Data v => Data (PerCompilerFlavor v) 
Instance details

Defined in Distribution.Compiler

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PerCompilerFlavor v -> c (PerCompilerFlavor v) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (PerCompilerFlavor v) #

toConstr :: PerCompilerFlavor v -> Constr #

dataTypeOf :: PerCompilerFlavor v -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (PerCompilerFlavor v)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (PerCompilerFlavor v)) #

gmapT :: (forall b. Data b => b -> b) -> PerCompilerFlavor v -> PerCompilerFlavor v #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PerCompilerFlavor v -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PerCompilerFlavor v -> r #

gmapQ :: (forall d. Data d => d -> u) -> PerCompilerFlavor v -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PerCompilerFlavor v -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PerCompilerFlavor v -> m (PerCompilerFlavor v) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PerCompilerFlavor v -> m (PerCompilerFlavor v) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PerCompilerFlavor v -> m (PerCompilerFlavor v) #

Data c => Data (Condition c) 
Instance details

Defined in Distribution.Types.Condition

Methods

gfoldl :: (forall d b. Data d => c0 (d -> b) -> d -> c0 b) -> (forall g. g -> c0 g) -> Condition c -> c0 (Condition c) #

gunfold :: (forall b r. Data b => c0 (b -> r) -> c0 r) -> (forall r. r -> c0 r) -> Constr -> c0 (Condition c) #

toConstr :: Condition c -> Constr #

dataTypeOf :: Condition c -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c0 (t d)) -> Maybe (c0 (Condition c)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c0 (t d e)) -> Maybe (c0 (Condition c)) #

gmapT :: (forall b. Data b => b -> b) -> Condition c -> Condition c #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Condition c -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Condition c -> r #

gmapQ :: (forall d. Data d => d -> u) -> Condition c -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Condition c -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Condition c -> m (Condition c) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Condition c -> m (Condition c) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Condition c -> m (Condition c) #

Data a => Data (VersionRangeF a) 
Instance details

Defined in Distribution.Types.VersionRange.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> VersionRangeF a -> c (VersionRangeF a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (VersionRangeF a) #

toConstr :: VersionRangeF a -> Constr #

dataTypeOf :: VersionRangeF a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (VersionRangeF a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (VersionRangeF a)) #

gmapT :: (forall b. Data b => b -> b) -> VersionRangeF a -> VersionRangeF a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> VersionRangeF a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> VersionRangeF a -> r #

gmapQ :: (forall d. Data d => d -> u) -> VersionRangeF a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> VersionRangeF a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> VersionRangeF a -> m (VersionRangeF a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> VersionRangeF a -> m (VersionRangeF a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> VersionRangeF a -> m (VersionRangeF a) #

Data v => Data (KeyMap v) 
Instance details

Defined in Data.Aeson.KeyMap

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> KeyMap v -> c (KeyMap v) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (KeyMap v) #

toConstr :: KeyMap v -> Constr #

dataTypeOf :: KeyMap v -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (KeyMap v)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (KeyMap v)) #

gmapT :: (forall b. Data b => b -> b) -> KeyMap v -> KeyMap v #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> KeyMap v -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> KeyMap v -> r #

gmapQ :: (forall d. Data d => d -> u) -> KeyMap v -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> KeyMap v -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> KeyMap v -> m (KeyMap v) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> KeyMap v -> m (KeyMap v) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> KeyMap v -> m (KeyMap v) #

Data a => Data (ZipList a) 
Instance details

Defined in Data.Data

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) #

Typeable s => Data (MutableByteArray s) 
Instance details

Defined in Data.Array.Byte

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> MutableByteArray s -> c (MutableByteArray s) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (MutableByteArray s) #

toConstr :: MutableByteArray s -> Constr #

dataTypeOf :: MutableByteArray s -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (MutableByteArray s)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (MutableByteArray s)) #

gmapT :: (forall b. Data b => b -> b) -> MutableByteArray s -> MutableByteArray s #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> MutableByteArray s -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> MutableByteArray s -> r #

gmapQ :: (forall d. Data d => d -> u) -> MutableByteArray s -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> MutableByteArray s -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> MutableByteArray s -> m (MutableByteArray s) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> MutableByteArray s -> m (MutableByteArray s) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> MutableByteArray s -> m (MutableByteArray s) #

Data a => Data (Complex a) 
Instance details

Defined in Data.Complex

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Complex a -> c (Complex a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Complex a) #

toConstr :: Complex a -> Constr #

dataTypeOf :: Complex a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Complex a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Complex a)) #

gmapT :: (forall b. Data b => b -> b) -> Complex a -> Complex a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Complex a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Complex a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Complex a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Complex a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Complex a -> m (Complex a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Complex a -> m (Complex a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Complex a -> m (Complex a) #

Data a => Data (Identity a) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Identity a -> c (Identity a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Identity a) #

toConstr :: Identity a -> Constr #

dataTypeOf :: Identity a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Identity a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Identity a)) #

gmapT :: (forall b. Data b => b -> b) -> Identity a -> Identity a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Identity a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Identity a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Identity a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Identity a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Identity a -> m (Identity a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Identity a -> m (Identity a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Identity a -> m (Identity a) #

Data a => Data (First a) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> First a -> c (First a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (First a) #

toConstr :: First a -> Constr #

dataTypeOf :: First a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (First a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (First a)) #

gmapT :: (forall b. Data b => b -> b) -> First a -> First a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> First a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> First a -> r #

gmapQ :: (forall d. Data d => d -> u) -> First a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> First a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> First a -> m (First a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> First a -> m (First a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> First a -> m (First a) #

Data a => Data (Last a) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Last a -> c (Last a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Last a) #

toConstr :: Last a -> Constr #

dataTypeOf :: Last a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Last a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Last a)) #

gmapT :: (forall b. Data b => b -> b) -> Last a -> Last a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Last a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Last a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Last a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Last a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Last a -> m (Last a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Last a -> m (Last a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Last a -> m (Last a) #

Data a => Data (Down a) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Down a -> c (Down a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Down a) #

toConstr :: Down a -> Constr #

dataTypeOf :: Down a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Down a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Down a)) #

gmapT :: (forall b. Data b => b -> b) -> Down a -> Down a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Down a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Down a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Down a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Down a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Down a -> m (Down a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Down a -> m (Down a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Down a -> m (Down a) #

Data a => Data (First a) 
Instance details

Defined in Data.Semigroup

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> First a -> c (First a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (First a) #

toConstr :: First a -> Constr #

dataTypeOf :: First a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (First a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (First a)) #

gmapT :: (forall b. Data b => b -> b) -> First a -> First a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> First a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> First a -> r #

gmapQ :: (forall d. Data d => d -> u) -> First a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> First a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> First a -> m (First a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> First a -> m (First a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> First a -> m (First a) #

Data a => Data (Last a) 
Instance details

Defined in Data.Semigroup

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Last a -> c (Last a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Last a) #

toConstr :: Last a -> Constr #

dataTypeOf :: Last a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Last a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Last a)) #

gmapT :: (forall b. Data b => b -> b) -> Last a -> Last a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Last a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Last a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Last a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Last a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Last a -> m (Last a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Last a -> m (Last a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Last a -> m (Last a) #

Data a => Data (Max a) 
Instance details

Defined in Data.Semigroup

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Max a -> c (Max a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Max a) #

toConstr :: Max a -> Constr #

dataTypeOf :: Max a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Max a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Max a)) #

gmapT :: (forall b. Data b => b -> b) -> Max a -> Max a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Max a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Max a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Max a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Max a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Max a -> m (Max a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Max a -> m (Max a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Max a -> m (Max a) #

Data a => Data (Min a) 
Instance details

Defined in Data.Semigroup

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Min a -> c (Min a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Min a) #

toConstr :: Min a -> Constr #

dataTypeOf :: Min a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Min a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Min a)) #

gmapT :: (forall b. Data b => b -> b) -> Min a -> Min a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Min a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Min a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Min a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Min a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Min a -> m (Min a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Min a -> m (Min a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Min a -> m (Min a) #

Data m => Data (WrappedMonoid m) 
Instance details

Defined in Data.Semigroup

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> WrappedMonoid m -> c (WrappedMonoid m) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (WrappedMonoid m) #

toConstr :: WrappedMonoid m -> Constr #

dataTypeOf :: WrappedMonoid m -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (WrappedMonoid m)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (WrappedMonoid m)) #

gmapT :: (forall b. Data b => b -> b) -> WrappedMonoid m -> WrappedMonoid m #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WrappedMonoid m -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WrappedMonoid m -> r #

gmapQ :: (forall d. Data d => d -> u) -> WrappedMonoid m -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> WrappedMonoid m -> u #

gmapM :: Monad m0 => (forall d. Data d => d -> m0 d) -> WrappedMonoid m -> m0 (WrappedMonoid m) #

gmapMp :: MonadPlus m0 => (forall d. Data d => d -> m0 d) -> WrappedMonoid m -> m0 (WrappedMonoid m) #

gmapMo :: MonadPlus m0 => (forall d. Data d => d -> m0 d) -> WrappedMonoid m -> m0 (WrappedMonoid m) #

Data a => Data (Dual a) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Dual a -> c (Dual a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Dual a) #

toConstr :: Dual a -> Constr #

dataTypeOf :: Dual a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Dual a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Dual a)) #

gmapT :: (forall b. Data b => b -> b) -> Dual a -> Dual a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Dual a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Dual a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Dual a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Dual a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Dual a -> m (Dual a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Dual a -> m (Dual a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Dual a -> m (Dual a) #

Data a => Data (Product a) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Product a -> c (Product a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Product a) #

toConstr :: Product a -> Constr #

dataTypeOf :: Product a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Product a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Product a)) #

gmapT :: (forall b. Data b => b -> b) -> Product a -> Product a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Product a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Product a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Product a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Product a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Product a -> m (Product a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Product a -> m (Product a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Product a -> m (Product a) #

Data a => Data (Sum a) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Sum a -> c (Sum a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Sum a) #

toConstr :: Sum a -> Constr #

dataTypeOf :: Sum a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Sum a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Sum a)) #

gmapT :: (forall b. Data b => b -> b) -> Sum a -> Sum a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Sum a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Sum a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Sum a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Sum a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Sum a -> m (Sum a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Sum a -> m (Sum a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Sum a -> m (Sum a) #

Data a => Data (ConstPtr a) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ConstPtr a -> c (ConstPtr a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ConstPtr a) #

toConstr :: ConstPtr a -> Constr #

dataTypeOf :: ConstPtr a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (ConstPtr a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ConstPtr a)) #

gmapT :: (forall b. Data b => b -> b) -> ConstPtr a -> ConstPtr a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ConstPtr a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ConstPtr a -> r #

gmapQ :: (forall d. Data d => d -> u) -> ConstPtr a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ConstPtr a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ConstPtr a -> m (ConstPtr a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ConstPtr a -> m (ConstPtr a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ConstPtr a -> m (ConstPtr a) #

Data a => Data (NonEmpty a) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NonEmpty a -> c (NonEmpty a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (NonEmpty a) #

toConstr :: NonEmpty a -> Constr #

dataTypeOf :: NonEmpty a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (NonEmpty a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (NonEmpty a)) #

gmapT :: (forall b. Data b => b -> b) -> NonEmpty a -> NonEmpty a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NonEmpty a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NonEmpty a -> r #

gmapQ :: (forall d. Data d => d -> u) -> NonEmpty a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> NonEmpty a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NonEmpty a -> m (NonEmpty a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NonEmpty a -> m (NonEmpty a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NonEmpty a -> m (NonEmpty a) #

Data a => Data (ForeignPtr a) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ForeignPtr a -> c (ForeignPtr a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ForeignPtr a) #

toConstr :: ForeignPtr a -> Constr #

dataTypeOf :: ForeignPtr a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (ForeignPtr a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ForeignPtr a)) #

gmapT :: (forall b. Data b => b -> b) -> ForeignPtr a -> ForeignPtr a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ForeignPtr a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ForeignPtr a -> r #

gmapQ :: (forall d. Data d => d -> u) -> ForeignPtr a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ForeignPtr a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ForeignPtr a -> m (ForeignPtr a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ForeignPtr a -> m (ForeignPtr a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ForeignPtr a -> m (ForeignPtr a) #

Data p => Data (Par1 p) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Par1 p -> c (Par1 p) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Par1 p) #

toConstr :: Par1 p -> Constr #

dataTypeOf :: Par1 p -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Par1 p)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Par1 p)) #

gmapT :: (forall b. Data b => b -> b) -> Par1 p -> Par1 p #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Par1 p -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Par1 p -> r #

gmapQ :: (forall d. Data d => d -> u) -> Par1 p -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Par1 p -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Par1 p -> m (Par1 p) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Par1 p -> m (Par1 p) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Par1 p -> m (Par1 p) #

Data a => Data (Ptr a) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Ptr a -> c (Ptr a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Ptr a) #

toConstr :: Ptr a -> Constr #

dataTypeOf :: Ptr a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Ptr a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Ptr a)) #

gmapT :: (forall b. Data b => b -> b) -> Ptr a -> Ptr a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Ptr a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Ptr a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Ptr a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Ptr a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Ptr a -> m (Ptr a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Ptr a -> m (Ptr a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Ptr a -> m (Ptr a) #

(Data a, Integral a) => Data (Ratio a) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Ratio a -> c (Ratio a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Ratio a) #

toConstr :: Ratio a -> Constr #

dataTypeOf :: Ratio a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Ratio a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Ratio a)) #

gmapT :: (forall b. Data b => b -> b) -> Ratio a -> Ratio a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Ratio a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Ratio a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Ratio a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Ratio a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Ratio a -> m (Ratio a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Ratio a -> m (Ratio a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Ratio a -> m (Ratio a) #

Data ty => Data (Block ty) 
Instance details

Defined in Basement.Block.Base

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Block ty -> c (Block ty) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Block ty) #

toConstr :: Block ty -> Constr #

dataTypeOf :: Block ty -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Block ty)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Block ty)) #

gmapT :: (forall b. Data b => b -> b) -> Block ty -> Block ty #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Block ty -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Block ty -> r #

gmapQ :: (forall d. Data d => d -> u) -> Block ty -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Block ty -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Block ty -> m (Block ty) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Block ty -> m (Block ty) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Block ty -> m (Block ty) #

Data ty => Data (UArray ty) 
Instance details

Defined in Basement.UArray.Base

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UArray ty -> c (UArray ty) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (UArray ty) #

toConstr :: UArray ty -> Constr #

dataTypeOf :: UArray ty -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (UArray ty)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (UArray ty)) #

gmapT :: (forall b. Data b => b -> b) -> UArray ty -> UArray ty #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UArray ty -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UArray ty -> r #

gmapQ :: (forall d. Data d => d -> u) -> UArray ty -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UArray ty -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UArray ty -> m (UArray ty) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UArray ty -> m (UArray ty) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UArray ty -> m (UArray ty) #

Data s => Data (CI s) 
Instance details

Defined in Data.CaseInsensitive.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CI s -> c (CI s) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (CI s) #

toConstr :: CI s -> Constr #

dataTypeOf :: CI s -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (CI s)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (CI s)) #

gmapT :: (forall b. Data b => b -> b) -> CI s -> CI s #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CI s -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CI s -> r #

gmapQ :: (forall d. Data d => d -> u) -> CI s -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CI s -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CI s -> m (CI s) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CI s -> m (CI s) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CI s -> m (CI s) #

Data vertex => Data (SCC vertex) 
Instance details

Defined in Data.Graph

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SCC vertex -> c (SCC vertex) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (SCC vertex) #

toConstr :: SCC vertex -> Constr #

dataTypeOf :: SCC vertex -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (SCC vertex)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (SCC vertex)) #

gmapT :: (forall b. Data b => b -> b) -> SCC vertex -> SCC vertex #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SCC vertex -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SCC vertex -> r #

gmapQ :: (forall d. Data d => d -> u) -> SCC vertex -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SCC vertex -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SCC vertex -> m (SCC vertex) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SCC vertex -> m (SCC vertex) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SCC vertex -> m (SCC vertex) #

Data a => Data (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IntMap a -> c (IntMap a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (IntMap a) #

toConstr :: IntMap a -> Constr #

dataTypeOf :: IntMap a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (IntMap a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (IntMap a)) #

gmapT :: (forall b. Data b => b -> b) -> IntMap a -> IntMap a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IntMap a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IntMap a -> r #

gmapQ :: (forall d. Data d => d -> u) -> IntMap a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IntMap a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IntMap a -> m (IntMap a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IntMap a -> m (IntMap a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IntMap a -> m (IntMap a) #

Data a => Data (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Seq a -> c (Seq a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Seq a) #

toConstr :: Seq a -> Constr #

dataTypeOf :: Seq a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Seq a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Seq a)) #

gmapT :: (forall b. Data b => b -> b) -> Seq a -> Seq a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Seq a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Seq a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Seq a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Seq a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Seq a -> m (Seq a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Seq a -> m (Seq a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Seq a -> m (Seq a) #

Data a => Data (ViewL a) 
Instance details

Defined in Data.Sequence.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ViewL a -> c (ViewL a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ViewL a) #

toConstr :: ViewL a -> Constr #

dataTypeOf :: ViewL a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (ViewL a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ViewL a)) #

gmapT :: (forall b. Data b => b -> b) -> ViewL a -> ViewL a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ViewL a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ViewL a -> r #

gmapQ :: (forall d. Data d => d -> u) -> ViewL a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ViewL a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ViewL a -> m (ViewL a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ViewL a -> m (ViewL a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ViewL a -> m (ViewL a) #

Data a => Data (ViewR a) 
Instance details

Defined in Data.Sequence.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ViewR a -> c (ViewR a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ViewR a) #

toConstr :: ViewR a -> Constr #

dataTypeOf :: ViewR a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (ViewR a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ViewR a)) #

gmapT :: (forall b. Data b => b -> b) -> ViewR a -> ViewR a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ViewR a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ViewR a -> r #

gmapQ :: (forall d. Data d => d -> u) -> ViewR a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ViewR a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ViewR a -> m (ViewR a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ViewR a -> m (ViewR a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ViewR a -> m (ViewR a) #

(Data a, Ord a) => Data (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Set a -> c (Set a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Set a) #

toConstr :: Set a -> Constr #

dataTypeOf :: Set a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Set a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Set a)) #

gmapT :: (forall b. Data b => b -> b) -> Set a -> Set a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Set a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Set a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Set a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Set a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Set a -> m (Set a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Set a -> m (Set a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Set a -> m (Set a) #

Data a => Data (Tree a) 
Instance details

Defined in Data.Tree

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Tree a -> c (Tree a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Tree a) #

toConstr :: Tree a -> Constr #

dataTypeOf :: Tree a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Tree a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Tree a)) #

gmapT :: (forall b. Data b => b -> b) -> Tree a -> Tree a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Tree a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Tree a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Tree a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Tree a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Tree a -> m (Tree a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Tree a -> m (Tree a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Tree a -> m (Tree a) #

KnownNat bitlen => Data (Blake2b bitlen) 
Instance details

Defined in Crypto.Hash.Blake2

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Blake2b bitlen -> c (Blake2b bitlen) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Blake2b bitlen) #

toConstr :: Blake2b bitlen -> Constr #

dataTypeOf :: Blake2b bitlen -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Blake2b bitlen)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Blake2b bitlen)) #

gmapT :: (forall b. Data b => b -> b) -> Blake2b bitlen -> Blake2b bitlen #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Blake2b bitlen -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Blake2b bitlen -> r #

gmapQ :: (forall d. Data d => d -> u) -> Blake2b bitlen -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Blake2b bitlen -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Blake2b bitlen -> m (Blake2b bitlen) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2b bitlen -> m (Blake2b bitlen) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2b bitlen -> m (Blake2b bitlen) #

KnownNat bitlen => Data (Blake2bp bitlen) 
Instance details

Defined in Crypto.Hash.Blake2

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Blake2bp bitlen -> c (Blake2bp bitlen) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Blake2bp bitlen) #

toConstr :: Blake2bp bitlen -> Constr #

dataTypeOf :: Blake2bp bitlen -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Blake2bp bitlen)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Blake2bp bitlen)) #

gmapT :: (forall b. Data b => b -> b) -> Blake2bp bitlen -> Blake2bp bitlen #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Blake2bp bitlen -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Blake2bp bitlen -> r #

gmapQ :: (forall d. Data d => d -> u) -> Blake2bp bitlen -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Blake2bp bitlen -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Blake2bp bitlen -> m (Blake2bp bitlen) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2bp bitlen -> m (Blake2bp bitlen) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2bp bitlen -> m (Blake2bp bitlen) #

KnownNat bitlen => Data (Blake2s bitlen) 
Instance details

Defined in Crypto.Hash.Blake2

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Blake2s bitlen -> c (Blake2s bitlen) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Blake2s bitlen) #

toConstr :: Blake2s bitlen -> Constr #

dataTypeOf :: Blake2s bitlen -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Blake2s bitlen)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Blake2s bitlen)) #

gmapT :: (forall b. Data b => b -> b) -> Blake2s bitlen -> Blake2s bitlen #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Blake2s bitlen -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Blake2s bitlen -> r #

gmapQ :: (forall d. Data d => d -> u) -> Blake2s bitlen -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Blake2s bitlen -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Blake2s bitlen -> m (Blake2s bitlen) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2s bitlen -> m (Blake2s bitlen) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2s bitlen -> m (Blake2s bitlen) #

KnownNat bitlen => Data (Blake2sp bitlen) 
Instance details

Defined in Crypto.Hash.Blake2

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Blake2sp bitlen -> c (Blake2sp bitlen) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Blake2sp bitlen) #

toConstr :: Blake2sp bitlen -> Constr #

dataTypeOf :: Blake2sp bitlen -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Blake2sp bitlen)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Blake2sp bitlen)) #

gmapT :: (forall b. Data b => b -> b) -> Blake2sp bitlen -> Blake2sp bitlen #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Blake2sp bitlen -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Blake2sp bitlen -> r #

gmapQ :: (forall d. Data d => d -> u) -> Blake2sp bitlen -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Blake2sp bitlen -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Blake2sp bitlen -> m (Blake2sp bitlen) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2sp bitlen -> m (Blake2sp bitlen) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Blake2sp bitlen -> m (Blake2sp bitlen) #

KnownNat bitlen => Data (SHAKE128 bitlen) 
Instance details

Defined in Crypto.Hash.SHAKE

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SHAKE128 bitlen -> c (SHAKE128 bitlen) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (SHAKE128 bitlen) #

toConstr :: SHAKE128 bitlen -> Constr #

dataTypeOf :: SHAKE128 bitlen -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (SHAKE128 bitlen)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (SHAKE128 bitlen)) #

gmapT :: (forall b. Data b => b -> b) -> SHAKE128 bitlen -> SHAKE128 bitlen #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SHAKE128 bitlen -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SHAKE128 bitlen -> r #

gmapQ :: (forall d. Data d => d -> u) -> SHAKE128 bitlen -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SHAKE128 bitlen -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SHAKE128 bitlen -> m (SHAKE128 bitlen) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SHAKE128 bitlen -> m (SHAKE128 bitlen) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SHAKE128 bitlen -> m (SHAKE128 bitlen) #

KnownNat bitlen => Data (SHAKE256 bitlen) 
Instance details

Defined in Crypto.Hash.SHAKE

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SHAKE256 bitlen -> c (SHAKE256 bitlen) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (SHAKE256 bitlen) #

toConstr :: SHAKE256 bitlen -> Constr #

dataTypeOf :: SHAKE256 bitlen -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (SHAKE256 bitlen)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (SHAKE256 bitlen)) #

gmapT :: (forall b. Data b => b -> b) -> SHAKE256 bitlen -> SHAKE256 bitlen #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SHAKE256 bitlen -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SHAKE256 bitlen -> r #

gmapQ :: (forall d. Data d => d -> u) -> SHAKE256 bitlen -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SHAKE256 bitlen -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SHAKE256 bitlen -> m (SHAKE256 bitlen) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SHAKE256 bitlen -> m (SHAKE256 bitlen) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SHAKE256 bitlen -> m (SHAKE256 bitlen) #

Data a => Data (Digest a) 
Instance details

Defined in Crypto.Hash.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Digest a -> c (Digest a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Digest a) #

toConstr :: Digest a -> Constr #

dataTypeOf :: Digest a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Digest a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Digest a)) #

gmapT :: (forall b. Data b => b -> b) -> Digest a -> Digest a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Digest a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Digest a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Digest a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Digest a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Digest a -> m (Digest a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Digest a -> m (Digest a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Digest a -> m (Digest a) #

(Typeable f, Data (f (Fix f))) => Data (Fix f) 
Instance details

Defined in Data.Fix

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Fix f -> c (Fix f) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Fix f) #

toConstr :: Fix f -> Constr #

dataTypeOf :: Fix f -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Fix f)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Fix f)) #

gmapT :: (forall b. Data b => b -> b) -> Fix f -> Fix f #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Fix f -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Fix f -> r #

gmapQ :: (forall d. Data d => d -> u) -> Fix f -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Fix f -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Fix f -> m (Fix f) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Fix f -> m (Fix f) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Fix f -> m (Fix f) #

Data a => Data (LenientData a) 
Instance details

Defined in Web.Internal.HttpApiData

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LenientData a -> c (LenientData a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (LenientData a) #

toConstr :: LenientData a -> Constr #

dataTypeOf :: LenientData a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (LenientData a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (LenientData a)) #

gmapT :: (forall b. Data b => b -> b) -> LenientData a -> LenientData a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LenientData a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LenientData a -> r #

gmapQ :: (forall d. Data d => d -> u) -> LenientData a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> LenientData a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> LenientData a -> m (LenientData a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LenientData a -> m (LenientData a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LenientData a -> m (LenientData a) #

Data a => Data (AddrRange a) 
Instance details

Defined in Data.IP.Range

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AddrRange a -> c (AddrRange a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (AddrRange a) #

toConstr :: AddrRange a -> Constr #

dataTypeOf :: AddrRange a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (AddrRange a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (AddrRange a)) #

gmapT :: (forall b. Data b => b -> b) -> AddrRange a -> AddrRange a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AddrRange a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AddrRange a -> r #

gmapQ :: (forall d. Data d => d -> u) -> AddrRange a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AddrRange a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AddrRange a -> m (AddrRange a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AddrRange a -> m (AddrRange a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AddrRange a -> m (AddrRange a) #

Data mono => Data (NonNull mono) 
Instance details

Defined in Data.NonNull

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NonNull mono -> c (NonNull mono) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (NonNull mono) #

toConstr :: NonNull mono -> Constr #

dataTypeOf :: NonNull mono -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (NonNull mono)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (NonNull mono)) #

gmapT :: (forall b. Data b => b -> b) -> NonNull mono -> NonNull mono #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NonNull mono -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NonNull mono -> r #

gmapQ :: (forall d. Data d => d -> u) -> NonNull mono -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> NonNull mono -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NonNull mono -> m (NonNull mono) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NonNull mono -> m (NonNull mono) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NonNull mono -> m (NonNull mono) #

Data a => Data (Array a) 
Instance details

Defined in Data.Primitive.Array

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Array a -> c (Array a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Array a) #

toConstr :: Array a -> Constr #

dataTypeOf :: Array a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Array a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Array a)) #

gmapT :: (forall b. Data b => b -> b) -> Array a -> Array a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Array a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Array a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Array a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Array a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Array a -> m (Array a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Array a -> m (Array a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Array a -> m (Array a) #

Data a => Data (SmallArray a) 
Instance details

Defined in Data.Primitive.SmallArray

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SmallArray a -> c (SmallArray a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (SmallArray a) #

toConstr :: SmallArray a -> Constr #

dataTypeOf :: SmallArray a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (SmallArray a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (SmallArray a)) #

gmapT :: (forall b. Data b => b -> b) -> SmallArray a -> SmallArray a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SmallArray a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SmallArray a -> r #

gmapQ :: (forall d. Data d => d -> u) -> SmallArray a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SmallArray a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SmallArray a -> m (SmallArray a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SmallArray a -> m (SmallArray a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SmallArray a -> m (SmallArray a) #

Data a => Data (Maybe a) 
Instance details

Defined in Data.Strict.Maybe

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) #

Data flag => Data (TyVarBndr flag) 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TyVarBndr flag -> c (TyVarBndr flag) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (TyVarBndr flag) #

toConstr :: TyVarBndr flag -> Constr #

dataTypeOf :: TyVarBndr flag -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (TyVarBndr flag)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (TyVarBndr flag)) #

gmapT :: (forall b. Data b => b -> b) -> TyVarBndr flag -> TyVarBndr flag #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TyVarBndr flag -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TyVarBndr flag -> r #

gmapQ :: (forall d. Data d => d -> u) -> TyVarBndr flag -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TyVarBndr flag -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TyVarBndr flag -> m (TyVarBndr flag) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TyVarBndr flag -> m (TyVarBndr flag) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TyVarBndr flag -> m (TyVarBndr flag) #

(Data a, Eq a, Hashable a) => Data (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> HashSet a -> c (HashSet a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (HashSet a) #

toConstr :: HashSet a -> Constr #

dataTypeOf :: HashSet a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (HashSet a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (HashSet a)) #

gmapT :: (forall b. Data b => b -> b) -> HashSet a -> HashSet a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HashSet a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HashSet a -> r #

gmapQ :: (forall d. Data d => d -> u) -> HashSet a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> HashSet a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> HashSet a -> m (HashSet a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HashSet a -> m (HashSet a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HashSet a -> m (HashSet a) #

Data a => Data (Vector a) 
Instance details

Defined in Data.Vector

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Vector a -> c (Vector a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Vector a) #

toConstr :: Vector a -> Constr #

dataTypeOf :: Vector a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Vector a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Vector a)) #

gmapT :: (forall b. Data b => b -> b) -> Vector a -> Vector a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Vector a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Vector a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Vector a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Vector a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Vector a -> m (Vector a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Vector a -> m (Vector a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Vector a -> m (Vector a) #

(Data a, Prim a) => Data (Vector a) 
Instance details

Defined in Data.Vector.Primitive

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Vector a -> c (Vector a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Vector a) #

toConstr :: Vector a -> Constr #

dataTypeOf :: Vector a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Vector a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Vector a)) #

gmapT :: (forall b. Data b => b -> b) -> Vector a -> Vector a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Vector a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Vector a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Vector a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Vector a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Vector a -> m (Vector a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Vector a -> m (Vector a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Vector a -> m (Vector a) #

(Data a, Storable a) => Data (Vector a) 
Instance details

Defined in Data.Vector.Storable

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Vector a -> c (Vector a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Vector a) #

toConstr :: Vector a -> Constr #

dataTypeOf :: Vector a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Vector a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Vector a)) #

gmapT :: (forall b. Data b => b -> b) -> Vector a -> Vector a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Vector a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Vector a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Vector a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Vector a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Vector a -> m (Vector a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Vector a -> m (Vector a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Vector a -> m (Vector a) #

Data a => Data (Vector a) 
Instance details

Defined in Data.Vector.Strict

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Vector a -> c (Vector a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Vector a) #

toConstr :: Vector a -> Constr #

dataTypeOf :: Vector a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Vector a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Vector a)) #

gmapT :: (forall b. Data b => b -> b) -> Vector a -> Vector a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Vector a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Vector a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Vector a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Vector a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Vector a -> m (Vector a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Vector a -> m (Vector a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Vector a -> m (Vector a) #

(Data a, Unbox a) => Data (Vector a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Vector a -> c (Vector a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Vector a) #

toConstr :: Vector a -> Constr #

dataTypeOf :: Vector a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Vector a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Vector a)) #

gmapT :: (forall b. Data b => b -> b) -> Vector a -> Vector a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Vector a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Vector a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Vector a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Vector a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Vector a -> m (Vector a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Vector a -> m (Vector a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Vector a -> m (Vector a) #

Data a => Data (Maybe a) 
Instance details

Defined in 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) #

Data a => Data (Solo a) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Solo a -> c (Solo a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Solo a) #

toConstr :: Solo a -> Constr #

dataTypeOf :: Solo a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Solo a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Solo a)) #

gmapT :: (forall b. Data b => b -> b) -> Solo a -> Solo a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Solo a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Solo a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Solo a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Solo a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Solo a -> m (Solo a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Solo a -> m (Solo a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Solo a -> m (Solo a) #

Data a => Data [a] 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> [a] -> c [a] #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c [a] #

toConstr :: [a] -> Constr #

dataTypeOf :: [a] -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c [a]) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c [a]) #

gmapT :: (forall b. Data b => b -> b) -> [a] -> [a] #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> [a] -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> [a] -> r #

gmapQ :: (forall d. Data d => d -> u) -> [a] -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> [a] -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> [a] -> m [a] #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> [a] -> m [a] #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> [a] -> m [a] #

(Data from, Data to) => Data (SymbolicPath from to) 
Instance details

Defined in Distribution.Utils.Path

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SymbolicPath from to -> c (SymbolicPath from to) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (SymbolicPath from to) #

toConstr :: SymbolicPath from to -> Constr #

dataTypeOf :: SymbolicPath from to -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (SymbolicPath from to)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (SymbolicPath from to)) #

gmapT :: (forall b. Data b => b -> b) -> SymbolicPath from to -> SymbolicPath from to #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SymbolicPath from to -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SymbolicPath from to -> r #

gmapQ :: (forall d. Data d => d -> u) -> SymbolicPath from to -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SymbolicPath from to -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SymbolicPath from to -> m (SymbolicPath from to) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SymbolicPath from to -> m (SymbolicPath from to) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SymbolicPath from to -> m (SymbolicPath from to) #

(Typeable m, Typeable a, Data (m a)) => Data (WrappedMonad m a) 
Instance details

Defined in Data.Data

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) #

(Data a, Data b) => Data (Either a b) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> Either a b -> c (Either a b) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Either a b) #

toConstr :: Either a b -> Constr #

dataTypeOf :: Either a b -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Either a b)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Either a b)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> Either a b -> Either a b #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Either a b -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Either a b -> r #

gmapQ :: (forall d. Data d => d -> u) -> Either a b -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Either a b -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Either a b -> m (Either a b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Either a b -> m (Either a b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Either a b -> m (Either a b) #

(Typeable k, Typeable a) => Data (Fixed a) 
Instance details

Defined in Data.Fixed

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Fixed a -> c (Fixed a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Fixed a) #

toConstr :: Fixed a -> Constr #

dataTypeOf :: Fixed a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Fixed a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Fixed a)) #

gmapT :: (forall b. Data b => b -> b) -> Fixed a -> Fixed a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Fixed a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Fixed a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Fixed a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Fixed a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Fixed a -> m (Fixed a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Fixed a -> m (Fixed a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Fixed a -> m (Fixed a) #

Data t => Data (Proxy t) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Proxy t -> c (Proxy t) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Proxy t) #

toConstr :: Proxy t -> Constr #

dataTypeOf :: Proxy t -> DataType #

dataCast1 :: Typeable t0 => (forall d. Data d => c (t0 d)) -> Maybe (c (Proxy t)) #

dataCast2 :: Typeable t0 => (forall d e. (Data d, Data e) => c (t0 d e)) -> Maybe (c (Proxy t)) #

gmapT :: (forall b. Data b => b -> b) -> Proxy t -> Proxy t #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Proxy t -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Proxy t -> r #

gmapQ :: (forall d. Data d => d -> u) -> Proxy t -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Proxy t -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Proxy t -> m (Proxy t) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Proxy t -> m (Proxy t) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Proxy t -> m (Proxy t) #

(Data a, Data b) => Data (Arg a b) 
Instance details

Defined in Data.Semigroup

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> Arg a b -> c (Arg a b) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Arg a b) #

toConstr :: Arg a b -> Constr #

dataTypeOf :: Arg a b -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Arg a b)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Arg a b)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> Arg a b -> Arg a b #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Arg a b -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Arg a b -> r #

gmapQ :: (forall d. Data d => d -> u) -> Arg a b -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Arg a b -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Arg a b -> m (Arg a b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Arg a b -> m (Arg a b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Arg a b -> m (Arg a b) #

(Data a, Data b, Ix a) => Data (Array a b) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> Array a b -> c (Array a b) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Array a b) #

toConstr :: Array a b -> Constr #

dataTypeOf :: Array a b -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Array a b)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Array a b)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> Array a b -> Array a b #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Array a b -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Array a b -> r #

gmapQ :: (forall d. Data d => d -> u) -> Array a b -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Array a b -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Array a b -> m (Array a b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Array a b -> m (Array a b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Array a b -> m (Array a b) #

Data p => Data (U1 p) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> U1 p -> c (U1 p) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (U1 p) #

toConstr :: U1 p -> Constr #

dataTypeOf :: U1 p -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (U1 p)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (U1 p)) #

gmapT :: (forall b. Data b => b -> b) -> U1 p -> U1 p #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> U1 p -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> U1 p -> r #

gmapQ :: (forall d. Data d => d -> u) -> U1 p -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> U1 p -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> U1 p -> m (U1 p) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> U1 p -> m (U1 p) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> U1 p -> m (U1 p) #

Data p => Data (V1 p) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> V1 p -> c (V1 p) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (V1 p) #

toConstr :: V1 p -> Constr #

dataTypeOf :: V1 p -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (V1 p)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (V1 p)) #

gmapT :: (forall b. Data b => b -> b) -> V1 p -> V1 p #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> V1 p -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> V1 p -> r #

gmapQ :: (forall d. Data d => d -> u) -> V1 p -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> V1 p -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> V1 p -> m (V1 p) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> V1 p -> m (V1 p) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> V1 p -> m (V1 p) #

(Data k, Data a, Ord k) => Data (Map k a) 
Instance details

Defined in Data.Map.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Map k a -> c (Map k a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Map k a) #

toConstr :: Map k a -> Constr #

dataTypeOf :: Map k a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Map k a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Map k a)) #

gmapT :: (forall b. Data b => b -> b) -> Map k a -> Map k a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Map k a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Map k a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Map k a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Map k a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Map k a -> m (Map k a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Map k a -> m (Map k a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Map k a -> m (Map k a) #

(Data b, Data t) => Data (Path b t) 
Instance details

Defined in Path.Internal.Posix

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> Path b t -> c (Path b t) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Path b t) #

toConstr :: Path b t -> Constr #

dataTypeOf :: Path b t -> DataType #

dataCast1 :: Typeable t0 => (forall d. Data d => c (t0 d)) -> Maybe (c (Path b t)) #

dataCast2 :: Typeable t0 => (forall d e. (Data d, Data e) => c (t0 d e)) -> Maybe (c (Path b t)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> Path b t -> Path b t #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Path b t -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Path b t -> r #

gmapQ :: (forall d. Data d => d -> u) -> Path b t -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Path b t -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Path b t -> m (Path b t) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Path b t -> m (Path b t) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Path b t -> m (Path b t) #

(Data b, Data t) => Data (Path b t) 
Instance details

Defined in Path.Internal.Windows

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> Path b t -> c (Path b t) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Path b t) #

toConstr :: Path b t -> Constr #

dataTypeOf :: Path b t -> DataType #

dataCast1 :: Typeable t0 => (forall d. Data d => c (t0 d)) -> Maybe (c (Path b t)) #

dataCast2 :: Typeable t0 => (forall d e. (Data d, Data e) => c (t0 d e)) -> Maybe (c (Path b t)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> Path b t -> Path b t #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Path b t -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Path b t -> r #

gmapQ :: (forall d. Data d => d -> u) -> Path b t -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Path b t -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Path b t -> m (Path b t) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Path b t -> m (Path b t) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Path b t -> m (Path b t) #

(Typeable s, Typeable a) => Data (MutableArray s a) 
Instance details

Defined in Data.Primitive.Array

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> MutableArray s a -> c (MutableArray s a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (MutableArray s a) #

toConstr :: MutableArray s a -> Constr #

dataTypeOf :: MutableArray s a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (MutableArray s a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (MutableArray s a)) #

gmapT :: (forall b. Data b => b -> b) -> MutableArray s a -> MutableArray s a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> MutableArray s a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> MutableArray s a -> r #

gmapQ :: (forall d. Data d => d -> u) -> MutableArray s a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> MutableArray s a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> MutableArray s a -> m (MutableArray s a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> MutableArray s a -> m (MutableArray s a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> MutableArray s a -> m (MutableArray s a) #

(Typeable s, Typeable a) => Data (SmallMutableArray s a) 
Instance details

Defined in Data.Primitive.SmallArray

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SmallMutableArray s a -> c (SmallMutableArray s a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (SmallMutableArray s a) #

toConstr :: SmallMutableArray s a -> Constr #

dataTypeOf :: SmallMutableArray s a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (SmallMutableArray s a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (SmallMutableArray s a)) #

gmapT :: (forall b. Data b => b -> b) -> SmallMutableArray s a -> SmallMutableArray s a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SmallMutableArray s a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SmallMutableArray s a -> r #

gmapQ :: (forall d. Data d => d -> u) -> SmallMutableArray s a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SmallMutableArray s a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SmallMutableArray s a -> m (SmallMutableArray s a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SmallMutableArray s a -> m (SmallMutableArray s a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SmallMutableArray s a -> m (SmallMutableArray s a) #

(Data a, Data b) => Data (Either a b) 
Instance details

Defined in Data.Strict.Either

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> Either a b -> c (Either a b) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Either a b) #

toConstr :: Either a b -> Constr #

dataTypeOf :: Either a b -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Either a b)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Either a b)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> Either a b -> Either a b #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Either a b -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Either a b -> r #

gmapQ :: (forall d. Data d => d -> u) -> Either a b -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Either a b -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Either a b -> m (Either a b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Either a b -> m (Either a b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Either a b -> m (Either a b) #

(Data a, Data b) => Data (These a b) 
Instance details

Defined in Data.Strict.These

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> These a b -> c (These a b) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (These a b) #

toConstr :: These a b -> Constr #

dataTypeOf :: These a b -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (These a b)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (These a b)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> These a b -> These a b #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> These a b -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> These a b -> r #

gmapQ :: (forall d. Data d => d -> u) -> These a b -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> These a b -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> These a b -> m (These a b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> These a b -> m (These a b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> These a b -> m (These a b) #

(Data a, Data b) => Data (Pair a b) 
Instance details

Defined in Data.Strict.Tuple

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> Pair a b -> c (Pair a b) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Pair a b) #

toConstr :: Pair a b -> Constr #

dataTypeOf :: Pair a b -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Pair a b)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Pair a b)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> Pair a b -> Pair a b #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Pair a b -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Pair a b -> r #

gmapQ :: (forall d. Data d => d -> u) -> Pair a b -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Pair a b -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Pair a b -> m (Pair a b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Pair a b -> m (Pair a b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Pair a b -> m (Pair a b) #

(Data a, Data b) => Data (These a b) 
Instance details

Defined in Data.These

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> These a b -> c (These a b) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (These a b) #

toConstr :: These a b -> Constr #

dataTypeOf :: These a b -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (These a b)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (These a b)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> These a b -> These a b #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> These a b -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> These a b -> r #

gmapQ :: (forall d. Data d => d -> u) -> These a b -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> These a b -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> These a b -> m (These a b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> These a b -> m (These a b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> These a b -> m (These a b) #

(Data k, Data v, Eq k, Hashable k) => Data (HashMap k v) 
Instance details

Defined in Data.HashMap.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> HashMap k v -> c (HashMap k v) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (HashMap k v) #

toConstr :: HashMap k v -> Constr #

dataTypeOf :: HashMap k v -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (HashMap k v)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (HashMap k v)) #

gmapT :: (forall b. Data b => b -> b) -> HashMap k v -> HashMap k v #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HashMap k v -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HashMap k v -> r #

gmapQ :: (forall d. Data d => d -> u) -> HashMap k v -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> HashMap k v -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> HashMap k v -> m (HashMap k v) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HashMap k v -> m (HashMap k v) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HashMap k v -> m (HashMap k v) #

(Data a, Data b) => Data (a, b) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> (a, b) -> c (a, b) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (a, b) #

toConstr :: (a, b) -> Constr #

dataTypeOf :: (a, b) -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (a, b)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (a, b)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> (a, b) -> (a, b) #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> (a, b) -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> (a, b) -> r #

gmapQ :: (forall d. Data d => d -> u) -> (a, b) -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> (a, b) -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> (a, b) -> m (a, b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> (a, b) -> m (a, b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> (a, b) -> m (a, b) #

(Data v, Data c, Data a) => Data (CondBranch v c a) 
Instance details

Defined in Distribution.Types.CondTree

Methods

gfoldl :: (forall d b. Data d => c0 (d -> b) -> d -> c0 b) -> (forall g. g -> c0 g) -> CondBranch v c a -> c0 (CondBranch v c a) #

gunfold :: (forall b r. Data b => c0 (b -> r) -> c0 r) -> (forall r. r -> c0 r) -> Constr -> c0 (CondBranch v c a) #

toConstr :: CondBranch v c a -> Constr #

dataTypeOf :: CondBranch v c a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c0 (t d)) -> Maybe (c0 (CondBranch v c a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c0 (t d e)) -> Maybe (c0 (CondBranch v c a)) #

gmapT :: (forall b. Data b => b -> b) -> CondBranch v c a -> CondBranch v c a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CondBranch v c a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CondBranch v c a -> r #

gmapQ :: (forall d. Data d => d -> u) -> CondBranch v c a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CondBranch v c a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CondBranch v c a -> m (CondBranch v c a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CondBranch v c a -> m (CondBranch v c a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CondBranch v c a -> m (CondBranch v c a) #

(Data v, Data a, Data c) => Data (CondTree v c a) 
Instance details

Defined in Distribution.Types.CondTree

Methods

gfoldl :: (forall d b. Data d => c0 (d -> b) -> d -> c0 b) -> (forall g. g -> c0 g) -> CondTree v c a -> c0 (CondTree v c a) #

gunfold :: (forall b r. Data b => c0 (b -> r) -> c0 r) -> (forall r. r -> c0 r) -> Constr -> c0 (CondTree v c a) #

toConstr :: CondTree v c a -> Constr #

dataTypeOf :: CondTree v c a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c0 (t d)) -> Maybe (c0 (CondTree v c a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c0 (t d e)) -> Maybe (c0 (CondTree v c a)) #

gmapT :: (forall b. Data b => b -> b) -> CondTree v c a -> CondTree v c a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CondTree v c a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CondTree v c a -> r #

gmapQ :: (forall d. Data d => d -> u) -> CondTree v c a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CondTree v c a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CondTree v c a -> m (CondTree v c a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CondTree v c a -> m (CondTree v c a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CondTree v c a -> m (CondTree v c a) #

(Typeable a, Typeable b, Typeable c, Data (a b c)) => Data (WrappedArrow a b c) 
Instance details

Defined in Data.Data

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) #

(Typeable k, Data a, Typeable b) => Data (Const a b) 
Instance details

Defined in 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) #

(Data (f a), Data a, Typeable f) => Data (Ap f a) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Ap f a -> c (Ap f a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Ap f a) #

toConstr :: Ap f a -> Constr #

dataTypeOf :: Ap f a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Ap f a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Ap f a)) #

gmapT :: (forall b. Data b => b -> b) -> Ap f a -> Ap f a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Ap f a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Ap f a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Ap f a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Ap f a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Ap f a -> m (Ap f a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Ap f a -> m (Ap f a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Ap f a -> m (Ap f a) #

(Data (f a), Data a, Typeable f) => Data (Alt f a) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Alt f a -> c (Alt f a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Alt f a) #

toConstr :: Alt f a -> Constr #

dataTypeOf :: Alt f a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Alt f a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Alt f a)) #

gmapT :: (forall b. Data b => b -> b) -> Alt f a -> Alt f a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Alt f a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Alt f a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Alt f a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Alt f a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Alt f a -> m (Alt f a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Alt f a -> m (Alt f a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Alt f a -> m (Alt f a) #

(Coercible a b, Data a, Data b) => Data (Coercion a b) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> Coercion a b -> c (Coercion a b) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Coercion a b) #

toConstr :: Coercion a b -> Constr #

dataTypeOf :: Coercion a b -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Coercion a b)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Coercion a b)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> Coercion a b -> Coercion a b #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Coercion a b -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Coercion a b -> r #

gmapQ :: (forall d. Data d => d -> u) -> Coercion a b -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Coercion a b -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Coercion a b -> m (Coercion a b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Coercion a b -> m (Coercion a b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Coercion a b -> m (Coercion a b) #

(a ~ b, Data a) => Data (a :~: b) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> (a :~: b) -> c (a :~: b) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (a :~: b) #

toConstr :: (a :~: b) -> Constr #

dataTypeOf :: (a :~: b) -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (a :~: b)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (a :~: b)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> (a :~: b) -> a :~: b #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> (a :~: b) -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> (a :~: b) -> r #

gmapQ :: (forall d. Data d => d -> u) -> (a :~: b) -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> (a :~: b) -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> (a :~: b) -> m (a :~: b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> (a :~: b) -> m (a :~: b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> (a :~: b) -> m (a :~: b) #

(Data (f p), Typeable f, Data p) => Data (Rec1 f p) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Rec1 f p -> c (Rec1 f p) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Rec1 f p) #

toConstr :: Rec1 f p -> Constr #

dataTypeOf :: Rec1 f p -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Rec1 f p)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Rec1 f p)) #

gmapT :: (forall b. Data b => b -> b) -> Rec1 f p -> Rec1 f p #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Rec1 f p -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Rec1 f p -> r #

gmapQ :: (forall d. Data d => d -> u) -> Rec1 f p -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Rec1 f p -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Rec1 f p -> m (Rec1 f p) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Rec1 f p -> m (Rec1 f p) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Rec1 f p -> m (Rec1 f p) #

(Data s, Data b) => Data (Tagged s b) 
Instance details

Defined in Data.Tagged

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> Tagged s b -> c (Tagged s b) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Tagged s b) #

toConstr :: Tagged s b -> Constr #

dataTypeOf :: Tagged s b -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Tagged s b)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Tagged s b)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> Tagged s b -> Tagged s b #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Tagged s b -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Tagged s b -> r #

gmapQ :: (forall d. Data d => d -> u) -> Tagged s b -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Tagged s b -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Tagged s b -> m (Tagged s b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Tagged s b -> m (Tagged s b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Tagged s b -> m (Tagged s b) #

(Typeable f, Typeable g, Typeable a, Data (f a), Data (g a)) => Data (These1 f g a) 
Instance details

Defined in Data.Functor.These

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g0. g0 -> c g0) -> These1 f g a -> c (These1 f g a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (These1 f g a) #

toConstr :: These1 f g a -> Constr #

dataTypeOf :: These1 f g a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (These1 f g a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (These1 f g a)) #

gmapT :: (forall b. Data b => b -> b) -> These1 f g a -> These1 f g a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> These1 f g a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> These1 f g a -> r #

gmapQ :: (forall d. Data d => d -> u) -> These1 f g a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> These1 f g a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> These1 f g a -> m (These1 f g a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> These1 f g a -> m (These1 f g a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> These1 f g a -> m (These1 f g a) #

(Typeable b, Typeable k, Data a) => Data (Constant a b) 
Instance details

Defined in Data.Functor.Constant

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> Constant a b -> c (Constant a b) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Constant a b) #

toConstr :: Constant a b -> Constr #

dataTypeOf :: Constant a b -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Constant a b)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Constant a b)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> Constant a b -> Constant a b #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Constant a b -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Constant a b -> r #

gmapQ :: (forall d. Data d => d -> u) -> Constant a b -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Constant a b -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Constant a b -> m (Constant a b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Constant a b -> m (Constant a b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Constant a b -> m (Constant a b) #

(Data a, Data b, Data c) => Data (a, b, c) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b0. Data d => c0 (d -> b0) -> d -> c0 b0) -> (forall g. g -> c0 g) -> (a, b, c) -> c0 (a, b, c) #

gunfold :: (forall b0 r. Data b0 => c0 (b0 -> r) -> c0 r) -> (forall r. r -> c0 r) -> Constr -> c0 (a, b, c) #

toConstr :: (a, b, c) -> Constr #

dataTypeOf :: (a, b, c) -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c0 (t d)) -> Maybe (c0 (a, b, c)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c0 (t d e)) -> Maybe (c0 (a, b, c)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> (a, b, c) -> (a, b, c) #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> (a, b, c) -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> (a, b, c) -> r #

gmapQ :: (forall d. Data d => d -> u) -> (a, b, c) -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> (a, b, c) -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> (a, b, c) -> m (a, b, c) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> (a, b, c) -> m (a, b, c) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> (a, b, c) -> m (a, b, c) #

(Typeable a, Typeable f, Typeable g, Typeable k, Data (f a), Data (g a)) => Data (Product f g a) 
Instance details

Defined in Data.Functor.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g0. g0 -> c g0) -> Product f g a -> c (Product f g a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Product f g a) #

toConstr :: Product f g a -> Constr #

dataTypeOf :: Product f g a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Product f g a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Product f g a)) #

gmapT :: (forall b. Data b => b -> b) -> Product f g a -> Product f g a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Product f g a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Product f g a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Product f g a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Product f g a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Product f g a -> m (Product f g a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Product f g a -> m (Product f g a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Product f g a -> m (Product f g a) #

(Typeable a, Typeable f, Typeable g, Typeable k, Data (f a), Data (g a)) => Data (Sum f g a) 
Instance details

Defined in Data.Functor.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g0. g0 -> c g0) -> Sum f g a -> c (Sum f g a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Sum f g a) #

toConstr :: Sum f g a -> Constr #

dataTypeOf :: Sum f g a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Sum f g a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Sum f g a)) #

gmapT :: (forall b. Data b => b -> b) -> Sum f g a -> Sum f g a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Sum f g a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Sum f g a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Sum f g a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Sum f g a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Sum f g a -> m (Sum f g a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Sum f g a -> m (Sum f g a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Sum f g a -> m (Sum f g a) #

(Typeable i, Typeable j, Typeable a, Typeable b, a ~~ b) => Data (a :~~: b) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> (a :~~: b) -> c (a :~~: b) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (a :~~: b) #

toConstr :: (a :~~: b) -> Constr #

dataTypeOf :: (a :~~: b) -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (a :~~: b)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (a :~~: b)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> (a :~~: b) -> a :~~: b #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> (a :~~: b) -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> (a :~~: b) -> r #

gmapQ :: (forall d. Data d => d -> u) -> (a :~~: b) -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> (a :~~: b) -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> (a :~~: b) -> m (a :~~: b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> (a :~~: b) -> m (a :~~: b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> (a :~~: b) -> m (a :~~: b) #

(Typeable f, Typeable g, Data p, Data (f p), Data (g p)) => Data ((f :*: g) p) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g0. g0 -> c g0) -> (f :*: g) p -> c ((f :*: g) p) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ((f :*: g) p) #

toConstr :: (f :*: g) p -> Constr #

dataTypeOf :: (f :*: g) p -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ((f :*: g) p)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ((f :*: g) p)) #

gmapT :: (forall b. Data b => b -> b) -> (f :*: g) p -> (f :*: g) p #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> (f :*: g) p -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> (f :*: g) p -> r #

gmapQ :: (forall d. Data d => d -> u) -> (f :*: g) p -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> (f :*: g) p -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> (f :*: g) p -> m ((f :*: g) p) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> (f :*: g) p -> m ((f :*: g) p) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> (f :*: g) p -> m ((f :*: g) p) #

(Typeable f, Typeable g, Data p, Data (f p), Data (g p)) => Data ((f :+: g) p) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g0. g0 -> c g0) -> (f :+: g) p -> c ((f :+: g) p) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ((f :+: g) p) #

toConstr :: (f :+: g) p -> Constr #

dataTypeOf :: (f :+: g) p -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ((f :+: g) p)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ((f :+: g) p)) #

gmapT :: (forall b. Data b => b -> b) -> (f :+: g) p -> (f :+: g) p #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> (f :+: g) p -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> (f :+: g) p -> r #

gmapQ :: (forall d. Data d => d -> u) -> (f :+: g) p -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> (f :+: g) p -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> (f :+: g) p -> m ((f :+: g) p) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> (f :+: g) p -> m ((f :+: g) p) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> (f :+: g) p -> m ((f :+: g) p) #

(Typeable i, Data p, Data c) => Data (K1 i c p) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c0 (d -> b) -> d -> c0 b) -> (forall g. g -> c0 g) -> K1 i c p -> c0 (K1 i c p) #

gunfold :: (forall b r. Data b => c0 (b -> r) -> c0 r) -> (forall r. r -> c0 r) -> Constr -> c0 (K1 i c p) #

toConstr :: K1 i c p -> Constr #

dataTypeOf :: K1 i c p -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c0 (t d)) -> Maybe (c0 (K1 i c p)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c0 (t d e)) -> Maybe (c0 (K1 i c p)) #

gmapT :: (forall b. Data b => b -> b) -> K1 i c p -> K1 i c p #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> K1 i c p -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> K1 i c p -> r #

gmapQ :: (forall d. Data d => d -> u) -> K1 i c p -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> K1 i c p -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> K1 i c p -> m (K1 i c p) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> K1 i c p -> m (K1 i c p) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> K1 i c p -> m (K1 i c p) #

(Data a, Data b, Data c, Data d) => Data (a, b, c, d) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d0 b0. Data d0 => c0 (d0 -> b0) -> d0 -> c0 b0) -> (forall g. g -> c0 g) -> (a, b, c, d) -> c0 (a, b, c, d) #

gunfold :: (forall b0 r. Data b0 => c0 (b0 -> r) -> c0 r) -> (forall r. r -> c0 r) -> Constr -> c0 (a, b, c, d) #

toConstr :: (a, b, c, d) -> Constr #

dataTypeOf :: (a, b, c, d) -> DataType #

dataCast1 :: Typeable t => (forall d0. Data d0 => c0 (t d0)) -> Maybe (c0 (a, b, c, d)) #

dataCast2 :: Typeable t => (forall d0 e. (Data d0, Data e) => c0 (t d0 e)) -> Maybe (c0 (a, b, c, d)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> (a, b, c, d) -> (a, b, c, d) #

gmapQl :: (r -> r' -> r) -> r -> (forall d0. Data d0 => d0 -> r') -> (a, b, c, d) -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d0. Data d0 => d0 -> r') -> (a, b, c, d) -> r #

gmapQ :: (forall d0. Data d0 => d0 -> u) -> (a, b, c, d) -> [u] #

gmapQi :: Int -> (forall d0. Data d0 => d0 -> u) -> (a, b, c, d) -> u #

gmapM :: Monad m => (forall d0. Data d0 => d0 -> m d0) -> (a, b, c, d) -> m (a, b, c, d) #

gmapMp :: MonadPlus m => (forall d0. Data d0 => d0 -> m d0) -> (a, b, c, d) -> m (a, b, c, d) #

gmapMo :: MonadPlus m => (forall d0. Data d0 => d0 -> m d0) -> (a, b, c, d) -> m (a, b, c, d) #

(Typeable a, Typeable f, Typeable g, Typeable k1, Typeable k2, Data (f (g a))) => Data (Compose f g a) 
Instance details

Defined in Data.Functor.Compose

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g0. g0 -> c g0) -> Compose f g a -> c (Compose f g a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Compose f g a) #

toConstr :: Compose f g a -> Constr #

dataTypeOf :: Compose f g a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Compose f g a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Compose f g a)) #

gmapT :: (forall b. Data b => b -> b) -> Compose f g a -> Compose f g a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Compose f g a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Compose f g a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Compose f g a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Compose f g a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Compose f g a -> m (Compose f g a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Compose f g a -> m (Compose f g a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Compose f g a -> m (Compose f g a) #

(Typeable f, Typeable g, Data p, Data (f (g p))) => Data ((f :.: g) p) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g0. g0 -> c g0) -> (f :.: g) p -> c ((f :.: g) p) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ((f :.: g) p) #

toConstr :: (f :.: g) p -> Constr #

dataTypeOf :: (f :.: g) p -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ((f :.: g) p)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ((f :.: g) p)) #

gmapT :: (forall b. Data b => b -> b) -> (f :.: g) p -> (f :.: g) p #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> (f :.: g) p -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> (f :.: g) p -> r #

gmapQ :: (forall d. Data d => d -> u) -> (f :.: g) p -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> (f :.: g) p -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> (f :.: g) p -> m ((f :.: g) p) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> (f :.: g) p -> m ((f :.: g) p) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> (f :.: g) p -> m ((f :.: g) p) #

(Data p, Data (f p), Typeable c, Typeable i, Typeable f) => Data (M1 i c f p) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c0 (d -> b) -> d -> c0 b) -> (forall g. g -> c0 g) -> M1 i c f p -> c0 (M1 i c f p) #

gunfold :: (forall b r. Data b => c0 (b -> r) -> c0 r) -> (forall r. r -> c0 r) -> Constr -> c0 (M1 i c f p) #

toConstr :: M1 i c f p -> Constr #

dataTypeOf :: M1 i c f p -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c0 (t d)) -> Maybe (c0 (M1 i c f p)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c0 (t d e)) -> Maybe (c0 (M1 i c f p)) #

gmapT :: (forall b. Data b => b -> b) -> M1 i c f p -> M1 i c f p #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> M1 i c f p -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> M1 i c f p -> r #

gmapQ :: (forall d. Data d => d -> u) -> M1 i c f p -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> M1 i c f p -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> M1 i c f p -> m (M1 i c f p) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> M1 i c f p -> m (M1 i c f p) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> M1 i c f p -> m (M1 i c f p) #

(Data a, Data b, Data c, Data d, Data e) => Data (a, b, c, d, e) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d0 b0. Data d0 => c0 (d0 -> b0) -> d0 -> c0 b0) -> (forall g. g -> c0 g) -> (a, b, c, d, e) -> c0 (a, b, c, d, e) #

gunfold :: (forall b0 r. Data b0 => c0 (b0 -> r) -> c0 r) -> (forall r. r -> c0 r) -> Constr -> c0 (a, b, c, d, e) #

toConstr :: (a, b, c, d, e) -> Constr #

dataTypeOf :: (a, b, c, d, e) -> DataType #

dataCast1 :: Typeable t => (forall d0. Data d0 => c0 (t d0)) -> Maybe (c0 (a, b, c, d, e)) #

dataCast2 :: Typeable t => (forall d0 e0. (Data d0, Data e0) => c0 (t d0 e0)) -> Maybe (c0 (a, b, c, d, e)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> (a, b, c, d, e) -> (a, b, c, d, e) #

gmapQl :: (r -> r' -> r) -> r -> (forall d0. Data d0 => d0 -> r') -> (a, b, c, d, e) -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d0. Data d0 => d0 -> r') -> (a, b, c, d, e) -> r #

gmapQ :: (forall d0. Data d0 => d0 -> u) -> (a, b, c, d, e) -> [u] #

gmapQi :: Int -> (forall d0. Data d0 => d0 -> u) -> (a, b, c, d, e) -> u #

gmapM :: Monad m => (forall d0. Data d0 => d0 -> m d0) -> (a, b, c, d, e) -> m (a, b, c, d, e) #

gmapMp :: MonadPlus m => (forall d0. Data d0 => d0 -> m d0) -> (a, b, c, d, e) -> m (a, b, c, d, e) #

gmapMo :: MonadPlus m => (forall d0. Data d0 => d0 -> m d0) -> (a, b, c, d, e) -> m (a, b, c, d, e) #

(Data a, Data b, Data c, Data d, Data e, Data f) => Data (a, b, c, d, e, f) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d0 b0. Data d0 => c0 (d0 -> b0) -> d0 -> c0 b0) -> (forall g. g -> c0 g) -> (a, b, c, d, e, f) -> c0 (a, b, c, d, e, f) #

gunfold :: (forall b0 r. Data b0 => c0 (b0 -> r) -> c0 r) -> (forall r. r -> c0 r) -> Constr -> c0 (a, b, c, d, e, f) #

toConstr :: (a, b, c, d, e, f) -> Constr #

dataTypeOf :: (a, b, c, d, e, f) -> DataType #

dataCast1 :: Typeable t => (forall d0. Data d0 => c0 (t d0)) -> Maybe (c0 (a, b, c, d, e, f)) #

dataCast2 :: Typeable t => (forall d0 e0. (Data d0, Data e0) => c0 (t d0 e0)) -> Maybe (c0 (a, b, c, d, e, f)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> (a, b, c, d, e, f) -> (a, b, c, d, e, f) #

gmapQl :: (r -> r' -> r) -> r -> (forall d0. Data d0 => d0 -> r') -> (a, b, c, d, e, f) -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d0. Data d0 => d0 -> r') -> (a, b, c, d, e, f) -> r #

gmapQ :: (forall d0. Data d0 => d0 -> u) -> (a, b, c, d, e, f) -> [u] #

gmapQi :: Int -> (forall d0. Data d0 => d0 -> u) -> (a, b, c, d, e, f) -> u #

gmapM :: Monad m => (forall d0. Data d0 => d0 -> m d0) -> (a, b, c, d, e, f) -> m (a, b, c, d, e, f) #

gmapMp :: MonadPlus m => (forall d0. Data d0 => d0 -> m d0) -> (a, b, c, d, e, f) -> m (a, b, c, d, e, f) #

gmapMo :: MonadPlus m => (forall d0. Data d0 => d0 -> m d0) -> (a, b, c, d, e, f) -> m (a, b, c, d, e, f) #

(Data a, Data b, Data c, Data d, Data e, Data f, Data g) => Data (a, b, c, d, e, f, g) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d0 b0. Data d0 => c0 (d0 -> b0) -> d0 -> c0 b0) -> (forall g0. g0 -> c0 g0) -> (a, b, c, d, e, f, g) -> c0 (a, b, c, d, e, f, g) #

gunfold :: (forall b0 r. Data b0 => c0 (b0 -> r) -> c0 r) -> (forall r. r -> c0 r) -> Constr -> c0 (a, b, c, d, e, f, g) #

toConstr :: (a, b, c, d, e, f, g) -> Constr #

dataTypeOf :: (a, b, c, d, e, f, g) -> DataType #

dataCast1 :: Typeable t => (forall d0. Data d0 => c0 (t d0)) -> Maybe (c0 (a, b, c, d, e, f, g)) #

dataCast2 :: Typeable t => (forall d0 e0. (Data d0, Data e0) => c0 (t d0 e0)) -> Maybe (c0 (a, b, c, d, e, f, g)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) #

gmapQl :: (r -> r' -> r) -> r -> (forall d0. Data d0 => d0 -> r') -> (a, b, c, d, e, f, g) -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d0. Data d0 => d0 -> r') -> (a, b, c, d, e, f, g) -> r #

gmapQ :: (forall d0. Data d0 => d0 -> u) -> (a, b, c, d, e, f, g) -> [u] #

gmapQi :: Int -> (forall d0. Data d0 => d0 -> u) -> (a, b, c, d, e, f, g) -> u #

gmapM :: Monad m => (forall d0. Data d0 => d0 -> m d0) -> (a, b, c, d, e, f, g) -> m (a, b, c, d, e, f, g) #

gmapMp :: MonadPlus m => (forall d0. Data d0 => d0 -> m d0) -> (a, b, c, d, e, f, g) -> m (a, b, c, d, e, f, g) #

gmapMo :: MonadPlus m => (forall d0. Data d0 => d0 -> m d0) -> (a, b, c, d, e, f, g) -> m (a, b, c, d, e, f, g) #

data Either a b #

Constructors

Left a 
Right b 

Instances

Instances details
FromJSON2 Either 
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 (Either a b)

liftParseJSONList2 :: Maybe a -> (Value -> Parser a) -> (Value -> Parser [a]) -> Maybe b -> (Value -> Parser b) -> (Value -> Parser [b]) -> Value -> Parser [Either a b]

liftOmittedField2 :: Maybe a -> Maybe b -> Maybe (Either a b)

ToJSON2 Either 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON2 :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> (b -> Bool) -> (b -> Value) -> ([b] -> Value) -> Either a b -> Value

liftToJSONList2 :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> (b -> Bool) -> (b -> Value) -> ([b] -> Value) -> [Either a b] -> Value

liftToEncoding2 :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> (b -> Bool) -> (b -> Encoding) -> ([b] -> Encoding) -> Either a b -> Encoding

liftToEncodingList2 :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> (b -> Bool) -> (b -> Encoding) -> ([b] -> Encoding) -> [Either a b] -> Encoding

liftOmitField2 :: (a -> Bool) -> (b -> Bool) -> Either a b -> Bool

Bifoldable Either 
Instance details

Defined in Data.Bifoldable

Methods

bifold :: Monoid m => Either m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> Either a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> Either a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> Either a b -> c #

Bifoldable1 Either 
Instance details

Defined in Data.Bifoldable1

Methods

bifold1 :: Semigroup m => Either m m -> m

bifoldMap1 :: Semigroup m => (a -> m) -> (b -> m) -> Either a b -> m

Bifunctor Either 
Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> Either a c -> Either b d #

first :: (a -> b) -> Either a c -> Either b c #

second :: (b -> c) -> Either a b -> Either a c #

Bitraversable Either 
Instance details

Defined in Data.Bitraversable

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> Either a b -> f (Either c d) #

Eq2 Either 
Instance details

Defined in Data.Functor.Classes

Methods

liftEq2 :: (a -> b -> Bool) -> (c -> d -> Bool) -> Either a c -> Either b d -> Bool

Ord2 Either 
Instance details

Defined in Data.Functor.Classes

Methods

liftCompare2 :: (a -> b -> Ordering) -> (c -> d -> Ordering) -> Either a c -> Either b d -> Ordering

Read2 Either 
Instance details

Defined in Data.Functor.Classes

Methods

liftReadsPrec2 :: (Int -> ReadS a) -> ReadS [a] -> (Int -> ReadS b) -> ReadS [b] -> Int -> ReadS (Either a b)

liftReadList2 :: (Int -> ReadS a) -> ReadS [a] -> (Int -> ReadS b) -> ReadS [b] -> ReadS [Either a b]

liftReadPrec2 :: ReadPrec a -> ReadPrec [a] -> ReadPrec b -> ReadPrec [b] -> ReadPrec (Either a b)

liftReadListPrec2 :: ReadPrec a -> ReadPrec [a] -> ReadPrec b -> ReadPrec [b] -> ReadPrec [Either a b]

Show2 Either 
Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec2 :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> (Int -> b -> ShowS) -> ([b] -> ShowS) -> Int -> Either a b -> ShowS

liftShowList2 :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> (Int -> b -> ShowS) -> ([b] -> ShowS) -> [Either a b] -> ShowS

NFData2 Either 
Instance details

Defined in Control.DeepSeq

Methods

liftRnf2 :: (a -> ()) -> (b -> ()) -> Either a b -> ()

Hashable2 Either 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt2 :: (Int -> a -> Int) -> (Int -> b -> Int) -> Int -> Either a b -> Int

Generic1 (Either a :: Type -> Type) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 (Either a :: Type -> Type) 
Instance details

Defined in GHC.Generics

type Rep1 (Either a :: Type -> Type) = D1 ('MetaData "Either" "Data.Either" "base" 'False) (C1 ('MetaCons "Left" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)) :+: C1 ('MetaCons "Right" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1))

Methods

from1 :: Either a a0 -> Rep1 (Either a) a0

to1 :: Rep1 (Either a) a0 -> Either a a0

MonadError e (Either e) 
Instance details

Defined in Control.Monad.Error.Class

Methods

throwError :: e -> Either e a

catchError :: Either e a -> (e -> Either e a) -> Either e a

(Lift a, Lift b) => Lift (Either a b :: Type) 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Either a b -> m Exp

liftTyped :: forall (m :: Type -> Type). Quote m => Either a b -> Code m (Either a b)

FromJSON a => FromJSON1 (Either a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: Maybe a0 -> (Value -> Parser a0) -> (Value -> Parser [a0]) -> Value -> Parser (Either a a0)

liftParseJSONList :: Maybe a0 -> (Value -> Parser a0) -> (Value -> Parser [a0]) -> Value -> Parser [Either a a0]

liftOmittedField :: Maybe a0 -> Maybe (Either a a0)

ToJSON a => ToJSON1 (Either a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a0 -> Bool) -> (a0 -> Value) -> ([a0] -> Value) -> Either a a0 -> Value

liftToJSONList :: (a0 -> Bool) -> (a0 -> Value) -> ([a0] -> Value) -> [Either a a0] -> Value

liftToEncoding :: (a0 -> Bool) -> (a0 -> Encoding) -> ([a0] -> Encoding) -> Either a a0 -> Encoding

liftToEncodingList :: (a0 -> Bool) -> (a0 -> Encoding) -> ([a0] -> Encoding) -> [Either a a0] -> Encoding

liftOmitField :: (a0 -> Bool) -> Either a a0 -> Bool

MonadFix (Either e) 
Instance details

Defined in Control.Monad.Fix

Methods

mfix :: (a -> Either e a) -> Either e a

Foldable (Either a) 
Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Either a m -> m #

foldMap :: Monoid m => (a0 -> m) -> Either a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> Either a a0 -> m

foldr :: (a0 -> b -> b) -> b -> Either a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Either a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> Either a a0 -> b

foldl' :: (b -> a0 -> b) -> b -> Either a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Either a a0 -> a0

foldl1 :: (a0 -> a0 -> a0) -> Either a a0 -> a0

toList :: Either a a0 -> [a0] #

null :: Either a a0 -> Bool #

length :: Either a a0 -> Int #

elem :: Eq a0 => a0 -> Either a a0 -> Bool #

maximum :: Ord a0 => Either a a0 -> a0

minimum :: Ord a0 => Either a a0 -> a0

sum :: Num a0 => Either a a0 -> a0 #

product :: Num a0 => Either a a0 -> a0 #

Eq a => Eq1 (Either a) 
Instance details

Defined in Data.Functor.Classes

Methods

liftEq :: (a0 -> b -> Bool) -> Either a a0 -> Either a b -> Bool

Ord a => Ord1 (Either a) 
Instance details

Defined in Data.Functor.Classes

Methods

liftCompare :: (a0 -> b -> Ordering) -> Either a a0 -> Either a b -> Ordering

Read a => Read1 (Either a) 
Instance details

Defined in Data.Functor.Classes

Methods

liftReadsPrec :: (Int -> ReadS a0) -> ReadS [a0] -> Int -> ReadS (Either a a0)

liftReadList :: (Int -> ReadS a0) -> ReadS [a0] -> ReadS [Either a a0]

liftReadPrec :: ReadPrec a0 -> ReadPrec [a0] -> ReadPrec (Either a a0)

liftReadListPrec :: ReadPrec a0 -> ReadPrec [a0] -> ReadPrec [Either a a0]

Show a => Show1 (Either a) 
Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec :: (Int -> a0 -> ShowS) -> ([a0] -> ShowS) -> Int -> Either a a0 -> ShowS

liftShowList :: (Int -> a0 -> ShowS) -> ([a0] -> ShowS) -> [Either a a0] -> ShowS

Traversable (Either a) 
Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a0 -> f b) -> Either a a0 -> f (Either a b) #

sequenceA :: Applicative f => Either a (f a0) -> f (Either a a0) #

mapM :: Monad m => (a0 -> m b) -> Either a a0 -> m (Either a b) #

sequence :: Monad m => Either a (m a0) -> m (Either a a0) #

Applicative (Either e) 
Instance details

Defined in 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 #

Functor (Either a) 
Instance details

Defined in Data.Either

Methods

fmap :: (a0 -> b) -> Either a a0 -> Either a b #

(<$) :: a0 -> Either a b -> Either a a0 #

Monad (Either e) 
Instance details

Defined in 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 #

MonadFailure (Either a) 
Instance details

Defined in Basement.Monad

Associated Types

type Failure (Either a) 
Instance details

Defined in Basement.Monad

type Failure (Either a) = a

Methods

mFail :: Failure (Either a) -> Either a ()

NFData a => NFData1 (Either a) 
Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a0 -> ()) -> Either a a0 -> ()

e ~ SomeException => MonadCatch (Either e) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: (HasCallStack, Exception e0) => Either e a -> (e0 -> Either e a) -> Either e a

e ~ SomeException => MonadMask (Either e) 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: HasCallStack => ((forall a. Either e a -> Either e a) -> Either e b) -> Either e b

uninterruptibleMask :: HasCallStack => ((forall a. Either e a -> Either e a) -> Either e b) -> Either e b

generalBracket :: HasCallStack => Either e a -> (a -> ExitCase b -> Either e c) -> (a -> Either e b) -> Either e (b, c)

e ~ SomeException => MonadThrow (Either e) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: (HasCallStack, Exception e0) => e0 -> Either e a #

GFoldable (Either a) 
Instance details

Defined in Generics.Deriving.Foldable

Methods

gfoldMap :: Monoid m => (a0 -> m) -> Either a a0 -> m

gfold :: Monoid m => Either a m -> m

gfoldr :: (a0 -> b -> b) -> b -> Either a a0 -> b

gfoldr' :: (a0 -> b -> b) -> b -> Either a a0 -> b

gfoldl :: (a0 -> b -> a0) -> a0 -> Either a b -> a0

gfoldl' :: (a0 -> b -> a0) -> a0 -> Either a b -> a0

gfoldr1 :: (a0 -> a0 -> a0) -> Either a a0 -> a0

gfoldl1 :: (a0 -> a0 -> a0) -> Either a a0 -> a0

GFunctor (Either a) 
Instance details

Defined in Generics.Deriving.Functor

Methods

gmap :: (a0 -> b) -> Either a a0 -> Either a b

GTraversable (Either a) 
Instance details

Defined in Generics.Deriving.Traversable

Methods

gtraverse :: Applicative f => (a0 -> f b) -> Either a a0 -> f (Either a b)

gsequenceA :: Applicative f => Either a (f a0) -> f (Either a a0)

gmapM :: Monad m => (a0 -> m b) -> Either a a0 -> m (Either a b)

gsequence :: Monad m => Either a (m a0) -> m (Either a a0)

Hashable a => Hashable1 (Either a) 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a0 -> Int) -> Int -> Either a a0 -> Int

MonadBaseControl (Either e) (Either e) 
Instance details

Defined in Control.Monad.Trans.Control

Methods

liftBaseWith :: (RunInBase (Either e) (Either e) -> Either e a) -> Either e a

restoreM :: StM (Either e) a -> Either e a

(IsNode a, IsNode b, Key a ~ Key b) => IsNode (Either a b) 
Instance details

Defined in Distribution.Compat.Graph

Associated Types

type Key (Either a b) 
Instance details

Defined in Distribution.Compat.Graph

type Key (Either a b) = Key a

Methods

nodeKey :: Either a b -> Key (Either a b)

nodeNeighbors :: Either a b -> [Key (Either a b)]

(Structured a, Structured b) => Structured (Either a b) 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy (Either a b) -> Structure

structureHash' :: Tagged (Either a b) MD5

(FromJSON a, FromJSON b) => FromJSON (Either a b) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Either a b)

parseJSONList :: Value -> Parser [Either a b]

omittedField :: Maybe (Either a b)

(ToJSON a, ToJSON b) => ToJSON (Either a b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Either a b -> Value

toEncoding :: Either a b -> Encoding

toJSONList :: [Either a b] -> Value

toEncodingList :: [Either a b] -> Encoding

omitField :: Either a b -> Bool

(Data a, Data b) => Data (Either a b) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> Either a b -> c (Either a b) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Either a b) #

toConstr :: Either a b -> Constr #

dataTypeOf :: Either a b -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Either a b)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Either a b)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> Either a b -> Either a b #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Either a b -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Either a b -> r #

gmapQ :: (forall d. Data d => d -> u) -> Either a b -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Either a b -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Either a b -> m (Either a b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Either a b -> m (Either a b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Either a b -> m (Either a b) #

Semigroup (Either a b) 
Instance details

Defined in 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

Generic (Either a b) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Either a b) 
Instance details

Defined in GHC.Generics

type Rep (Either a b) = D1 ('MetaData "Either" "Data.Either" "base" 'False) (C1 ('MetaCons "Left" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)) :+: C1 ('MetaCons "Right" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 b)))

Methods

from :: Either a b -> Rep (Either a b) x

to :: Rep (Either a b) x -> Either a b

(Read a, Read b) => Read (Either a b) 
Instance details

Defined in Data.Either

Methods

readsPrec :: Int -> ReadS (Either a b)

readList :: ReadS [Either a b]

readPrec :: ReadPrec (Either a b)

readListPrec :: ReadPrec [Either a b]

(Show a, Show b) => Show (Either a b) 
Instance details

Defined in Data.Either

Methods

showsPrec :: Int -> Either a b -> ShowS

show :: Either a b -> String #

showList :: [Either a b] -> ShowS

(Binary a, Binary b) => Binary (Either a b) 
Instance details

Defined in Data.Binary.Class

Methods

put :: Either a b -> Put

get :: Get (Either a b)

putList :: [Either a b] -> Put

(NFData a, NFData b) => NFData (Either a b) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Either a b -> () #

(GEnum a, GEnum b) => GEnum (Either a b) 
Instance details

Defined in Generics.Deriving.Enum

Methods

genum :: [Either a b]

(GEq a, GEnum a, GIx a, GEq b, GEnum b, GIx b) => GIx (Either a b) 
Instance details

Defined in Generics.Deriving.Enum

Methods

range :: (Either a b, Either a b) -> [Either a b]

index :: (Either a b, Either a b) -> Either a b -> Int

inRange :: (Either a b, Either a b) -> Either a b -> Bool

(GEq a, GEq b) => GEq (Either a b) 
Instance details

Defined in Generics.Deriving.Eq

Methods

geq :: Either a b -> Either a b -> Bool

(GShow a, GShow b) => GShow (Either a b) 
Instance details

Defined in Generics.Deriving.Show

Methods

gshowsPrec :: Int -> Either a b -> ShowS

gshows :: Either a b -> ShowS

gshow :: Either a b -> String

gshowList :: [Either a b] -> ShowS

Uniplate (Either a b) 
Instance details

Defined in Generics.Deriving.Uniplate

Methods

children :: Either a b -> [Either a b]

context :: Either a b -> [Either a b] -> Either a b

descend :: (Either a b -> Either a b) -> Either a b -> Either a b

descendM :: Monad m => (Either a b -> m (Either a b)) -> Either a b -> m (Either a b)

transform :: (Either a b -> Either a b) -> Either a b -> Either a b

transformM :: Monad m => (Either a b -> m (Either a b)) -> Either a b -> m (Either a b)

(Eq a, Eq b) => Eq (Either a b) 
Instance details

Defined in Data.Either

Methods

(==) :: Either a b -> Either a b -> Bool #

(/=) :: Either a b -> Either a b -> Bool #

(Ord a, Ord b) => Ord (Either a b) 
Instance details

Defined in Data.Either

Methods

compare :: Either a b -> Either a b -> Ordering #

(<) :: Either a b -> Either a b -> Bool #

(<=) :: Either a b -> Either a b -> Bool #

(>) :: Either a b -> Either a b -> Bool #

(>=) :: Either a b -> Either a b -> Bool #

max :: Either a b -> Either a b -> Either a b #

min :: Either a b -> Either a b -> Either a b #

(Hashable a, Hashable b) => Hashable (Either a b) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Either a b -> Int

hash :: Either a b -> Int

(FromValue a, FromValue b) => FromValue (Either a b) 
Instance details

Defined in Data.Aeson.Config.FromValue

Methods

fromValue :: Value -> Parser (Either a b) Source #

(FromHttpApiData a, FromHttpApiData b) => FromHttpApiData (Either a b) 
Instance details

Defined in Web.Internal.HttpApiData

(ToHttpApiData a, ToHttpApiData b) => ToHttpApiData (Either a b) 
Instance details

Defined in Web.Internal.HttpApiData

MonoFoldable (Either a b) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (Either a b) -> m) -> Either a b -> m

ofoldr :: (Element (Either a b) -> b0 -> b0) -> b0 -> Either a b -> b0

ofoldl' :: (a0 -> Element (Either a b) -> a0) -> a0 -> Either a b -> a0

otoList :: Either a b -> [Element (Either a b)]

oall :: (Element (Either a b) -> Bool) -> Either a b -> Bool

oany :: (Element (Either a b) -> Bool) -> Either a b -> Bool

onull :: Either a b -> Bool

olength :: Either a b -> Int

olength64 :: Either a b -> Int64

ocompareLength :: Integral i => Either a b -> i -> Ordering

otraverse_ :: Applicative f => (Element (Either a b) -> f b0) -> Either a b -> f ()

ofor_ :: Applicative f => Either a b -> (Element (Either a b) -> f b0) -> f ()

omapM_ :: Applicative m => (Element (Either a b) -> m ()) -> Either a b -> m ()

oforM_ :: Applicative m => Either a b -> (Element (Either a b) -> m ()) -> m ()

ofoldlM :: Monad m => (a0 -> Element (Either a b) -> m a0) -> a0 -> Either a b -> m a0

ofoldMap1Ex :: Semigroup m => (Element (Either a b) -> m) -> Either a b -> m

ofoldr1Ex :: (Element (Either a b) -> Element (Either a b) -> Element (Either a b)) -> Either a b -> Element (Either a b)

ofoldl1Ex' :: (Element (Either a b) -> Element (Either a b) -> Element (Either a b)) -> Either a b -> Element (Either a b)

headEx :: Either a b -> Element (Either a b)

lastEx :: Either a b -> Element (Either a b)

unsafeHead :: Either a b -> Element (Either a b)

unsafeLast :: Either a b -> Element (Either a b)

maximumByEx :: (Element (Either a b) -> Element (Either a b) -> Ordering) -> Either a b -> Element (Either a b)

minimumByEx :: (Element (Either a b) -> Element (Either a b) -> Ordering) -> Either a b -> Element (Either a b)

oelem :: Element (Either a b) -> Either a b -> Bool

onotElem :: Element (Either a b) -> Either a b -> Bool

MonoFunctor (Either a b) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Either a b) -> Element (Either a b)) -> Either a b -> Either a b

MonoPointed (Either a b) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Either a b) -> Either a b

MonoTraversable (Either a b) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (Either a b) -> f (Element (Either a b))) -> Either a b -> f (Either a b)

omapM :: Applicative m => (Element (Either a b) -> m (Element (Either a b))) -> Either a b -> m (Either a b)

(PersistConfig c1, PersistConfig c2, PersistConfigPool c1 ~ PersistConfigPool c2, PersistConfigBackend c1 ~ PersistConfigBackend c2) => PersistConfig (Either c1 c2) 
Instance details

Defined in Database.Persist.Class.PersistConfig

Associated Types

type PersistConfigBackend (Either c1 c2) 
Instance details

Defined in Database.Persist.Class.PersistConfig

type PersistConfigBackend (Either c1 c2) = PersistConfigBackend c1
type PersistConfigPool (Either c1 c2) 
Instance details

Defined in Database.Persist.Class.PersistConfig

type PersistConfigPool (Either c1 c2) = PersistConfigPool c1

Methods

loadConfig :: Value -> Parser (Either c1 c2)

applyEnv :: Either c1 c2 -> IO (Either c1 c2)

createPoolConfig :: Either c1 c2 -> IO (PersistConfigPool (Either c1 c2))

runPool :: MonadUnliftIO m => Either c1 c2 -> PersistConfigBackend (Either c1 c2) m a -> PersistConfigPool (Either c1 c2) -> m a

(Pretty a, Pretty b) => Pretty (Either a b) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJClass

Methods

pPrintPrec :: PrettyLevel -> Rational -> Either a b -> Doc ann

pPrint :: Either a b -> Doc ann

pPrintList :: PrettyLevel -> [Either a b] -> Doc ann

(Pretty a, Pretty b) => Pretty (Either a b) 
Instance details

Defined in Text.PrettyPrint.HughesPJClass

Methods

pPrintPrec :: PrettyLevel -> Rational -> Either a b -> Doc

pPrint :: Either a b -> Doc

pPrintList :: PrettyLevel -> [Either a b] -> Doc

Newtype (Either License License) SpecLicense 
Instance details

Defined in Distribution.FieldGrammar.Newtypes

Methods

pack :: Either License License -> SpecLicense

unpack :: SpecLicense -> Either License License

Newtype (Either License License) SpecLicenseLenient 
Instance details

Defined in Distribution.Types.InstalledPackageInfo.FieldGrammar

Methods

pack :: Either License License -> SpecLicenseLenient

unpack :: SpecLicenseLenient -> Either License License

(a ~ a', b ~ b') => Each (Either a a') (Either b b') a b 
Instance details

Defined in Lens.Micro.Internal

Methods

each :: Traversal (Either a a') (Either b b') a b

type Rep1 (Either a :: Type -> Type) 
Instance details

Defined in GHC.Generics

type Rep1 (Either a :: Type -> Type) = D1 ('MetaData "Either" "Data.Either" "base" 'False) (C1 ('MetaCons "Left" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)) :+: C1 ('MetaCons "Right" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1))
type Failure (Either a) 
Instance details

Defined in Basement.Monad

type Failure (Either a) = a
type StM (Either e) a 
Instance details

Defined in Control.Monad.Trans.Control

type StM (Either e) a = a
type Key (Either a b) 
Instance details

Defined in Distribution.Compat.Graph

type Key (Either a b) = Key a
type Rep (Either a b) 
Instance details

Defined in GHC.Generics

type Rep (Either a b) = D1 ('MetaData "Either" "Data.Either" "base" 'False) (C1 ('MetaCons "Left" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)) :+: C1 ('MetaCons "Right" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 b)))
type Element (Either a b) 
Instance details

Defined in Data.MonoTraversable

type Element (Either a b) = b
type PersistConfigBackend (Either c1 c2) 
Instance details

Defined in Database.Persist.Class.PersistConfig

type PersistConfigBackend (Either c1 c2) = PersistConfigBackend c1
type PersistConfigPool (Either c1 c2) 
Instance details

Defined in Database.Persist.Class.PersistConfig

type PersistConfigPool (Either c1 c2) = PersistConfigPool c1

newtype Identity a #

Constructors

Identity 

Fields

Instances

Instances details
FromJSON1 Identity 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: Maybe a -> (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (Identity a)

liftParseJSONList :: Maybe a -> (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [Identity a]

liftOmittedField :: Maybe a -> Maybe (Identity a)

ToJSON1 Identity 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> Identity a -> Value

liftToJSONList :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> [Identity a] -> Value

liftToEncoding :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> Identity a -> Encoding

liftToEncodingList :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> [Identity a] -> Encoding

liftOmitField :: (a -> Bool) -> Identity a -> Bool

MonadFix Identity 
Instance details

Defined in Data.Functor.Identity

Methods

mfix :: (a -> Identity a) -> Identity a

MonadZip Identity 
Instance details

Defined in Control.Monad.Zip

Methods

mzip :: Identity a -> Identity b -> Identity (a, b)

mzipWith :: (a -> b -> c) -> Identity a -> Identity b -> Identity c

munzip :: Identity (a, b) -> (Identity a, Identity b)

Foldable Identity 
Instance details

Defined in Data.Functor.Identity

Methods

fold :: Monoid m => Identity m -> m #

foldMap :: Monoid m => (a -> m) -> Identity a -> m #

foldMap' :: Monoid m => (a -> m) -> Identity a -> m

foldr :: (a -> b -> b) -> b -> Identity a -> b #

foldr' :: (a -> b -> b) -> b -> Identity a -> b #

foldl :: (b -> a -> b) -> b -> Identity a -> b

foldl' :: (b -> a -> b) -> b -> Identity a -> b #

foldr1 :: (a -> a -> a) -> Identity a -> a

foldl1 :: (a -> a -> a) -> Identity a -> a

toList :: Identity a -> [a] #

null :: Identity a -> Bool #

length :: Identity a -> Int #

elem :: Eq a => a -> Identity a -> Bool #

maximum :: Ord a => Identity a -> a

minimum :: Ord a => Identity a -> a

sum :: Num a => Identity a -> a #

product :: Num a => Identity a -> a #

Foldable1 Identity 
Instance details

Defined in Data.Foldable1

Methods

fold1 :: Semigroup m => Identity m -> m

foldMap1 :: Semigroup m => (a -> m) -> Identity a -> m

foldMap1' :: Semigroup m => (a -> m) -> Identity a -> m

toNonEmpty :: Identity a -> NonEmpty a

maximum :: Ord a => Identity a -> a

minimum :: Ord a => Identity a -> a

head :: Identity a -> a

last :: Identity a -> a

foldrMap1 :: (a -> b) -> (a -> b -> b) -> Identity a -> b

foldlMap1' :: (a -> b) -> (b -> a -> b) -> Identity a -> b

foldlMap1 :: (a -> b) -> (b -> a -> b) -> Identity a -> b

foldrMap1' :: (a -> b) -> (a -> b -> b) -> Identity a -> b

Eq1 Identity 
Instance details

Defined in Data.Functor.Classes

Methods

liftEq :: (a -> b -> Bool) -> Identity a -> Identity b -> Bool

Ord1 Identity 
Instance details

Defined in Data.Functor.Classes

Methods

liftCompare :: (a -> b -> Ordering) -> Identity a -> Identity b -> Ordering

Read1 Identity 
Instance details

Defined in Data.Functor.Classes

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (Identity a)

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [Identity a]

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (Identity a)

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [Identity a]

Show1 Identity 
Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Identity a -> ShowS

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Identity a] -> ShowS

Traversable Identity 
Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Identity a -> f (Identity b) #

sequenceA :: Applicative f => Identity (f a) -> f (Identity a) #

mapM :: Monad m => (a -> m b) -> Identity a -> m (Identity b) #

sequence :: Monad m => Identity (m a) -> m (Identity a) #

Applicative Identity 
Instance details

Defined in 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 #

Functor Identity 
Instance details

Defined in Data.Functor.Identity

Methods

fmap :: (a -> b) -> Identity a -> Identity b #

(<$) :: a -> Identity b -> Identity a #

Monad Identity 
Instance details

Defined in Data.Functor.Identity

Methods

(>>=) :: Identity a -> (a -> Identity b) -> Identity b #

(>>) :: Identity a -> Identity b -> Identity b #

return :: a -> Identity a #

MonadActive Identity 
Instance details

Defined in Data.Conduit.Lazy

NFData1 Identity 
Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> Identity a -> ()

GCopoint Identity 
Instance details

Defined in Generics.Deriving.Copoint

Methods

gcopoint :: Identity a -> a

GFoldable Identity 
Instance details

Defined in Generics.Deriving.Foldable

Methods

gfoldMap :: Monoid m => (a -> m) -> Identity a -> m

gfold :: Monoid m => Identity m -> m

gfoldr :: (a -> b -> b) -> b -> Identity a -> b

gfoldr' :: (a -> b -> b) -> b -> Identity a -> b

gfoldl :: (a -> b -> a) -> a -> Identity b -> a

gfoldl' :: (a -> b -> a) -> a -> Identity b -> a

gfoldr1 :: (a -> a -> a) -> Identity a -> a

gfoldl1 :: (a -> a -> a) -> Identity a -> a

GFunctor Identity 
Instance details

Defined in Generics.Deriving.Functor

Methods

gmap :: (a -> b) -> Identity a -> Identity b

GTraversable Identity 
Instance details

Defined in Generics.Deriving.Traversable

Methods

gtraverse :: Applicative f => (a -> f b) -> Identity a -> f (Identity b)

gsequenceA :: Applicative f => Identity (f a) -> f (Identity a)

gmapM :: Monad m => (a -> m b) -> Identity a -> m (Identity b)

gsequence :: Monad m => Identity (m a) -> m (Identity a)

Hashable1 Identity 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> Identity a -> Int

Generic1 Identity 
Instance details

Defined in Data.Functor.Identity

Associated Types

type Rep1 Identity 
Instance details

Defined in Data.Functor.Identity

type Rep1 Identity = D1 ('MetaData "Identity" "Data.Functor.Identity" "base" 'True) (C1 ('MetaCons "Identity" 'PrefixI 'True) (S1 ('MetaSel ('Just "runIdentity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1))

Methods

from1 :: Identity a -> Rep1 Identity a

to1 :: Rep1 Identity a -> Identity a

MonadBaseControl Identity Identity 
Instance details

Defined in Control.Monad.Trans.Control

Associated Types

type StM Identity a 
Instance details

Defined in Control.Monad.Trans.Control

type StM Identity a = a

Methods

liftBaseWith :: (RunInBase Identity Identity -> Identity a) -> Identity a

restoreM :: StM Identity a -> Identity a

Stream LexState' Identity LToken 
Instance details

Defined in Distribution.Fields.Parser

Methods

uncons :: LexState' -> Identity (Maybe (LToken, LexState'))

Newtype a (Identity a) 
Instance details

Defined in Distribution.Compat.Newtype

Methods

pack :: a -> Identity a

unpack :: Identity a -> a

Unbox a => Vector Vector (Identity a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: Mutable Vector s (Identity a) -> ST s (Vector (Identity a))

basicUnsafeThaw :: Vector (Identity a) -> ST s (Mutable Vector s (Identity a))

basicLength :: Vector (Identity a) -> Int

basicUnsafeSlice :: Int -> Int -> Vector (Identity a) -> Vector (Identity a)

basicUnsafeIndexM :: Vector (Identity a) -> Int -> Box (Identity a)

basicUnsafeCopy :: Mutable Vector s (Identity a) -> Vector (Identity a) -> ST s ()

elemseq :: Vector (Identity a) -> Identity a -> b -> b

Unbox a => MVector MVector (Identity a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s (Identity a) -> Int

basicUnsafeSlice :: Int -> Int -> MVector s (Identity a) -> MVector s (Identity a)

basicOverlaps :: MVector s (Identity a) -> MVector s (Identity a) -> Bool

basicUnsafeNew :: Int -> ST s (MVector s (Identity a))

basicInitialize :: MVector s (Identity a) -> ST s ()

basicUnsafeReplicate :: Int -> Identity a -> ST s (MVector s (Identity a))

basicUnsafeRead :: MVector s (Identity a) -> Int -> ST s (Identity a)

basicUnsafeWrite :: MVector s (Identity a) -> Int -> Identity a -> ST s ()

basicClear :: MVector s (Identity a) -> ST s ()

basicSet :: MVector s (Identity a) -> Identity a -> ST s ()

basicUnsafeCopy :: MVector s (Identity a) -> MVector s (Identity a) -> ST s ()

basicUnsafeMove :: MVector s (Identity a) -> MVector s (Identity a) -> ST s ()

basicUnsafeGrow :: MVector s (Identity a) -> Int -> ST s (MVector s (Identity a))

Monoid w => MonadAccum w (AccumT w Identity) 
Instance details

Defined in Control.Monad.Accum

Methods

look :: AccumT w Identity w

add :: w -> AccumT w Identity ()

accum :: (w -> (a, w)) -> AccumT w Identity a

MonadSelect r (SelectT r Identity) 
Instance details

Defined in Control.Monad.Select

Methods

select :: ((a -> r) -> a) -> SelectT r Identity a

Parsec a => Parsec (Identity a) 
Instance details

Defined in Distribution.Parsec

Methods

parsec :: CabalParsing m => m (Identity a)

Pretty a => Pretty (Identity a) 
Instance details

Defined in Distribution.Pretty

Methods

pretty :: Identity a -> Doc

prettyVersioned :: CabalSpecVersion -> Identity a -> Doc

FromJSON a => FromJSON (Identity a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Identity a)

parseJSONList :: Value -> Parser [Identity a]

omittedField :: Maybe (Identity a)

FromJSONKey a => FromJSONKey (Identity a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction (Identity a)

fromJSONKeyList :: FromJSONKeyFunction [Identity a]

ToJSON a => ToJSON (Identity a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Identity a -> Value

toEncoding :: Identity a -> Encoding

toJSONList :: [Identity a] -> Value

toEncodingList :: [Identity a] -> Encoding

omitField :: Identity a -> Bool

ToJSONKey a => ToJSONKey (Identity a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction (Identity a)

toJSONKeyList :: ToJSONKeyFunction [Identity a]

Data a => Data (Identity a) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Identity a -> c (Identity a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Identity a) #

toConstr :: Identity a -> Constr #

dataTypeOf :: Identity a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Identity a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Identity a)) #

gmapT :: (forall b. Data b => b -> b) -> Identity a -> Identity a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Identity a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Identity a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Identity a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Identity a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Identity a -> m (Identity a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Identity a -> m (Identity a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Identity a -> m (Identity a) #

IsString a => IsString (Identity a) 
Instance details

Defined in Data.String

Methods

fromString :: String -> Identity a #

Storable a => Storable (Identity a) 
Instance details

Defined in Data.Functor.Identity

Methods

sizeOf :: Identity a -> Int

alignment :: Identity a -> Int

peekElemOff :: Ptr (Identity a) -> Int -> IO (Identity a)

pokeElemOff :: Ptr (Identity a) -> Int -> Identity a -> IO ()

peekByteOff :: Ptr b -> Int -> IO (Identity a)

pokeByteOff :: Ptr b -> Int -> Identity a -> IO ()

peek :: Ptr (Identity a) -> IO (Identity a)

poke :: Ptr (Identity a) -> Identity a -> IO ()

Monoid a => Monoid (Identity a) 
Instance details

Defined in Data.Functor.Identity

Methods

mempty :: Identity a #

mappend :: Identity a -> Identity a -> Identity a #

mconcat :: [Identity a] -> Identity a #

Semigroup a => Semigroup (Identity a) 
Instance details

Defined in Data.Functor.Identity

Methods

(<>) :: Identity a -> Identity a -> Identity a #

sconcat :: NonEmpty (Identity a) -> Identity a

stimes :: Integral b => b -> Identity a -> Identity a

Bits a => Bits (Identity a) 
Instance details

Defined in Data.Functor.Identity

FiniteBits a => FiniteBits (Identity a) 
Instance details

Defined in Data.Functor.Identity

Bounded a => Bounded (Identity a) 
Instance details

Defined in Data.Functor.Identity

Enum a => Enum (Identity a) 
Instance details

Defined in Data.Functor.Identity

Floating a => Floating (Identity a) 
Instance details

Defined in Data.Functor.Identity

RealFloat a => RealFloat (Identity a) 
Instance details

Defined in Data.Functor.Identity

Generic (Identity a) 
Instance details

Defined in Data.Functor.Identity

Associated Types

type Rep (Identity a) 
Instance details

Defined in Data.Functor.Identity

type Rep (Identity a) = D1 ('MetaData "Identity" "Data.Functor.Identity" "base" 'True) (C1 ('MetaCons "Identity" 'PrefixI 'True) (S1 ('MetaSel ('Just "runIdentity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))

Methods

from :: Identity a -> Rep (Identity a) x

to :: Rep (Identity a) x -> Identity a

Ix a => Ix (Identity a) 
Instance details

Defined in Data.Functor.Identity

Num a => Num (Identity a) 
Instance details

Defined in Data.Functor.Identity

Read a => Read (Identity a) 
Instance details

Defined in Data.Functor.Identity

Methods

readsPrec :: Int -> ReadS (Identity a)

readList :: ReadS [Identity a]

readPrec :: ReadPrec (Identity a)

readListPrec :: ReadPrec [Identity a]

Fractional a => Fractional (Identity a) 
Instance details

Defined in Data.Functor.Identity

Integral a => Integral (Identity a) 
Instance details

Defined in Data.Functor.Identity

Real a => Real (Identity a) 
Instance details

Defined in Data.Functor.Identity

Methods

toRational :: Identity a -> Rational #

RealFrac a => RealFrac (Identity a) 
Instance details

Defined in Data.Functor.Identity

Methods

properFraction :: Integral b => Identity a -> (b, Identity a) #

truncate :: Integral b => Identity a -> b #

round :: Integral b => Identity a -> b #

ceiling :: Integral b => Identity a -> b #

floor :: Integral b => Identity a -> b #

Show a => Show (Identity a) 
Instance details

Defined in Data.Functor.Identity

Methods

showsPrec :: Int -> Identity a -> ShowS

show :: Identity a -> String #

showList :: [Identity a] -> ShowS

Binary a => Binary (Identity a) 
Instance details

Defined in Data.Binary.Class

Methods

put :: Identity a -> Put

get :: Get (Identity a)

putList :: [Identity a] -> Put

NFData a => NFData (Identity a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Identity a -> () #

GEnum a => GEnum (Identity a) 
Instance details

Defined in Generics.Deriving.Enum

Methods

genum :: [Identity a]

(GEq a, GEnum a, GIx a) => GIx (Identity a) 
Instance details

Defined in Generics.Deriving.Enum

Methods

range :: (Identity a, Identity a) -> [Identity a]

index :: (Identity a, Identity a) -> Identity a -> Int

inRange :: (Identity a, Identity a) -> Identity a -> Bool

GEq a => GEq (Identity a) 
Instance details

Defined in Generics.Deriving.Eq

Methods

geq :: Identity a -> Identity a -> Bool

GMonoid a => GMonoid (Identity a) 
Instance details

Defined in Generics.Deriving.Monoid.Internal

GShow a => GShow (Identity a) 
Instance details

Defined in Generics.Deriving.Show

Methods

gshowsPrec :: Int -> Identity a -> ShowS

gshows :: Identity a -> ShowS

gshow :: Identity a -> String

gshowList :: [Identity a] -> ShowS

Eq a => Eq (Identity a) 
Instance details

Defined in Data.Functor.Identity

Methods

(==) :: Identity a -> Identity a -> Bool #

(/=) :: Identity a -> Identity a -> Bool #

Ord a => Ord (Identity a) 
Instance details

Defined in Data.Functor.Identity

Methods

compare :: Identity a -> Identity a -> Ordering #

(<) :: Identity a -> Identity a -> Bool #

(<=) :: Identity a -> Identity a -> Bool #

(>) :: Identity a -> Identity a -> Bool #

(>=) :: Identity a -> Identity a -> Bool #

max :: Identity a -> Identity a -> Identity a #

min :: Identity a -> Identity a -> Identity a #

Hashable a => Hashable (Identity a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Identity a -> Int

hash :: Identity a -> Int

FromHttpApiData a => FromHttpApiData (Identity a) 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData a => ToHttpApiData (Identity a) 
Instance details

Defined in Web.Internal.HttpApiData

MonoFoldable (Identity a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (Identity a) -> m) -> Identity a -> m

ofoldr :: (Element (Identity a) -> b -> b) -> b -> Identity a -> b

ofoldl' :: (a0 -> Element (Identity a) -> a0) -> a0 -> Identity a -> a0

otoList :: Identity a -> [Element (Identity a)]

oall :: (Element (Identity a) -> Bool) -> Identity a -> Bool

oany :: (Element (Identity a) -> Bool) -> Identity a -> Bool

onull :: Identity a -> Bool

olength :: Identity a -> Int

olength64 :: Identity a -> Int64

ocompareLength :: Integral i => Identity a -> i -> Ordering

otraverse_ :: Applicative f => (Element (Identity a) -> f b) -> Identity a -> f ()

ofor_ :: Applicative f => Identity a -> (Element (Identity a) -> f b) -> f ()

omapM_ :: Applicative m => (Element (Identity a) -> m ()) -> Identity a -> m ()

oforM_ :: Applicative m => Identity a -> (Element (Identity a) -> m ()) -> m ()

ofoldlM :: Monad m => (a0 -> Element (Identity a) -> m a0) -> a0 -> Identity a -> m a0

ofoldMap1Ex :: Semigroup m => (Element (Identity a) -> m) -> Identity a -> m

ofoldr1Ex :: (Element (Identity a) -> Element (Identity a) -> Element (Identity a)) -> Identity a -> Element (Identity a)

ofoldl1Ex' :: (Element (Identity a) -> Element (Identity a) -> Element (Identity a)) -> Identity a -> Element (Identity a)

headEx :: Identity a -> Element (Identity a)

lastEx :: Identity a -> Element (Identity a)

unsafeHead :: Identity a -> Element (Identity a)

unsafeLast :: Identity a -> Element (Identity a)

maximumByEx :: (Element (Identity a) -> Element (Identity a) -> Ordering) -> Identity a -> Element (Identity a)

minimumByEx :: (Element (Identity a) -> Element (Identity a) -> Ordering) -> Identity a -> Element (Identity a)

oelem :: Element (Identity a) -> Identity a -> Bool

onotElem :: Element (Identity a) -> Identity a -> Bool

MonoFunctor (Identity a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Identity a) -> Element (Identity a)) -> Identity a -> Identity a

MonoPointed (Identity a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Identity a) -> Identity a

MonoTraversable (Identity a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (Identity a) -> f (Element (Identity a))) -> Identity a -> f (Identity a)

omapM :: Applicative m => (Element (Identity a) -> m (Element (Identity a))) -> Identity a -> m (Identity a)

Pretty a => Pretty (Identity a) 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Identity a -> Doc ann

prettyList :: [Identity a] -> Doc ann

Unbox a => Unbox (Identity a) 
Instance details

Defined in Data.Vector.Unboxed.Base

type Rep1 Identity 
Instance details

Defined in Data.Functor.Identity

type Rep1 Identity = D1 ('MetaData "Identity" "Data.Functor.Identity" "base" 'True) (C1 ('MetaCons "Identity" 'PrefixI 'True) (S1 ('MetaSel ('Just "runIdentity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1))
type StM Identity a 
Instance details

Defined in Control.Monad.Trans.Control

type StM Identity a = a
newtype MVector s (Identity a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s (Identity a) = MV_Identity (MVector s a)
type Rep (Identity a) 
Instance details

Defined in Data.Functor.Identity

type Rep (Identity a) = D1 ('MetaData "Identity" "Data.Functor.Identity" "base" 'True) (C1 ('MetaCons "Identity" 'PrefixI 'True) (S1 ('MetaSel ('Just "runIdentity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))
type Element (Identity a) 
Instance details

Defined in Data.MonoTraversable

type Element (Identity a) = a
newtype Vector (Identity a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector (Identity a) = V_Identity (Vector a)

newtype Down a #

Constructors

Down 

Fields

Instances

Instances details
FromJSON1 Down 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: Maybe a -> (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (Down a)

liftParseJSONList :: Maybe a -> (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [Down a]

liftOmittedField :: Maybe a -> Maybe (Down a)

ToJSON1 Down 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> Down a -> Value

liftToJSONList :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> [Down a] -> Value

liftToEncoding :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> Down a -> Encoding

liftToEncodingList :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> [Down a] -> Encoding

liftOmitField :: (a -> Bool) -> Down a -> Bool

MonadFix Down 
Instance details

Defined in Control.Monad.Fix

Methods

mfix :: (a -> Down a) -> Down a

MonadZip Down 
Instance details

Defined in Control.Monad.Zip

Methods

mzip :: Down a -> Down b -> Down (a, b)

mzipWith :: (a -> b -> c) -> Down a -> Down b -> Down c

munzip :: Down (a, b) -> (Down a, Down b)

Foldable Down 
Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Down m -> m #

foldMap :: Monoid m => (a -> m) -> Down a -> m #

foldMap' :: Monoid m => (a -> m) -> Down a -> m

foldr :: (a -> b -> b) -> b -> Down a -> b #

foldr' :: (a -> b -> b) -> b -> Down a -> b #

foldl :: (b -> a -> b) -> b -> Down a -> b

foldl' :: (b -> a -> b) -> b -> Down a -> b #

foldr1 :: (a -> a -> a) -> Down a -> a

foldl1 :: (a -> a -> a) -> Down a -> a

toList :: Down a -> [a] #

null :: Down a -> Bool #

length :: Down a -> Int #

elem :: Eq a => a -> Down a -> Bool #

maximum :: Ord a => Down a -> a

minimum :: Ord a => Down a -> a

sum :: Num a => Down a -> a #

product :: Num a => Down a -> a #

Foldable1 Down 
Instance details

Defined in Data.Foldable1

Methods

fold1 :: Semigroup m => Down m -> m

foldMap1 :: Semigroup m => (a -> m) -> Down a -> m

foldMap1' :: Semigroup m => (a -> m) -> Down a -> m

toNonEmpty :: Down a -> NonEmpty a

maximum :: Ord a => Down a -> a

minimum :: Ord a => Down a -> a

head :: Down a -> a

last :: Down a -> a

foldrMap1 :: (a -> b) -> (a -> b -> b) -> Down a -> b

foldlMap1' :: (a -> b) -> (b -> a -> b) -> Down a -> b

foldlMap1 :: (a -> b) -> (b -> a -> b) -> Down a -> b

foldrMap1' :: (a -> b) -> (a -> b -> b) -> Down a -> b

Eq1 Down 
Instance details

Defined in Data.Functor.Classes

Methods

liftEq :: (a -> b -> Bool) -> Down a -> Down b -> Bool

Ord1 Down 
Instance details

Defined in Data.Functor.Classes

Methods

liftCompare :: (a -> b -> Ordering) -> Down a -> Down b -> Ordering

Read1 Down 
Instance details

Defined in Data.Functor.Classes

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (Down a)

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [Down a]

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (Down a)

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [Down a]

Show1 Down 
Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Down a -> ShowS

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Down a] -> ShowS

Traversable Down 
Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Down a -> f (Down b) #

sequenceA :: Applicative f => Down (f a) -> f (Down a) #

mapM :: Monad m => (a -> m b) -> Down a -> m (Down b) #

sequence :: Monad m => Down (m a) -> m (Down a) #

Applicative Down 
Instance details

Defined in 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 #

Functor Down 
Instance details

Defined in Data.Ord

Methods

fmap :: (a -> b) -> Down a -> Down b #

(<$) :: a -> Down b -> Down a #

Monad Down 
Instance details

Defined in Data.Ord

Methods

(>>=) :: Down a -> (a -> Down b) -> Down b #

(>>) :: Down a -> Down b -> Down b #

return :: a -> Down a #

NFData1 Down 
Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> Down a -> ()

GCopoint Down 
Instance details

Defined in Generics.Deriving.Copoint

Methods

gcopoint :: Down a -> a

GFoldable Down 
Instance details

Defined in Generics.Deriving.Foldable

Methods

gfoldMap :: Monoid m => (a -> m) -> Down a -> m

gfold :: Monoid m => Down m -> m

gfoldr :: (a -> b -> b) -> b -> Down a -> b

gfoldr' :: (a -> b -> b) -> b -> Down a -> b

gfoldl :: (a -> b -> a) -> a -> Down b -> a

gfoldl' :: (a -> b -> a) -> a -> Down b -> a

gfoldr1 :: (a -> a -> a) -> Down a -> a

gfoldl1 :: (a -> a -> a) -> Down a -> a

GFunctor Down 
Instance details

Defined in Generics.Deriving.Functor

Methods

gmap :: (a -> b) -> Down a -> Down b

GTraversable Down 
Instance details

Defined in Generics.Deriving.Traversable

Methods

gtraverse :: Applicative f => (a -> f b) -> Down a -> f (Down b)

gsequenceA :: Applicative f => Down (f a) -> f (Down a)

gmapM :: Monad m => (a -> m b) -> Down a -> m (Down b)

gsequence :: Monad m => Down (m a) -> m (Down a)

Generic1 Down 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 Down 
Instance details

Defined in GHC.Generics

type Rep1 Down = D1 ('MetaData "Down" "Data.Ord" "base" 'True) (C1 ('MetaCons "Down" 'PrefixI 'True) (S1 ('MetaSel ('Just "getDown") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1))

Methods

from1 :: Down a -> Rep1 Down a

to1 :: Rep1 Down a -> Down a

Unbox a => Vector Vector (Down a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: Mutable Vector s (Down a) -> ST s (Vector (Down a))

basicUnsafeThaw :: Vector (Down a) -> ST s (Mutable Vector s (Down a))

basicLength :: Vector (Down a) -> Int

basicUnsafeSlice :: Int -> Int -> Vector (Down a) -> Vector (Down a)

basicUnsafeIndexM :: Vector (Down a) -> Int -> Box (Down a)

basicUnsafeCopy :: Mutable Vector s (Down a) -> Vector (Down a) -> ST s ()

elemseq :: Vector (Down a) -> Down a -> b -> b

Unbox a => MVector MVector (Down a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s (Down a) -> Int

basicUnsafeSlice :: Int -> Int -> MVector s (Down a) -> MVector s (Down a)

basicOverlaps :: MVector s (Down a) -> MVector s (Down a) -> Bool

basicUnsafeNew :: Int -> ST s (MVector s (Down a))

basicInitialize :: MVector s (Down a) -> ST s ()

basicUnsafeReplicate :: Int -> Down a -> ST s (MVector s (Down a))

basicUnsafeRead :: MVector s (Down a) -> Int -> ST s (Down a)

basicUnsafeWrite :: MVector s (Down a) -> Int -> Down a -> ST s ()

basicClear :: MVector s (Down a) -> ST s ()

basicSet :: MVector s (Down a) -> Down a -> ST s ()

basicUnsafeCopy :: MVector s (Down a) -> MVector s (Down a) -> ST s ()

basicUnsafeMove :: MVector s (Down a) -> MVector s (Down a) -> ST s ()

basicUnsafeGrow :: MVector s (Down a) -> Int -> ST s (MVector s (Down a))

FromJSON a => FromJSON (Down a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Down a)

parseJSONList :: Value -> Parser [Down a]

omittedField :: Maybe (Down a)

ToJSON a => ToJSON (Down a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Down a -> Value

toEncoding :: Down a -> Encoding

toJSONList :: [Down a] -> Value

toEncodingList :: [Down a] -> Encoding

omitField :: Down a -> Bool

Data a => Data (Down a) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Down a -> c (Down a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Down a) #

toConstr :: Down a -> Constr #

dataTypeOf :: Down a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Down a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Down a)) #

gmapT :: (forall b. Data b => b -> b) -> Down a -> Down a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Down a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Down a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Down a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Down a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Down a -> m (Down a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Down a -> m (Down a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Down a -> m (Down a) #

Storable a => Storable (Down a) 
Instance details

Defined in Data.Ord

Methods

sizeOf :: Down a -> Int

alignment :: Down a -> Int

peekElemOff :: Ptr (Down a) -> Int -> IO (Down a)

pokeElemOff :: Ptr (Down a) -> Int -> Down a -> IO ()

peekByteOff :: Ptr b -> Int -> IO (Down a)

pokeByteOff :: Ptr b -> Int -> Down a -> IO ()

peek :: Ptr (Down a) -> IO (Down a)

poke :: Ptr (Down a) -> Down a -> IO ()

Monoid a => Monoid (Down a) 
Instance details

Defined in Data.Ord

Methods

mempty :: Down a #

mappend :: Down a -> Down a -> Down a #

mconcat :: [Down a] -> Down a #

Semigroup a => Semigroup (Down a) 
Instance details

Defined in Data.Ord

Methods

(<>) :: Down a -> Down a -> Down a #

sconcat :: NonEmpty (Down a) -> Down a

stimes :: Integral b => b -> Down a -> Down a

Bits a => Bits (Down a) 
Instance details

Defined in Data.Ord

Methods

(.&.) :: Down a -> Down a -> Down a

(.|.) :: Down a -> Down a -> Down a

xor :: Down a -> Down a -> Down a

complement :: Down a -> Down a

shift :: Down a -> Int -> Down a

rotate :: Down a -> Int -> Down a

zeroBits :: Down a

bit :: Int -> Down a

setBit :: Down a -> Int -> Down a

clearBit :: Down a -> Int -> Down a

complementBit :: Down a -> Int -> Down a

testBit :: Down a -> Int -> Bool

bitSizeMaybe :: Down a -> Maybe Int

bitSize :: Down a -> Int

isSigned :: Down a -> Bool

shiftL :: Down a -> Int -> Down a

unsafeShiftL :: Down a -> Int -> Down a

shiftR :: Down a -> Int -> Down a

unsafeShiftR :: Down a -> Int -> Down a

rotateL :: Down a -> Int -> Down a

rotateR :: Down a -> Int -> Down a

popCount :: Down a -> Int

FiniteBits a => FiniteBits (Down a) 
Instance details

Defined in Data.Ord

Bounded a => Bounded (Down a) 
Instance details

Defined in Data.Ord

Methods

minBound :: Down a #

maxBound :: Down a #

(Enum a, Bounded a, Eq a) => Enum (Down a) 
Instance details

Defined in 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]

Floating a => Floating (Down a) 
Instance details

Defined in Data.Ord

Methods

pi :: Down a #

exp :: Down a -> Down a #

log :: Down a -> Down a #

sqrt :: Down a -> Down a #

(**) :: Down a -> Down a -> Down a #

logBase :: Down a -> Down a -> Down a #

sin :: Down a -> Down a #

cos :: Down a -> Down a #

tan :: Down a -> Down a #

asin :: Down a -> Down a #

acos :: Down a -> Down a #

atan :: Down a -> Down a #

sinh :: Down a -> Down a #

cosh :: Down a -> Down a #

tanh :: Down a -> Down a #

asinh :: Down a -> Down a #

acosh :: Down a -> Down a #

atanh :: Down a -> Down a #

log1p :: Down a -> Down a

expm1 :: Down a -> Down a

log1pexp :: Down a -> Down a

log1mexp :: Down a -> Down a

RealFloat a => RealFloat (Down a) 
Instance details

Defined in Data.Ord

Generic (Down a) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Down a) 
Instance details

Defined in GHC.Generics

type Rep (Down a) = D1 ('MetaData "Down" "Data.Ord" "base" 'True) (C1 ('MetaCons "Down" 'PrefixI 'True) (S1 ('MetaSel ('Just "getDown") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))

Methods

from :: Down a -> Rep (Down a) x

to :: Rep (Down a) x -> Down a

Ix a => Ix (Down a) 
Instance details

Defined in Data.Ord

Methods

range :: (Down a, Down a) -> [Down a]

index :: (Down a, Down a) -> Down a -> Int

unsafeIndex :: (Down a, Down a) -> Down a -> Int

inRange :: (Down a, Down a) -> Down a -> Bool

rangeSize :: (Down a, Down a) -> Int

unsafeRangeSize :: (Down a, Down a) -> Int

Num a => Num (Down a) 
Instance details

Defined in 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 #

Read a => Read (Down a) 
Instance details

Defined in Data.Ord

Methods

readsPrec :: Int -> ReadS (Down a)

readList :: ReadS [Down a]

readPrec :: ReadPrec (Down a)

readListPrec :: ReadPrec [Down a]

Fractional a => Fractional (Down a) 
Instance details

Defined in Data.Ord

Methods

(/) :: Down a -> Down a -> Down a #

recip :: Down a -> Down a #

fromRational :: Rational -> Down a #

Real a => Real (Down a) 
Instance details

Defined in Data.Ord

Methods

toRational :: Down a -> Rational #

RealFrac a => RealFrac (Down a) 
Instance details

Defined in Data.Ord

Methods

properFraction :: Integral b => Down a -> (b, Down a) #

truncate :: Integral b => Down a -> b #

round :: Integral b => Down a -> b #

ceiling :: Integral b => Down a -> b #

floor :: Integral b => Down a -> b #

Show a => Show (Down a) 
Instance details

Defined in Data.Ord

Methods

showsPrec :: Int -> Down a -> ShowS

show :: Down a -> String #

showList :: [Down a] -> ShowS

NFData a => NFData (Down a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Down a -> () #

GEq a => GEq (Down a) 
Instance details

Defined in Generics.Deriving.Eq

Methods

geq :: Down a -> Down a -> Bool

GMonoid a => GMonoid (Down a) 
Instance details

Defined in Generics.Deriving.Monoid.Internal

Methods

gmempty :: Down a

gmappend :: Down a -> Down a -> Down a

gmconcat :: [Down a] -> Down a

GShow a => GShow (Down a) 
Instance details

Defined in Generics.Deriving.Show

Methods

gshowsPrec :: Int -> Down a -> ShowS

gshows :: Down a -> ShowS

gshow :: Down a -> String

gshowList :: [Down a] -> ShowS

Eq a => Eq (Down a) 
Instance details

Defined in Data.Ord

Methods

(==) :: Down a -> Down a -> Bool #

(/=) :: Down a -> Down a -> Bool #

Ord a => Ord (Down a) 
Instance details

Defined in Data.Ord

Methods

compare :: Down a -> Down a -> Ordering #

(<) :: Down a -> Down a -> Bool #

(<=) :: Down a -> Down a -> Bool #

(>) :: Down a -> Down a -> Bool #

(>=) :: Down a -> Down a -> Bool #

max :: Down a -> Down a -> Down a #

min :: Down a -> Down a -> Down a #

Unbox a => Unbox (Down a) 
Instance details

Defined in Data.Vector.Unboxed.Base

type Rep1 Down 
Instance details

Defined in GHC.Generics

type Rep1 Down = D1 ('MetaData "Down" "Data.Ord" "base" 'True) (C1 ('MetaCons "Down" 'PrefixI 'True) (S1 ('MetaSel ('Just "getDown") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1))
newtype MVector s (Down a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s (Down a) = MV_Down (MVector s a)
type Rep (Down a) 
Instance details

Defined in GHC.Generics

type Rep (Down a) = D1 ('MetaData "Down" "Data.Ord" "base" 'True) (C1 ('MetaCons "Down" 'PrefixI 'True) (S1 ('MetaSel ('Just "getDown") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))
newtype Vector (Down a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector (Down a) = V_Down (Vector a)

data Proxy (t :: k) #

Constructors

Proxy 

Instances

Instances details
Generic1 (Proxy :: k -> Type) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 (Proxy :: k -> Type) 
Instance details

Defined in GHC.Generics

type Rep1 (Proxy :: k -> Type) = D1 ('MetaData "Proxy" "Data.Proxy" "base" 'False) (C1 ('MetaCons "Proxy" 'PrefixI 'False) (U1 :: k -> Type))

Methods

from1 :: forall (a :: k). Proxy a -> Rep1 (Proxy :: k -> Type) a

to1 :: forall (a :: k). Rep1 (Proxy :: k -> Type) a -> Proxy a

FromJSON1 (Proxy :: Type -> Type) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: Maybe a -> (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (Proxy a)

liftParseJSONList :: Maybe a -> (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [Proxy a]

liftOmittedField :: Maybe a -> Maybe (Proxy a)

ToJSON1 (Proxy :: Type -> Type) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> Proxy a -> Value

liftToJSONList :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> [Proxy a] -> Value

liftToEncoding :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> Proxy a -> Encoding

liftToEncodingList :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> [Proxy a] -> Encoding

liftOmitField :: (a -> Bool) -> Proxy a -> Bool

MonadZip (Proxy :: Type -> Type) 
Instance details

Defined in Control.Monad.Zip

Methods

mzip :: Proxy a -> Proxy b -> Proxy (a, b)

mzipWith :: (a -> b -> c) -> Proxy a -> Proxy b -> Proxy c

munzip :: Proxy (a, b) -> (Proxy a, Proxy b)

Foldable (Proxy :: Type -> Type) 
Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Proxy m -> m #

foldMap :: Monoid m => (a -> m) -> Proxy a -> m #

foldMap' :: Monoid m => (a -> m) -> Proxy a -> m

foldr :: (a -> b -> b) -> b -> Proxy a -> b #

foldr' :: (a -> b -> b) -> b -> Proxy a -> b #

foldl :: (b -> a -> b) -> b -> Proxy a -> b

foldl' :: (b -> a -> b) -> b -> Proxy a -> b #

foldr1 :: (a -> a -> a) -> Proxy a -> a

foldl1 :: (a -> a -> a) -> Proxy a -> a

toList :: Proxy a -> [a] #

null :: Proxy a -> Bool #

length :: Proxy a -> Int #

elem :: Eq a => a -> Proxy a -> Bool #

maximum :: Ord a => Proxy a -> a

minimum :: Ord a => Proxy a -> a

sum :: Num a => Proxy a -> a #

product :: Num a => Proxy a -> a #

Eq1 (Proxy :: Type -> Type) 
Instance details

Defined in Data.Functor.Classes

Methods

liftEq :: (a -> b -> Bool) -> Proxy a -> Proxy b -> Bool

Ord1 (Proxy :: Type -> Type) 
Instance details

Defined in Data.Functor.Classes

Methods

liftCompare :: (a -> b -> Ordering) -> Proxy a -> Proxy b -> Ordering

Read1 (Proxy :: Type -> Type) 
Instance details

Defined in Data.Functor.Classes

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (Proxy a)

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [Proxy a]

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (Proxy a)

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [Proxy a]

Show1 (Proxy :: Type -> Type) 
Instance details

Defined in Data.Functor.Classes

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Proxy a -> ShowS

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Proxy a] -> ShowS

Contravariant (Proxy :: Type -> Type) 
Instance details

Defined in Data.Functor.Contravariant

Methods

contramap :: (a' -> a) -> Proxy a -> Proxy a'

(>$) :: b -> Proxy b -> Proxy a

Traversable (Proxy :: Type -> Type) 
Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Proxy a -> f (Proxy b) #

sequenceA :: Applicative f => Proxy (f a) -> f (Proxy a) #

mapM :: Monad m => (a -> m b) -> Proxy a -> m (Proxy b) #

sequence :: Monad m => Proxy (m a) -> m (Proxy a) #

Alternative (Proxy :: Type -> Type) 
Instance details

Defined in Data.Proxy

Methods

empty :: Proxy a

(<|>) :: Proxy a -> Proxy a -> Proxy a #

some :: Proxy a -> Proxy [a] #

many :: Proxy a -> Proxy [a] #

Applicative (Proxy :: Type -> Type) 
Instance details

Defined in 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 #

Functor (Proxy :: Type -> Type) 
Instance details

Defined in Data.Proxy

Methods

fmap :: (a -> b) -> Proxy a -> Proxy b #

(<$) :: a -> Proxy b -> Proxy a #

Monad (Proxy :: Type -> Type) 
Instance details

Defined in Data.Proxy

Methods

(>>=) :: Proxy a -> (a -> Proxy b) -> Proxy b #

(>>) :: Proxy a -> Proxy b -> Proxy b #

return :: a -> Proxy a #

MonadPlus (Proxy :: Type -> Type) 
Instance details

Defined in Data.Proxy

Methods

mzero :: Proxy a #

mplus :: Proxy a -> Proxy a -> Proxy a #

NFData1 (Proxy :: Type -> Type) 
Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> Proxy a -> ()

GFoldable (Proxy :: Type -> Type) 
Instance details

Defined in Generics.Deriving.Foldable

Methods

gfoldMap :: Monoid m => (a -> m) -> Proxy a -> m

gfold :: Monoid m => Proxy m -> m

gfoldr :: (a -> b -> b) -> b -> Proxy a -> b

gfoldr' :: (a -> b -> b) -> b -> Proxy a -> b

gfoldl :: (a -> b -> a) -> a -> Proxy b -> a

gfoldl' :: (a -> b -> a) -> a -> Proxy b -> a

gfoldr1 :: (a -> a -> a) -> Proxy a -> a

gfoldl1 :: (a -> a -> a) -> Proxy a -> a

GFunctor (Proxy :: Type -> Type) 
Instance details

Defined in Generics.Deriving.Functor

Methods

gmap :: (a -> b) -> Proxy a -> Proxy b

GTraversable (Proxy :: Type -> Type) 
Instance details

Defined in Generics.Deriving.Traversable

Methods

gtraverse :: Applicative f => (a -> f b) -> Proxy a -> f (Proxy b)

gsequenceA :: Applicative f => Proxy (f a) -> f (Proxy a)

gmapM :: Monad m => (a -> m b) -> Proxy a -> m (Proxy b)

gsequence :: Monad m => Proxy (m a) -> m (Proxy a)

Hashable1 (Proxy :: Type -> Type) 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> Proxy a -> Int

FromJSON (Proxy a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Proxy a)

parseJSONList :: Value -> Parser [Proxy a]

omittedField :: Maybe (Proxy a)

ToJSON (Proxy a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Proxy a -> Value

toEncoding :: Proxy a -> Encoding

toJSONList :: [Proxy a] -> Value

toEncodingList :: [Proxy a] -> Encoding

omitField :: Proxy a -> Bool

Data t => Data (Proxy t) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Proxy t -> c (Proxy t) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Proxy t) #

toConstr :: Proxy t -> Constr #

dataTypeOf :: Proxy t -> DataType #

dataCast1 :: Typeable t0 => (forall d. Data d => c (t0 d)) -> Maybe (c (Proxy t)) #

dataCast2 :: Typeable t0 => (forall d e. (Data d, Data e) => c (t0 d e)) -> Maybe (c (Proxy t)) #

gmapT :: (forall b. Data b => b -> b) -> Proxy t -> Proxy t #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Proxy t -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Proxy t -> r #

gmapQ :: (forall d. Data d => d -> u) -> Proxy t -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Proxy t -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Proxy t -> m (Proxy t) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Proxy t -> m (Proxy t) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Proxy t -> m (Proxy t) #

Monoid (Proxy s) 
Instance details

Defined in Data.Proxy

Methods

mempty :: Proxy s #

mappend :: Proxy s -> Proxy s -> Proxy s #

mconcat :: [Proxy s] -> Proxy s #

Semigroup (Proxy s) 
Instance details

Defined in Data.Proxy

Methods

(<>) :: Proxy s -> Proxy s -> Proxy s #

sconcat :: NonEmpty (Proxy s) -> Proxy s

stimes :: Integral b => b -> Proxy s -> Proxy s

Bounded (Proxy t) 
Instance details

Defined in Data.Proxy

Methods

minBound :: Proxy t #

maxBound :: Proxy t #

Enum (Proxy s) 
Instance details

Defined in 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]

Generic (Proxy t) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Proxy t) 
Instance details

Defined in GHC.Generics

type Rep (Proxy t) = D1 ('MetaData "Proxy" "Data.Proxy" "base" 'False) (C1 ('MetaCons "Proxy" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: Proxy t -> Rep (Proxy t) x

to :: Rep (Proxy t) x -> Proxy t

Ix (Proxy s) 
Instance details

Defined in Data.Proxy

Methods

range :: (Proxy s, Proxy s) -> [Proxy s]

index :: (Proxy s, Proxy s) -> Proxy s -> Int

unsafeIndex :: (Proxy s, Proxy s) -> Proxy s -> Int

inRange :: (Proxy s, Proxy s) -> Proxy s -> Bool

rangeSize :: (Proxy s, Proxy s) -> Int

unsafeRangeSize :: (Proxy s, Proxy s) -> Int

Read (Proxy t) 
Instance details

Defined in Data.Proxy

Methods

readsPrec :: Int -> ReadS (Proxy t)

readList :: ReadS [Proxy t]

readPrec :: ReadPrec (Proxy t)

readListPrec :: ReadPrec [Proxy t]

Show (Proxy s) 
Instance details

Defined in Data.Proxy

Methods

showsPrec :: Int -> Proxy s -> ShowS

show :: Proxy s -> String #

showList :: [Proxy s] -> ShowS

NFData (Proxy a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Proxy a -> () #

GEnum (Proxy s) 
Instance details

Defined in Generics.Deriving.Enum

Methods

genum :: [Proxy s]

GIx (Proxy s) 
Instance details

Defined in Generics.Deriving.Enum

Methods

range :: (Proxy s, Proxy s) -> [Proxy s]

index :: (Proxy s, Proxy s) -> Proxy s -> Int

inRange :: (Proxy s, Proxy s) -> Proxy s -> Bool

GEq (Proxy s) 
Instance details

Defined in Generics.Deriving.Eq

Methods

geq :: Proxy s -> Proxy s -> Bool

GMonoid (Proxy s) 
Instance details

Defined in Generics.Deriving.Monoid.Internal

Methods

gmempty :: Proxy s

gmappend :: Proxy s -> Proxy s -> Proxy s

gmconcat :: [Proxy s] -> Proxy s

GShow (Proxy s) 
Instance details

Defined in Generics.Deriving.Show

Methods

gshowsPrec :: Int -> Proxy s -> ShowS

gshows :: Proxy s -> ShowS

gshow :: Proxy s -> String

gshowList :: [Proxy s] -> ShowS

Eq (Proxy s) 
Instance details

Defined in Data.Proxy

Methods

(==) :: Proxy s -> Proxy s -> Bool #

(/=) :: Proxy s -> Proxy s -> Bool #

Ord (Proxy s) 
Instance details

Defined in Data.Proxy

Methods

compare :: Proxy s -> Proxy s -> Ordering #

(<) :: Proxy s -> Proxy s -> Bool #

(<=) :: Proxy s -> Proxy s -> Bool #

(>) :: Proxy s -> Proxy s -> Bool #

(>=) :: Proxy s -> Proxy s -> Bool #

max :: Proxy s -> Proxy s -> Proxy s #

min :: Proxy s -> Proxy s -> Proxy s #

Hashable (Proxy a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Proxy a -> Int

hash :: Proxy a -> Int

MonoFoldable (Proxy a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (Proxy a) -> m) -> Proxy a -> m

ofoldr :: (Element (Proxy a) -> b -> b) -> b -> Proxy a -> b

ofoldl' :: (a0 -> Element (Proxy a) -> a0) -> a0 -> Proxy a -> a0

otoList :: Proxy a -> [Element (Proxy a)]

oall :: (Element (Proxy a) -> Bool) -> Proxy a -> Bool

oany :: (Element (Proxy a) -> Bool) -> Proxy a -> Bool

onull :: Proxy a -> Bool

olength :: Proxy a -> Int

olength64 :: Proxy a -> Int64

ocompareLength :: Integral i => Proxy a -> i -> Ordering

otraverse_ :: Applicative f => (Element (Proxy a) -> f b) -> Proxy a -> f ()

ofor_ :: Applicative f => Proxy a -> (Element (Proxy a) -> f b) -> f ()

omapM_ :: Applicative m => (Element (Proxy a) -> m ()) -> Proxy a -> m ()

oforM_ :: Applicative m => Proxy a -> (Element (Proxy a) -> m ()) -> m ()

ofoldlM :: Monad m => (a0 -> Element (Proxy a) -> m a0) -> a0 -> Proxy a -> m a0

ofoldMap1Ex :: Semigroup m => (Element (Proxy a) -> m) -> Proxy a -> m

ofoldr1Ex :: (Element (Proxy a) -> Element (Proxy a) -> Element (Proxy a)) -> Proxy a -> Element (Proxy a)

ofoldl1Ex' :: (Element (Proxy a) -> Element (Proxy a) -> Element (Proxy a)) -> Proxy a -> Element (Proxy a)

headEx :: Proxy a -> Element (Proxy a)

lastEx :: Proxy a -> Element (Proxy a)

unsafeHead :: Proxy a -> Element (Proxy a)

unsafeLast :: Proxy a -> Element (Proxy a)

maximumByEx :: (Element (Proxy a) -> Element (Proxy a) -> Ordering) -> Proxy a -> Element (Proxy a)

minimumByEx :: (Element (Proxy a) -> Element (Proxy a) -> Ordering) -> Proxy a -> Element (Proxy a)

oelem :: Element (Proxy a) -> Proxy a -> Bool

onotElem :: Element (Proxy a) -> Proxy a -> Bool

MonoFunctor (Proxy a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Proxy a) -> Element (Proxy a)) -> Proxy a -> Proxy a

MonoPointed (Proxy a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Proxy a) -> Proxy a

MonoTraversable (Proxy a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (Proxy a) -> f (Element (Proxy a))) -> Proxy a -> f (Proxy a)

omapM :: Applicative m => (Element (Proxy a) -> m (Element (Proxy a))) -> Proxy a -> m (Proxy a)

type Rep1 (Proxy :: k -> Type) 
Instance details

Defined in GHC.Generics

type Rep1 (Proxy :: k -> Type) = D1 ('MetaData "Proxy" "Data.Proxy" "base" 'False) (C1 ('MetaCons "Proxy" 'PrefixI 'False) (U1 :: k -> Type))
type Rep (Proxy t) 
Instance details

Defined in GHC.Generics

type Rep (Proxy t) = D1 ('MetaData "Proxy" "Data.Proxy" "base" 'False) (C1 ('MetaCons "Proxy" 'PrefixI 'False) (U1 :: Type -> Type))
type Element (Proxy a) 
Instance details

Defined in Data.MonoTraversable

type Element (Proxy a) = a

newtype First a #

Constructors

First 

Fields

Instances

Instances details
FromJSON1 First 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: Maybe a -> (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (First a)

liftParseJSONList :: Maybe a -> (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [First a]

liftOmittedField :: Maybe a -> Maybe (First a)

ToJSON1 First 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> First a -> Value

liftToJSONList :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> [First a] -> Value

liftToEncoding :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> First a -> Encoding

liftToEncodingList :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> [First a] -> Encoding

liftOmitField :: (a -> Bool) -> First a -> Bool

MonadFix First 
Instance details

Defined in Control.Monad.Fix

Methods

mfix :: (a -> First a) -> First a

MonadZip First 
Instance details

Defined in Control.Monad.Zip

Methods

mzip :: First a -> First b -> First (a, b)

mzipWith :: (a -> b -> c) -> First a -> First b -> First c

munzip :: First (a, b) -> (First a, First b)

Foldable First 
Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => First m -> m #

foldMap :: Monoid m => (a -> m) -> First a -> m #

foldMap' :: Monoid m => (a -> m) -> First a -> m

foldr :: (a -> b -> b) -> b -> First a -> b #

foldr' :: (a -> b -> b) -> b -> First a -> b #

foldl :: (b -> a -> b) -> b -> First a -> b

foldl' :: (b -> a -> b) -> b -> First a -> b #

foldr1 :: (a -> a -> a) -> First a -> a

foldl1 :: (a -> a -> a) -> First a -> a

toList :: First a -> [a] #

null :: First a -> Bool #

length :: First a -> Int #

elem :: Eq a => a -> First a -> Bool #

maximum :: Ord a => First a -> a

minimum :: Ord a => First a -> a

sum :: Num a => First a -> a #

product :: Num a => First a -> a #

Traversable First 
Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> First a -> f (First b) #

sequenceA :: Applicative f => First (f a) -> f (First a) #

mapM :: Monad m => (a -> m b) -> First a -> m (First b) #

sequence :: Monad m => First (m a) -> m (First a) #

Applicative First 
Instance details

Defined in 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 #

Functor First 
Instance details

Defined in Data.Monoid

Methods

fmap :: (a -> b) -> First a -> First b #

(<$) :: a -> First b -> First a #

Monad First 
Instance details

Defined in Data.Monoid

Methods

(>>=) :: First a -> (a -> First b) -> First b #

(>>) :: First a -> First b -> First b #

return :: a -> First a #

NFData1 First 
Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> First a -> ()

GFoldable First 
Instance details

Defined in Generics.Deriving.Foldable

Methods

gfoldMap :: Monoid m => (a -> m) -> First a -> m

gfold :: Monoid m => First m -> m

gfoldr :: (a -> b -> b) -> b -> First a -> b

gfoldr' :: (a -> b -> b) -> b -> First a -> b

gfoldl :: (a -> b -> a) -> a -> First b -> a

gfoldl' :: (a -> b -> a) -> a -> First b -> a

gfoldr1 :: (a -> a -> a) -> First a -> a

gfoldl1 :: (a -> a -> a) -> First a -> a

GFunctor First 
Instance details

Defined in Generics.Deriving.Functor

Methods

gmap :: (a -> b) -> First a -> First b

GTraversable First 
Instance details

Defined in Generics.Deriving.Traversable

Methods

gtraverse :: Applicative f => (a -> f b) -> First a -> f (First b)

gsequenceA :: Applicative f => First (f a) -> f (First a)

gmapM :: Monad m => (a -> m b) -> First a -> m (First b)

gsequence :: Monad m => First (m a) -> m (First a)

Generic1 First 
Instance details

Defined in Data.Monoid

Associated Types

type Rep1 First 
Instance details

Defined in Data.Monoid

type Rep1 First = D1 ('MetaData "First" "Data.Monoid" "base" 'True) (C1 ('MetaCons "First" 'PrefixI 'True) (S1 ('MetaSel ('Just "getFirst") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Maybe)))

Methods

from1 :: First a -> Rep1 First a

to1 :: Rep1 First a -> First a

FromJSON a => FromJSON (First a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (First a)

parseJSONList :: Value -> Parser [First a]

omittedField :: Maybe (First a)

ToJSON a => ToJSON (First a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: First a -> Value

toEncoding :: First a -> Encoding

toJSONList :: [First a] -> Value

toEncodingList :: [First a] -> Encoding

omitField :: First a -> Bool

Data a => Data (First a) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> First a -> c (First a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (First a) #

toConstr :: First a -> Constr #

dataTypeOf :: First a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (First a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (First a)) #

gmapT :: (forall b. Data b => b -> b) -> First a -> First a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> First a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> First a -> r #

gmapQ :: (forall d. Data d => d -> u) -> First a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> First a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> First a -> m (First a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> First a -> m (First a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> First a -> m (First a) #

Monoid (First a) 
Instance details

Defined in Data.Monoid

Methods

mempty :: First a #

mappend :: First a -> First a -> First a #

mconcat :: [First a] -> First a #

Semigroup (First a) 
Instance details

Defined in Data.Monoid

Methods

(<>) :: First a -> First a -> First a #

sconcat :: NonEmpty (First a) -> First a

stimes :: Integral b => b -> First a -> First a

Generic (First a) 
Instance details

Defined in Data.Monoid

Associated Types

type Rep (First a) 
Instance details

Defined in Data.Monoid

type Rep (First a) = D1 ('MetaData "First" "Data.Monoid" "base" 'True) (C1 ('MetaCons "First" 'PrefixI 'True) (S1 ('MetaSel ('Just "getFirst") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe a))))

Methods

from :: First a -> Rep (First a) x

to :: Rep (First a) x -> First a

Read a => Read (First a) 
Instance details

Defined in Data.Monoid

Methods

readsPrec :: Int -> ReadS (First a)

readList :: ReadS [First a]

readPrec :: ReadPrec (First a)

readListPrec :: ReadPrec [First a]

Show a => Show (First a) 
Instance details

Defined in Data.Monoid

Methods

showsPrec :: Int -> First a -> ShowS

show :: First a -> String #

showList :: [First a] -> ShowS

Binary a => Binary (First a) 
Instance details

Defined in Data.Binary.Class

Methods

put :: First a -> Put

get :: Get (First a)

putList :: [First a] -> Put

NFData a => NFData (First a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: First a -> () #

GEnum a => GEnum (First a) 
Instance details

Defined in Generics.Deriving.Enum

Methods

genum :: [First a]

(GEq a, GEnum a, GIx a) => GIx (First a) 
Instance details

Defined in Generics.Deriving.Enum

Methods

range :: (First a, First a) -> [First a]

index :: (First a, First a) -> First a -> Int

inRange :: (First a, First a) -> First a -> Bool

GEq a => GEq (First a) 
Instance details

Defined in Generics.Deriving.Eq

Methods

geq :: First a -> First a -> Bool

GMonoid (First a) 
Instance details

Defined in Generics.Deriving.Monoid.Internal

Methods

gmempty :: First a

gmappend :: First a -> First a -> First a

gmconcat :: [First a] -> First a

GShow a => GShow (First a) 
Instance details

Defined in Generics.Deriving.Show

Methods

gshowsPrec :: Int -> First a -> ShowS

gshows :: First a -> ShowS

gshow :: First a -> String

gshowList :: [First a] -> ShowS

Eq a => Eq (First a) 
Instance details

Defined in Data.Monoid

Methods

(==) :: First a -> First a -> Bool #

(/=) :: First a -> First a -> Bool #

Ord a => Ord (First a) 
Instance details

Defined in Data.Monoid

Methods

compare :: First a -> First a -> Ordering #

(<) :: First a -> First a -> Bool #

(<=) :: First a -> First a -> Bool #

(>) :: First a -> First a -> Bool #

(>=) :: First a -> First a -> Bool #

max :: First a -> First a -> First a #

min :: First a -> First a -> First a #

FromHttpApiData a => FromHttpApiData (First a) 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData a => ToHttpApiData (First a) 
Instance details

Defined in Web.Internal.HttpApiData

type Rep1 First 
Instance details

Defined in Data.Monoid

type Rep1 First = D1 ('MetaData "First" "Data.Monoid" "base" 'True) (C1 ('MetaCons "First" 'PrefixI 'True) (S1 ('MetaSel ('Just "getFirst") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 Maybe)))
type Rep (First a) 
Instance details

Defined in Data.Monoid

type Rep (First a) = D1 ('MetaData "First" "Data.Monoid" "base" 'True) (C1 ('MetaCons "First" 'PrefixI 'True) (S1 ('MetaSel ('Just "getFirst") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe a))))

newtype Endo a #

Constructors

Endo 

Fields

Instances

Instances details
Monoid (Endo a) 
Instance details

Defined in Data.Semigroup.Internal

Methods

mempty :: Endo a #

mappend :: Endo a -> Endo a -> Endo a #

mconcat :: [Endo a] -> Endo a #

Semigroup (Endo a) 
Instance details

Defined in Data.Semigroup.Internal

Methods

(<>) :: Endo a -> Endo a -> Endo a #

sconcat :: NonEmpty (Endo a) -> Endo a

stimes :: Integral b => b -> Endo a -> Endo a

Generic (Endo a) 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep (Endo a) 
Instance details

Defined in Data.Semigroup.Internal

type Rep (Endo a) = D1 ('MetaData "Endo" "Data.Semigroup.Internal" "base" 'True) (C1 ('MetaCons "Endo" 'PrefixI 'True) (S1 ('MetaSel ('Just "appEndo") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (a -> a))))

Methods

from :: Endo a -> Rep (Endo a) x

to :: Rep (Endo a) x -> Endo a

GMonoid (Endo a) 
Instance details

Defined in Generics.Deriving.Monoid.Internal

Methods

gmempty :: Endo a

gmappend :: Endo a -> Endo a -> Endo a

gmconcat :: [Endo a] -> Endo a

Newtype (a -> a) (Endo a) 
Instance details

Defined in Distribution.Compat.Newtype

Methods

pack :: (a -> a) -> Endo a

unpack :: Endo a -> a -> a

type Rep (Endo a) 
Instance details

Defined in Data.Semigroup.Internal

type Rep (Endo a) = D1 ('MetaData "Endo" "Data.Semigroup.Internal" "base" 'True) (C1 ('MetaCons "Endo" 'PrefixI 'True) (S1 ('MetaSel ('Just "appEndo") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (a -> a))))

newtype Sum a #

Constructors

Sum 

Fields

Instances

Instances details
FromJSON1 Sum 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: Maybe a -> (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (Sum a)

liftParseJSONList :: Maybe a -> (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [Sum a]

liftOmittedField :: Maybe a -> Maybe (Sum a)

ToJSON1 Sum 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> Sum a -> Value

liftToJSONList :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> [Sum a] -> Value

liftToEncoding :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> Sum a -> Encoding

liftToEncodingList :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> [Sum a] -> Encoding

liftOmitField :: (a -> Bool) -> Sum a -> Bool

MonadFix Sum 
Instance details

Defined in Control.Monad.Fix

Methods

mfix :: (a -> Sum a) -> Sum a

MonadZip Sum 
Instance details

Defined in Control.Monad.Zip

Methods

mzip :: Sum a -> Sum b -> Sum (a, b)

mzipWith :: (a -> b -> c) -> Sum a -> Sum b -> Sum c

munzip :: Sum (a, b) -> (Sum a, Sum b)

Foldable Sum 
Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => Sum m -> m #

foldMap :: Monoid m => (a -> m) -> Sum a -> m #

foldMap' :: Monoid m => (a -> m) -> Sum a -> m

foldr :: (a -> b -> b) -> b -> Sum a -> b #

foldr' :: (a -> b -> b) -> b -> Sum a -> b #

foldl :: (b -> a -> b) -> b -> Sum a -> b

foldl' :: (b -> a -> b) -> b -> Sum a -> b #

foldr1 :: (a -> a -> a) -> Sum a -> a

foldl1 :: (a -> a -> a) -> Sum a -> a

toList :: Sum a -> [a] #

null :: Sum a -> Bool #

length :: Sum a -> Int #

elem :: Eq a => a -> Sum a -> Bool #

maximum :: Ord a => Sum a -> a

minimum :: Ord a => Sum a -> a

sum :: Num a => Sum a -> a #

product :: Num a => Sum a -> a #

Foldable1 Sum 
Instance details

Defined in Data.Foldable1

Methods

fold1 :: Semigroup m => Sum m -> m

foldMap1 :: Semigroup m => (a -> m) -> Sum a -> m

foldMap1' :: Semigroup m => (a -> m) -> Sum a -> m

toNonEmpty :: Sum a -> NonEmpty a

maximum :: Ord a => Sum a -> a

minimum :: Ord a => Sum a -> a

head :: Sum a -> a

last :: Sum a -> a

foldrMap1 :: (a -> b) -> (a -> b -> b) -> Sum a -> b

foldlMap1' :: (a -> b) -> (b -> a -> b) -> Sum a -> b

foldlMap1 :: (a -> b) -> (b -> a -> b) -> Sum a -> b

foldrMap1' :: (a -> b) -> (a -> b -> b) -> Sum a -> b

Traversable Sum 
Instance details

Defined in Data.Traversable

Methods

traverse :: Applicative f => (a -> f b) -> Sum a -> f (Sum b) #

sequenceA :: Applicative f => Sum (f a) -> f (Sum a) #

mapM :: Monad m => (a -> m b) -> Sum a -> m (Sum b) #

sequence :: Monad m => Sum (m a) -> m (Sum a) #

Applicative Sum 
Instance details

Defined in 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 #

Functor Sum 
Instance details

Defined in Data.Semigroup.Internal

Methods

fmap :: (a -> b) -> Sum a -> Sum b #

(<$) :: a -> Sum b -> Sum a #

Monad Sum 
Instance details

Defined in Data.Semigroup.Internal

Methods

(>>=) :: Sum a -> (a -> Sum b) -> Sum b #

(>>) :: Sum a -> Sum b -> Sum b #

return :: a -> Sum a #

NFData1 Sum 
Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> Sum a -> ()

GCopoint Sum 
Instance details

Defined in Generics.Deriving.Copoint

Methods

gcopoint :: Sum a -> a

GFoldable Sum 
Instance details

Defined in Generics.Deriving.Foldable

Methods

gfoldMap :: Monoid m => (a -> m) -> Sum a -> m

gfold :: Monoid m => Sum m -> m

gfoldr :: (a -> b -> b) -> b -> Sum a -> b

gfoldr' :: (a -> b -> b) -> b -> Sum a -> b

gfoldl :: (a -> b -> a) -> a -> Sum b -> a

gfoldl' :: (a -> b -> a) -> a -> Sum b -> a

gfoldr1 :: (a -> a -> a) -> Sum a -> a

gfoldl1 :: (a -> a -> a) -> Sum a -> a

GFunctor Sum 
Instance details

Defined in Generics.Deriving.Functor

Methods

gmap :: (a -> b) -> Sum a -> Sum b

GTraversable Sum 
Instance details

Defined in Generics.Deriving.Traversable

Methods

gtraverse :: Applicative f => (a -> f b) -> Sum a -> f (Sum b)

gsequenceA :: Applicative f => Sum (f a) -> f (Sum a)

gmapM :: Monad m => (a -> m b) -> Sum a -> m (Sum b)

gsequence :: Monad m => Sum (m a) -> m (Sum a)

Generic1 Sum 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep1 Sum 
Instance details

Defined in Data.Semigroup.Internal

type Rep1 Sum = D1 ('MetaData "Sum" "Data.Semigroup.Internal" "base" 'True) (C1 ('MetaCons "Sum" 'PrefixI 'True) (S1 ('MetaSel ('Just "getSum") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1))

Methods

from1 :: Sum a -> Rep1 Sum a

to1 :: Rep1 Sum a -> Sum a

Newtype a (Sum a) 
Instance details

Defined in Distribution.Compat.Newtype

Methods

pack :: a -> Sum a

unpack :: Sum a -> a

Unbox a => Vector Vector (Sum a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: Mutable Vector s (Sum a) -> ST s (Vector (Sum a))

basicUnsafeThaw :: Vector (Sum a) -> ST s (Mutable Vector s (Sum a))

basicLength :: Vector (Sum a) -> Int

basicUnsafeSlice :: Int -> Int -> Vector (Sum a) -> Vector (Sum a)

basicUnsafeIndexM :: Vector (Sum a) -> Int -> Box (Sum a)

basicUnsafeCopy :: Mutable Vector s (Sum a) -> Vector (Sum a) -> ST s ()

elemseq :: Vector (Sum a) -> Sum a -> b -> b

Unbox a => MVector MVector (Sum a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s (Sum a) -> Int

basicUnsafeSlice :: Int -> Int -> MVector s (Sum a) -> MVector s (Sum a)

basicOverlaps :: MVector s (Sum a) -> MVector s (Sum a) -> Bool

basicUnsafeNew :: Int -> ST s (MVector s (Sum a))

basicInitialize :: MVector s (Sum a) -> ST s ()

basicUnsafeReplicate :: Int -> Sum a -> ST s (MVector s (Sum a))

basicUnsafeRead :: MVector s (Sum a) -> Int -> ST s (Sum a)

basicUnsafeWrite :: MVector s (Sum a) -> Int -> Sum a -> ST s ()

basicClear :: MVector s (Sum a) -> ST s ()

basicSet :: MVector s (Sum a) -> Sum a -> ST s ()

basicUnsafeCopy :: MVector s (Sum a) -> MVector s (Sum a) -> ST s ()

basicUnsafeMove :: MVector s (Sum a) -> MVector s (Sum a) -> ST s ()

basicUnsafeGrow :: MVector s (Sum a) -> Int -> ST s (MVector s (Sum a))

FromJSON a => FromJSON (Sum a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Sum a)

parseJSONList :: Value -> Parser [Sum a]

omittedField :: Maybe (Sum a)

ToJSON a => ToJSON (Sum a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Sum a -> Value

toEncoding :: Sum a -> Encoding

toJSONList :: [Sum a] -> Value

toEncodingList :: [Sum a] -> Encoding

omitField :: Sum a -> Bool

Data a => Data (Sum a) 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Sum a -> c (Sum a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Sum a) #

toConstr :: Sum a -> Constr #

dataTypeOf :: Sum a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Sum a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Sum a)) #

gmapT :: (forall b. Data b => b -> b) -> Sum a -> Sum a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Sum a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Sum a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Sum a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Sum a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Sum a -> m (Sum a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Sum a -> m (Sum a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Sum a -> m (Sum a) #

Num a => Monoid (Sum a) 
Instance details

Defined in Data.Semigroup.Internal

Methods

mempty :: Sum a #

mappend :: Sum a -> Sum a -> Sum a #

mconcat :: [Sum a] -> Sum a #

Num a => Semigroup (Sum a) 
Instance details

Defined in Data.Semigroup.Internal

Methods

(<>) :: Sum a -> Sum a -> Sum a #

sconcat :: NonEmpty (Sum a) -> Sum a

stimes :: Integral b => b -> Sum a -> Sum a

Bounded a => Bounded (Sum a) 
Instance details

Defined in Data.Semigroup.Internal

Methods

minBound :: Sum a #

maxBound :: Sum a #

Generic (Sum a) 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep (Sum a) 
Instance details

Defined in Data.Semigroup.Internal

type Rep (Sum a) = D1 ('MetaData "Sum" "Data.Semigroup.Internal" "base" 'True) (C1 ('MetaCons "Sum" 'PrefixI 'True) (S1 ('MetaSel ('Just "getSum") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))

Methods

from :: Sum a -> Rep (Sum a) x

to :: Rep (Sum a) x -> Sum a

Num a => Num (Sum a) 
Instance details

Defined in 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 #

Read a => Read (Sum a) 
Instance details

Defined in Data.Semigroup.Internal

Methods

readsPrec :: Int -> ReadS (Sum a)

readList :: ReadS [Sum a]

readPrec :: ReadPrec (Sum a)

readListPrec :: ReadPrec [Sum a]

Show a => Show (Sum a) 
Instance details

Defined in Data.Semigroup.Internal

Methods

showsPrec :: Int -> Sum a -> ShowS

show :: Sum a -> String #

showList :: [Sum a] -> ShowS

Binary a => Binary (Sum a) 
Instance details

Defined in Data.Binary.Class

Methods

put :: Sum a -> Put

get :: Get (Sum a)

putList :: [Sum a] -> Put

NFData a => NFData (Sum a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Sum a -> () #

GEnum a => GEnum (Sum a) 
Instance details

Defined in Generics.Deriving.Enum

Methods

genum :: [Sum a]

(GEq a, GEnum a, GIx a) => GIx (Sum a) 
Instance details

Defined in Generics.Deriving.Enum

Methods

range :: (Sum a, Sum a) -> [Sum a]

index :: (Sum a, Sum a) -> Sum a -> Int

inRange :: (Sum a, Sum a) -> Sum a -> Bool

GEq a => GEq (Sum a) 
Instance details

Defined in Generics.Deriving.Eq

Methods

geq :: Sum a -> Sum a -> Bool

Num a => GMonoid (Sum a) 
Instance details

Defined in Generics.Deriving.Monoid.Internal

Methods

gmempty :: Sum a

gmappend :: Sum a -> Sum a -> Sum a

gmconcat :: [Sum a] -> Sum a

GShow a => GShow (Sum a) 
Instance details

Defined in Generics.Deriving.Show

Methods

gshowsPrec :: Int -> Sum a -> ShowS

gshows :: Sum a -> ShowS

gshow :: Sum a -> String

gshowList :: [Sum a] -> ShowS

Eq a => Eq (Sum a) 
Instance details

Defined in Data.Semigroup.Internal

Methods

(==) :: Sum a -> Sum a -> Bool #

(/=) :: Sum a -> Sum a -> Bool #

Ord a => Ord (Sum a) 
Instance details

Defined in Data.Semigroup.Internal

Methods

compare :: Sum a -> Sum a -> Ordering #

(<) :: Sum a -> Sum a -> Bool #

(<=) :: Sum a -> Sum a -> Bool #

(>) :: Sum a -> Sum a -> Bool #

(>=) :: Sum a -> Sum a -> Bool #

max :: Sum a -> Sum a -> Sum a #

min :: Sum a -> Sum a -> Sum a #

FromHttpApiData a => FromHttpApiData (Sum a) 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData a => ToHttpApiData (Sum a) 
Instance details

Defined in Web.Internal.HttpApiData

Unbox a => Unbox (Sum a) 
Instance details

Defined in Data.Vector.Unboxed.Base

type Rep1 Sum 
Instance details

Defined in Data.Semigroup.Internal

type Rep1 Sum = D1 ('MetaData "Sum" "Data.Semigroup.Internal" "base" 'True) (C1 ('MetaCons "Sum" 'PrefixI 'True) (S1 ('MetaSel ('Just "getSum") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1))
newtype MVector s (Sum a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s (Sum a) = MV_Sum (MVector s a)
type Rep (Sum a) 
Instance details

Defined in Data.Semigroup.Internal

type Rep (Sum a) = D1 ('MetaData "Sum" "Data.Semigroup.Internal" "base" 'True) (C1 ('MetaCons "Sum" 'PrefixI 'True) (S1 ('MetaSel ('Just "getSum") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))
newtype Vector (Sum a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector (Sum a) = V_Sum (Vector a)

class Typeable (a :: k) #

Minimal complete definition

typeRep#

data Version #

Instances

Instances details
Parsec Version 
Instance details

Defined in Distribution.Types.Version

Methods

parsec :: CabalParsing m => m Version

Pretty Version 
Instance details

Defined in Distribution.Types.Version

Methods

pretty :: Version -> Doc

prettyVersioned :: CabalSpecVersion -> Version -> Doc

Structured Version 
Instance details

Defined in Distribution.Types.Version

Methods

structure :: Proxy Version -> Structure

structureHash' :: Tagged Version MD5

Data Version 
Instance details

Defined in Distribution.Types.Version

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Version -> c Version #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Version #

toConstr :: Version -> Constr #

dataTypeOf :: Version -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Version) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Version) #

gmapT :: (forall b. Data b => b -> b) -> Version -> Version #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Version -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Version -> r #

gmapQ :: (forall d. Data d => d -> u) -> Version -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Version -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Version -> m Version #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Version -> m Version #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Version -> m Version #

Generic Version 
Instance details

Defined in Distribution.Types.Version

Associated Types

type Rep Version 
Instance details

Defined in Distribution.Types.Version

type Rep Version = D1 ('MetaData "Version" "Distribution.Types.Version" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "PV0" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'SourceUnpack 'SourceStrict 'DecidedUnpack) (Rec0 Word64)) :+: C1 ('MetaCons "PV1" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Int) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Int])))

Methods

from :: Version -> Rep Version x

to :: Rep Version x -> Version

Read Version 
Instance details

Defined in Distribution.Types.Version

Methods

readsPrec :: Int -> ReadS Version

readList :: ReadS [Version]

readPrec :: ReadPrec Version

readListPrec :: ReadPrec [Version]

Show Version 
Instance details

Defined in Distribution.Types.Version

Methods

showsPrec :: Int -> Version -> ShowS

show :: Version -> String #

showList :: [Version] -> ShowS

Binary Version 
Instance details

Defined in Distribution.Types.Version

Methods

put :: Version -> Put

get :: Get Version

putList :: [Version] -> Put

NFData Version 
Instance details

Defined in Distribution.Types.Version

Methods

rnf :: Version -> () #

Eq Version 
Instance details

Defined in Distribution.Types.Version

Methods

(==) :: Version -> Version -> Bool #

(/=) :: Version -> Version -> Bool #

Ord Version 
Instance details

Defined in Distribution.Types.Version

IsCabalString Version 
Instance details

Defined in Pantry.Types

type Rep Version 
Instance details

Defined in Distribution.Types.Version

type Rep Version = D1 ('MetaData "Version" "Distribution.Types.Version" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "PV0" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'SourceUnpack 'SourceStrict 'DecidedUnpack) (Rec0 Word64)) :+: C1 ('MetaCons "PV1" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Int) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Int])))

class Storable a #

Minimal complete definition

sizeOf, alignment, (peek | peekElemOff | peekByteOff), (poke | pokeElemOff | pokeByteOff)

Instances

Instances details
Storable CBool 
Instance details

Defined in Foreign.C.Types

Methods

sizeOf :: CBool -> Int

alignment :: CBool -> Int

peekElemOff :: Ptr CBool -> Int -> IO CBool

pokeElemOff :: Ptr CBool -> Int -> CBool -> IO ()

peekByteOff :: Ptr b -> Int -> IO CBool

pokeByteOff :: Ptr b -> Int -> CBool -> IO ()

peek :: Ptr CBool -> IO CBool

poke :: Ptr CBool -> CBool -> IO ()

Storable CChar 
Instance details

Defined in Foreign.C.Types

Methods

sizeOf :: CChar -> Int

alignment :: CChar -> Int

peekElemOff :: Ptr CChar -> Int -> IO CChar

pokeElemOff :: Ptr CChar -> Int -> CChar -> IO ()

peekByteOff :: Ptr b -> Int -> IO CChar

pokeByteOff :: Ptr b -> Int -> CChar -> IO ()

peek :: Ptr CChar -> IO CChar

poke :: Ptr CChar -> CChar -> IO ()

Storable CClock 
Instance details

Defined in Foreign.C.Types

Methods

sizeOf :: CClock -> Int

alignment :: CClock -> Int

peekElemOff :: Ptr CClock -> Int -> IO CClock

pokeElemOff :: Ptr CClock -> Int -> CClock -> IO ()

peekByteOff :: Ptr b -> Int -> IO CClock

pokeByteOff :: Ptr b -> Int -> CClock -> IO ()

peek :: Ptr CClock -> IO CClock

poke :: Ptr CClock -> CClock -> IO ()

Storable CDouble 
Instance details

Defined in Foreign.C.Types

Methods

sizeOf :: CDouble -> Int

alignment :: CDouble -> Int

peekElemOff :: Ptr CDouble -> Int -> IO CDouble

pokeElemOff :: Ptr CDouble -> Int -> CDouble -> IO ()

peekByteOff :: Ptr b -> Int -> IO CDouble

pokeByteOff :: Ptr b -> Int -> CDouble -> IO ()

peek :: Ptr CDouble -> IO CDouble

poke :: Ptr CDouble -> CDouble -> IO ()

Storable CFloat 
Instance details

Defined in Foreign.C.Types

Methods

sizeOf :: CFloat -> Int

alignment :: CFloat -> Int

peekElemOff :: Ptr CFloat -> Int -> IO CFloat

pokeElemOff :: Ptr CFloat -> Int -> CFloat -> IO ()

peekByteOff :: Ptr b -> Int -> IO CFloat

pokeByteOff :: Ptr b -> Int -> CFloat -> IO ()

peek :: Ptr CFloat -> IO CFloat

poke :: Ptr CFloat -> CFloat -> IO ()

Storable CInt 
Instance details

Defined in Foreign.C.Types

Methods

sizeOf :: CInt -> Int

alignment :: CInt -> Int

peekElemOff :: Ptr CInt -> Int -> IO CInt

pokeElemOff :: Ptr CInt -> Int -> CInt -> IO ()

peekByteOff :: Ptr b -> Int -> IO CInt

pokeByteOff :: Ptr b -> Int -> CInt -> IO ()

peek :: Ptr CInt -> IO CInt

poke :: Ptr CInt -> CInt -> IO ()

Storable CIntMax 
Instance details

Defined in Foreign.C.Types

Methods

sizeOf :: CIntMax -> Int

alignment :: CIntMax -> Int

peekElemOff :: Ptr CIntMax -> Int -> IO CIntMax

pokeElemOff :: Ptr CIntMax -> Int -> CIntMax -> IO ()

peekByteOff :: Ptr b -> Int -> IO CIntMax

pokeByteOff :: Ptr b -> Int -> CIntMax -> IO ()

peek :: Ptr CIntMax -> IO CIntMax

poke :: Ptr CIntMax -> CIntMax -> IO ()

Storable CIntPtr 
Instance details

Defined in Foreign.C.Types

Methods

sizeOf :: CIntPtr -> Int

alignment :: CIntPtr -> Int

peekElemOff :: Ptr CIntPtr -> Int -> IO CIntPtr

pokeElemOff :: Ptr CIntPtr -> Int -> CIntPtr -> IO ()

peekByteOff :: Ptr b -> Int -> IO CIntPtr

pokeByteOff :: Ptr b -> Int -> CIntPtr -> IO ()

peek :: Ptr CIntPtr -> IO CIntPtr

poke :: Ptr CIntPtr -> CIntPtr -> IO ()

Storable CLLong 
Instance details

Defined in Foreign.C.Types

Methods

sizeOf :: CLLong -> Int

alignment :: CLLong -> Int

peekElemOff :: Ptr CLLong -> Int -> IO CLLong

pokeElemOff :: Ptr CLLong -> Int -> CLLong -> IO ()

peekByteOff :: Ptr b -> Int -> IO CLLong

pokeByteOff :: Ptr b -> Int -> CLLong -> IO ()

peek :: Ptr CLLong -> IO CLLong

poke :: Ptr CLLong -> CLLong -> IO ()

Storable CLong 
Instance details

Defined in Foreign.C.Types

Methods

sizeOf :: CLong -> Int

alignment :: CLong -> Int

peekElemOff :: Ptr CLong -> Int -> IO CLong

pokeElemOff :: Ptr CLong -> Int -> CLong -> IO ()

peekByteOff :: Ptr b -> Int -> IO CLong

pokeByteOff :: Ptr b -> Int -> CLong -> IO ()

peek :: Ptr CLong -> IO CLong

poke :: Ptr CLong -> CLong -> IO ()

Storable CPtrdiff 
Instance details

Defined in Foreign.C.Types

Methods

sizeOf :: CPtrdiff -> Int

alignment :: CPtrdiff -> Int

peekElemOff :: Ptr CPtrdiff -> Int -> IO CPtrdiff

pokeElemOff :: Ptr CPtrdiff -> Int -> CPtrdiff -> IO ()

peekByteOff :: Ptr b -> Int -> IO CPtrdiff

pokeByteOff :: Ptr b -> Int -> CPtrdiff -> IO ()

peek :: Ptr CPtrdiff -> IO CPtrdiff

poke :: Ptr CPtrdiff -> CPtrdiff -> IO ()

Storable CSChar 
Instance details

Defined in Foreign.C.Types

Methods

sizeOf :: CSChar -> Int

alignment :: CSChar -> Int

peekElemOff :: Ptr CSChar -> Int -> IO CSChar

pokeElemOff :: Ptr CSChar -> Int -> CSChar -> IO ()

peekByteOff :: Ptr b -> Int -> IO CSChar

pokeByteOff :: Ptr b -> Int -> CSChar -> IO ()

peek :: Ptr CSChar -> IO CSChar

poke :: Ptr CSChar -> CSChar -> IO ()

Storable CSUSeconds 
Instance details

Defined in Foreign.C.Types

Methods

sizeOf :: CSUSeconds -> Int

alignment :: CSUSeconds -> Int

peekElemOff :: Ptr CSUSeconds -> Int -> IO CSUSeconds

pokeElemOff :: Ptr CSUSeconds -> Int -> CSUSeconds -> IO ()

peekByteOff :: Ptr b -> Int -> IO CSUSeconds

pokeByteOff :: Ptr b -> Int -> CSUSeconds -> IO ()

peek :: Ptr CSUSeconds -> IO CSUSeconds

poke :: Ptr CSUSeconds -> CSUSeconds -> IO ()

Storable CShort 
Instance details

Defined in Foreign.C.Types

Methods

sizeOf :: CShort -> Int

alignment :: CShort -> Int

peekElemOff :: Ptr CShort -> Int -> IO CShort

pokeElemOff :: Ptr CShort -> Int -> CShort -> IO ()

peekByteOff :: Ptr b -> Int -> IO CShort

pokeByteOff :: Ptr b -> Int -> CShort -> IO ()

peek :: Ptr CShort -> IO CShort

poke :: Ptr CShort -> CShort -> IO ()

Storable CSigAtomic 
Instance details

Defined in Foreign.C.Types

Methods

sizeOf :: CSigAtomic -> Int

alignment :: CSigAtomic -> Int

peekElemOff :: Ptr CSigAtomic -> Int -> IO CSigAtomic

pokeElemOff :: Ptr CSigAtomic -> Int -> CSigAtomic -> IO ()

peekByteOff :: Ptr b -> Int -> IO CSigAtomic

pokeByteOff :: Ptr b -> Int -> CSigAtomic -> IO ()

peek :: Ptr CSigAtomic -> IO CSigAtomic

poke :: Ptr CSigAtomic -> CSigAtomic -> IO ()

Storable CSize 
Instance details

Defined in Foreign.C.Types

Methods

sizeOf :: CSize -> Int

alignment :: CSize -> Int

peekElemOff :: Ptr CSize -> Int -> IO CSize

pokeElemOff :: Ptr CSize -> Int -> CSize -> IO ()

peekByteOff :: Ptr b -> Int -> IO CSize

pokeByteOff :: Ptr b -> Int -> CSize -> IO ()

peek :: Ptr CSize -> IO CSize

poke :: Ptr CSize -> CSize -> IO ()

Storable CTime 
Instance details

Defined in Foreign.C.Types

Methods

sizeOf :: CTime -> Int

alignment :: CTime -> Int

peekElemOff :: Ptr CTime -> Int -> IO CTime

pokeElemOff :: Ptr CTime -> Int -> CTime -> IO ()

peekByteOff :: Ptr b -> Int -> IO CTime

pokeByteOff :: Ptr b -> Int -> CTime -> IO ()

peek :: Ptr CTime -> IO CTime

poke :: Ptr CTime -> CTime -> IO ()

Storable CUChar 
Instance details

Defined in Foreign.C.Types

Methods

sizeOf :: CUChar -> Int

alignment :: CUChar -> Int

peekElemOff :: Ptr CUChar -> Int -> IO CUChar

pokeElemOff :: Ptr CUChar -> Int -> CUChar -> IO ()

peekByteOff :: Ptr b -> Int -> IO CUChar

pokeByteOff :: Ptr b -> Int -> CUChar -> IO ()

peek :: Ptr CUChar -> IO CUChar

poke :: Ptr CUChar -> CUChar -> IO ()

Storable CUInt 
Instance details

Defined in Foreign.C.Types

Methods

sizeOf :: CUInt -> Int

alignment :: CUInt -> Int

peekElemOff :: Ptr CUInt -> Int -> IO CUInt

pokeElemOff :: Ptr CUInt -> Int -> CUInt -> IO ()

peekByteOff :: Ptr b -> Int -> IO CUInt

pokeByteOff :: Ptr b -> Int -> CUInt -> IO ()

peek :: Ptr CUInt -> IO CUInt

poke :: Ptr CUInt -> CUInt -> IO ()

Storable CUIntMax 
Instance details

Defined in Foreign.C.Types

Methods

sizeOf :: CUIntMax -> Int

alignment :: CUIntMax -> Int

peekElemOff :: Ptr CUIntMax -> Int -> IO CUIntMax

pokeElemOff :: Ptr CUIntMax -> Int -> CUIntMax -> IO ()

peekByteOff :: Ptr b -> Int -> IO CUIntMax

pokeByteOff :: Ptr b -> Int -> CUIntMax -> IO ()

peek :: Ptr CUIntMax -> IO CUIntMax

poke :: Ptr CUIntMax -> CUIntMax -> IO ()

Storable CUIntPtr 
Instance details

Defined in Foreign.C.Types

Methods

sizeOf :: CUIntPtr -> Int

alignment :: CUIntPtr -> Int

peekElemOff :: Ptr CUIntPtr -> Int -> IO CUIntPtr

pokeElemOff :: Ptr CUIntPtr -> Int -> CUIntPtr -> IO ()

peekByteOff :: Ptr b -> Int -> IO CUIntPtr

pokeByteOff :: Ptr b -> Int -> CUIntPtr -> IO ()

peek :: Ptr CUIntPtr -> IO CUIntPtr

poke :: Ptr CUIntPtr -> CUIntPtr -> IO ()

Storable CULLong 
Instance details

Defined in Foreign.C.Types

Methods

sizeOf :: CULLong -> Int

alignment :: CULLong -> Int

peekElemOff :: Ptr CULLong -> Int -> IO CULLong

pokeElemOff :: Ptr CULLong -> Int -> CULLong -> IO ()

peekByteOff :: Ptr b -> Int -> IO CULLong

pokeByteOff :: Ptr b -> Int -> CULLong -> IO ()

peek :: Ptr CULLong -> IO CULLong

poke :: Ptr CULLong -> CULLong -> IO ()

Storable CULong 
Instance details

Defined in Foreign.C.Types

Methods

sizeOf :: CULong -> Int

alignment :: CULong -> Int

peekElemOff :: Ptr CULong -> Int -> IO CULong

pokeElemOff :: Ptr CULong -> Int -> CULong -> IO ()

peekByteOff :: Ptr b -> Int -> IO CULong

pokeByteOff :: Ptr b -> Int -> CULong -> IO ()

peek :: Ptr CULong -> IO CULong

poke :: Ptr CULong -> CULong -> IO ()

Storable CUSeconds 
Instance details

Defined in Foreign.C.Types

Methods

sizeOf :: CUSeconds -> Int

alignment :: CUSeconds -> Int

peekElemOff :: Ptr CUSeconds -> Int -> IO CUSeconds

pokeElemOff :: Ptr CUSeconds -> Int -> CUSeconds -> IO ()

peekByteOff :: Ptr b -> Int -> IO CUSeconds

pokeByteOff :: Ptr b -> Int -> CUSeconds -> IO ()

peek :: Ptr CUSeconds -> IO CUSeconds

poke :: Ptr CUSeconds -> CUSeconds -> IO ()

Storable CUShort 
Instance details

Defined in Foreign.C.Types

Methods

sizeOf :: CUShort -> Int

alignment :: CUShort -> Int

peekElemOff :: Ptr CUShort -> Int -> IO CUShort

pokeElemOff :: Ptr CUShort -> Int -> CUShort -> IO ()

peekByteOff :: Ptr b -> Int -> IO CUShort

pokeByteOff :: Ptr b -> Int -> CUShort -> IO ()

peek :: Ptr CUShort -> IO CUShort

poke :: Ptr CUShort -> CUShort -> IO ()

Storable CWchar 
Instance details

Defined in Foreign.C.Types

Methods

sizeOf :: CWchar -> Int

alignment :: CWchar -> Int

peekElemOff :: Ptr CWchar -> Int -> IO CWchar

pokeElemOff :: Ptr CWchar -> Int -> CWchar -> IO ()

peekByteOff :: Ptr b -> Int -> IO CWchar

pokeByteOff :: Ptr b -> Int -> CWchar -> IO ()

peek :: Ptr CWchar -> IO CWchar

poke :: Ptr CWchar -> CWchar -> IO ()

Storable IntPtr 
Instance details

Defined in Foreign.Ptr

Methods

sizeOf :: IntPtr -> Int

alignment :: IntPtr -> Int

peekElemOff :: Ptr IntPtr -> Int -> IO IntPtr

pokeElemOff :: Ptr IntPtr -> Int -> IntPtr -> IO ()

peekByteOff :: Ptr b -> Int -> IO IntPtr

pokeByteOff :: Ptr b -> Int -> IntPtr -> IO ()

peek :: Ptr IntPtr -> IO IntPtr

poke :: Ptr IntPtr -> IntPtr -> IO ()

Storable WordPtr 
Instance details

Defined in Foreign.Ptr

Methods

sizeOf :: WordPtr -> Int

alignment :: WordPtr -> Int

peekElemOff :: Ptr WordPtr -> Int -> IO WordPtr

pokeElemOff :: Ptr WordPtr -> Int -> WordPtr -> IO ()

peekByteOff :: Ptr b -> Int -> IO WordPtr

pokeByteOff :: Ptr b -> Int -> WordPtr -> IO ()

peek :: Ptr WordPtr -> IO WordPtr

poke :: Ptr WordPtr -> WordPtr -> IO ()

Storable Fingerprint 
Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Fingerprint -> Int

alignment :: Fingerprint -> Int

peekElemOff :: Ptr Fingerprint -> Int -> IO Fingerprint

pokeElemOff :: Ptr Fingerprint -> Int -> Fingerprint -> IO ()

peekByteOff :: Ptr b -> Int -> IO Fingerprint

pokeByteOff :: Ptr b -> Int -> Fingerprint -> IO ()

peek :: Ptr Fingerprint -> IO Fingerprint

poke :: Ptr Fingerprint -> Fingerprint -> IO ()

Storable Int16 
Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Int16 -> Int

alignment :: Int16 -> Int

peekElemOff :: Ptr Int16 -> Int -> IO Int16

pokeElemOff :: Ptr Int16 -> Int -> Int16 -> IO ()

peekByteOff :: Ptr b -> Int -> IO Int16

pokeByteOff :: Ptr b -> Int -> Int16 -> IO ()

peek :: Ptr Int16 -> IO Int16

poke :: Ptr Int16 -> Int16 -> IO ()

Storable Int32 
Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Int32 -> Int

alignment :: Int32 -> Int

peekElemOff :: Ptr Int32 -> Int -> IO Int32

pokeElemOff :: Ptr Int32 -> Int -> Int32 -> IO ()

peekByteOff :: Ptr b -> Int -> IO Int32

pokeByteOff :: Ptr b -> Int -> Int32 -> IO ()

peek :: Ptr Int32 -> IO Int32

poke :: Ptr Int32 -> Int32 -> IO ()

Storable Int64 
Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Int64 -> Int

alignment :: Int64 -> Int

peekElemOff :: Ptr Int64 -> Int -> IO Int64

pokeElemOff :: Ptr Int64 -> Int -> Int64 -> IO ()

peekByteOff :: Ptr b -> Int -> IO Int64

pokeByteOff :: Ptr b -> Int -> Int64 -> IO ()

peek :: Ptr Int64 -> IO Int64

poke :: Ptr Int64 -> Int64 -> IO ()

Storable Int8 
Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Int8 -> Int

alignment :: Int8 -> Int

peekElemOff :: Ptr Int8 -> Int -> IO Int8

pokeElemOff :: Ptr Int8 -> Int -> Int8 -> IO ()

peekByteOff :: Ptr b -> Int -> IO Int8

pokeByteOff :: Ptr b -> Int -> Int8 -> IO ()

peek :: Ptr Int8 -> IO Int8

poke :: Ptr Int8 -> Int8 -> IO ()

Storable IoSubSystem 
Instance details

Defined in GHC.RTS.Flags

Methods

sizeOf :: IoSubSystem -> Int

alignment :: IoSubSystem -> Int

peekElemOff :: Ptr IoSubSystem -> Int -> IO IoSubSystem

pokeElemOff :: Ptr IoSubSystem -> Int -> IoSubSystem -> IO ()

peekByteOff :: Ptr b -> Int -> IO IoSubSystem

pokeByteOff :: Ptr b -> Int -> IoSubSystem -> IO ()

peek :: Ptr IoSubSystem -> IO IoSubSystem

poke :: Ptr IoSubSystem -> IoSubSystem -> IO ()

Storable Word16 
Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Word16 -> Int

alignment :: Word16 -> Int

peekElemOff :: Ptr Word16 -> Int -> IO Word16

pokeElemOff :: Ptr Word16 -> Int -> Word16 -> IO ()

peekByteOff :: Ptr b -> Int -> IO Word16

pokeByteOff :: Ptr b -> Int -> Word16 -> IO ()

peek :: Ptr Word16 -> IO Word16

poke :: Ptr Word16 -> Word16 -> IO ()

Storable Word32 
Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Word32 -> Int

alignment :: Word32 -> Int

peekElemOff :: Ptr Word32 -> Int -> IO Word32

pokeElemOff :: Ptr Word32 -> Int -> Word32 -> IO ()

peekByteOff :: Ptr b -> Int -> IO Word32

pokeByteOff :: Ptr b -> Int -> Word32 -> IO ()

peek :: Ptr Word32 -> IO Word32

poke :: Ptr Word32 -> Word32 -> IO ()

Storable Word64 
Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Word64 -> Int

alignment :: Word64 -> Int

peekElemOff :: Ptr Word64 -> Int -> IO Word64

pokeElemOff :: Ptr Word64 -> Int -> Word64 -> IO ()

peekByteOff :: Ptr b -> Int -> IO Word64

pokeByteOff :: Ptr b -> Int -> Word64 -> IO ()

peek :: Ptr Word64 -> IO Word64

poke :: Ptr Word64 -> Word64 -> IO ()

Storable Word8 
Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Word8 -> Int

alignment :: Word8 -> Int

peekElemOff :: Ptr Word8 -> Int -> IO Word8

pokeElemOff :: Ptr Word8 -> Int -> Word8 -> IO ()

peekByteOff :: Ptr b -> Int -> IO Word8

pokeByteOff :: Ptr b -> Int -> Word8 -> IO ()

peek :: Ptr Word8 -> IO Word8

poke :: Ptr Word8 -> Word8 -> IO ()

Storable CBlkCnt 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: CBlkCnt -> Int

alignment :: CBlkCnt -> Int

peekElemOff :: Ptr CBlkCnt -> Int -> IO CBlkCnt

pokeElemOff :: Ptr CBlkCnt -> Int -> CBlkCnt -> IO ()

peekByteOff :: Ptr b -> Int -> IO CBlkCnt

pokeByteOff :: Ptr b -> Int -> CBlkCnt -> IO ()

peek :: Ptr CBlkCnt -> IO CBlkCnt

poke :: Ptr CBlkCnt -> CBlkCnt -> IO ()

Storable CBlkSize 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: CBlkSize -> Int

alignment :: CBlkSize -> Int

peekElemOff :: Ptr CBlkSize -> Int -> IO CBlkSize

pokeElemOff :: Ptr CBlkSize -> Int -> CBlkSize -> IO ()

peekByteOff :: Ptr b -> Int -> IO CBlkSize

pokeByteOff :: Ptr b -> Int -> CBlkSize -> IO ()

peek :: Ptr CBlkSize -> IO CBlkSize

poke :: Ptr CBlkSize -> CBlkSize -> IO ()

Storable CCc 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: CCc -> Int

alignment :: CCc -> Int

peekElemOff :: Ptr CCc -> Int -> IO CCc

pokeElemOff :: Ptr CCc -> Int -> CCc -> IO ()

peekByteOff :: Ptr b -> Int -> IO CCc

pokeByteOff :: Ptr b -> Int -> CCc -> IO ()

peek :: Ptr CCc -> IO CCc

poke :: Ptr CCc -> CCc -> IO ()

Storable CClockId 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: CClockId -> Int

alignment :: CClockId -> Int

peekElemOff :: Ptr CClockId -> Int -> IO CClockId

pokeElemOff :: Ptr CClockId -> Int -> CClockId -> IO ()

peekByteOff :: Ptr b -> Int -> IO CClockId

pokeByteOff :: Ptr b -> Int -> CClockId -> IO ()

peek :: Ptr CClockId -> IO CClockId

poke :: Ptr CClockId -> CClockId -> IO ()

Storable CDev 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: CDev -> Int

alignment :: CDev -> Int

peekElemOff :: Ptr CDev -> Int -> IO CDev

pokeElemOff :: Ptr CDev -> Int -> CDev -> IO ()

peekByteOff :: Ptr b -> Int -> IO CDev

pokeByteOff :: Ptr b -> Int -> CDev -> IO ()

peek :: Ptr CDev -> IO CDev

poke :: Ptr CDev -> CDev -> IO ()

Storable CFsBlkCnt 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: CFsBlkCnt -> Int

alignment :: CFsBlkCnt -> Int

peekElemOff :: Ptr CFsBlkCnt -> Int -> IO CFsBlkCnt

pokeElemOff :: Ptr CFsBlkCnt -> Int -> CFsBlkCnt -> IO ()

peekByteOff :: Ptr b -> Int -> IO CFsBlkCnt

pokeByteOff :: Ptr b -> Int -> CFsBlkCnt -> IO ()

peek :: Ptr CFsBlkCnt -> IO CFsBlkCnt

poke :: Ptr CFsBlkCnt -> CFsBlkCnt -> IO ()

Storable CFsFilCnt 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: CFsFilCnt -> Int

alignment :: CFsFilCnt -> Int

peekElemOff :: Ptr CFsFilCnt -> Int -> IO CFsFilCnt

pokeElemOff :: Ptr CFsFilCnt -> Int -> CFsFilCnt -> IO ()

peekByteOff :: Ptr b -> Int -> IO CFsFilCnt

pokeByteOff :: Ptr b -> Int -> CFsFilCnt -> IO ()

peek :: Ptr CFsFilCnt -> IO CFsFilCnt

poke :: Ptr CFsFilCnt -> CFsFilCnt -> IO ()

Storable CGid 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: CGid -> Int

alignment :: CGid -> Int

peekElemOff :: Ptr CGid -> Int -> IO CGid

pokeElemOff :: Ptr CGid -> Int -> CGid -> IO ()

peekByteOff :: Ptr b -> Int -> IO CGid

pokeByteOff :: Ptr b -> Int -> CGid -> IO ()

peek :: Ptr CGid -> IO CGid

poke :: Ptr CGid -> CGid -> IO ()

Storable CId 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: CId -> Int

alignment :: CId -> Int

peekElemOff :: Ptr CId -> Int -> IO CId

pokeElemOff :: Ptr CId -> Int -> CId -> IO ()

peekByteOff :: Ptr b -> Int -> IO CId

pokeByteOff :: Ptr b -> Int -> CId -> IO ()

peek :: Ptr CId -> IO CId

poke :: Ptr CId -> CId -> IO ()

Storable CIno 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: CIno -> Int

alignment :: CIno -> Int

peekElemOff :: Ptr CIno -> Int -> IO CIno

pokeElemOff :: Ptr CIno -> Int -> CIno -> IO ()

peekByteOff :: Ptr b -> Int -> IO CIno

pokeByteOff :: Ptr b -> Int -> CIno -> IO ()

peek :: Ptr CIno -> IO CIno

poke :: Ptr CIno -> CIno -> IO ()

Storable CKey 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: CKey -> Int

alignment :: CKey -> Int

peekElemOff :: Ptr CKey -> Int -> IO CKey

pokeElemOff :: Ptr CKey -> Int -> CKey -> IO ()

peekByteOff :: Ptr b -> Int -> IO CKey

pokeByteOff :: Ptr b -> Int -> CKey -> IO ()

peek :: Ptr CKey -> IO CKey

poke :: Ptr CKey -> CKey -> IO ()

Storable CMode 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: CMode -> Int

alignment :: CMode -> Int

peekElemOff :: Ptr CMode -> Int -> IO CMode

pokeElemOff :: Ptr CMode -> Int -> CMode -> IO ()

peekByteOff :: Ptr b -> Int -> IO CMode

pokeByteOff :: Ptr b -> Int -> CMode -> IO ()

peek :: Ptr CMode -> IO CMode

poke :: Ptr CMode -> CMode -> IO ()

Storable CNfds 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: CNfds -> Int

alignment :: CNfds -> Int

peekElemOff :: Ptr CNfds -> Int -> IO CNfds

pokeElemOff :: Ptr CNfds -> Int -> CNfds -> IO ()

peekByteOff :: Ptr b -> Int -> IO CNfds

pokeByteOff :: Ptr b -> Int -> CNfds -> IO ()

peek :: Ptr CNfds -> IO CNfds

poke :: Ptr CNfds -> CNfds -> IO ()

Storable CNlink 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: CNlink -> Int

alignment :: CNlink -> Int

peekElemOff :: Ptr CNlink -> Int -> IO CNlink

pokeElemOff :: Ptr CNlink -> Int -> CNlink -> IO ()

peekByteOff :: Ptr b -> Int -> IO CNlink

pokeByteOff :: Ptr b -> Int -> CNlink -> IO ()

peek :: Ptr CNlink -> IO CNlink

poke :: Ptr CNlink -> CNlink -> IO ()

Storable COff 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: COff -> Int

alignment :: COff -> Int

peekElemOff :: Ptr COff -> Int -> IO COff

pokeElemOff :: Ptr COff -> Int -> COff -> IO ()

peekByteOff :: Ptr b -> Int -> IO COff

pokeByteOff :: Ptr b -> Int -> COff -> IO ()

peek :: Ptr COff -> IO COff

poke :: Ptr COff -> COff -> IO ()

Storable CPid 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: CPid -> Int

alignment :: CPid -> Int

peekElemOff :: Ptr CPid -> Int -> IO CPid

pokeElemOff :: Ptr CPid -> Int -> CPid -> IO ()

peekByteOff :: Ptr b -> Int -> IO CPid

pokeByteOff :: Ptr b -> Int -> CPid -> IO ()

peek :: Ptr CPid -> IO CPid

poke :: Ptr CPid -> CPid -> IO ()

Storable CRLim 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: CRLim -> Int

alignment :: CRLim -> Int

peekElemOff :: Ptr CRLim -> Int -> IO CRLim

pokeElemOff :: Ptr CRLim -> Int -> CRLim -> IO ()

peekByteOff :: Ptr b -> Int -> IO CRLim

pokeByteOff :: Ptr b -> Int -> CRLim -> IO ()

peek :: Ptr CRLim -> IO CRLim

poke :: Ptr CRLim -> CRLim -> IO ()

Storable CSocklen 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: CSocklen -> Int

alignment :: CSocklen -> Int

peekElemOff :: Ptr CSocklen -> Int -> IO CSocklen

pokeElemOff :: Ptr CSocklen -> Int -> CSocklen -> IO ()

peekByteOff :: Ptr b -> Int -> IO CSocklen

pokeByteOff :: Ptr b -> Int -> CSocklen -> IO ()

peek :: Ptr CSocklen -> IO CSocklen

poke :: Ptr CSocklen -> CSocklen -> IO ()

Storable CSpeed 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: CSpeed -> Int

alignment :: CSpeed -> Int

peekElemOff :: Ptr CSpeed -> Int -> IO CSpeed

pokeElemOff :: Ptr CSpeed -> Int -> CSpeed -> IO ()

peekByteOff :: Ptr b -> Int -> IO CSpeed

pokeByteOff :: Ptr b -> Int -> CSpeed -> IO ()

peek :: Ptr CSpeed -> IO CSpeed

poke :: Ptr CSpeed -> CSpeed -> IO ()

Storable CSsize 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: CSsize -> Int

alignment :: CSsize -> Int

peekElemOff :: Ptr CSsize -> Int -> IO CSsize

pokeElemOff :: Ptr CSsize -> Int -> CSsize -> IO ()

peekByteOff :: Ptr b -> Int -> IO CSsize

pokeByteOff :: Ptr b -> Int -> CSsize -> IO ()

peek :: Ptr CSsize -> IO CSsize

poke :: Ptr CSsize -> CSsize -> IO ()

Storable CTcflag 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: CTcflag -> Int

alignment :: CTcflag -> Int

peekElemOff :: Ptr CTcflag -> Int -> IO CTcflag

pokeElemOff :: Ptr CTcflag -> Int -> CTcflag -> IO ()

peekByteOff :: Ptr b -> Int -> IO CTcflag

pokeByteOff :: Ptr b -> Int -> CTcflag -> IO ()

peek :: Ptr CTcflag -> IO CTcflag

poke :: Ptr CTcflag -> CTcflag -> IO ()

Storable CTimer 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: CTimer -> Int

alignment :: CTimer -> Int

peekElemOff :: Ptr CTimer -> Int -> IO CTimer

pokeElemOff :: Ptr CTimer -> Int -> CTimer -> IO ()

peekByteOff :: Ptr b -> Int -> IO CTimer

pokeByteOff :: Ptr b -> Int -> CTimer -> IO ()

peek :: Ptr CTimer -> IO CTimer

poke :: Ptr CTimer -> CTimer -> IO ()

Storable CUid 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: CUid -> Int

alignment :: CUid -> Int

peekElemOff :: Ptr CUid -> Int -> IO CUid

pokeElemOff :: Ptr CUid -> Int -> CUid -> IO ()

peekByteOff :: Ptr b -> Int -> IO CUid

pokeByteOff :: Ptr b -> Int -> CUid -> IO ()

peek :: Ptr CUid -> IO CUid

poke :: Ptr CUid -> CUid -> IO ()

Storable Fd 
Instance details

Defined in System.Posix.Types

Methods

sizeOf :: Fd -> Int

alignment :: Fd -> Int

peekElemOff :: Ptr Fd -> Int -> IO Fd

pokeElemOff :: Ptr Fd -> Int -> Fd -> IO ()

peekByteOff :: Ptr b -> Int -> IO Fd

pokeByteOff :: Ptr b -> Int -> Fd -> IO ()

peek :: Ptr Fd -> IO Fd

poke :: Ptr Fd -> Fd -> IO ()

Storable Half 
Instance details

Defined in Numeric.Half.Internal

Methods

sizeOf :: Half -> Int

alignment :: Half -> Int

peekElemOff :: Ptr Half -> Int -> IO Half

pokeElemOff :: Ptr Half -> Int -> Half -> IO ()

peekByteOff :: Ptr b -> Int -> IO Half

pokeByteOff :: Ptr b -> Int -> Half -> IO ()

peek :: Ptr Half -> IO Half

poke :: Ptr Half -> Half -> IO ()

Storable AddrInfo 
Instance details

Defined in Network.Socket.Info

Methods

sizeOf :: AddrInfo -> Int

alignment :: AddrInfo -> Int

peekElemOff :: Ptr AddrInfo -> Int -> IO AddrInfo

pokeElemOff :: Ptr AddrInfo -> Int -> AddrInfo -> IO ()

peekByteOff :: Ptr b -> Int -> IO AddrInfo

pokeByteOff :: Ptr b -> Int -> AddrInfo -> IO ()

peek :: Ptr AddrInfo -> IO AddrInfo

poke :: Ptr AddrInfo -> AddrInfo -> IO ()

Storable In6Addr 
Instance details

Defined in Network.Socket.Types

Methods

sizeOf :: In6Addr -> Int

alignment :: In6Addr -> Int

peekElemOff :: Ptr In6Addr -> Int -> IO In6Addr

pokeElemOff :: Ptr In6Addr -> Int -> In6Addr -> IO ()

peekByteOff :: Ptr b -> Int -> IO In6Addr

pokeByteOff :: Ptr b -> Int -> In6Addr -> IO ()

peek :: Ptr In6Addr -> IO In6Addr

poke :: Ptr In6Addr -> In6Addr -> IO ()

Storable PortNumber 
Instance details

Defined in Network.Socket.Types

Methods

sizeOf :: PortNumber -> Int

alignment :: PortNumber -> Int

peekElemOff :: Ptr PortNumber -> Int -> IO PortNumber

pokeElemOff :: Ptr PortNumber -> Int -> PortNumber -> IO ()

peekByteOff :: Ptr b -> Int -> IO PortNumber

pokeByteOff :: Ptr b -> Int -> PortNumber -> IO ()

peek :: Ptr PortNumber -> IO PortNumber

poke :: Ptr PortNumber -> PortNumber -> IO ()

Storable CAttributes 
Instance details

Defined in System.Posix.Files.Common

Methods

sizeOf :: CAttributes -> Int

alignment :: CAttributes -> Int

peekElemOff :: Ptr CAttributes -> Int -> IO CAttributes

pokeElemOff :: Ptr CAttributes -> Int -> CAttributes -> IO ()

peekByteOff :: Ptr b -> Int -> IO CAttributes

pokeByteOff :: Ptr b -> Int -> CAttributes -> IO ()

peek :: Ptr CAttributes -> IO CAttributes

poke :: Ptr CAttributes -> CAttributes -> IO ()

Storable CTimeSpec 
Instance details

Defined in System.Posix.Files.Common

Methods

sizeOf :: CTimeSpec -> Int

alignment :: CTimeSpec -> Int

peekElemOff :: Ptr CTimeSpec -> Int -> IO CTimeSpec

pokeElemOff :: Ptr CTimeSpec -> Int -> CTimeSpec -> IO ()

peekByteOff :: Ptr b -> Int -> IO CTimeSpec

pokeByteOff :: Ptr b -> Int -> CTimeSpec -> IO ()

peek :: Ptr CTimeSpec -> IO CTimeSpec

poke :: Ptr CTimeSpec -> CTimeSpec -> IO ()

Storable CTimeVal 
Instance details

Defined in System.Posix.Files.Common

Methods

sizeOf :: CTimeVal -> Int

alignment :: CTimeVal -> Int

peekElemOff :: Ptr CTimeVal -> Int -> IO CTimeVal

pokeElemOff :: Ptr CTimeVal -> Int -> CTimeVal -> IO ()

peekByteOff :: Ptr b -> Int -> IO CTimeVal

pokeByteOff :: Ptr b -> Int -> CTimeVal -> IO ()

peek :: Ptr CTimeVal -> IO CTimeVal

poke :: Ptr CTimeVal -> CTimeVal -> IO ()

Storable UnixTime 
Instance details

Defined in Data.UnixTime.Types

Methods

sizeOf :: UnixTime -> Int

alignment :: UnixTime -> Int

peekElemOff :: Ptr UnixTime -> Int -> IO UnixTime

pokeElemOff :: Ptr UnixTime -> Int -> UnixTime -> IO ()

peekByteOff :: Ptr b -> Int -> IO UnixTime

pokeByteOff :: Ptr b -> Int -> UnixTime -> IO ()

peek :: Ptr UnixTime -> IO UnixTime

poke :: Ptr UnixTime -> UnixTime -> IO ()

Storable UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

sizeOf :: UUID -> Int

alignment :: UUID -> Int

peekElemOff :: Ptr UUID -> Int -> IO UUID

pokeElemOff :: Ptr UUID -> Int -> UUID -> IO ()

peekByteOff :: Ptr b -> Int -> IO UUID

pokeByteOff :: Ptr b -> Int -> UUID -> IO ()

peek :: Ptr UUID -> IO UUID

poke :: Ptr UUID -> UUID -> IO ()

Storable () 
Instance details

Defined in Foreign.Storable

Methods

sizeOf :: () -> Int

alignment :: () -> Int

peekElemOff :: Ptr () -> Int -> IO ()

pokeElemOff :: Ptr () -> Int -> () -> IO ()

peekByteOff :: Ptr b -> Int -> IO ()

pokeByteOff :: Ptr b -> Int -> () -> IO ()

peek :: Ptr () -> IO ()

poke :: Ptr () -> () -> IO ()

Storable Bool 
Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Bool -> Int

alignment :: Bool -> Int

peekElemOff :: Ptr Bool -> Int -> IO Bool

pokeElemOff :: Ptr Bool -> Int -> Bool -> IO ()

peekByteOff :: Ptr b -> Int -> IO Bool

pokeByteOff :: Ptr b -> Int -> Bool -> IO ()

peek :: Ptr Bool -> IO Bool

poke :: Ptr Bool -> Bool -> IO ()

Storable Char 
Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Char -> Int

alignment :: Char -> Int

peekElemOff :: Ptr Char -> Int -> IO Char

pokeElemOff :: Ptr Char -> Int -> Char -> IO ()

peekByteOff :: Ptr b -> Int -> IO Char

pokeByteOff :: Ptr b -> Int -> Char -> IO ()

peek :: Ptr Char -> IO Char

poke :: Ptr Char -> Char -> IO ()

Storable Double 
Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Double -> Int

alignment :: Double -> Int

peekElemOff :: Ptr Double -> Int -> IO Double

pokeElemOff :: Ptr Double -> Int -> Double -> IO ()

peekByteOff :: Ptr b -> Int -> IO Double

pokeByteOff :: Ptr b -> Int -> Double -> IO ()

peek :: Ptr Double -> IO Double

poke :: Ptr Double -> Double -> IO ()

Storable Float 
Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Float -> Int

alignment :: Float -> Int

peekElemOff :: Ptr Float -> Int -> IO Float

pokeElemOff :: Ptr Float -> Int -> Float -> IO ()

peekByteOff :: Ptr b -> Int -> IO Float

pokeByteOff :: Ptr b -> Int -> Float -> IO ()

peek :: Ptr Float -> IO Float

poke :: Ptr Float -> Float -> IO ()

Storable Int 
Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Int -> Int

alignment :: Int -> Int

peekElemOff :: Ptr Int -> Int -> IO Int

pokeElemOff :: Ptr Int -> Int -> Int -> IO ()

peekByteOff :: Ptr b -> Int -> IO Int

pokeByteOff :: Ptr b -> Int -> Int -> IO ()

peek :: Ptr Int -> IO Int

poke :: Ptr Int -> Int -> IO ()

Storable Word 
Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Word -> Int

alignment :: Word -> Int

peekElemOff :: Ptr Word -> Int -> IO Word

pokeElemOff :: Ptr Word -> Int -> Word -> IO ()

peekByteOff :: Ptr b -> Int -> IO Word

pokeByteOff :: Ptr b -> Int -> Word -> IO ()

peek :: Ptr Word -> IO Word

poke :: Ptr Word -> Word -> IO ()

Storable a => Storable (Complex a) 
Instance details

Defined in Data.Complex

Methods

sizeOf :: Complex a -> Int

alignment :: Complex a -> Int

peekElemOff :: Ptr (Complex a) -> Int -> IO (Complex a)

pokeElemOff :: Ptr (Complex a) -> Int -> Complex a -> IO ()

peekByteOff :: Ptr b -> Int -> IO (Complex a)

pokeByteOff :: Ptr b -> Int -> Complex a -> IO ()

peek :: Ptr (Complex a) -> IO (Complex a)

poke :: Ptr (Complex a) -> Complex a -> IO ()

Storable a => Storable (Identity a) 
Instance details

Defined in Data.Functor.Identity

Methods

sizeOf :: Identity a -> Int

alignment :: Identity a -> Int

peekElemOff :: Ptr (Identity a) -> Int -> IO (Identity a)

pokeElemOff :: Ptr (Identity a) -> Int -> Identity a -> IO ()

peekByteOff :: Ptr b -> Int -> IO (Identity a)

pokeByteOff :: Ptr b -> Int -> Identity a -> IO ()

peek :: Ptr (Identity a) -> IO (Identity a)

poke :: Ptr (Identity a) -> Identity a -> IO ()

Storable a => Storable (Down a) 
Instance details

Defined in Data.Ord

Methods

sizeOf :: Down a -> Int

alignment :: Down a -> Int

peekElemOff :: Ptr (Down a) -> Int -> IO (Down a)

pokeElemOff :: Ptr (Down a) -> Int -> Down a -> IO ()

peekByteOff :: Ptr b -> Int -> IO (Down a)

pokeByteOff :: Ptr b -> Int -> Down a -> IO ()

peek :: Ptr (Down a) -> IO (Down a)

poke :: Ptr (Down a) -> Down a -> IO ()

Storable (ConstPtr a) 
Instance details

Defined in Foreign.Storable

Methods

sizeOf :: ConstPtr a -> Int

alignment :: ConstPtr a -> Int

peekElemOff :: Ptr (ConstPtr a) -> Int -> IO (ConstPtr a)

pokeElemOff :: Ptr (ConstPtr a) -> Int -> ConstPtr a -> IO ()

peekByteOff :: Ptr b -> Int -> IO (ConstPtr a)

pokeByteOff :: Ptr b -> Int -> ConstPtr a -> IO ()

peek :: Ptr (ConstPtr a) -> IO (ConstPtr a)

poke :: Ptr (ConstPtr a) -> ConstPtr a -> IO ()

Storable (FunPtr a) 
Instance details

Defined in Foreign.Storable

Methods

sizeOf :: FunPtr a -> Int

alignment :: FunPtr a -> Int

peekElemOff :: Ptr (FunPtr a) -> Int -> IO (FunPtr a)

pokeElemOff :: Ptr (FunPtr a) -> Int -> FunPtr a -> IO ()

peekByteOff :: Ptr b -> Int -> IO (FunPtr a)

pokeByteOff :: Ptr b -> Int -> FunPtr a -> IO ()

peek :: Ptr (FunPtr a) -> IO (FunPtr a)

poke :: Ptr (FunPtr a) -> FunPtr a -> IO ()

Storable (Ptr a) 
Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Ptr a -> Int

alignment :: Ptr a -> Int

peekElemOff :: Ptr (Ptr a) -> Int -> IO (Ptr a)

pokeElemOff :: Ptr (Ptr a) -> Int -> Ptr a -> IO ()

peekByteOff :: Ptr b -> Int -> IO (Ptr a)

pokeByteOff :: Ptr b -> Int -> Ptr a -> IO ()

peek :: Ptr (Ptr a) -> IO (Ptr a)

poke :: Ptr (Ptr a) -> Ptr a -> IO ()

(Storable a, Integral a) => Storable (Ratio a) 
Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Ratio a -> Int

alignment :: Ratio a -> Int

peekElemOff :: Ptr (Ratio a) -> Int -> IO (Ratio a)

pokeElemOff :: Ptr (Ratio a) -> Int -> Ratio a -> IO ()

peekByteOff :: Ptr b -> Int -> IO (Ratio a)

pokeByteOff :: Ptr b -> Int -> Ratio a -> IO ()

peek :: Ptr (Ratio a) -> IO (Ratio a)

poke :: Ptr (Ratio a) -> Ratio a -> IO ()

Storable (StablePtr a) 
Instance details

Defined in Foreign.Storable

Methods

sizeOf :: StablePtr a -> Int

alignment :: StablePtr a -> Int

peekElemOff :: Ptr (StablePtr a) -> Int -> IO (StablePtr a)

pokeElemOff :: Ptr (StablePtr a) -> Int -> StablePtr a -> IO ()

peekByteOff :: Ptr b -> Int -> IO (StablePtr a)

pokeByteOff :: Ptr b -> Int -> StablePtr a -> IO ()

peek :: Ptr (StablePtr a) -> IO (StablePtr a)

poke :: Ptr (StablePtr a) -> StablePtr a -> IO ()

Storable a => Storable (BE a) 
Instance details

Defined in Data.Memory.Endian

Methods

sizeOf :: BE a -> Int

alignment :: BE a -> Int

peekElemOff :: Ptr (BE a) -> Int -> IO (BE a)

pokeElemOff :: Ptr (BE a) -> Int -> BE a -> IO ()

peekByteOff :: Ptr b -> Int -> IO (BE a)

pokeByteOff :: Ptr b -> Int -> BE a -> IO ()

peek :: Ptr (BE a) -> IO (BE a)

poke :: Ptr (BE a) -> BE a -> IO ()

Storable a => Storable (LE a) 
Instance details

Defined in Data.Memory.Endian

Methods

sizeOf :: LE a -> Int

alignment :: LE a -> Int

peekElemOff :: Ptr (LE a) -> Int -> IO (LE a)

pokeElemOff :: Ptr (LE a) -> Int -> LE a -> IO ()

peekByteOff :: Ptr b -> Int -> IO (LE a)

pokeByteOff :: Ptr b -> Int -> LE a -> IO ()

peek :: Ptr (LE a) -> IO (LE a)

poke :: Ptr (LE a) -> LE a -> IO ()

Storable g => Storable (StateGen g) 
Instance details

Defined in System.Random.Internal

Methods

sizeOf :: StateGen g -> Int

alignment :: StateGen g -> Int

peekElemOff :: Ptr (StateGen g) -> Int -> IO (StateGen g)

pokeElemOff :: Ptr (StateGen g) -> Int -> StateGen g -> IO ()

peekByteOff :: Ptr b -> Int -> IO (StateGen g)

pokeByteOff :: Ptr b -> Int -> StateGen g -> IO ()

peek :: Ptr (StateGen g) -> IO (StateGen g)

poke :: Ptr (StateGen g) -> StateGen g -> IO ()

Storable g => Storable (AtomicGen g) 
Instance details

Defined in System.Random.Stateful

Methods

sizeOf :: AtomicGen g -> Int

alignment :: AtomicGen g -> Int

peekElemOff :: Ptr (AtomicGen g) -> Int -> IO (AtomicGen g)

pokeElemOff :: Ptr (AtomicGen g) -> Int -> AtomicGen g -> IO ()

peekByteOff :: Ptr b -> Int -> IO (AtomicGen g)

pokeByteOff :: Ptr b -> Int -> AtomicGen g -> IO ()

peek :: Ptr (AtomicGen g) -> IO (AtomicGen g)

poke :: Ptr (AtomicGen g) -> AtomicGen g -> IO ()

Storable g => Storable (IOGen g) 
Instance details

Defined in System.Random.Stateful

Methods

sizeOf :: IOGen g -> Int

alignment :: IOGen g -> Int

peekElemOff :: Ptr (IOGen g) -> Int -> IO (IOGen g)

pokeElemOff :: Ptr (IOGen g) -> Int -> IOGen g -> IO ()

peekByteOff :: Ptr b -> Int -> IO (IOGen g)

pokeByteOff :: Ptr b -> Int -> IOGen g -> IO ()

peek :: Ptr (IOGen g) -> IO (IOGen g)

poke :: Ptr (IOGen g) -> IOGen g -> IO ()

Storable g => Storable (STGen g) 
Instance details

Defined in System.Random.Stateful

Methods

sizeOf :: STGen g -> Int

alignment :: STGen g -> Int

peekElemOff :: Ptr (STGen g) -> Int -> IO (STGen g)

pokeElemOff :: Ptr (STGen g) -> Int -> STGen g -> IO ()

peekByteOff :: Ptr b -> Int -> IO (STGen g)

pokeByteOff :: Ptr b -> Int -> STGen g -> IO ()

peek :: Ptr (STGen g) -> IO (STGen g)

poke :: Ptr (STGen g) -> STGen g -> IO ()

Storable g => Storable (TGen g) 
Instance details

Defined in System.Random.Stateful

Methods

sizeOf :: TGen g -> Int

alignment :: TGen g -> Int

peekElemOff :: Ptr (TGen g) -> Int -> IO (TGen g)

pokeElemOff :: Ptr (TGen g) -> Int -> TGen g -> IO ()

peekByteOff :: Ptr b -> Int -> IO (TGen g)

pokeByteOff :: Ptr b -> Int -> TGen g -> IO ()

peek :: Ptr (TGen g) -> IO (TGen g)

poke :: Ptr (TGen g) -> TGen g -> IO ()

Storable a => Storable (Const a b) 
Instance details

Defined in 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 ()

Storable a => Storable (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

sizeOf :: Tagged s a -> Int

alignment :: Tagged s a -> Int

peekElemOff :: Ptr (Tagged s a) -> Int -> IO (Tagged s a)

pokeElemOff :: Ptr (Tagged s a) -> Int -> Tagged s a -> IO ()

peekByteOff :: Ptr b -> Int -> IO (Tagged s a)

pokeByteOff :: Ptr b -> Int -> Tagged s a -> IO ()

peek :: Ptr (Tagged s a) -> IO (Tagged s a)

poke :: Ptr (Tagged s a) -> Tagged s a -> IO ()

data STM a #

Instances

Instances details
Alternative STM 
Instance details

Defined in GHC.Conc.Sync

Methods

empty :: STM a

(<|>) :: STM a -> STM a -> STM a #

some :: STM a -> STM [a] #

many :: STM a -> STM [a] #

Applicative STM 
Instance details

Defined in GHC.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 #

Functor STM 
Instance details

Defined in GHC.Conc.Sync

Methods

fmap :: (a -> b) -> STM a -> STM b #

(<$) :: a -> STM b -> STM a #

Monad STM 
Instance details

Defined in GHC.Conc.Sync

Methods

(>>=) :: STM a -> (a -> STM b) -> STM b #

(>>) :: STM a -> STM b -> STM b #

return :: a -> STM a #

MonadPlus STM 
Instance details

Defined in GHC.Conc.Sync

Methods

mzero :: STM a #

mplus :: STM a -> STM a -> STM a #

MonadCatch STM 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: (HasCallStack, Exception e) => STM a -> (e -> STM a) -> STM a

MonadThrow STM 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: (HasCallStack, Exception e) => e -> STM a #

MonadBaseControl STM STM 
Instance details

Defined in Control.Monad.Trans.Control

Associated Types

type StM STM a 
Instance details

Defined in Control.Monad.Trans.Control

type StM STM a = a

Methods

liftBaseWith :: (RunInBase STM STM -> STM a) -> STM a

restoreM :: StM STM a -> STM a

MArray TArray e STM 
Instance details

Defined in Control.Concurrent.STM.TArray

Methods

getBounds :: Ix i => TArray i e -> STM (i, i)

getNumElements :: Ix i => TArray i e -> STM Int

newArray :: Ix i => (i, i) -> e -> STM (TArray i e)

newArray_ :: Ix i => (i, i) -> STM (TArray i e)

unsafeNewArray_ :: Ix i => (i, i) -> STM (TArray i e)

unsafeRead :: Ix i => TArray i e -> Int -> STM e

unsafeWrite :: Ix i => TArray i e -> Int -> e -> STM ()

Monoid a => Monoid (STM a) 
Instance details

Defined in GHC.Conc.Sync

Methods

mempty :: STM a #

mappend :: STM a -> STM a -> STM a #

mconcat :: [STM a] -> STM a #

Semigroup a => Semigroup (STM a) 
Instance details

Defined in GHC.Conc.Sync

Methods

(<>) :: STM a -> STM a -> STM a #

sconcat :: NonEmpty (STM a) -> STM a

stimes :: Integral b => b -> STM a -> STM a

RandomGen g => FrozenGen (TGen g) STM 
Instance details

Defined in System.Random.Stateful

Associated Types

type MutableGen (TGen g) STM 
Instance details

Defined in System.Random.Stateful

type MutableGen (TGen g) STM = TGenM g

Methods

freezeGen :: MutableGen (TGen g) STM -> STM (TGen g)

thawGen :: TGen g -> STM (MutableGen (TGen g) STM)

RandomGen g => StatefulGen (TGenM g) STM 
Instance details

Defined in System.Random.Stateful

Methods

uniformWord32R :: Word32 -> TGenM g -> STM Word32

uniformWord64R :: Word64 -> TGenM g -> STM Word64

uniformWord8 :: TGenM g -> STM Word8

uniformWord16 :: TGenM g -> STM Word16

uniformWord32 :: TGenM g -> STM Word32

uniformWord64 :: TGenM g -> STM Word64

uniformShortByteString :: Int -> TGenM g -> STM ShortByteString

RandomGen r => RandomGenM (TGenM r) r STM 
Instance details

Defined in System.Random.Stateful

Methods

applyRandomGenM :: (r -> (a, r)) -> TGenM r -> STM a

type StM STM a 
Instance details

Defined in Control.Monad.Trans.Control

type StM STM a = a
type MutableGen (TGen g) STM 
Instance details

Defined in System.Random.Stateful

type MutableGen (TGen g) STM = TGenM g

data TVar a #

Instances

Instances details
Eq (TVar a) 
Instance details

Defined in GHC.Conc.Sync

Methods

(==) :: TVar a -> TVar a -> Bool #

(/=) :: TVar a -> TVar a -> Bool #

data ThreadId #

Instances

Instances details
Show ThreadId 
Instance details

Defined in GHC.Conc.Sync

Methods

showsPrec :: Int -> ThreadId -> ShowS

show :: ThreadId -> String #

showList :: [ThreadId] -> ShowS

NFData ThreadId 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: ThreadId -> () #

Eq ThreadId 
Instance details

Defined in GHC.Conc.Sync

Ord ThreadId 
Instance details

Defined in GHC.Conc.Sync

Hashable ThreadId 
Instance details

Defined in Data.Hashable.Class

class Bounded a where #

Methods

minBound :: a #

maxBound :: a #

Instances

Instances details
Bounded ModTime 
Instance details

Defined in Distribution.Compat.Time

Methods

minBound :: ModTime #

maxBound :: ModTime #

Bounded ComponentKind 
Instance details

Defined in Distribution.Simple.BuildTarget

Methods

minBound :: ComponentKind #

maxBound :: ComponentKind #

Bounded DebugInfoLevel 
Instance details

Defined in Distribution.Simple.Compiler

Methods

minBound :: DebugInfoLevel #

maxBound :: DebugInfoLevel #

Bounded OptimisationLevel 
Instance details

Defined in Distribution.Simple.Compiler

Methods

minBound :: OptimisationLevel #

maxBound :: OptimisationLevel #

Bounded Way 
Instance details

Defined in Distribution.Simple.Hpc

Methods

minBound :: Way #

maxBound :: Way #

Bounded TestShowDetails 
Instance details

Defined in Distribution.Simple.Setup

Methods

minBound :: TestShowDetails #

maxBound :: TestShowDetails #

Bounded DumpBuildInfo 
Instance details

Defined in Distribution.Types.DumpBuildInfo

Methods

minBound :: DumpBuildInfo #

maxBound :: DumpBuildInfo #

Bounded Verbosity 
Instance details

Defined in Distribution.Verbosity

Methods

minBound :: Verbosity #

maxBound :: Verbosity #

Bounded VerbosityFlag 
Instance details

Defined in Distribution.Verbosity.Internal

Methods

minBound :: VerbosityFlag #

maxBound :: VerbosityFlag #

Bounded VerbosityLevel 
Instance details

Defined in Distribution.Verbosity.Internal

Methods

minBound :: VerbosityLevel #

maxBound :: VerbosityLevel #

Bounded CabalSpecVersion 
Instance details

Defined in Distribution.CabalSpecVersion

Methods

minBound :: CabalSpecVersion #

maxBound :: CabalSpecVersion #

Bounded PWarnType 
Instance details

Defined in Distribution.Parsec.Warning

Methods

minBound :: PWarnType #

maxBound :: PWarnType #

Bounded LicenseExceptionId 
Instance details

Defined in Distribution.SPDX.LicenseExceptionId

Methods

minBound :: LicenseExceptionId #

maxBound :: LicenseExceptionId #

Bounded LicenseId 
Instance details

Defined in Distribution.SPDX.LicenseId

Methods

minBound :: LicenseId #

maxBound :: LicenseId #

Bounded LicenseListVersion 
Instance details

Defined in Distribution.SPDX.LicenseListVersion

Methods

minBound :: LicenseListVersion #

maxBound :: LicenseListVersion #

Bounded KnownRepoType 
Instance details

Defined in Distribution.Types.SourceRepo

Methods

minBound :: KnownRepoType #

maxBound :: KnownRepoType #

Bounded KnownExtension 
Instance details

Defined in Language.Haskell.Extension

Methods

minBound :: KnownExtension #

maxBound :: KnownExtension #

Bounded BlinkSpeed 
Instance details

Defined in System.Console.ANSI.Types

Methods

minBound :: BlinkSpeed #

maxBound :: BlinkSpeed #

Bounded Color 
Instance details

Defined in System.Console.ANSI.Types

Methods

minBound :: Color #

maxBound :: Color #

Bounded ColorIntensity 
Instance details

Defined in System.Console.ANSI.Types

Methods

minBound :: ColorIntensity #

maxBound :: ColorIntensity #

Bounded ConsoleIntensity 
Instance details

Defined in System.Console.ANSI.Types

Methods

minBound :: ConsoleIntensity #

maxBound :: ConsoleIntensity #

Bounded ConsoleLayer 
Instance details

Defined in System.Console.ANSI.Types

Methods

minBound :: ConsoleLayer #

maxBound :: ConsoleLayer #

Bounded Underlining 
Instance details

Defined in System.Console.ANSI.Types

Methods

minBound :: Underlining #

maxBound :: Underlining #

Bounded All 
Instance details

Defined in Data.Semigroup.Internal

Methods

minBound :: All #

maxBound :: All #

Bounded Any 
Instance details

Defined in Data.Semigroup.Internal

Methods

minBound :: Any #

maxBound :: Any #

Bounded CBool 
Instance details

Defined in Foreign.C.Types

Methods

minBound :: CBool #

maxBound :: CBool #

Bounded CChar 
Instance details

Defined in Foreign.C.Types

Methods

minBound :: CChar #

maxBound :: CChar #

Bounded CInt 
Instance details

Defined in Foreign.C.Types

Methods

minBound :: CInt #

maxBound :: CInt #

Bounded CIntMax 
Instance details

Defined in Foreign.C.Types

Methods

minBound :: CIntMax #

maxBound :: CIntMax #

Bounded CIntPtr 
Instance details

Defined in Foreign.C.Types

Methods

minBound :: CIntPtr #

maxBound :: CIntPtr #

Bounded CLLong 
Instance details

Defined in Foreign.C.Types

Methods

minBound :: CLLong #

maxBound :: CLLong #

Bounded CLong 
Instance details

Defined in Foreign.C.Types

Methods

minBound :: CLong #

maxBound :: CLong #

Bounded CPtrdiff 
Instance details

Defined in Foreign.C.Types

Methods

minBound :: CPtrdiff #

maxBound :: CPtrdiff #

Bounded CSChar 
Instance details

Defined in Foreign.C.Types

Methods

minBound :: CSChar #

maxBound :: CSChar #

Bounded CShort 
Instance details

Defined in Foreign.C.Types

Methods

minBound :: CShort #

maxBound :: CShort #

Bounded CSigAtomic 
Instance details

Defined in Foreign.C.Types

Methods

minBound :: CSigAtomic #

maxBound :: CSigAtomic #

Bounded CSize 
Instance details

Defined in Foreign.C.Types

Methods

minBound :: CSize #

maxBound :: CSize #

Bounded CUChar 
Instance details

Defined in Foreign.C.Types

Methods

minBound :: CUChar #

maxBound :: CUChar #

Bounded CUInt 
Instance details

Defined in Foreign.C.Types

Methods

minBound :: CUInt #

maxBound :: CUInt #

Bounded CUIntMax 
Instance details

Defined in Foreign.C.Types

Methods

minBound :: CUIntMax #

maxBound :: CUIntMax #

Bounded CUIntPtr 
Instance details

Defined in Foreign.C.Types

Methods

minBound :: CUIntPtr #

maxBound :: CUIntPtr #

Bounded CULLong 
Instance details

Defined in Foreign.C.Types

Methods

minBound :: CULLong #

maxBound :: CULLong #

Bounded CULong 
Instance details

Defined in Foreign.C.Types

Methods

minBound :: CULong #

maxBound :: CULong #

Bounded CUShort 
Instance details

Defined in Foreign.C.Types

Methods

minBound :: CUShort #

maxBound :: CUShort #

Bounded CWchar 
Instance details

Defined in Foreign.C.Types

Methods

minBound :: CWchar #

maxBound :: CWchar #

Bounded IntPtr 
Instance details

Defined in Foreign.Ptr

Methods

minBound :: IntPtr #

maxBound :: IntPtr #

Bounded WordPtr 
Instance details

Defined in Foreign.Ptr

Methods

minBound :: WordPtr #

maxBound :: WordPtr #

Bounded ByteOrder 
Instance details

Defined in GHC.ByteOrder

Methods

minBound :: ByteOrder #

maxBound :: ByteOrder #

Bounded Associativity 
Instance details

Defined in GHC.Generics

Methods

minBound :: Associativity #

maxBound :: Associativity #

Bounded DecidedStrictness 
Instance details

Defined in GHC.Generics

Methods

minBound :: DecidedStrictness #

maxBound :: DecidedStrictness #

Bounded SourceStrictness 
Instance details

Defined in GHC.Generics

Methods

minBound :: SourceStrictness #

maxBound :: SourceStrictness #

Bounded SourceUnpackedness 
Instance details

Defined in GHC.Generics

Methods

minBound :: SourceUnpackedness #

maxBound :: SourceUnpackedness #

Bounded Int16 
Instance details

Defined in GHC.Int

Bounded Int32 
Instance details

Defined in GHC.Int

Bounded Int64 
Instance details

Defined in GHC.Int

Bounded Int8 
Instance details

Defined in GHC.Int

Bounded GeneralCategory 
Instance details

Defined in GHC.Unicode

Methods

minBound :: GeneralCategory #

maxBound :: GeneralCategory #

Bounded Word16 
Instance details

Defined in GHC.Word

Bounded Word32 
Instance details

Defined in GHC.Word

Bounded Word64 
Instance details

Defined in GHC.Word

Bounded Word8 
Instance details

Defined in GHC.Word

Bounded CBlkCnt 
Instance details

Defined in System.Posix.Types

Methods

minBound :: CBlkCnt #

maxBound :: CBlkCnt #

Bounded CBlkSize 
Instance details

Defined in System.Posix.Types

Methods

minBound :: CBlkSize #

maxBound :: CBlkSize #

Bounded CClockId 
Instance details

Defined in System.Posix.Types

Methods

minBound :: CClockId #

maxBound :: CClockId #

Bounded CDev 
Instance details

Defined in System.Posix.Types

Methods

minBound :: CDev #

maxBound :: CDev #

Bounded CFsBlkCnt 
Instance details

Defined in System.Posix.Types

Methods

minBound :: CFsBlkCnt #

maxBound :: CFsBlkCnt #

Bounded CFsFilCnt 
Instance details

Defined in System.Posix.Types

Methods

minBound :: CFsFilCnt #

maxBound :: CFsFilCnt #

Bounded CGid 
Instance details

Defined in System.Posix.Types

Methods

minBound :: CGid #

maxBound :: CGid #

Bounded CId 
Instance details

Defined in System.Posix.Types

Methods

minBound :: CId #

maxBound :: CId #

Bounded CIno 
Instance details

Defined in System.Posix.Types

Methods

minBound :: CIno #

maxBound :: CIno #

Bounded CKey 
Instance details

Defined in System.Posix.Types

Methods

minBound :: CKey #

maxBound :: CKey #

Bounded CMode 
Instance details

Defined in System.Posix.Types

Methods

minBound :: CMode #

maxBound :: CMode #

Bounded CNfds 
Instance details

Defined in System.Posix.Types

Methods

minBound :: CNfds #

maxBound :: CNfds #

Bounded CNlink 
Instance details

Defined in System.Posix.Types

Methods

minBound :: CNlink #

maxBound :: CNlink #

Bounded COff 
Instance details

Defined in System.Posix.Types

Methods

minBound :: COff #

maxBound :: COff #

Bounded CPid 
Instance details

Defined in System.Posix.Types

Methods

minBound :: CPid #

maxBound :: CPid #

Bounded CRLim 
Instance details

Defined in System.Posix.Types

Methods

minBound :: CRLim #

maxBound :: CRLim #

Bounded CSocklen 
Instance details

Defined in System.Posix.Types

Methods

minBound :: CSocklen #

maxBound :: CSocklen #

Bounded CSsize 
Instance details

Defined in System.Posix.Types

Methods

minBound :: CSsize #

maxBound :: CSsize #

Bounded CTcflag 
Instance details

Defined in System.Posix.Types

Methods

minBound :: CTcflag #

maxBound :: CTcflag #

Bounded CUid 
Instance details

Defined in System.Posix.Types

Methods

minBound :: CUid #

maxBound :: CUid #

Bounded Fd 
Instance details

Defined in System.Posix.Types

Methods

minBound :: Fd #

maxBound :: Fd #

Bounded Encoding 
Instance details

Defined in Basement.String

Methods

minBound :: Encoding #

maxBound :: Encoding #

Bounded UTF32_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF32

Methods

minBound :: UTF32_Invalid #

maxBound :: UTF32_Invalid #

Bounded Variant 
Instance details

Defined in Crypto.KDF.Argon2

Methods

minBound :: Variant #

maxBound :: Variant #

Bounded Version 
Instance details

Defined in Crypto.KDF.Argon2

Methods

minBound :: Version #

maxBound :: Version #

Bounded CurveName 
Instance details

Defined in Crypto.PubKey.ECC.Types

Methods

minBound :: CurveName #

maxBound :: CurveName #

Bounded FileType 
Instance details

Defined in System.Directory.Internal.Common

Methods

minBound :: FileType #

maxBound :: FileType #

Bounded XdgDirectory 
Instance details

Defined in System.Directory.Internal.Common

Methods

minBound :: XdgDirectory #

maxBound :: XdgDirectory #

Bounded XdgDirectoryList 
Instance details

Defined in System.Directory.Internal.Common

Methods

minBound :: XdgDirectoryList #

maxBound :: XdgDirectoryList #

Bounded Extension 
Instance details

Defined in GHC.LanguageExtensions.Type

Methods

minBound :: Extension #

maxBound :: Extension #

Bounded Ordering 
Instance details

Defined in GHC.Enum

Bounded BuildType 
Instance details

Defined in Hpack.Config

Bounded MaxHeaderLength 
Instance details

Defined in Network.HTTP.Client.Types

Methods

minBound :: MaxHeaderLength #

maxBound :: MaxHeaderLength #

Bounded MaxNumberHeaders 
Instance details

Defined in Network.HTTP.Client.Types

Methods

minBound :: MaxNumberHeaders #

maxBound :: MaxNumberHeaders #

Bounded StdMethod 
Instance details

Defined in Network.HTTP.Types.Method

Methods

minBound :: StdMethod #

maxBound :: StdMethod #

Bounded Status 
Instance details

Defined in Network.HTTP.Types.Status

Bounded IPv4 
Instance details

Defined in Data.IP.Addr

Methods

minBound :: IPv4 #

maxBound :: IPv4 #

Bounded IPv6 
Instance details

Defined in Data.IP.Addr

Methods

minBound :: IPv6 #

maxBound :: IPv6 #

Bounded MappingStyle 
Instance details

Defined in Text.Libyaml

Methods

minBound :: MappingStyle #

maxBound :: MappingStyle #

Bounded SequenceStyle 
Instance details

Defined in Text.Libyaml

Methods

minBound :: SequenceStyle #

maxBound :: SequenceStyle #

Bounded Style 
Instance details

Defined in Text.Libyaml

Methods

minBound :: Style #

maxBound :: Style #

Bounded PortNumber 
Instance details

Defined in Network.Socket.Types

Methods

minBound :: PortNumber #

maxBound :: PortNumber #

Bounded FileType 
Instance details

Defined in Pantry.Types

Methods

minBound :: FileType #

maxBound :: FileType #

Bounded IsolationLevel 
Instance details

Defined in Database.Persist.SqlBackend.Internal.IsolationLevel

Methods

minBound :: IsolationLevel #

maxBound :: IsolationLevel #

Bounded Checkmark 
Instance details

Defined in Database.Persist.Types.Base

Methods

minBound :: Checkmark #

maxBound :: Checkmark #

Bounded Style 
Instance details

Defined in RIO.PrettyPrint.Types

Bounded ApplyGhcOptions Source # 
Instance details

Defined in Stack.Types.ApplyGhcOptions

Bounded ApplyProgOptions Source # 
Instance details

Defined in Stack.Types.ApplyProgOptions

Bounded DumpLogs Source # 
Instance details

Defined in Stack.Types.DumpLogs

Bounded LockFileBehavior Source # 
Instance details

Defined in Stack.Types.LockFileBehavior

Bounded PvpBoundsType Source # 
Instance details

Defined in Stack.Types.PvpBounds

Bounded I8 
Instance details

Defined in Data.Text.Foreign

Methods

minBound :: I8 #

maxBound :: I8 #

Bounded FPFormat 
Instance details

Defined in Data.Text.Lazy.Builder.RealFloat

Methods

minBound :: FPFormat #

maxBound :: FPFormat #

Bounded QuarterOfYear 
Instance details

Defined in Data.Time.Calendar.Quarter

Methods

minBound :: QuarterOfYear #

maxBound :: QuarterOfYear #

Bounded CompressionStrategy 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

minBound :: CompressionStrategy #

maxBound :: CompressionStrategy #

Bounded Format 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

minBound :: Format #

maxBound :: Format #

Bounded Method 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

minBound :: Method #

maxBound :: Method #

Bounded () 
Instance details

Defined in GHC.Enum

Methods

minBound :: () #

maxBound :: () #

Bounded Bool 
Instance details

Defined in GHC.Enum

Bounded Char 
Instance details

Defined in GHC.Enum

Bounded Int 
Instance details

Defined in GHC.Enum

Methods

minBound :: Int #

maxBound :: Int #

Bounded Levity 
Instance details

Defined in GHC.Enum

Methods

minBound :: Levity #

maxBound :: Levity #

Bounded VecCount 
Instance details

Defined in GHC.Enum

Methods

minBound :: VecCount #

maxBound :: VecCount #

Bounded VecElem 
Instance details

Defined in GHC.Enum

Methods

minBound :: VecElem #

maxBound :: VecElem #

Bounded Word 
Instance details

Defined in GHC.Enum

Bounded a => Bounded (Flag a) 
Instance details

Defined in Distribution.Simple.Flag

Methods

minBound :: Flag a #

maxBound :: Flag a #

Bounded a => Bounded (And a) 
Instance details

Defined in Data.Bits

Methods

minBound :: And a #

maxBound :: And a #

Bounded a => Bounded (Iff a) 
Instance details

Defined in Data.Bits

Methods

minBound :: Iff a #

maxBound :: Iff a #

Bounded a => Bounded (Ior a) 
Instance details

Defined in Data.Bits

Methods

minBound :: Ior a #

maxBound :: Ior a #

Bounded a => Bounded (Xor a) 
Instance details

Defined in Data.Bits

Methods

minBound :: Xor a #

maxBound :: Xor a #

Bounded a => Bounded (Identity a) 
Instance details

Defined in Data.Functor.Identity

Bounded a => Bounded (Down a) 
Instance details

Defined in Data.Ord

Methods

minBound :: Down a #

maxBound :: Down a #

Bounded a => Bounded (First a) 
Instance details

Defined in Data.Semigroup

Methods

minBound :: First a #

maxBound :: First a #

Bounded a => Bounded (Last a) 
Instance details

Defined in Data.Semigroup

Methods

minBound :: Last a #

maxBound :: Last a #

Bounded a => Bounded (Max a) 
Instance details

Defined in Data.Semigroup

Methods

minBound :: Max a #

maxBound :: Max a #

Bounded a => Bounded (Min a) 
Instance details

Defined in Data.Semigroup

Methods

minBound :: Min a #

maxBound :: Min a #

Bounded m => Bounded (WrappedMonoid m) 
Instance details

Defined in Data.Semigroup

Methods

minBound :: WrappedMonoid m #

maxBound :: WrappedMonoid m #

Bounded a => Bounded (Dual a) 
Instance details

Defined in Data.Semigroup.Internal

Methods

minBound :: Dual a #

maxBound :: Dual a #

Bounded a => Bounded (Product a) 
Instance details

Defined in Data.Semigroup.Internal

Methods

minBound :: Product a #

maxBound :: Product a #

Bounded a => Bounded (Sum a) 
Instance details

Defined in Data.Semigroup.Internal

Methods

minBound :: Sum a #

maxBound :: Sum a #

SizeValid n => Bounded (Bits n) 
Instance details

Defined in Basement.Bits

Methods

minBound :: Bits n #

maxBound :: Bits n #

(BackendCompatible b s, Bounded (BackendKey b)) => Bounded (BackendKey (Compatible b s)) 
Instance details

Defined in Database.Persist.Compatible.Types

Methods

minBound :: BackendKey (Compatible b s) #

maxBound :: BackendKey (Compatible b s) #

(PersistCore b, PersistCore (RawSqlite b), Bounded (BackendKey b)) => Bounded (BackendKey (RawSqlite b)) 
Instance details

Defined in Database.Persist.Sqlite

Methods

minBound :: BackendKey (RawSqlite b) #

maxBound :: BackendKey (RawSqlite b) #

Bounded a => Bounded (Solo a) 
Instance details

Defined in GHC.Enum

Methods

minBound :: Solo a #

maxBound :: Solo a #

Bounded (Proxy t) 
Instance details

Defined in Data.Proxy

Methods

minBound :: Proxy t #

maxBound :: Proxy t #

(Bounded a, Bounded b) => Bounded (Pair a b) 
Instance details

Defined in Data.Strict.Tuple

Methods

minBound :: Pair a b #

maxBound :: Pair a b #

(Bounded a, Bounded b) => Bounded (a, b) 
Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b) #

maxBound :: (a, b) #

Bounded a => Bounded (Const a b) 
Instance details

Defined in Data.Functor.Const

Methods

minBound :: Const a b #

maxBound :: Const a b #

(Applicative f, Bounded a) => Bounded (Ap f a) 
Instance details

Defined in Data.Monoid

Methods

minBound :: Ap f a #

maxBound :: Ap f a #

Coercible a b => Bounded (Coercion a b) 
Instance details

Defined in Data.Type.Coercion

Methods

minBound :: Coercion a b #

maxBound :: Coercion a b #

a ~ b => Bounded (a :~: b) 
Instance details

Defined in Data.Type.Equality

Methods

minBound :: a :~: b #

maxBound :: a :~: b #

Bounded b => Bounded (Tagged s b) 
Instance details

Defined in Data.Tagged

Methods

minBound :: Tagged s b #

maxBound :: Tagged s b #

(Bounded a, Bounded b, Bounded c) => Bounded (a, b, c) 
Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c) #

maxBound :: (a, b, c) #

a ~~ b => Bounded (a :~~: b) 
Instance details

Defined in Data.Type.Equality

Methods

minBound :: a :~~: b #

maxBound :: a :~~: b #

(Bounded a, Bounded b, Bounded c, Bounded d) => Bounded (a, b, c, d) 
Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d) #

maxBound :: (a, b, c, d) #

Bounded (f (g a)) => Bounded (Compose f g a) 
Instance details

Defined in Data.Functor.Compose

Methods

minBound :: Compose f g a #

maxBound :: Compose f g a #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e) => Bounded (a, b, c, d, e) 
Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d, e) #

maxBound :: (a, b, c, d, e) #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f) => Bounded (a, b, c, d, e, f) 
Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d, e, f) #

maxBound :: (a, b, c, d, e, f) #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g) => Bounded (a, b, c, d, e, f, g) 
Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d, e, f, g) #

maxBound :: (a, b, c, d, e, f, g) #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h) => Bounded (a, b, c, d, e, f, g, h) 
Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d, e, f, g, h) #

maxBound :: (a, b, c, d, e, f, g, h) #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i) => Bounded (a, b, c, d, e, f, g, h, i) 
Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d, e, f, g, h, i) #

maxBound :: (a, b, c, d, e, f, g, h, i) #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i, Bounded j) => Bounded (a, b, c, d, e, f, g, h, i, j) 
Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d, e, f, g, h, i, j) #

maxBound :: (a, b, c, d, e, f, g, h, i, j) #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i, Bounded j, Bounded k) => Bounded (a, b, c, d, e, f, g, h, i, j, k) 
Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d, e, f, g, h, i, j, k) #

maxBound :: (a, b, c, d, e, f, g, h, i, j, k) #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i, Bounded j, Bounded k, Bounded l) => Bounded (a, b, c, d, e, f, g, h, i, j, k, l) 
Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d, e, f, g, h, i, j, k, l) #

maxBound :: (a, b, c, d, e, f, g, h, i, j, k, l) #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i, Bounded j, Bounded k, Bounded l, Bounded m) => Bounded (a, b, c, d, e, f, g, h, i, j, k, l, m) 
Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d, e, f, g, h, i, j, k, l, m) #

maxBound :: (a, b, c, d, e, f, g, h, i, j, k, l, m) #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i, Bounded j, Bounded k, Bounded l, Bounded m, Bounded n) => Bounded (a, b, c, d, e, f, g, h, i, j, k, l, m, n) 
Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) #

maxBound :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i, Bounded j, Bounded k, Bounded l, Bounded m, Bounded n, Bounded o) => Bounded (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) 
Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) #

maxBound :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) #

class Enum a where #

Minimal complete definition

toEnum, fromEnum

Methods

fromEnum :: a -> Int #

Instances

Instances details
Enum ComponentKind 
Instance details

Defined in Distribution.Simple.BuildTarget

Methods

succ :: ComponentKind -> ComponentKind

pred :: ComponentKind -> ComponentKind

toEnum :: Int -> ComponentKind

fromEnum :: ComponentKind -> Int #

enumFrom :: ComponentKind -> [ComponentKind]

enumFromThen :: ComponentKind -> ComponentKind -> [ComponentKind]

enumFromTo :: ComponentKind -> ComponentKind -> [ComponentKind]

enumFromThenTo :: ComponentKind -> ComponentKind -> ComponentKind -> [ComponentKind]

Enum QualLevel 
Instance details

Defined in Distribution.Simple.BuildTarget

Methods

succ :: QualLevel -> QualLevel

pred :: QualLevel -> QualLevel

toEnum :: Int -> QualLevel

fromEnum :: QualLevel -> Int #

enumFrom :: QualLevel -> [QualLevel]

enumFromThen :: QualLevel -> QualLevel -> [QualLevel]

enumFromTo :: QualLevel -> QualLevel -> [QualLevel]

enumFromThenTo :: QualLevel -> QualLevel -> QualLevel -> [QualLevel]

Enum DebugInfoLevel 
Instance details

Defined in Distribution.Simple.Compiler

Methods

succ :: DebugInfoLevel -> DebugInfoLevel

pred :: DebugInfoLevel -> DebugInfoLevel

toEnum :: Int -> DebugInfoLevel

fromEnum :: DebugInfoLevel -> Int #

enumFrom :: DebugInfoLevel -> [DebugInfoLevel]

enumFromThen :: DebugInfoLevel -> DebugInfoLevel -> [DebugInfoLevel]

enumFromTo :: DebugInfoLevel -> DebugInfoLevel -> [DebugInfoLevel]

enumFromThenTo :: DebugInfoLevel -> DebugInfoLevel -> DebugInfoLevel -> [DebugInfoLevel]

Enum OptimisationLevel 
Instance details

Defined in Distribution.Simple.Compiler

Methods

succ :: OptimisationLevel -> OptimisationLevel

pred :: OptimisationLevel -> OptimisationLevel

toEnum :: Int -> OptimisationLevel

fromEnum :: OptimisationLevel -> Int #

enumFrom :: OptimisationLevel -> [OptimisationLevel]

enumFromThen :: OptimisationLevel -> OptimisationLevel -> [OptimisationLevel]

enumFromTo :: OptimisationLevel -> OptimisationLevel -> [OptimisationLevel]

enumFromThenTo :: OptimisationLevel -> OptimisationLevel -> OptimisationLevel -> [OptimisationLevel]

Enum Way 
Instance details

Defined in Distribution.Simple.Hpc

Methods

succ :: Way -> Way

pred :: Way -> Way

toEnum :: Int -> Way

fromEnum :: Way -> Int #

enumFrom :: Way -> [Way]

enumFromThen :: Way -> Way -> [Way]

enumFromTo :: Way -> Way -> [Way]

enumFromThenTo :: Way -> Way -> Way -> [Way]

Enum TestShowDetails 
Instance details

Defined in Distribution.Simple.Setup

Methods

succ :: TestShowDetails -> TestShowDetails

pred :: TestShowDetails -> TestShowDetails

toEnum :: Int -> TestShowDetails

fromEnum :: TestShowDetails -> Int #

enumFrom :: TestShowDetails -> [TestShowDetails]

enumFromThen :: TestShowDetails -> TestShowDetails -> [TestShowDetails]

enumFromTo :: TestShowDetails -> TestShowDetails -> [TestShowDetails]

enumFromThenTo :: TestShowDetails -> TestShowDetails -> TestShowDetails -> [TestShowDetails]

Enum DumpBuildInfo 
Instance details

Defined in Distribution.Types.DumpBuildInfo

Methods

succ :: DumpBuildInfo -> DumpBuildInfo

pred :: DumpBuildInfo -> DumpBuildInfo

toEnum :: Int -> DumpBuildInfo

fromEnum :: DumpBuildInfo -> Int #

enumFrom :: DumpBuildInfo -> [DumpBuildInfo]

enumFromThen :: DumpBuildInfo -> DumpBuildInfo -> [DumpBuildInfo]

enumFromTo :: DumpBuildInfo -> DumpBuildInfo -> [DumpBuildInfo]

enumFromThenTo :: DumpBuildInfo -> DumpBuildInfo -> DumpBuildInfo -> [DumpBuildInfo]

Enum Verbosity 
Instance details

Defined in Distribution.Verbosity

Methods

succ :: Verbosity -> Verbosity

pred :: Verbosity -> Verbosity

toEnum :: Int -> Verbosity

fromEnum :: Verbosity -> Int #

enumFrom :: Verbosity -> [Verbosity]

enumFromThen :: Verbosity -> Verbosity -> [Verbosity]

enumFromTo :: Verbosity -> Verbosity -> [Verbosity]

enumFromThenTo :: Verbosity -> Verbosity -> Verbosity -> [Verbosity]

Enum VerbosityFlag 
Instance details

Defined in Distribution.Verbosity.Internal

Methods

succ :: VerbosityFlag -> VerbosityFlag

pred :: VerbosityFlag -> VerbosityFlag

toEnum :: Int -> VerbosityFlag

fromEnum :: VerbosityFlag -> Int #

enumFrom :: VerbosityFlag -> [VerbosityFlag]

enumFromThen :: VerbosityFlag -> VerbosityFlag -> [VerbosityFlag]

enumFromTo :: VerbosityFlag -> VerbosityFlag -> [VerbosityFlag]

enumFromThenTo :: VerbosityFlag -> VerbosityFlag -> VerbosityFlag -> [VerbosityFlag]

Enum VerbosityLevel 
Instance details

Defined in Distribution.Verbosity.Internal

Methods

succ :: VerbosityLevel -> VerbosityLevel

pred :: VerbosityLevel -> VerbosityLevel

toEnum :: Int -> VerbosityLevel

fromEnum :: VerbosityLevel -> Int #

enumFrom :: VerbosityLevel -> [VerbosityLevel]

enumFromThen :: VerbosityLevel -> VerbosityLevel -> [VerbosityLevel]

enumFromTo :: VerbosityLevel -> VerbosityLevel -> [VerbosityLevel]

enumFromThenTo :: VerbosityLevel -> VerbosityLevel -> VerbosityLevel -> [VerbosityLevel]

Enum CabalSpecVersion 
Instance details

Defined in Distribution.CabalSpecVersion

Methods

succ :: CabalSpecVersion -> CabalSpecVersion

pred :: CabalSpecVersion -> CabalSpecVersion

toEnum :: Int -> CabalSpecVersion

fromEnum :: CabalSpecVersion -> Int #

enumFrom :: CabalSpecVersion -> [CabalSpecVersion]

enumFromThen :: CabalSpecVersion -> CabalSpecVersion -> [CabalSpecVersion]

enumFromTo :: CabalSpecVersion -> CabalSpecVersion -> [CabalSpecVersion]

enumFromThenTo :: CabalSpecVersion -> CabalSpecVersion -> CabalSpecVersion -> [CabalSpecVersion]

Enum PWarnType 
Instance details

Defined in Distribution.Parsec.Warning

Methods

succ :: PWarnType -> PWarnType

pred :: PWarnType -> PWarnType

toEnum :: Int -> PWarnType

fromEnum :: PWarnType -> Int #

enumFrom :: PWarnType -> [PWarnType]

enumFromThen :: PWarnType -> PWarnType -> [PWarnType]

enumFromTo :: PWarnType -> PWarnType -> [PWarnType]

enumFromThenTo :: PWarnType -> PWarnType -> PWarnType -> [PWarnType]

Enum LicenseExceptionId 
Instance details

Defined in Distribution.SPDX.LicenseExceptionId

Methods

succ :: LicenseExceptionId -> LicenseExceptionId

pred :: LicenseExceptionId -> LicenseExceptionId

toEnum :: Int -> LicenseExceptionId

fromEnum :: LicenseExceptionId -> Int #

enumFrom :: LicenseExceptionId -> [LicenseExceptionId]

enumFromThen :: LicenseExceptionId -> LicenseExceptionId -> [LicenseExceptionId]

enumFromTo :: LicenseExceptionId -> LicenseExceptionId -> [LicenseExceptionId]

enumFromThenTo :: LicenseExceptionId -> LicenseExceptionId -> LicenseExceptionId -> [LicenseExceptionId]

Enum LicenseId 
Instance details

Defined in Distribution.SPDX.LicenseId

Methods

succ :: LicenseId -> LicenseId

pred :: LicenseId -> LicenseId

toEnum :: Int -> LicenseId

fromEnum :: LicenseId -> Int #

enumFrom :: LicenseId -> [LicenseId]

enumFromThen :: LicenseId -> LicenseId -> [LicenseId]

enumFromTo :: LicenseId -> LicenseId -> [LicenseId]

enumFromThenTo :: LicenseId -> LicenseId -> LicenseId -> [LicenseId]

Enum LicenseListVersion 
Instance details

Defined in Distribution.SPDX.LicenseListVersion

Methods

succ :: LicenseListVersion -> LicenseListVersion

pred :: LicenseListVersion -> LicenseListVersion

toEnum :: Int -> LicenseListVersion

fromEnum :: LicenseListVersion -> Int #

enumFrom :: LicenseListVersion -> [LicenseListVersion]

enumFromThen :: LicenseListVersion -> LicenseListVersion -> [LicenseListVersion]

enumFromTo :: LicenseListVersion -> LicenseListVersion -> [LicenseListVersion]

enumFromThenTo :: LicenseListVersion -> LicenseListVersion -> LicenseListVersion -> [LicenseListVersion]

Enum KnownRepoType 
Instance details

Defined in Distribution.Types.SourceRepo

Methods

succ :: KnownRepoType -> KnownRepoType

pred :: KnownRepoType -> KnownRepoType

toEnum :: Int -> KnownRepoType

fromEnum :: KnownRepoType -> Int #

enumFrom :: KnownRepoType -> [KnownRepoType]

enumFromThen :: KnownRepoType -> KnownRepoType -> [KnownRepoType]

enumFromTo :: KnownRepoType -> KnownRepoType -> [KnownRepoType]

enumFromThenTo :: KnownRepoType -> KnownRepoType -> KnownRepoType -> [KnownRepoType]

Enum KnownExtension 
Instance details

Defined in Language.Haskell.Extension

Methods

succ :: KnownExtension -> KnownExtension

pred :: KnownExtension -> KnownExtension

toEnum :: Int -> KnownExtension

fromEnum :: KnownExtension -> Int #

enumFrom :: KnownExtension -> [KnownExtension]

enumFromThen :: KnownExtension -> KnownExtension -> [KnownExtension]

enumFromTo :: KnownExtension -> KnownExtension -> [KnownExtension]

enumFromThenTo :: KnownExtension -> KnownExtension -> KnownExtension -> [KnownExtension]

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 BlinkSpeed 
Instance details

Defined in System.Console.ANSI.Types

Methods

succ :: BlinkSpeed -> BlinkSpeed

pred :: BlinkSpeed -> BlinkSpeed

toEnum :: Int -> BlinkSpeed

fromEnum :: BlinkSpeed -> Int #

enumFrom :: BlinkSpeed -> [BlinkSpeed]

enumFromThen :: BlinkSpeed -> BlinkSpeed -> [BlinkSpeed]

enumFromTo :: BlinkSpeed -> BlinkSpeed -> [BlinkSpeed]

enumFromThenTo :: BlinkSpeed -> BlinkSpeed -> BlinkSpeed -> [BlinkSpeed]

Enum Color 
Instance details

Defined in System.Console.ANSI.Types

Methods

succ :: Color -> Color

pred :: Color -> Color

toEnum :: Int -> Color

fromEnum :: Color -> Int #

enumFrom :: Color -> [Color]

enumFromThen :: Color -> Color -> [Color]

enumFromTo :: Color -> Color -> [Color]

enumFromThenTo :: Color -> Color -> Color -> [Color]

Enum ColorIntensity 
Instance details

Defined in System.Console.ANSI.Types

Methods

succ :: ColorIntensity -> ColorIntensity

pred :: ColorIntensity -> ColorIntensity

toEnum :: Int -> ColorIntensity

fromEnum :: ColorIntensity -> Int #

enumFrom :: ColorIntensity -> [ColorIntensity]

enumFromThen :: ColorIntensity -> ColorIntensity -> [ColorIntensity]

enumFromTo :: ColorIntensity -> ColorIntensity -> [ColorIntensity]

enumFromThenTo :: ColorIntensity -> ColorIntensity -> ColorIntensity -> [ColorIntensity]

Enum ConsoleIntensity 
Instance details

Defined in System.Console.ANSI.Types

Methods

succ :: ConsoleIntensity -> ConsoleIntensity

pred :: ConsoleIntensity -> ConsoleIntensity

toEnum :: Int -> ConsoleIntensity

fromEnum :: ConsoleIntensity -> Int #

enumFrom :: ConsoleIntensity -> [ConsoleIntensity]

enumFromThen :: ConsoleIntensity -> ConsoleIntensity -> [ConsoleIntensity]

enumFromTo :: ConsoleIntensity -> ConsoleIntensity -> [ConsoleIntensity]

enumFromThenTo :: ConsoleIntensity -> ConsoleIntensity -> ConsoleIntensity -> [ConsoleIntensity]

Enum ConsoleLayer 
Instance details

Defined in System.Console.ANSI.Types

Methods

succ :: ConsoleLayer -> ConsoleLayer

pred :: ConsoleLayer -> ConsoleLayer

toEnum :: Int -> ConsoleLayer

fromEnum :: ConsoleLayer -> Int #

enumFrom :: ConsoleLayer -> [ConsoleLayer]

enumFromThen :: ConsoleLayer -> ConsoleLayer -> [ConsoleLayer]

enumFromTo :: ConsoleLayer -> ConsoleLayer -> [ConsoleLayer]

enumFromThenTo :: ConsoleLayer -> ConsoleLayer -> ConsoleLayer -> [ConsoleLayer]

Enum Underlining 
Instance details

Defined in System.Console.ANSI.Types

Methods

succ :: Underlining -> Underlining

pred :: Underlining -> Underlining

toEnum :: Int -> Underlining

fromEnum :: Underlining -> Int #

enumFrom :: Underlining -> [Underlining]

enumFromThen :: Underlining -> Underlining -> [Underlining]

enumFromTo :: Underlining -> Underlining -> [Underlining]

enumFromThenTo :: Underlining -> Underlining -> Underlining -> [Underlining]

Enum CBool 
Instance details

Defined in Foreign.C.Types

Methods

succ :: CBool -> CBool

pred :: CBool -> CBool

toEnum :: Int -> CBool

fromEnum :: CBool -> Int #

enumFrom :: CBool -> [CBool]

enumFromThen :: CBool -> CBool -> [CBool]

enumFromTo :: CBool -> CBool -> [CBool]

enumFromThenTo :: CBool -> CBool -> CBool -> [CBool]

Enum CChar 
Instance details

Defined in Foreign.C.Types

Methods

succ :: CChar -> CChar

pred :: CChar -> CChar

toEnum :: Int -> CChar

fromEnum :: CChar -> Int #

enumFrom :: CChar -> [CChar]

enumFromThen :: CChar -> CChar -> [CChar]

enumFromTo :: CChar -> CChar -> [CChar]

enumFromThenTo :: CChar -> CChar -> CChar -> [CChar]

Enum CClock 
Instance details

Defined in Foreign.C.Types

Methods

succ :: CClock -> CClock

pred :: CClock -> CClock

toEnum :: Int -> CClock

fromEnum :: CClock -> Int #

enumFrom :: CClock -> [CClock]

enumFromThen :: CClock -> CClock -> [CClock]

enumFromTo :: CClock -> CClock -> [CClock]

enumFromThenTo :: CClock -> CClock -> CClock -> [CClock]

Enum CDouble 
Instance details

Defined in Foreign.C.Types

Methods

succ :: CDouble -> CDouble

pred :: CDouble -> CDouble

toEnum :: Int -> CDouble

fromEnum :: CDouble -> Int #

enumFrom :: CDouble -> [CDouble]

enumFromThen :: CDouble -> CDouble -> [CDouble]

enumFromTo :: CDouble -> CDouble -> [CDouble]

enumFromThenTo :: CDouble -> CDouble -> CDouble -> [CDouble]

Enum CFloat 
Instance details

Defined in Foreign.C.Types

Methods

succ :: CFloat -> CFloat

pred :: CFloat -> CFloat

toEnum :: Int -> CFloat

fromEnum :: CFloat -> Int #

enumFrom :: CFloat -> [CFloat]

enumFromThen :: CFloat -> CFloat -> [CFloat]

enumFromTo :: CFloat -> CFloat -> [CFloat]

enumFromThenTo :: CFloat -> CFloat -> CFloat -> [CFloat]

Enum CInt 
Instance details

Defined in 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 Foreign.C.Types

Methods

succ :: CIntMax -> CIntMax

pred :: CIntMax -> CIntMax

toEnum :: Int -> CIntMax

fromEnum :: CIntMax -> Int #

enumFrom :: CIntMax -> [CIntMax]

enumFromThen :: CIntMax -> CIntMax -> [CIntMax]

enumFromTo :: CIntMax -> CIntMax -> [CIntMax]

enumFromThenTo :: CIntMax -> CIntMax -> CIntMax -> [CIntMax]

Enum CIntPtr 
Instance details

Defined in Foreign.C.Types

Methods

succ :: CIntPtr -> CIntPtr

pred :: CIntPtr -> CIntPtr

toEnum :: Int -> CIntPtr

fromEnum :: CIntPtr -> Int #

enumFrom :: CIntPtr -> [CIntPtr]

enumFromThen :: CIntPtr -> CIntPtr -> [CIntPtr]

enumFromTo :: CIntPtr -> CIntPtr -> [CIntPtr]

enumFromThenTo :: CIntPtr -> CIntPtr -> CIntPtr -> [CIntPtr]

Enum CLLong 
Instance details

Defined in Foreign.C.Types

Methods

succ :: CLLong -> CLLong

pred :: CLLong -> CLLong

toEnum :: Int -> CLLong

fromEnum :: CLLong -> Int #

enumFrom :: CLLong -> [CLLong]

enumFromThen :: CLLong -> CLLong -> [CLLong]

enumFromTo :: CLLong -> CLLong -> [CLLong]

enumFromThenTo :: CLLong -> CLLong -> CLLong -> [CLLong]

Enum CLong 
Instance details

Defined in Foreign.C.Types

Methods

succ :: CLong -> CLong

pred :: CLong -> CLong

toEnum :: Int -> CLong

fromEnum :: CLong -> Int #

enumFrom :: CLong -> [CLong]

enumFromThen :: CLong -> CLong -> [CLong]

enumFromTo :: CLong -> CLong -> [CLong]

enumFromThenTo :: CLong -> CLong -> CLong -> [CLong]

Enum CPtrdiff 
Instance details

Defined in Foreign.C.Types

Methods

succ :: CPtrdiff -> CPtrdiff

pred :: CPtrdiff -> CPtrdiff

toEnum :: Int -> CPtrdiff

fromEnum :: CPtrdiff -> Int #

enumFrom :: CPtrdiff -> [CPtrdiff]

enumFromThen :: CPtrdiff -> CPtrdiff -> [CPtrdiff]

enumFromTo :: CPtrdiff -> CPtrdiff -> [CPtrdiff]

enumFromThenTo :: CPtrdiff -> CPtrdiff -> CPtrdiff -> [CPtrdiff]

Enum CSChar 
Instance details

Defined in Foreign.C.Types

Methods

succ :: CSChar -> CSChar

pred :: CSChar -> CSChar

toEnum :: Int -> CSChar

fromEnum :: CSChar -> Int #

enumFrom :: CSChar -> [CSChar]

enumFromThen :: CSChar -> CSChar -> [CSChar]

enumFromTo :: CSChar -> CSChar -> [CSChar]

enumFromThenTo :: CSChar -> CSChar -> CSChar -> [CSChar]

Enum CSUSeconds 
Instance details

Defined in Foreign.C.Types

Methods

succ :: CSUSeconds -> CSUSeconds

pred :: CSUSeconds -> CSUSeconds

toEnum :: Int -> CSUSeconds

fromEnum :: CSUSeconds -> Int #

enumFrom :: CSUSeconds -> [CSUSeconds]

enumFromThen :: CSUSeconds -> CSUSeconds -> [CSUSeconds]

enumFromTo :: CSUSeconds -> CSUSeconds -> [CSUSeconds]

enumFromThenTo :: CSUSeconds -> CSUSeconds -> CSUSeconds -> [CSUSeconds]

Enum CShort 
Instance details

Defined in Foreign.C.Types

Methods

succ :: CShort -> CShort

pred :: CShort -> CShort

toEnum :: Int -> CShort

fromEnum :: CShort -> Int #

enumFrom :: CShort -> [CShort]

enumFromThen :: CShort -> CShort -> [CShort]

enumFromTo :: CShort -> CShort -> [CShort]

enumFromThenTo :: CShort -> CShort -> CShort -> [CShort]

Enum CSigAtomic 
Instance details

Defined in Foreign.C.Types

Methods

succ :: CSigAtomic -> CSigAtomic

pred :: CSigAtomic -> CSigAtomic

toEnum :: Int -> CSigAtomic

fromEnum :: CSigAtomic -> Int #

enumFrom :: CSigAtomic -> [CSigAtomic]

enumFromThen :: CSigAtomic -> CSigAtomic -> [CSigAtomic]

enumFromTo :: CSigAtomic -> CSigAtomic -> [CSigAtomic]

enumFromThenTo :: CSigAtomic -> CSigAtomic -> CSigAtomic -> [CSigAtomic]

Enum CSize 
Instance details

Defined in Foreign.C.Types

Methods

succ :: CSize -> CSize

pred :: CSize -> CSize

toEnum :: Int -> CSize

fromEnum :: CSize -> Int #

enumFrom :: CSize -> [CSize]

enumFromThen :: CSize -> CSize -> [CSize]

enumFromTo :: CSize -> CSize -> [CSize]

enumFromThenTo :: CSize -> CSize -> CSize -> [CSize]

Enum CTime 
Instance details

Defined in Foreign.C.Types

Methods

succ :: CTime -> CTime

pred :: CTime -> CTime

toEnum :: Int -> CTime

fromEnum :: CTime -> Int #

enumFrom :: CTime -> [CTime]

enumFromThen :: CTime -> CTime -> [CTime]

enumFromTo :: CTime -> CTime -> [CTime]

enumFromThenTo :: CTime -> CTime -> CTime -> [CTime]

Enum CUChar 
Instance details

Defined in Foreign.C.Types

Methods

succ :: CUChar -> CUChar

pred :: CUChar -> CUChar

toEnum :: Int -> CUChar

fromEnum :: CUChar -> Int #

enumFrom :: CUChar -> [CUChar]

enumFromThen :: CUChar -> CUChar -> [CUChar]

enumFromTo :: CUChar -> CUChar -> [CUChar]

enumFromThenTo :: CUChar -> CUChar -> CUChar -> [CUChar]

Enum CUInt 
Instance details

Defined in Foreign.C.Types

Methods

succ :: CUInt -> CUInt

pred :: CUInt -> CUInt

toEnum :: Int -> CUInt

fromEnum :: CUInt -> Int #

enumFrom :: CUInt -> [CUInt]

enumFromThen :: CUInt -> CUInt -> [CUInt]

enumFromTo :: CUInt -> CUInt -> [CUInt]

enumFromThenTo :: CUInt -> CUInt -> CUInt -> [CUInt]

Enum CUIntMax 
Instance details

Defined in Foreign.C.Types

Methods

succ :: CUIntMax -> CUIntMax

pred :: CUIntMax -> CUIntMax

toEnum :: Int -> CUIntMax

fromEnum :: CUIntMax -> Int #

enumFrom :: CUIntMax -> [CUIntMax]

enumFromThen :: CUIntMax -> CUIntMax -> [CUIntMax]

enumFromTo :: CUIntMax -> CUIntMax -> [CUIntMax]

enumFromThenTo :: CUIntMax -> CUIntMax -> CUIntMax -> [CUIntMax]

Enum CUIntPtr 
Instance details

Defined in Foreign.C.Types

Methods

succ :: CUIntPtr -> CUIntPtr

pred :: CUIntPtr -> CUIntPtr

toEnum :: Int -> CUIntPtr

fromEnum :: CUIntPtr -> Int #

enumFrom :: CUIntPtr -> [CUIntPtr]

enumFromThen :: CUIntPtr -> CUIntPtr -> [CUIntPtr]

enumFromTo :: CUIntPtr -> CUIntPtr -> [CUIntPtr]

enumFromThenTo :: CUIntPtr -> CUIntPtr -> CUIntPtr -> [CUIntPtr]

Enum CULLong 
Instance details

Defined in Foreign.C.Types

Methods

succ :: CULLong -> CULLong

pred :: CULLong -> CULLong

toEnum :: Int -> CULLong

fromEnum :: CULLong -> Int #

enumFrom :: CULLong -> [CULLong]

enumFromThen :: CULLong -> CULLong -> [CULLong]

enumFromTo :: CULLong -> CULLong -> [CULLong]

enumFromThenTo :: CULLong -> CULLong -> CULLong -> [CULLong]

Enum CULong 
Instance details

Defined in Foreign.C.Types

Methods

succ :: CULong -> CULong

pred :: CULong -> CULong

toEnum :: Int -> CULong

fromEnum :: CULong -> Int #

enumFrom :: CULong -> [CULong]

enumFromThen :: CULong -> CULong -> [CULong]

enumFromTo :: CULong -> CULong -> [CULong]

enumFromThenTo :: CULong -> CULong -> CULong -> [CULong]

Enum CUSeconds 
Instance details

Defined in Foreign.C.Types

Methods

succ :: CUSeconds -> CUSeconds

pred :: CUSeconds -> CUSeconds

toEnum :: Int -> CUSeconds

fromEnum :: CUSeconds -> Int #

enumFrom :: CUSeconds -> [CUSeconds]

enumFromThen :: CUSeconds -> CUSeconds -> [CUSeconds]

enumFromTo :: CUSeconds -> CUSeconds -> [CUSeconds]

enumFromThenTo :: CUSeconds -> CUSeconds -> CUSeconds -> [CUSeconds]

Enum CUShort 
Instance details

Defined in Foreign.C.Types

Methods

succ :: CUShort -> CUShort

pred :: CUShort -> CUShort

toEnum :: Int -> CUShort

fromEnum :: CUShort -> Int #

enumFrom :: CUShort -> [CUShort]

enumFromThen :: CUShort -> CUShort -> [CUShort]

enumFromTo :: CUShort -> CUShort -> [CUShort]

enumFromThenTo :: CUShort -> CUShort -> CUShort -> [CUShort]

Enum CWchar 
Instance details

Defined in Foreign.C.Types

Methods

succ :: CWchar -> CWchar

pred :: CWchar -> CWchar

toEnum :: Int -> CWchar

fromEnum :: CWchar -> Int #

enumFrom :: CWchar -> [CWchar]

enumFromThen :: CWchar -> CWchar -> [CWchar]

enumFromTo :: CWchar -> CWchar -> [CWchar]

enumFromThenTo :: CWchar -> CWchar -> CWchar -> [CWchar]

Enum IntPtr 
Instance details

Defined in Foreign.Ptr

Methods

succ :: IntPtr -> IntPtr

pred :: IntPtr -> IntPtr

toEnum :: Int -> IntPtr

fromEnum :: IntPtr -> Int #

enumFrom :: IntPtr -> [IntPtr]

enumFromThen :: IntPtr -> IntPtr -> [IntPtr]

enumFromTo :: IntPtr -> IntPtr -> [IntPtr]

enumFromThenTo :: IntPtr -> IntPtr -> IntPtr -> [IntPtr]

Enum WordPtr 
Instance details

Defined in Foreign.Ptr

Methods

succ :: WordPtr -> WordPtr

pred :: WordPtr -> WordPtr

toEnum :: Int -> WordPtr

fromEnum :: WordPtr -> Int #

enumFrom :: WordPtr -> [WordPtr]

enumFromThen :: WordPtr -> WordPtr -> [WordPtr]

enumFromTo :: WordPtr -> WordPtr -> [WordPtr]

enumFromThenTo :: WordPtr -> WordPtr -> WordPtr -> [WordPtr]

Enum ByteOrder 
Instance details

Defined in GHC.ByteOrder

Methods

succ :: ByteOrder -> ByteOrder

pred :: ByteOrder -> ByteOrder

toEnum :: Int -> ByteOrder

fromEnum :: ByteOrder -> Int #

enumFrom :: ByteOrder -> [ByteOrder]

enumFromThen :: ByteOrder -> ByteOrder -> [ByteOrder]

enumFromTo :: ByteOrder -> ByteOrder -> [ByteOrder]

enumFromThenTo :: ByteOrder -> ByteOrder -> ByteOrder -> [ByteOrder]

Enum Associativity 
Instance details

Defined in GHC.Generics

Methods

succ :: Associativity -> Associativity

pred :: Associativity -> Associativity

toEnum :: Int -> Associativity

fromEnum :: Associativity -> Int #

enumFrom :: Associativity -> [Associativity]

enumFromThen :: Associativity -> Associativity -> [Associativity]

enumFromTo :: Associativity -> Associativity -> [Associativity]

enumFromThenTo :: Associativity -> Associativity -> Associativity -> [Associativity]

Enum DecidedStrictness 
Instance details

Defined in GHC.Generics

Methods

succ :: DecidedStrictness -> DecidedStrictness

pred :: DecidedStrictness -> DecidedStrictness

toEnum :: Int -> DecidedStrictness

fromEnum :: DecidedStrictness -> Int #

enumFrom :: DecidedStrictness -> [DecidedStrictness]

enumFromThen :: DecidedStrictness -> DecidedStrictness -> [DecidedStrictness]

enumFromTo :: DecidedStrictness -> DecidedStrictness -> [DecidedStrictness]

enumFromThenTo :: DecidedStrictness -> DecidedStrictness -> DecidedStrictness -> [DecidedStrictness]

Enum SourceStrictness 
Instance details

Defined in GHC.Generics

Methods

succ :: SourceStrictness -> SourceStrictness

pred :: SourceStrictness -> SourceStrictness

toEnum :: Int -> SourceStrictness

fromEnum :: SourceStrictness -> Int #

enumFrom :: SourceStrictness -> [SourceStrictness]

enumFromThen :: SourceStrictness -> SourceStrictness -> [SourceStrictness]

enumFromTo :: SourceStrictness -> SourceStrictness -> [SourceStrictness]

enumFromThenTo :: SourceStrictness -> SourceStrictness -> SourceStrictness -> [SourceStrictness]

Enum SourceUnpackedness 
Instance details

Defined in GHC.Generics

Methods

succ :: SourceUnpackedness -> SourceUnpackedness

pred :: SourceUnpackedness -> SourceUnpackedness

toEnum :: Int -> SourceUnpackedness

fromEnum :: SourceUnpackedness -> Int #

enumFrom :: SourceUnpackedness -> [SourceUnpackedness]

enumFromThen :: SourceUnpackedness -> SourceUnpackedness -> [SourceUnpackedness]

enumFromTo :: SourceUnpackedness -> SourceUnpackedness -> [SourceUnpackedness]

enumFromThenTo :: SourceUnpackedness -> SourceUnpackedness -> SourceUnpackedness -> [SourceUnpackedness]

Enum SeekMode 
Instance details

Defined in GHC.IO.Device

Enum IOMode 
Instance details

Defined in GHC.IO.IOMode

Enum Int16 
Instance details

Defined in GHC.Int

Enum Int32 
Instance details

Defined in GHC.Int

Enum Int64 
Instance details

Defined in GHC.Int

Enum Int8 
Instance details

Defined in GHC.Int

Enum DoCostCentres 
Instance details

Defined in GHC.RTS.Flags

Methods

succ :: DoCostCentres -> DoCostCentres

pred :: DoCostCentres -> DoCostCentres

toEnum :: Int -> DoCostCentres

fromEnum :: DoCostCentres -> Int #

enumFrom :: DoCostCentres -> [DoCostCentres]

enumFromThen :: DoCostCentres -> DoCostCentres -> [DoCostCentres]

enumFromTo :: DoCostCentres -> DoCostCentres -> [DoCostCentres]

enumFromThenTo :: DoCostCentres -> DoCostCentres -> DoCostCentres -> [DoCostCentres]

Enum DoHeapProfile 
Instance details

Defined in GHC.RTS.Flags

Methods

succ :: DoHeapProfile -> DoHeapProfile

pred :: DoHeapProfile -> DoHeapProfile

toEnum :: Int -> DoHeapProfile

fromEnum :: DoHeapProfile -> Int #

enumFrom :: DoHeapProfile -> [DoHeapProfile]

enumFromThen :: DoHeapProfile -> DoHeapProfile -> [DoHeapProfile]

enumFromTo :: DoHeapProfile -> DoHeapProfile -> [DoHeapProfile]

enumFromThenTo :: DoHeapProfile -> DoHeapProfile -> DoHeapProfile -> [DoHeapProfile]

Enum DoTrace 
Instance details

Defined in GHC.RTS.Flags

Methods

succ :: DoTrace -> DoTrace

pred :: DoTrace -> DoTrace

toEnum :: Int -> DoTrace

fromEnum :: DoTrace -> Int #

enumFrom :: DoTrace -> [DoTrace]

enumFromThen :: DoTrace -> DoTrace -> [DoTrace]

enumFromTo :: DoTrace -> DoTrace -> [DoTrace]

enumFromThenTo :: DoTrace -> DoTrace -> DoTrace -> [DoTrace]

Enum GiveGCStats 
Instance details

Defined in GHC.RTS.Flags

Methods

succ :: GiveGCStats -> GiveGCStats

pred :: GiveGCStats -> GiveGCStats

toEnum :: Int -> GiveGCStats

fromEnum :: GiveGCStats -> Int #

enumFrom :: GiveGCStats -> [GiveGCStats]

enumFromThen :: GiveGCStats -> GiveGCStats -> [GiveGCStats]

enumFromTo :: GiveGCStats -> GiveGCStats -> [GiveGCStats]

enumFromThenTo :: GiveGCStats -> GiveGCStats -> GiveGCStats -> [GiveGCStats]

Enum IoSubSystem 
Instance details

Defined in GHC.RTS.Flags

Methods

succ :: IoSubSystem -> IoSubSystem

pred :: IoSubSystem -> IoSubSystem

toEnum :: Int -> IoSubSystem

fromEnum :: IoSubSystem -> Int #

enumFrom :: IoSubSystem -> [IoSubSystem]

enumFromThen :: IoSubSystem -> IoSubSystem -> [IoSubSystem]

enumFromTo :: IoSubSystem -> IoSubSystem -> [IoSubSystem]

enumFromThenTo :: IoSubSystem -> IoSubSystem -> IoSubSystem -> [IoSubSystem]

Enum GeneralCategory 
Instance details

Defined in GHC.Unicode

Methods

succ :: GeneralCategory -> GeneralCategory

pred :: GeneralCategory -> GeneralCategory

toEnum :: Int -> GeneralCategory

fromEnum :: GeneralCategory -> Int #

enumFrom :: GeneralCategory -> [GeneralCategory]

enumFromThen :: GeneralCategory -> GeneralCategory -> [GeneralCategory]

enumFromTo :: GeneralCategory -> GeneralCategory -> [GeneralCategory]

enumFromThenTo :: GeneralCategory -> GeneralCategory -> GeneralCategory -> [GeneralCategory]

Enum Word16 
Instance details

Defined in GHC.Word

Enum Word32 
Instance details

Defined in GHC.Word

Enum Word64 
Instance details

Defined in GHC.Word

Enum Word8 
Instance details

Defined in GHC.Word

Enum CBlkCnt 
Instance details

Defined in System.Posix.Types

Methods

succ :: CBlkCnt -> CBlkCnt

pred :: CBlkCnt -> CBlkCnt

toEnum :: Int -> CBlkCnt

fromEnum :: CBlkCnt -> Int #

enumFrom :: CBlkCnt -> [CBlkCnt]

enumFromThen :: CBlkCnt -> CBlkCnt -> [CBlkCnt]

enumFromTo :: CBlkCnt -> CBlkCnt -> [CBlkCnt]

enumFromThenTo :: CBlkCnt -> CBlkCnt -> CBlkCnt -> [CBlkCnt]

Enum CBlkSize 
Instance details

Defined in System.Posix.Types

Methods

succ :: CBlkSize -> CBlkSize

pred :: CBlkSize -> CBlkSize

toEnum :: Int -> CBlkSize

fromEnum :: CBlkSize -> Int #

enumFrom :: CBlkSize -> [CBlkSize]

enumFromThen :: CBlkSize -> CBlkSize -> [CBlkSize]

enumFromTo :: CBlkSize -> CBlkSize -> [CBlkSize]

enumFromThenTo :: CBlkSize -> CBlkSize -> CBlkSize -> [CBlkSize]

Enum CCc 
Instance details

Defined in 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 System.Posix.Types

Methods

succ :: CClockId -> CClockId

pred :: CClockId -> CClockId

toEnum :: Int -> CClockId

fromEnum :: CClockId -> Int #

enumFrom :: CClockId -> [CClockId]

enumFromThen :: CClockId -> CClockId -> [CClockId]

enumFromTo :: CClockId -> CClockId -> [CClockId]

enumFromThenTo :: CClockId -> CClockId -> CClockId -> [CClockId]

Enum CDev 
Instance details

Defined in 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 System.Posix.Types

Methods

succ :: CFsBlkCnt -> CFsBlkCnt

pred :: CFsBlkCnt -> CFsBlkCnt

toEnum :: Int -> CFsBlkCnt

fromEnum :: CFsBlkCnt -> Int #

enumFrom :: CFsBlkCnt -> [CFsBlkCnt]

enumFromThen :: CFsBlkCnt -> CFsBlkCnt -> [CFsBlkCnt]

enumFromTo :: CFsBlkCnt -> CFsBlkCnt -> [CFsBlkCnt]

enumFromThenTo :: CFsBlkCnt -> CFsBlkCnt -> CFsBlkCnt -> [CFsBlkCnt]

Enum CFsFilCnt 
Instance details

Defined in System.Posix.Types

Methods

succ :: CFsFilCnt -> CFsFilCnt

pred :: CFsFilCnt -> CFsFilCnt

toEnum :: Int -> CFsFilCnt

fromEnum :: CFsFilCnt -> Int #

enumFrom :: CFsFilCnt -> [CFsFilCnt]

enumFromThen :: CFsFilCnt -> CFsFilCnt -> [CFsFilCnt]

enumFromTo :: CFsFilCnt -> CFsFilCnt -> [CFsFilCnt]

enumFromThenTo :: CFsFilCnt -> CFsFilCnt -> CFsFilCnt -> [CFsFilCnt]

Enum CGid 
Instance details

Defined in 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 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 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 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 System.Posix.Types

Methods

succ :: CMode -> CMode

pred :: CMode -> CMode

toEnum :: Int -> CMode

fromEnum :: CMode -> Int #

enumFrom :: CMode -> [CMode]

enumFromThen :: CMode -> CMode -> [CMode]

enumFromTo :: CMode -> CMode -> [CMode]

enumFromThenTo :: CMode -> CMode -> CMode -> [CMode]

Enum CNfds 
Instance details

Defined in System.Posix.Types

Methods

succ :: CNfds -> CNfds

pred :: CNfds -> CNfds

toEnum :: Int -> CNfds

fromEnum :: CNfds -> Int #

enumFrom :: CNfds -> [CNfds]

enumFromThen :: CNfds -> CNfds -> [CNfds]

enumFromTo :: CNfds -> CNfds -> [CNfds]

enumFromThenTo :: CNfds -> CNfds -> CNfds -> [CNfds]

Enum CNlink 
Instance details

Defined in System.Posix.Types

Methods

succ :: CNlink -> CNlink

pred :: CNlink -> CNlink

toEnum :: Int -> CNlink

fromEnum :: CNlink -> Int #

enumFrom :: CNlink -> [CNlink]

enumFromThen :: CNlink -> CNlink -> [CNlink]

enumFromTo :: CNlink -> CNlink -> [CNlink]

enumFromThenTo :: CNlink -> CNlink -> CNlink -> [CNlink]

Enum COff 
Instance details

Defined in 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 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 System.Posix.Types

Methods

succ :: CRLim -> CRLim

pred :: CRLim -> CRLim

toEnum :: Int -> CRLim

fromEnum :: CRLim -> Int #

enumFrom :: CRLim -> [CRLim]

enumFromThen :: CRLim -> CRLim -> [CRLim]

enumFromTo :: CRLim -> CRLim -> [CRLim]

enumFromThenTo :: CRLim -> CRLim -> CRLim -> [CRLim]

Enum CSocklen 
Instance details

Defined in System.Posix.Types

Methods

succ :: CSocklen -> CSocklen

pred :: CSocklen -> CSocklen

toEnum :: Int -> CSocklen

fromEnum :: CSocklen -> Int #

enumFrom :: CSocklen -> [CSocklen]

enumFromThen :: CSocklen -> CSocklen -> [CSocklen]

enumFromTo :: CSocklen -> CSocklen -> [CSocklen]

enumFromThenTo :: CSocklen -> CSocklen -> CSocklen -> [CSocklen]

Enum CSpeed 
Instance details

Defined in System.Posix.Types

Methods

succ :: CSpeed -> CSpeed

pred :: CSpeed -> CSpeed

toEnum :: Int -> CSpeed

fromEnum :: CSpeed -> Int #

enumFrom :: CSpeed -> [CSpeed]

enumFromThen :: CSpeed -> CSpeed -> [CSpeed]

enumFromTo :: CSpeed -> CSpeed -> [CSpeed]

enumFromThenTo :: CSpeed -> CSpeed -> CSpeed -> [CSpeed]

Enum CSsize 
Instance details

Defined in System.Posix.Types

Methods

succ :: CSsize -> CSsize

pred :: CSsize -> CSsize

toEnum :: Int -> CSsize

fromEnum :: CSsize -> Int #

enumFrom :: CSsize -> [CSsize]

enumFromThen :: CSsize -> CSsize -> [CSsize]

enumFromTo :: CSsize -> CSsize -> [CSsize]

enumFromThenTo :: CSsize -> CSsize -> CSsize -> [CSsize]

Enum CTcflag 
Instance details

Defined in System.Posix.Types

Methods

succ :: CTcflag -> CTcflag

pred :: CTcflag -> CTcflag

toEnum :: Int -> CTcflag

fromEnum :: CTcflag -> Int #

enumFrom :: CTcflag -> [CTcflag]

enumFromThen :: CTcflag -> CTcflag -> [CTcflag]

enumFromTo :: CTcflag -> CTcflag -> [CTcflag]

enumFromThenTo :: CTcflag -> CTcflag -> CTcflag -> [CTcflag]

Enum CUid 
Instance details

Defined in 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 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 Encoding 
Instance details

Defined in Basement.String

Methods

succ :: Encoding -> Encoding

pred :: Encoding -> Encoding

toEnum :: Int -> Encoding

fromEnum :: Encoding -> Int #

enumFrom :: Encoding -> [Encoding]

enumFromThen :: Encoding -> Encoding -> [Encoding]

enumFromTo :: Encoding -> Encoding -> [Encoding]

enumFromThenTo :: Encoding -> Encoding -> Encoding -> [Encoding]

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

Methods

succ :: CryptoError -> CryptoError

pred :: CryptoError -> CryptoError

toEnum :: Int -> CryptoError

fromEnum :: CryptoError -> Int #

enumFrom :: CryptoError -> [CryptoError]

enumFromThen :: CryptoError -> CryptoError -> [CryptoError]

enumFromTo :: CryptoError -> CryptoError -> [CryptoError]

enumFromThenTo :: CryptoError -> CryptoError -> CryptoError -> [CryptoError]

Enum Variant 
Instance details

Defined in Crypto.KDF.Argon2

Methods

succ :: Variant -> Variant

pred :: Variant -> Variant

toEnum :: Int -> Variant

fromEnum :: Variant -> Int #

enumFrom :: Variant -> [Variant]

enumFromThen :: Variant -> Variant -> [Variant]

enumFromTo :: Variant -> Variant -> [Variant]

enumFromThenTo :: Variant -> Variant -> Variant -> [Variant]

Enum Version 
Instance details

Defined in Crypto.KDF.Argon2

Methods

succ :: Version -> Version

pred :: Version -> Version

toEnum :: Int -> Version

fromEnum :: Version -> Int #

enumFrom :: Version -> [Version]

enumFromThen :: Version -> Version -> [Version]

enumFromTo :: Version -> Version -> [Version]

enumFromThenTo :: Version -> Version -> Version -> [Version]

Enum ClockSkew 
Instance details

Defined in Crypto.OTP

Methods

succ :: ClockSkew -> ClockSkew

pred :: ClockSkew -> ClockSkew

toEnum :: Int -> ClockSkew

fromEnum :: ClockSkew -> Int #

enumFrom :: ClockSkew -> [ClockSkew]

enumFromThen :: ClockSkew -> ClockSkew -> [ClockSkew]

enumFromTo :: ClockSkew -> ClockSkew -> [ClockSkew]

enumFromThenTo :: ClockSkew -> ClockSkew -> ClockSkew -> [ClockSkew]

Enum PrivateNumber 
Instance details

Defined in Crypto.PubKey.DH

Methods

succ :: PrivateNumber -> PrivateNumber

pred :: PrivateNumber -> PrivateNumber

toEnum :: Int -> PrivateNumber

fromEnum :: PrivateNumber -> Int #

enumFrom :: PrivateNumber -> [PrivateNumber]

enumFromThen :: PrivateNumber -> PrivateNumber -> [PrivateNumber]

enumFromTo :: PrivateNumber -> PrivateNumber -> [PrivateNumber]

enumFromThenTo :: PrivateNumber -> PrivateNumber -> PrivateNumber -> [PrivateNumber]

Enum PublicNumber 
Instance details

Defined in Crypto.PubKey.DH

Methods

succ :: PublicNumber -> PublicNumber

pred :: PublicNumber -> PublicNumber

toEnum :: Int -> PublicNumber

fromEnum :: PublicNumber -> Int #

enumFrom :: PublicNumber -> [PublicNumber]

enumFromThen :: PublicNumber -> PublicNumber -> [PublicNumber]

enumFromTo :: PublicNumber -> PublicNumber -> [PublicNumber]

enumFromThenTo :: PublicNumber -> PublicNumber -> PublicNumber -> [PublicNumber]

Enum CurveName 
Instance details

Defined in Crypto.PubKey.ECC.Types

Methods

succ :: CurveName -> CurveName

pred :: CurveName -> CurveName

toEnum :: Int -> CurveName

fromEnum :: CurveName -> Int #

enumFrom :: CurveName -> [CurveName]

enumFromThen :: CurveName -> CurveName -> [CurveName]

enumFromTo :: CurveName -> CurveName -> [CurveName]

enumFromThenTo :: CurveName -> CurveName -> CurveName -> [CurveName]

Enum ProcessorOption 
Instance details

Defined in Crypto.System.CPU

Methods

succ :: ProcessorOption -> ProcessorOption

pred :: ProcessorOption -> ProcessorOption

toEnum :: Int -> ProcessorOption

fromEnum :: ProcessorOption -> Int #

enumFrom :: ProcessorOption -> [ProcessorOption]

enumFromThen :: ProcessorOption -> ProcessorOption -> [ProcessorOption]

enumFromTo :: ProcessorOption -> ProcessorOption -> [ProcessorOption]

enumFromThenTo :: ProcessorOption -> ProcessorOption -> ProcessorOption -> [ProcessorOption]

Enum FileType 
Instance details

Defined in System.Directory.Internal.Common

Methods

succ :: FileType -> FileType

pred :: FileType -> FileType

toEnum :: Int -> FileType

fromEnum :: FileType -> Int #

enumFrom :: FileType -> [FileType]

enumFromThen :: FileType -> FileType -> [FileType]

enumFromTo :: FileType -> FileType -> [FileType]

enumFromThenTo :: FileType -> FileType -> FileType -> [FileType]

Enum XdgDirectory 
Instance details

Defined in System.Directory.Internal.Common

Methods

succ :: XdgDirectory -> XdgDirectory

pred :: XdgDirectory -> XdgDirectory

toEnum :: Int -> XdgDirectory

fromEnum :: XdgDirectory -> Int #

enumFrom :: XdgDirectory -> [XdgDirectory]

enumFromThen :: XdgDirectory -> XdgDirectory -> [XdgDirectory]

enumFromTo :: XdgDirectory -> XdgDirectory -> [XdgDirectory]

enumFromThenTo :: XdgDirectory -> XdgDirectory -> XdgDirectory -> [XdgDirectory]

Enum XdgDirectoryList 
Instance details

Defined in System.Directory.Internal.Common

Methods

succ :: XdgDirectoryList -> XdgDirectoryList

pred :: XdgDirectoryList -> XdgDirectoryList

toEnum :: Int -> XdgDirectoryList

fromEnum :: XdgDirectoryList -> Int #

enumFrom :: XdgDirectoryList -> [XdgDirectoryList]

enumFromThen :: XdgDirectoryList -> XdgDirectoryList -> [XdgDirectoryList]

enumFromTo :: XdgDirectoryList -> XdgDirectoryList -> [XdgDirectoryList]

enumFromThenTo :: XdgDirectoryList -> XdgDirectoryList -> XdgDirectoryList -> [XdgDirectoryList]

Enum Extension 
Instance details

Defined in GHC.LanguageExtensions.Type

Methods

succ :: Extension -> Extension

pred :: Extension -> Extension

toEnum :: Int -> Extension

fromEnum :: Extension -> Int #

enumFrom :: Extension -> [Extension]

enumFromThen :: Extension -> Extension -> [Extension]

enumFromTo :: Extension -> Extension -> [Extension]

enumFromThenTo :: Extension -> Extension -> Extension -> [Extension]

Enum Ordering 
Instance details

Defined in GHC.Enum

Enum IfaceVersion 
Instance details

Defined in HiFileParser

Methods

succ :: IfaceVersion -> IfaceVersion

pred :: IfaceVersion -> IfaceVersion

toEnum :: Int -> IfaceVersion

fromEnum :: IfaceVersion -> Int #

enumFrom :: IfaceVersion -> [IfaceVersion]

enumFromThen :: IfaceVersion -> IfaceVersion -> [IfaceVersion]

enumFromTo :: IfaceVersion -> IfaceVersion -> [IfaceVersion]

enumFromThenTo :: IfaceVersion -> IfaceVersion -> IfaceVersion -> [IfaceVersion]

Enum BuildType 
Instance details

Defined in Hpack.Config

Enum MaxHeaderLength 
Instance details

Defined in Network.HTTP.Client.Types

Methods

succ :: MaxHeaderLength -> MaxHeaderLength

pred :: MaxHeaderLength -> MaxHeaderLength

toEnum :: Int -> MaxHeaderLength

fromEnum :: MaxHeaderLength -> Int #

enumFrom :: MaxHeaderLength -> [MaxHeaderLength]

enumFromThen :: MaxHeaderLength -> MaxHeaderLength -> [MaxHeaderLength]

enumFromTo :: MaxHeaderLength -> MaxHeaderLength -> [MaxHeaderLength]

enumFromThenTo :: MaxHeaderLength -> MaxHeaderLength -> MaxHeaderLength -> [MaxHeaderLength]

Enum MaxNumberHeaders 
Instance details

Defined in Network.HTTP.Client.Types

Methods

succ :: MaxNumberHeaders -> MaxNumberHeaders

pred :: MaxNumberHeaders -> MaxNumberHeaders

toEnum :: Int -> MaxNumberHeaders

fromEnum :: MaxNumberHeaders -> Int #

enumFrom :: MaxNumberHeaders -> [MaxNumberHeaders]

enumFromThen :: MaxNumberHeaders -> MaxNumberHeaders -> [MaxNumberHeaders]

enumFromTo :: MaxNumberHeaders -> MaxNumberHeaders -> [MaxNumberHeaders]

enumFromThenTo :: MaxNumberHeaders -> MaxNumberHeaders -> MaxNumberHeaders -> [MaxNumberHeaders]

Enum StdMethod 
Instance details

Defined in Network.HTTP.Types.Method

Methods

succ :: StdMethod -> StdMethod

pred :: StdMethod -> StdMethod

toEnum :: Int -> StdMethod

fromEnum :: StdMethod -> Int #

enumFrom :: StdMethod -> [StdMethod]

enumFromThen :: StdMethod -> StdMethod -> [StdMethod]

enumFromTo :: StdMethod -> StdMethod -> [StdMethod]

enumFromThenTo :: StdMethod -> StdMethod -> StdMethod -> [StdMethod]

Enum Status 
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 EventType 
Instance details

Defined in Text.Libyaml

Methods

succ :: EventType -> EventType

pred :: EventType -> EventType

toEnum :: Int -> EventType

fromEnum :: EventType -> Int #

enumFrom :: EventType -> [EventType]

enumFromThen :: EventType -> EventType -> [EventType]

enumFromTo :: EventType -> EventType -> [EventType]

enumFromThenTo :: EventType -> EventType -> EventType -> [EventType]

Enum MappingStyle 
Instance details

Defined in Text.Libyaml

Methods

succ :: MappingStyle -> MappingStyle

pred :: MappingStyle -> MappingStyle

toEnum :: Int -> MappingStyle

fromEnum :: MappingStyle -> Int #

enumFrom :: MappingStyle -> [MappingStyle]

enumFromThen :: MappingStyle -> MappingStyle -> [MappingStyle]

enumFromTo :: MappingStyle -> MappingStyle -> [MappingStyle]

enumFromThenTo :: MappingStyle -> MappingStyle -> MappingStyle -> [MappingStyle]

Enum SequenceStyle 
Instance details

Defined in Text.Libyaml

Methods

succ :: SequenceStyle -> SequenceStyle

pred :: SequenceStyle -> SequenceStyle

toEnum :: Int -> SequenceStyle

fromEnum :: SequenceStyle -> Int #

enumFrom :: SequenceStyle -> [SequenceStyle]

enumFromThen :: SequenceStyle -> SequenceStyle -> [SequenceStyle]

enumFromTo :: SequenceStyle -> SequenceStyle -> [SequenceStyle]

enumFromThenTo :: SequenceStyle -> SequenceStyle -> SequenceStyle -> [SequenceStyle]

Enum Style 
Instance details

Defined in Text.Libyaml

Methods

succ :: Style -> Style

pred :: Style -> Style

toEnum :: Int -> Style

fromEnum :: Style -> Int #

enumFrom :: Style -> [Style]

enumFromThen :: Style -> Style -> [Style]

enumFromTo :: Style -> Style -> [Style]

enumFromThenTo :: Style -> Style -> Style -> [Style]

Enum TagRender 
Instance details

Defined in Text.Libyaml

Methods

succ :: TagRender -> TagRender

pred :: TagRender -> TagRender

toEnum :: Int -> TagRender

fromEnum :: TagRender -> Int #

enumFrom :: TagRender -> [TagRender]

enumFromThen :: TagRender -> TagRender -> [TagRender]

enumFromTo :: TagRender -> TagRender -> [TagRender]

enumFromThenTo :: TagRender -> TagRender -> TagRender -> [TagRender]

Enum PortNumber 
Instance details

Defined in Network.Socket.Types

Methods

succ :: PortNumber -> PortNumber

pred :: PortNumber -> PortNumber

toEnum :: Int -> PortNumber

fromEnum :: PortNumber -> Int #

enumFrom :: PortNumber -> [PortNumber]

enumFromThen :: PortNumber -> PortNumber -> [PortNumber]

enumFromTo :: PortNumber -> PortNumber -> [PortNumber]

enumFromThenTo :: PortNumber -> PortNumber -> PortNumber -> [PortNumber]

Enum FileType 
Instance details

Defined in Pantry.Types

Methods

succ :: FileType -> FileType

pred :: FileType -> FileType

toEnum :: Int -> FileType

fromEnum :: FileType -> Int #

enumFrom :: FileType -> [FileType]

enumFromThen :: FileType -> FileType -> [FileType]

enumFromTo :: FileType -> FileType -> [FileType]

enumFromThenTo :: FileType -> FileType -> FileType -> [FileType]

Enum Message 
Instance details

Defined in Text.Parsec.Error

Methods

succ :: Message -> Message

pred :: Message -> Message

toEnum :: Int -> Message

fromEnum :: Message -> Int #

enumFrom :: Message -> [Message]

enumFromThen :: Message -> Message -> [Message]

enumFromTo :: Message -> Message -> [Message]

enumFromThenTo :: Message -> Message -> Message -> [Message]

Enum IsolationLevel 
Instance details

Defined in Database.Persist.SqlBackend.Internal.IsolationLevel

Methods

succ :: IsolationLevel -> IsolationLevel

pred :: IsolationLevel -> IsolationLevel

toEnum :: Int -> IsolationLevel

fromEnum :: IsolationLevel -> Int #

enumFrom :: IsolationLevel -> [IsolationLevel]

enumFromThen :: IsolationLevel -> IsolationLevel -> [IsolationLevel]

enumFromTo :: IsolationLevel -> IsolationLevel -> [IsolationLevel]

enumFromThenTo :: IsolationLevel -> IsolationLevel -> IsolationLevel -> [IsolationLevel]

Enum Checkmark 
Instance details

Defined in Database.Persist.Types.Base

Methods

succ :: Checkmark -> Checkmark

pred :: Checkmark -> Checkmark

toEnum :: Int -> Checkmark

fromEnum :: Checkmark -> Int #

enumFrom :: Checkmark -> [Checkmark]

enumFromThen :: Checkmark -> Checkmark -> [Checkmark]

enumFromTo :: Checkmark -> Checkmark -> [Checkmark]

enumFromThenTo :: Checkmark -> Checkmark -> Checkmark -> [Checkmark]

Enum Style 
Instance details

Defined in RIO.PrettyPrint.Types

Enum EscapingMode Source # 
Instance details

Defined in Data.Attoparsec.Args

Enum ApplyGhcOptions Source # 
Instance details

Defined in Stack.Types.ApplyGhcOptions

Enum ApplyProgOptions Source # 
Instance details

Defined in Stack.Types.ApplyProgOptions

Enum DumpLogs Source # 
Instance details

Defined in Stack.Types.DumpLogs

Enum LockFileBehavior Source # 
Instance details

Defined in Stack.Types.LockFileBehavior

Enum PvpBoundsType Source # 
Instance details

Defined in Stack.Types.PvpBounds

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

Methods

succ :: FPFormat -> FPFormat

pred :: FPFormat -> FPFormat

toEnum :: Int -> FPFormat

fromEnum :: FPFormat -> Int #

enumFrom :: FPFormat -> [FPFormat]

enumFromThen :: FPFormat -> FPFormat -> [FPFormat]

enumFromTo :: FPFormat -> FPFormat -> [FPFormat]

enumFromThenTo :: FPFormat -> FPFormat -> FPFormat -> [FPFormat]

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

Methods

succ :: Month -> Month

pred :: Month -> Month

toEnum :: Int -> Month

fromEnum :: Month -> Int #

enumFrom :: Month -> [Month]

enumFromThen :: Month -> Month -> [Month]

enumFromTo :: Month -> Month -> [Month]

enumFromThenTo :: Month -> Month -> Month -> [Month]

Enum Quarter 
Instance details

Defined in Data.Time.Calendar.Quarter

Methods

succ :: Quarter -> Quarter

pred :: Quarter -> Quarter

toEnum :: Int -> Quarter

fromEnum :: Quarter -> Int #

enumFrom :: Quarter -> [Quarter]

enumFromThen :: Quarter -> Quarter -> [Quarter]

enumFromTo :: Quarter -> Quarter -> [Quarter]

enumFromThenTo :: Quarter -> Quarter -> Quarter -> [Quarter]

Enum QuarterOfYear 
Instance details

Defined in Data.Time.Calendar.Quarter

Methods

succ :: QuarterOfYear -> QuarterOfYear

pred :: QuarterOfYear -> QuarterOfYear

toEnum :: Int -> QuarterOfYear

fromEnum :: QuarterOfYear -> Int #

enumFrom :: QuarterOfYear -> [QuarterOfYear]

enumFromThen :: QuarterOfYear -> QuarterOfYear -> [QuarterOfYear]

enumFromTo :: QuarterOfYear -> QuarterOfYear -> [QuarterOfYear]

enumFromThenTo :: QuarterOfYear -> QuarterOfYear -> QuarterOfYear -> [QuarterOfYear]

Enum DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Methods

succ :: DiffTime -> DiffTime

pred :: DiffTime -> DiffTime

toEnum :: Int -> DiffTime

fromEnum :: DiffTime -> Int #

enumFrom :: DiffTime -> [DiffTime]

enumFromThen :: DiffTime -> DiffTime -> [DiffTime]

enumFromTo :: DiffTime -> DiffTime -> [DiffTime]

enumFromThenTo :: DiffTime -> DiffTime -> DiffTime -> [DiffTime]

Enum NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Methods

succ :: NominalDiffTime -> NominalDiffTime

pred :: NominalDiffTime -> NominalDiffTime

toEnum :: Int -> NominalDiffTime

fromEnum :: NominalDiffTime -> Int #

enumFrom :: NominalDiffTime -> [NominalDiffTime]

enumFromThen :: NominalDiffTime -> NominalDiffTime -> [NominalDiffTime]

enumFromTo :: NominalDiffTime -> NominalDiffTime -> [NominalDiffTime]

enumFromThenTo :: NominalDiffTime -> NominalDiffTime -> NominalDiffTime -> [NominalDiffTime]

Enum SessionFlag 
Instance details

Defined in Network.TLS.Types

Methods

succ :: SessionFlag -> SessionFlag

pred :: SessionFlag -> SessionFlag

toEnum :: Int -> SessionFlag

fromEnum :: SessionFlag -> Int #

enumFrom :: SessionFlag -> [SessionFlag]

enumFromThen :: SessionFlag -> SessionFlag -> [SessionFlag]

enumFromTo :: SessionFlag -> SessionFlag -> [SessionFlag]

enumFromThenTo :: SessionFlag -> SessionFlag -> SessionFlag -> [SessionFlag]

Enum StatxFlags 
Instance details

Defined in System.Posix.Files.Common

Methods

succ :: StatxFlags -> StatxFlags

pred :: StatxFlags -> StatxFlags

toEnum :: Int -> StatxFlags

fromEnum :: StatxFlags -> Int #

enumFrom :: StatxFlags -> [StatxFlags]

enumFromThen :: StatxFlags -> StatxFlags -> [StatxFlags]

enumFromTo :: StatxFlags -> StatxFlags -> [StatxFlags]

enumFromThenTo :: StatxFlags -> StatxFlags -> StatxFlags -> [StatxFlags]

Enum StatxMask 
Instance details

Defined in System.Posix.Files.Common

Methods

succ :: StatxMask -> StatxMask

pred :: StatxMask -> StatxMask

toEnum :: Int -> StatxMask

fromEnum :: StatxMask -> Int #

enumFrom :: StatxMask -> [StatxMask]

enumFromThen :: StatxMask -> StatxMask -> [StatxMask]

enumFromTo :: StatxMask -> StatxMask -> [StatxMask]

enumFromThenTo :: StatxMask -> StatxMask -> StatxMask -> [StatxMask]

Enum CompressionStrategy 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

succ :: CompressionStrategy -> CompressionStrategy

pred :: CompressionStrategy -> CompressionStrategy

toEnum :: Int -> CompressionStrategy

fromEnum :: CompressionStrategy -> Int #

enumFrom :: CompressionStrategy -> [CompressionStrategy]

enumFromThen :: CompressionStrategy -> CompressionStrategy -> [CompressionStrategy]

enumFromTo :: CompressionStrategy -> CompressionStrategy -> [CompressionStrategy]

enumFromThenTo :: CompressionStrategy -> CompressionStrategy -> CompressionStrategy -> [CompressionStrategy]

Enum Format 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

succ :: Format -> Format

pred :: Format -> Format

toEnum :: Int -> Format

fromEnum :: Format -> Int #

enumFrom :: Format -> [Format]

enumFromThen :: Format -> Format -> [Format]

enumFromTo :: Format -> Format -> [Format]

enumFromThenTo :: Format -> Format -> Format -> [Format]

Enum Method 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

succ :: Method -> Method

pred :: Method -> Method

toEnum :: Int -> Method

fromEnum :: Method -> Int #

enumFrom :: Method -> [Method]

enumFromThen :: Method -> Method -> [Method]

enumFromTo :: Method -> Method -> [Method]

enumFromThenTo :: Method -> Method -> Method -> [Method]

Enum Integer 
Instance details

Defined in GHC.Enum

Enum Natural 
Instance details

Defined in GHC.Enum

Enum () 
Instance details

Defined in GHC.Enum

Methods

succ :: () -> ()

pred :: () -> ()

toEnum :: Int -> ()

fromEnum :: () -> Int #

enumFrom :: () -> [()]

enumFromThen :: () -> () -> [()]

enumFromTo :: () -> () -> [()]

enumFromThenTo :: () -> () -> () -> [()]

Enum Bool 
Instance details

Defined in GHC.Enum

Enum Char 
Instance details

Defined in GHC.Enum

Enum Int 
Instance details

Defined in GHC.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 
Instance details

Defined in GHC.Enum

Methods

succ :: Levity -> Levity

pred :: Levity -> Levity

toEnum :: Int -> Levity

fromEnum :: Levity -> Int #

enumFrom :: Levity -> [Levity]

enumFromThen :: Levity -> Levity -> [Levity]

enumFromTo :: Levity -> Levity -> [Levity]

enumFromThenTo :: Levity -> Levity -> Levity -> [Levity]

Enum VecCount 
Instance details

Defined in GHC.Enum

Methods

succ :: VecCount -> VecCount

pred :: VecCount -> VecCount

toEnum :: Int -> VecCount

fromEnum :: VecCount -> Int #

enumFrom :: VecCount -> [VecCount]

enumFromThen :: VecCount -> VecCount -> [VecCount]

enumFromTo :: VecCount -> VecCount -> [VecCount]

enumFromThenTo :: VecCount -> VecCount -> VecCount -> [VecCount]

Enum VecElem 
Instance details

Defined in GHC.Enum

Methods

succ :: VecElem -> VecElem

pred :: VecElem -> VecElem

toEnum :: Int -> VecElem

fromEnum :: VecElem -> Int #

enumFrom :: VecElem -> [VecElem]

enumFromThen :: VecElem -> VecElem -> [VecElem]

enumFromTo :: VecElem -> VecElem -> [VecElem]

enumFromThenTo :: VecElem -> VecElem -> VecElem -> [VecElem]

Enum Word 
Instance details

Defined in GHC.Enum

Enum a => Enum (Flag a) 
Instance details

Defined in Distribution.Simple.Flag

Methods

succ :: Flag a -> Flag a

pred :: Flag a -> Flag a

toEnum :: Int -> Flag a

fromEnum :: Flag a -> Int #

enumFrom :: Flag a -> [Flag a]

enumFromThen :: Flag a -> Flag a -> [Flag a]

enumFromTo :: Flag a -> Flag a -> [Flag a]

enumFromThenTo :: Flag a -> Flag a -> Flag a -> [Flag a]

Enum a => Enum (And a) 
Instance details

Defined in Data.Bits

Methods

succ :: And a -> And a

pred :: And a -> And a

toEnum :: Int -> And a

fromEnum :: And a -> Int #

enumFrom :: And a -> [And a]

enumFromThen :: And a -> And a -> [And a]

enumFromTo :: And a -> And a -> [And a]

enumFromThenTo :: And a -> And a -> And a -> [And a]

Enum a => Enum (Iff a) 
Instance details

Defined in Data.Bits

Methods

succ :: Iff a -> Iff a

pred :: Iff a -> Iff a

toEnum :: Int -> Iff a

fromEnum :: Iff a -> Int #

enumFrom :: Iff a -> [Iff a]

enumFromThen :: Iff a -> Iff a -> [Iff a]

enumFromTo :: Iff a -> Iff a -> [Iff a]

enumFromThenTo :: Iff a -> Iff a -> Iff a -> [Iff a]

Enum a => Enum (Ior a) 
Instance details

Defined in Data.Bits

Methods

succ :: Ior a -> Ior a

pred :: Ior a -> Ior a

toEnum :: Int -> Ior a

fromEnum :: Ior a -> Int #

enumFrom :: Ior a -> [Ior a]

enumFromThen :: Ior a -> Ior a -> [Ior a]

enumFromTo :: Ior a -> Ior a -> [Ior a]

enumFromThenTo :: Ior a -> Ior a -> Ior a -> [Ior a]

Enum a => Enum (Xor a) 
Instance details

Defined in Data.Bits

Methods

succ :: Xor a -> Xor a

pred :: Xor a -> Xor a

toEnum :: Int -> Xor a

fromEnum :: Xor a -> Int #

enumFrom :: Xor a -> [Xor a]

enumFromThen :: Xor a -> Xor a -> [Xor a]

enumFromTo :: Xor a -> Xor a -> [Xor a]

enumFromThenTo :: Xor a -> Xor a -> Xor a -> [Xor a]

Enum a => Enum (Identity a) 
Instance details

Defined in Data.Functor.Identity

(Enum a, Bounded a, Eq a) => Enum (Down a) 
Instance details

Defined in 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]

Enum a => Enum (First a) 
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) 
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) 
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) 
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) 
Instance details

Defined in Data.Semigroup

Methods

succ :: WrappedMonoid a -> WrappedMonoid a

pred :: WrappedMonoid a -> WrappedMonoid a

toEnum :: Int -> WrappedMonoid a

fromEnum :: WrappedMonoid a -> Int #

enumFrom :: WrappedMonoid a -> [WrappedMonoid a]

enumFromThen :: WrappedMonoid a -> WrappedMonoid a -> [WrappedMonoid a]

enumFromTo :: WrappedMonoid a -> WrappedMonoid a -> [WrappedMonoid a]

enumFromThenTo :: WrappedMonoid a -> WrappedMonoid a -> WrappedMonoid a -> [WrappedMonoid a]

Integral a => Enum (Ratio a) 
Instance details

Defined in GHC.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]

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]

(BackendCompatible b s, Enum (BackendKey b)) => Enum (BackendKey (Compatible b s)) 
Instance details

Defined in Database.Persist.Compatible.Types

Methods

succ :: BackendKey (Compatible b s) -> BackendKey (Compatible b s)

pred :: BackendKey (Compatible b s) -> BackendKey (Compatible b s)

toEnum :: Int -> BackendKey (Compatible b s)

fromEnum :: BackendKey (Compatible b s) -> Int #

enumFrom :: BackendKey (Compatible b s) -> [BackendKey (Compatible b s)]

enumFromThen :: BackendKey (Compatible b s) -> BackendKey (Compatible b s) -> [BackendKey (Compatible b s)]

enumFromTo :: BackendKey (Compatible b s) -> BackendKey (Compatible b s) -> [BackendKey (Compatible b s)]

enumFromThenTo :: BackendKey (Compatible b s) -> BackendKey (Compatible b s) -> BackendKey (Compatible b s) -> [BackendKey (Compatible b s)]

(PersistCore b, PersistCore (RawSqlite b), Enum (BackendKey b)) => Enum (BackendKey (RawSqlite b)) 
Instance details

Defined in Database.Persist.Sqlite

Methods

succ :: BackendKey (RawSqlite b) -> BackendKey (RawSqlite b)

pred :: BackendKey (RawSqlite b) -> BackendKey (RawSqlite b)

toEnum :: Int -> BackendKey (RawSqlite b)

fromEnum :: BackendKey (RawSqlite b) -> Int #

enumFrom :: BackendKey (RawSqlite b) -> [BackendKey (RawSqlite b)]

enumFromThen :: BackendKey (RawSqlite b) -> BackendKey (RawSqlite b) -> [BackendKey (RawSqlite b)]

enumFromTo :: BackendKey (RawSqlite b) -> BackendKey (RawSqlite b) -> [BackendKey (RawSqlite b)]

enumFromThenTo :: BackendKey (RawSqlite b) -> BackendKey (RawSqlite b) -> BackendKey (RawSqlite b) -> [BackendKey (RawSqlite b)]

Enum a => Enum (Solo a) 
Instance details

Defined in GHC.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) 
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) 
Instance details

Defined in 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) 
Instance details

Defined in 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) 
Instance details

Defined in 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) 
Instance details

Defined in 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]

Coercible a b => Enum (Coercion a b) 
Instance details

Defined in Data.Type.Coercion

Methods

succ :: Coercion a b -> Coercion a b

pred :: Coercion a b -> Coercion a b

toEnum :: Int -> Coercion a b

fromEnum :: Coercion a b -> Int #

enumFrom :: Coercion a b -> [Coercion a b]

enumFromThen :: Coercion a b -> Coercion a b -> [Coercion a b]

enumFromTo :: Coercion a b -> Coercion a b -> [Coercion a b]

enumFromThenTo :: Coercion a b -> Coercion a b -> Coercion a b -> [Coercion a b]

a ~ b => Enum (a :~: b) 
Instance details

Defined in 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) 
Instance details

Defined in 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) 
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]

class Fractional a => Floating a where #

Minimal complete definition

pi, exp, log, sin, cos, asin, acos, atan, sinh, cosh, asinh, acosh, atanh

Methods

pi :: a #

exp :: a -> a #

log :: a -> a #

sqrt :: a -> a #

(**) :: a -> a -> a #

logBase :: a -> a -> a #

sin :: a -> a #

cos :: a -> a #

tan :: a -> a #

asin :: a -> a #

acos :: a -> a #

atan :: a -> a #

sinh :: a -> a #

cosh :: a -> a #

tanh :: a -> a #

asinh :: a -> a #

acosh :: a -> a #

atanh :: a -> a #

Instances

Instances details
Floating CDouble 
Instance details

Defined in Foreign.C.Types

Methods

pi :: CDouble #

exp :: CDouble -> CDouble #

log :: CDouble -> CDouble #

sqrt :: CDouble -> CDouble #

(**) :: CDouble -> CDouble -> CDouble #

logBase :: CDouble -> CDouble -> CDouble #

sin :: CDouble -> CDouble #

cos :: CDouble -> CDouble #

tan :: CDouble -> CDouble #

asin :: CDouble -> CDouble #

acos :: CDouble -> CDouble #

atan :: CDouble -> CDouble #

sinh :: CDouble -> CDouble #

cosh :: CDouble -> CDouble #

tanh :: CDouble -> CDouble #

asinh :: CDouble -> CDouble #

acosh :: CDouble -> CDouble #

atanh :: CDouble -> CDouble #

log1p :: CDouble -> CDouble

expm1 :: CDouble -> CDouble

log1pexp :: CDouble -> CDouble

log1mexp :: CDouble -> CDouble

Floating CFloat 
Instance details

Defined in Foreign.C.Types

Methods

pi :: CFloat #

exp :: CFloat -> CFloat #

log :: CFloat -> CFloat #

sqrt :: CFloat -> CFloat #

(**) :: CFloat -> CFloat -> CFloat #

logBase :: CFloat -> CFloat -> CFloat #

sin :: CFloat -> CFloat #

cos :: CFloat -> CFloat #

tan :: CFloat -> CFloat #

asin :: CFloat -> CFloat #

acos :: CFloat -> CFloat #

atan :: CFloat -> CFloat #

sinh :: CFloat -> CFloat #

cosh :: CFloat -> CFloat #

tanh :: CFloat -> CFloat #

asinh :: CFloat -> CFloat #

acosh :: CFloat -> CFloat #

atanh :: CFloat -> CFloat #

log1p :: CFloat -> CFloat

expm1 :: CFloat -> CFloat

log1pexp :: CFloat -> CFloat

log1mexp :: CFloat -> CFloat

Floating Half 
Instance details

Defined in Numeric.Half.Internal

Methods

pi :: Half #

exp :: Half -> Half #

log :: Half -> Half #

sqrt :: Half -> Half #

(**) :: Half -> Half -> Half #

logBase :: Half -> Half -> Half #

sin :: Half -> Half #

cos :: Half -> Half #

tan :: Half -> Half #

asin :: Half -> Half #

acos :: Half -> Half #

atan :: Half -> Half #

sinh :: Half -> Half #

cosh :: Half -> Half #

tanh :: Half -> Half #

asinh :: Half -> Half #

acosh :: Half -> Half #

atanh :: Half -> Half #

log1p :: Half -> Half

expm1 :: Half -> Half

log1pexp :: Half -> Half

log1mexp :: Half -> Half

Floating Double 
Instance details

Defined in GHC.Float

Floating Float 
Instance details

Defined in GHC.Float

RealFloat a => Floating (Complex a) 
Instance details

Defined in Data.Complex

Methods

pi :: Complex a #

exp :: Complex a -> Complex a #

log :: Complex a -> Complex a #

sqrt :: Complex a -> Complex a #

(**) :: Complex a -> Complex a -> Complex a #

logBase :: Complex a -> Complex a -> Complex a #

sin :: Complex a -> Complex a #

cos :: Complex a -> Complex a #

tan :: Complex a -> Complex a #

asin :: Complex a -> Complex a #

acos :: Complex a -> Complex a #

atan :: Complex a -> Complex a #

sinh :: Complex a -> Complex a #

cosh :: Complex a -> Complex a #

tanh :: Complex a -> Complex a #

asinh :: Complex a -> Complex a #

acosh :: Complex a -> Complex a #

atanh :: Complex a -> Complex a #

log1p :: Complex a -> Complex a

expm1 :: Complex a -> Complex a

log1pexp :: Complex a -> Complex a

log1mexp :: Complex a -> Complex a

Floating a => Floating (Identity a) 
Instance details

Defined in Data.Functor.Identity

Floating a => Floating (Down a) 
Instance details

Defined in Data.Ord

Methods

pi :: Down a #

exp :: Down a -> Down a #

log :: Down a -> Down a #

sqrt :: Down a -> Down a #

(**) :: Down a -> Down a -> Down a #

logBase :: Down a -> Down a -> Down a #

sin :: Down a -> Down a #

cos :: Down a -> Down a #

tan :: Down a -> Down a #

asin :: Down a -> Down a #

acos :: Down a -> Down a #

atan :: Down a -> Down a #

sinh :: Down a -> Down a #

cosh :: Down a -> Down a #

tanh :: Down a -> Down a #

asinh :: Down a -> Down a #

acosh :: Down a -> Down a #

atanh :: Down a -> Down a #

log1p :: Down a -> Down a

expm1 :: Down a -> Down a

log1pexp :: Down a -> Down a

log1mexp :: Down a -> Down a

Floating a => Floating (Op a b) 
Instance details

Defined in Data.Functor.Contravariant

Methods

pi :: Op a b #

exp :: Op a b -> Op a b #

log :: Op a b -> Op a b #

sqrt :: Op a b -> Op a b #

(**) :: Op a b -> Op a b -> Op a b #

logBase :: Op a b -> Op a b -> Op a b #

sin :: Op a b -> Op a b #

cos :: Op a b -> Op a b #

tan :: Op a b -> Op a b #

asin :: Op a b -> Op a b #

acos :: Op a b -> Op a b #

atan :: Op a b -> Op a b #

sinh :: Op a b -> Op a b #

cosh :: Op a b -> Op a b #

tanh :: Op a b -> Op a b #

asinh :: Op a b -> Op a b #

acosh :: Op a b -> Op a b #

atanh :: Op a b -> Op a b #

log1p :: Op a b -> Op a b

expm1 :: Op a b -> Op a b

log1pexp :: Op a b -> Op a b

log1mexp :: Op a b -> Op a b

Floating a => Floating (Const a b) 
Instance details

Defined in 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

Floating a => Floating (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

pi :: Tagged s a #

exp :: Tagged s a -> Tagged s a #

log :: Tagged s a -> Tagged s a #

sqrt :: Tagged s a -> Tagged s a #

(**) :: Tagged s a -> Tagged s a -> Tagged s a #

logBase :: Tagged s a -> Tagged s a -> Tagged s a #

sin :: Tagged s a -> Tagged s a #

cos :: Tagged s a -> Tagged s a #

tan :: Tagged s a -> Tagged s a #

asin :: Tagged s a -> Tagged s a #

acos :: Tagged s a -> Tagged s a #

atan :: Tagged s a -> Tagged s a #

sinh :: Tagged s a -> Tagged s a #

cosh :: Tagged s a -> Tagged s a #

tanh :: Tagged s a -> Tagged s a #

asinh :: Tagged s a -> Tagged s a #

acosh :: Tagged s a -> Tagged s a #

atanh :: Tagged s a -> Tagged s a #

log1p :: Tagged s a -> Tagged s a

expm1 :: Tagged s a -> Tagged s a

log1pexp :: Tagged s a -> Tagged s a

log1mexp :: Tagged s a -> Tagged s a

class (RealFrac a, Floating a) => RealFloat a where #

Methods

floatRadix :: a -> Integer #

floatDigits :: a -> Int #

floatRange :: a -> (Int, Int) #

decodeFloat :: a -> (Integer, Int) #

encodeFloat :: Integer -> Int -> a #

exponent :: a -> Int #

significand :: a -> a #

scaleFloat :: Int -> a -> a #

isNaN :: a -> Bool #

isInfinite :: a -> Bool #

isDenormalized :: a -> Bool #

isNegativeZero :: a -> Bool #

isIEEE :: a -> Bool #

atan2 :: a -> a -> a #

Instances

Instances details
RealFloat CDouble 
Instance details

Defined in Foreign.C.Types

Methods

floatRadix :: CDouble -> Integer #

floatDigits :: CDouble -> Int #

floatRange :: CDouble -> (Int, Int) #

decodeFloat :: CDouble -> (Integer, Int) #

encodeFloat :: Integer -> Int -> CDouble #

exponent :: CDouble -> Int #

significand :: CDouble -> CDouble #

scaleFloat :: Int -> CDouble -> CDouble #

isNaN :: CDouble -> Bool #

isInfinite :: CDouble -> Bool #

isDenormalized :: CDouble -> Bool #

isNegativeZero :: CDouble -> Bool #

isIEEE :: CDouble -> Bool #

atan2 :: CDouble -> CDouble -> CDouble #

RealFloat CFloat 
Instance details

Defined in Foreign.C.Types

Methods

floatRadix :: CFloat -> Integer #

floatDigits :: CFloat -> Int #

floatRange :: CFloat -> (Int, Int) #

decodeFloat :: CFloat -> (Integer, Int) #

encodeFloat :: Integer -> Int -> CFloat #

exponent :: CFloat -> Int #

significand :: CFloat -> CFloat #

scaleFloat :: Int -> CFloat -> CFloat #

isNaN :: CFloat -> Bool #

isInfinite :: CFloat -> Bool #

isDenormalized :: CFloat -> Bool #

isNegativeZero :: CFloat -> Bool #

isIEEE :: CFloat -> Bool #

atan2 :: CFloat -> CFloat -> CFloat #

RealFloat Half 
Instance details

Defined in Numeric.Half.Internal

Methods

floatRadix :: Half -> Integer #

floatDigits :: Half -> Int #

floatRange :: Half -> (Int, Int) #

decodeFloat :: Half -> (Integer, Int) #

encodeFloat :: Integer -> Int -> Half #

exponent :: Half -> Int #

significand :: Half -> Half #

scaleFloat :: Int -> Half -> Half #

isNaN :: Half -> Bool #

isInfinite :: Half -> Bool #

isDenormalized :: Half -> Bool #

isNegativeZero :: Half -> Bool #

isIEEE :: Half -> Bool #

atan2 :: Half -> Half -> Half #

RealFloat Double 
Instance details

Defined in GHC.Float

RealFloat Float 
Instance details

Defined in GHC.Float

RealFloat a => RealFloat (Identity a) 
Instance details

Defined in Data.Functor.Identity

RealFloat a => RealFloat (Down a) 
Instance details

Defined in Data.Ord

RealFloat a => RealFloat (Const a b) 
Instance details

Defined in 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 #

RealFloat a => RealFloat (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

floatRadix :: Tagged s a -> Integer #

floatDigits :: Tagged s a -> Int #

floatRange :: Tagged s a -> (Int, Int) #

decodeFloat :: Tagged s a -> (Integer, Int) #

encodeFloat :: Integer -> Int -> Tagged s a #

exponent :: Tagged s a -> Int #

significand :: Tagged s a -> Tagged s a #

scaleFloat :: Int -> Tagged s a -> Tagged s a #

isNaN :: Tagged s a -> Bool #

isInfinite :: Tagged s a -> Bool #

isDenormalized :: Tagged s a -> Bool #

isNegativeZero :: Tagged s a -> Bool #

isIEEE :: Tagged s a -> Bool #

atan2 :: Tagged s a -> Tagged s a -> Tagged s a #

data SeekMode #

Instances

Instances details
Enum SeekMode 
Instance details

Defined in GHC.IO.Device

Ix SeekMode 
Instance details

Defined in GHC.IO.Device

Read SeekMode 
Instance details

Defined in GHC.IO.Device

Methods

readsPrec :: Int -> ReadS SeekMode

readList :: ReadS [SeekMode]

readPrec :: ReadPrec SeekMode

readListPrec :: ReadPrec [SeekMode]

Show SeekMode 
Instance details

Defined in GHC.IO.Device

Methods

showsPrec :: Int -> SeekMode -> ShowS

show :: SeekMode -> String #

showList :: [SeekMode] -> ShowS

GEq SeekMode 
Instance details

Defined in Generics.Deriving.Eq

Methods

geq :: SeekMode -> SeekMode -> Bool

GShow SeekMode 
Instance details

Defined in Generics.Deriving.Show

Methods

gshowsPrec :: Int -> SeekMode -> ShowS

gshows :: SeekMode -> ShowS

gshow :: SeekMode -> String

gshowList :: [SeekMode] -> ShowS

Eq SeekMode 
Instance details

Defined in GHC.IO.Device

Ord SeekMode 
Instance details

Defined in GHC.IO.Device

data ExitCode #

Constructors

ExitSuccess 
ExitFailure Int 

Instances

Instances details
Exception ExitCode 
Instance details

Defined in GHC.IO.Exception

Generic ExitCode 
Instance details

Defined in GHC.IO.Exception

Associated Types

type Rep ExitCode 
Instance details

Defined in GHC.IO.Exception

type Rep ExitCode = D1 ('MetaData "ExitCode" "GHC.IO.Exception" "base" 'False) (C1 ('MetaCons "ExitSuccess" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ExitFailure" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)))

Methods

from :: ExitCode -> Rep ExitCode x

to :: Rep ExitCode x -> ExitCode

Read ExitCode 
Instance details

Defined in GHC.IO.Exception

Methods

readsPrec :: Int -> ReadS ExitCode

readList :: ReadS [ExitCode]

readPrec :: ReadPrec ExitCode

readListPrec :: ReadPrec [ExitCode]

Show ExitCode 
Instance details

Defined in GHC.IO.Exception

Methods

showsPrec :: Int -> ExitCode -> ShowS

show :: ExitCode -> String #

showList :: [ExitCode] -> ShowS

NFData ExitCode 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: ExitCode -> () #

GEnum ExitCode 
Instance details

Defined in Generics.Deriving.Enum

Methods

genum :: [ExitCode]

GIx ExitCode 
Instance details

Defined in Generics.Deriving.Enum

GEq ExitCode 
Instance details

Defined in Generics.Deriving.Eq

Methods

geq :: ExitCode -> ExitCode -> Bool

GShow ExitCode 
Instance details

Defined in Generics.Deriving.Show

Methods

gshowsPrec :: Int -> ExitCode -> ShowS

gshows :: ExitCode -> ShowS

gshow :: ExitCode -> String

gshowList :: [ExitCode] -> ShowS

Eq ExitCode 
Instance details

Defined in GHC.IO.Exception

Ord ExitCode 
Instance details

Defined in GHC.IO.Exception

type Rep ExitCode 
Instance details

Defined in GHC.IO.Exception

type Rep ExitCode = D1 ('MetaData "ExitCode" "GHC.IO.Exception" "base" 'False) (C1 ('MetaCons "ExitSuccess" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ExitFailure" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)))

data IOException #

Instances

Instances details
Exception IOException 
Instance details

Defined in GHC.IO.Exception

Show IOException 
Instance details

Defined in GHC.IO.Exception

Methods

showsPrec :: Int -> IOException -> ShowS

show :: IOException -> String #

showList :: [IOException] -> ShowS

GEq IOError 
Instance details

Defined in Generics.Deriving.Eq

Methods

geq :: IOError -> IOError -> Bool

GShow IOError 
Instance details

Defined in Generics.Deriving.Show

Methods

gshowsPrec :: Int -> IOError -> ShowS

gshows :: IOError -> ShowS

gshow :: IOError -> String

gshowList :: [IOError] -> ShowS

Eq IOException 
Instance details

Defined in GHC.IO.Exception

Display IOException 
Instance details

Defined in RIO.Prelude.Display

MonadError IOException IO 
Instance details

Defined in Control.Monad.Error.Class

Methods

throwError :: IOException -> IO a

catchError :: IO a -> (IOException -> IO a) -> IO a

data BufferMode #

Instances

Instances details
Read BufferMode 
Instance details

Defined in GHC.IO.Handle.Types

Methods

readsPrec :: Int -> ReadS BufferMode

readList :: ReadS [BufferMode]

readPrec :: ReadPrec BufferMode

readListPrec :: ReadPrec [BufferMode]

Show BufferMode 
Instance details

Defined in GHC.IO.Handle.Types

Methods

showsPrec :: Int -> BufferMode -> ShowS

show :: BufferMode -> String #

showList :: [BufferMode] -> ShowS

GEq BufferMode 
Instance details

Defined in Generics.Deriving.Eq

Methods

geq :: BufferMode -> BufferMode -> Bool

GShow BufferMode 
Instance details

Defined in Generics.Deriving.Show

Methods

gshowsPrec :: Int -> BufferMode -> ShowS

gshows :: BufferMode -> ShowS

gshow :: BufferMode -> String

gshowList :: [BufferMode] -> ShowS

Eq BufferMode 
Instance details

Defined in GHC.IO.Handle.Types

Ord BufferMode 
Instance details

Defined in GHC.IO.Handle.Types

data Handle #

Instances

Instances details
Show Handle 
Instance details

Defined in GHC.IO.Handle.Types

Methods

showsPrec :: Int -> Handle -> ShowS

show :: Handle -> String #

showList :: [Handle] -> ShowS

GEq Handle 
Instance details

Defined in Generics.Deriving.Eq

Methods

geq :: Handle -> Handle -> Bool

GShow Handle 
Instance details

Defined in Generics.Deriving.Show

Methods

gshowsPrec :: Int -> Handle -> ShowS

gshows :: Handle -> ShowS

gshow :: Handle -> String

gshowList :: [Handle] -> ShowS

Eq Handle 
Instance details

Defined in GHC.IO.Handle.Types

Methods

(==) :: Handle -> Handle -> Bool #

(/=) :: Handle -> Handle -> Bool #

data IOMode #

Instances

Instances details
Enum IOMode 
Instance details

Defined in GHC.IO.IOMode

Ix IOMode 
Instance details

Defined in GHC.IO.IOMode

Read IOMode 
Instance details

Defined in GHC.IO.IOMode

Methods

readsPrec :: Int -> ReadS IOMode

readList :: ReadS [IOMode]

readPrec :: ReadPrec IOMode

readListPrec :: ReadPrec [IOMode]

Show IOMode 
Instance details

Defined in GHC.IO.IOMode

Methods

showsPrec :: Int -> IOMode -> ShowS

show :: IOMode -> String #

showList :: [IOMode] -> ShowS

GEq IOMode 
Instance details

Defined in Generics.Deriving.Eq

Methods

geq :: IOMode -> IOMode -> Bool

GShow IOMode 
Instance details

Defined in Generics.Deriving.Show

Methods

gshowsPrec :: Int -> IOMode -> ShowS

gshows :: IOMode -> ShowS

gshow :: IOMode -> String

gshowList :: [IOMode] -> ShowS

Eq IOMode 
Instance details

Defined in GHC.IO.IOMode

Methods

(==) :: IOMode -> IOMode -> Bool #

(/=) :: IOMode -> IOMode -> Bool #

Ord IOMode 
Instance details

Defined in GHC.IO.IOMode

data IORef a #

Instances

Instances details
NFData1 IORef 
Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> IORef a -> ()

NFData (IORef a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: IORef a -> () #

Eq (IORef a) 
Instance details

Defined in GHC.IORef

Methods

(==) :: IORef a -> IORef a -> Bool #

(/=) :: IORef a -> IORef a -> Bool #

HasResourceMap (IORef ReleaseMap) 
Instance details

Defined in RIO.Orphans

Methods

resourceMapL :: Lens' (IORef ReleaseMap) ResourceMap Source #

data Int16 #

Instances

Instances details
Structured Int16 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy Int16 -> Structure

structureHash' :: Tagged Int16 MD5

FromJSON Int16 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Int16

parseJSONList :: Value -> Parser [Int16]

omittedField :: Maybe Int16

FromJSONKey Int16 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction Int16

fromJSONKeyList :: FromJSONKeyFunction [Int16]

ToJSON Int16 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Int16 -> Value

toEncoding :: Int16 -> Encoding

toJSONList :: [Int16] -> Value

toEncodingList :: [Int16] -> Encoding

omitField :: Int16 -> Bool

ToJSONKey Int16 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction Int16

toJSONKeyList :: ToJSONKeyFunction [Int16]

Data Int16 
Instance details

Defined in 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 #

Storable Int16 
Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Int16 -> Int

alignment :: Int16 -> Int

peekElemOff :: Ptr Int16 -> Int -> IO Int16

pokeElemOff :: Ptr Int16 -> Int -> Int16 -> IO ()

peekByteOff :: Ptr b -> Int -> IO Int16

pokeByteOff :: Ptr b -> Int -> Int16 -> IO ()

peek :: Ptr Int16 -> IO Int16

poke :: Ptr Int16 -> Int16 -> IO ()

Bits Int16 
Instance details

Defined in GHC.Int

FiniteBits Int16 
Instance details

Defined in GHC.Int

Bounded Int16 
Instance details

Defined in GHC.Int

Enum Int16 
Instance details

Defined in GHC.Int

Ix Int16 
Instance details

Defined in GHC.Int

Num Int16 
Instance details

Defined in GHC.Int

Read Int16 
Instance details

Defined in GHC.Int

Methods

readsPrec :: Int -> ReadS Int16

readList :: ReadS [Int16]

readPrec :: ReadPrec Int16

readListPrec :: ReadPrec [Int16]

Integral Int16 
Instance details

Defined in GHC.Int

Real Int16 
Instance details

Defined in GHC.Int

Methods

toRational :: Int16 -> Rational #

Show Int16 
Instance details

Defined in GHC.Int

Methods

showsPrec :: Int -> Int16 -> ShowS

show :: Int16 -> String #

showList :: [Int16] -> ShowS

PrintfArg Int16 
Instance details

Defined in Text.Printf

Methods

formatArg :: Int16 -> FieldFormatter

parseFormat :: Int16 -> ModifierParser

BitOps Int16 
Instance details

Defined in Basement.Bits

Methods

(.&.) :: Int16 -> Int16 -> Int16

(.|.) :: Int16 -> Int16 -> Int16

(.^.) :: Int16 -> Int16 -> Int16

(.<<.) :: Int16 -> CountOf Bool -> Int16

(.>>.) :: Int16 -> CountOf Bool -> Int16

bit :: Offset Bool -> Int16

isBitSet :: Int16 -> Offset Bool -> Bool

setBit :: Int16 -> Offset Bool -> Int16

clearBit :: Int16 -> Offset Bool -> Int16

FiniteBitsOps Int16 
Instance details

Defined in Basement.Bits

Methods

numberOfBits :: Int16 -> CountOf Bool

rotateL :: Int16 -> CountOf Bool -> Int16

rotateR :: Int16 -> CountOf Bool -> Int16

popCount :: Int16 -> CountOf Bool

bitFlip :: Int16 -> Int16

countLeadingZeros :: Int16 -> CountOf Bool

countTrailingZeros :: Int16 -> CountOf Bool

Subtractive Int16 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Int16 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Int16 = Int16

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

Methods

primSizeInBytes :: Proxy Int16 -> CountOf Word8

primShiftToBytes :: Proxy Int16 -> Int

primBaUIndex :: ByteArray# -> Offset Int16 -> Int16

primMbaURead :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Int16 -> prim Int16

primMbaUWrite :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Int16 -> Int16 -> prim ()

primAddrIndex :: Addr# -> Offset Int16 -> Int16

primAddrRead :: PrimMonad prim => Addr# -> Offset Int16 -> prim Int16

primAddrWrite :: PrimMonad prim => Addr# -> Offset Int16 -> Int16 -> prim ()

Binary Int16 
Instance details

Defined in Data.Binary.Class

Methods

put :: Int16 -> Put

get :: Get Int16

putList :: [Int16] -> Put

NFData Int16 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int16 -> () #

GEnum Int16 
Instance details

Defined in Generics.Deriving.Enum

Methods

genum :: [Int16]

GIx Int16 
Instance details

Defined in Generics.Deriving.Enum

Methods

range :: (Int16, Int16) -> [Int16]

index :: (Int16, Int16) -> Int16 -> Int

inRange :: (Int16, Int16) -> Int16 -> Bool

GEq Int16 
Instance details

Defined in Generics.Deriving.Eq

Methods

geq :: Int16 -> Int16 -> Bool

GShow Int16 
Instance details

Defined in Generics.Deriving.Show

Methods

gshowsPrec :: Int -> Int16 -> ShowS

gshows :: Int16 -> ShowS

gshow :: Int16 -> String

gshowList :: [Int16] -> ShowS

Eq Int16 
Instance details

Defined in GHC.Int

Methods

(==) :: Int16 -> Int16 -> Bool #

(/=) :: Int16 -> Int16 -> Bool #

Ord Int16 
Instance details

Defined in GHC.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

FromHttpApiData Int16 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Int16 
Instance details

Defined in Web.Internal.HttpApiData

ToMustache Int16 
Instance details

Defined in Text.Mustache.Internal.Types

PathPiece Int16 
Instance details

Defined in Web.PathPieces

PersistField Int16 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Int16 -> PersistValue

fromPersistValue :: PersistValue -> Either Text Int16

PersistFieldSql Int16 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Int16 -> SqlType

Pretty Int16 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Int16 -> Doc ann

prettyList :: [Int16] -> Doc ann

Random Int16 
Instance details

Defined in System.Random

Methods

randomR :: RandomGen g => (Int16, Int16) -> g -> (Int16, g)

random :: RandomGen g => g -> (Int16, g)

randomRs :: RandomGen g => (Int16, Int16) -> g -> [Int16]

randoms :: RandomGen g => g -> [Int16]

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

Display Int16 
Instance details

Defined in RIO.Prelude.Display

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

Methods

basicUnsafeFreeze :: Mutable Vector s Int16 -> ST s (Vector Int16)

basicUnsafeThaw :: Vector Int16 -> ST s (Mutable Vector s Int16)

basicLength :: Vector Int16 -> Int

basicUnsafeSlice :: Int -> Int -> Vector Int16 -> Vector Int16

basicUnsafeIndexM :: Vector Int16 -> Int -> Box Int16

basicUnsafeCopy :: Mutable Vector s Int16 -> Vector Int16 -> ST s ()

elemseq :: Vector Int16 -> Int16 -> b -> b

MVector MVector Int16 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s Int16 -> Int

basicUnsafeSlice :: Int -> Int -> MVector s Int16 -> MVector s Int16

basicOverlaps :: MVector s Int16 -> MVector s Int16 -> Bool

basicUnsafeNew :: Int -> ST s (MVector s Int16)

basicInitialize :: MVector s Int16 -> ST s ()

basicUnsafeReplicate :: Int -> Int16 -> ST s (MVector s Int16)

basicUnsafeRead :: MVector s Int16 -> Int -> ST s Int16

basicUnsafeWrite :: MVector s Int16 -> Int -> Int16 -> ST s ()

basicClear :: MVector s Int16 -> ST s ()

basicSet :: MVector s Int16 -> Int16 -> ST s ()

basicUnsafeCopy :: MVector s Int16 -> MVector s Int16 -> ST s ()

basicUnsafeMove :: MVector s Int16 -> MVector s Int16 -> ST s ()

basicUnsafeGrow :: MVector s Int16 -> Int -> ST s (MVector s Int16)

MArray IOUArray Int16 IO 
Instance details

Defined in Data.Array.IO.Internals

Methods

getBounds :: Ix i => IOUArray i Int16 -> IO (i, i)

getNumElements :: Ix i => IOUArray i Int16 -> IO Int

newArray :: Ix i => (i, i) -> Int16 -> IO (IOUArray i Int16)

newArray_ :: Ix i => (i, i) -> IO (IOUArray i Int16)

unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Int16)

unsafeRead :: Ix i => IOUArray i Int16 -> Int -> IO Int16

unsafeWrite :: Ix i => IOUArray i Int16 -> Int -> Int16 -> IO ()

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 Difference Int16 = Int16
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 Vector Int16 = V_Int16 (Vector Int16)
newtype MVector s Int16 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Int16 = MV_Int16 (MVector s Int16)

data Int32 #

Instances

Instances details
Structured Int32 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy Int32 -> Structure

structureHash' :: Tagged Int32 MD5

FromJSON Int32 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Int32

parseJSONList :: Value -> Parser [Int32]

omittedField :: Maybe Int32

FromJSONKey Int32 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction Int32

fromJSONKeyList :: FromJSONKeyFunction [Int32]

ToJSON Int32 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Int32 -> Value

toEncoding :: Int32 -> Encoding

toJSONList :: [Int32] -> Value

toEncodingList :: [Int32] -> Encoding

omitField :: Int32 -> Bool

ToJSONKey Int32 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction Int32

toJSONKeyList :: ToJSONKeyFunction [Int32]

Data Int32 
Instance details

Defined in 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 #

Storable Int32 
Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Int32 -> Int

alignment :: Int32 -> Int

peekElemOff :: Ptr Int32 -> Int -> IO Int32

pokeElemOff :: Ptr Int32 -> Int -> Int32 -> IO ()

peekByteOff :: Ptr b -> Int -> IO Int32

pokeByteOff :: Ptr b -> Int -> Int32 -> IO ()

peek :: Ptr Int32 -> IO Int32

poke :: Ptr Int32 -> Int32 -> IO ()

Bits Int32 
Instance details

Defined in GHC.Int

FiniteBits Int32 
Instance details

Defined in GHC.Int

Bounded Int32 
Instance details

Defined in GHC.Int

Enum Int32 
Instance details

Defined in GHC.Int

Ix Int32 
Instance details

Defined in GHC.Int

Num Int32 
Instance details

Defined in GHC.Int

Read Int32 
Instance details

Defined in GHC.Int

Methods

readsPrec :: Int -> ReadS Int32

readList :: ReadS [Int32]

readPrec :: ReadPrec Int32

readListPrec :: ReadPrec [Int32]

Integral Int32 
Instance details

Defined in GHC.Int

Real Int32 
Instance details

Defined in GHC.Int

Methods

toRational :: Int32 -> Rational #

Show Int32 
Instance details

Defined in GHC.Int

Methods

showsPrec :: Int -> Int32 -> ShowS

show :: Int32 -> String #

showList :: [Int32] -> ShowS

PrintfArg Int32 
Instance details

Defined in Text.Printf

Methods

formatArg :: Int32 -> FieldFormatter

parseFormat :: Int32 -> ModifierParser

BitOps Int32 
Instance details

Defined in Basement.Bits

Methods

(.&.) :: Int32 -> Int32 -> Int32

(.|.) :: Int32 -> Int32 -> Int32

(.^.) :: Int32 -> Int32 -> Int32

(.<<.) :: Int32 -> CountOf Bool -> Int32

(.>>.) :: Int32 -> CountOf Bool -> Int32

bit :: Offset Bool -> Int32

isBitSet :: Int32 -> Offset Bool -> Bool

setBit :: Int32 -> Offset Bool -> Int32

clearBit :: Int32 -> Offset Bool -> Int32

FiniteBitsOps Int32 
Instance details

Defined in Basement.Bits

Methods

numberOfBits :: Int32 -> CountOf Bool

rotateL :: Int32 -> CountOf Bool -> Int32

rotateR :: Int32 -> CountOf Bool -> Int32

popCount :: Int32 -> CountOf Bool

bitFlip :: Int32 -> Int32

countLeadingZeros :: Int32 -> CountOf Bool

countTrailingZeros :: Int32 -> CountOf Bool

Subtractive Int32 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Int32 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Int32 = Int32

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

Methods

primSizeInBytes :: Proxy Int32 -> CountOf Word8

primShiftToBytes :: Proxy Int32 -> Int

primBaUIndex :: ByteArray# -> Offset Int32 -> Int32

primMbaURead :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Int32 -> prim Int32

primMbaUWrite :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Int32 -> Int32 -> prim ()

primAddrIndex :: Addr# -> Offset Int32 -> Int32

primAddrRead :: PrimMonad prim => Addr# -> Offset Int32 -> prim Int32

primAddrWrite :: PrimMonad prim => Addr# -> Offset Int32 -> Int32 -> prim ()

Binary Int32 
Instance details

Defined in Data.Binary.Class

Methods

put :: Int32 -> Put

get :: Get Int32

putList :: [Int32] -> Put

NFData Int32 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int32 -> () #

GEnum Int32 
Instance details

Defined in Generics.Deriving.Enum

Methods

genum :: [Int32]

GIx Int32 
Instance details

Defined in Generics.Deriving.Enum

Methods

range :: (Int32, Int32) -> [Int32]

index :: (Int32, Int32) -> Int32 -> Int

inRange :: (Int32, Int32) -> Int32 -> Bool

GEq Int32 
Instance details

Defined in Generics.Deriving.Eq

Methods

geq :: Int32 -> Int32 -> Bool

GShow Int32 
Instance details

Defined in Generics.Deriving.Show

Methods

gshowsPrec :: Int -> Int32 -> ShowS

gshows :: Int32 -> ShowS

gshow :: Int32 -> String

gshowList :: [Int32] -> ShowS

Eq Int32 
Instance details

Defined in GHC.Int

Methods

(==) :: Int32 -> Int32 -> Bool #

(/=) :: Int32 -> Int32 -> Bool #

Ord Int32 
Instance details

Defined in GHC.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

FromHttpApiData Int32 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Int32 
Instance details

Defined in Web.Internal.HttpApiData

ToMustache Int32 
Instance details

Defined in Text.Mustache.Internal.Types

PathPiece Int32 
Instance details

Defined in Web.PathPieces

PersistField Int32 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Int32 -> PersistValue

fromPersistValue :: PersistValue -> Either Text Int32

PersistFieldSql Int32 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Int32 -> SqlType

Pretty Int32 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Int32 -> Doc ann

prettyList :: [Int32] -> Doc ann

Random Int32 
Instance details

Defined in System.Random

Methods

randomR :: RandomGen g => (Int32, Int32) -> g -> (Int32, g)

random :: RandomGen g => g -> (Int32, g)

randomRs :: RandomGen g => (Int32, Int32) -> g -> [Int32]

randoms :: RandomGen g => g -> [Int32]

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

Display Int32 
Instance details

Defined in RIO.Prelude.Display

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

Methods

basicUnsafeFreeze :: Mutable Vector s Int32 -> ST s (Vector Int32)

basicUnsafeThaw :: Vector Int32 -> ST s (Mutable Vector s Int32)

basicLength :: Vector Int32 -> Int

basicUnsafeSlice :: Int -> Int -> Vector Int32 -> Vector Int32

basicUnsafeIndexM :: Vector Int32 -> Int -> Box Int32

basicUnsafeCopy :: Mutable Vector s Int32 -> Vector Int32 -> ST s ()

elemseq :: Vector Int32 -> Int32 -> b -> b

MVector MVector Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s Int32 -> Int

basicUnsafeSlice :: Int -> Int -> MVector s Int32 -> MVector s Int32

basicOverlaps :: MVector s Int32 -> MVector s Int32 -> Bool

basicUnsafeNew :: Int -> ST s (MVector s Int32)

basicInitialize :: MVector s Int32 -> ST s ()

basicUnsafeReplicate :: Int -> Int32 -> ST s (MVector s Int32)

basicUnsafeRead :: MVector s Int32 -> Int -> ST s Int32

basicUnsafeWrite :: MVector s Int32 -> Int -> Int32 -> ST s ()

basicClear :: MVector s Int32 -> ST s ()

basicSet :: MVector s Int32 -> Int32 -> ST s ()

basicUnsafeCopy :: MVector s Int32 -> MVector s Int32 -> ST s ()

basicUnsafeMove :: MVector s Int32 -> MVector s Int32 -> ST s ()

basicUnsafeGrow :: MVector s Int32 -> Int -> ST s (MVector s Int32)

MArray IOUArray Int32 IO 
Instance details

Defined in Data.Array.IO.Internals

Methods

getBounds :: Ix i => IOUArray i Int32 -> IO (i, i)

getNumElements :: Ix i => IOUArray i Int32 -> IO Int

newArray :: Ix i => (i, i) -> Int32 -> IO (IOUArray i Int32)

newArray_ :: Ix i => (i, i) -> IO (IOUArray i Int32)

unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Int32)

unsafeRead :: Ix i => IOUArray i Int32 -> Int -> IO Int32

unsafeWrite :: Ix i => IOUArray i Int32 -> Int -> Int32 -> IO ()

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 Difference Int32 = Int32
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 Vector Int32 = V_Int32 (Vector Int32)
newtype MVector s Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Int32 = MV_Int32 (MVector s Int32)

data Int64 #

Instances

Instances details
Structured Int64 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy Int64 -> Structure

structureHash' :: Tagged Int64 MD5

FromJSON Int64 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Int64

parseJSONList :: Value -> Parser [Int64]

omittedField :: Maybe Int64

FromJSONKey Int64 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction Int64

fromJSONKeyList :: FromJSONKeyFunction [Int64]

ToJSON Int64 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Int64 -> Value

toEncoding :: Int64 -> Encoding

toJSONList :: [Int64] -> Value

toEncodingList :: [Int64] -> Encoding

omitField :: Int64 -> Bool

ToJSONKey Int64 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction Int64

toJSONKeyList :: ToJSONKeyFunction [Int64]

Data Int64 
Instance details

Defined in 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 #

Storable Int64 
Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Int64 -> Int

alignment :: Int64 -> Int

peekElemOff :: Ptr Int64 -> Int -> IO Int64

pokeElemOff :: Ptr Int64 -> Int -> Int64 -> IO ()

peekByteOff :: Ptr b -> Int -> IO Int64

pokeByteOff :: Ptr b -> Int -> Int64 -> IO ()

peek :: Ptr Int64 -> IO Int64

poke :: Ptr Int64 -> Int64 -> IO ()

Bits Int64 
Instance details

Defined in GHC.Int

FiniteBits Int64 
Instance details

Defined in GHC.Int

Bounded Int64 
Instance details

Defined in GHC.Int

Enum Int64 
Instance details

Defined in GHC.Int

Ix Int64 
Instance details

Defined in GHC.Int

Num Int64 
Instance details

Defined in GHC.Int

Read Int64 
Instance details

Defined in GHC.Int

Methods

readsPrec :: Int -> ReadS Int64

readList :: ReadS [Int64]

readPrec :: ReadPrec Int64

readListPrec :: ReadPrec [Int64]

Integral Int64 
Instance details

Defined in GHC.Int

Real Int64 
Instance details

Defined in GHC.Int

Methods

toRational :: Int64 -> Rational #

Show Int64 
Instance details

Defined in GHC.Int

Methods

showsPrec :: Int -> Int64 -> ShowS

show :: Int64 -> String #

showList :: [Int64] -> ShowS

PrintfArg Int64 
Instance details

Defined in Text.Printf

Methods

formatArg :: Int64 -> FieldFormatter

parseFormat :: Int64 -> ModifierParser

BitOps Int64 
Instance details

Defined in Basement.Bits

Methods

(.&.) :: Int64 -> Int64 -> Int64

(.|.) :: Int64 -> Int64 -> Int64

(.^.) :: Int64 -> Int64 -> Int64

(.<<.) :: Int64 -> CountOf Bool -> Int64

(.>>.) :: Int64 -> CountOf Bool -> Int64

bit :: Offset Bool -> Int64

isBitSet :: Int64 -> Offset Bool -> Bool

setBit :: Int64 -> Offset Bool -> Int64

clearBit :: Int64 -> Offset Bool -> Int64

FiniteBitsOps Int64 
Instance details

Defined in Basement.Bits

Methods

numberOfBits :: Int64 -> CountOf Bool

rotateL :: Int64 -> CountOf Bool -> Int64

rotateR :: Int64 -> CountOf Bool -> Int64

popCount :: Int64 -> CountOf Bool

bitFlip :: Int64 -> Int64

countLeadingZeros :: Int64 -> CountOf Bool

countTrailingZeros :: Int64 -> CountOf Bool

Subtractive Int64 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Int64 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Int64 = Int64

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

Methods

primSizeInBytes :: Proxy Int64 -> CountOf Word8

primShiftToBytes :: Proxy Int64 -> Int

primBaUIndex :: ByteArray# -> Offset Int64 -> Int64

primMbaURead :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Int64 -> prim Int64

primMbaUWrite :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Int64 -> Int64 -> prim ()

primAddrIndex :: Addr# -> Offset Int64 -> Int64

primAddrRead :: PrimMonad prim => Addr# -> Offset Int64 -> prim Int64

primAddrWrite :: PrimMonad prim => Addr# -> Offset Int64 -> Int64 -> prim ()

Binary Int64 
Instance details

Defined in Data.Binary.Class

Methods

put :: Int64 -> Put

get :: Get Int64

putList :: [Int64] -> Put

NFData Int64 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int64 -> () #

GEnum Int64 
Instance details

Defined in Generics.Deriving.Enum

Methods

genum :: [Int64]

GIx Int64 
Instance details

Defined in Generics.Deriving.Enum

Methods

range :: (Int64, Int64) -> [Int64]

index :: (Int64, Int64) -> Int64 -> Int

inRange :: (Int64, Int64) -> Int64 -> Bool

GEq Int64 
Instance details

Defined in Generics.Deriving.Eq

Methods

geq :: Int64 -> Int64 -> Bool

GShow Int64 
Instance details

Defined in Generics.Deriving.Show

Methods

gshowsPrec :: Int -> Int64 -> ShowS

gshows :: Int64 -> ShowS

gshow :: Int64 -> String

gshowList :: [Int64] -> ShowS

Eq Int64 
Instance details

Defined in GHC.Int

Methods

(==) :: Int64 -> Int64 -> Bool #

(/=) :: Int64 -> Int64 -> Bool #

Ord Int64 
Instance details

Defined in GHC.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

FromHttpApiData Int64 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Int64 
Instance details

Defined in Web.Internal.HttpApiData

ToMustache Int64 
Instance details

Defined in Text.Mustache.Internal.Types

PathPiece Int64 
Instance details

Defined in Web.PathPieces

PersistField Int64 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Int64 -> PersistValue

fromPersistValue :: PersistValue -> Either Text Int64

PersistFieldSql Int64 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Int64 -> SqlType

Pretty Int64 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Int64 -> Doc ann

prettyList :: [Int64] -> Doc ann

Random Int64 
Instance details

Defined in System.Random

Methods

randomR :: RandomGen g => (Int64, Int64) -> g -> (Int64, g)

random :: RandomGen g => g -> (Int64, g)

randomRs :: RandomGen g => (Int64, Int64) -> g -> [Int64]

randoms :: RandomGen g => g -> [Int64]

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

Display Int64 
Instance details

Defined in RIO.Prelude.Display

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

Methods

basicUnsafeFreeze :: Mutable Vector s Int64 -> ST s (Vector Int64)

basicUnsafeThaw :: Vector Int64 -> ST s (Mutable Vector s Int64)

basicLength :: Vector Int64 -> Int

basicUnsafeSlice :: Int -> Int -> Vector Int64 -> Vector Int64

basicUnsafeIndexM :: Vector Int64 -> Int -> Box Int64

basicUnsafeCopy :: Mutable Vector s Int64 -> Vector Int64 -> ST s ()

elemseq :: Vector Int64 -> Int64 -> b -> b

MVector MVector Int64 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s Int64 -> Int

basicUnsafeSlice :: Int -> Int -> MVector s Int64 -> MVector s Int64

basicOverlaps :: MVector s Int64 -> MVector s Int64 -> Bool

basicUnsafeNew :: Int -> ST s (MVector s Int64)

basicInitialize :: MVector s Int64 -> ST s ()

basicUnsafeReplicate :: Int -> Int64 -> ST s (MVector s Int64)

basicUnsafeRead :: MVector s Int64 -> Int -> ST s Int64

basicUnsafeWrite :: MVector s Int64 -> Int -> Int64 -> ST s ()

basicClear :: MVector s Int64 -> ST s ()

basicSet :: MVector s Int64 -> Int64 -> ST s ()

basicUnsafeCopy :: MVector s Int64 -> MVector s Int64 -> ST s ()

basicUnsafeMove :: MVector s Int64 -> MVector s Int64 -> ST s ()

basicUnsafeGrow :: MVector s Int64 -> Int -> ST s (MVector s Int64)

MArray IOUArray Int64 IO 
Instance details

Defined in Data.Array.IO.Internals

Methods

getBounds :: Ix i => IOUArray i Int64 -> IO (i, i)

getNumElements :: Ix i => IOUArray i Int64 -> IO Int

newArray :: Ix i => (i, i) -> Int64 -> IO (IOUArray i Int64)

newArray_ :: Ix i => (i, i) -> IO (IOUArray i Int64)

unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Int64)

unsafeRead :: Ix i => IOUArray i Int64 -> Int -> IO Int64

unsafeWrite :: Ix i => IOUArray i Int64 -> Int -> Int64 -> IO ()

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 Difference Int64 = Int64
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 Vector Int64 = V_Int64 (Vector Int64)
newtype MVector s Int64 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Int64 = MV_Int64 (MVector s Int64)

data Int8 #

Instances

Instances details
Structured Int8 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy Int8 -> Structure

structureHash' :: Tagged Int8 MD5

FromJSON Int8 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Int8

parseJSONList :: Value -> Parser [Int8]

omittedField :: Maybe Int8

FromJSONKey Int8 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction Int8

fromJSONKeyList :: FromJSONKeyFunction [Int8]

ToJSON Int8 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Int8 -> Value

toEncoding :: Int8 -> Encoding

toJSONList :: [Int8] -> Value

toEncodingList :: [Int8] -> Encoding

omitField :: Int8 -> Bool

ToJSONKey Int8 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction Int8

toJSONKeyList :: ToJSONKeyFunction [Int8]

Data Int8 
Instance details

Defined in 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 #

Storable Int8 
Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Int8 -> Int

alignment :: Int8 -> Int

peekElemOff :: Ptr Int8 -> Int -> IO Int8

pokeElemOff :: Ptr Int8 -> Int -> Int8 -> IO ()

peekByteOff :: Ptr b -> Int -> IO Int8

pokeByteOff :: Ptr b -> Int -> Int8 -> IO ()

peek :: Ptr Int8 -> IO Int8

poke :: Ptr Int8 -> Int8 -> IO ()

Bits Int8 
Instance details

Defined in GHC.Int

FiniteBits Int8 
Instance details

Defined in GHC.Int

Bounded Int8 
Instance details

Defined in GHC.Int

Enum Int8 
Instance details

Defined in GHC.Int

Ix Int8 
Instance details

Defined in GHC.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 
Instance details

Defined in GHC.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 
Instance details

Defined in GHC.Int

Methods

readsPrec :: Int -> ReadS Int8

readList :: ReadS [Int8]

readPrec :: ReadPrec Int8

readListPrec :: ReadPrec [Int8]

Integral Int8 
Instance details

Defined in GHC.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 
Instance details

Defined in GHC.Int

Methods

toRational :: Int8 -> Rational #

Show Int8 
Instance details

Defined in GHC.Int

Methods

showsPrec :: Int -> Int8 -> ShowS

show :: Int8 -> String #

showList :: [Int8] -> ShowS

PrintfArg Int8 
Instance details

Defined in Text.Printf

Methods

formatArg :: Int8 -> FieldFormatter

parseFormat :: Int8 -> ModifierParser

BitOps Int8 
Instance details

Defined in Basement.Bits

Methods

(.&.) :: Int8 -> Int8 -> Int8

(.|.) :: Int8 -> Int8 -> Int8

(.^.) :: Int8 -> Int8 -> Int8

(.<<.) :: Int8 -> CountOf Bool -> Int8

(.>>.) :: Int8 -> CountOf Bool -> Int8

bit :: Offset Bool -> Int8

isBitSet :: Int8 -> Offset Bool -> Bool

setBit :: Int8 -> Offset Bool -> Int8

clearBit :: Int8 -> Offset Bool -> Int8

FiniteBitsOps Int8 
Instance details

Defined in Basement.Bits

Methods

numberOfBits :: Int8 -> CountOf Bool

rotateL :: Int8 -> CountOf Bool -> Int8

rotateR :: Int8 -> CountOf Bool -> Int8

popCount :: Int8 -> CountOf Bool

bitFlip :: Int8 -> Int8

countLeadingZeros :: Int8 -> CountOf Bool

countTrailingZeros :: Int8 -> CountOf Bool

Subtractive Int8 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Int8 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Int8 = Int8

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

Methods

primSizeInBytes :: Proxy Int8 -> CountOf Word8

primShiftToBytes :: Proxy Int8 -> Int

primBaUIndex :: ByteArray# -> Offset Int8 -> Int8

primMbaURead :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Int8 -> prim Int8

primMbaUWrite :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Int8 -> Int8 -> prim ()

primAddrIndex :: Addr# -> Offset Int8 -> Int8

primAddrRead :: PrimMonad prim => Addr# -> Offset Int8 -> prim Int8

primAddrWrite :: PrimMonad prim => Addr# -> Offset Int8 -> Int8 -> prim ()

Binary Int8 
Instance details

Defined in Data.Binary.Class

Methods

put :: Int8 -> Put

get :: Get Int8

putList :: [Int8] -> Put

NFData Int8 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int8 -> () #

GEnum Int8 
Instance details

Defined in Generics.Deriving.Enum

Methods

genum :: [Int8]

GIx Int8 
Instance details

Defined in Generics.Deriving.Enum

Methods

range :: (Int8, Int8) -> [Int8]

index :: (Int8, Int8) -> Int8 -> Int

inRange :: (Int8, Int8) -> Int8 -> Bool

GEq Int8 
Instance details

Defined in Generics.Deriving.Eq

Methods

geq :: Int8 -> Int8 -> Bool

GShow Int8 
Instance details

Defined in Generics.Deriving.Show

Methods

gshowsPrec :: Int -> Int8 -> ShowS

gshows :: Int8 -> ShowS

gshow :: Int8 -> String

gshowList :: [Int8] -> ShowS

Eq Int8 
Instance details

Defined in GHC.Int

Methods

(==) :: Int8 -> Int8 -> Bool #

(/=) :: Int8 -> Int8 -> Bool #

Ord Int8 
Instance details

Defined in GHC.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

FromHttpApiData Int8 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Int8 
Instance details

Defined in Web.Internal.HttpApiData

ToMustache Int8 
Instance details

Defined in Text.Mustache.Internal.Types

PathPiece Int8 
Instance details

Defined in Web.PathPieces

PersistField Int8 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Int8 -> PersistValue

fromPersistValue :: PersistValue -> Either Text Int8

PersistFieldSql Int8 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Int8 -> SqlType

Pretty Int8 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Int8 -> Doc ann

prettyList :: [Int8] -> Doc ann

Random Int8 
Instance details

Defined in System.Random

Methods

randomR :: RandomGen g => (Int8, Int8) -> g -> (Int8, g)

random :: RandomGen g => g -> (Int8, g)

randomRs :: RandomGen g => (Int8, Int8) -> g -> [Int8]

randoms :: RandomGen g => g -> [Int8]

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

Display Int8 
Instance details

Defined in RIO.Prelude.Display

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

Methods

basicUnsafeFreeze :: Mutable Vector s Int8 -> ST s (Vector Int8)

basicUnsafeThaw :: Vector Int8 -> ST s (Mutable Vector s Int8)

basicLength :: Vector Int8 -> Int

basicUnsafeSlice :: Int -> Int -> Vector Int8 -> Vector Int8

basicUnsafeIndexM :: Vector Int8 -> Int -> Box Int8

basicUnsafeCopy :: Mutable Vector s Int8 -> Vector Int8 -> ST s ()

elemseq :: Vector Int8 -> Int8 -> b -> b

MVector MVector Int8 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s Int8 -> Int

basicUnsafeSlice :: Int -> Int -> MVector s Int8 -> MVector s Int8

basicOverlaps :: MVector s Int8 -> MVector s Int8 -> Bool

basicUnsafeNew :: Int -> ST s (MVector s Int8)

basicInitialize :: MVector s Int8 -> ST s ()

basicUnsafeReplicate :: Int -> Int8 -> ST s (MVector s Int8)

basicUnsafeRead :: MVector s Int8 -> Int -> ST s Int8

basicUnsafeWrite :: MVector s Int8 -> Int -> Int8 -> ST s ()

basicClear :: MVector s Int8 -> ST s ()

basicSet :: MVector s Int8 -> Int8 -> ST s ()

basicUnsafeCopy :: MVector s Int8 -> MVector s Int8 -> ST s ()

basicUnsafeMove :: MVector s Int8 -> MVector s Int8 -> ST s ()

basicUnsafeGrow :: MVector s Int8 -> Int -> ST s (MVector s Int8)

MArray IOUArray Int8 IO 
Instance details

Defined in Data.Array.IO.Internals

Methods

getBounds :: Ix i => IOUArray i Int8 -> IO (i, i)

getNumElements :: Ix i => IOUArray i Int8 -> IO Int

newArray :: Ix i => (i, i) -> Int8 -> IO (IOUArray i Int8)

newArray_ :: Ix i => (i, i) -> IO (IOUArray i Int8)

unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Int8)

unsafeRead :: Ix i => IOUArray i Int8 -> Int -> IO Int8

unsafeWrite :: Ix i => IOUArray i Int8 -> Int -> Int8 -> IO ()

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 Difference Int8 = Int8
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 Vector Int8 = V_Int8 (Vector Int8)
newtype MVector s Int8 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Int8 = MV_Int8 (MVector s Int8)

data MVar a #

Instances

Instances details
NFData1 MVar 
Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> MVar a -> ()

NFData (MVar a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: MVar a -> () #

Eq (MVar a) 
Instance details

Defined in GHC.MVar

Methods

(==) :: MVar a -> MVar a -> Bool #

(/=) :: MVar a -> MVar a -> Bool #

class Num a where #

Minimal complete definition

(+), (*), abs, signum, fromInteger, (negate | (-))

Methods

(+) :: a -> a -> a #

(-) :: a -> a -> a #

(*) :: a -> a -> a #

negate :: a -> a #

abs :: a -> a #

signum :: a -> a #

fromInteger :: Integer -> 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 Number 
Instance details

Defined in Data.Attoparsec.Number

Methods

(+) :: Number -> Number -> Number #

(-) :: Number -> Number -> Number #

(*) :: Number -> Number -> Number #

negate :: Number -> Number #

abs :: Number -> Number #

signum :: Number -> Number #

fromInteger :: Integer -> Number #

Num CBool 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CBool -> CBool -> CBool #

(-) :: CBool -> CBool -> CBool #

(*) :: CBool -> CBool -> CBool #

negate :: CBool -> CBool #

abs :: CBool -> CBool #

signum :: CBool -> CBool #

fromInteger :: Integer -> CBool #

Num CChar 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CChar -> CChar -> CChar #

(-) :: CChar -> CChar -> CChar #

(*) :: CChar -> CChar -> CChar #

negate :: CChar -> CChar #

abs :: CChar -> CChar #

signum :: CChar -> CChar #

fromInteger :: Integer -> CChar #

Num CClock 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CClock -> CClock -> CClock #

(-) :: CClock -> CClock -> CClock #

(*) :: CClock -> CClock -> CClock #

negate :: CClock -> CClock #

abs :: CClock -> CClock #

signum :: CClock -> CClock #

fromInteger :: Integer -> CClock #

Num CDouble 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CDouble -> CDouble -> CDouble #

(-) :: CDouble -> CDouble -> CDouble #

(*) :: CDouble -> CDouble -> CDouble #

negate :: CDouble -> CDouble #

abs :: CDouble -> CDouble #

signum :: CDouble -> CDouble #

fromInteger :: Integer -> CDouble #

Num CFloat 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CFloat -> CFloat -> CFloat #

(-) :: CFloat -> CFloat -> CFloat #

(*) :: CFloat -> CFloat -> CFloat #

negate :: CFloat -> CFloat #

abs :: CFloat -> CFloat #

signum :: CFloat -> CFloat #

fromInteger :: Integer -> CFloat #

Num CInt 
Instance details

Defined in 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 Foreign.C.Types

Methods

(+) :: CIntMax -> CIntMax -> CIntMax #

(-) :: CIntMax -> CIntMax -> CIntMax #

(*) :: CIntMax -> CIntMax -> CIntMax #

negate :: CIntMax -> CIntMax #

abs :: CIntMax -> CIntMax #

signum :: CIntMax -> CIntMax #

fromInteger :: Integer -> CIntMax #

Num CIntPtr 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CIntPtr -> CIntPtr -> CIntPtr #

(-) :: CIntPtr -> CIntPtr -> CIntPtr #

(*) :: CIntPtr -> CIntPtr -> CIntPtr #

negate :: CIntPtr -> CIntPtr #

abs :: CIntPtr -> CIntPtr #

signum :: CIntPtr -> CIntPtr #

fromInteger :: Integer -> CIntPtr #

Num CLLong 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CLLong -> CLLong -> CLLong #

(-) :: CLLong -> CLLong -> CLLong #

(*) :: CLLong -> CLLong -> CLLong #

negate :: CLLong -> CLLong #

abs :: CLLong -> CLLong #

signum :: CLLong -> CLLong #

fromInteger :: Integer -> CLLong #

Num CLong 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CLong -> CLong -> CLong #

(-) :: CLong -> CLong -> CLong #

(*) :: CLong -> CLong -> CLong #

negate :: CLong -> CLong #

abs :: CLong -> CLong #

signum :: CLong -> CLong #

fromInteger :: Integer -> CLong #

Num CPtrdiff 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CPtrdiff -> CPtrdiff -> CPtrdiff #

(-) :: CPtrdiff -> CPtrdiff -> CPtrdiff #

(*) :: CPtrdiff -> CPtrdiff -> CPtrdiff #

negate :: CPtrdiff -> CPtrdiff #

abs :: CPtrdiff -> CPtrdiff #

signum :: CPtrdiff -> CPtrdiff #

fromInteger :: Integer -> CPtrdiff #

Num CSChar 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CSChar -> CSChar -> CSChar #

(-) :: CSChar -> CSChar -> CSChar #

(*) :: CSChar -> CSChar -> CSChar #

negate :: CSChar -> CSChar #

abs :: CSChar -> CSChar #

signum :: CSChar -> CSChar #

fromInteger :: Integer -> CSChar #

Num CSUSeconds 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CSUSeconds -> CSUSeconds -> CSUSeconds #

(-) :: CSUSeconds -> CSUSeconds -> CSUSeconds #

(*) :: CSUSeconds -> CSUSeconds -> CSUSeconds #

negate :: CSUSeconds -> CSUSeconds #

abs :: CSUSeconds -> CSUSeconds #

signum :: CSUSeconds -> CSUSeconds #

fromInteger :: Integer -> CSUSeconds #

Num CShort 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CShort -> CShort -> CShort #

(-) :: CShort -> CShort -> CShort #

(*) :: CShort -> CShort -> CShort #

negate :: CShort -> CShort #

abs :: CShort -> CShort #

signum :: CShort -> CShort #

fromInteger :: Integer -> CShort #

Num CSigAtomic 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CSigAtomic -> CSigAtomic -> CSigAtomic #

(-) :: CSigAtomic -> CSigAtomic -> CSigAtomic #

(*) :: CSigAtomic -> CSigAtomic -> CSigAtomic #

negate :: CSigAtomic -> CSigAtomic #

abs :: CSigAtomic -> CSigAtomic #

signum :: CSigAtomic -> CSigAtomic #

fromInteger :: Integer -> CSigAtomic #

Num CSize 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CSize -> CSize -> CSize #

(-) :: CSize -> CSize -> CSize #

(*) :: CSize -> CSize -> CSize #

negate :: CSize -> CSize #

abs :: CSize -> CSize #

signum :: CSize -> CSize #

fromInteger :: Integer -> CSize #

Num CTime 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CTime -> CTime -> CTime #

(-) :: CTime -> CTime -> CTime #

(*) :: CTime -> CTime -> CTime #

negate :: CTime -> CTime #

abs :: CTime -> CTime #

signum :: CTime -> CTime #

fromInteger :: Integer -> CTime #

Num CUChar 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CUChar -> CUChar -> CUChar #

(-) :: CUChar -> CUChar -> CUChar #

(*) :: CUChar -> CUChar -> CUChar #

negate :: CUChar -> CUChar #

abs :: CUChar -> CUChar #

signum :: CUChar -> CUChar #

fromInteger :: Integer -> CUChar #

Num CUInt 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CUInt -> CUInt -> CUInt #

(-) :: CUInt -> CUInt -> CUInt #

(*) :: CUInt -> CUInt -> CUInt #

negate :: CUInt -> CUInt #

abs :: CUInt -> CUInt #

signum :: CUInt -> CUInt #

fromInteger :: Integer -> CUInt #

Num CUIntMax 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CUIntMax -> CUIntMax -> CUIntMax #

(-) :: CUIntMax -> CUIntMax -> CUIntMax #

(*) :: CUIntMax -> CUIntMax -> CUIntMax #

negate :: CUIntMax -> CUIntMax #

abs :: CUIntMax -> CUIntMax #

signum :: CUIntMax -> CUIntMax #

fromInteger :: Integer -> CUIntMax #

Num CUIntPtr 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CUIntPtr -> CUIntPtr -> CUIntPtr #

(-) :: CUIntPtr -> CUIntPtr -> CUIntPtr #

(*) :: CUIntPtr -> CUIntPtr -> CUIntPtr #

negate :: CUIntPtr -> CUIntPtr #

abs :: CUIntPtr -> CUIntPtr #

signum :: CUIntPtr -> CUIntPtr #

fromInteger :: Integer -> CUIntPtr #

Num CULLong 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CULLong -> CULLong -> CULLong #

(-) :: CULLong -> CULLong -> CULLong #

(*) :: CULLong -> CULLong -> CULLong #

negate :: CULLong -> CULLong #

abs :: CULLong -> CULLong #

signum :: CULLong -> CULLong #

fromInteger :: Integer -> CULLong #

Num CULong 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CULong -> CULong -> CULong #

(-) :: CULong -> CULong -> CULong #

(*) :: CULong -> CULong -> CULong #

negate :: CULong -> CULong #

abs :: CULong -> CULong #

signum :: CULong -> CULong #

fromInteger :: Integer -> CULong #

Num CUSeconds 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CUSeconds -> CUSeconds -> CUSeconds #

(-) :: CUSeconds -> CUSeconds -> CUSeconds #

(*) :: CUSeconds -> CUSeconds -> CUSeconds #

negate :: CUSeconds -> CUSeconds #

abs :: CUSeconds -> CUSeconds #

signum :: CUSeconds -> CUSeconds #

fromInteger :: Integer -> CUSeconds #

Num CUShort 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CUShort -> CUShort -> CUShort #

(-) :: CUShort -> CUShort -> CUShort #

(*) :: CUShort -> CUShort -> CUShort #

negate :: CUShort -> CUShort #

abs :: CUShort -> CUShort #

signum :: CUShort -> CUShort #

fromInteger :: Integer -> CUShort #

Num CWchar 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CWchar -> CWchar -> CWchar #

(-) :: CWchar -> CWchar -> CWchar #

(*) :: CWchar -> CWchar -> CWchar #

negate :: CWchar -> CWchar #

abs :: CWchar -> CWchar #

signum :: CWchar -> CWchar #

fromInteger :: Integer -> CWchar #

Num IntPtr 
Instance details

Defined in Foreign.Ptr

Methods

(+) :: IntPtr -> IntPtr -> IntPtr #

(-) :: IntPtr -> IntPtr -> IntPtr #

(*) :: IntPtr -> IntPtr -> IntPtr #

negate :: IntPtr -> IntPtr #

abs :: IntPtr -> IntPtr #

signum :: IntPtr -> IntPtr #

fromInteger :: Integer -> IntPtr #

Num WordPtr 
Instance details

Defined in Foreign.Ptr

Methods

(+) :: WordPtr -> WordPtr -> WordPtr #

(-) :: WordPtr -> WordPtr -> WordPtr #

(*) :: WordPtr -> WordPtr -> WordPtr #

negate :: WordPtr -> WordPtr #

abs :: WordPtr -> WordPtr #

signum :: WordPtr -> WordPtr #

fromInteger :: Integer -> WordPtr #

Num Int16 
Instance details

Defined in GHC.Int

Num Int32 
Instance details

Defined in GHC.Int

Num Int64 
Instance details

Defined in GHC.Int

Num Int8 
Instance details

Defined in GHC.Int

Methods

(+) :: Int8 -> Int8 -> Int8 #

(-) :: Int8 -> Int8 -> Int8 #

(*) :: Int8 -> Int8 -> Int8 #

negate :: Int8 -> Int8 #

abs :: Int8 -> Int8 #

signum :: Int8 -> Int8 #

fromInteger :: Integer -> Int8 #

Num Word16 
Instance details

Defined in GHC.Word

Num Word32 
Instance details

Defined in GHC.Word

Num Word64 
Instance details

Defined in GHC.Word

Num Word8 
Instance details

Defined in GHC.Word

Num CBlkCnt 
Instance details

Defined in System.Posix.Types

Methods

(+) :: CBlkCnt -> CBlkCnt -> CBlkCnt #

(-) :: CBlkCnt -> CBlkCnt -> CBlkCnt #

(*) :: CBlkCnt -> CBlkCnt -> CBlkCnt #

negate :: CBlkCnt -> CBlkCnt #

abs :: CBlkCnt -> CBlkCnt #

signum :: CBlkCnt -> CBlkCnt #

fromInteger :: Integer -> CBlkCnt #

Num CBlkSize 
Instance details

Defined in System.Posix.Types

Methods

(+) :: CBlkSize -> CBlkSize -> CBlkSize #

(-) :: CBlkSize -> CBlkSize -> CBlkSize #

(*) :: CBlkSize -> CBlkSize -> CBlkSize #

negate :: CBlkSize -> CBlkSize #

abs :: CBlkSize -> CBlkSize #

signum :: CBlkSize -> CBlkSize #

fromInteger :: Integer -> CBlkSize #

Num CCc 
Instance details

Defined in 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 System.Posix.Types

Methods

(+) :: CClockId -> CClockId -> CClockId #

(-) :: CClockId -> CClockId -> CClockId #

(*) :: CClockId -> CClockId -> CClockId #

negate :: CClockId -> CClockId #

abs :: CClockId -> CClockId #

signum :: CClockId -> CClockId #

fromInteger :: Integer -> CClockId #

Num CDev 
Instance details

Defined in 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 System.Posix.Types

Methods

(+) :: CFsBlkCnt -> CFsBlkCnt -> CFsBlkCnt #

(-) :: CFsBlkCnt -> CFsBlkCnt -> CFsBlkCnt #

(*) :: CFsBlkCnt -> CFsBlkCnt -> CFsBlkCnt #

negate :: CFsBlkCnt -> CFsBlkCnt #

abs :: CFsBlkCnt -> CFsBlkCnt #

signum :: CFsBlkCnt -> CFsBlkCnt #

fromInteger :: Integer -> CFsBlkCnt #

Num CFsFilCnt 
Instance details

Defined in System.Posix.Types

Methods

(+) :: CFsFilCnt -> CFsFilCnt -> CFsFilCnt #

(-) :: CFsFilCnt -> CFsFilCnt -> CFsFilCnt #

(*) :: CFsFilCnt -> CFsFilCnt -> CFsFilCnt #

negate :: CFsFilCnt -> CFsFilCnt #

abs :: CFsFilCnt -> CFsFilCnt #

signum :: CFsFilCnt -> CFsFilCnt #

fromInteger :: Integer -> CFsFilCnt #

Num CGid 
Instance details

Defined in 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 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 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 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 System.Posix.Types

Methods

(+) :: CMode -> CMode -> CMode #

(-) :: CMode -> CMode -> CMode #

(*) :: CMode -> CMode -> CMode #

negate :: CMode -> CMode #

abs :: CMode -> CMode #

signum :: CMode -> CMode #

fromInteger :: Integer -> CMode #

Num CNfds 
Instance details

Defined in System.Posix.Types

Methods

(+) :: CNfds -> CNfds -> CNfds #

(-) :: CNfds -> CNfds -> CNfds #

(*) :: CNfds -> CNfds -> CNfds #

negate :: CNfds -> CNfds #

abs :: CNfds -> CNfds #

signum :: CNfds -> CNfds #

fromInteger :: Integer -> CNfds #

Num CNlink 
Instance details

Defined in System.Posix.Types

Methods

(+) :: CNlink -> CNlink -> CNlink #

(-) :: CNlink -> CNlink -> CNlink #

(*) :: CNlink -> CNlink -> CNlink #

negate :: CNlink -> CNlink #

abs :: CNlink -> CNlink #

signum :: CNlink -> CNlink #

fromInteger :: Integer -> CNlink #

Num COff 
Instance details

Defined in 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 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 System.Posix.Types

Methods

(+) :: CRLim -> CRLim -> CRLim #

(-) :: CRLim -> CRLim -> CRLim #

(*) :: CRLim -> CRLim -> CRLim #

negate :: CRLim -> CRLim #

abs :: CRLim -> CRLim #

signum :: CRLim -> CRLim #

fromInteger :: Integer -> CRLim #

Num CSocklen 
Instance details

Defined in System.Posix.Types

Methods

(+) :: CSocklen -> CSocklen -> CSocklen #

(-) :: CSocklen -> CSocklen -> CSocklen #

(*) :: CSocklen -> CSocklen -> CSocklen #

negate :: CSocklen -> CSocklen #

abs :: CSocklen -> CSocklen #

signum :: CSocklen -> CSocklen #

fromInteger :: Integer -> CSocklen #

Num CSpeed 
Instance details

Defined in System.Posix.Types

Methods

(+) :: CSpeed -> CSpeed -> CSpeed #

(-) :: CSpeed -> CSpeed -> CSpeed #

(*) :: CSpeed -> CSpeed -> CSpeed #

negate :: CSpeed -> CSpeed #

abs :: CSpeed -> CSpeed #

signum :: CSpeed -> CSpeed #

fromInteger :: Integer -> CSpeed #

Num CSsize 
Instance details

Defined in System.Posix.Types

Methods

(+) :: CSsize -> CSsize -> CSsize #

(-) :: CSsize -> CSsize -> CSsize #

(*) :: CSsize -> CSsize -> CSsize #

negate :: CSsize -> CSsize #

abs :: CSsize -> CSsize #

signum :: CSsize -> CSsize #

fromInteger :: Integer -> CSsize #

Num CTcflag 
Instance details

Defined in System.Posix.Types

Methods

(+) :: CTcflag -> CTcflag -> CTcflag #

(-) :: CTcflag -> CTcflag -> CTcflag #

(*) :: CTcflag -> CTcflag -> CTcflag #

negate :: CTcflag -> CTcflag #

abs :: CTcflag -> CTcflag #

signum :: CTcflag -> CTcflag #

fromInteger :: Integer -> CTcflag #

Num CUid 
Instance details

Defined in 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 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 PrivateNumber 
Instance details

Defined in Crypto.PubKey.DH

Methods

(+) :: PrivateNumber -> PrivateNumber -> PrivateNumber #

(-) :: PrivateNumber -> PrivateNumber -> PrivateNumber #

(*) :: PrivateNumber -> PrivateNumber -> PrivateNumber #

negate :: PrivateNumber -> PrivateNumber #

abs :: PrivateNumber -> PrivateNumber #

signum :: PrivateNumber -> PrivateNumber #

fromInteger :: Integer -> PrivateNumber #

Num PublicNumber 
Instance details

Defined in Crypto.PubKey.DH

Methods

(+) :: PublicNumber -> PublicNumber -> PublicNumber #

(-) :: PublicNumber -> PublicNumber -> PublicNumber #

(*) :: PublicNumber -> PublicNumber -> PublicNumber #

negate :: PublicNumber -> PublicNumber #

abs :: PublicNumber -> PublicNumber #

signum :: PublicNumber -> PublicNumber #

fromInteger :: Integer -> PublicNumber #

Num Half 
Instance details

Defined in Numeric.Half.Internal

Methods

(+) :: Half -> Half -> Half #

(-) :: Half -> Half -> Half #

(*) :: Half -> Half -> Half #

negate :: Half -> Half #

abs :: Half -> Half #

signum :: Half -> Half #

fromInteger :: Integer -> Half #

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 MaxHeaderLength 
Instance details

Defined in Network.HTTP.Client.Types

Methods

(+) :: MaxHeaderLength -> MaxHeaderLength -> MaxHeaderLength #

(-) :: MaxHeaderLength -> MaxHeaderLength -> MaxHeaderLength #

(*) :: MaxHeaderLength -> MaxHeaderLength -> MaxHeaderLength #

negate :: MaxHeaderLength -> MaxHeaderLength #

abs :: MaxHeaderLength -> MaxHeaderLength #

signum :: MaxHeaderLength -> MaxHeaderLength #

fromInteger :: Integer -> MaxHeaderLength #

Num MaxNumberHeaders 
Instance details

Defined in Network.HTTP.Client.Types

Methods

(+) :: MaxNumberHeaders -> MaxNumberHeaders -> MaxNumberHeaders #

(-) :: MaxNumberHeaders -> MaxNumberHeaders -> MaxNumberHeaders #

(*) :: MaxNumberHeaders -> MaxNumberHeaders -> MaxNumberHeaders #

negate :: MaxNumberHeaders -> MaxNumberHeaders #

abs :: MaxNumberHeaders -> MaxNumberHeaders #

signum :: MaxNumberHeaders -> MaxNumberHeaders #

fromInteger :: Integer -> MaxNumberHeaders #

Num PortNumber 
Instance details

Defined in Network.Socket.Types

Methods

(+) :: PortNumber -> PortNumber -> PortNumber #

(-) :: PortNumber -> PortNumber -> PortNumber #

(*) :: PortNumber -> PortNumber -> PortNumber #

negate :: PortNumber -> PortNumber #

abs :: PortNumber -> PortNumber #

signum :: PortNumber -> PortNumber #

fromInteger :: Integer -> PortNumber #

Num OverflowNatural 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

(+) :: OverflowNatural -> OverflowNatural -> OverflowNatural #

(-) :: OverflowNatural -> OverflowNatural -> OverflowNatural #

(*) :: OverflowNatural -> OverflowNatural -> OverflowNatural #

negate :: OverflowNatural -> OverflowNatural #

abs :: OverflowNatural -> OverflowNatural #

signum :: OverflowNatural -> OverflowNatural #

fromInteger :: Integer -> OverflowNatural #

Num Scientific 
Instance details

Defined in Data.Scientific

Methods

(+) :: Scientific -> Scientific -> Scientific #

(-) :: Scientific -> Scientific -> Scientific #

(*) :: Scientific -> Scientific -> Scientific #

negate :: Scientific -> Scientific #

abs :: Scientific -> Scientific #

signum :: Scientific -> Scientific #

fromInteger :: Integer -> 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

Methods

(+) :: DiffTime -> DiffTime -> DiffTime #

(-) :: DiffTime -> DiffTime -> DiffTime #

(*) :: DiffTime -> DiffTime -> DiffTime #

negate :: DiffTime -> DiffTime #

abs :: DiffTime -> DiffTime #

signum :: DiffTime -> DiffTime #

fromInteger :: Integer -> DiffTime #

Num NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Methods

(+) :: NominalDiffTime -> NominalDiffTime -> NominalDiffTime #

(-) :: NominalDiffTime -> NominalDiffTime -> NominalDiffTime #

(*) :: NominalDiffTime -> NominalDiffTime -> NominalDiffTime #

negate :: NominalDiffTime -> NominalDiffTime #

abs :: NominalDiffTime -> NominalDiffTime #

signum :: NominalDiffTime -> NominalDiffTime #

fromInteger :: Integer -> NominalDiffTime #

Num CAttributes 
Instance details

Defined in System.Posix.Files.Common

Methods

(+) :: CAttributes -> CAttributes -> CAttributes #

(-) :: CAttributes -> CAttributes -> CAttributes #

(*) :: CAttributes -> CAttributes -> CAttributes #

negate :: CAttributes -> CAttributes #

abs :: CAttributes -> CAttributes #

signum :: CAttributes -> CAttributes #

fromInteger :: Integer -> CAttributes #

Num StatxFlags 
Instance details

Defined in System.Posix.Files.Common

Methods

(+) :: StatxFlags -> StatxFlags -> StatxFlags #

(-) :: StatxFlags -> StatxFlags -> StatxFlags #

(*) :: StatxFlags -> StatxFlags -> StatxFlags #

negate :: StatxFlags -> StatxFlags #

abs :: StatxFlags -> StatxFlags #

signum :: StatxFlags -> StatxFlags #

fromInteger :: Integer -> StatxFlags #

Num StatxMask 
Instance details

Defined in System.Posix.Files.Common

Methods

(+) :: StatxMask -> StatxMask -> StatxMask #

(-) :: StatxMask -> StatxMask -> StatxMask #

(*) :: StatxMask -> StatxMask -> StatxMask #

negate :: StatxMask -> StatxMask #

abs :: StatxMask -> StatxMask #

signum :: StatxMask -> StatxMask #

fromInteger :: Integer -> StatxMask #

Num Size 
Instance details

Defined in Data.Vector.Fusion.Bundle.Size

Methods

(+) :: Size -> Size -> Size #

(-) :: Size -> Size -> Size #

(*) :: Size -> Size -> Size #

negate :: Size -> Size #

abs :: Size -> Size #

signum :: Size -> Size #

fromInteger :: Integer -> Size #

Num Integer 
Instance details

Defined in GHC.Num

Num Natural 
Instance details

Defined in GHC.Num

Num Int 
Instance details

Defined in GHC.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 
Instance details

Defined in GHC.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) 
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 (Identity a) 
Instance details

Defined in Data.Functor.Identity

Num a => Num (Down a) 
Instance details

Defined in 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 (Max a) 
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) 
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 #

Num a => Num (Product a) 
Instance details

Defined in 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) 
Instance details

Defined in 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) 
Instance details

Defined in GHC.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 #

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 #

(BackendCompatible b s, Num (BackendKey b)) => Num (BackendKey (Compatible b s)) 
Instance details

Defined in Database.Persist.Compatible.Types

Methods

(+) :: BackendKey (Compatible b s) -> BackendKey (Compatible b s) -> BackendKey (Compatible b s) #

(-) :: BackendKey (Compatible b s) -> BackendKey (Compatible b s) -> BackendKey (Compatible b s) #

(*) :: BackendKey (Compatible b s) -> BackendKey (Compatible b s) -> BackendKey (Compatible b s) #

negate :: BackendKey (Compatible b s) -> BackendKey (Compatible b s) #

abs :: BackendKey (Compatible b s) -> BackendKey (Compatible b s) #

signum :: BackendKey (Compatible b s) -> BackendKey (Compatible b s) #

fromInteger :: Integer -> BackendKey (Compatible b s) #

(PersistCore b, PersistCore (RawSqlite b), Num (BackendKey b)) => Num (BackendKey (RawSqlite b)) 
Instance details

Defined in Database.Persist.Sqlite

Methods

(+) :: BackendKey (RawSqlite b) -> BackendKey (RawSqlite b) -> BackendKey (RawSqlite b) #

(-) :: BackendKey (RawSqlite b) -> BackendKey (RawSqlite b) -> BackendKey (RawSqlite b) #

(*) :: BackendKey (RawSqlite b) -> BackendKey (RawSqlite b) -> BackendKey (RawSqlite b) #

negate :: BackendKey (RawSqlite b) -> BackendKey (RawSqlite b) #

abs :: BackendKey (RawSqlite b) -> BackendKey (RawSqlite b) #

signum :: BackendKey (RawSqlite b) -> BackendKey (RawSqlite b) #

fromInteger :: Integer -> BackendKey (RawSqlite b) #

HasResolution a => Num (Fixed a) 
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) 
Instance details

Defined in 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) 
Instance details

Defined in 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) 
Instance details

Defined in 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) 
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 #

Minimal complete definition

readsPrec | readPrec

Instances

Instances details
Read ModTime 
Instance details

Defined in Distribution.Compat.Time

Methods

readsPrec :: Int -> ReadS ModTime

readList :: ReadS [ModTime]

readPrec :: ReadPrec ModTime

readListPrec :: ReadPrec [ModTime]

Read Compiler 
Instance details

Defined in Distribution.Simple.Compiler

Methods

readsPrec :: Int -> ReadS Compiler

readList :: ReadS [Compiler]

readPrec :: ReadPrec Compiler

readListPrec :: ReadPrec [Compiler]

Read DebugInfoLevel 
Instance details

Defined in Distribution.Simple.Compiler

Methods

readsPrec :: Int -> ReadS DebugInfoLevel

readList :: ReadS [DebugInfoLevel]

readPrec :: ReadPrec DebugInfoLevel

readListPrec :: ReadPrec [DebugInfoLevel]

Read OptimisationLevel 
Instance details

Defined in Distribution.Simple.Compiler

Methods

readsPrec :: Int -> ReadS OptimisationLevel

readList :: ReadS [OptimisationLevel]

readPrec :: ReadPrec OptimisationLevel

readListPrec :: ReadPrec [OptimisationLevel]

Read PackageDB 
Instance details

Defined in Distribution.Simple.Compiler

Methods

readsPrec :: Int -> ReadS PackageDB

readList :: ReadS [PackageDB]

readPrec :: ReadPrec PackageDB

readListPrec :: ReadPrec [PackageDB]

Read ProfDetailLevel 
Instance details

Defined in Distribution.Simple.Compiler

Methods

readsPrec :: Int -> ReadS ProfDetailLevel

readList :: ReadS [ProfDetailLevel]

readPrec :: ReadPrec ProfDetailLevel

readListPrec :: ReadPrec [ProfDetailLevel]

Read Directory 
Instance details

Defined in Distribution.Simple.Haddock

Methods

readsPrec :: Int -> ReadS Directory

readList :: ReadS [Directory]

readPrec :: ReadPrec Directory

readListPrec :: ReadPrec [Directory]

Read Way 
Instance details

Defined in Distribution.Simple.Hpc

Methods

readsPrec :: Int -> ReadS Way

readList :: ReadS [Way]

readPrec :: ReadPrec Way

readListPrec :: ReadPrec [Way]

Read PathTemplate 
Instance details

Defined in Distribution.Simple.InstallDirs

Methods

readsPrec :: Int -> ReadS PathTemplate

readList :: ReadS [PathTemplate]

readPrec :: ReadPrec PathTemplate

readListPrec :: ReadPrec [PathTemplate]

Read PathComponent 
Instance details

Defined in Distribution.Simple.InstallDirs.Internal

Methods

readsPrec :: Int -> ReadS PathComponent

readList :: ReadS [PathComponent]

readPrec :: ReadPrec PathComponent

readListPrec :: ReadPrec [PathComponent]

Read PathTemplateVariable 
Instance details

Defined in Distribution.Simple.InstallDirs.Internal

Methods

readsPrec :: Int -> ReadS PathTemplateVariable

readList :: ReadS [PathTemplateVariable]

readPrec :: ReadPrec PathTemplateVariable

readListPrec :: ReadPrec [PathTemplateVariable]

Read ProgramDb 
Instance details

Defined in Distribution.Simple.Program.Db

Methods

readsPrec :: Int -> ReadS ProgramDb

readList :: ReadS [ProgramDb]

readPrec :: ReadPrec ProgramDb

readListPrec :: ReadPrec [ProgramDb]

Read ConfiguredProgram 
Instance details

Defined in Distribution.Simple.Program.Types

Methods

readsPrec :: Int -> ReadS ConfiguredProgram

readList :: ReadS [ConfiguredProgram]

readPrec :: ReadPrec ConfiguredProgram

readListPrec :: ReadPrec [ConfiguredProgram]

Read ProgramLocation 
Instance details

Defined in Distribution.Simple.Program.Types

Methods

readsPrec :: Int -> ReadS ProgramLocation

readList :: ReadS [ProgramLocation]

readPrec :: ReadPrec ProgramLocation

readListPrec :: ReadPrec [ProgramLocation]

Read BuildFlags 
Instance details

Defined in Distribution.Simple.Setup

Methods

readsPrec :: Int -> ReadS BuildFlags

readList :: ReadS [BuildFlags]

readPrec :: ReadPrec BuildFlags

readListPrec :: ReadPrec [BuildFlags]

Read ConfigFlags 
Instance details

Defined in Distribution.Simple.Setup

Methods

readsPrec :: Int -> ReadS ConfigFlags

readList :: ReadS [ConfigFlags]

readPrec :: ReadPrec ConfigFlags

readListPrec :: ReadPrec [ConfigFlags]

Read PackageLog 
Instance details

Defined in Distribution.Simple.Test.Log

Methods

readsPrec :: Int -> ReadS PackageLog

readList :: ReadS [PackageLog]

readPrec :: ReadPrec PackageLog

readListPrec :: ReadPrec [PackageLog]

Read TestLogs 
Instance details

Defined in Distribution.Simple.Test.Log

Methods

readsPrec :: Int -> ReadS TestLogs

readList :: ReadS [TestLogs]

readPrec :: ReadPrec TestLogs

readListPrec :: ReadPrec [TestLogs]

Read TestSuiteLog 
Instance details

Defined in Distribution.Simple.Test.Log

Methods

readsPrec :: Int -> ReadS TestSuiteLog

readList :: ReadS [TestSuiteLog]

readPrec :: ReadPrec TestSuiteLog

readListPrec :: ReadPrec [TestSuiteLog]

Read OptionDescr 
Instance details

Defined in Distribution.TestSuite

Methods

readsPrec :: Int -> ReadS OptionDescr

readList :: ReadS [OptionDescr]

readPrec :: ReadPrec OptionDescr

readListPrec :: ReadPrec [OptionDescr]

Read OptionType 
Instance details

Defined in Distribution.TestSuite

Methods

readsPrec :: Int -> ReadS OptionType

readList :: ReadS [OptionType]

readPrec :: ReadPrec OptionType

readListPrec :: ReadPrec [OptionType]

Read Result 
Instance details

Defined in Distribution.TestSuite

Methods

readsPrec :: Int -> ReadS Result

readList :: ReadS [Result]

readPrec :: ReadPrec Result

readListPrec :: ReadPrec [Result]

Read ComponentLocalBuildInfo 
Instance details

Defined in Distribution.Types.ComponentLocalBuildInfo

Methods

readsPrec :: Int -> ReadS ComponentLocalBuildInfo

readList :: ReadS [ComponentLocalBuildInfo]

readPrec :: ReadPrec ComponentLocalBuildInfo

readListPrec :: ReadPrec [ComponentLocalBuildInfo]

Read DumpBuildInfo 
Instance details

Defined in Distribution.Types.DumpBuildInfo

Methods

readsPrec :: Int -> ReadS DumpBuildInfo

readList :: ReadS [DumpBuildInfo]

readPrec :: ReadPrec DumpBuildInfo

readListPrec :: ReadPrec [DumpBuildInfo]

Read GivenComponent 
Instance details

Defined in Distribution.Types.GivenComponent

Methods

readsPrec :: Int -> ReadS GivenComponent

readList :: ReadS [GivenComponent]

readPrec :: ReadPrec GivenComponent

readListPrec :: ReadPrec [GivenComponent]

Read LocalBuildInfo 
Instance details

Defined in Distribution.Types.LocalBuildInfo

Methods

readsPrec :: Int -> ReadS LocalBuildInfo

readList :: ReadS [LocalBuildInfo]

readPrec :: ReadPrec LocalBuildInfo

readListPrec :: ReadPrec [LocalBuildInfo]

Read Verbosity 
Instance details

Defined in Distribution.Verbosity

Methods

readsPrec :: Int -> ReadS Verbosity

readList :: ReadS [Verbosity]

readPrec :: ReadPrec Verbosity

readListPrec :: ReadPrec [Verbosity]

Read VerbosityFlag 
Instance details

Defined in Distribution.Verbosity.Internal

Methods

readsPrec :: Int -> ReadS VerbosityFlag

readList :: ReadS [VerbosityFlag]

readPrec :: ReadPrec VerbosityFlag

readListPrec :: ReadPrec [VerbosityFlag]

Read VerbosityLevel 
Instance details

Defined in Distribution.Verbosity.Internal

Methods

readsPrec :: Int -> ReadS VerbosityLevel

readList :: ReadS [VerbosityLevel]

readPrec :: ReadPrec VerbosityLevel

readListPrec :: ReadPrec [VerbosityLevel]

Read OpenModule 
Instance details

Defined in Distribution.Backpack

Methods

readsPrec :: Int -> ReadS OpenModule

readList :: ReadS [OpenModule]

readPrec :: ReadPrec OpenModule

readListPrec :: ReadPrec [OpenModule]

Read OpenUnitId 
Instance details

Defined in Distribution.Backpack

Methods

readsPrec :: Int -> ReadS OpenUnitId

readList :: ReadS [OpenUnitId]

readPrec :: ReadPrec OpenUnitId

readListPrec :: ReadPrec [OpenUnitId]

Read CabalSpecVersion 
Instance details

Defined in Distribution.CabalSpecVersion

Methods

readsPrec :: Int -> ReadS CabalSpecVersion

readList :: ReadS [CabalSpecVersion]

readPrec :: ReadPrec CabalSpecVersion

readListPrec :: ReadPrec [CabalSpecVersion]

Read AbiTag 
Instance details

Defined in Distribution.Compiler

Methods

readsPrec :: Int -> ReadS AbiTag

readList :: ReadS [AbiTag]

readPrec :: ReadPrec AbiTag

readListPrec :: ReadPrec [AbiTag]

Read CompilerFlavor 
Instance details

Defined in Distribution.Compiler

Methods

readsPrec :: Int -> ReadS CompilerFlavor

readList :: ReadS [CompilerFlavor]

readPrec :: ReadPrec CompilerFlavor

readListPrec :: ReadPrec [CompilerFlavor]

Read CompilerId 
Instance details

Defined in Distribution.Compiler

Methods

readsPrec :: Int -> ReadS CompilerId

readList :: ReadS [CompilerId]

readPrec :: ReadPrec CompilerId

readListPrec :: ReadPrec [CompilerId]

Read CompilerInfo 
Instance details

Defined in Distribution.Compiler

Methods

readsPrec :: Int -> ReadS CompilerInfo

readList :: ReadS [CompilerInfo]

readPrec :: ReadPrec CompilerInfo

readListPrec :: ReadPrec [CompilerInfo]

Read License 
Instance details

Defined in Distribution.License

Methods

readsPrec :: Int -> ReadS License

readList :: ReadS [License]

readPrec :: ReadPrec License

readListPrec :: ReadPrec [License]

Read ModuleName 
Instance details

Defined in Distribution.ModuleName

Methods

readsPrec :: Int -> ReadS ModuleName

readList :: ReadS [ModuleName]

readPrec :: ReadPrec ModuleName

readListPrec :: ReadPrec [ModuleName]

Read License 
Instance details

Defined in Distribution.SPDX.License

Methods

readsPrec :: Int -> ReadS License

readList :: ReadS [License]

readPrec :: ReadPrec License

readListPrec :: ReadPrec [License]

Read LicenseExceptionId 
Instance details

Defined in Distribution.SPDX.LicenseExceptionId

Methods

readsPrec :: Int -> ReadS LicenseExceptionId

readList :: ReadS [LicenseExceptionId]

readPrec :: ReadPrec LicenseExceptionId

readListPrec :: ReadPrec [LicenseExceptionId]

Read LicenseExpression 
Instance details

Defined in Distribution.SPDX.LicenseExpression

Methods

readsPrec :: Int -> ReadS LicenseExpression

readList :: ReadS [LicenseExpression]

readPrec :: ReadPrec LicenseExpression

readListPrec :: ReadPrec [LicenseExpression]

Read SimpleLicenseExpression 
Instance details

Defined in Distribution.SPDX.LicenseExpression

Methods

readsPrec :: Int -> ReadS SimpleLicenseExpression

readList :: ReadS [SimpleLicenseExpression]

readPrec :: ReadPrec SimpleLicenseExpression

readListPrec :: ReadPrec [SimpleLicenseExpression]

Read LicenseId 
Instance details

Defined in Distribution.SPDX.LicenseId

Methods

readsPrec :: Int -> ReadS LicenseId

readList :: ReadS [LicenseId]

readPrec :: ReadPrec LicenseId

readListPrec :: ReadPrec [LicenseId]

Read LicenseRef 
Instance details

Defined in Distribution.SPDX.LicenseReference

Methods

readsPrec :: Int -> ReadS LicenseRef

readList :: ReadS [LicenseRef]

readPrec :: ReadPrec LicenseRef

readListPrec :: ReadPrec [LicenseRef]

Read Arch 
Instance details

Defined in Distribution.System

Methods

readsPrec :: Int -> ReadS Arch

readList :: ReadS [Arch]

readPrec :: ReadPrec Arch

readListPrec :: ReadPrec [Arch]

Read OS 
Instance details

Defined in Distribution.System

Methods

readsPrec :: Int -> ReadS OS

readList :: ReadS [OS]

readPrec :: ReadPrec OS

readListPrec :: ReadPrec [OS]

Read Platform 
Instance details

Defined in Distribution.System

Methods

readsPrec :: Int -> ReadS Platform

readList :: ReadS [Platform]

readPrec :: ReadPrec Platform

readListPrec :: ReadPrec [Platform]

Read AbiDependency 
Instance details

Defined in Distribution.Types.AbiDependency

Methods

readsPrec :: Int -> ReadS AbiDependency

readList :: ReadS [AbiDependency]

readPrec :: ReadPrec AbiDependency

readListPrec :: ReadPrec [AbiDependency]

Read AbiHash 
Instance details

Defined in Distribution.Types.AbiHash

Methods

readsPrec :: Int -> ReadS AbiHash

readList :: ReadS [AbiHash]

readPrec :: ReadPrec AbiHash

readListPrec :: ReadPrec [AbiHash]

Read Benchmark 
Instance details

Defined in Distribution.Types.Benchmark

Methods

readsPrec :: Int -> ReadS Benchmark

readList :: ReadS [Benchmark]

readPrec :: ReadPrec Benchmark

readListPrec :: ReadPrec [Benchmark]

Read BenchmarkInterface 
Instance details

Defined in Distribution.Types.BenchmarkInterface

Methods

readsPrec :: Int -> ReadS BenchmarkInterface

readList :: ReadS [BenchmarkInterface]

readPrec :: ReadPrec BenchmarkInterface

readListPrec :: ReadPrec [BenchmarkInterface]

Read BenchmarkType 
Instance details

Defined in Distribution.Types.BenchmarkType

Methods

readsPrec :: Int -> ReadS BenchmarkType

readList :: ReadS [BenchmarkType]

readPrec :: ReadPrec BenchmarkType

readListPrec :: ReadPrec [BenchmarkType]

Read BuildInfo 
Instance details

Defined in Distribution.Types.BuildInfo

Methods

readsPrec :: Int -> ReadS BuildInfo

readList :: ReadS [BuildInfo]

readPrec :: ReadPrec BuildInfo

readListPrec :: ReadPrec [BuildInfo]

Read BuildType 
Instance details

Defined in Distribution.Types.BuildType

Methods

readsPrec :: Int -> ReadS BuildType

readList :: ReadS [BuildType]

readPrec :: ReadPrec BuildType

readListPrec :: ReadPrec [BuildType]

Read Component 
Instance details

Defined in Distribution.Types.Component

Methods

readsPrec :: Int -> ReadS Component

readList :: ReadS [Component]

readPrec :: ReadPrec Component

readListPrec :: ReadPrec [Component]

Read ComponentId 
Instance details

Defined in Distribution.Types.ComponentId

Methods

readsPrec :: Int -> ReadS ComponentId

readList :: ReadS [ComponentId]

readPrec :: ReadPrec ComponentId

readListPrec :: ReadPrec [ComponentId]

Read ComponentName 
Instance details

Defined in Distribution.Types.ComponentName

Methods

readsPrec :: Int -> ReadS ComponentName

readList :: ReadS [ComponentName]

readPrec :: ReadPrec ComponentName

readListPrec :: ReadPrec [ComponentName]

Read NotLibComponentName 
Instance details

Defined in Distribution.Types.ComponentName

Methods

readsPrec :: Int -> ReadS NotLibComponentName

readList :: ReadS [NotLibComponentName]

readPrec :: ReadPrec NotLibComponentName

readListPrec :: ReadPrec [NotLibComponentName]

Read ComponentRequestedSpec 
Instance details

Defined in Distribution.Types.ComponentRequestedSpec

Methods

readsPrec :: Int -> ReadS ComponentRequestedSpec

readList :: ReadS [ComponentRequestedSpec]

readPrec :: ReadPrec ComponentRequestedSpec

readListPrec :: ReadPrec [ComponentRequestedSpec]

Read Dependency 
Instance details

Defined in Distribution.Types.Dependency

Methods

readsPrec :: Int -> ReadS Dependency

readList :: ReadS [Dependency]

readPrec :: ReadPrec Dependency

readListPrec :: ReadPrec [Dependency]

Read DependencyMap 
Instance details

Defined in Distribution.Types.DependencyMap

Methods

readsPrec :: Int -> ReadS DependencyMap

readList :: ReadS [DependencyMap]

readPrec :: ReadPrec DependencyMap

readListPrec :: ReadPrec [DependencyMap]

Read ExeDependency 
Instance details

Defined in Distribution.Types.ExeDependency

Methods

readsPrec :: Int -> ReadS ExeDependency

readList :: ReadS [ExeDependency]

readPrec :: ReadPrec ExeDependency

readListPrec :: ReadPrec [ExeDependency]

Read Executable 
Instance details

Defined in Distribution.Types.Executable

Methods

readsPrec :: Int -> ReadS Executable

readList :: ReadS [Executable]

readPrec :: ReadPrec Executable

readListPrec :: ReadPrec [Executable]

Read ExecutableScope 
Instance details

Defined in Distribution.Types.ExecutableScope

Methods

readsPrec :: Int -> ReadS ExecutableScope

readList :: ReadS [ExecutableScope]

readPrec :: ReadPrec ExecutableScope

readListPrec :: ReadPrec [ExecutableScope]

Read ExposedModule 
Instance details

Defined in Distribution.Types.ExposedModule

Methods

readsPrec :: Int -> ReadS ExposedModule

readList :: ReadS [ExposedModule]

readPrec :: ReadPrec ExposedModule

readListPrec :: ReadPrec [ExposedModule]

Read FlagAssignment 
Instance details

Defined in Distribution.Types.Flag

Methods

readsPrec :: Int -> ReadS FlagAssignment

readList :: ReadS [FlagAssignment]

readPrec :: ReadPrec FlagAssignment

readListPrec :: ReadPrec [FlagAssignment]

Read FlagName 
Instance details

Defined in Distribution.Types.Flag

Methods

readsPrec :: Int -> ReadS FlagName

readList :: ReadS [FlagName]

readPrec :: ReadPrec FlagName

readListPrec :: ReadPrec [FlagName]

Read ForeignLib 
Instance details

Defined in Distribution.Types.ForeignLib

Methods

readsPrec :: Int -> ReadS ForeignLib

readList :: ReadS [ForeignLib]

readPrec :: ReadPrec ForeignLib

readListPrec :: ReadPrec [ForeignLib]

Read LibVersionInfo 
Instance details

Defined in Distribution.Types.ForeignLib

Methods

readsPrec :: Int -> ReadS LibVersionInfo

readList :: ReadS [LibVersionInfo]

readPrec :: ReadPrec LibVersionInfo

readListPrec :: ReadPrec [LibVersionInfo]

Read ForeignLibOption 
Instance details

Defined in Distribution.Types.ForeignLibOption

Methods

readsPrec :: Int -> ReadS ForeignLibOption

readList :: ReadS [ForeignLibOption]

readPrec :: ReadPrec ForeignLibOption

readListPrec :: ReadPrec [ForeignLibOption]

Read ForeignLibType 
Instance details

Defined in Distribution.Types.ForeignLibType

Methods

readsPrec :: Int -> ReadS ForeignLibType

readList :: ReadS [ForeignLibType]

readPrec :: ReadPrec ForeignLibType

readListPrec :: ReadPrec [ForeignLibType]

Read IncludeRenaming 
Instance details

Defined in Distribution.Types.IncludeRenaming

Methods

readsPrec :: Int -> ReadS IncludeRenaming

readList :: ReadS [IncludeRenaming]

readPrec :: ReadPrec IncludeRenaming

readListPrec :: ReadPrec [IncludeRenaming]

Read InstalledPackageInfo 
Instance details

Defined in Distribution.Types.InstalledPackageInfo

Methods

readsPrec :: Int -> ReadS InstalledPackageInfo

readList :: ReadS [InstalledPackageInfo]

readPrec :: ReadPrec InstalledPackageInfo

readListPrec :: ReadPrec [InstalledPackageInfo]

Read LegacyExeDependency 
Instance details

Defined in Distribution.Types.LegacyExeDependency

Methods

readsPrec :: Int -> ReadS LegacyExeDependency

readList :: ReadS [LegacyExeDependency]

readPrec :: ReadPrec LegacyExeDependency

readListPrec :: ReadPrec [LegacyExeDependency]

Read Library 
Instance details

Defined in Distribution.Types.Library

Methods

readsPrec :: Int -> ReadS Library

readList :: ReadS [Library]

readPrec :: ReadPrec Library

readListPrec :: ReadPrec [Library]

Read LibraryName 
Instance details

Defined in Distribution.Types.LibraryName

Methods

readsPrec :: Int -> ReadS LibraryName

readList :: ReadS [LibraryName]

readPrec :: ReadPrec LibraryName

readListPrec :: ReadPrec [LibraryName]

Read LibraryVisibility 
Instance details

Defined in Distribution.Types.LibraryVisibility

Methods

readsPrec :: Int -> ReadS LibraryVisibility

readList :: ReadS [LibraryVisibility]

readPrec :: ReadPrec LibraryVisibility

readListPrec :: ReadPrec [LibraryVisibility]

Read Mixin 
Instance details

Defined in Distribution.Types.Mixin

Methods

readsPrec :: Int -> ReadS Mixin

readList :: ReadS [Mixin]

readPrec :: ReadPrec Mixin

readListPrec :: ReadPrec [Mixin]

Read Module 
Instance details

Defined in Distribution.Types.Module

Methods

readsPrec :: Int -> ReadS Module

readList :: ReadS [Module]

readPrec :: ReadPrec Module

readListPrec :: ReadPrec [Module]

Read ModuleReexport 
Instance details

Defined in Distribution.Types.ModuleReexport

Methods

readsPrec :: Int -> ReadS ModuleReexport

readList :: ReadS [ModuleReexport]

readPrec :: ReadPrec ModuleReexport

readListPrec :: ReadPrec [ModuleReexport]

Read ModuleRenaming 
Instance details

Defined in Distribution.Types.ModuleRenaming

Methods

readsPrec :: Int -> ReadS ModuleRenaming

readList :: ReadS [ModuleRenaming]

readPrec :: ReadPrec ModuleRenaming

readListPrec :: ReadPrec [ModuleRenaming]

Read MungedPackageId 
Instance details

Defined in Distribution.Types.MungedPackageId

Read MungedPackageName 
Instance details

Defined in Distribution.Types.MungedPackageName

Read PackageDescription 
Instance details

Defined in Distribution.Types.PackageDescription

Methods

readsPrec :: Int -> ReadS PackageDescription

readList :: ReadS [PackageDescription]

readPrec :: ReadPrec PackageDescription

readListPrec :: ReadPrec [PackageDescription]

Read PackageIdentifier 
Instance details

Defined in Distribution.Types.PackageId

Read PackageName 
Instance details

Defined in Distribution.Types.PackageName

Methods

readsPrec :: Int -> ReadS PackageName

readList :: ReadS [PackageName]

readPrec :: ReadPrec PackageName

readListPrec :: ReadPrec [PackageName]

Read PackageVersionConstraint 
Instance details

Defined in Distribution.Types.PackageVersionConstraint

Methods

readsPrec :: Int -> ReadS PackageVersionConstraint

readList :: ReadS [PackageVersionConstraint]

readPrec :: ReadPrec PackageVersionConstraint

readListPrec :: ReadPrec [PackageVersionConstraint]

Read PkgconfigDependency 
Instance details

Defined in Distribution.Types.PkgconfigDependency

Methods

readsPrec :: Int -> ReadS PkgconfigDependency

readList :: ReadS [PkgconfigDependency]

readPrec :: ReadPrec PkgconfigDependency

readListPrec :: ReadPrec [PkgconfigDependency]

Read PkgconfigName 
Instance details

Defined in Distribution.Types.PkgconfigName

Methods

readsPrec :: Int -> ReadS PkgconfigName

readList :: ReadS [PkgconfigName]

readPrec :: ReadPrec PkgconfigName

readListPrec :: ReadPrec [PkgconfigName]

Read PkgconfigVersion 
Instance details

Defined in Distribution.Types.PkgconfigVersion

Methods

readsPrec :: Int -> ReadS PkgconfigVersion

readList :: ReadS [PkgconfigVersion]

readPrec :: ReadPrec PkgconfigVersion

readListPrec :: ReadPrec [PkgconfigVersion]

Read PkgconfigVersionRange 
Instance details

Defined in Distribution.Types.PkgconfigVersionRange

Methods

readsPrec :: Int -> ReadS PkgconfigVersionRange

readList :: ReadS [PkgconfigVersionRange]

readPrec :: ReadPrec PkgconfigVersionRange

readListPrec :: ReadPrec [PkgconfigVersionRange]

Read SetupBuildInfo 
Instance details

Defined in Distribution.Types.SetupBuildInfo

Methods

readsPrec :: Int -> ReadS SetupBuildInfo

readList :: ReadS [SetupBuildInfo]

readPrec :: ReadPrec SetupBuildInfo

readListPrec :: ReadPrec [SetupBuildInfo]

Read KnownRepoType 
Instance details

Defined in Distribution.Types.SourceRepo

Methods

readsPrec :: Int -> ReadS KnownRepoType

readList :: ReadS [KnownRepoType]

readPrec :: ReadPrec KnownRepoType

readListPrec :: ReadPrec [KnownRepoType]

Read RepoKind 
Instance details

Defined in Distribution.Types.SourceRepo

Methods

readsPrec :: Int -> ReadS RepoKind

readList :: ReadS [RepoKind]

readPrec :: ReadPrec RepoKind

readListPrec :: ReadPrec [RepoKind]

Read RepoType 
Instance details

Defined in Distribution.Types.SourceRepo

Methods

readsPrec :: Int -> ReadS RepoType

readList :: ReadS [RepoType]

readPrec :: ReadPrec RepoType

readListPrec :: ReadPrec [RepoType]

Read SourceRepo 
Instance details

Defined in Distribution.Types.SourceRepo

Methods

readsPrec :: Int -> ReadS SourceRepo

readList :: ReadS [SourceRepo]

readPrec :: ReadPrec SourceRepo

readListPrec :: ReadPrec [SourceRepo]

Read TestSuite 
Instance details

Defined in Distribution.Types.TestSuite

Methods

readsPrec :: Int -> ReadS TestSuite

readList :: ReadS [TestSuite]

readPrec :: ReadPrec TestSuite

readListPrec :: ReadPrec [TestSuite]

Read TestSuiteInterface 
Instance details

Defined in Distribution.Types.TestSuiteInterface

Methods

readsPrec :: Int -> ReadS TestSuiteInterface

readList :: ReadS [TestSuiteInterface]

readPrec :: ReadPrec TestSuiteInterface

readListPrec :: ReadPrec [TestSuiteInterface]

Read TestType 
Instance details

Defined in Distribution.Types.TestType

Methods

readsPrec :: Int -> ReadS TestType

readList :: ReadS [TestType]

readPrec :: ReadPrec TestType

readListPrec :: ReadPrec [TestType]

Read DefUnitId 
Instance details

Defined in Distribution.Types.UnitId

Methods

readsPrec :: Int -> ReadS DefUnitId

readList :: ReadS [DefUnitId]

readPrec :: ReadPrec DefUnitId

readListPrec :: ReadPrec [DefUnitId]

Read UnitId 
Instance details

Defined in Distribution.Types.UnitId

Methods

readsPrec :: Int -> ReadS UnitId

readList :: ReadS [UnitId]

readPrec :: ReadPrec UnitId

readListPrec :: ReadPrec [UnitId]

Read UnqualComponentName 
Instance details

Defined in Distribution.Types.UnqualComponentName

Methods

readsPrec :: Int -> ReadS UnqualComponentName

readList :: ReadS [UnqualComponentName]

readPrec :: ReadPrec UnqualComponentName

readListPrec :: ReadPrec [UnqualComponentName]

Read Version 
Instance details

Defined in Distribution.Types.Version

Methods

readsPrec :: Int -> ReadS Version

readList :: ReadS [Version]

readPrec :: ReadPrec Version

readListPrec :: ReadPrec [Version]

Read VersionRange 
Instance details

Defined in Distribution.Types.VersionRange.Internal

Methods

readsPrec :: Int -> ReadS VersionRange

readList :: ReadS [VersionRange]

readPrec :: ReadPrec VersionRange

readListPrec :: ReadPrec [VersionRange]

Read ShortText 
Instance details

Defined in Distribution.Utils.ShortText

Methods

readsPrec :: Int -> ReadS ShortText

readList :: ReadS [ShortText]

readPrec :: ReadPrec ShortText

readListPrec :: ReadPrec [ShortText]

Read Extension 
Instance details

Defined in Language.Haskell.Extension

Methods

readsPrec :: Int -> ReadS Extension

readList :: ReadS [Extension]

readPrec :: ReadPrec Extension

readListPrec :: ReadPrec [Extension]

Read KnownExtension 
Instance details

Defined in Language.Haskell.Extension

Methods

readsPrec :: Int -> ReadS KnownExtension

readList :: ReadS [KnownExtension]

readPrec :: ReadPrec KnownExtension

readListPrec :: ReadPrec [KnownExtension]

Read Language 
Instance details

Defined in Language.Haskell.Extension

Methods

readsPrec :: Int -> ReadS Language

readList :: ReadS [Language]

readPrec :: ReadPrec Language

readListPrec :: ReadPrec [Language]

Read Key 
Instance details

Defined in Data.Aeson.Key

Methods

readsPrec :: Int -> ReadS Key

readList :: ReadS [Key]

readPrec :: ReadPrec Key

readListPrec :: ReadPrec [Key]

Read DotNetTime 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

readsPrec :: Int -> ReadS DotNetTime

readList :: ReadS [DotNetTime]

readPrec :: ReadPrec DotNetTime

readListPrec :: ReadPrec [DotNetTime]

Read Value 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

readsPrec :: Int -> ReadS Value

readList :: ReadS [Value]

readPrec :: ReadPrec Value

readListPrec :: ReadPrec [Value]

Read BlinkSpeed 
Instance details

Defined in System.Console.ANSI.Types

Methods

readsPrec :: Int -> ReadS BlinkSpeed

readList :: ReadS [BlinkSpeed]

readPrec :: ReadPrec BlinkSpeed

readListPrec :: ReadPrec [BlinkSpeed]

Read Color 
Instance details

Defined in System.Console.ANSI.Types

Methods

readsPrec :: Int -> ReadS Color

readList :: ReadS [Color]

readPrec :: ReadPrec Color

readListPrec :: ReadPrec [Color]

Read ColorIntensity 
Instance details

Defined in System.Console.ANSI.Types

Methods

readsPrec :: Int -> ReadS ColorIntensity

readList :: ReadS [ColorIntensity]

readPrec :: ReadPrec ColorIntensity

readListPrec :: ReadPrec [ColorIntensity]

Read ConsoleIntensity 
Instance details

Defined in System.Console.ANSI.Types

Methods

readsPrec :: Int -> ReadS ConsoleIntensity

readList :: ReadS [ConsoleIntensity]

readPrec :: ReadPrec ConsoleIntensity

readListPrec :: ReadPrec [ConsoleIntensity]

Read ConsoleLayer 
Instance details

Defined in System.Console.ANSI.Types

Methods

readsPrec :: Int -> ReadS ConsoleLayer

readList :: ReadS [ConsoleLayer]

readPrec :: ReadPrec ConsoleLayer

readListPrec :: ReadPrec [ConsoleLayer]

Read SGR 
Instance details

Defined in System.Console.ANSI.Types

Methods

readsPrec :: Int -> ReadS SGR

readList :: ReadS [SGR]

readPrec :: ReadPrec SGR

readListPrec :: ReadPrec [SGR]

Read Underlining 
Instance details

Defined in System.Console.ANSI.Types

Methods

readsPrec :: Int -> ReadS Underlining

readList :: ReadS [Underlining]

readPrec :: ReadPrec Underlining

readListPrec :: ReadPrec [Underlining]

Read All 
Instance details

Defined in Data.Semigroup.Internal

Methods

readsPrec :: Int -> ReadS All

readList :: ReadS [All]

readPrec :: ReadPrec All

readListPrec :: ReadPrec [All]

Read Any 
Instance details

Defined in Data.Semigroup.Internal

Methods

readsPrec :: Int -> ReadS Any

readList :: ReadS [Any]

readPrec :: ReadPrec Any

readListPrec :: ReadPrec [Any]

Read Version 
Instance details

Defined in Data.Version

Methods

readsPrec :: Int -> ReadS Version

readList :: ReadS [Version]

readPrec :: ReadPrec Version

readListPrec :: ReadPrec [Version]

Read CBool 
Instance details

Defined in Foreign.C.Types

Methods

readsPrec :: Int -> ReadS CBool

readList :: ReadS [CBool]

readPrec :: ReadPrec CBool

readListPrec :: ReadPrec [CBool]

Read CChar 
Instance details

Defined in Foreign.C.Types

Methods

readsPrec :: Int -> ReadS CChar

readList :: ReadS [CChar]

readPrec :: ReadPrec CChar

readListPrec :: ReadPrec [CChar]

Read CClock 
Instance details

Defined in Foreign.C.Types

Methods

readsPrec :: Int -> ReadS CClock

readList :: ReadS [CClock]

readPrec :: ReadPrec CClock

readListPrec :: ReadPrec [CClock]

Read CDouble 
Instance details

Defined in Foreign.C.Types

Methods

readsPrec :: Int -> ReadS CDouble

readList :: ReadS [CDouble]

readPrec :: ReadPrec CDouble

readListPrec :: ReadPrec [CDouble]

Read CFloat 
Instance details

Defined in Foreign.C.Types

Methods

readsPrec :: Int -> ReadS CFloat

readList :: ReadS [CFloat]

readPrec :: ReadPrec CFloat

readListPrec :: ReadPrec [CFloat]

Read CInt 
Instance details

Defined in Foreign.C.Types

Methods

readsPrec :: Int -> ReadS CInt

readList :: ReadS [CInt]

readPrec :: ReadPrec CInt

readListPrec :: ReadPrec [CInt]

Read CIntMax 
Instance details

Defined in Foreign.C.Types

Methods

readsPrec :: Int -> ReadS CIntMax

readList :: ReadS [CIntMax]

readPrec :: ReadPrec CIntMax

readListPrec :: ReadPrec [CIntMax]

Read CIntPtr 
Instance details

Defined in Foreign.C.Types

Methods

readsPrec :: Int -> ReadS CIntPtr

readList :: ReadS [CIntPtr]

readPrec :: ReadPrec CIntPtr

readListPrec :: ReadPrec [CIntPtr]

Read CLLong 
Instance details

Defined in Foreign.C.Types

Methods

readsPrec :: Int -> ReadS CLLong

readList :: ReadS [CLLong]

readPrec :: ReadPrec CLLong

readListPrec :: ReadPrec [CLLong]

Read CLong 
Instance details

Defined in Foreign.C.Types

Methods

readsPrec :: Int -> ReadS CLong

readList :: ReadS [CLong]

readPrec :: ReadPrec CLong

readListPrec :: ReadPrec [CLong]

Read CPtrdiff 
Instance details

Defined in Foreign.C.Types

Methods

readsPrec :: Int -> ReadS CPtrdiff

readList :: ReadS [CPtrdiff]

readPrec :: ReadPrec CPtrdiff

readListPrec :: ReadPrec [CPtrdiff]

Read CSChar 
Instance details

Defined in Foreign.C.Types

Methods

readsPrec :: Int -> ReadS CSChar

readList :: ReadS [CSChar]

readPrec :: ReadPrec CSChar

readListPrec :: ReadPrec [CSChar]

Read CSUSeconds 
Instance details

Defined in Foreign.C.Types

Methods

readsPrec :: Int -> ReadS CSUSeconds

readList :: ReadS [CSUSeconds]

readPrec :: ReadPrec CSUSeconds

readListPrec :: ReadPrec [CSUSeconds]

Read CShort 
Instance details

Defined in Foreign.C.Types

Methods

readsPrec :: Int -> ReadS CShort

readList :: ReadS [CShort]

readPrec :: ReadPrec CShort

readListPrec :: ReadPrec [CShort]

Read CSigAtomic 
Instance details

Defined in Foreign.C.Types

Methods

readsPrec :: Int -> ReadS CSigAtomic

readList :: ReadS [CSigAtomic]

readPrec :: ReadPrec CSigAtomic

readListPrec :: ReadPrec [CSigAtomic]

Read CSize 
Instance details

Defined in Foreign.C.Types

Methods

readsPrec :: Int -> ReadS CSize

readList :: ReadS [CSize]

readPrec :: ReadPrec CSize

readListPrec :: ReadPrec [CSize]

Read CTime 
Instance details

Defined in Foreign.C.Types

Methods

readsPrec :: Int -> ReadS CTime

readList :: ReadS [CTime]

readPrec :: ReadPrec CTime

readListPrec :: ReadPrec [CTime]

Read CUChar 
Instance details

Defined in Foreign.C.Types

Methods

readsPrec :: Int -> ReadS CUChar

readList :: ReadS [CUChar]

readPrec :: ReadPrec CUChar

readListPrec :: ReadPrec [CUChar]

Read CUInt 
Instance details

Defined in Foreign.C.Types

Methods

readsPrec :: Int -> ReadS CUInt

readList :: ReadS [CUInt]

readPrec :: ReadPrec CUInt

readListPrec :: ReadPrec [CUInt]

Read CUIntMax 
Instance details

Defined in Foreign.C.Types

Methods

readsPrec :: Int -> ReadS CUIntMax

readList :: ReadS [CUIntMax]

readPrec :: ReadPrec CUIntMax

readListPrec :: ReadPrec [CUIntMax]

Read CUIntPtr 
Instance details

Defined in Foreign.C.Types

Methods

readsPrec :: Int -> ReadS CUIntPtr

readList :: ReadS [CUIntPtr]

readPrec :: ReadPrec CUIntPtr

readListPrec :: ReadPrec [CUIntPtr]

Read CULLong 
Instance details

Defined in Foreign.C.Types

Methods

readsPrec :: Int -> ReadS CULLong

readList :: ReadS [CULLong]

readPrec :: ReadPrec CULLong

readListPrec :: ReadPrec [CULLong]

Read CULong 
Instance details

Defined in Foreign.C.Types

Methods

readsPrec :: Int -> ReadS CULong

readList :: ReadS [CULong]

readPrec :: ReadPrec CULong

readListPrec :: ReadPrec [CULong]

Read CUSeconds 
Instance details

Defined in Foreign.C.Types

Methods

readsPrec :: Int -> ReadS CUSeconds

readList :: ReadS [CUSeconds]

readPrec :: ReadPrec CUSeconds

readListPrec :: ReadPrec [CUSeconds]

Read CUShort 
Instance details

Defined in Foreign.C.Types

Methods

readsPrec :: Int -> ReadS CUShort

readList :: ReadS [CUShort]

readPrec :: ReadPrec CUShort

readListPrec :: ReadPrec [CUShort]

Read CWchar 
Instance details

Defined in Foreign.C.Types

Methods

readsPrec :: Int -> ReadS CWchar

readList :: ReadS [CWchar]

readPrec :: ReadPrec CWchar

readListPrec :: ReadPrec [CWchar]

Read IntPtr 
Instance details

Defined in Foreign.Ptr

Methods

readsPrec :: Int -> ReadS IntPtr

readList :: ReadS [IntPtr]

readPrec :: ReadPrec IntPtr

readListPrec :: ReadPrec [IntPtr]

Read WordPtr 
Instance details

Defined in Foreign.Ptr

Methods

readsPrec :: Int -> ReadS WordPtr

readList :: ReadS [WordPtr]

readPrec :: ReadPrec WordPtr

readListPrec :: ReadPrec [WordPtr]

Read Void 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS Void

readList :: ReadS [Void]

readPrec :: ReadPrec Void

readListPrec :: ReadPrec [Void]

Read ByteOrder 
Instance details

Defined in GHC.ByteOrder

Methods

readsPrec :: Int -> ReadS ByteOrder

readList :: ReadS [ByteOrder]

readPrec :: ReadPrec ByteOrder

readListPrec :: ReadPrec [ByteOrder]

Read Associativity 
Instance details

Defined in GHC.Generics

Methods

readsPrec :: Int -> ReadS Associativity

readList :: ReadS [Associativity]

readPrec :: ReadPrec Associativity

readListPrec :: ReadPrec [Associativity]

Read DecidedStrictness 
Instance details

Defined in GHC.Generics

Methods

readsPrec :: Int -> ReadS DecidedStrictness

readList :: ReadS [DecidedStrictness]

readPrec :: ReadPrec DecidedStrictness

readListPrec :: ReadPrec [DecidedStrictness]

Read Fixity 
Instance details

Defined in GHC.Generics

Methods

readsPrec :: Int -> ReadS Fixity

readList :: ReadS [Fixity]

readPrec :: ReadPrec Fixity

readListPrec :: ReadPrec [Fixity]

Read SourceStrictness 
Instance details

Defined in GHC.Generics

Methods

readsPrec :: Int -> ReadS SourceStrictness

readList :: ReadS [SourceStrictness]

readPrec :: ReadPrec SourceStrictness

readListPrec :: ReadPrec [SourceStrictness]

Read SourceUnpackedness 
Instance details

Defined in GHC.Generics

Methods

readsPrec :: Int -> ReadS SourceUnpackedness

readList :: ReadS [SourceUnpackedness]

readPrec :: ReadPrec SourceUnpackedness

readListPrec :: ReadPrec [SourceUnpackedness]

Read SeekMode 
Instance details

Defined in GHC.IO.Device

Methods

readsPrec :: Int -> ReadS SeekMode

readList :: ReadS [SeekMode]

readPrec :: ReadPrec SeekMode

readListPrec :: ReadPrec [SeekMode]

Read ExitCode 
Instance details

Defined in GHC.IO.Exception

Methods

readsPrec :: Int -> ReadS ExitCode

readList :: ReadS [ExitCode]

readPrec :: ReadPrec ExitCode

readListPrec :: ReadPrec [ExitCode]

Read BufferMode 
Instance details

Defined in GHC.IO.Handle.Types

Methods

readsPrec :: Int -> ReadS BufferMode

readList :: ReadS [BufferMode]

readPrec :: ReadPrec BufferMode

readListPrec :: ReadPrec [BufferMode]

Read Newline 
Instance details

Defined in GHC.IO.Handle.Types

Methods

readsPrec :: Int -> ReadS Newline

readList :: ReadS [Newline]

readPrec :: ReadPrec Newline

readListPrec :: ReadPrec [Newline]

Read NewlineMode 
Instance details

Defined in GHC.IO.Handle.Types

Methods

readsPrec :: Int -> ReadS NewlineMode

readList :: ReadS [NewlineMode]

readPrec :: ReadPrec NewlineMode

readListPrec :: ReadPrec [NewlineMode]

Read IOMode 
Instance details

Defined in GHC.IO.IOMode

Methods

readsPrec :: Int -> ReadS IOMode

readList :: ReadS [IOMode]

readPrec :: ReadPrec IOMode

readListPrec :: ReadPrec [IOMode]

Read Int16 
Instance details

Defined in GHC.Int

Methods

readsPrec :: Int -> ReadS Int16

readList :: ReadS [Int16]

readPrec :: ReadPrec Int16

readListPrec :: ReadPrec [Int16]

Read Int32 
Instance details

Defined in GHC.Int

Methods

readsPrec :: Int -> ReadS Int32

readList :: ReadS [Int32]

readPrec :: ReadPrec Int32

readListPrec :: ReadPrec [Int32]

Read Int64 
Instance details

Defined in GHC.Int

Methods

readsPrec :: Int -> ReadS Int64

readList :: ReadS [Int64]

readPrec :: ReadPrec Int64

readListPrec :: ReadPrec [Int64]

Read Int8 
Instance details

Defined in GHC.Int

Methods

readsPrec :: Int -> ReadS Int8

readList :: ReadS [Int8]

readPrec :: ReadPrec Int8

readListPrec :: ReadPrec [Int8]

Read GCDetails 
Instance details

Defined in GHC.Stats

Methods

readsPrec :: Int -> ReadS GCDetails

readList :: ReadS [GCDetails]

readPrec :: ReadPrec GCDetails

readListPrec :: ReadPrec [GCDetails]

Read RTSStats 
Instance details

Defined in GHC.Stats

Methods

readsPrec :: Int -> ReadS RTSStats

readList :: ReadS [RTSStats]

readPrec :: ReadPrec RTSStats

readListPrec :: ReadPrec [RTSStats]

Read SomeChar 
Instance details

Defined in GHC.TypeLits

Methods

readsPrec :: Int -> ReadS SomeChar

readList :: ReadS [SomeChar]

readPrec :: ReadPrec SomeChar

readListPrec :: ReadPrec [SomeChar]

Read SomeSymbol 
Instance details

Defined in GHC.TypeLits

Methods

readsPrec :: Int -> ReadS SomeSymbol

readList :: ReadS [SomeSymbol]

readPrec :: ReadPrec SomeSymbol

readListPrec :: ReadPrec [SomeSymbol]

Read SomeNat 
Instance details

Defined in GHC.TypeNats

Methods

readsPrec :: Int -> ReadS SomeNat

readList :: ReadS [SomeNat]

readPrec :: ReadPrec SomeNat

readListPrec :: ReadPrec [SomeNat]

Read GeneralCategory 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS GeneralCategory

readList :: ReadS [GeneralCategory]

readPrec :: ReadPrec GeneralCategory

readListPrec :: ReadPrec [GeneralCategory]

Read Word16 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS Word16

readList :: ReadS [Word16]

readPrec :: ReadPrec Word16

readListPrec :: ReadPrec [Word16]

Read Word32 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS Word32

readList :: ReadS [Word32]

readPrec :: ReadPrec Word32

readListPrec :: ReadPrec [Word32]

Read Word64 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS Word64

readList :: ReadS [Word64]

readPrec :: ReadPrec Word64

readListPrec :: ReadPrec [Word64]

Read Word8 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS Word8

readList :: ReadS [Word8]

readPrec :: ReadPrec Word8

readListPrec :: ReadPrec [Word8]

Read CBlkCnt 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS CBlkCnt

readList :: ReadS [CBlkCnt]

readPrec :: ReadPrec CBlkCnt

readListPrec :: ReadPrec [CBlkCnt]

Read CBlkSize 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS CBlkSize

readList :: ReadS [CBlkSize]

readPrec :: ReadPrec CBlkSize

readListPrec :: ReadPrec [CBlkSize]

Read CCc 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS CCc

readList :: ReadS [CCc]

readPrec :: ReadPrec CCc

readListPrec :: ReadPrec [CCc]

Read CClockId 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS CClockId

readList :: ReadS [CClockId]

readPrec :: ReadPrec CClockId

readListPrec :: ReadPrec [CClockId]

Read CDev 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS CDev

readList :: ReadS [CDev]

readPrec :: ReadPrec CDev

readListPrec :: ReadPrec [CDev]

Read CFsBlkCnt 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS CFsBlkCnt

readList :: ReadS [CFsBlkCnt]

readPrec :: ReadPrec CFsBlkCnt

readListPrec :: ReadPrec [CFsBlkCnt]

Read CFsFilCnt 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS CFsFilCnt

readList :: ReadS [CFsFilCnt]

readPrec :: ReadPrec CFsFilCnt

readListPrec :: ReadPrec [CFsFilCnt]

Read CGid 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS CGid

readList :: ReadS [CGid]

readPrec :: ReadPrec CGid

readListPrec :: ReadPrec [CGid]

Read CId 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS CId

readList :: ReadS [CId]

readPrec :: ReadPrec CId

readListPrec :: ReadPrec [CId]

Read CIno 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS CIno

readList :: ReadS [CIno]

readPrec :: ReadPrec CIno

readListPrec :: ReadPrec [CIno]

Read CKey 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS CKey

readList :: ReadS [CKey]

readPrec :: ReadPrec CKey

readListPrec :: ReadPrec [CKey]

Read CMode 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS CMode

readList :: ReadS [CMode]

readPrec :: ReadPrec CMode

readListPrec :: ReadPrec [CMode]

Read CNfds 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS CNfds

readList :: ReadS [CNfds]

readPrec :: ReadPrec CNfds

readListPrec :: ReadPrec [CNfds]

Read CNlink 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS CNlink

readList :: ReadS [CNlink]

readPrec :: ReadPrec CNlink

readListPrec :: ReadPrec [CNlink]

Read COff 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS COff

readList :: ReadS [COff]

readPrec :: ReadPrec COff

readListPrec :: ReadPrec [COff]

Read CPid 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS CPid

readList :: ReadS [CPid]

readPrec :: ReadPrec CPid

readListPrec :: ReadPrec [CPid]

Read CRLim 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS CRLim

readList :: ReadS [CRLim]

readPrec :: ReadPrec CRLim

readListPrec :: ReadPrec [CRLim]

Read CSocklen 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS CSocklen

readList :: ReadS [CSocklen]

readPrec :: ReadPrec CSocklen

readListPrec :: ReadPrec [CSocklen]

Read CSpeed 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS CSpeed

readList :: ReadS [CSpeed]

readPrec :: ReadPrec CSpeed

readListPrec :: ReadPrec [CSpeed]

Read CSsize 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS CSsize

readList :: ReadS [CSsize]

readPrec :: ReadPrec CSsize

readListPrec :: ReadPrec [CSsize]

Read CTcflag 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS CTcflag

readList :: ReadS [CTcflag]

readPrec :: ReadPrec CTcflag

readListPrec :: ReadPrec [CTcflag]

Read CUid 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS CUid

readList :: ReadS [CUid]

readPrec :: ReadPrec CUid

readListPrec :: ReadPrec [CUid]

Read Fd 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS Fd

readList :: ReadS [Fd]

readPrec :: ReadPrec Fd

readListPrec :: ReadPrec [Fd]

Read Lexeme 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS Lexeme

readList :: ReadS [Lexeme]

readPrec :: ReadPrec Lexeme

readListPrec :: ReadPrec [Lexeme]

Read ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

Methods

readsPrec :: Int -> ReadS ByteString

readList :: ReadS [ByteString]

readPrec :: ReadPrec ByteString

readListPrec :: ReadPrec [ByteString]

Read ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Methods

readsPrec :: Int -> ReadS ByteString

readList :: ReadS [ByteString]

readPrec :: ReadPrec ByteString

readListPrec :: ReadPrec [ByteString]

Read ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Read IntSet 
Instance details

Defined in Data.IntSet.Internal

Methods

readsPrec :: Int -> ReadS IntSet

readList :: ReadS [IntSet]

readPrec :: ReadPrec IntSet

readListPrec :: ReadPrec [IntSet]

Read Options 
Instance details

Defined in Crypto.KDF.Argon2

Methods

readsPrec :: Int -> ReadS Options

readList :: ReadS [Options]

readPrec :: ReadPrec Options

readListPrec :: ReadPrec [Options]

Read Variant 
Instance details

Defined in Crypto.KDF.Argon2

Methods

readsPrec :: Int -> ReadS Variant

readList :: ReadS [Variant]

readPrec :: ReadPrec Variant

readListPrec :: ReadPrec [Variant]

Read Version 
Instance details

Defined in Crypto.KDF.Argon2

Methods

readsPrec :: Int -> ReadS Version

readList :: ReadS [Version]

readPrec :: ReadPrec Version

readListPrec :: ReadPrec [Version]

Read Params 
Instance details

Defined in Crypto.PubKey.DH

Methods

readsPrec :: Int -> ReadS Params

readList :: ReadS [Params]

readPrec :: ReadPrec Params

readListPrec :: ReadPrec [Params]

Read PrivateNumber 
Instance details

Defined in Crypto.PubKey.DH

Methods

readsPrec :: Int -> ReadS PrivateNumber

readList :: ReadS [PrivateNumber]

readPrec :: ReadPrec PrivateNumber

readListPrec :: ReadPrec [PrivateNumber]

Read PublicNumber 
Instance details

Defined in Crypto.PubKey.DH

Methods

readsPrec :: Int -> ReadS PublicNumber

readList :: ReadS [PublicNumber]

readPrec :: ReadPrec PublicNumber

readListPrec :: ReadPrec [PublicNumber]

Read KeyPair 
Instance details

Defined in Crypto.PubKey.DSA

Methods

readsPrec :: Int -> ReadS KeyPair

readList :: ReadS [KeyPair]

readPrec :: ReadPrec KeyPair

readListPrec :: ReadPrec [KeyPair]

Read Params 
Instance details

Defined in Crypto.PubKey.DSA

Methods

readsPrec :: Int -> ReadS Params

readList :: ReadS [Params]

readPrec :: ReadPrec Params

readListPrec :: ReadPrec [Params]

Read PrivateKey 
Instance details

Defined in Crypto.PubKey.DSA

Methods

readsPrec :: Int -> ReadS PrivateKey

readList :: ReadS [PrivateKey]

readPrec :: ReadPrec PrivateKey

readListPrec :: ReadPrec [PrivateKey]

Read PublicKey 
Instance details

Defined in Crypto.PubKey.DSA

Methods

readsPrec :: Int -> ReadS PublicKey

readList :: ReadS [PublicKey]

readPrec :: ReadPrec PublicKey

readListPrec :: ReadPrec [PublicKey]

Read Signature 
Instance details

Defined in Crypto.PubKey.DSA

Methods

readsPrec :: Int -> ReadS Signature

readList :: ReadS [Signature]

readPrec :: ReadPrec Signature

readListPrec :: ReadPrec [Signature]

Read ExtendedSignature 
Instance details

Defined in Crypto.PubKey.ECC.ECDSA

Methods

readsPrec :: Int -> ReadS ExtendedSignature

readList :: ReadS [ExtendedSignature]

readPrec :: ReadPrec ExtendedSignature

readListPrec :: ReadPrec [ExtendedSignature]

Read KeyPair 
Instance details

Defined in Crypto.PubKey.ECC.ECDSA

Methods

readsPrec :: Int -> ReadS KeyPair

readList :: ReadS [KeyPair]

readPrec :: ReadPrec KeyPair

readListPrec :: ReadPrec [KeyPair]

Read PrivateKey 
Instance details

Defined in Crypto.PubKey.ECC.ECDSA

Methods

readsPrec :: Int -> ReadS PrivateKey

readList :: ReadS [PrivateKey]

readPrec :: ReadPrec PrivateKey

readListPrec :: ReadPrec [PrivateKey]

Read PublicKey 
Instance details

Defined in Crypto.PubKey.ECC.ECDSA

Methods

readsPrec :: Int -> ReadS PublicKey

readList :: ReadS [PublicKey]

readPrec :: ReadPrec PublicKey

readListPrec :: ReadPrec [PublicKey]

Read Signature 
Instance details

Defined in Crypto.PubKey.ECC.ECDSA

Methods

readsPrec :: Int -> ReadS Signature

readList :: ReadS [Signature]

readPrec :: ReadPrec Signature

readListPrec :: ReadPrec [Signature]

Read Curve 
Instance details

Defined in Crypto.PubKey.ECC.Types

Methods

readsPrec :: Int -> ReadS Curve

readList :: ReadS [Curve]

readPrec :: ReadPrec Curve

readListPrec :: ReadPrec [Curve]

Read CurveBinary 
Instance details

Defined in Crypto.PubKey.ECC.Types

Methods

readsPrec :: Int -> ReadS CurveBinary

readList :: ReadS [CurveBinary]

readPrec :: ReadPrec CurveBinary

readListPrec :: ReadPrec [CurveBinary]

Read CurveCommon 
Instance details

Defined in Crypto.PubKey.ECC.Types

Methods

readsPrec :: Int -> ReadS CurveCommon

readList :: ReadS [CurveCommon]

readPrec :: ReadPrec CurveCommon

readListPrec :: ReadPrec [CurveCommon]

Read CurveName 
Instance details

Defined in Crypto.PubKey.ECC.Types

Methods

readsPrec :: Int -> ReadS CurveName

readList :: ReadS [CurveName]

readPrec :: ReadPrec CurveName

readListPrec :: ReadPrec [CurveName]

Read CurvePrime 
Instance details

Defined in Crypto.PubKey.ECC.Types

Methods

readsPrec :: Int -> ReadS CurvePrime

readList :: ReadS [CurvePrime]

readPrec :: ReadPrec CurvePrime

readListPrec :: ReadPrec [CurvePrime]

Read Point 
Instance details

Defined in Crypto.PubKey.ECC.Types

Methods

readsPrec :: Int -> ReadS Point

readList :: ReadS [Point]

readPrec :: ReadPrec Point

readListPrec :: ReadPrec [Point]

Read KeyPair 
Instance details

Defined in Crypto.PubKey.RSA.Types

Methods

readsPrec :: Int -> ReadS KeyPair

readList :: ReadS [KeyPair]

readPrec :: ReadPrec KeyPair

readListPrec :: ReadPrec [KeyPair]

Read PrivateKey 
Instance details

Defined in Crypto.PubKey.RSA.Types

Methods

readsPrec :: Int -> ReadS PrivateKey

readList :: ReadS [PrivateKey]

readPrec :: ReadPrec PrivateKey

readListPrec :: ReadPrec [PrivateKey]

Read PublicKey 
Instance details

Defined in Crypto.PubKey.RSA.Types

Methods

readsPrec :: Int -> ReadS PublicKey

readList :: ReadS [PublicKey]

readPrec :: ReadPrec PublicKey

readListPrec :: ReadPrec [PublicKey]

Read PrivateKey 
Instance details

Defined in Crypto.PubKey.Rabin.Basic

Methods

readsPrec :: Int -> ReadS PrivateKey

readList :: ReadS [PrivateKey]

readPrec :: ReadPrec PrivateKey

readListPrec :: ReadPrec [PrivateKey]

Read PublicKey 
Instance details

Defined in Crypto.PubKey.Rabin.Basic

Methods

readsPrec :: Int -> ReadS PublicKey

readList :: ReadS [PublicKey]

readPrec :: ReadPrec PublicKey

readListPrec :: ReadPrec [PublicKey]

Read Signature 
Instance details

Defined in Crypto.PubKey.Rabin.Basic

Methods

readsPrec :: Int -> ReadS Signature

readList :: ReadS [Signature]

readPrec :: ReadPrec Signature

readListPrec :: ReadPrec [Signature]

Read PrivateKey 
Instance details

Defined in Crypto.PubKey.Rabin.Modified

Methods

readsPrec :: Int -> ReadS PrivateKey

readList :: ReadS [PrivateKey]

readPrec :: ReadPrec PrivateKey

readListPrec :: ReadPrec [PrivateKey]

Read PublicKey 
Instance details

Defined in Crypto.PubKey.Rabin.Modified

Methods

readsPrec :: Int -> ReadS PublicKey

readList :: ReadS [PublicKey]

readPrec :: ReadPrec PublicKey

readListPrec :: ReadPrec [PublicKey]

Read PrivateKey 
Instance details

Defined in Crypto.PubKey.Rabin.RW

Methods

readsPrec :: Int -> ReadS PrivateKey

readList :: ReadS [PrivateKey]

readPrec :: ReadPrec PrivateKey

readListPrec :: ReadPrec [PrivateKey]

Read PublicKey 
Instance details

Defined in Crypto.PubKey.Rabin.RW

Methods

readsPrec :: Int -> ReadS PublicKey

readList :: ReadS [PublicKey]

readPrec :: ReadPrec PublicKey

readListPrec :: ReadPrec [PublicKey]

Read FileType 
Instance details

Defined in System.Directory.Internal.Common

Methods

readsPrec :: Int -> ReadS FileType

readList :: ReadS [FileType]

readPrec :: ReadPrec FileType

readListPrec :: ReadPrec [FileType]

Read Permissions 
Instance details

Defined in System.Directory.Internal.Common

Methods

readsPrec :: Int -> ReadS Permissions

readList :: ReadS [Permissions]

readPrec :: ReadPrec Permissions

readListPrec :: ReadPrec [Permissions]

Read XdgDirectory 
Instance details

Defined in System.Directory.Internal.Common

Methods

readsPrec :: Int -> ReadS XdgDirectory

readList :: ReadS [XdgDirectory]

readPrec :: ReadPrec XdgDirectory

readListPrec :: ReadPrec [XdgDirectory]

Read XdgDirectoryList 
Instance details

Defined in System.Directory.Internal.Common

Methods

readsPrec :: Int -> ReadS XdgDirectoryList

readList :: ReadS [XdgDirectoryList]

readPrec :: ReadPrec XdgDirectoryList

readListPrec :: ReadPrec [XdgDirectoryList]

Read Options 
Instance details

Defined in Generics.Deriving.TH

Methods

readsPrec :: Int -> ReadS Options

readList :: ReadS [Options]

readPrec :: ReadPrec Options

readListPrec :: ReadPrec [Options]

Read RepOptions 
Instance details

Defined in Generics.Deriving.TH

Methods

readsPrec :: Int -> ReadS RepOptions

readList :: ReadS [RepOptions]

readPrec :: ReadPrec RepOptions

readListPrec :: ReadPrec [RepOptions]

Read Arch 
Instance details

Defined in GHC.Platform.ArchOS

Methods

readsPrec :: Int -> ReadS Arch

readList :: ReadS [Arch]

readPrec :: ReadPrec Arch

readListPrec :: ReadPrec [Arch]

Read ArchOS 
Instance details

Defined in GHC.Platform.ArchOS

Methods

readsPrec :: Int -> ReadS ArchOS

readList :: ReadS [ArchOS]

readPrec :: ReadPrec ArchOS

readListPrec :: ReadPrec [ArchOS]

Read ArmABI 
Instance details

Defined in GHC.Platform.ArchOS

Methods

readsPrec :: Int -> ReadS ArmABI

readList :: ReadS [ArmABI]

readPrec :: ReadPrec ArmABI

readListPrec :: ReadPrec [ArmABI]

Read ArmISA 
Instance details

Defined in GHC.Platform.ArchOS

Methods

readsPrec :: Int -> ReadS ArmISA

readList :: ReadS [ArmISA]

readPrec :: ReadPrec ArmISA

readListPrec :: ReadPrec [ArmISA]

Read ArmISAExt 
Instance details

Defined in GHC.Platform.ArchOS

Methods

readsPrec :: Int -> ReadS ArmISAExt

readList :: ReadS [ArmISAExt]

readPrec :: ReadPrec ArmISAExt

readListPrec :: ReadPrec [ArmISAExt]

Read OS 
Instance details

Defined in GHC.Platform.ArchOS

Methods

readsPrec :: Int -> ReadS OS

readList :: ReadS [OS]

readPrec :: ReadPrec OS

readListPrec :: ReadPrec [OS]

Read PPC_64ABI 
Instance details

Defined in GHC.Platform.ArchOS

Methods

readsPrec :: Int -> ReadS PPC_64ABI

readList :: ReadS [PPC_64ABI]

readPrec :: ReadPrec PPC_64ABI

readListPrec :: ReadPrec [PPC_64ABI]

Read Ordering 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS Ordering

readList :: ReadS [Ordering]

readPrec :: ReadPrec Ordering

readListPrec :: ReadPrec [Ordering]

Read Half 
Instance details

Defined in Numeric.Half.Internal

Methods

readsPrec :: Int -> ReadS Half

readList :: ReadS [Half]

readPrec :: ReadPrec Half

readListPrec :: ReadPrec [Half]

Read BoxLabel 
Instance details

Defined in Trace.Hpc.Mix

Methods

readsPrec :: Int -> ReadS BoxLabel

readList :: ReadS [BoxLabel]

readPrec :: ReadPrec BoxLabel

readListPrec :: ReadPrec [BoxLabel]

Read CondBox 
Instance details

Defined in Trace.Hpc.Mix

Methods

readsPrec :: Int -> ReadS CondBox

readList :: ReadS [CondBox]

readPrec :: ReadPrec CondBox

readListPrec :: ReadPrec [CondBox]

Read Mix 
Instance details

Defined in Trace.Hpc.Mix

Methods

readsPrec :: Int -> ReadS Mix

readList :: ReadS [Mix]

readPrec :: ReadPrec Mix

readListPrec :: ReadPrec [Mix]

Read Tix 
Instance details

Defined in Trace.Hpc.Tix

Methods

readsPrec :: Int -> ReadS Tix

readList :: ReadS [Tix]

readPrec :: ReadPrec Tix

readListPrec :: ReadPrec [Tix]

Read TixModule 
Instance details

Defined in Trace.Hpc.Tix

Methods

readsPrec :: Int -> ReadS TixModule

readList :: ReadS [TixModule]

readPrec :: ReadPrec TixModule

readListPrec :: ReadPrec [TixModule]

Read Hash 
Instance details

Defined in Trace.Hpc.Util

Methods

readsPrec :: Int -> ReadS Hash

readList :: ReadS [Hash]

readPrec :: ReadPrec Hash

readListPrec :: ReadPrec [Hash]

Read HpcPos 
Instance details

Defined in Trace.Hpc.Util

Methods

readsPrec :: Int -> ReadS HpcPos

readList :: ReadS [HpcPos]

readPrec :: ReadPrec HpcPos

readListPrec :: ReadPrec [HpcPos]

Read Cookie 
Instance details

Defined in Network.HTTP.Client.Types

Methods

readsPrec :: Int -> ReadS Cookie

readList :: ReadS [Cookie]

readPrec :: ReadPrec Cookie

readListPrec :: ReadPrec [Cookie]

Read CookieJar 
Instance details

Defined in Network.HTTP.Client.Types

Methods

readsPrec :: Int -> ReadS CookieJar

readList :: ReadS [CookieJar]

readPrec :: ReadPrec CookieJar

readListPrec :: ReadPrec [CookieJar]

Read Proxy 
Instance details

Defined in Network.HTTP.Client.Types

Methods

readsPrec :: Int -> ReadS Proxy

readList :: ReadS [Proxy]

readPrec :: ReadPrec Proxy

readListPrec :: ReadPrec [Proxy]

Read ProxySecureMode 
Instance details

Defined in Network.HTTP.Client.Types

Methods

readsPrec :: Int -> ReadS ProxySecureMode

readList :: ReadS [ProxySecureMode]

readPrec :: ReadPrec ProxySecureMode

readListPrec :: ReadPrec [ProxySecureMode]

Read DigestAuthExceptionDetails 
Instance details

Defined in Network.HTTP.Client.TLS

Methods

readsPrec :: Int -> ReadS DigestAuthExceptionDetails

readList :: ReadS [DigestAuthExceptionDetails]

readPrec :: ReadPrec DigestAuthExceptionDetails

readListPrec :: ReadPrec [DigestAuthExceptionDetails]

Read StdMethod 
Instance details

Defined in Network.HTTP.Types.Method

Methods

readsPrec :: Int -> ReadS StdMethod

readList :: ReadS [StdMethod]

readPrec :: ReadPrec StdMethod

readListPrec :: ReadPrec [StdMethod]

Read IP 
Instance details

Defined in Data.IP.Addr

Methods

readsPrec :: Int -> ReadS IP

readList :: ReadS [IP]

readPrec :: ReadPrec IP

readListPrec :: ReadPrec [IP]

Read IPv4 
Instance details

Defined in Data.IP.Addr

Methods

readsPrec :: Int -> ReadS IPv4

readList :: ReadS [IPv4]

readPrec :: ReadPrec IPv4

readListPrec :: ReadPrec [IPv4]

Read IPv6 
Instance details

Defined in Data.IP.Addr

Methods

readsPrec :: Int -> ReadS IPv6

readList :: ReadS [IPv6]

readPrec :: ReadPrec IPv6

readListPrec :: ReadPrec [IPv6]

Read IPRange 
Instance details

Defined in Data.IP.Range

Methods

readsPrec :: Int -> ReadS IPRange

readList :: ReadS [IPRange]

readPrec :: ReadPrec IPRange

readListPrec :: ReadPrec [IPRange]

Read Style 
Instance details

Defined in Text.Libyaml

Methods

readsPrec :: Int -> ReadS Style

readList :: ReadS [Style]

readPrec :: ReadPrec Style

readListPrec :: ReadPrec [Style]

Read Tag 
Instance details

Defined in Text.Libyaml

Methods

readsPrec :: Int -> ReadS Tag

readList :: ReadS [Tag]

readPrec :: ReadPrec Tag

readListPrec :: ReadPrec [Tag]

Read LogLevel 
Instance details

Defined in Control.Monad.Logger

Methods

readsPrec :: Int -> ReadS LogLevel

readList :: ReadS [LogLevel]

readPrec :: ReadPrec LogLevel

readListPrec :: ReadPrec [LogLevel]

Read AddrInfoFlag 
Instance details

Defined in Network.Socket.Info

Methods

readsPrec :: Int -> ReadS AddrInfoFlag

readList :: ReadS [AddrInfoFlag]

readPrec :: ReadPrec AddrInfoFlag

readListPrec :: ReadPrec [AddrInfoFlag]

Read NameInfoFlag 
Instance details

Defined in Network.Socket.Info

Methods

readsPrec :: Int -> ReadS NameInfoFlag

readList :: ReadS [NameInfoFlag]

readPrec :: ReadPrec NameInfoFlag

readListPrec :: ReadPrec [NameInfoFlag]

Read Family 
Instance details

Defined in Network.Socket.Types

Methods

readsPrec :: Int -> ReadS Family

readList :: ReadS [Family]

readPrec :: ReadPrec Family

readListPrec :: ReadPrec [Family]

Read PortNumber 
Instance details

Defined in Network.Socket.Types

Methods

readsPrec :: Int -> ReadS PortNumber

readList :: ReadS [PortNumber]

readPrec :: ReadPrec PortNumber

readListPrec :: ReadPrec [PortNumber]

Read SocketType 
Instance details

Defined in Network.Socket.Types

Methods

readsPrec :: Int -> ReadS SocketType

readList :: ReadS [SocketType]

readPrec :: ReadPrec SocketType

readListPrec :: ReadPrec [SocketType]

Read HpackExecutable 
Instance details

Defined in Pantry.Types

Read PackageNameP 
Instance details

Defined in Pantry.Types

Methods

readsPrec :: Int -> ReadS PackageNameP

readList :: ReadS [PackageNameP]

readPrec :: ReadPrec PackageNameP

readListPrec :: ReadPrec [PackageNameP]

Read VersionP 
Instance details

Defined in Pantry.Types

Methods

readsPrec :: Int -> ReadS VersionP

readList :: ReadS [VersionP]

readPrec :: ReadPrec VersionP

readListPrec :: ReadPrec [VersionP]

Read ConstraintNameDB 
Instance details

Defined in Database.Persist.Names

Methods

readsPrec :: Int -> ReadS ConstraintNameDB

readList :: ReadS [ConstraintNameDB]

readPrec :: ReadPrec ConstraintNameDB

readListPrec :: ReadPrec [ConstraintNameDB]

Read ConstraintNameHS 
Instance details

Defined in Database.Persist.Names

Methods

readsPrec :: Int -> ReadS ConstraintNameHS

readList :: ReadS [ConstraintNameHS]

readPrec :: ReadPrec ConstraintNameHS

readListPrec :: ReadPrec [ConstraintNameHS]

Read EntityNameDB 
Instance details

Defined in Database.Persist.Names

Methods

readsPrec :: Int -> ReadS EntityNameDB

readList :: ReadS [EntityNameDB]

readPrec :: ReadPrec EntityNameDB

readListPrec :: ReadPrec [EntityNameDB]

Read EntityNameHS 
Instance details

Defined in Database.Persist.Names

Methods

readsPrec :: Int -> ReadS EntityNameHS

readList :: ReadS [EntityNameHS]

readPrec :: ReadPrec EntityNameHS

readListPrec :: ReadPrec [EntityNameHS]

Read FieldNameDB 
Instance details

Defined in Database.Persist.Names

Methods

readsPrec :: Int -> ReadS FieldNameDB

readList :: ReadS [FieldNameDB]

readPrec :: ReadPrec FieldNameDB

readListPrec :: ReadPrec [FieldNameDB]

Read FieldNameHS 
Instance details

Defined in Database.Persist.Names

Methods

readsPrec :: Int -> ReadS FieldNameHS

readList :: ReadS [FieldNameHS]

readPrec :: ReadPrec FieldNameHS

readListPrec :: ReadPrec [FieldNameHS]

Read LiteralType 
Instance details

Defined in Database.Persist.PersistValue

Methods

readsPrec :: Int -> ReadS LiteralType

readList :: ReadS [LiteralType]

readPrec :: ReadPrec LiteralType

readListPrec :: ReadPrec [LiteralType]

Read PersistValue 
Instance details

Defined in Database.Persist.PersistValue

Methods

readsPrec :: Int -> ReadS PersistValue

readList :: ReadS [PersistValue]

readPrec :: ReadPrec PersistValue

readListPrec :: ReadPrec [PersistValue]

Read CascadeAction 
Instance details

Defined in Database.Persist.Types.Base

Methods

readsPrec :: Int -> ReadS CascadeAction

readList :: ReadS [CascadeAction]

readPrec :: ReadPrec CascadeAction

readListPrec :: ReadPrec [CascadeAction]

Read Checkmark 
Instance details

Defined in Database.Persist.Types.Base

Methods

readsPrec :: Int -> ReadS Checkmark

readList :: ReadS [Checkmark]

readPrec :: ReadPrec Checkmark

readListPrec :: ReadPrec [Checkmark]

Read CompositeDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

readsPrec :: Int -> ReadS CompositeDef

readList :: ReadS [CompositeDef]

readPrec :: ReadPrec CompositeDef

readListPrec :: ReadPrec [CompositeDef]

Read EmbedEntityDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

readsPrec :: Int -> ReadS EmbedEntityDef

readList :: ReadS [EmbedEntityDef]

readPrec :: ReadPrec EmbedEntityDef

readListPrec :: ReadPrec [EmbedEntityDef]

Read EmbedFieldDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

readsPrec :: Int -> ReadS EmbedFieldDef

readList :: ReadS [EmbedFieldDef]

readPrec :: ReadPrec EmbedFieldDef

readListPrec :: ReadPrec [EmbedFieldDef]

Read EntityDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

readsPrec :: Int -> ReadS EntityDef

readList :: ReadS [EntityDef]

readPrec :: ReadPrec EntityDef

readListPrec :: ReadPrec [EntityDef]

Read EntityIdDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

readsPrec :: Int -> ReadS EntityIdDef

readList :: ReadS [EntityIdDef]

readPrec :: ReadPrec EntityIdDef

readListPrec :: ReadPrec [EntityIdDef]

Read FieldAttr 
Instance details

Defined in Database.Persist.Types.Base

Methods

readsPrec :: Int -> ReadS FieldAttr

readList :: ReadS [FieldAttr]

readPrec :: ReadPrec FieldAttr

readListPrec :: ReadPrec [FieldAttr]

Read FieldCascade 
Instance details

Defined in Database.Persist.Types.Base

Methods

readsPrec :: Int -> ReadS FieldCascade

readList :: ReadS [FieldCascade]

readPrec :: ReadPrec FieldCascade

readListPrec :: ReadPrec [FieldCascade]

Read FieldDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

readsPrec :: Int -> ReadS FieldDef

readList :: ReadS [FieldDef]

readPrec :: ReadPrec FieldDef

readListPrec :: ReadPrec [FieldDef]

Read FieldType 
Instance details

Defined in Database.Persist.Types.Base

Methods

readsPrec :: Int -> ReadS FieldType

readList :: ReadS [FieldType]

readPrec :: ReadPrec FieldType

readListPrec :: ReadPrec [FieldType]

Read FieldTypeLit 
Instance details

Defined in Database.Persist.Types.Base

Methods

readsPrec :: Int -> ReadS FieldTypeLit

readList :: ReadS [FieldTypeLit]

readPrec :: ReadPrec FieldTypeLit

readListPrec :: ReadPrec [FieldTypeLit]

Read ForeignDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

readsPrec :: Int -> ReadS ForeignDef

readList :: ReadS [ForeignDef]

readPrec :: ReadPrec ForeignDef

readListPrec :: ReadPrec [ForeignDef]

Read PersistFilter 
Instance details

Defined in Database.Persist.Types.Base

Methods

readsPrec :: Int -> ReadS PersistFilter

readList :: ReadS [PersistFilter]

readPrec :: ReadPrec PersistFilter

readListPrec :: ReadPrec [PersistFilter]

Read PersistUpdate 
Instance details

Defined in Database.Persist.Types.Base

Methods

readsPrec :: Int -> ReadS PersistUpdate

readList :: ReadS [PersistUpdate]

readPrec :: ReadPrec PersistUpdate

readListPrec :: ReadPrec [PersistUpdate]

Read ReferenceDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

readsPrec :: Int -> ReadS ReferenceDef

readList :: ReadS [ReferenceDef]

readPrec :: ReadPrec ReferenceDef

readListPrec :: ReadPrec [ReferenceDef]

Read SelfEmbed 
Instance details

Defined in Database.Persist.Types.Base

Methods

readsPrec :: Int -> ReadS SelfEmbed

readList :: ReadS [SelfEmbed]

readPrec :: ReadPrec SelfEmbed

readListPrec :: ReadPrec [SelfEmbed]

Read SqlType 
Instance details

Defined in Database.Persist.Types.Base

Methods

readsPrec :: Int -> ReadS SqlType

readList :: ReadS [SqlType]

readPrec :: ReadPrec SqlType

readListPrec :: ReadPrec [SqlType]

Read UniqueDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

readsPrec :: Int -> ReadS UniqueDef

readList :: ReadS [UniqueDef]

readPrec :: ReadPrec UniqueDef

readListPrec :: ReadPrec [UniqueDef]

Read CommunicationHandle 
Instance details

Defined in System.Process.CommunicationHandle.Internal

Methods

readsPrec :: Int -> ReadS CommunicationHandle

readList :: ReadS [CommunicationHandle]

readPrec :: ReadPrec CommunicationHandle

readListPrec :: ReadPrec [CommunicationHandle]

Read RetryAction 
Instance details

Defined in Control.Retry

Methods

readsPrec :: Int -> ReadS RetryAction

readList :: ReadS [RetryAction]

readPrec :: ReadPrec RetryAction

readListPrec :: ReadPrec [RetryAction]

Read RetryStatus 
Instance details

Defined in Control.Retry

Methods

readsPrec :: Int -> ReadS RetryStatus

readList :: ReadS [RetryStatus]

readPrec :: ReadPrec RetryStatus

readListPrec :: ReadPrec [RetryStatus]

Read LogLevel 
Instance details

Defined in RIO.Prelude.Logger

Methods

readsPrec :: Int -> ReadS LogLevel

readList :: ReadS [LogLevel]

readPrec :: ReadPrec LogLevel

readListPrec :: ReadPrec [LogLevel]

Read Scientific 
Instance details

Defined in Data.Scientific

Methods

readsPrec :: Int -> ReadS Scientific

readList :: ReadS [Scientific]

readPrec :: ReadPrec Scientific

readListPrec :: ReadPrec [Scientific]

Read AllowNewerDeps Source # 
Instance details

Defined in Stack.Types.AllowNewerDeps

Read ApplyGhcOptions Source # 
Instance details

Defined in Stack.Types.ApplyGhcOptions

Read ApplyProgOptions Source # 
Instance details

Defined in Stack.Types.ApplyProgOptions

Read CachePkgSrc Source # 
Instance details

Defined in Stack.Types.Build

Methods

readsPrec :: Int -> ReadS CachePkgSrc

readList :: ReadS [CachePkgSrc]

readPrec :: ReadPrec CachePkgSrc

readListPrec :: ReadPrec [CachePkgSrc]

Read CabalConfigKey Source # 
Instance details

Defined in Stack.Types.CabalConfigKey

Read StackUnqualCompName Source # 
Instance details

Defined in Stack.Types.ComponentUtils

Read Mount Source #

For optparse-applicative.

Instance details

Defined in Stack.Types.Docker

Methods

readsPrec :: Int -> ReadS Mount

readList :: ReadS [Mount]

readPrec :: ReadPrec Mount

readListPrec :: ReadPrec [Mount]

Read DockerEntrypoint Source # 
Instance details

Defined in Stack.Types.DockerEntrypoint

Read DockerUser Source # 
Instance details

Defined in Stack.Types.DockerEntrypoint

Methods

readsPrec :: Int -> ReadS DockerUser

readList :: ReadS [DockerUser]

readPrec :: ReadPrec DockerUser

readListPrec :: ReadPrec [DockerUser]

Read DumpLogs Source # 
Instance details

Defined in Stack.Types.DumpLogs

Methods

readsPrec :: Int -> ReadS DumpLogs

readList :: ReadS [DumpLogs]

readPrec :: ReadPrec DumpLogs

readListPrec :: ReadPrec [DumpLogs]

Read DumpPackage Source # 
Instance details

Defined in Stack.Types.DumpPackage

Methods

readsPrec :: Int -> ReadS DumpPackage

readList :: ReadS [DumpPackage]

readPrec :: ReadPrec DumpPackage

readListPrec :: ReadPrec [DumpPackage]

Read SublibDump Source # 
Instance details

Defined in Stack.Types.DumpPackage

Methods

readsPrec :: Int -> ReadS SublibDump

readList :: ReadS [SublibDump]

readPrec :: ReadPrec SublibDump

readListPrec :: ReadPrec [SublibDump]

Read GhcPkgId Source # 
Instance details

Defined in Stack.Types.GhcPkgId

Methods

readsPrec :: Int -> ReadS GhcPkgId

readList :: ReadS [GhcPkgId]

readPrec :: ReadPrec GhcPkgId

readListPrec :: ReadPrec [GhcPkgId]

Read PvpBounds Source # 
Instance details

Defined in Stack.Types.PvpBounds

Methods

readsPrec :: Int -> ReadS PvpBounds

readList :: ReadS [PvpBounds]

readPrec :: ReadPrec PvpBounds

readListPrec :: ReadPrec [PvpBounds]

Read PvpBoundsType Source # 
Instance details

Defined in Stack.Types.PvpBounds

Read I8 
Instance details

Defined in Data.Text.Foreign

Methods

readsPrec :: Int -> ReadS I8

readList :: ReadS [I8]

readPrec :: ReadPrec I8

readListPrec :: ReadPrec [I8]

Read FPFormat 
Instance details

Defined in Data.Text.Lazy.Builder.RealFloat

Methods

readsPrec :: Int -> ReadS FPFormat

readList :: ReadS [FPFormat]

readPrec :: ReadPrec FPFormat

readListPrec :: ReadPrec [FPFormat]

Read ShortText 
Instance details

Defined in Data.Text.Short.Internal

Methods

readsPrec :: Int -> ReadS ShortText

readList :: ReadS [ShortText]

readPrec :: ReadPrec ShortText

readListPrec :: ReadPrec [ShortText]

Read DatatypeVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

readsPrec :: Int -> ReadS DatatypeVariant

readList :: ReadS [DatatypeVariant]

readPrec :: ReadPrec DatatypeVariant

readListPrec :: ReadPrec [DatatypeVariant]

Read Month 
Instance details

Defined in Data.Time.Calendar.Month

Methods

readsPrec :: Int -> ReadS Month

readList :: ReadS [Month]

readPrec :: ReadPrec Month

readListPrec :: ReadPrec [Month]

Read Quarter 
Instance details

Defined in Data.Time.Calendar.Quarter

Methods

readsPrec :: Int -> ReadS Quarter

readList :: ReadS [Quarter]

readPrec :: ReadPrec Quarter

readListPrec :: ReadPrec [Quarter]

Read QuarterOfYear 
Instance details

Defined in Data.Time.Calendar.Quarter

Methods

readsPrec :: Int -> ReadS QuarterOfYear

readList :: ReadS [QuarterOfYear]

readPrec :: ReadPrec QuarterOfYear

readListPrec :: ReadPrec [QuarterOfYear]

Read DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Methods

readsPrec :: Int -> ReadS DiffTime

readList :: ReadS [DiffTime]

readPrec :: ReadPrec DiffTime

readListPrec :: ReadPrec [DiffTime]

Read NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Methods

readsPrec :: Int -> ReadS NominalDiffTime

readList :: ReadS [NominalDiffTime]

readPrec :: ReadPrec NominalDiffTime

readListPrec :: ReadPrec [NominalDiffTime]

Read RTLDFlags 
Instance details

Defined in System.Posix.DynamicLinker.Prim

Methods

readsPrec :: Int -> ReadS RTLDFlags

readList :: ReadS [RTLDFlags]

readPrec :: ReadPrec RTLDFlags

readListPrec :: ReadPrec [RTLDFlags]

Read CAttributes 
Instance details

Defined in System.Posix.Files.Common

Methods

readsPrec :: Int -> ReadS CAttributes

readList :: ReadS [CAttributes]

readPrec :: ReadPrec CAttributes

readListPrec :: ReadPrec [CAttributes]

Read StatxFlags 
Instance details

Defined in System.Posix.Files.Common

Methods

readsPrec :: Int -> ReadS StatxFlags

readList :: ReadS [StatxFlags]

readPrec :: ReadPrec StatxFlags

readListPrec :: ReadPrec [StatxFlags]

Read StatxMask 
Instance details

Defined in System.Posix.Files.Common

Methods

readsPrec :: Int -> ReadS StatxMask

readList :: ReadS [StatxMask]

readPrec :: ReadPrec StatxMask

readListPrec :: ReadPrec [StatxMask]

Read GroupEntry 
Instance details

Defined in System.Posix.User.Common

Methods

readsPrec :: Int -> ReadS GroupEntry

readList :: ReadS [GroupEntry]

readPrec :: ReadPrec GroupEntry

readListPrec :: ReadPrec [GroupEntry]

Read UserEntry 
Instance details

Defined in System.Posix.User.Common

Methods

readsPrec :: Int -> ReadS UserEntry

readList :: ReadS [UserEntry]

readPrec :: ReadPrec UserEntry

readListPrec :: ReadPrec [UserEntry]

Read UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

readsPrec :: Int -> ReadS UUID

readList :: ReadS [UUID]

readPrec :: ReadPrec UUID

readListPrec :: ReadPrec [UUID]

Read UnpackedUUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

readsPrec :: Int -> ReadS UnpackedUUID

readList :: ReadS [UnpackedUUID]

readPrec :: ReadPrec UnpackedUUID

readListPrec :: ReadPrec [UnpackedUUID]

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 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS Integer

readList :: ReadS [Integer]

readPrec :: ReadPrec Integer

readListPrec :: ReadPrec [Integer]

Read Natural 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS Natural

readList :: ReadS [Natural]

readPrec :: ReadPrec Natural

readListPrec :: ReadPrec [Natural]

Read () 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS ()

readList :: ReadS [()]

readPrec :: ReadPrec ()

readListPrec :: ReadPrec [()]

Read Bool 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS Bool

readList :: ReadS [Bool]

readPrec :: ReadPrec Bool

readListPrec :: ReadPrec [Bool]

Read Char 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS Char

readList :: ReadS [Char]

readPrec :: ReadPrec Char

readListPrec :: ReadPrec [Char]

Read Double 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS Double

readList :: ReadS [Double]

readPrec :: ReadPrec Double

readListPrec :: ReadPrec [Double]

Read Float 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS Float

readList :: ReadS [Float]

readPrec :: ReadPrec Float

readListPrec :: ReadPrec [Float]

Read Int 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS Int

readList :: ReadS [Int]

readPrec :: ReadPrec Int

readListPrec :: ReadPrec [Int]

Read Word 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS Word

readList :: ReadS [Word]

readPrec :: ReadPrec Word

readListPrec :: ReadPrec [Word]

Read a => Read (Flag a) 
Instance details

Defined in Distribution.Simple.Flag

Methods

readsPrec :: Int -> ReadS (Flag a)

readList :: ReadS [Flag a]

readPrec :: ReadPrec (Flag a)

readListPrec :: ReadPrec [Flag a]

Read dir => Read (InstallDirs dir) 
Instance details

Defined in Distribution.Simple.InstallDirs

Methods

readsPrec :: Int -> ReadS (InstallDirs dir)

readList :: ReadS [InstallDirs dir]

readPrec :: ReadPrec (InstallDirs dir)

readListPrec :: ReadPrec [InstallDirs dir]

Read a => Read (PackageIndex a) 
Instance details

Defined in Distribution.Simple.PackageIndex

Methods

readsPrec :: Int -> ReadS (PackageIndex a)

readList :: ReadS [PackageIndex a]

readPrec :: ReadPrec (PackageIndex a)

readListPrec :: ReadPrec [PackageIndex a]

(Ord a, Read a) => Read (NubList a) 
Instance details

Defined in Distribution.Utils.NubList

Methods

readsPrec :: Int -> ReadS (NubList a)

readList :: ReadS [NubList a]

readPrec :: ReadPrec (NubList a)

readListPrec :: ReadPrec [NubList a]

(Ord a, Read a) => Read (NubListR a) 
Instance details

Defined in Distribution.Utils.NubList

Methods

readsPrec :: Int -> ReadS (NubListR a)

readList :: ReadS [NubListR a]

readPrec :: ReadPrec (NubListR a)

readListPrec :: ReadPrec [NubListR a]

(IsNode a, Read a, Show (Key a)) => Read (Graph a) 
Instance details

Defined in Distribution.Compat.Graph

Methods

readsPrec :: Int -> ReadS (Graph a)

readList :: ReadS [Graph a]

readPrec :: ReadPrec (Graph a)

readListPrec :: ReadPrec [Graph a]

(Read a, Ord a) => Read (NonEmptySet a) 
Instance details

Defined in Distribution.Compat.NonEmptySet

Methods

readsPrec :: Int -> ReadS (NonEmptySet a)

readList :: ReadS [NonEmptySet a]

readPrec :: ReadPrec (NonEmptySet a)

readListPrec :: ReadPrec [NonEmptySet a]

Read a => Read (Last' a) 
Instance details

Defined in Distribution.Compat.Semigroup

Methods

readsPrec :: Int -> ReadS (Last' a)

readList :: ReadS [Last' a]

readPrec :: ReadPrec (Last' a)

readListPrec :: ReadPrec [Last' a]

Read a => Read (Option' a) 
Instance details

Defined in Distribution.Compat.Semigroup

Methods

readsPrec :: Int -> ReadS (Option' a)

readList :: ReadS [Option' a]

readPrec :: ReadPrec (Option' a)

readListPrec :: ReadPrec [Option' a]

Read v => Read (PerCompilerFlavor v) 
Instance details

Defined in Distribution.Compiler

Methods

readsPrec :: Int -> ReadS (PerCompilerFlavor v)

readList :: ReadS [PerCompilerFlavor v]

readPrec :: ReadPrec (PerCompilerFlavor v)

readListPrec :: ReadPrec [PerCompilerFlavor v]

Read a => Read (VersionRangeF a) 
Instance details

Defined in Distribution.Types.VersionRange.Internal

Methods

readsPrec :: Int -> ReadS (VersionRangeF a)

readList :: ReadS [VersionRangeF a]

readPrec :: ReadPrec (VersionRangeF a)

readListPrec :: ReadPrec [VersionRangeF a]

Read v => Read (KeyMap v) 
Instance details

Defined in Data.Aeson.KeyMap

Methods

readsPrec :: Int -> ReadS (KeyMap v)

readList :: ReadS [KeyMap v]

readPrec :: ReadPrec (KeyMap v)

readListPrec :: ReadPrec [KeyMap v]

Read a => Read (ZipList a) 
Instance details

Defined in Control.Applicative

Methods

readsPrec :: Int -> ReadS (ZipList a)

readList :: ReadS [ZipList a]

readPrec :: ReadPrec (ZipList a)

readListPrec :: ReadPrec [ZipList a]

Read a => Read (And a) 
Instance details

Defined in Data.Bits

Methods

readsPrec :: Int -> ReadS (And a)

readList :: ReadS [And a]

readPrec :: ReadPrec (And a)

readListPrec :: ReadPrec [And a]

Read a => Read (Iff a) 
Instance details

Defined in Data.Bits

Methods

readsPrec :: Int -> ReadS (Iff a)

readList :: ReadS [Iff a]

readPrec :: ReadPrec (Iff a)

readListPrec :: ReadPrec [Iff a]

Read a => Read (Ior a) 
Instance details

Defined in Data.Bits

Methods

readsPrec :: Int -> ReadS (Ior a)

readList :: ReadS [Ior a]

readPrec :: ReadPrec (Ior a)

readListPrec :: ReadPrec [Ior a]

Read a => Read (Xor a) 
Instance details

Defined in Data.Bits

Methods

readsPrec :: Int -> ReadS (Xor a)

readList :: ReadS [Xor a]

readPrec :: ReadPrec (Xor a)

readListPrec :: ReadPrec [Xor a]

Read a => Read (Complex a) 
Instance details

Defined in Data.Complex

Methods

readsPrec :: Int -> ReadS (Complex a)

readList :: ReadS [Complex a]

readPrec :: ReadPrec (Complex a)

readListPrec :: ReadPrec [Complex a]

Read a => Read (Identity a) 
Instance details

Defined in Data.Functor.Identity

Methods

readsPrec :: Int -> ReadS (Identity a)

readList :: ReadS [Identity a]

readPrec :: ReadPrec (Identity a)

readListPrec :: ReadPrec [Identity a]

Read a => Read (First a) 
Instance details

Defined in Data.Monoid

Methods

readsPrec :: Int -> ReadS (First a)

readList :: ReadS [First a]

readPrec :: ReadPrec (First a)

readListPrec :: ReadPrec [First a]

Read a => Read (Last a) 
Instance details

Defined in Data.Monoid

Methods

readsPrec :: Int -> ReadS (Last a)

readList :: ReadS [Last a]

readPrec :: ReadPrec (Last a)

readListPrec :: ReadPrec [Last a]

Read a => Read (Down a) 
Instance details

Defined in Data.Ord

Methods

readsPrec :: Int -> ReadS (Down a)

readList :: ReadS [Down a]

readPrec :: ReadPrec (Down a)

readListPrec :: ReadPrec [Down a]

Read a => Read (First a) 
Instance details

Defined in Data.Semigroup

Methods

readsPrec :: Int -> ReadS (First a)

readList :: ReadS [First a]

readPrec :: ReadPrec (First a)

readListPrec :: ReadPrec [First a]

Read a => Read (Last a) 
Instance details

Defined in Data.Semigroup

Methods

readsPrec :: Int -> ReadS (Last a)

readList :: ReadS [Last a]

readPrec :: ReadPrec (Last a)

readListPrec :: ReadPrec [Last a]

Read a => Read (Max a) 
Instance details

Defined in Data.Semigroup

Methods

readsPrec :: Int -> ReadS (Max a)

readList :: ReadS [Max a]

readPrec :: ReadPrec (Max a)

readListPrec :: ReadPrec [Max a]

Read a => Read (Min a) 
Instance details

Defined in Data.Semigroup

Methods

readsPrec :: Int -> ReadS (Min a)

readList :: ReadS [Min a]

readPrec :: ReadPrec (Min a)

readListPrec :: ReadPrec [Min a]

Read m => Read (WrappedMonoid m) 
Instance details

Defined in Data.Semigroup

Methods

readsPrec :: Int -> ReadS (WrappedMonoid m)

readList :: ReadS [WrappedMonoid m]

readPrec :: ReadPrec (WrappedMonoid m)

readListPrec :: ReadPrec [WrappedMonoid m]

Read a => Read (Dual a) 
Instance details

Defined in Data.Semigroup.Internal

Methods

readsPrec :: Int -> ReadS (Dual a)

readList :: ReadS [Dual a]

readPrec :: ReadPrec (Dual a)

readListPrec :: ReadPrec [Dual a]

Read a => Read (Product a) 
Instance details

Defined in Data.Semigroup.Internal

Methods

readsPrec :: Int -> ReadS (Product a)

readList :: ReadS [Product a]

readPrec :: ReadPrec (Product a)

readListPrec :: ReadPrec [Product a]

Read a => Read (Sum a) 
Instance details

Defined in Data.Semigroup.Internal

Methods

readsPrec :: Int -> ReadS (Sum a)

readList :: ReadS [Sum a]

readPrec :: ReadPrec (Sum a)

readListPrec :: ReadPrec [Sum a]

Read a => Read (NonEmpty a) 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (NonEmpty a)

readList :: ReadS [NonEmpty a]

readPrec :: ReadPrec (NonEmpty a)

readListPrec :: ReadPrec [NonEmpty a]

Read p => Read (Par1 p) 
Instance details

Defined in GHC.Generics

Methods

readsPrec :: Int -> ReadS (Par1 p)

readList :: ReadS [Par1 p]

readPrec :: ReadPrec (Par1 p)

readListPrec :: ReadPrec [Par1 p]

(Integral a, Read a) => Read (Ratio a) 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (Ratio a)

readList :: ReadS [Ratio a]

readPrec :: ReadPrec (Ratio a)

readListPrec :: ReadPrec [Ratio a]

(Read s, FoldCase s) => Read (CI s) 
Instance details

Defined in Data.CaseInsensitive.Internal

Methods

readsPrec :: Int -> ReadS (CI s)

readList :: ReadS [CI s]

readPrec :: ReadPrec (CI s)

readListPrec :: ReadPrec [CI s]

Read vertex => Read (SCC vertex) 
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

Methods

readsPrec :: Int -> ReadS (IntMap e)

readList :: ReadS [IntMap e]

readPrec :: ReadPrec (IntMap e)

readListPrec :: ReadPrec [IntMap e]

Read a => Read (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

readsPrec :: Int -> ReadS (Seq a)

readList :: ReadS [Seq a]

readPrec :: ReadPrec (Seq a)

readListPrec :: ReadPrec [Seq a]

Read a => Read (ViewL a) 
Instance details

Defined in Data.Sequence.Internal

Methods

readsPrec :: Int -> ReadS (ViewL a)

readList :: ReadS [ViewL a]

readPrec :: ReadPrec (ViewL a)

readListPrec :: ReadPrec [ViewL a]

Read a => Read (ViewR a) 
Instance details

Defined in Data.Sequence.Internal

Methods

readsPrec :: Int -> ReadS (ViewR a)

readList :: ReadS [ViewR a]

readPrec :: ReadPrec (ViewR a)

readListPrec :: ReadPrec [ViewR a]

(Read a, Ord a) => Read (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

readsPrec :: Int -> ReadS (Set a)

readList :: ReadS [Set a]

readPrec :: ReadPrec (Set a)

readListPrec :: ReadPrec [Set a]

Read a => Read (Tree a) 
Instance details

Defined in Data.Tree

Methods

readsPrec :: Int -> ReadS (Tree a)

readList :: ReadS [Tree a]

readPrec :: ReadPrec (Tree a)

readListPrec :: ReadPrec [Tree a]

HashAlgorithm a => Read (Digest a) 
Instance details

Defined in Crypto.Hash.Types

Methods

readsPrec :: Int -> ReadS (Digest a)

readList :: ReadS [Digest a]

readPrec :: ReadPrec (Digest a)

readListPrec :: ReadPrec [Digest a]

Read1 f => Read (Fix f) 
Instance details

Defined in Data.Fix

Methods

readsPrec :: Int -> ReadS (Fix f)

readList :: ReadS [Fix f]

readPrec :: ReadPrec (Fix f)

readListPrec :: ReadPrec [Fix f]

(Functor f, Read1 f) => Read (Mu f) 
Instance details

Defined in Data.Fix

Methods

readsPrec :: Int -> ReadS (Mu f)

readList :: ReadS [Mu f]

readPrec :: ReadPrec (Mu f)

readListPrec :: ReadPrec [Mu f]

(Functor f, Read1 f) => Read (Nu f) 
Instance details

Defined in Data.Fix

Methods

readsPrec :: Int -> ReadS (Nu f)

readList :: ReadS [Nu f]

readPrec :: ReadPrec (Nu f)

readListPrec :: ReadPrec [Nu f]

Read a => Read (DNonEmpty a) 
Instance details

Defined in Data.DList.DNonEmpty.Internal

Methods

readsPrec :: Int -> ReadS (DNonEmpty a)

readList :: ReadS [DNonEmpty a]

readPrec :: ReadPrec (DNonEmpty a)

readListPrec :: ReadPrec [DNonEmpty a]

Read a => Read (DList a) 
Instance details

Defined in Data.DList.Internal

Methods

readsPrec :: Int -> ReadS (DList a)

readList :: ReadS [DList a]

readPrec :: ReadPrec (DList a)

readListPrec :: ReadPrec [DList a]

Read a => Read (LenientData a) 
Instance details

Defined in Web.Internal.HttpApiData

Methods

readsPrec :: Int -> ReadS (LenientData a)

readList :: ReadS [LenientData a]

readPrec :: ReadPrec (LenientData a)

readListPrec :: ReadPrec [LenientData a]

Read (AddrRange IPv4) 
Instance details

Defined in Data.IP.Range

Methods

readsPrec :: Int -> ReadS (AddrRange IPv4)

readList :: ReadS [AddrRange IPv4]

readPrec :: ReadPrec (AddrRange IPv4)

readListPrec :: ReadPrec [AddrRange IPv4]

Read (AddrRange IPv6) 
Instance details

Defined in Data.IP.Range

Methods

readsPrec :: Int -> ReadS (AddrRange IPv6)

readList :: ReadS [AddrRange IPv6]

readPrec :: ReadPrec (AddrRange IPv6)

readListPrec :: ReadPrec [AddrRange IPv6]

Read mono => Read (NonNull mono) 
Instance details

Defined in Data.NonNull

Methods

readsPrec :: Int -> ReadS (NonNull mono)

readList :: ReadS [NonNull mono]

readPrec :: ReadPrec (NonNull mono)

readListPrec :: ReadPrec [NonNull mono]

(Read (Key record), Read record) => Read (Entity record) 
Instance details

Defined in Database.Persist.Class.PersistEntity

Methods

readsPrec :: Int -> ReadS (Entity record)

readList :: ReadS [Entity record]

readPrec :: ReadPrec (Entity record)

readListPrec :: ReadPrec [Entity record]

Read (Key ArchiveCache) 
Instance details

Defined in Pantry.Storage

Methods

readsPrec :: Int -> ReadS (Key ArchiveCache)

readList :: ReadS [Key ArchiveCache]

readPrec :: ReadPrec (Key ArchiveCache)

readListPrec :: ReadPrec [Key ArchiveCache]

Read (Key Blob) 
Instance details

Defined in Pantry.Storage

Methods

readsPrec :: Int -> ReadS (Key Blob)

readList :: ReadS [Key Blob]

readPrec :: ReadPrec (Key Blob)

readListPrec :: ReadPrec [Key Blob]

Read (Key CacheUpdate) 
Instance details

Defined in Pantry.Storage

Methods

readsPrec :: Int -> ReadS (Key CacheUpdate)

readList :: ReadS [Key CacheUpdate]

readPrec :: ReadPrec (Key CacheUpdate)

readListPrec :: ReadPrec [Key CacheUpdate]

Read (Key FilePath) 
Instance details

Defined in Pantry.Storage

Methods

readsPrec :: Int -> ReadS (Key FilePath)

readList :: ReadS [Key FilePath]

readPrec :: ReadPrec (Key FilePath)

readListPrec :: ReadPrec [Key FilePath]

Read (Key HPack) 
Instance details

Defined in Pantry.Storage

Methods

readsPrec :: Int -> ReadS (Key HPack)

readList :: ReadS [Key HPack]

readPrec :: ReadPrec (Key HPack)

readListPrec :: ReadPrec [Key HPack]

Read (Key HackageCabal) 
Instance details

Defined in Pantry.Storage

Methods

readsPrec :: Int -> ReadS (Key HackageCabal)

readList :: ReadS [Key HackageCabal]

readPrec :: ReadPrec (Key HackageCabal)

readListPrec :: ReadPrec [Key HackageCabal]

Read (Key HackageTarball) 
Instance details

Defined in Pantry.Storage

Methods

readsPrec :: Int -> ReadS (Key HackageTarball)

readList :: ReadS [Key HackageTarball]

readPrec :: ReadPrec (Key HackageTarball)

readListPrec :: ReadPrec [Key HackageTarball]

Read (Key ModuleName) 
Instance details

Defined in Pantry.Storage

Methods

readsPrec :: Int -> ReadS (Key ModuleName)

readList :: ReadS [Key ModuleName]

readPrec :: ReadPrec (Key ModuleName)

readListPrec :: ReadPrec [Key ModuleName]

Read (Key PackageExposedModule) 
Instance details

Defined in Pantry.Storage

Methods

readsPrec :: Int -> ReadS (Key PackageExposedModule)

readList :: ReadS [Key PackageExposedModule]

readPrec :: ReadPrec (Key PackageExposedModule)

readListPrec :: ReadPrec [Key PackageExposedModule]

Read (Key PackageName) 
Instance details

Defined in Pantry.Storage

Methods

readsPrec :: Int -> ReadS (Key PackageName)

readList :: ReadS [Key PackageName]

readPrec :: ReadPrec (Key PackageName)

readListPrec :: ReadPrec [Key PackageName]

Read (Key PreferredVersions) 
Instance details

Defined in Pantry.Storage

Methods

readsPrec :: Int -> ReadS (Key PreferredVersions)

readList :: ReadS [Key PreferredVersions]

readPrec :: ReadPrec (Key PreferredVersions)

readListPrec :: ReadPrec [Key PreferredVersions]

Read (Key RepoCache) 
Instance details

Defined in Pantry.Storage

Methods

readsPrec :: Int -> ReadS (Key RepoCache)

readList :: ReadS [Key RepoCache]

readPrec :: ReadPrec (Key RepoCache)

readListPrec :: ReadPrec [Key RepoCache]

Read (Key SnapshotCache) 
Instance details

Defined in Pantry.Storage

Methods

readsPrec :: Int -> ReadS (Key SnapshotCache)

readList :: ReadS [Key SnapshotCache]

readPrec :: ReadPrec (Key SnapshotCache)

readListPrec :: ReadPrec [Key SnapshotCache]

Read (Key Tree) 
Instance details

Defined in Pantry.Storage

Methods

readsPrec :: Int -> ReadS (Key Tree)

readList :: ReadS [Key Tree]

readPrec :: ReadPrec (Key Tree)

readListPrec :: ReadPrec [Key Tree]

Read (Key TreeEntry) 
Instance details

Defined in Pantry.Storage

Methods

readsPrec :: Int -> ReadS (Key TreeEntry)

readList :: ReadS [Key TreeEntry]

readPrec :: ReadPrec (Key TreeEntry)

readListPrec :: ReadPrec [Key TreeEntry]

Read (Key UrlBlob) 
Instance details

Defined in Pantry.Storage

Methods

readsPrec :: Int -> ReadS (Key UrlBlob)

readList :: ReadS [Key UrlBlob]

readPrec :: ReadPrec (Key UrlBlob)

readListPrec :: ReadPrec [Key UrlBlob]

Read (Key Version) 
Instance details

Defined in Pantry.Storage

Methods

readsPrec :: Int -> ReadS (Key Version)

readList :: ReadS [Key Version]

readPrec :: ReadPrec (Key Version)

readListPrec :: ReadPrec [Key Version]

(BackendCompatible b s, Read (BackendKey b)) => Read (BackendKey (Compatible b s)) 
Instance details

Defined in Database.Persist.Compatible.Types

Methods

readsPrec :: Int -> ReadS (BackendKey (Compatible b s))

readList :: ReadS [BackendKey (Compatible b s)]

readPrec :: ReadPrec (BackendKey (Compatible b s))

readListPrec :: ReadPrec [BackendKey (Compatible b s)]

(PersistCore b, PersistCore (RawSqlite b), Read (BackendKey b)) => Read (BackendKey (RawSqlite b)) 
Instance details

Defined in Database.Persist.Sqlite

Methods

readsPrec :: Int -> ReadS (BackendKey (RawSqlite b))

readList :: ReadS [BackendKey (RawSqlite b)]

readPrec :: ReadPrec (BackendKey (RawSqlite b))

readListPrec :: ReadPrec [BackendKey (RawSqlite b)]

Read a => Read (Array a) 
Instance details

Defined in Data.Primitive.Array

Methods

readsPrec :: Int -> ReadS (Array a)

readList :: ReadS [Array a]

readPrec :: ReadPrec (Array a)

readListPrec :: ReadPrec [Array a]

Read a => Read (SmallArray a) 
Instance details

Defined in Data.Primitive.SmallArray

Methods

readsPrec :: Int -> ReadS (SmallArray a)

readList :: ReadS [SmallArray a]

readPrec :: ReadPrec (SmallArray a)

readListPrec :: ReadPrec [SmallArray a]

Read a => Read (Maybe a) 
Instance details

Defined in Data.Strict.Maybe

Methods

readsPrec :: Int -> ReadS (Maybe a)

readList :: ReadS [Maybe a]

readPrec :: ReadPrec (Maybe a)

readListPrec :: ReadPrec [Maybe a]

(Eq a, Hashable a, Read a) => Read (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Methods

readsPrec :: Int -> ReadS (HashSet a)

readList :: ReadS [HashSet a]

readPrec :: ReadPrec (HashSet a)

readListPrec :: ReadPrec [HashSet a]

Read a => Read (Vector a) 
Instance details

Defined in Data.Vector

Methods

readsPrec :: Int -> ReadS (Vector a)

readList :: ReadS [Vector a]

readPrec :: ReadPrec (Vector a)

readListPrec :: ReadPrec [Vector a]

(Read a, Prim a) => Read (Vector a) 
Instance details

Defined in Data.Vector.Primitive

Methods

readsPrec :: Int -> ReadS (Vector a)

readList :: ReadS [Vector a]

readPrec :: ReadPrec (Vector a)

readListPrec :: ReadPrec [Vector a]

(Read a, Storable a) => Read (Vector a) 
Instance details

Defined in Data.Vector.Storable

Methods

readsPrec :: Int -> ReadS (Vector a)

readList :: ReadS [Vector a]

readPrec :: ReadPrec (Vector a)

readListPrec :: ReadPrec [Vector a]

Read a => Read (Vector a) 
Instance details

Defined in Data.Vector.Strict

Methods

readsPrec :: Int -> ReadS (Vector a)

readList :: ReadS [Vector a]

readPrec :: ReadPrec (Vector a)

readListPrec :: ReadPrec [Vector a]

Read a => Read (Maybe a) 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (Maybe a)

readList :: ReadS [Maybe a]

readPrec :: ReadPrec (Maybe a)

readListPrec :: ReadPrec [Maybe a]

Read a => Read (Solo a) 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (Solo a)

readList :: ReadS [Solo a]

readPrec :: ReadPrec (Solo a)

readListPrec :: ReadPrec [Solo a]

Read a => Read [a] 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS [a]

readList :: ReadS [[a]]

readPrec :: ReadPrec [a]

readListPrec :: ReadPrec [[a]]

Read (SymbolicPath from to) 
Instance details

Defined in Distribution.Utils.Path

Methods

readsPrec :: Int -> ReadS (SymbolicPath from to)

readList :: ReadS [SymbolicPath from to]

readPrec :: ReadPrec (SymbolicPath from to)

readListPrec :: ReadPrec [SymbolicPath from to]

(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]

(Read a, Read b) => Read (Either a b) 
Instance details

Defined in Data.Either

Methods

readsPrec :: Int -> ReadS (Either a b)

readList :: ReadS [Either a b]

readPrec :: ReadPrec (Either a b)

readListPrec :: ReadPrec [Either a b]

HasResolution a => Read (Fixed a) 
Instance details

Defined in Data.Fixed

Methods

readsPrec :: Int -> ReadS (Fixed a)

readList :: ReadS [Fixed a]

readPrec :: ReadPrec (Fixed a)

readListPrec :: ReadPrec [Fixed a]

Read (Proxy t) 
Instance details

Defined in Data.Proxy

Methods

readsPrec :: Int -> ReadS (Proxy t)

readList :: ReadS [Proxy t]

readPrec :: ReadPrec (Proxy t)

readListPrec :: ReadPrec [Proxy t]

(Read a, Read b) => Read (Arg a b) 
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]

(Ix a, Read a, Read b) => Read (Array a b) 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (Array a b)

readList :: ReadS [Array a b]

readPrec :: ReadPrec (Array a b)

readListPrec :: ReadPrec [Array a b]

Read (U1 p) 
Instance details

Defined in GHC.Generics

Methods

readsPrec :: Int -> ReadS (U1 p)

readList :: ReadS [U1 p]

readPrec :: ReadPrec (U1 p)

readListPrec :: ReadPrec [U1 p]

Read (V1 p) 
Instance details

Defined in GHC.Generics

Methods

readsPrec :: Int -> ReadS (V1 p)

readList :: ReadS [V1 p]

readPrec :: ReadPrec (V1 p)

readListPrec :: ReadPrec [V1 p]

(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]

(Ord k, Read k, Read a) => Read (MonoidMap k a) Source # 
Instance details

Defined in Data.Monoid.Map

Methods

readsPrec :: Int -> ReadS (MonoidMap k a)

readList :: ReadS [MonoidMap k a]

readPrec :: ReadPrec (MonoidMap k a)

readListPrec :: ReadPrec [MonoidMap k a]

(Read a, Read b) => Read (Either a b) 
Instance details

Defined in Data.Strict.Either

Methods

readsPrec :: Int -> ReadS (Either a b)

readList :: ReadS [Either a b]

readPrec :: ReadPrec (Either a b)

readListPrec :: ReadPrec [Either a b]

(Read a, Read b) => Read (These a b) 
Instance details

Defined in Data.Strict.These

Methods

readsPrec :: Int -> ReadS (These a b)

readList :: ReadS [These a b]

readPrec :: ReadPrec (These a b)

readListPrec :: ReadPrec [These a b]

(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

Methods

readsPrec :: Int -> ReadS (These a b)

readList :: ReadS [These a b]

readPrec :: ReadPrec (These a b)

readListPrec :: ReadPrec [These a b]

(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

Methods

readsPrec :: Int -> ReadS (MaybeT m a)

readList :: ReadS [MaybeT m a]

readPrec :: ReadPrec (MaybeT m a)

readListPrec :: ReadPrec [MaybeT m a]

(Eq k, Hashable k, Read k, Read e) => Read (HashMap k e) 
Instance details

Defined in Data.HashMap.Internal

Methods

readsPrec :: Int -> ReadS (HashMap k e)

readList :: ReadS [HashMap k e]

readPrec :: ReadPrec (HashMap k e)

readListPrec :: ReadPrec [HashMap k e]

(Read a, Read b) => Read (a, b) 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a, b)

readList :: ReadS [(a, b)]

readPrec :: ReadPrec (a, b)

readListPrec :: ReadPrec [(a, b)]

Read a => Read (Const a b) 
Instance details

Defined in Data.Functor.Const

Methods

readsPrec :: Int -> ReadS (Const a b)

readList :: ReadS [Const a b]

readPrec :: ReadPrec (Const a b)

readListPrec :: ReadPrec [Const a b]

Read (f a) => Read (Ap f a) 
Instance details

Defined in 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) 
Instance details

Defined in 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]

Coercible a b => Read (Coercion a b) 
Instance details

Defined in Data.Type.Coercion

Methods

readsPrec :: Int -> ReadS (Coercion a b)

readList :: ReadS [Coercion a b]

readPrec :: ReadPrec (Coercion a b)

readListPrec :: ReadPrec [Coercion a b]

a ~ b => Read (a :~: b) 
Instance details

Defined in 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) 
Instance details

Defined in GHC.Generics

Methods

readsPrec :: Int -> ReadS (Rec1 f p)

readList :: ReadS [Rec1 f p]

readPrec :: ReadPrec (Rec1 f p)

readListPrec :: ReadPrec [Rec1 f p]

Read b => Read (Tagged s b) 
Instance details

Defined in Data.Tagged

Methods

readsPrec :: Int -> ReadS (Tagged s b)

readList :: ReadS [Tagged s b]

readPrec :: ReadPrec (Tagged s b)

readListPrec :: ReadPrec [Tagged s b]

(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

Methods

readsPrec :: Int -> ReadS (Backwards f a)

readList :: ReadS [Backwards f a]

readPrec :: ReadPrec (Backwards f a)

readListPrec :: ReadPrec [Backwards f a]

(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

Methods

readsPrec :: Int -> ReadS (IdentityT f a)

readList :: ReadS [IdentityT f a]

readPrec :: ReadPrec (IdentityT f a)

readListPrec :: ReadPrec [IdentityT f a]

(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

Methods

readsPrec :: Int -> ReadS (Constant a b)

readList :: ReadS [Constant a b]

readPrec :: ReadPrec (Constant a b)

readListPrec :: ReadPrec [Constant a b]

(Read1 f, Read a) => Read (Reverse f a) 
Instance details

Defined in Data.Functor.Reverse

Methods

readsPrec :: Int -> ReadS (Reverse f a)

readList :: ReadS [Reverse f a]

readPrec :: ReadPrec (Reverse f a)

readListPrec :: ReadPrec [Reverse f a]

(Read a, Read b, Read c) => Read (a, b, c) 
Instance details

Defined in GHC.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) 
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) 
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) 
Instance details

Defined in 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) 
Instance details

Defined in GHC.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) 
Instance details

Defined in GHC.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) 
Instance details

Defined in GHC.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) 
Instance details

Defined in GHC.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) 
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 (g p)) => Read ((f :.: g) p) 
Instance details

Defined in GHC.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) 
Instance details

Defined in GHC.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]

(Read a, Read b, Read c, Read d, Read e) => Read (a, b, c, d, e) 
Instance details

Defined in GHC.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 a, Read b, Read c, Read d, Read e, Read f) => Read (a, b, c, d, e, f) 
Instance details

Defined in GHC.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 a, Read b, Read c, Read d, Read e, Read f, Read g) => Read (a, b, c, d, e, f, g) 
Instance details

Defined in GHC.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) 
Instance details

Defined in GHC.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 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) 
Instance details

Defined in GHC.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) 
Instance details

Defined in GHC.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) 
Instance details

Defined in GHC.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) 
Instance details

Defined in GHC.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) 
Instance details

Defined in GHC.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) 
Instance details

Defined in GHC.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) 
Instance details

Defined in GHC.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 #

Minimal complete definition

fromRational, (recip | (/))

Methods

(/) :: a -> a -> a #

recip :: a -> a #

fromRational :: Rational -> a #

Instances

Instances details
Fractional Number 
Instance details

Defined in Data.Attoparsec.Number

Methods

(/) :: Number -> Number -> Number #

recip :: Number -> Number #

fromRational :: Rational -> Number #

Fractional CDouble 
Instance details

Defined in Foreign.C.Types

Methods

(/) :: CDouble -> CDouble -> CDouble #

recip :: CDouble -> CDouble #

fromRational :: Rational -> CDouble #

Fractional CFloat 
Instance details

Defined in Foreign.C.Types

Methods

(/) :: CFloat -> CFloat -> CFloat #

recip :: CFloat -> CFloat #

fromRational :: Rational -> CFloat #

Fractional Half 
Instance details

Defined in Numeric.Half.Internal

Methods

(/) :: Half -> Half -> Half #

recip :: Half -> Half #

fromRational :: Rational -> Half #

Fractional Scientific 
Instance details

Defined in Data.Scientific

Methods

(/) :: Scientific -> Scientific -> Scientific #

recip :: Scientific -> Scientific #

fromRational :: Rational -> Scientific #

Fractional DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Methods

(/) :: DiffTime -> DiffTime -> DiffTime #

recip :: DiffTime -> DiffTime #

fromRational :: Rational -> DiffTime #

Fractional NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Methods

(/) :: NominalDiffTime -> NominalDiffTime -> NominalDiffTime #

recip :: NominalDiffTime -> NominalDiffTime #

fromRational :: Rational -> NominalDiffTime #

RealFloat a => Fractional (Complex a) 
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) 
Instance details

Defined in Data.Functor.Identity

Fractional a => Fractional (Down a) 
Instance details

Defined in Data.Ord

Methods

(/) :: Down a -> Down a -> Down a #

recip :: Down a -> Down a #

fromRational :: Rational -> Down a #

Integral a => Fractional (Ratio a) 
Instance details

Defined in GHC.Real

Methods

(/) :: Ratio a -> Ratio a -> Ratio a #

recip :: Ratio a -> Ratio a #

fromRational :: Rational -> Ratio a #

HasResolution a => Fractional (Fixed a) 
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) 
Instance details

Defined in 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 #

class (Real a, Enum a) => Integral a where #

Minimal complete definition

quotRem, toInteger

Methods

quot :: a -> a -> a #

rem :: a -> a -> a #

div :: a -> a -> a #

mod :: a -> a -> a #

quotRem :: a -> a -> (a, a) #

divMod :: a -> a -> (a, a) #

toInteger :: a -> Integer #

Instances

Instances details
Integral CBool 
Instance details

Defined in Foreign.C.Types

Methods

quot :: CBool -> CBool -> CBool #

rem :: CBool -> CBool -> CBool #

div :: CBool -> CBool -> CBool #

mod :: CBool -> CBool -> CBool #

quotRem :: CBool -> CBool -> (CBool, CBool) #

divMod :: CBool -> CBool -> (CBool, CBool) #

toInteger :: CBool -> Integer #

Integral CChar 
Instance details

Defined in Foreign.C.Types

Methods

quot :: CChar -> CChar -> CChar #

rem :: CChar -> CChar -> CChar #

div :: CChar -> CChar -> CChar #

mod :: CChar -> CChar -> CChar #

quotRem :: CChar -> CChar -> (CChar, CChar) #

divMod :: CChar -> CChar -> (CChar, CChar) #

toInteger :: CChar -> Integer #

Integral CInt 
Instance details

Defined in Foreign.C.Types

Methods

quot :: CInt -> CInt -> CInt #

rem :: CInt -> CInt -> CInt #

div :: CInt -> CInt -> CInt #

mod :: CInt -> CInt -> CInt #

quotRem :: CInt -> CInt -> (CInt, CInt) #

divMod :: CInt -> CInt -> (CInt, CInt) #

toInteger :: CInt -> Integer #

Integral CIntMax 
Instance details

Defined in Foreign.C.Types

Methods

quot :: CIntMax -> CIntMax -> CIntMax #

rem :: CIntMax -> CIntMax -> CIntMax #

div :: CIntMax -> CIntMax -> CIntMax #

mod :: CIntMax -> CIntMax -> CIntMax #

quotRem :: CIntMax -> CIntMax -> (CIntMax, CIntMax) #

divMod :: CIntMax -> CIntMax -> (CIntMax, CIntMax) #

toInteger :: CIntMax -> Integer #

Integral CIntPtr 
Instance details

Defined in Foreign.C.Types

Methods

quot :: CIntPtr -> CIntPtr -> CIntPtr #

rem :: CIntPtr -> CIntPtr -> CIntPtr #

div :: CIntPtr -> CIntPtr -> CIntPtr #

mod :: CIntPtr -> CIntPtr -> CIntPtr #

quotRem :: CIntPtr -> CIntPtr -> (CIntPtr, CIntPtr) #

divMod :: CIntPtr -> CIntPtr -> (CIntPtr, CIntPtr) #

toInteger :: CIntPtr -> Integer #

Integral CLLong 
Instance details

Defined in Foreign.C.Types

Methods

quot :: CLLong -> CLLong -> CLLong #

rem :: CLLong -> CLLong -> CLLong #

div :: CLLong -> CLLong -> CLLong #

mod :: CLLong -> CLLong -> CLLong #

quotRem :: CLLong -> CLLong -> (CLLong, CLLong) #

divMod :: CLLong -> CLLong -> (CLLong, CLLong) #

toInteger :: CLLong -> Integer #

Integral CLong 
Instance details

Defined in Foreign.C.Types

Methods

quot :: CLong -> CLong -> CLong #

rem :: CLong -> CLong -> CLong #

div :: CLong -> CLong -> CLong #

mod :: CLong -> CLong -> CLong #

quotRem :: CLong -> CLong -> (CLong, CLong) #

divMod :: CLong -> CLong -> (CLong, CLong) #

toInteger :: CLong -> Integer #

Integral CPtrdiff 
Instance details

Defined in Foreign.C.Types

Methods

quot :: CPtrdiff -> CPtrdiff -> CPtrdiff #

rem :: CPtrdiff -> CPtrdiff -> CPtrdiff #

div :: CPtrdiff -> CPtrdiff -> CPtrdiff #

mod :: CPtrdiff -> CPtrdiff -> CPtrdiff #

quotRem :: CPtrdiff -> CPtrdiff -> (CPtrdiff, CPtrdiff) #

divMod :: CPtrdiff -> CPtrdiff -> (CPtrdiff, CPtrdiff) #

toInteger :: CPtrdiff -> Integer #

Integral CSChar 
Instance details

Defined in Foreign.C.Types

Methods

quot :: CSChar -> CSChar -> CSChar #

rem :: CSChar -> CSChar -> CSChar #

div :: CSChar -> CSChar -> CSChar #

mod :: CSChar -> CSChar -> CSChar #

quotRem :: CSChar -> CSChar -> (CSChar, CSChar) #

divMod :: CSChar -> CSChar -> (CSChar, CSChar) #

toInteger :: CSChar -> Integer #

Integral CShort 
Instance details

Defined in Foreign.C.Types

Methods

quot :: CShort -> CShort -> CShort #

rem :: CShort -> CShort -> CShort #

div :: CShort -> CShort -> CShort #

mod :: CShort -> CShort -> CShort #

quotRem :: CShort -> CShort -> (CShort, CShort) #

divMod :: CShort -> CShort -> (CShort, CShort) #

toInteger :: CShort -> Integer #

Integral CSigAtomic 
Instance details

Defined in Foreign.C.Types

Methods

quot :: CSigAtomic -> CSigAtomic -> CSigAtomic #

rem :: CSigAtomic -> CSigAtomic -> CSigAtomic #

div :: CSigAtomic -> CSigAtomic -> CSigAtomic #

mod :: CSigAtomic -> CSigAtomic -> CSigAtomic #

quotRem :: CSigAtomic -> CSigAtomic -> (CSigAtomic, CSigAtomic) #

divMod :: CSigAtomic -> CSigAtomic -> (CSigAtomic, CSigAtomic) #

toInteger :: CSigAtomic -> Integer #

Integral CSize 
Instance details

Defined in Foreign.C.Types

Methods

quot :: CSize -> CSize -> CSize #

rem :: CSize -> CSize -> CSize #

div :: CSize -> CSize -> CSize #

mod :: CSize -> CSize -> CSize #

quotRem :: CSize -> CSize -> (CSize, CSize) #

divMod :: CSize -> CSize -> (CSize, CSize) #

toInteger :: CSize -> Integer #

Integral CUChar 
Instance details

Defined in Foreign.C.Types

Methods

quot :: CUChar -> CUChar -> CUChar #

rem :: CUChar -> CUChar -> CUChar #

div :: CUChar -> CUChar -> CUChar #

mod :: CUChar -> CUChar -> CUChar #

quotRem :: CUChar -> CUChar -> (CUChar, CUChar) #

divMod :: CUChar -> CUChar -> (CUChar, CUChar) #

toInteger :: CUChar -> Integer #

Integral CUInt 
Instance details

Defined in Foreign.C.Types

Methods

quot :: CUInt -> CUInt -> CUInt #

rem :: CUInt -> CUInt -> CUInt #

div :: CUInt -> CUInt -> CUInt #

mod :: CUInt -> CUInt -> CUInt #

quotRem :: CUInt -> CUInt -> (CUInt, CUInt) #

divMod :: CUInt -> CUInt -> (CUInt, CUInt) #

toInteger :: CUInt -> Integer #

Integral CUIntMax 
Instance details

Defined in Foreign.C.Types

Methods

quot :: CUIntMax -> CUIntMax -> CUIntMax #

rem :: CUIntMax -> CUIntMax -> CUIntMax #

div :: CUIntMax -> CUIntMax -> CUIntMax #

mod :: CUIntMax -> CUIntMax -> CUIntMax #

quotRem :: CUIntMax -> CUIntMax -> (CUIntMax, CUIntMax) #

divMod :: CUIntMax -> CUIntMax -> (CUIntMax, CUIntMax) #

toInteger :: CUIntMax -> Integer #

Integral CUIntPtr 
Instance details

Defined in Foreign.C.Types

Methods

quot :: CUIntPtr -> CUIntPtr -> CUIntPtr #

rem :: CUIntPtr -> CUIntPtr -> CUIntPtr #

div :: CUIntPtr -> CUIntPtr -> CUIntPtr #

mod :: CUIntPtr -> CUIntPtr -> CUIntPtr #

quotRem :: CUIntPtr -> CUIntPtr -> (CUIntPtr, CUIntPtr) #

divMod :: CUIntPtr -> CUIntPtr -> (CUIntPtr, CUIntPtr) #

toInteger :: CUIntPtr -> Integer #

Integral CULLong 
Instance details

Defined in Foreign.C.Types

Methods

quot :: CULLong -> CULLong -> CULLong #

rem :: CULLong -> CULLong -> CULLong #

div :: CULLong -> CULLong -> CULLong #

mod :: CULLong -> CULLong -> CULLong #

quotRem :: CULLong -> CULLong -> (CULLong, CULLong) #

divMod :: CULLong -> CULLong -> (CULLong, CULLong) #

toInteger :: CULLong -> Integer #

Integral CULong 
Instance details

Defined in Foreign.C.Types

Methods

quot :: CULong -> CULong -> CULong #

rem :: CULong -> CULong -> CULong #

div :: CULong -> CULong -> CULong #

mod :: CULong -> CULong -> CULong #

quotRem :: CULong -> CULong -> (CULong, CULong) #

divMod :: CULong -> CULong -> (CULong, CULong) #

toInteger :: CULong -> Integer #

Integral CUShort 
Instance details

Defined in Foreign.C.Types

Methods

quot :: CUShort -> CUShort -> CUShort #

rem :: CUShort -> CUShort -> CUShort #

div :: CUShort -> CUShort -> CUShort #

mod :: CUShort -> CUShort -> CUShort #

quotRem :: CUShort -> CUShort -> (CUShort, CUShort) #

divMod :: CUShort -> CUShort -> (CUShort, CUShort) #

toInteger :: CUShort -> Integer #

Integral CWchar 
Instance details

Defined in Foreign.C.Types

Methods

quot :: CWchar -> CWchar -> CWchar #

rem :: CWchar -> CWchar -> CWchar #

div :: CWchar -> CWchar -> CWchar #

mod :: CWchar -> CWchar -> CWchar #

quotRem :: CWchar -> CWchar -> (CWchar, CWchar) #

divMod :: CWchar -> CWchar -> (CWchar, CWchar) #

toInteger :: CWchar -> Integer #

Integral IntPtr 
Instance details

Defined in Foreign.Ptr

Methods

quot :: IntPtr -> IntPtr -> IntPtr #

rem :: IntPtr -> IntPtr -> IntPtr #

div :: IntPtr -> IntPtr -> IntPtr #

mod :: IntPtr -> IntPtr -> IntPtr #

quotRem :: IntPtr -> IntPtr -> (IntPtr, IntPtr) #

divMod :: IntPtr -> IntPtr -> (IntPtr, IntPtr) #

toInteger :: IntPtr -> Integer #

Integral WordPtr 
Instance details

Defined in Foreign.Ptr

Methods

quot :: WordPtr -> WordPtr -> WordPtr #

rem :: WordPtr -> WordPtr -> WordPtr #

div :: WordPtr -> WordPtr -> WordPtr #

mod :: WordPtr -> WordPtr -> WordPtr #

quotRem :: WordPtr -> WordPtr -> (WordPtr, WordPtr) #

divMod :: WordPtr -> WordPtr -> (WordPtr, WordPtr) #

toInteger :: WordPtr -> Integer #

Integral Int16 
Instance details

Defined in GHC.Int

Integral Int32 
Instance details

Defined in GHC.Int

Integral Int64 
Instance details

Defined in GHC.Int

Integral Int8 
Instance details

Defined in GHC.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 #

Integral Word16 
Instance details

Defined in GHC.Word

Integral Word32 
Instance details

Defined in GHC.Word

Integral Word64 
Instance details

Defined in GHC.Word

Integral Word8 
Instance details

Defined in GHC.Word

Integral CBlkCnt 
Instance details

Defined in System.Posix.Types

Methods

quot :: CBlkCnt -> CBlkCnt -> CBlkCnt #

rem :: CBlkCnt -> CBlkCnt -> CBlkCnt #

div :: CBlkCnt -> CBlkCnt -> CBlkCnt #

mod :: CBlkCnt -> CBlkCnt -> CBlkCnt #

quotRem :: CBlkCnt -> CBlkCnt -> (CBlkCnt, CBlkCnt) #

divMod :: CBlkCnt -> CBlkCnt -> (CBlkCnt, CBlkCnt) #

toInteger :: CBlkCnt -> Integer #

Integral CBlkSize 
Instance details

Defined in System.Posix.Types

Methods

quot :: CBlkSize -> CBlkSize -> CBlkSize #

rem :: CBlkSize -> CBlkSize -> CBlkSize #

div :: CBlkSize -> CBlkSize -> CBlkSize #

mod :: CBlkSize -> CBlkSize -> CBlkSize #

quotRem :: CBlkSize -> CBlkSize -> (CBlkSize, CBlkSize) #

divMod :: CBlkSize -> CBlkSize -> (CBlkSize, CBlkSize) #

toInteger :: CBlkSize -> Integer #

Integral CClockId 
Instance details

Defined in System.Posix.Types

Methods

quot :: CClockId -> CClockId -> CClockId #

rem :: CClockId -> CClockId -> CClockId #

div :: CClockId -> CClockId -> CClockId #

mod :: CClockId -> CClockId -> CClockId #

quotRem :: CClockId -> CClockId -> (CClockId, CClockId) #

divMod :: CClockId -> CClockId -> (CClockId, CClockId) #

toInteger :: CClockId -> Integer #

Integral CDev 
Instance details

Defined in System.Posix.Types

Methods

quot :: CDev -> CDev -> CDev #

rem :: CDev -> CDev -> CDev #

div :: CDev -> CDev -> CDev #

mod :: CDev -> CDev -> CDev #

quotRem :: CDev -> CDev -> (CDev, CDev) #

divMod :: CDev -> CDev -> (CDev, CDev) #

toInteger :: CDev -> Integer #

Integral CFsBlkCnt 
Instance details

Defined in System.Posix.Types

Methods

quot :: CFsBlkCnt -> CFsBlkCnt -> CFsBlkCnt #

rem :: CFsBlkCnt -> CFsBlkCnt -> CFsBlkCnt #

div :: CFsBlkCnt -> CFsBlkCnt -> CFsBlkCnt #

mod :: CFsBlkCnt -> CFsBlkCnt -> CFsBlkCnt #

quotRem :: CFsBlkCnt -> CFsBlkCnt -> (CFsBlkCnt, CFsBlkCnt) #

divMod :: CFsBlkCnt -> CFsBlkCnt -> (CFsBlkCnt, CFsBlkCnt) #

toInteger :: CFsBlkCnt -> Integer #

Integral CFsFilCnt 
Instance details

Defined in System.Posix.Types

Methods

quot :: CFsFilCnt -> CFsFilCnt -> CFsFilCnt #

rem :: CFsFilCnt -> CFsFilCnt -> CFsFilCnt #

div :: CFsFilCnt -> CFsFilCnt -> CFsFilCnt #

mod :: CFsFilCnt -> CFsFilCnt -> CFsFilCnt #

quotRem :: CFsFilCnt -> CFsFilCnt -> (CFsFilCnt, CFsFilCnt) #

divMod :: CFsFilCnt -> CFsFilCnt -> (CFsFilCnt, CFsFilCnt) #

toInteger :: CFsFilCnt -> Integer #

Integral CGid 
Instance details

Defined in System.Posix.Types

Methods

quot :: CGid -> CGid -> CGid #

rem :: CGid -> CGid -> CGid #

div :: CGid -> CGid -> CGid #

mod :: CGid -> CGid -> CGid #

quotRem :: CGid -> CGid -> (CGid, CGid) #

divMod :: CGid -> CGid -> (CGid, CGid) #

toInteger :: CGid -> Integer #

Integral CId 
Instance details

Defined in System.Posix.Types

Methods

quot :: CId -> CId -> CId #

rem :: CId -> CId -> CId #

div :: CId -> CId -> CId #

mod :: CId -> CId -> CId #

quotRem :: CId -> CId -> (CId, CId) #

divMod :: CId -> CId -> (CId, CId) #

toInteger :: CId -> Integer #

Integral CIno 
Instance details

Defined in System.Posix.Types

Methods

quot :: CIno -> CIno -> CIno #

rem :: CIno -> CIno -> CIno #

div :: CIno -> CIno -> CIno #

mod :: CIno -> CIno -> CIno #

quotRem :: CIno -> CIno -> (CIno, CIno) #

divMod :: CIno -> CIno -> (CIno, CIno) #

toInteger :: CIno -> Integer #

Integral CKey 
Instance details

Defined in System.Posix.Types

Methods

quot :: CKey -> CKey -> CKey #

rem :: CKey -> CKey -> CKey #

div :: CKey -> CKey -> CKey #

mod :: CKey -> CKey -> CKey #

quotRem :: CKey -> CKey -> (CKey, CKey) #

divMod :: CKey -> CKey -> (CKey, CKey) #

toInteger :: CKey -> Integer #

Integral CMode 
Instance details

Defined in System.Posix.Types

Methods

quot :: CMode -> CMode -> CMode #

rem :: CMode -> CMode -> CMode #

div :: CMode -> CMode -> CMode #

mod :: CMode -> CMode -> CMode #

quotRem :: CMode -> CMode -> (CMode, CMode) #

divMod :: CMode -> CMode -> (CMode, CMode) #

toInteger :: CMode -> Integer #

Integral CNfds 
Instance details

Defined in System.Posix.Types

Methods

quot :: CNfds -> CNfds -> CNfds #

rem :: CNfds -> CNfds -> CNfds #

div :: CNfds -> CNfds -> CNfds #

mod :: CNfds -> CNfds -> CNfds #

quotRem :: CNfds -> CNfds -> (CNfds, CNfds) #

divMod :: CNfds -> CNfds -> (CNfds, CNfds) #

toInteger :: CNfds -> Integer #

Integral CNlink 
Instance details

Defined in System.Posix.Types

Methods

quot :: CNlink -> CNlink -> CNlink #

rem :: CNlink -> CNlink -> CNlink #

div :: CNlink -> CNlink -> CNlink #

mod :: CNlink -> CNlink -> CNlink #

quotRem :: CNlink -> CNlink -> (CNlink, CNlink) #

divMod :: CNlink -> CNlink -> (CNlink, CNlink) #

toInteger :: CNlink -> Integer #

Integral COff 
Instance details

Defined in System.Posix.Types

Methods

quot :: COff -> COff -> COff #

rem :: COff -> COff -> COff #

div :: COff -> COff -> COff #

mod :: COff -> COff -> COff #

quotRem :: COff -> COff -> (COff, COff) #

divMod :: COff -> COff -> (COff, COff) #

toInteger :: COff -> Integer #

Integral CPid 
Instance details

Defined in System.Posix.Types

Methods

quot :: CPid -> CPid -> CPid #

rem :: CPid -> CPid -> CPid #

div :: CPid -> CPid -> CPid #

mod :: CPid -> CPid -> CPid #

quotRem :: CPid -> CPid -> (CPid, CPid) #

divMod :: CPid -> CPid -> (CPid, CPid) #

toInteger :: CPid -> Integer #

Integral CRLim 
Instance details

Defined in System.Posix.Types

Methods

quot :: CRLim -> CRLim -> CRLim #

rem :: CRLim -> CRLim -> CRLim #

div :: CRLim -> CRLim -> CRLim #

mod :: CRLim -> CRLim -> CRLim #

quotRem :: CRLim -> CRLim -> (CRLim, CRLim) #

divMod :: CRLim -> CRLim -> (CRLim, CRLim) #

toInteger :: CRLim -> Integer #

Integral CSocklen 
Instance details

Defined in System.Posix.Types

Methods

quot :: CSocklen -> CSocklen -> CSocklen #

rem :: CSocklen -> CSocklen -> CSocklen #

div :: CSocklen -> CSocklen -> CSocklen #

mod :: CSocklen -> CSocklen -> CSocklen #

quotRem :: CSocklen -> CSocklen -> (CSocklen, CSocklen) #

divMod :: CSocklen -> CSocklen -> (CSocklen, CSocklen) #

toInteger :: CSocklen -> Integer #

Integral CSsize 
Instance details

Defined in System.Posix.Types

Methods

quot :: CSsize -> CSsize -> CSsize #

rem :: CSsize -> CSsize -> CSsize #

div :: CSsize -> CSsize -> CSsize #

mod :: CSsize -> CSsize -> CSsize #

quotRem :: CSsize -> CSsize -> (CSsize, CSsize) #

divMod :: CSsize -> CSsize -> (CSsize, CSsize) #

toInteger :: CSsize -> Integer #

Integral CTcflag 
Instance details

Defined in System.Posix.Types

Methods

quot :: CTcflag -> CTcflag -> CTcflag #

rem :: CTcflag -> CTcflag -> CTcflag #

div :: CTcflag -> CTcflag -> CTcflag #

mod :: CTcflag -> CTcflag -> CTcflag #

quotRem :: CTcflag -> CTcflag -> (CTcflag, CTcflag) #

divMod :: CTcflag -> CTcflag -> (CTcflag, CTcflag) #

toInteger :: CTcflag -> Integer #

Integral CUid 
Instance details

Defined in System.Posix.Types

Methods

quot :: CUid -> CUid -> CUid #

rem :: CUid -> CUid -> CUid #

div :: CUid -> CUid -> CUid #

mod :: CUid -> CUid -> CUid #

quotRem :: CUid -> CUid -> (CUid, CUid) #

divMod :: CUid -> CUid -> (CUid, CUid) #

toInteger :: CUid -> Integer #

Integral Fd 
Instance details

Defined in System.Posix.Types

Methods

quot :: Fd -> Fd -> Fd #

rem :: Fd -> Fd -> Fd #

div :: Fd -> Fd -> Fd #

mod :: Fd -> Fd -> Fd #

quotRem :: Fd -> Fd -> (Fd, Fd) #

divMod :: Fd -> Fd -> (Fd, Fd) #

toInteger :: Fd -> Integer #

Integral PortNumber 
Instance details

Defined in Network.Socket.Types

Methods

quot :: PortNumber -> PortNumber -> PortNumber #

rem :: PortNumber -> PortNumber -> PortNumber #

div :: PortNumber -> PortNumber -> PortNumber #

mod :: PortNumber -> PortNumber -> PortNumber #

quotRem :: PortNumber -> PortNumber -> (PortNumber, PortNumber) #

divMod :: PortNumber -> PortNumber -> (PortNumber, PortNumber) #

toInteger :: PortNumber -> Integer #

Integral I8 
Instance details

Defined in Data.Text.Foreign

Methods

quot :: I8 -> I8 -> I8 #

rem :: I8 -> I8 -> I8 #

div :: I8 -> I8 -> I8 #

mod :: I8 -> I8 -> I8 #

quotRem :: I8 -> I8 -> (I8, I8) #

divMod :: I8 -> I8 -> (I8, I8) #

toInteger :: I8 -> Integer #

Integral StatxFlags 
Instance details

Defined in System.Posix.Files.Common

Methods

quot :: StatxFlags -> StatxFlags -> StatxFlags #

rem :: StatxFlags -> StatxFlags -> StatxFlags #

div :: StatxFlags -> StatxFlags -> StatxFlags #

mod :: StatxFlags -> StatxFlags -> StatxFlags #

quotRem :: StatxFlags -> StatxFlags -> (StatxFlags, StatxFlags) #

divMod :: StatxFlags -> StatxFlags -> (StatxFlags, StatxFlags) #

toInteger :: StatxFlags -> Integer #

Integral StatxMask 
Instance details

Defined in System.Posix.Files.Common

Methods

quot :: StatxMask -> StatxMask -> StatxMask #

rem :: StatxMask -> StatxMask -> StatxMask #

div :: StatxMask -> StatxMask -> StatxMask #

mod :: StatxMask -> StatxMask -> StatxMask #

quotRem :: StatxMask -> StatxMask -> (StatxMask, StatxMask) #

divMod :: StatxMask -> StatxMask -> (StatxMask, StatxMask) #

toInteger :: StatxMask -> Integer #

Integral Integer 
Instance details

Defined in GHC.Real

Integral Natural 
Instance details

Defined in GHC.Real

Integral Int 
Instance details

Defined in GHC.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 #

Integral Word 
Instance details

Defined in GHC.Real

Methods

quot :: Word -> Word -> Word #

rem :: Word -> Word -> Word #

div :: Word -> Word -> Word #

mod :: Word -> Word -> Word #

quotRem :: Word -> Word -> (Word, Word) #

divMod :: Word -> Word -> (Word, Word) #

toInteger :: Word -> Integer #

Integral a => Integral (Identity a) 
Instance details

Defined in Data.Functor.Identity

(BackendCompatible b s, Integral (BackendKey b)) => Integral (BackendKey (Compatible b s)) 
Instance details

Defined in Database.Persist.Compatible.Types

Methods

quot :: BackendKey (Compatible b s) -> BackendKey (Compatible b s) -> BackendKey (Compatible b s) #

rem :: BackendKey (Compatible b s) -> BackendKey (Compatible b s) -> BackendKey (Compatible b s) #

div :: BackendKey (Compatible b s) -> BackendKey (Compatible b s) -> BackendKey (Compatible b s) #

mod :: BackendKey (Compatible b s) -> BackendKey (Compatible b s) -> BackendKey (Compatible b s) #

quotRem :: BackendKey (Compatible b s) -> BackendKey (Compatible b s) -> (BackendKey (Compatible b s), BackendKey (Compatible b s)) #

divMod :: BackendKey (Compatible b s) -> BackendKey (Compatible b s) -> (BackendKey (Compatible b s), BackendKey (Compatible b s)) #

toInteger :: BackendKey (Compatible b s) -> Integer #

(PersistCore b, PersistCore (RawSqlite b), Integral (BackendKey b)) => Integral (BackendKey (RawSqlite b)) 
Instance details

Defined in Database.Persist.Sqlite

Methods

quot :: BackendKey (RawSqlite b) -> BackendKey (RawSqlite b) -> BackendKey (RawSqlite b) #

rem :: BackendKey (RawSqlite b) -> BackendKey (RawSqlite b) -> BackendKey (RawSqlite b) #

div :: BackendKey (RawSqlite b) -> BackendKey (RawSqlite b) -> BackendKey (RawSqlite b) #

mod :: BackendKey (RawSqlite b) -> BackendKey (RawSqlite b) -> BackendKey (RawSqlite b) #

quotRem :: BackendKey (RawSqlite b) -> BackendKey (RawSqlite b) -> (BackendKey (RawSqlite b), BackendKey (RawSqlite b)) #

divMod :: BackendKey (RawSqlite b) -> BackendKey (RawSqlite b) -> (BackendKey (RawSqlite b), BackendKey (RawSqlite b)) #

toInteger :: BackendKey (RawSqlite b) -> Integer #

Integral a => Integral (Const a b) 
Instance details

Defined in 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 #

Integral a => Integral (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

quot :: Tagged s a -> Tagged s a -> Tagged s a #

rem :: Tagged s a -> Tagged s a -> Tagged s a #

div :: Tagged s a -> Tagged s a -> Tagged s a #

mod :: Tagged s a -> Tagged s a -> Tagged s a #

quotRem :: Tagged s a -> Tagged s a -> (Tagged s a, Tagged s a) #

divMod :: Tagged s a -> Tagged s a -> (Tagged s a, Tagged s a) #

toInteger :: Tagged s a -> Integer #

Integral (f (g a)) => Integral (Compose f g a) 
Instance details

Defined in Data.Functor.Compose

Methods

quot :: Compose f g a -> Compose f g a -> Compose f g a #

rem :: Compose f g a -> Compose f g a -> Compose f g a #

div :: Compose f g a -> Compose f g a -> Compose f g a #

mod :: Compose f g a -> Compose f g a -> Compose f g a #

quotRem :: Compose f g a -> Compose f g a -> (Compose f g a, Compose f g a) #

divMod :: Compose f g a -> Compose f g a -> (Compose f g a, Compose f g a) #

toInteger :: Compose f g a -> Integer #

type Rational = Ratio Integer #

class (Num a, Ord a) => Real a where #

Methods

toRational :: a -> Rational #

Instances

Instances details
Real Number 
Instance details

Defined in Data.Attoparsec.Number

Methods

toRational :: Number -> Rational #

Real CBool 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CBool -> Rational #

Real CChar 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CChar -> Rational #

Real CClock 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CClock -> Rational #

Real CDouble 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CDouble -> Rational #

Real CFloat 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CFloat -> Rational #

Real CInt 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CInt -> Rational #

Real CIntMax 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CIntMax -> Rational #

Real CIntPtr 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CIntPtr -> Rational #

Real CLLong 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CLLong -> Rational #

Real CLong 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CLong -> Rational #

Real CPtrdiff 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CPtrdiff -> Rational #

Real CSChar 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CSChar -> Rational #

Real CSUSeconds 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CSUSeconds -> Rational #

Real CShort 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CShort -> Rational #

Real CSigAtomic 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CSigAtomic -> Rational #

Real CSize 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CSize -> Rational #

Real CTime 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CTime -> Rational #

Real CUChar 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CUChar -> Rational #

Real CUInt 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CUInt -> Rational #

Real CUIntMax 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CUIntMax -> Rational #

Real CUIntPtr 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CUIntPtr -> Rational #

Real CULLong 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CULLong -> Rational #

Real CULong 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CULong -> Rational #

Real CUSeconds 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CUSeconds -> Rational #

Real CUShort 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CUShort -> Rational #

Real CWchar 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CWchar -> Rational #

Real IntPtr 
Instance details

Defined in Foreign.Ptr

Methods

toRational :: IntPtr -> Rational #

Real WordPtr 
Instance details

Defined in Foreign.Ptr

Methods

toRational :: WordPtr -> Rational #

Real Int16 
Instance details

Defined in GHC.Int

Methods

toRational :: Int16 -> Rational #

Real Int32 
Instance details

Defined in GHC.Int

Methods

toRational :: Int32 -> Rational #

Real Int64 
Instance details

Defined in GHC.Int

Methods

toRational :: Int64 -> Rational #

Real Int8 
Instance details

Defined in GHC.Int

Methods

toRational :: Int8 -> Rational #

Real Word16 
Instance details

Defined in GHC.Word

Real Word32 
Instance details

Defined in GHC.Word

Real Word64 
Instance details

Defined in GHC.Word

Real Word8 
Instance details

Defined in GHC.Word

Methods

toRational :: Word8 -> Rational #

Real CBlkCnt 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CBlkCnt -> Rational #

Real CBlkSize 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CBlkSize -> Rational #

Real CCc 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CCc -> Rational #

Real CClockId 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CClockId -> Rational #

Real CDev 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CDev -> Rational #

Real CFsBlkCnt 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CFsBlkCnt -> Rational #

Real CFsFilCnt 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CFsFilCnt -> Rational #

Real CGid 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CGid -> Rational #

Real CId 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CId -> Rational #

Real CIno 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CIno -> Rational #

Real CKey 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CKey -> Rational #

Real CMode 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CMode -> Rational #

Real CNfds 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CNfds -> Rational #

Real CNlink 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CNlink -> Rational #

Real COff 
Instance details

Defined in System.Posix.Types

Methods

toRational :: COff -> Rational #

Real CPid 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CPid -> Rational #

Real CRLim 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CRLim -> Rational #

Real CSocklen 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CSocklen -> Rational #

Real CSpeed 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CSpeed -> Rational #

Real CSsize 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CSsize -> Rational #

Real CTcflag 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CTcflag -> Rational #

Real CUid 
Instance details

Defined in System.Posix.Types

Methods

toRational :: CUid -> Rational #

Real Fd 
Instance details

Defined in System.Posix.Types

Methods

toRational :: Fd -> Rational #

Real PrivateNumber 
Instance details

Defined in Crypto.PubKey.DH

Methods

toRational :: PrivateNumber -> Rational #

Real PublicNumber 
Instance details

Defined in Crypto.PubKey.DH

Methods

toRational :: PublicNumber -> Rational #

Real Half 
Instance details

Defined in Numeric.Half.Internal

Methods

toRational :: Half -> Rational #

Real PortNumber 
Instance details

Defined in Network.Socket.Types

Methods

toRational :: PortNumber -> Rational #

Real Scientific 
Instance details

Defined in Data.Scientific

Methods

toRational :: Scientific -> Rational #

Real I8 
Instance details

Defined in Data.Text.Foreign

Methods

toRational :: I8 -> Rational #

Real DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Methods

toRational :: DiffTime -> Rational #

Real NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Methods

toRational :: NominalDiffTime -> Rational #

Real StatxFlags 
Instance details

Defined in System.Posix.Files.Common

Methods

toRational :: StatxFlags -> Rational #

Real StatxMask 
Instance details

Defined in System.Posix.Files.Common

Methods

toRational :: StatxMask -> Rational #

Real Integer 
Instance details

Defined in GHC.Real

Real Natural 
Instance details

Defined in GHC.Real

Real Int 
Instance details

Defined in GHC.Real

Methods

toRational :: Int -> Rational #

Real Word 
Instance details

Defined in GHC.Real

Methods

toRational :: Word -> Rational #

Real a => Real (Identity a) 
Instance details

Defined in Data.Functor.Identity

Methods

toRational :: Identity a -> Rational #

Real a => Real (Down a) 
Instance details

Defined in Data.Ord

Methods

toRational :: Down a -> Rational #

Integral a => Real (Ratio a) 
Instance details

Defined in GHC.Real

Methods

toRational :: Ratio a -> Rational #

(BackendCompatible b s, Real (BackendKey b)) => Real (BackendKey (Compatible b s)) 
Instance details

Defined in Database.Persist.Compatible.Types

Methods

toRational :: BackendKey (Compatible b s) -> Rational #

(PersistCore b, PersistCore (RawSqlite b), Real (BackendKey b)) => Real (BackendKey (RawSqlite b)) 
Instance details

Defined in Database.Persist.Sqlite

Methods

toRational :: BackendKey (RawSqlite b) -> Rational #

HasResolution a => Real (Fixed a) 
Instance details

Defined in Data.Fixed

Methods

toRational :: Fixed a -> Rational #

Real a => Real (Const a b) 
Instance details

Defined in Data.Functor.Const

Methods

toRational :: Const a b -> Rational #

Real a => Real (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

toRational :: Tagged s a -> Rational #

Real (f (g a)) => Real (Compose f g a) 
Instance details

Defined in Data.Functor.Compose

Methods

toRational :: Compose f g a -> Rational #

class (Real a, Fractional a) => RealFrac a where #

Minimal complete definition

properFraction

Methods

properFraction :: Integral b => a -> (b, a) #

truncate :: Integral b => a -> b #

round :: Integral b => a -> b #

ceiling :: Integral b => a -> b #

floor :: Integral b => a -> b #

Instances

Instances details
RealFrac Number 
Instance details

Defined in Data.Attoparsec.Number

Methods

properFraction :: Integral b => Number -> (b, Number) #

truncate :: Integral b => Number -> b #

round :: Integral b => Number -> b #

ceiling :: Integral b => Number -> b #

floor :: Integral b => Number -> b #

RealFrac CDouble 
Instance details

Defined in Foreign.C.Types

Methods

properFraction :: Integral b => CDouble -> (b, CDouble) #

truncate :: Integral b => CDouble -> b #

round :: Integral b => CDouble -> b #

ceiling :: Integral b => CDouble -> b #

floor :: Integral b => CDouble -> b #

RealFrac CFloat 
Instance details

Defined in Foreign.C.Types

Methods

properFraction :: Integral b => CFloat -> (b, CFloat) #

truncate :: Integral b => CFloat -> b #

round :: Integral b => CFloat -> b #

ceiling :: Integral b => CFloat -> b #

floor :: Integral b => CFloat -> b #

RealFrac Half 
Instance details

Defined in Numeric.Half.Internal

Methods

properFraction :: Integral b => Half -> (b, Half) #

truncate :: Integral b => Half -> b #

round :: Integral b => Half -> b #

ceiling :: Integral b => Half -> b #

floor :: Integral b => Half -> b #

RealFrac Scientific 
Instance details

Defined in Data.Scientific

Methods

properFraction :: Integral b => Scientific -> (b, Scientific) #

truncate :: Integral b => Scientific -> b #

round :: Integral b => Scientific -> b #

ceiling :: Integral b => Scientific -> b #

floor :: Integral b => Scientific -> b #

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 #

RealFrac NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Methods

properFraction :: Integral b => NominalDiffTime -> (b, NominalDiffTime) #

truncate :: Integral b => NominalDiffTime -> b #

round :: Integral b => NominalDiffTime -> b #

ceiling :: Integral b => NominalDiffTime -> b #

floor :: Integral b => NominalDiffTime -> b #

RealFrac a => RealFrac (Identity a) 
Instance details

Defined in Data.Functor.Identity

Methods

properFraction :: Integral b => Identity a -> (b, Identity a) #

truncate :: Integral b => Identity a -> b #

round :: Integral b => Identity a -> b #

ceiling :: Integral b => Identity a -> b #

floor :: Integral b => Identity a -> b #

RealFrac a => RealFrac (Down a) 
Instance details

Defined in Data.Ord

Methods

properFraction :: Integral b => Down a -> (b, Down a) #

truncate :: Integral b => Down a -> b #

round :: Integral b => Down a -> b #

ceiling :: Integral b => Down a -> b #

floor :: Integral b => Down a -> b #

Integral a => RealFrac (Ratio a) 
Instance details

Defined in GHC.Real

Methods

properFraction :: Integral b => Ratio a -> (b, Ratio a) #

truncate :: Integral b => Ratio a -> b #

round :: Integral b => Ratio a -> b #

ceiling :: Integral b => Ratio a -> b #

floor :: Integral b => Ratio a -> b #

HasResolution a => RealFrac (Fixed a) 
Instance details

Defined in Data.Fixed

Methods

properFraction :: Integral b => Fixed a -> (b, Fixed a) #

truncate :: Integral b => Fixed a -> b #

round :: Integral b => Fixed a -> b #

ceiling :: Integral b => Fixed a -> b #

floor :: Integral b => Fixed a -> b #

RealFrac a => RealFrac (Const a b) 
Instance details

Defined in 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 #

RealFrac a => RealFrac (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

properFraction :: Integral b => Tagged s a -> (b, Tagged s a) #

truncate :: Integral b => Tagged s a -> b #

round :: Integral b => Tagged s a -> b #

ceiling :: Integral b => Tagged s a -> b #

floor :: Integral b => Tagged s a -> b #

data ST s a #

Instances

Instances details
MonadFix (ST s) 
Instance details

Defined in Control.Monad.Fix

Methods

mfix :: (a -> ST s a) -> ST s a

Applicative (ST s) 
Instance details

Defined in GHC.ST

Methods

pure :: a -> ST s a #

(<*>) :: ST s (a -> b) -> ST s a -> ST s b #

liftA2 :: (a -> b -> c) -> ST s a -> ST s b -> ST s c #

(*>) :: ST s a -> ST s b -> ST s b #

(<*) :: ST s a -> ST s b -> ST s a #

Functor (ST s) 
Instance details

Defined in GHC.ST

Methods

fmap :: (a -> b) -> ST s a -> ST s b #

(<$) :: a -> ST s b -> ST s a #

Monad (ST s) 
Instance details

Defined in GHC.ST

Methods

(>>=) :: ST s a -> (a -> ST s b) -> ST s b #

(>>) :: ST s a -> ST s b -> ST s b #

return :: a -> ST s a #

PrimMonad (ST s) 
Instance details

Defined in Basement.Monad

Associated Types

type PrimState (ST s) 
Instance details

Defined in Basement.Monad

type PrimState (ST s) = s
type PrimVar (ST s) 
Instance details

Defined in Basement.Monad

type PrimVar (ST s) = STRef s

Methods

primitive :: (State# (PrimState (ST s)) -> (# State# (PrimState (ST s)), a #)) -> ST s a

primThrow :: Exception e => e -> ST s a

unPrimMonad :: ST s a -> State# (PrimState (ST s)) -> (# State# (PrimState (ST s)), a #)

primVarNew :: a -> ST s (PrimVar (ST s) a)

primVarRead :: PrimVar (ST s) a -> ST s a

primVarWrite :: PrimVar (ST s) a -> a -> ST s ()

MonadActive (ST s) 
Instance details

Defined in Data.Conduit.Lazy

Methods

monadActive :: ST s Bool

MonadThrow (ST s) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: (HasCallStack, Exception e) => e -> ST s a #

PrimBase (ST s) 
Instance details

Defined in Control.Monad.Primitive

Methods

internal :: ST s a -> State# (PrimState (ST s)) -> (# State# (PrimState (ST s)), a #)

PrimMonad (ST s) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (ST s) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ST s) = s

Methods

primitive :: (State# (PrimState (ST s)) -> (# State# (PrimState (ST s)), a #)) -> ST s a #

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 ()

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 ()

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 ()

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 ()

MArray (STUArray s) Word16 (ST s) 
Instance details

Defined in Data.Array.Base

Methods

getBounds :: Ix i => STUArray s i Word16 -> ST s (i, i)

getNumElements :: Ix i => STUArray s i Word16 -> ST s Int

newArray :: Ix i => (i, i) -> Word16 -> ST s (STUArray s i Word16)

newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Word16)

unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Word16)

unsafeRead :: Ix i => STUArray s i Word16 -> Int -> ST s Word16

unsafeWrite :: Ix i => STUArray s i Word16 -> Int -> Word16 -> ST s ()

MArray (STUArray s) Word32 (ST s) 
Instance details

Defined in Data.Array.Base

Methods

getBounds :: Ix i => STUArray s i Word32 -> ST s (i, i)

getNumElements :: Ix i => STUArray s i Word32 -> ST s Int

newArray :: Ix i => (i, i) -> Word32 -> ST s (STUArray s i Word32)

newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Word32)

unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Word32)

unsafeRead :: Ix i => STUArray s i Word32 -> Int -> ST s Word32

unsafeWrite :: Ix i => STUArray s i Word32 -> Int -> Word32 -> ST s ()

MArray (STUArray s) Word64 (ST s) 
Instance details

Defined in Data.Array.Base

Methods

getBounds :: Ix i => STUArray s i Word64 -> ST s (i, i)

getNumElements :: Ix i => STUArray s i Word64 -> ST s Int

newArray :: Ix i => (i, i) -> Word64 -> ST s (STUArray s i Word64)

newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Word64)

unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Word64)

unsafeRead :: Ix i => STUArray s i Word64 -> Int -> ST s Word64

unsafeWrite :: Ix i => STUArray s i Word64 -> Int -> Word64 -> ST s ()

MArray (STUArray s) Word8 (ST s) 
Instance details

Defined in Data.Array.Base

Methods

getBounds :: Ix i => STUArray s i Word8 -> ST s (i, i)

getNumElements :: Ix i => STUArray s i Word8 -> ST s Int

newArray :: Ix i => (i, i) -> Word8 -> ST s (STUArray s i Word8)

newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Word8)

unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Word8)

unsafeRead :: Ix i => STUArray s i Word8 -> Int -> ST s Word8

unsafeWrite :: Ix i => STUArray s i Word8 -> Int -> Word8 -> ST s ()

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 ()

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 ()

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 ()

MArray (STUArray s) Float (ST s) 
Instance details

Defined in Data.Array.Base

Methods

getBounds :: Ix i => STUArray s i Float -> ST s (i, i)

getNumElements :: Ix i => STUArray s i Float -> ST s Int

newArray :: Ix i => (i, i) -> Float -> ST s (STUArray s i Float)

newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Float)

unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Float)

unsafeRead :: Ix i => STUArray s i Float -> Int -> ST s Float

unsafeWrite :: Ix i => STUArray s i Float -> Int -> Float -> ST s ()

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 ()

MArray (STUArray s) Word (ST s) 
Instance details

Defined in Data.Array.Base

Methods

getBounds :: Ix i => STUArray s i Word -> ST s (i, i)

getNumElements :: Ix i => STUArray s i Word -> ST s Int

newArray :: Ix i => (i, i) -> Word -> ST s (STUArray s i Word)

newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Word)

unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Word)

unsafeRead :: Ix i => STUArray s i Word -> Int -> ST s Word

unsafeWrite :: Ix i => STUArray s i Word -> Int -> Word -> ST s ()

MArray (STArray s) e (ST s) 
Instance details

Defined in Data.Array.Base

Methods

getBounds :: Ix i => STArray s i e -> ST s (i, i)

getNumElements :: Ix i => STArray s i e -> ST s Int

newArray :: Ix i => (i, i) -> e -> ST s (STArray s i e)

newArray_ :: Ix i => (i, i) -> ST s (STArray s i e)

unsafeNewArray_ :: Ix i => (i, i) -> ST s (STArray s i e)

unsafeRead :: Ix i => STArray s i e -> Int -> ST s e

unsafeWrite :: Ix i => STArray s i e -> Int -> e -> ST s ()

MonadBaseControl (ST s) (ST s) 
Instance details

Defined in Control.Monad.Trans.Control

Methods

liftBaseWith :: (RunInBase (ST s) (ST s) -> ST s a) -> ST s a

restoreM :: StM (ST s) a -> ST s a

RandomGen g => FrozenGen (STGen g) (ST s) 
Instance details

Defined in System.Random.Stateful

Associated Types

type MutableGen (STGen g) (ST s) 
Instance details

Defined in System.Random.Stateful

type MutableGen (STGen g) (ST s) = STGenM g s

Methods

freezeGen :: MutableGen (STGen g) (ST s) -> ST s (STGen g)

thawGen :: STGen g -> ST s (MutableGen (STGen g) (ST s))

MArray (STUArray s) (FunPtr a) (ST s) 
Instance details

Defined in Data.Array.Base

Methods

getBounds :: Ix i => STUArray s i (FunPtr a) -> ST s (i, i)

getNumElements :: Ix i => STUArray s i (FunPtr a) -> ST s Int

newArray :: Ix i => (i, i) -> FunPtr a -> ST s (STUArray s i (FunPtr a))

newArray_ :: Ix i => (i, i) -> ST s (STUArray s i (FunPtr a))

unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i (FunPtr a))

unsafeRead :: Ix i => STUArray s i (FunPtr a) -> Int -> ST s (FunPtr a)

unsafeWrite :: Ix i => STUArray s i (FunPtr a) -> Int -> FunPtr a -> ST s ()

MArray (STUArray s) (Ptr a) (ST s) 
Instance details

Defined in Data.Array.Base

Methods

getBounds :: Ix i => STUArray s i (Ptr a) -> ST s (i, i)

getNumElements :: Ix i => STUArray s i (Ptr a) -> ST s Int

newArray :: Ix i => (i, i) -> Ptr a -> ST s (STUArray s i (Ptr a))

newArray_ :: Ix i => (i, i) -> ST s (STUArray s i (Ptr a))

unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i (Ptr a))

unsafeRead :: Ix i => STUArray s i (Ptr a) -> Int -> ST s (Ptr a)

unsafeWrite :: Ix i => STUArray s i (Ptr a) -> Int -> Ptr a -> ST s ()

MArray (STUArray s) (StablePtr a) (ST s) 
Instance details

Defined in Data.Array.Base

Methods

getBounds :: Ix i => STUArray s i (StablePtr a) -> ST s (i, i)

getNumElements :: Ix i => STUArray s i (StablePtr a) -> ST s Int

newArray :: Ix i => (i, i) -> StablePtr a -> ST s (STUArray s i (StablePtr a))

newArray_ :: Ix i => (i, i) -> ST s (STUArray s i (StablePtr a))

unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i (StablePtr a))

unsafeRead :: Ix i => STUArray s i (StablePtr a) -> Int -> ST s (StablePtr a)

unsafeWrite :: Ix i => STUArray s i (StablePtr a) -> Int -> StablePtr a -> ST s ()

Monoid a => Monoid (ST s a) 
Instance details

Defined in GHC.ST

Methods

mempty :: ST s a #

mappend :: ST s a -> ST s a -> ST s a #

mconcat :: [ST s a] -> ST s a #

Semigroup a => Semigroup (ST s a) 
Instance details

Defined in GHC.ST

Methods

(<>) :: ST s a -> ST s a -> ST s a #

sconcat :: NonEmpty (ST s a) -> ST s a

stimes :: Integral b => b -> ST s a -> ST s a

Show (ST s a) 
Instance details

Defined in GHC.ST

Methods

showsPrec :: Int -> ST s a -> ShowS

show :: ST s a -> String #

showList :: [ST s a] -> ShowS

RandomGen r => RandomGenM (STGenM r s) r (ST s) 
Instance details

Defined in System.Random.Stateful

Methods

applyRandomGenM :: (r -> (a, r)) -> STGenM r s -> ST s a

RandomGen g => StatefulGen (STGenM g s) (ST s) 
Instance details

Defined in System.Random.Stateful

Methods

uniformWord32R :: Word32 -> STGenM g s -> ST s Word32

uniformWord64R :: Word64 -> STGenM g s -> ST s Word64

uniformWord8 :: STGenM g s -> ST s Word8

uniformWord16 :: STGenM g s -> ST s Word16

uniformWord32 :: STGenM g s -> ST s Word32

uniformWord64 :: STGenM g s -> ST s Word64

uniformShortByteString :: Int -> STGenM g s -> ST s ShortByteString

type PrimState (ST s) 
Instance details

Defined in Basement.Monad

type PrimState (ST s) = s
type PrimVar (ST s) 
Instance details

Defined in Basement.Monad

type PrimVar (ST s) = STRef s
type PrimState (ST s) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ST s) = s
type StM (ST s) a 
Instance details

Defined in Control.Monad.Trans.Control

type StM (ST s) a = a
type MutableGen (STGen g) (ST s) 
Instance details

Defined in System.Random.Stateful

type MutableGen (STGen g) (ST s) = STGenM g s

class Show a where #

Minimal complete definition

showsPrec | show

Methods

show :: a -> String #

Instances

Instances details
Show FullUnitId 
Instance details

Defined in Distribution.Backpack.FullUnitId

Methods

showsPrec :: Int -> FullUnitId -> ShowS

show :: FullUnitId -> String #

showList :: [FullUnitId] -> ShowS

Show ModuleShape 
Instance details

Defined in Distribution.Backpack.ModuleShape

Methods

showsPrec :: Int -> ModuleShape -> ShowS

show :: ModuleShape -> String #

showList :: [ModuleShape] -> ShowS

Show PreModuleShape 
Instance details

Defined in Distribution.Backpack.PreModuleShape

Methods

showsPrec :: Int -> PreModuleShape -> ShowS

show :: PreModuleShape -> String #

showList :: [PreModuleShape] -> ShowS

Show ModTime 
Instance details

Defined in Distribution.Compat.Time

Methods

showsPrec :: Int -> ModTime -> ShowS

show :: ModTime -> String #

showList :: [ModTime] -> ShowS

Show CEField 
Instance details

Defined in Distribution.PackageDescription.Check

Methods

showsPrec :: Int -> CEField -> ShowS

show :: CEField -> String #

showList :: [CEField] -> ShowS

Show CEType 
Instance details

Defined in Distribution.PackageDescription.Check

Methods

showsPrec :: Int -> CEType -> ShowS

show :: CEType -> String #

showList :: [CEType] -> ShowS

Show CheckExplanation 
Instance details

Defined in Distribution.PackageDescription.Check

Methods

showsPrec :: Int -> CheckExplanation -> ShowS

show :: CheckExplanation -> String #

showList :: [CheckExplanation] -> ShowS

Show PackageCheck 
Instance details

Defined in Distribution.PackageDescription.Check

Methods

showsPrec :: Int -> PackageCheck -> ShowS

show :: PackageCheck -> String #

showList :: [PackageCheck] -> ShowS

Show BuildTarget 
Instance details

Defined in Distribution.Simple.BuildTarget

Methods

showsPrec :: Int -> BuildTarget -> ShowS

show :: BuildTarget -> String #

showList :: [BuildTarget] -> ShowS

Show BuildTargetProblem 
Instance details

Defined in Distribution.Simple.BuildTarget

Methods

showsPrec :: Int -> BuildTargetProblem -> ShowS

show :: BuildTargetProblem -> String #

showList :: [BuildTargetProblem] -> ShowS

Show ComponentKind 
Instance details

Defined in Distribution.Simple.BuildTarget

Methods

showsPrec :: Int -> ComponentKind -> ShowS

show :: ComponentKind -> String #

showList :: [ComponentKind] -> ShowS

Show MatchError 
Instance details

Defined in Distribution.Simple.BuildTarget

Methods

showsPrec :: Int -> MatchError -> ShowS

show :: MatchError -> String #

showList :: [MatchError] -> ShowS

Show QualLevel 
Instance details

Defined in Distribution.Simple.BuildTarget

Methods

showsPrec :: Int -> QualLevel -> ShowS

show :: QualLevel -> String #

showList :: [QualLevel] -> ShowS

Show UserBuildTarget 
Instance details

Defined in Distribution.Simple.BuildTarget

Methods

showsPrec :: Int -> UserBuildTarget -> ShowS

show :: UserBuildTarget -> String #

showList :: [UserBuildTarget] -> ShowS

Show UserBuildTargetProblem 
Instance details

Defined in Distribution.Simple.BuildTarget

Methods

showsPrec :: Int -> UserBuildTargetProblem -> ShowS

show :: UserBuildTargetProblem -> String #

showList :: [UserBuildTargetProblem] -> ShowS

Show CDialect 
Instance details

Defined in Distribution.Simple.CCompiler

Methods

showsPrec :: Int -> CDialect -> ShowS

show :: CDialect -> String #

showList :: [CDialect] -> ShowS

Show Compiler 
Instance details

Defined in Distribution.Simple.Compiler

Methods

showsPrec :: Int -> Compiler -> ShowS

show :: Compiler -> String #

showList :: [Compiler] -> ShowS

Show DebugInfoLevel 
Instance details

Defined in Distribution.Simple.Compiler

Methods

showsPrec :: Int -> DebugInfoLevel -> ShowS

show :: DebugInfoLevel -> String #

showList :: [DebugInfoLevel] -> ShowS

Show OptimisationLevel 
Instance details

Defined in Distribution.Simple.Compiler

Methods

showsPrec :: Int -> OptimisationLevel -> ShowS

show :: OptimisationLevel -> String #

showList :: [OptimisationLevel] -> ShowS

Show PackageDB 
Instance details

Defined in Distribution.Simple.Compiler

Methods

showsPrec :: Int -> PackageDB -> ShowS

show :: PackageDB -> String #

showList :: [PackageDB] -> ShowS

Show ProfDetailLevel 
Instance details

Defined in Distribution.Simple.Compiler

Methods

showsPrec :: Int -> ProfDetailLevel -> ShowS

show :: ProfDetailLevel -> String #

showList :: [ProfDetailLevel] -> ShowS

Show ConfigStateFileError 
Instance details

Defined in Distribution.Simple.Configure

Methods

showsPrec :: Int -> ConfigStateFileError -> ShowS

show :: ConfigStateFileError -> String #

showList :: [ConfigStateFileError] -> ShowS

Show GlobSyntaxError 
Instance details

Defined in Distribution.Simple.Glob

Methods

showsPrec :: Int -> GlobSyntaxError -> ShowS

show :: GlobSyntaxError -> String #

showList :: [GlobSyntaxError] -> ShowS

Show Directory 
Instance details

Defined in Distribution.Simple.Haddock

Methods

showsPrec :: Int -> Directory -> ShowS

show :: Directory -> String #

showList :: [Directory] -> ShowS

Show Way 
Instance details

Defined in Distribution.Simple.Hpc

Methods

showsPrec :: Int -> Way -> ShowS

show :: Way -> String #

showList :: [Way] -> ShowS

Show CopyDest 
Instance details

Defined in Distribution.Simple.InstallDirs

Methods

showsPrec :: Int -> CopyDest -> ShowS

show :: CopyDest -> String #

showList :: [CopyDest] -> ShowS

Show PathTemplate 
Instance details

Defined in Distribution.Simple.InstallDirs

Methods

showsPrec :: Int -> PathTemplate -> ShowS

show :: PathTemplate -> String #

showList :: [PathTemplate] -> ShowS

Show PathComponent 
Instance details

Defined in Distribution.Simple.InstallDirs.Internal

Methods

showsPrec :: Int -> PathComponent -> ShowS

show :: PathComponent -> String #

showList :: [PathComponent] -> ShowS

Show PathTemplateVariable 
Instance details

Defined in Distribution.Simple.InstallDirs.Internal

Methods

showsPrec :: Int -> PathTemplateVariable -> ShowS

show :: PathTemplateVariable -> String #

showList :: [PathTemplateVariable] -> ShowS

Show ProgramDb 
Instance details

Defined in Distribution.Simple.Program.Db

Methods

showsPrec :: Int -> ProgramDb -> ShowS

show :: ProgramDb -> String #

showList :: [ProgramDb] -> ShowS

Show GhcDynLinkMode 
Instance details

Defined in Distribution.Simple.Program.GHC

Methods

showsPrec :: Int -> GhcDynLinkMode -> ShowS

show :: GhcDynLinkMode -> String #

showList :: [GhcDynLinkMode] -> ShowS

Show GhcMode 
Instance details

Defined in Distribution.Simple.Program.GHC

Methods

showsPrec :: Int -> GhcMode -> ShowS

show :: GhcMode -> String #

showList :: [GhcMode] -> ShowS

Show GhcOptimisation 
Instance details

Defined in Distribution.Simple.Program.GHC

Methods

showsPrec :: Int -> GhcOptimisation -> ShowS

show :: GhcOptimisation -> String #

showList :: [GhcOptimisation] -> ShowS

Show GhcOptions 
Instance details

Defined in Distribution.Simple.Program.GHC

Methods

showsPrec :: Int -> GhcOptions -> ShowS

show :: GhcOptions -> String #

showList :: [GhcOptions] -> ShowS

Show GhcProfAuto 
Instance details

Defined in Distribution.Simple.Program.GHC

Methods

showsPrec :: Int -> GhcProfAuto -> ShowS

show :: GhcProfAuto -> String #

showList :: [GhcProfAuto] -> ShowS

Show ConfiguredProgram 
Instance details

Defined in Distribution.Simple.Program.Types

Methods

showsPrec :: Int -> ConfiguredProgram -> ShowS

show :: ConfiguredProgram -> String #

showList :: [ConfiguredProgram] -> ShowS

Show Program 
Instance details

Defined in Distribution.Simple.Program.Types

Methods

showsPrec :: Int -> Program -> ShowS

show :: Program -> String #

showList :: [Program] -> ShowS

Show ProgramLocation 
Instance details

Defined in Distribution.Simple.Program.Types

Methods

showsPrec :: Int -> ProgramLocation -> ShowS

show :: ProgramLocation -> String #

showList :: [ProgramLocation] -> ShowS

Show BenchmarkFlags 
Instance details

Defined in Distribution.Simple.Setup

Methods

showsPrec :: Int -> BenchmarkFlags -> ShowS

show :: BenchmarkFlags -> String #

showList :: [BenchmarkFlags] -> ShowS

Show BuildFlags 
Instance details

Defined in Distribution.Simple.Setup

Methods

showsPrec :: Int -> BuildFlags -> ShowS

show :: BuildFlags -> String #

showList :: [BuildFlags] -> ShowS

Show CleanFlags 
Instance details

Defined in Distribution.Simple.Setup

Methods

showsPrec :: Int -> CleanFlags -> ShowS

show :: CleanFlags -> String #

showList :: [CleanFlags] -> ShowS

Show ConfigFlags 
Instance details

Defined in Distribution.Simple.Setup

Methods

showsPrec :: Int -> ConfigFlags -> ShowS

show :: ConfigFlags -> String #

showList :: [ConfigFlags] -> ShowS

Show CopyFlags 
Instance details

Defined in Distribution.Simple.Setup

Methods

showsPrec :: Int -> CopyFlags -> ShowS

show :: CopyFlags -> String #

showList :: [CopyFlags] -> ShowS

Show HaddockFlags 
Instance details

Defined in Distribution.Simple.Setup

Methods

showsPrec :: Int -> HaddockFlags -> ShowS

show :: HaddockFlags -> String #

showList :: [HaddockFlags] -> ShowS

Show HaddockProjectFlags 
Instance details

Defined in Distribution.Simple.Setup

Methods

showsPrec :: Int -> HaddockProjectFlags -> ShowS

show :: HaddockProjectFlags -> String #

showList :: [HaddockProjectFlags] -> ShowS

Show HaddockTarget 
Instance details

Defined in Distribution.Simple.Setup

Methods

showsPrec :: Int -> HaddockTarget -> ShowS

show :: HaddockTarget -> String #

showList :: [HaddockTarget] -> ShowS

Show HscolourFlags 
Instance details

Defined in Distribution.Simple.Setup

Methods

showsPrec :: Int -> HscolourFlags -> ShowS

show :: HscolourFlags -> String #

showList :: [HscolourFlags] -> ShowS

Show InstallFlags 
Instance details

Defined in Distribution.Simple.Setup

Methods

showsPrec :: Int -> InstallFlags -> ShowS

show :: InstallFlags -> String #

showList :: [InstallFlags] -> ShowS

Show RegisterFlags 
Instance details

Defined in Distribution.Simple.Setup

Methods

showsPrec :: Int -> RegisterFlags -> ShowS

show :: RegisterFlags -> String #

showList :: [RegisterFlags] -> ShowS

Show ReplFlags 
Instance details

Defined in Distribution.Simple.Setup

Methods

showsPrec :: Int -> ReplFlags -> ShowS

show :: ReplFlags -> String #

showList :: [ReplFlags] -> ShowS

Show ReplOptions 
Instance details

Defined in Distribution.Simple.Setup

Methods

showsPrec :: Int -> ReplOptions -> ShowS

show :: ReplOptions -> String #

showList :: [ReplOptions] -> ShowS

Show SDistFlags 
Instance details

Defined in Distribution.Simple.Setup

Methods

showsPrec :: Int -> SDistFlags -> ShowS

show :: SDistFlags -> String #

showList :: [SDistFlags] -> ShowS

Show TestFlags 
Instance details

Defined in Distribution.Simple.Setup

Methods

showsPrec :: Int -> TestFlags -> ShowS

show :: TestFlags -> String #

showList :: [TestFlags] -> ShowS

Show TestShowDetails 
Instance details

Defined in Distribution.Simple.Setup

Methods

showsPrec :: Int -> TestShowDetails -> ShowS

show :: TestShowDetails -> String #

showList :: [TestShowDetails] -> ShowS

Show Visibility 
Instance details

Defined in Distribution.Simple.Setup

Methods

showsPrec :: Int -> Visibility -> ShowS

show :: Visibility -> String #

showList :: [Visibility] -> ShowS

Show PackageLog 
Instance details

Defined in Distribution.Simple.Test.Log

Methods

showsPrec :: Int -> PackageLog -> ShowS

show :: PackageLog -> String #

showList :: [PackageLog] -> ShowS

Show TestLogs 
Instance details

Defined in Distribution.Simple.Test.Log

Methods

showsPrec :: Int -> TestLogs -> ShowS

show :: TestLogs -> String #

showList :: [TestLogs] -> ShowS

Show TestSuiteLog 
Instance details

Defined in Distribution.Simple.Test.Log

Methods

showsPrec :: Int -> TestSuiteLog -> ShowS

show :: TestSuiteLog -> String #

showList :: [TestSuiteLog] -> ShowS

Show OptionDescr 
Instance details

Defined in Distribution.TestSuite

Methods

showsPrec :: Int -> OptionDescr -> ShowS

show :: OptionDescr -> String #

showList :: [OptionDescr] -> ShowS

Show OptionType 
Instance details

Defined in Distribution.TestSuite

Methods

showsPrec :: Int -> OptionType -> ShowS

show :: OptionType -> String #

showList :: [OptionType] -> ShowS

Show Result 
Instance details

Defined in Distribution.TestSuite

Methods

showsPrec :: Int -> Result -> ShowS

show :: Result -> String #

showList :: [Result] -> ShowS

Show ComponentLocalBuildInfo 
Instance details

Defined in Distribution.Types.ComponentLocalBuildInfo

Methods

showsPrec :: Int -> ComponentLocalBuildInfo -> ShowS

show :: ComponentLocalBuildInfo -> String #

showList :: [ComponentLocalBuildInfo] -> ShowS

Show DumpBuildInfo 
Instance details

Defined in Distribution.Types.DumpBuildInfo

Methods

showsPrec :: Int -> DumpBuildInfo -> ShowS

show :: DumpBuildInfo -> String #

showList :: [DumpBuildInfo] -> ShowS

Show GivenComponent 
Instance details

Defined in Distribution.Types.GivenComponent

Methods

showsPrec :: Int -> GivenComponent -> ShowS

show :: GivenComponent -> String #

showList :: [GivenComponent] -> ShowS

Show LocalBuildInfo 
Instance details

Defined in Distribution.Types.LocalBuildInfo

Methods

showsPrec :: Int -> LocalBuildInfo -> ShowS

show :: LocalBuildInfo -> String #

showList :: [LocalBuildInfo] -> ShowS

Show Json 
Instance details

Defined in Distribution.Utils.Json

Methods

showsPrec :: Int -> Json -> ShowS

show :: Json -> String #

showList :: [Json] -> ShowS

Show Verbosity 
Instance details

Defined in Distribution.Verbosity

Methods

showsPrec :: Int -> Verbosity -> ShowS

show :: Verbosity -> String #

showList :: [Verbosity] -> ShowS

Show VerbosityFlag 
Instance details

Defined in Distribution.Verbosity.Internal

Methods

showsPrec :: Int -> VerbosityFlag -> ShowS

show :: VerbosityFlag -> String #

showList :: [VerbosityFlag] -> ShowS

Show VerbosityLevel 
Instance details

Defined in Distribution.Verbosity.Internal

Methods

showsPrec :: Int -> VerbosityLevel -> ShowS

show :: VerbosityLevel -> String #

showList :: [VerbosityLevel] -> ShowS

Show OpenModule 
Instance details

Defined in Distribution.Backpack

Methods

showsPrec :: Int -> OpenModule -> ShowS

show :: OpenModule -> String #

showList :: [OpenModule] -> ShowS

Show OpenUnitId 
Instance details

Defined in Distribution.Backpack

Methods

showsPrec :: Int -> OpenUnitId -> ShowS

show :: OpenUnitId -> String #

showList :: [OpenUnitId] -> ShowS

Show CabalSpecVersion 
Instance details

Defined in Distribution.CabalSpecVersion

Methods

showsPrec :: Int -> CabalSpecVersion -> ShowS

show :: CabalSpecVersion -> String #

showList :: [CabalSpecVersion] -> ShowS

Show HasCommonStanzas 
Instance details

Defined in Distribution.CabalSpecVersion

Methods

showsPrec :: Int -> HasCommonStanzas -> ShowS

show :: HasCommonStanzas -> String #

showList :: [HasCommonStanzas] -> ShowS

Show HasElif 
Instance details

Defined in Distribution.CabalSpecVersion

Methods

showsPrec :: Int -> HasElif -> ShowS

show :: HasElif -> String #

showList :: [HasElif] -> ShowS

Show AbiTag 
Instance details

Defined in Distribution.Compiler

Methods

showsPrec :: Int -> AbiTag -> ShowS

show :: AbiTag -> String #

showList :: [AbiTag] -> ShowS

Show CompilerFlavor 
Instance details

Defined in Distribution.Compiler

Methods

showsPrec :: Int -> CompilerFlavor -> ShowS

show :: CompilerFlavor -> String #

showList :: [CompilerFlavor] -> ShowS

Show CompilerId 
Instance details

Defined in Distribution.Compiler

Methods

showsPrec :: Int -> CompilerId -> ShowS

show :: CompilerId -> String #

showList :: [CompilerId] -> ShowS

Show CompilerInfo 
Instance details

Defined in Distribution.Compiler

Methods

showsPrec :: Int -> CompilerInfo -> ShowS

show :: CompilerInfo -> String #

showList :: [CompilerInfo] -> ShowS

Show SpecLicense 
Instance details

Defined in Distribution.FieldGrammar.Newtypes

Methods

showsPrec :: Int -> SpecLicense -> ShowS

show :: SpecLicense -> String #

showList :: [SpecLicense] -> ShowS

Show SpecVersion 
Instance details

Defined in Distribution.FieldGrammar.Newtypes

Methods

showsPrec :: Int -> SpecVersion -> ShowS

show :: SpecVersion -> String #

showList :: [SpecVersion] -> ShowS

Show LToken 
Instance details

Defined in Distribution.Fields.Lexer

Methods

showsPrec :: Int -> LToken -> ShowS

show :: LToken -> String #

showList :: [LToken] -> ShowS

Show Token 
Instance details

Defined in Distribution.Fields.Lexer

Methods

showsPrec :: Int -> Token -> ShowS

show :: Token -> String #

showList :: [Token] -> ShowS

Show LexWarning 
Instance details

Defined in Distribution.Fields.LexerMonad

Methods

showsPrec :: Int -> LexWarning -> ShowS

show :: LexWarning -> String #

showList :: [LexWarning] -> ShowS

Show LexWarningType 
Instance details

Defined in Distribution.Fields.LexerMonad

Methods

showsPrec :: Int -> LexWarningType -> ShowS

show :: LexWarningType -> String #

showList :: [LexWarningType] -> ShowS

Show License 
Instance details

Defined in Distribution.License

Methods

showsPrec :: Int -> License -> ShowS

show :: License -> String #

showList :: [License] -> ShowS

Show ModuleName 
Instance details

Defined in Distribution.ModuleName

Methods

showsPrec :: Int -> ModuleName -> ShowS

show :: ModuleName -> String #

showList :: [ModuleName] -> ShowS

Show PDTagged 
Instance details

Defined in Distribution.PackageDescription.Configuration

Methods

showsPrec :: Int -> PDTagged -> ShowS

show :: PDTagged -> String #

showList :: [PDTagged] -> ShowS

Show Syntax 
Instance details

Defined in Distribution.PackageDescription.Parsec

Methods

showsPrec :: Int -> Syntax -> ShowS

show :: Syntax -> String #

showList :: [Syntax] -> ShowS

Show PError 
Instance details

Defined in Distribution.Parsec.Error

Methods

showsPrec :: Int -> PError -> ShowS

show :: PError -> String #

showList :: [PError] -> ShowS

Show FieldLineStream 
Instance details

Defined in Distribution.Parsec.FieldLineStream

Methods

showsPrec :: Int -> FieldLineStream -> ShowS

show :: FieldLineStream -> String #

showList :: [FieldLineStream] -> ShowS

Show Position 
Instance details

Defined in Distribution.Parsec.Position

Methods

showsPrec :: Int -> Position -> ShowS

show :: Position -> String #

showList :: [Position] -> ShowS

Show PWarnType 
Instance details

Defined in Distribution.Parsec.Warning

Methods

showsPrec :: Int -> PWarnType -> ShowS

show :: PWarnType -> String #

showList :: [PWarnType] -> ShowS

Show PWarning 
Instance details

Defined in Distribution.Parsec.Warning

Methods

showsPrec :: Int -> PWarning -> ShowS

show :: PWarning -> String #

showList :: [PWarning] -> ShowS

Show License 
Instance details

Defined in Distribution.SPDX.License

Methods

showsPrec :: Int -> License -> ShowS

show :: License -> String #

showList :: [License] -> ShowS

Show LicenseExceptionId 
Instance details

Defined in Distribution.SPDX.LicenseExceptionId

Methods

showsPrec :: Int -> LicenseExceptionId -> ShowS

show :: LicenseExceptionId -> String #

showList :: [LicenseExceptionId] -> ShowS

Show LicenseExpression 
Instance details

Defined in Distribution.SPDX.LicenseExpression

Methods

showsPrec :: Int -> LicenseExpression -> ShowS

show :: LicenseExpression -> String #

showList :: [LicenseExpression] -> ShowS

Show SimpleLicenseExpression 
Instance details

Defined in Distribution.SPDX.LicenseExpression

Methods

showsPrec :: Int -> SimpleLicenseExpression -> ShowS

show :: SimpleLicenseExpression -> String #

showList :: [SimpleLicenseExpression] -> ShowS

Show LicenseId 
Instance details

Defined in Distribution.SPDX.LicenseId

Methods

showsPrec :: Int -> LicenseId -> ShowS

show :: LicenseId -> String #

showList :: [LicenseId] -> ShowS

Show LicenseListVersion 
Instance details

Defined in Distribution.SPDX.LicenseListVersion

Methods

showsPrec :: Int -> LicenseListVersion -> ShowS

show :: LicenseListVersion -> String #

showList :: [LicenseListVersion] -> ShowS

Show LicenseRef 
Instance details

Defined in Distribution.SPDX.LicenseReference

Methods

showsPrec :: Int -> LicenseRef -> ShowS

show :: LicenseRef -> String #

showList :: [LicenseRef] -> ShowS

Show Arch 
Instance details

Defined in Distribution.System

Methods

showsPrec :: Int -> Arch -> ShowS

show :: Arch -> String #

showList :: [Arch] -> ShowS

Show OS 
Instance details

Defined in Distribution.System

Methods

showsPrec :: Int -> OS -> ShowS

show :: OS -> String #

showList :: [OS] -> ShowS

Show Platform 
Instance details

Defined in Distribution.System

Methods

showsPrec :: Int -> Platform -> ShowS

show :: Platform -> String #

showList :: [Platform] -> ShowS

Show AbiDependency 
Instance details

Defined in Distribution.Types.AbiDependency

Methods

showsPrec :: Int -> AbiDependency -> ShowS

show :: AbiDependency -> String #

showList :: [AbiDependency] -> ShowS

Show AbiHash 
Instance details

Defined in Distribution.Types.AbiHash

Methods

showsPrec :: Int -> AbiHash -> ShowS

show :: AbiHash -> String #

showList :: [AbiHash] -> ShowS

Show Benchmark 
Instance details

Defined in Distribution.Types.Benchmark

Methods

showsPrec :: Int -> Benchmark -> ShowS

show :: Benchmark -> String #

showList :: [Benchmark] -> ShowS

Show BenchmarkInterface 
Instance details

Defined in Distribution.Types.BenchmarkInterface

Methods

showsPrec :: Int -> BenchmarkInterface -> ShowS

show :: BenchmarkInterface -> String #

showList :: [BenchmarkInterface] -> ShowS

Show BenchmarkType 
Instance details

Defined in Distribution.Types.BenchmarkType

Methods

showsPrec :: Int -> BenchmarkType -> ShowS

show :: BenchmarkType -> String #

showList :: [BenchmarkType] -> ShowS

Show BuildInfo 
Instance details

Defined in Distribution.Types.BuildInfo

Methods

showsPrec :: Int -> BuildInfo -> ShowS

show :: BuildInfo -> String #

showList :: [BuildInfo] -> ShowS

Show BuildType 
Instance details

Defined in Distribution.Types.BuildType

Methods

showsPrec :: Int -> BuildType -> ShowS

show :: BuildType -> String #

showList :: [BuildType] -> ShowS

Show Component 
Instance details

Defined in Distribution.Types.Component

Methods

showsPrec :: Int -> Component -> ShowS

show :: Component -> String #

showList :: [Component] -> ShowS

Show ComponentId 
Instance details

Defined in Distribution.Types.ComponentId

Methods

showsPrec :: Int -> ComponentId -> ShowS

show :: ComponentId -> String #

showList :: [ComponentId] -> ShowS

Show ComponentName 
Instance details

Defined in Distribution.Types.ComponentName

Methods

showsPrec :: Int -> ComponentName -> ShowS

show :: ComponentName -> String #

showList :: [ComponentName] -> ShowS

Show NotLibComponentName 
Instance details

Defined in Distribution.Types.ComponentName

Methods

showsPrec :: Int -> NotLibComponentName -> ShowS

show :: NotLibComponentName -> String #

showList :: [NotLibComponentName] -> ShowS

Show ComponentRequestedSpec 
Instance details

Defined in Distribution.Types.ComponentRequestedSpec

Methods

showsPrec :: Int -> ComponentRequestedSpec -> ShowS

show :: ComponentRequestedSpec -> String #

showList :: [ComponentRequestedSpec] -> ShowS

Show ConfVar 
Instance details

Defined in Distribution.Types.ConfVar

Methods

showsPrec :: Int -> ConfVar -> ShowS

show :: ConfVar -> String #

showList :: [ConfVar] -> ShowS

Show Dependency 
Instance details

Defined in Distribution.Types.Dependency

Methods

showsPrec :: Int -> Dependency -> ShowS

show :: Dependency -> String #

showList :: [Dependency] -> ShowS

Show DependencyMap 
Instance details

Defined in Distribution.Types.DependencyMap

Methods

showsPrec :: Int -> DependencyMap -> ShowS

show :: DependencyMap -> String #

showList :: [DependencyMap] -> ShowS

Show ExeDependency 
Instance details

Defined in Distribution.Types.ExeDependency

Methods

showsPrec :: Int -> ExeDependency -> ShowS

show :: ExeDependency -> String #

showList :: [ExeDependency] -> ShowS

Show Executable 
Instance details

Defined in Distribution.Types.Executable

Methods

showsPrec :: Int -> Executable -> ShowS

show :: Executable -> String #

showList :: [Executable] -> ShowS

Show ExecutableScope 
Instance details

Defined in Distribution.Types.ExecutableScope

Methods

showsPrec :: Int -> ExecutableScope -> ShowS

show :: ExecutableScope -> String #

showList :: [ExecutableScope] -> ShowS

Show ExposedModule 
Instance details

Defined in Distribution.Types.ExposedModule

Methods

showsPrec :: Int -> ExposedModule -> ShowS

show :: ExposedModule -> String #

showList :: [ExposedModule] -> ShowS

Show FlagAssignment 
Instance details

Defined in Distribution.Types.Flag

Methods

showsPrec :: Int -> FlagAssignment -> ShowS

show :: FlagAssignment -> String #

showList :: [FlagAssignment] -> ShowS

Show FlagName 
Instance details

Defined in Distribution.Types.Flag

Methods

showsPrec :: Int -> FlagName -> ShowS

show :: FlagName -> String #

showList :: [FlagName] -> ShowS

Show PackageFlag 
Instance details

Defined in Distribution.Types.Flag

Methods

showsPrec :: Int -> PackageFlag -> ShowS

show :: PackageFlag -> String #

showList :: [PackageFlag] -> ShowS

Show ForeignLib 
Instance details

Defined in Distribution.Types.ForeignLib

Methods

showsPrec :: Int -> ForeignLib -> ShowS

show :: ForeignLib -> String #

showList :: [ForeignLib] -> ShowS

Show LibVersionInfo 
Instance details

Defined in Distribution.Types.ForeignLib

Methods

showsPrec :: Int -> LibVersionInfo -> ShowS

show :: LibVersionInfo -> String #

showList :: [LibVersionInfo] -> ShowS

Show ForeignLibOption 
Instance details

Defined in Distribution.Types.ForeignLibOption

Methods

showsPrec :: Int -> ForeignLibOption -> ShowS

show :: ForeignLibOption -> String #

showList :: [ForeignLibOption] -> ShowS

Show ForeignLibType 
Instance details

Defined in Distribution.Types.ForeignLibType

Methods

showsPrec :: Int -> ForeignLibType -> ShowS

show :: ForeignLibType -> String #

showList :: [ForeignLibType] -> ShowS

Show GenericPackageDescription 
Instance details

Defined in Distribution.Types.GenericPackageDescription

Methods

showsPrec :: Int -> GenericPackageDescription -> ShowS

show :: GenericPackageDescription -> String #

showList :: [GenericPackageDescription] -> ShowS

Show IncludeRenaming 
Instance details

Defined in Distribution.Types.IncludeRenaming

Methods

showsPrec :: Int -> IncludeRenaming -> ShowS

show :: IncludeRenaming -> String #

showList :: [IncludeRenaming] -> ShowS

Show InstalledPackageInfo 
Instance details

Defined in Distribution.Types.InstalledPackageInfo

Methods

showsPrec :: Int -> InstalledPackageInfo -> ShowS

show :: InstalledPackageInfo -> String #

showList :: [InstalledPackageInfo] -> ShowS

Show LegacyExeDependency 
Instance details

Defined in Distribution.Types.LegacyExeDependency

Methods

showsPrec :: Int -> LegacyExeDependency -> ShowS

show :: LegacyExeDependency -> String #

showList :: [LegacyExeDependency] -> ShowS

Show Library 
Instance details

Defined in Distribution.Types.Library

Methods

showsPrec :: Int -> Library -> ShowS

show :: Library -> String #

showList :: [Library] -> ShowS

Show LibraryName 
Instance details

Defined in Distribution.Types.LibraryName

Methods

showsPrec :: Int -> LibraryName -> ShowS

show :: LibraryName -> String #

showList :: [LibraryName] -> ShowS

Show LibraryVisibility 
Instance details

Defined in Distribution.Types.LibraryVisibility

Methods

showsPrec :: Int -> LibraryVisibility -> ShowS

show :: LibraryVisibility -> String #

showList :: [LibraryVisibility] -> ShowS

Show Mixin 
Instance details

Defined in Distribution.Types.Mixin

Methods

showsPrec :: Int -> Mixin -> ShowS

show :: Mixin -> String #

showList :: [Mixin] -> ShowS

Show Module 
Instance details

Defined in Distribution.Types.Module

Methods

showsPrec :: Int -> Module -> ShowS

show :: Module -> String #

showList :: [Module] -> ShowS

Show ModuleReexport 
Instance details

Defined in Distribution.Types.ModuleReexport

Methods

showsPrec :: Int -> ModuleReexport -> ShowS

show :: ModuleReexport -> String #

showList :: [ModuleReexport] -> ShowS

Show ModuleRenaming 
Instance details

Defined in Distribution.Types.ModuleRenaming

Methods

showsPrec :: Int -> ModuleRenaming -> ShowS

show :: ModuleRenaming -> String #

showList :: [ModuleRenaming] -> ShowS

Show MungedPackageId 
Instance details

Defined in Distribution.Types.MungedPackageId

Show MungedPackageName 
Instance details

Defined in Distribution.Types.MungedPackageName

Show PackageDescription 
Instance details

Defined in Distribution.Types.PackageDescription

Methods

showsPrec :: Int -> PackageDescription -> ShowS

show :: PackageDescription -> String #

showList :: [PackageDescription] -> ShowS

Show PackageIdentifier 
Instance details

Defined in Distribution.Types.PackageId

Show PackageName 
Instance details

Defined in Distribution.Types.PackageName

Methods

showsPrec :: Int -> PackageName -> ShowS

show :: PackageName -> String #

showList :: [PackageName] -> ShowS

Show PackageVersionConstraint 
Instance details

Defined in Distribution.Types.PackageVersionConstraint

Methods

showsPrec :: Int -> PackageVersionConstraint -> ShowS

show :: PackageVersionConstraint -> String #

showList :: [PackageVersionConstraint] -> ShowS

Show PkgconfigDependency 
Instance details

Defined in Distribution.Types.PkgconfigDependency

Methods

showsPrec :: Int -> PkgconfigDependency -> ShowS

show :: PkgconfigDependency -> String #

showList :: [PkgconfigDependency] -> ShowS

Show PkgconfigName 
Instance details

Defined in Distribution.Types.PkgconfigName

Methods

showsPrec :: Int -> PkgconfigName -> ShowS

show :: PkgconfigName -> String #

showList :: [PkgconfigName] -> ShowS

Show PkgconfigVersion 
Instance details

Defined in Distribution.Types.PkgconfigVersion

Methods

showsPrec :: Int -> PkgconfigVersion -> ShowS

show :: PkgconfigVersion -> String #

showList :: [PkgconfigVersion] -> ShowS

Show PkgconfigVersionRange 
Instance details

Defined in Distribution.Types.PkgconfigVersionRange

Methods

showsPrec :: Int -> PkgconfigVersionRange -> ShowS

show :: PkgconfigVersionRange -> String #

showList :: [PkgconfigVersionRange] -> ShowS

Show SetupBuildInfo 
Instance details

Defined in Distribution.Types.SetupBuildInfo

Methods

showsPrec :: Int -> SetupBuildInfo -> ShowS

show :: SetupBuildInfo -> String #

showList :: [SetupBuildInfo] -> ShowS

Show KnownRepoType 
Instance details

Defined in Distribution.Types.SourceRepo

Methods

showsPrec :: Int -> KnownRepoType -> ShowS

show :: KnownRepoType -> String #

showList :: [KnownRepoType] -> ShowS

Show RepoKind 
Instance details

Defined in Distribution.Types.SourceRepo

Methods

showsPrec :: Int -> RepoKind -> ShowS

show :: RepoKind -> String #

showList :: [RepoKind] -> ShowS

Show RepoType 
Instance details

Defined in Distribution.Types.SourceRepo

Methods

showsPrec :: Int -> RepoType -> ShowS

show :: RepoType -> String #

showList :: [RepoType] -> ShowS

Show SourceRepo 
Instance details

Defined in Distribution.Types.SourceRepo

Methods

showsPrec :: Int -> SourceRepo -> ShowS

show :: SourceRepo -> String #

showList :: [SourceRepo] -> ShowS

Show TestSuite 
Instance details

Defined in Distribution.Types.TestSuite

Methods

showsPrec :: Int -> TestSuite -> ShowS

show :: TestSuite -> String #

showList :: [TestSuite] -> ShowS

Show TestSuiteInterface 
Instance details

Defined in Distribution.Types.TestSuiteInterface

Methods

showsPrec :: Int -> TestSuiteInterface -> ShowS

show :: TestSuiteInterface -> String #

showList :: [TestSuiteInterface] -> ShowS

Show TestType 
Instance details

Defined in Distribution.Types.TestType

Methods

showsPrec :: Int -> TestType -> ShowS

show :: TestType -> String #

showList :: [TestType] -> ShowS

Show DefUnitId 
Instance details

Defined in Distribution.Types.UnitId

Methods

showsPrec :: Int -> DefUnitId -> ShowS

show :: DefUnitId -> String #

showList :: [DefUnitId] -> ShowS

Show UnitId 
Instance details

Defined in Distribution.Types.UnitId

Methods

showsPrec :: Int -> UnitId -> ShowS

show :: UnitId -> String #

showList :: [UnitId] -> ShowS

Show UnqualComponentName 
Instance details

Defined in Distribution.Types.UnqualComponentName

Methods

showsPrec :: Int -> UnqualComponentName -> ShowS

show :: UnqualComponentName -> String #

showList :: [UnqualComponentName] -> ShowS

Show Version 
Instance details

Defined in Distribution.Types.Version

Methods

showsPrec :: Int -> Version -> ShowS

show :: Version -> String #

showList :: [Version] -> ShowS

Show Bound 
Instance details

Defined in Distribution.Types.VersionInterval

Methods

showsPrec :: Int -> Bound -> ShowS

show :: Bound -> String #

showList :: [Bound] -> ShowS

Show LowerBound 
Instance details

Defined in Distribution.Types.VersionInterval

Methods

showsPrec :: Int -> LowerBound -> ShowS

show :: LowerBound -> String #

showList :: [LowerBound] -> ShowS

Show UpperBound 
Instance details

Defined in Distribution.Types.VersionInterval

Methods

showsPrec :: Int -> UpperBound -> ShowS

show :: UpperBound -> String #

showList :: [UpperBound] -> ShowS

Show VersionInterval 
Instance details

Defined in Distribution.Types.VersionInterval

Methods

showsPrec :: Int -> VersionInterval -> ShowS

show :: VersionInterval -> String #

showList :: [VersionInterval] -> ShowS

Show VersionIntervals 
Instance details

Defined in Distribution.Types.VersionInterval

Methods

showsPrec :: Int -> VersionIntervals -> ShowS

show :: VersionIntervals -> String #

showList :: [VersionIntervals] -> ShowS

Show Bound 
Instance details

Defined in Distribution.Types.VersionInterval.Legacy

Methods

showsPrec :: Int -> Bound -> ShowS

show :: Bound -> String #

showList :: [Bound] -> ShowS

Show LowerBound 
Instance details

Defined in Distribution.Types.VersionInterval.Legacy

Methods

showsPrec :: Int -> LowerBound -> ShowS

show :: LowerBound -> String #

showList :: [LowerBound] -> ShowS

Show UpperBound 
Instance details

Defined in Distribution.Types.VersionInterval.Legacy

Methods

showsPrec :: Int -> UpperBound -> ShowS

show :: UpperBound -> String #

showList :: [UpperBound] -> ShowS

Show VersionIntervals 
Instance details

Defined in Distribution.Types.VersionInterval.Legacy

Methods

showsPrec :: Int -> VersionIntervals -> ShowS

show :: VersionIntervals -> String #

showList :: [VersionIntervals] -> ShowS

Show VersionRange 
Instance details

Defined in Distribution.Types.VersionRange.Internal

Methods

showsPrec :: Int -> VersionRange -> ShowS

show :: VersionRange -> String #

showList :: [VersionRange] -> ShowS

Show ShortText 
Instance details

Defined in Distribution.Utils.ShortText

Methods

showsPrec :: Int -> ShortText -> ShowS

show :: ShortText -> String #

showList :: [ShortText] -> ShowS

Show Structure 
Instance details

Defined in Distribution.Utils.Structured

Methods

showsPrec :: Int -> Structure -> ShowS

show :: Structure -> String #

showList :: [Structure] -> ShowS

Show Extension 
Instance details

Defined in Language.Haskell.Extension

Methods

showsPrec :: Int -> Extension -> ShowS

show :: Extension -> String #

showList :: [Extension] -> ShowS

Show KnownExtension 
Instance details

Defined in Language.Haskell.Extension

Methods

showsPrec :: Int -> KnownExtension -> ShowS

show :: KnownExtension -> String #

showList :: [KnownExtension] -> ShowS

Show Language 
Instance details

Defined in Language.Haskell.Extension

Methods

showsPrec :: Int -> Language -> ShowS

show :: Language -> String #

showList :: [Language] -> ShowS

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

Methods

showsPrec :: Int -> Number -> ShowS

show :: Number -> String #

showList :: [Number] -> ShowS

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

Methods

showsPrec :: Int -> AesonException -> ShowS

show :: AesonException -> String #

showList :: [AesonException] -> ShowS

Show DotNetTime 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

showsPrec :: Int -> DotNetTime -> ShowS

show :: DotNetTime -> String #

showList :: [DotNetTime] -> ShowS

Show JSONPathElement 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

showsPrec :: Int -> JSONPathElement -> ShowS

show :: JSONPathElement -> String #

showList :: [JSONPathElement] -> ShowS

Show Options 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

showsPrec :: Int -> Options -> ShowS

show :: Options -> String #

showList :: [Options] -> ShowS

Show SumEncoding 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

showsPrec :: Int -> SumEncoding -> ShowS

show :: SumEncoding -> String #

showList :: [SumEncoding] -> ShowS

Show Value 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

showsPrec :: Int -> Value -> ShowS

show :: Value -> String #

showList :: [Value] -> ShowS

Show JSONWarning 
Instance details

Defined in Data.Aeson.WarningParser

Methods

showsPrec :: Int -> JSONWarning -> ShowS

show :: JSONWarning -> String #

showList :: [JSONWarning] -> ShowS

Show BlinkSpeed 
Instance details

Defined in System.Console.ANSI.Types

Methods

showsPrec :: Int -> BlinkSpeed -> ShowS

show :: BlinkSpeed -> String #

showList :: [BlinkSpeed] -> ShowS

Show Color 
Instance details

Defined in System.Console.ANSI.Types

Methods

showsPrec :: Int -> Color -> ShowS

show :: Color -> String #

showList :: [Color] -> ShowS

Show ColorIntensity 
Instance details

Defined in System.Console.ANSI.Types

Methods

showsPrec :: Int -> ColorIntensity -> ShowS

show :: ColorIntensity -> String #

showList :: [ColorIntensity] -> ShowS

Show ConsoleIntensity 
Instance details

Defined in System.Console.ANSI.Types

Methods

showsPrec :: Int -> ConsoleIntensity -> ShowS

show :: ConsoleIntensity -> String #

showList :: [ConsoleIntensity] -> ShowS

Show ConsoleLayer 
Instance details

Defined in System.Console.ANSI.Types

Methods

showsPrec :: Int -> ConsoleLayer -> ShowS

show :: ConsoleLayer -> String #

showList :: [ConsoleLayer] -> ShowS

Show SGR 
Instance details

Defined in System.Console.ANSI.Types

Methods

showsPrec :: Int -> SGR -> ShowS

show :: SGR -> String #

showList :: [SGR] -> ShowS

Show Underlining 
Instance details

Defined in System.Console.ANSI.Types

Methods

showsPrec :: Int -> Underlining -> ShowS

show :: Underlining -> String #

showList :: [Underlining] -> ShowS

Show AsyncCancelled 
Instance details

Defined in Control.Concurrent.Async.Internal

Show ExceptionInLinkedThread 
Instance details

Defined in Control.Concurrent.Async.Internal

Methods

showsPrec :: Int -> ExceptionInLinkedThread -> ShowS

show :: ExceptionInLinkedThread -> String #

showList :: [ExceptionInLinkedThread] -> ShowS

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 Number 
Instance details

Defined in Data.Attoparsec.Number

Methods

showsPrec :: Int -> Number -> ShowS

show :: Number -> String #

showList :: [Number] -> ShowS

Show NestedAtomically 
Instance details

Defined in Control.Exception.Base

Methods

showsPrec :: Int -> NestedAtomically -> ShowS

show :: NestedAtomically -> String #

showList :: [NestedAtomically] -> ShowS

Show NoMatchingContinuationPrompt 
Instance details

Defined in Control.Exception.Base

Methods

showsPrec :: Int -> NoMatchingContinuationPrompt -> ShowS

show :: NoMatchingContinuationPrompt -> String #

showList :: [NoMatchingContinuationPrompt] -> ShowS

Show NoMethodError 
Instance details

Defined in Control.Exception.Base

Methods

showsPrec :: Int -> NoMethodError -> ShowS

show :: NoMethodError -> String #

showList :: [NoMethodError] -> ShowS

Show NonTermination 
Instance details

Defined in Control.Exception.Base

Methods

showsPrec :: Int -> NonTermination -> ShowS

show :: NonTermination -> String #

showList :: [NonTermination] -> ShowS

Show PatternMatchFail 
Instance details

Defined in Control.Exception.Base

Methods

showsPrec :: Int -> PatternMatchFail -> ShowS

show :: PatternMatchFail -> String #

showList :: [PatternMatchFail] -> ShowS

Show RecConError 
Instance details

Defined in Control.Exception.Base

Methods

showsPrec :: Int -> RecConError -> ShowS

show :: RecConError -> String #

showList :: [RecConError] -> ShowS

Show RecSelError 
Instance details

Defined in Control.Exception.Base

Methods

showsPrec :: Int -> RecSelError -> ShowS

show :: RecSelError -> String #

showList :: [RecSelError] -> ShowS

Show RecUpdError 
Instance details

Defined in Control.Exception.Base

Methods

showsPrec :: Int -> RecUpdError -> ShowS

show :: RecUpdError -> String #

showList :: [RecUpdError] -> ShowS

Show TypeError 
Instance details

Defined in Control.Exception.Base

Methods

showsPrec :: Int -> TypeError -> ShowS

show :: TypeError -> String #

showList :: [TypeError] -> ShowS

Show ByteArray 
Instance details

Defined in Data.Array.Byte

Methods

showsPrec :: Int -> ByteArray -> ShowS

show :: ByteArray -> String #

showList :: [ByteArray] -> ShowS

Show Constr 
Instance details

Defined in Data.Data

Methods

showsPrec :: Int -> Constr -> ShowS

show :: Constr -> String #

showList :: [Constr] -> ShowS

Show ConstrRep 
Instance details

Defined in Data.Data

Methods

showsPrec :: Int -> ConstrRep -> ShowS

show :: ConstrRep -> String #

showList :: [ConstrRep] -> ShowS

Show DataRep 
Instance details

Defined in Data.Data

Methods

showsPrec :: Int -> DataRep -> ShowS

show :: DataRep -> String #

showList :: [DataRep] -> ShowS

Show DataType 
Instance details

Defined in Data.Data

Methods

showsPrec :: Int -> DataType -> ShowS

show :: DataType -> String #

showList :: [DataType] -> ShowS

Show Fixity 
Instance details

Defined in Data.Data

Methods

showsPrec :: Int -> Fixity -> ShowS

show :: Fixity -> String #

showList :: [Fixity] -> ShowS

Show Dynamic 
Instance details

Defined in Data.Dynamic

Methods

showsPrec :: Int -> Dynamic -> ShowS

show :: Dynamic -> String #

showList :: [Dynamic] -> ShowS

Show All 
Instance details

Defined in Data.Semigroup.Internal

Methods

showsPrec :: Int -> All -> ShowS

show :: All -> String #

showList :: [All] -> ShowS

Show Any 
Instance details

Defined in Data.Semigroup.Internal

Methods

showsPrec :: Int -> Any -> ShowS

show :: Any -> String #

showList :: [Any] -> ShowS

Show SomeTypeRep 
Instance details

Defined in Data.Typeable.Internal

Methods

showsPrec :: Int -> SomeTypeRep -> ShowS

show :: SomeTypeRep -> String #

showList :: [SomeTypeRep] -> ShowS

Show Version 
Instance details

Defined in Data.Version

Methods

showsPrec :: Int -> Version -> ShowS

show :: Version -> String #

showList :: [Version] -> ShowS

Show CBool 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CBool -> ShowS

show :: CBool -> String #

showList :: [CBool] -> ShowS

Show CChar 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CChar -> ShowS

show :: CChar -> String #

showList :: [CChar] -> ShowS

Show CClock 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CClock -> ShowS

show :: CClock -> String #

showList :: [CClock] -> ShowS

Show CDouble 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CDouble -> ShowS

show :: CDouble -> String #

showList :: [CDouble] -> ShowS

Show CFloat 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CFloat -> ShowS

show :: CFloat -> String #

showList :: [CFloat] -> ShowS

Show CInt 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CInt -> ShowS

show :: CInt -> String #

showList :: [CInt] -> ShowS

Show CIntMax 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CIntMax -> ShowS

show :: CIntMax -> String #

showList :: [CIntMax] -> ShowS

Show CIntPtr 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CIntPtr -> ShowS

show :: CIntPtr -> String #

showList :: [CIntPtr] -> ShowS

Show CLLong 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CLLong -> ShowS

show :: CLLong -> String #

showList :: [CLLong] -> ShowS

Show CLong 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CLong -> ShowS

show :: CLong -> String #

showList :: [CLong] -> ShowS

Show CPtrdiff 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CPtrdiff -> ShowS

show :: CPtrdiff -> String #

showList :: [CPtrdiff] -> ShowS

Show CSChar 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CSChar -> ShowS

show :: CSChar -> String #

showList :: [CSChar] -> ShowS

Show CSUSeconds 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CSUSeconds -> ShowS

show :: CSUSeconds -> String #

showList :: [CSUSeconds] -> ShowS

Show CShort 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CShort -> ShowS

show :: CShort -> String #

showList :: [CShort] -> ShowS

Show CSigAtomic 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CSigAtomic -> ShowS

show :: CSigAtomic -> String #

showList :: [CSigAtomic] -> ShowS

Show CSize 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CSize -> ShowS

show :: CSize -> String #

showList :: [CSize] -> ShowS

Show CTime 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CTime -> ShowS

show :: CTime -> String #

showList :: [CTime] -> ShowS

Show CUChar 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CUChar -> ShowS

show :: CUChar -> String #

showList :: [CUChar] -> ShowS

Show CUInt 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CUInt -> ShowS

show :: CUInt -> String #

showList :: [CUInt] -> ShowS

Show CUIntMax 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CUIntMax -> ShowS

show :: CUIntMax -> String #

showList :: [CUIntMax] -> ShowS

Show CUIntPtr 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CUIntPtr -> ShowS

show :: CUIntPtr -> String #

showList :: [CUIntPtr] -> ShowS

Show CULLong 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CULLong -> ShowS

show :: CULLong -> String #

showList :: [CULLong] -> ShowS

Show CULong 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CULong -> ShowS

show :: CULong -> String #

showList :: [CULong] -> ShowS

Show CUSeconds 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CUSeconds -> ShowS

show :: CUSeconds -> String #

showList :: [CUSeconds] -> ShowS

Show CUShort 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CUShort -> ShowS

show :: CUShort -> String #

showList :: [CUShort] -> ShowS

Show CWchar 
Instance details

Defined in Foreign.C.Types

Methods

showsPrec :: Int -> CWchar -> ShowS

show :: CWchar -> String #

showList :: [CWchar] -> ShowS

Show IntPtr 
Instance details

Defined in Foreign.Ptr

Methods

showsPrec :: Int -> IntPtr -> ShowS

show :: IntPtr -> String #

showList :: [IntPtr] -> ShowS

Show WordPtr 
Instance details

Defined in Foreign.Ptr

Methods

showsPrec :: Int -> WordPtr -> ShowS

show :: WordPtr -> String #

showList :: [WordPtr] -> ShowS

Show Void 
Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Void -> ShowS

show :: Void -> String #

showList :: [Void] -> ShowS

Show ByteOrder 
Instance details

Defined in GHC.ByteOrder

Methods

showsPrec :: Int -> ByteOrder -> ShowS

show :: ByteOrder -> String #

showList :: [ByteOrder] -> ShowS

Show BlockReason 
Instance details

Defined in GHC.Conc.Sync

Methods

showsPrec :: Int -> BlockReason -> ShowS

show :: BlockReason -> String #

showList :: [BlockReason] -> ShowS

Show ThreadId 
Instance details

Defined in GHC.Conc.Sync

Methods

showsPrec :: Int -> ThreadId -> ShowS

show :: ThreadId -> String #

showList :: [ThreadId] -> ShowS

Show ThreadStatus 
Instance details

Defined in GHC.Conc.Sync

Methods

showsPrec :: Int -> ThreadStatus -> ShowS

show :: ThreadStatus -> String #

showList :: [ThreadStatus] -> ShowS

Show ErrorCall 
Instance details

Defined in GHC.Exception

Methods

showsPrec :: Int -> ErrorCall -> ShowS

show :: ErrorCall -> String #

showList :: [ErrorCall] -> ShowS

Show ArithException 
Instance details

Defined in GHC.Exception.Type

Methods

showsPrec :: Int -> ArithException -> ShowS

show :: ArithException -> String #

showList :: [ArithException] -> ShowS

Show SomeException 
Instance details

Defined in GHC.Exception.Type

Methods

showsPrec :: Int -> SomeException -> ShowS

show :: SomeException -> String #

showList :: [SomeException] -> ShowS

Show Fingerprint 
Instance details

Defined in GHC.Fingerprint.Type

Methods

showsPrec :: Int -> Fingerprint -> ShowS

show :: Fingerprint -> String #

showList :: [Fingerprint] -> ShowS

Show Associativity 
Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> Associativity -> ShowS

show :: Associativity -> String #

showList :: [Associativity] -> ShowS

Show DecidedStrictness 
Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> DecidedStrictness -> ShowS

show :: DecidedStrictness -> String #

showList :: [DecidedStrictness] -> ShowS

Show Fixity 
Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> Fixity -> ShowS

show :: Fixity -> String #

showList :: [Fixity] -> ShowS

Show SourceStrictness 
Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> SourceStrictness -> ShowS

show :: SourceStrictness -> String #

showList :: [SourceStrictness] -> ShowS

Show SourceUnpackedness 
Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> SourceUnpackedness -> ShowS

show :: SourceUnpackedness -> String #

showList :: [SourceUnpackedness] -> ShowS

Show MaskingState 
Instance details

Defined in GHC.IO

Methods

showsPrec :: Int -> MaskingState -> ShowS

show :: MaskingState -> String #

showList :: [MaskingState] -> ShowS

Show SeekMode 
Instance details

Defined in GHC.IO.Device

Methods

showsPrec :: Int -> SeekMode -> ShowS

show :: SeekMode -> String #

showList :: [SeekMode] -> ShowS

Show CodingFailureMode 
Instance details

Defined in GHC.IO.Encoding.Failure

Methods

showsPrec :: Int -> CodingFailureMode -> ShowS

show :: CodingFailureMode -> String #

showList :: [CodingFailureMode] -> ShowS

Show CodingProgress 
Instance details

Defined in GHC.IO.Encoding.Types

Methods

showsPrec :: Int -> CodingProgress -> ShowS

show :: CodingProgress -> String #

showList :: [CodingProgress] -> ShowS

Show TextEncoding 
Instance details

Defined in GHC.IO.Encoding.Types

Methods

showsPrec :: Int -> TextEncoding -> ShowS

show :: TextEncoding -> String #

showList :: [TextEncoding] -> ShowS

Show AllocationLimitExceeded 
Instance details

Defined in GHC.IO.Exception

Methods

showsPrec :: Int -> AllocationLimitExceeded -> ShowS

show :: AllocationLimitExceeded -> String #

showList :: [AllocationLimitExceeded] -> ShowS

Show ArrayException 
Instance details

Defined in GHC.IO.Exception

Methods

showsPrec :: Int -> ArrayException -> ShowS

show :: ArrayException -> String #

showList :: [ArrayException] -> ShowS

Show AssertionFailed 
Instance details

Defined in GHC.IO.Exception

Methods

showsPrec :: Int -> AssertionFailed -> ShowS

show :: AssertionFailed -> String #

showList :: [AssertionFailed] -> ShowS

Show AsyncException 
Instance details

Defined in GHC.IO.Exception

Methods

showsPrec :: Int -> AsyncException -> ShowS

show :: AsyncException -> String #

showList :: [AsyncException] -> ShowS

Show BlockedIndefinitelyOnMVar 
Instance details

Defined in GHC.IO.Exception

Methods

showsPrec :: Int -> BlockedIndefinitelyOnMVar -> ShowS

show :: BlockedIndefinitelyOnMVar -> String #

showList :: [BlockedIndefinitelyOnMVar] -> ShowS

Show BlockedIndefinitelyOnSTM 
Instance details

Defined in GHC.IO.Exception

Methods

showsPrec :: Int -> BlockedIndefinitelyOnSTM -> ShowS

show :: BlockedIndefinitelyOnSTM -> String #

showList :: [BlockedIndefinitelyOnSTM] -> ShowS

Show CompactionFailed 
Instance details

Defined in GHC.IO.Exception

Methods

showsPrec :: Int -> CompactionFailed -> ShowS

show :: CompactionFailed -> String #

showList :: [CompactionFailed] -> ShowS

Show Deadlock 
Instance details

Defined in GHC.IO.Exception

Methods

showsPrec :: Int -> Deadlock -> ShowS

show :: Deadlock -> String #

showList :: [Deadlock] -> ShowS

Show ExitCode 
Instance details

Defined in GHC.IO.Exception

Methods

showsPrec :: Int -> ExitCode -> ShowS

show :: ExitCode -> String #

showList :: [ExitCode] -> ShowS

Show FixIOException 
Instance details

Defined in GHC.IO.Exception

Methods

showsPrec :: Int -> FixIOException -> ShowS

show :: FixIOException -> String #

showList :: [FixIOException] -> ShowS

Show IOErrorType 
Instance details

Defined in GHC.IO.Exception

Methods

showsPrec :: Int -> IOErrorType -> ShowS

show :: IOErrorType -> String #

showList :: [IOErrorType] -> ShowS

Show IOException 
Instance details

Defined in GHC.IO.Exception

Methods

showsPrec :: Int -> IOException -> ShowS

show :: IOException -> String #

showList :: [IOException] -> ShowS

Show SomeAsyncException 
Instance details

Defined in GHC.IO.Exception

Show FD 
Instance details

Defined in GHC.IO.FD

Methods

showsPrec :: Int -> FD -> ShowS

show :: FD -> String #

showList :: [FD] -> ShowS

Show HandlePosn 
Instance details

Defined in GHC.IO.Handle

Methods

showsPrec :: Int -> HandlePosn -> ShowS

show :: HandlePosn -> String #

showList :: [HandlePosn] -> ShowS

Show BufferMode 
Instance details

Defined in GHC.IO.Handle.Types

Methods

showsPrec :: Int -> BufferMode -> ShowS

show :: BufferMode -> String #

showList :: [BufferMode] -> ShowS

Show Handle 
Instance details

Defined in GHC.IO.Handle.Types

Methods

showsPrec :: Int -> Handle -> ShowS

show :: Handle -> String #

showList :: [Handle] -> ShowS

Show HandleType 
Instance details

Defined in GHC.IO.Handle.Types

Methods

showsPrec :: Int -> HandleType -> ShowS

show :: HandleType -> String #

showList :: [HandleType] -> ShowS

Show Newline 
Instance details

Defined in GHC.IO.Handle.Types

Methods

showsPrec :: Int -> Newline -> ShowS

show :: Newline -> String #

showList :: [Newline] -> ShowS

Show NewlineMode 
Instance details

Defined in GHC.IO.Handle.Types

Methods

showsPrec :: Int -> NewlineMode -> ShowS

show :: NewlineMode -> String #

showList :: [NewlineMode] -> ShowS

Show IOMode 
Instance details

Defined in GHC.IO.IOMode

Methods

showsPrec :: Int -> IOMode -> ShowS

show :: IOMode -> String #

showList :: [IOMode] -> ShowS

Show IOPortException 
Instance details

Defined in GHC.IOPort

Methods

showsPrec :: Int -> IOPortException -> ShowS

show :: IOPortException -> String #

showList :: [IOPortException] -> ShowS

Show InfoProv 
Instance details

Defined in GHC.InfoProv

Methods

showsPrec :: Int -> InfoProv -> ShowS

show :: InfoProv -> String #

showList :: [InfoProv] -> ShowS

Show Int16 
Instance details

Defined in GHC.Int

Methods

showsPrec :: Int -> Int16 -> ShowS

show :: Int16 -> String #

showList :: [Int16] -> ShowS

Show Int32 
Instance details

Defined in GHC.Int

Methods

showsPrec :: Int -> Int32 -> ShowS

show :: Int32 -> String #

showList :: [Int32] -> ShowS

Show Int64 
Instance details

Defined in GHC.Int

Methods

showsPrec :: Int -> Int64 -> ShowS

show :: Int64 -> String #

showList :: [Int64] -> ShowS

Show Int8 
Instance details

Defined in GHC.Int

Methods

showsPrec :: Int -> Int8 -> ShowS

show :: Int8 -> String #

showList :: [Int8] -> ShowS

Show CCFlags 
Instance details

Defined in GHC.RTS.Flags

Methods

showsPrec :: Int -> CCFlags -> ShowS

show :: CCFlags -> String #

showList :: [CCFlags] -> ShowS

Show ConcFlags 
Instance details

Defined in GHC.RTS.Flags

Methods

showsPrec :: Int -> ConcFlags -> ShowS

show :: ConcFlags -> String #

showList :: [ConcFlags] -> ShowS

Show DebugFlags 
Instance details

Defined in GHC.RTS.Flags

Methods

showsPrec :: Int -> DebugFlags -> ShowS

show :: DebugFlags -> String #

showList :: [DebugFlags] -> ShowS

Show DoCostCentres 
Instance details

Defined in GHC.RTS.Flags

Methods

showsPrec :: Int -> DoCostCentres -> ShowS

show :: DoCostCentres -> String #

showList :: [DoCostCentres] -> ShowS

Show DoHeapProfile 
Instance details

Defined in GHC.RTS.Flags

Methods

showsPrec :: Int -> DoHeapProfile -> ShowS

show :: DoHeapProfile -> String #

showList :: [DoHeapProfile] -> ShowS

Show DoTrace 
Instance details

Defined in GHC.RTS.Flags

Methods

showsPrec :: Int -> DoTrace -> ShowS

show :: DoTrace -> String #

showList :: [DoTrace] -> ShowS

Show GCFlags 
Instance details

Defined in GHC.RTS.Flags

Methods

showsPrec :: Int -> GCFlags -> ShowS

show :: GCFlags -> String #

showList :: [GCFlags] -> ShowS

Show GiveGCStats 
Instance details

Defined in GHC.RTS.Flags

Methods

showsPrec :: Int -> GiveGCStats -> ShowS

show :: GiveGCStats -> String #

showList :: [GiveGCStats] -> ShowS

Show IoSubSystem 
Instance details

Defined in GHC.RTS.Flags

Methods

showsPrec :: Int -> IoSubSystem -> ShowS

show :: IoSubSystem -> String #

showList :: [IoSubSystem] -> ShowS

Show MiscFlags 
Instance details

Defined in GHC.RTS.Flags

Methods

showsPrec :: Int -> MiscFlags -> ShowS

show :: MiscFlags -> String #

showList :: [MiscFlags] -> ShowS

Show ParFlags 
Instance details

Defined in GHC.RTS.Flags

Methods

showsPrec :: Int -> ParFlags -> ShowS

show :: ParFlags -> String #

showList :: [ParFlags] -> ShowS

Show ProfFlags 
Instance details

Defined in GHC.RTS.Flags

Methods

showsPrec :: Int -> ProfFlags -> ShowS

show :: ProfFlags -> String #

showList :: [ProfFlags] -> ShowS

Show RTSFlags 
Instance details

Defined in GHC.RTS.Flags

Methods

showsPrec :: Int -> RTSFlags -> ShowS

show :: RTSFlags -> String #

showList :: [RTSFlags] -> ShowS

Show TickyFlags 
Instance details

Defined in GHC.RTS.Flags

Methods

showsPrec :: Int -> TickyFlags -> ShowS

show :: TickyFlags -> String #

showList :: [TickyFlags] -> ShowS

Show TraceFlags 
Instance details

Defined in GHC.RTS.Flags

Methods

showsPrec :: Int -> TraceFlags -> ShowS

show :: TraceFlags -> String #

showList :: [TraceFlags] -> ShowS

Show FractionalExponentBase 
Instance details

Defined in GHC.Real

Methods

showsPrec :: Int -> FractionalExponentBase -> ShowS

show :: FractionalExponentBase -> String #

showList :: [FractionalExponentBase] -> ShowS

Show StackEntry 
Instance details

Defined in GHC.Stack.CloneStack

Methods

showsPrec :: Int -> StackEntry -> ShowS

show :: StackEntry -> String #

showList :: [StackEntry] -> ShowS

Show CallStack 
Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> CallStack -> ShowS

show :: CallStack -> String #

showList :: [CallStack] -> ShowS

Show SrcLoc 
Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> SrcLoc -> ShowS

show :: SrcLoc -> String #

showList :: [SrcLoc] -> ShowS

Show StaticPtrInfo 
Instance details

Defined in GHC.StaticPtr

Methods

showsPrec :: Int -> StaticPtrInfo -> ShowS

show :: StaticPtrInfo -> String #

showList :: [StaticPtrInfo] -> ShowS

Show GCDetails 
Instance details

Defined in GHC.Stats

Methods

showsPrec :: Int -> GCDetails -> ShowS

show :: GCDetails -> String #

showList :: [GCDetails] -> ShowS

Show RTSStats 
Instance details

Defined in GHC.Stats

Methods

showsPrec :: Int -> RTSStats -> ShowS

show :: RTSStats -> String #

showList :: [RTSStats] -> ShowS

Show SomeChar 
Instance details

Defined in GHC.TypeLits

Methods

showsPrec :: Int -> SomeChar -> ShowS

show :: SomeChar -> String #

showList :: [SomeChar] -> ShowS

Show SomeSymbol 
Instance details

Defined in GHC.TypeLits

Methods

showsPrec :: Int -> SomeSymbol -> ShowS

show :: SomeSymbol -> String #

showList :: [SomeSymbol] -> ShowS

Show SomeNat 
Instance details

Defined in GHC.TypeNats

Methods

showsPrec :: Int -> SomeNat -> ShowS

show :: SomeNat -> String #

showList :: [SomeNat] -> ShowS

Show GeneralCategory 
Instance details

Defined in GHC.Unicode

Methods

showsPrec :: Int -> GeneralCategory -> ShowS

show :: GeneralCategory -> String #

showList :: [GeneralCategory] -> ShowS

Show Word16 
Instance details

Defined in GHC.Word

Methods

showsPrec :: Int -> Word16 -> ShowS

show :: Word16 -> String #

showList :: [Word16] -> ShowS

Show Word32 
Instance details

Defined in GHC.Word

Methods

showsPrec :: Int -> Word32 -> ShowS

show :: Word32 -> String #

showList :: [Word32] -> ShowS

Show Word64 
Instance details

Defined in GHC.Word

Methods

showsPrec :: Int -> Word64 -> ShowS

show :: Word64 -> String #

showList :: [Word64] -> ShowS

Show Word8 
Instance details

Defined in GHC.Word

Methods

showsPrec :: Int -> Word8 -> ShowS

show :: Word8 -> String #

showList :: [Word8] -> ShowS

Show CBlkCnt 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CBlkCnt -> ShowS

show :: CBlkCnt -> String #

showList :: [CBlkCnt] -> ShowS

Show CBlkSize 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CBlkSize -> ShowS

show :: CBlkSize -> String #

showList :: [CBlkSize] -> ShowS

Show CCc 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CCc -> ShowS

show :: CCc -> String #

showList :: [CCc] -> ShowS

Show CClockId 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CClockId -> ShowS

show :: CClockId -> String #

showList :: [CClockId] -> ShowS

Show CDev 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CDev -> ShowS

show :: CDev -> String #

showList :: [CDev] -> ShowS

Show CFsBlkCnt 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CFsBlkCnt -> ShowS

show :: CFsBlkCnt -> String #

showList :: [CFsBlkCnt] -> ShowS

Show CFsFilCnt 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CFsFilCnt -> ShowS

show :: CFsFilCnt -> String #

showList :: [CFsFilCnt] -> ShowS

Show CGid 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CGid -> ShowS

show :: CGid -> String #

showList :: [CGid] -> ShowS

Show CId 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CId -> ShowS

show :: CId -> String #

showList :: [CId] -> ShowS

Show CIno 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CIno -> ShowS

show :: CIno -> String #

showList :: [CIno] -> ShowS

Show CKey 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CKey -> ShowS

show :: CKey -> String #

showList :: [CKey] -> ShowS

Show CMode 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CMode -> ShowS

show :: CMode -> String #

showList :: [CMode] -> ShowS

Show CNfds 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CNfds -> ShowS

show :: CNfds -> String #

showList :: [CNfds] -> ShowS

Show CNlink 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CNlink -> ShowS

show :: CNlink -> String #

showList :: [CNlink] -> ShowS

Show COff 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> COff -> ShowS

show :: COff -> String #

showList :: [COff] -> ShowS

Show CPid 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CPid -> ShowS

show :: CPid -> String #

showList :: [CPid] -> ShowS

Show CRLim 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CRLim -> ShowS

show :: CRLim -> String #

showList :: [CRLim] -> ShowS

Show CSocklen 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CSocklen -> ShowS

show :: CSocklen -> String #

showList :: [CSocklen] -> ShowS

Show CSpeed 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CSpeed -> ShowS

show :: CSpeed -> String #

showList :: [CSpeed] -> ShowS

Show CSsize 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CSsize -> ShowS

show :: CSsize -> String #

showList :: [CSsize] -> ShowS

Show CTcflag 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CTcflag -> ShowS

show :: CTcflag -> String #

showList :: [CTcflag] -> ShowS

Show CTimer 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CTimer -> ShowS

show :: CTimer -> String #

showList :: [CTimer] -> ShowS

Show CUid 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> CUid -> ShowS

show :: CUid -> String #

showList :: [CUid] -> ShowS

Show Fd 
Instance details

Defined in System.Posix.Types

Methods

showsPrec :: Int -> Fd -> ShowS

show :: Fd -> String #

showList :: [Fd] -> ShowS

Show Timeout 
Instance details

Defined in System.Timeout

Methods

showsPrec :: Int -> Timeout -> ShowS

show :: Timeout -> String #

showList :: [Timeout] -> ShowS

Show Lexeme 
Instance details

Defined in Text.Read.Lex

Methods

showsPrec :: Int -> Lexeme -> ShowS

show :: Lexeme -> String #

showList :: [Lexeme] -> ShowS

Show Number 
Instance details

Defined in Text.Read.Lex

Methods

showsPrec :: Int -> Number -> ShowS

show :: Number -> String #

showList :: [Number] -> ShowS

Show Encoding 
Instance details

Defined in Basement.String

Methods

showsPrec :: Int -> Encoding -> ShowS

show :: Encoding -> String #

showList :: [Encoding] -> ShowS

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

Methods

showsPrec :: Int -> FileSize -> ShowS

show :: FileSize -> String #

showList :: [FileSize] -> ShowS

Show String 
Instance details

Defined in Basement.UTF8.Base

Methods

showsPrec :: Int -> String -> ShowS

show :: String -> String #

showList :: [String] -> ShowS

Show FormatMode 
Instance details

Defined in Data.ByteString.Builder.RealFloat

Methods

showsPrec :: Int -> FormatMode -> ShowS

show :: FormatMode -> String #

showList :: [FormatMode] -> ShowS

Show ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

Methods

showsPrec :: Int -> ByteString -> ShowS

show :: ByteString -> String #

showList :: [ByteString] -> ShowS

Show SizeOverflowException 
Instance details

Defined in Data.ByteString.Internal.Type

Methods

showsPrec :: Int -> SizeOverflowException -> ShowS

show :: SizeOverflowException -> String #

showList :: [SizeOverflowException] -> ShowS

Show ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Methods

showsPrec :: Int -> ByteString -> ShowS

show :: ByteString -> String #

showList :: [ByteString] -> ShowS

Show ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Show CasaRepoPrefix 
Instance details

Defined in Casa.Client

Show PullException 
Instance details

Defined in Casa.Client

Methods

showsPrec :: Int -> PullException -> ShowS

show :: PullException -> String #

showList :: [PullException] -> ShowS

Show PushException 
Instance details

Defined in Casa.Client

Methods

showsPrec :: Int -> PushException -> ShowS

show :: PushException -> String #

showList :: [PushException] -> ShowS

Show ByteArray 
Instance details

Defined in Codec.CBOR.ByteArray

Methods

showsPrec :: Int -> ByteArray -> ShowS

show :: ByteArray -> String #

showList :: [ByteArray] -> ShowS

Show SlicedByteArray 
Instance details

Defined in Codec.CBOR.ByteArray.Sliced

Methods

showsPrec :: Int -> SlicedByteArray -> ShowS

show :: SlicedByteArray -> String #

showList :: [SlicedByteArray] -> ShowS

Show CompanionDone 
Instance details

Defined in Control.Concurrent.Companion

Methods

showsPrec :: Int -> CompanionDone -> ShowS

show :: CompanionDone -> String #

showList :: [CompanionDone] -> ShowS

Show ParseError 
Instance details

Defined in Data.Conduit.Attoparsec

Methods

showsPrec :: Int -> ParseError -> ShowS

show :: ParseError -> String #

showList :: [ParseError] -> ShowS

Show Position 
Instance details

Defined in Data.Conduit.Attoparsec

Methods

showsPrec :: Int -> Position -> ShowS

show :: Position -> String #

showList :: [Position] -> ShowS

Show PositionRange 
Instance details

Defined in Data.Conduit.Attoparsec

Methods

showsPrec :: Int -> PositionRange -> ShowS

show :: PositionRange -> String #

showList :: [PositionRange] -> ShowS

Show SinkStorableException 
Instance details

Defined in Data.Conduit.Binary

Methods

showsPrec :: Int -> SinkStorableException -> ShowS

show :: SinkStorableException -> String #

showList :: [SinkStorableException] -> ShowS

Show Codec 
Instance details

Defined in Data.Conduit.Text

Methods

showsPrec :: Int -> Codec -> ShowS

show :: Codec -> String #

showList :: [Codec] -> ShowS

Show TextException 
Instance details

Defined in Data.Conduit.Text

Methods

showsPrec :: Int -> TextException -> ShowS

show :: TextException -> String #

showList :: [TextException] -> ShowS

Show IntSet 
Instance details

Defined in Data.IntSet.Internal

Methods

showsPrec :: Int -> IntSet -> ShowS

show :: IntSet -> String #

showList :: [IntSet] -> ShowS

Show BitQueue 
Instance details

Defined in Utils.Containers.Internal.BitQueue

Methods

showsPrec :: Int -> BitQueue -> ShowS

show :: BitQueue -> String #

showList :: [BitQueue] -> ShowS

Show BitQueueB 
Instance details

Defined in Utils.Containers.Internal.BitQueue

Methods

showsPrec :: Int -> BitQueueB -> ShowS

show :: BitQueueB -> String #

showList :: [BitQueueB] -> ShowS

Show Nonce 
Instance details

Defined in Crypto.Cipher.AESGCMSIV

Methods

showsPrec :: Int -> Nonce -> ShowS

show :: Nonce -> String #

showList :: [Nonce] -> ShowS

Show Format 
Instance details

Defined in Crypto.Data.Padding

Methods

showsPrec :: Int -> Format -> ShowS

show :: Format -> String #

showList :: [Format] -> ShowS

Show Curve_Edwards25519 
Instance details

Defined in Crypto.ECC

Methods

showsPrec :: Int -> Curve_Edwards25519 -> ShowS

show :: Curve_Edwards25519 -> String #

showList :: [Curve_Edwards25519] -> ShowS

Show Curve_P256R1 
Instance details

Defined in Crypto.ECC

Methods

showsPrec :: Int -> Curve_P256R1 -> ShowS

show :: Curve_P256R1 -> String #

showList :: [Curve_P256R1] -> ShowS

Show Curve_P384R1 
Instance details

Defined in Crypto.ECC

Methods

showsPrec :: Int -> Curve_P384R1 -> ShowS

show :: Curve_P384R1 -> String #

showList :: [Curve_P384R1] -> ShowS

Show Curve_P521R1 
Instance details

Defined in Crypto.ECC

Methods

showsPrec :: Int -> Curve_P521R1 -> ShowS

show :: Curve_P521R1 -> String #

showList :: [Curve_P521R1] -> ShowS

Show Curve_X25519 
Instance details

Defined in Crypto.ECC

Methods

showsPrec :: Int -> Curve_X25519 -> ShowS

show :: Curve_X25519 -> String #

showList :: [Curve_X25519] -> ShowS

Show Curve_X448 
Instance details

Defined in Crypto.ECC

Methods

showsPrec :: Int -> Curve_X448 -> ShowS

show :: Curve_X448 -> String #

showList :: [Curve_X448] -> ShowS

Show Point 
Instance details

Defined in Crypto.ECC.Edwards25519

Methods

showsPrec :: Int -> Point -> ShowS

show :: Point -> String #

showList :: [Point] -> ShowS

Show Scalar 
Instance details

Defined in Crypto.ECC.Edwards25519

Methods

showsPrec :: Int -> Scalar -> ShowS

show :: Scalar -> String #

showList :: [Scalar] -> ShowS

Show CryptoError 
Instance details

Defined in Crypto.Error.Types

Methods

showsPrec :: Int -> CryptoError -> ShowS

show :: CryptoError -> String #

showList :: [CryptoError] -> ShowS

Show Blake2b_160 
Instance details

Defined in Crypto.Hash.Blake2b

Methods

showsPrec :: Int -> Blake2b_160 -> ShowS

show :: Blake2b_160 -> String #

showList :: [Blake2b_160] -> ShowS

Show Blake2b_224 
Instance details

Defined in Crypto.Hash.Blake2b

Methods

showsPrec :: Int -> Blake2b_224 -> ShowS

show :: Blake2b_224 -> String #

showList :: [Blake2b_224] -> ShowS

Show Blake2b_256 
Instance details

Defined in Crypto.Hash.Blake2b

Methods

showsPrec :: Int -> Blake2b_256 -> ShowS

show :: Blake2b_256 -> String #

showList :: [Blake2b_256] -> ShowS

Show Blake2b_384 
Instance details

Defined in Crypto.Hash.Blake2b

Methods

showsPrec :: Int -> Blake2b_384 -> ShowS

show :: Blake2b_384 -> String #

showList :: [Blake2b_384] -> ShowS

Show Blake2b_512 
Instance details

Defined in Crypto.Hash.Blake2b

Methods

showsPrec :: Int -> Blake2b_512 -> ShowS

show :: Blake2b_512 -> String #

showList :: [Blake2b_512] -> ShowS

Show Blake2bp_512 
Instance details

Defined in Crypto.Hash.Blake2bp

Methods

showsPrec :: Int -> Blake2bp_512 -> ShowS

show :: Blake2bp_512 -> String #

showList :: [Blake2bp_512] -> ShowS

Show Blake2s_160 
Instance details

Defined in Crypto.Hash.Blake2s

Methods

showsPrec :: Int -> Blake2s_160 -> ShowS

show :: Blake2s_160 -> String #

showList :: [Blake2s_160] -> ShowS

Show Blake2s_224 
Instance details

Defined in Crypto.Hash.Blake2s

Methods

showsPrec :: Int -> Blake2s_224 -> ShowS

show :: Blake2s_224 -> String #

showList :: [Blake2s_224] -> ShowS

Show Blake2s_256 
Instance details

Defined in Crypto.Hash.Blake2s

Methods

showsPrec :: Int -> Blake2s_256 -> ShowS

show :: Blake2s_256 -> String #

showList :: [Blake2s_256] -> ShowS

Show Blake2sp_224 
Instance details

Defined in Crypto.Hash.Blake2sp

Methods

showsPrec :: Int -> Blake2sp_224 -> ShowS

show :: Blake2sp_224 -> String #

showList :: [Blake2sp_224] -> ShowS

Show Blake2sp_256 
Instance details

Defined in Crypto.Hash.Blake2sp

Methods

showsPrec :: Int -> Blake2sp_256 -> ShowS

show :: Blake2sp_256 -> String #

showList :: [Blake2sp_256] -> ShowS

Show Keccak_224 
Instance details

Defined in Crypto.Hash.Keccak

Methods

showsPrec :: Int -> Keccak_224 -> ShowS

show :: Keccak_224 -> String #

showList :: [Keccak_224] -> ShowS

Show Keccak_256 
Instance details

Defined in Crypto.Hash.Keccak

Methods

showsPrec :: Int -> Keccak_256 -> ShowS

show :: Keccak_256 -> String #

showList :: [Keccak_256] -> ShowS

Show Keccak_384 
Instance details

Defined in Crypto.Hash.Keccak

Methods

showsPrec :: Int -> Keccak_384 -> ShowS

show :: Keccak_384 -> String #

showList :: [Keccak_384] -> ShowS

Show Keccak_512 
Instance details

Defined in Crypto.Hash.Keccak

Methods

showsPrec :: Int -> Keccak_512 -> ShowS

show :: Keccak_512 -> String #

showList :: [Keccak_512] -> ShowS

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

Methods

showsPrec :: Int -> RIPEMD160 -> ShowS

show :: RIPEMD160 -> String #

showList :: [RIPEMD160] -> ShowS

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

Methods

showsPrec :: Int -> SHA224 -> ShowS

show :: SHA224 -> String #

showList :: [SHA224] -> ShowS

Show SHA256 
Instance details

Defined in Crypto.Hash.SHA256

Methods

showsPrec :: Int -> SHA256 -> ShowS

show :: SHA256 -> String #

showList :: [SHA256] -> ShowS

Show SHA3_224 
Instance details

Defined in Crypto.Hash.SHA3

Methods

showsPrec :: Int -> SHA3_224 -> ShowS

show :: SHA3_224 -> String #

showList :: [SHA3_224] -> ShowS

Show SHA3_256 
Instance details

Defined in Crypto.Hash.SHA3

Methods

showsPrec :: Int -> SHA3_256 -> ShowS

show :: SHA3_256 -> String #

showList :: [SHA3_256] -> ShowS

Show SHA3_384 
Instance details

Defined in Crypto.Hash.SHA3

Methods

showsPrec :: Int -> SHA3_384 -> ShowS

show :: SHA3_384 -> String #

showList :: [SHA3_384] -> ShowS

Show SHA3_512 
Instance details

Defined in Crypto.Hash.SHA3

Methods

showsPrec :: Int -> SHA3_512 -> ShowS

show :: SHA3_512 -> String #

showList :: [SHA3_512] -> ShowS

Show SHA384 
Instance details

Defined in Crypto.Hash.SHA384

Methods

showsPrec :: Int -> SHA384 -> ShowS

show :: SHA384 -> String #

showList :: [SHA384] -> ShowS

Show SHA512 
Instance details

Defined in Crypto.Hash.SHA512

Methods

showsPrec :: Int -> SHA512 -> ShowS

show :: SHA512 -> String #

showList :: [SHA512] -> ShowS

Show SHA512t_224 
Instance details

Defined in Crypto.Hash.SHA512t

Methods

showsPrec :: Int -> SHA512t_224 -> ShowS

show :: SHA512t_224 -> String #

showList :: [SHA512t_224] -> ShowS

Show SHA512t_256 
Instance details

Defined in Crypto.Hash.SHA512t

Methods

showsPrec :: Int -> SHA512t_256 -> ShowS

show :: SHA512t_256 -> String #

showList :: [SHA512t_256] -> ShowS

Show Skein256_224 
Instance details

Defined in Crypto.Hash.Skein256

Methods

showsPrec :: Int -> Skein256_224 -> ShowS

show :: Skein256_224 -> String #

showList :: [Skein256_224] -> ShowS

Show Skein256_256 
Instance details

Defined in Crypto.Hash.Skein256

Methods

showsPrec :: Int -> Skein256_256 -> ShowS

show :: Skein256_256 -> String #

showList :: [Skein256_256] -> ShowS

Show Skein512_224 
Instance details

Defined in Crypto.Hash.Skein512

Methods

showsPrec :: Int -> Skein512_224 -> ShowS

show :: Skein512_224 -> String #

showList :: [Skein512_224] -> ShowS

Show Skein512_256 
Instance details

Defined in Crypto.Hash.Skein512

Methods

showsPrec :: Int -> Skein512_256 -> ShowS

show :: Skein512_256 -> String #

showList :: [Skein512_256] -> ShowS

Show Skein512_384 
Instance details

Defined in Crypto.Hash.Skein512

Methods

showsPrec :: Int -> Skein512_384 -> ShowS

show :: Skein512_384 -> String #

showList :: [Skein512_384] -> ShowS

Show Skein512_512 
Instance details

Defined in Crypto.Hash.Skein512

Methods

showsPrec :: Int -> Skein512_512 -> ShowS

show :: Skein512_512 -> String #

showList :: [Skein512_512] -> ShowS

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

Methods

showsPrec :: Int -> Whirlpool -> ShowS

show :: Whirlpool -> String #

showList :: [Whirlpool] -> ShowS

Show Options 
Instance details

Defined in Crypto.KDF.Argon2

Methods

showsPrec :: Int -> Options -> ShowS

show :: Options -> String #

showList :: [Options] -> ShowS

Show Variant 
Instance details

Defined in Crypto.KDF.Argon2

Methods

showsPrec :: Int -> Variant -> ShowS

show :: Variant -> String #

showList :: [Variant] -> ShowS

Show Version 
Instance details

Defined in Crypto.KDF.Argon2

Methods

showsPrec :: Int -> Version -> ShowS

show :: Version -> String #

showList :: [Version] -> ShowS

Show Parameters 
Instance details

Defined in Crypto.KDF.BCryptPBKDF

Methods

showsPrec :: Int -> Parameters -> ShowS

show :: Parameters -> String #

showList :: [Parameters] -> ShowS

Show GenTopPolicy 
Instance details

Defined in Crypto.Number.Generate

Methods

showsPrec :: Int -> GenTopPolicy -> ShowS

show :: GenTopPolicy -> String #

showList :: [GenTopPolicy] -> ShowS

Show CoprimesAssertionError 
Instance details

Defined in Crypto.Number.ModArithmetic

Methods

showsPrec :: Int -> CoprimesAssertionError -> ShowS

show :: CoprimesAssertionError -> String #

showList :: [CoprimesAssertionError] -> ShowS

Show ModulusAssertionError 
Instance details

Defined in Crypto.Number.ModArithmetic

Methods

showsPrec :: Int -> ModulusAssertionError -> ShowS

show :: ModulusAssertionError -> String #

showList :: [ModulusAssertionError] -> ShowS

Show ClockSkew 
Instance details

Defined in Crypto.OTP

Methods

showsPrec :: Int -> ClockSkew -> ShowS

show :: ClockSkew -> String #

showList :: [ClockSkew] -> ShowS

Show OTPDigits 
Instance details

Defined in Crypto.OTP

Methods

showsPrec :: Int -> OTPDigits -> ShowS

show :: OTPDigits -> String #

showList :: [OTPDigits] -> ShowS

Show DhSecret 
Instance details

Defined in Crypto.PubKey.Curve25519

Methods

showsPrec :: Int -> DhSecret -> ShowS

show :: DhSecret -> String #

showList :: [DhSecret] -> ShowS

Show PublicKey 
Instance details

Defined in Crypto.PubKey.Curve25519

Methods

showsPrec :: Int -> PublicKey -> ShowS

show :: PublicKey -> String #

showList :: [PublicKey] -> ShowS

Show SecretKey 
Instance details

Defined in Crypto.PubKey.Curve25519

Methods

showsPrec :: Int -> SecretKey -> ShowS

show :: SecretKey -> String #

showList :: [SecretKey] -> ShowS

Show DhSecret 
Instance details

Defined in Crypto.PubKey.Curve448

Methods

showsPrec :: Int -> DhSecret -> ShowS

show :: DhSecret -> String #

showList :: [DhSecret] -> ShowS

Show PublicKey 
Instance details

Defined in Crypto.PubKey.Curve448

Methods

showsPrec :: Int -> PublicKey -> ShowS

show :: PublicKey -> String #

showList :: [PublicKey] -> ShowS

Show SecretKey 
Instance details

Defined in Crypto.PubKey.Curve448

Methods

showsPrec :: Int -> SecretKey -> ShowS

show :: SecretKey -> String #

showList :: [SecretKey] -> ShowS

Show Params 
Instance details

Defined in Crypto.PubKey.DH

Methods

showsPrec :: Int -> Params -> ShowS

show :: Params -> String #

showList :: [Params] -> ShowS

Show PrivateNumber 
Instance details

Defined in Crypto.PubKey.DH

Methods

showsPrec :: Int -> PrivateNumber -> ShowS

show :: PrivateNumber -> String #

showList :: [PrivateNumber] -> ShowS

Show PublicNumber 
Instance details

Defined in Crypto.PubKey.DH

Methods

showsPrec :: Int -> PublicNumber -> ShowS

show :: PublicNumber -> String #

showList :: [PublicNumber] -> ShowS

Show SharedKey 
Instance details

Defined in Crypto.PubKey.DH

Methods

showsPrec :: Int -> SharedKey -> ShowS

show :: SharedKey -> String #

showList :: [SharedKey] -> ShowS

Show KeyPair 
Instance details

Defined in Crypto.PubKey.DSA

Methods

showsPrec :: Int -> KeyPair -> ShowS

show :: KeyPair -> String #

showList :: [KeyPair] -> ShowS

Show Params 
Instance details

Defined in Crypto.PubKey.DSA

Methods

showsPrec :: Int -> Params -> ShowS

show :: Params -> String #

showList :: [Params] -> ShowS

Show PrivateKey 
Instance details

Defined in Crypto.PubKey.DSA

Methods

showsPrec :: Int -> PrivateKey -> ShowS

show :: PrivateKey -> String #

showList :: [PrivateKey] -> ShowS

Show PublicKey 
Instance details

Defined in Crypto.PubKey.DSA

Methods

showsPrec :: Int -> PublicKey -> ShowS

show :: PublicKey -> String #

showList :: [PublicKey] -> ShowS

Show Signature 
Instance details

Defined in Crypto.PubKey.DSA

Methods

showsPrec :: Int -> Signature -> ShowS

show :: Signature -> String #

showList :: [Signature] -> ShowS

Show ExtendedSignature 
Instance details

Defined in Crypto.PubKey.ECC.ECDSA

Methods

showsPrec :: Int -> ExtendedSignature -> ShowS

show :: ExtendedSignature -> String #

showList :: [ExtendedSignature] -> ShowS

Show KeyPair 
Instance details

Defined in Crypto.PubKey.ECC.ECDSA

Methods

showsPrec :: Int -> KeyPair -> ShowS

show :: KeyPair -> String #

showList :: [KeyPair] -> ShowS

Show PrivateKey 
Instance details

Defined in Crypto.PubKey.ECC.ECDSA

Methods

showsPrec :: Int -> PrivateKey -> ShowS

show :: PrivateKey -> String #

showList :: [PrivateKey] -> ShowS

Show PublicKey 
Instance details

Defined in Crypto.PubKey.ECC.ECDSA

Methods

showsPrec :: Int -> PublicKey -> ShowS

show :: PublicKey -> String #

showList :: [PublicKey] -> ShowS

Show Signature 
Instance details

Defined in Crypto.PubKey.ECC.ECDSA

Methods

showsPrec :: Int -> Signature -> ShowS

show :: Signature -> String #

showList :: [Signature] -> ShowS

Show Point 
Instance details

Defined in Crypto.PubKey.ECC.P256

Methods

showsPrec :: Int -> Point -> ShowS

show :: Point -> String #

showList :: [Point] -> ShowS

Show Scalar 
Instance details

Defined in Crypto.PubKey.ECC.P256

Methods

showsPrec :: Int -> Scalar -> ShowS

show :: Scalar -> String #

showList :: [Scalar] -> ShowS

Show Curve 
Instance details

Defined in Crypto.PubKey.ECC.Types

Methods

showsPrec :: Int -> Curve -> ShowS

show :: Curve -> String #

showList :: [Curve] -> ShowS

Show CurveBinary 
Instance details

Defined in Crypto.PubKey.ECC.Types

Methods

showsPrec :: Int -> CurveBinary -> ShowS

show :: CurveBinary -> String #

showList :: [CurveBinary] -> ShowS

Show CurveCommon 
Instance details

Defined in Crypto.PubKey.ECC.Types

Methods

showsPrec :: Int -> CurveCommon -> ShowS

show :: CurveCommon -> String #

showList :: [CurveCommon] -> ShowS

Show CurveName 
Instance details

Defined in Crypto.PubKey.ECC.Types

Methods

showsPrec :: Int -> CurveName -> ShowS

show :: CurveName -> String #

showList :: [CurveName] -> ShowS

Show CurvePrime 
Instance details

Defined in Crypto.PubKey.ECC.Types

Methods

showsPrec :: Int -> CurvePrime -> ShowS

show :: CurvePrime -> String #

showList :: [CurvePrime] -> ShowS

Show Point 
Instance details

Defined in Crypto.PubKey.ECC.Types

Methods

showsPrec :: Int -> Point -> ShowS

show :: Point -> String #

showList :: [Point] -> ShowS

Show PublicKey 
Instance details

Defined in Crypto.PubKey.Ed25519

Methods

showsPrec :: Int -> PublicKey -> ShowS

show :: PublicKey -> String #

showList :: [PublicKey] -> ShowS

Show SecretKey 
Instance details

Defined in Crypto.PubKey.Ed25519

Methods

showsPrec :: Int -> SecretKey -> ShowS

show :: SecretKey -> String #

showList :: [SecretKey] -> ShowS

Show Signature 
Instance details

Defined in Crypto.PubKey.Ed25519

Methods

showsPrec :: Int -> Signature -> ShowS

show :: Signature -> String #

showList :: [Signature] -> ShowS

Show PublicKey 
Instance details

Defined in Crypto.PubKey.Ed448

Methods

showsPrec :: Int -> PublicKey -> ShowS

show :: PublicKey -> String #

showList :: [PublicKey] -> ShowS

Show SecretKey 
Instance details

Defined in Crypto.PubKey.Ed448

Methods

showsPrec :: Int -> SecretKey -> ShowS

show :: SecretKey -> String #

showList :: [SecretKey] -> ShowS

Show Signature 
Instance details

Defined in Crypto.PubKey.Ed448

Methods

showsPrec :: Int -> Signature -> ShowS

show :: Signature -> String #

showList :: [Signature] -> ShowS

Show Blinder 
Instance details

Defined in Crypto.PubKey.RSA.Types

Methods

showsPrec :: Int -> Blinder -> ShowS

show :: Blinder -> String #

showList :: [Blinder] -> ShowS

Show Error 
Instance details

Defined in Crypto.PubKey.RSA.Types

Methods

showsPrec :: Int -> Error -> ShowS

show :: Error -> String #

showList :: [Error] -> ShowS

Show KeyPair 
Instance details

Defined in Crypto.PubKey.RSA.Types

Methods

showsPrec :: Int -> KeyPair -> ShowS

show :: KeyPair -> String #

showList :: [KeyPair] -> ShowS

Show PrivateKey 
Instance details

Defined in Crypto.PubKey.RSA.Types

Methods

showsPrec :: Int -> PrivateKey -> ShowS

show :: PrivateKey -> String #

showList :: [PrivateKey] -> ShowS

Show PublicKey 
Instance details

Defined in Crypto.PubKey.RSA.Types

Methods

showsPrec :: Int -> PublicKey -> ShowS

show :: PublicKey -> String #

showList :: [PublicKey] -> ShowS

Show PrivateKey 
Instance details

Defined in Crypto.PubKey.Rabin.Basic

Methods

showsPrec :: Int -> PrivateKey -> ShowS

show :: PrivateKey -> String #

showList :: [PrivateKey] -> ShowS

Show PublicKey 
Instance details

Defined in Crypto.PubKey.Rabin.Basic

Methods

showsPrec :: Int -> PublicKey -> ShowS

show :: PublicKey -> String #

showList :: [PublicKey] -> ShowS

Show Signature 
Instance details

Defined in Crypto.PubKey.Rabin.Basic

Methods

showsPrec :: Int -> Signature -> ShowS

show :: Signature -> String #

showList :: [Signature] -> ShowS

Show PrivateKey 
Instance details

Defined in Crypto.PubKey.Rabin.Modified

Methods

showsPrec :: Int -> PrivateKey -> ShowS

show :: PrivateKey -> String #

showList :: [PrivateKey] -> ShowS

Show PublicKey 
Instance details

Defined in Crypto.PubKey.Rabin.Modified

Methods

showsPrec :: Int -> PublicKey -> ShowS

show :: PublicKey -> String #

showList :: [PublicKey] -> ShowS

Show PrivateKey 
Instance details

Defined in Crypto.PubKey.Rabin.RW

Methods

showsPrec :: Int -> PrivateKey -> ShowS

show :: PrivateKey -> String #

showList :: [PrivateKey] -> ShowS

Show PublicKey 
Instance details

Defined in Crypto.PubKey.Rabin.RW

Methods

showsPrec :: Int -> PublicKey -> ShowS

show :: PublicKey -> String #

showList :: [PublicKey] -> ShowS

Show Error 
Instance details

Defined in Crypto.PubKey.Rabin.Types

Methods

showsPrec :: Int -> Error -> ShowS

show :: Error -> String #

showList :: [Error] -> ShowS

Show ProcessorOption 
Instance details

Defined in Crypto.System.CPU

Methods

showsPrec :: Int -> ProcessorOption -> ShowS

show :: ProcessorOption -> String #

showList :: [ProcessorOption] -> ShowS

Show FileType 
Instance details

Defined in System.Directory.Internal.Common

Methods

showsPrec :: Int -> FileType -> ShowS

show :: FileType -> String #

showList :: [FileType] -> ShowS

Show Permissions 
Instance details

Defined in System.Directory.Internal.Common

Methods

showsPrec :: Int -> Permissions -> ShowS

show :: Permissions -> String #

showList :: [Permissions] -> ShowS

Show XdgDirectory 
Instance details

Defined in System.Directory.Internal.Common

Methods

showsPrec :: Int -> XdgDirectory -> ShowS

show :: XdgDirectory -> String #

showList :: [XdgDirectory] -> ShowS

Show XdgDirectoryList 
Instance details

Defined in System.Directory.Internal.Common

Methods

showsPrec :: Int -> XdgDirectoryList -> ShowS

show :: XdgDirectoryList -> String #

showList :: [XdgDirectoryList] -> ShowS

Show EchoState 
Instance details

Defined in System.IO.Echo.Internal

Methods

showsPrec :: Int -> EchoState -> ShowS

show :: EchoState -> String #

showList :: [EchoState] -> ShowS

Show PublicKey 
Instance details

Defined in Crypto.Sign.Ed25519

Methods

showsPrec :: Int -> PublicKey -> ShowS

show :: PublicKey -> String #

showList :: [PublicKey] -> ShowS

Show SecretKey 
Instance details

Defined in Crypto.Sign.Ed25519

Methods

showsPrec :: Int -> SecretKey -> ShowS

show :: SecretKey -> String #

showList :: [SecretKey] -> ShowS

Show Signature 
Instance details

Defined in Crypto.Sign.Ed25519

Methods

showsPrec :: Int -> Signature -> ShowS

show :: Signature -> String #

showList :: [Signature] -> ShowS

Show Timeout 
Instance details

Defined in System.Time.Extra

Methods

showsPrec :: Int -> Timeout -> ShowS

show :: Timeout -> String #

showList :: [Timeout] -> ShowS

Show SharedExclusive 
Instance details

Defined in System.FileLock

Show OsChar 
Instance details

Defined in System.OsString.Internal.Types.Hidden

Methods

showsPrec :: Int -> OsChar -> ShowS

show :: OsChar -> String #

showList :: [OsChar] -> ShowS

Show OsString 
Instance details

Defined in System.OsString.Internal.Types.Hidden

Methods

showsPrec :: Int -> OsString -> ShowS

show :: OsString -> String #

showList :: [OsString] -> ShowS

Show PosixChar 
Instance details

Defined in System.OsString.Internal.Types.Hidden

Methods

showsPrec :: Int -> PosixChar -> ShowS

show :: PosixChar -> String #

showList :: [PosixChar] -> ShowS

Show PosixString 
Instance details

Defined in System.OsString.Internal.Types.Hidden

Methods

showsPrec :: Int -> PosixString -> ShowS

show :: PosixString -> String #

showList :: [PosixString] -> ShowS

Show WindowsChar 
Instance details

Defined in System.OsString.Internal.Types.Hidden

Methods

showsPrec :: Int -> WindowsChar -> ShowS

show :: WindowsChar -> String #

showList :: [WindowsChar] -> ShowS

Show WindowsString 
Instance details

Defined in System.OsString.Internal.Types.Hidden

Methods

showsPrec :: Int -> WindowsString -> ShowS

show :: WindowsString -> String #

showList :: [WindowsString] -> ShowS

Show Event 
Instance details

Defined in System.FSNotify.Types

Methods

showsPrec :: Int -> Event -> ShowS

show :: Event -> String #

showList :: [Event] -> ShowS

Show EventIsDirectory 
Instance details

Defined in System.FSNotify.Types

Methods

showsPrec :: Int -> EventIsDirectory -> ShowS

show :: EventIsDirectory -> String #

showList :: [EventIsDirectory] -> ShowS

Show Options 
Instance details

Defined in Generics.Deriving.TH

Methods

showsPrec :: Int -> Options -> ShowS

show :: Options -> String #

showList :: [Options] -> ShowS

Show RepOptions 
Instance details

Defined in Generics.Deriving.TH

Methods

showsPrec :: Int -> RepOptions -> ShowS

show :: RepOptions -> String #

showList :: [RepOptions] -> ShowS

Show ShortText 
Instance details

Defined in GHC.Data.ShortText

Methods

showsPrec :: Int -> ShortText -> ShowS

show :: ShortText -> String #

showList :: [ShortText] -> ShowS

Show Arch 
Instance details

Defined in GHC.Platform.ArchOS

Methods

showsPrec :: Int -> Arch -> ShowS

show :: Arch -> String #

showList :: [Arch] -> ShowS

Show ArchOS 
Instance details

Defined in GHC.Platform.ArchOS

Methods

showsPrec :: Int -> ArchOS -> ShowS

show :: ArchOS -> String #

showList :: [ArchOS] -> ShowS

Show ArmABI 
Instance details

Defined in GHC.Platform.ArchOS

Methods

showsPrec :: Int -> ArmABI -> ShowS

show :: ArmABI -> String #

showList :: [ArmABI] -> ShowS

Show ArmISA 
Instance details

Defined in GHC.Platform.ArchOS

Methods

showsPrec :: Int -> ArmISA -> ShowS

show :: ArmISA -> String #

showList :: [ArmISA] -> ShowS

Show ArmISAExt 
Instance details

Defined in GHC.Platform.ArchOS

Methods

showsPrec :: Int -> ArmISAExt -> ShowS

show :: ArmISAExt -> String #

showList :: [ArmISAExt] -> ShowS

Show OS 
Instance details

Defined in GHC.Platform.ArchOS

Methods

showsPrec :: Int -> OS -> ShowS

show :: OS -> String #

showList :: [OS] -> ShowS

Show PPC_64ABI 
Instance details

Defined in GHC.Platform.ArchOS

Methods

showsPrec :: Int -> PPC_64ABI -> ShowS

show :: PPC_64ABI -> String #

showList :: [PPC_64ABI] -> ShowS

Show DbInstUnitId 
Instance details

Defined in GHC.Unit.Database

Methods

showsPrec :: Int -> DbInstUnitId -> ShowS

show :: DbInstUnitId -> String #

showList :: [DbInstUnitId] -> ShowS

Show DbModule 
Instance details

Defined in GHC.Unit.Database

Methods

showsPrec :: Int -> DbModule -> ShowS

show :: DbModule -> String #

showList :: [DbModule] -> ShowS

Show ForeignSrcLang 
Instance details

Defined in GHC.ForeignSrcLang.Type

Methods

showsPrec :: Int -> ForeignSrcLang -> ShowS

show :: ForeignSrcLang -> String #

showList :: [ForeignSrcLang] -> ShowS

Show Extension 
Instance details

Defined in GHC.LanguageExtensions.Type

Methods

showsPrec :: Int -> Extension -> ShowS

show :: Extension -> String #

showList :: [Extension] -> ShowS

Show KindRep 
Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> KindRep -> ShowS

show :: KindRep -> String #

showList :: [KindRep] -> ShowS

Show Module 
Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Module -> ShowS

show :: Module -> String #

showList :: [Module] -> ShowS

Show Ordering 
Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Ordering -> ShowS

show :: Ordering -> String #

showList :: [Ordering] -> ShowS

Show TrName 
Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> TrName -> ShowS

show :: TrName -> String #

showList :: [TrName] -> ShowS

Show TyCon 
Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> TyCon -> ShowS

show :: TyCon -> String #

showList :: [TyCon] -> ShowS

Show TypeLitSort 
Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> TypeLitSort -> ShowS

show :: TypeLitSort -> String #

showList :: [TypeLitSort] -> ShowS

Show GitHashException 
Instance details

Defined in GitHash

Methods

showsPrec :: Int -> GitHashException -> ShowS

show :: GitHashException -> String #

showList :: [GitHashException] -> ShowS

Show GitInfo 
Instance details

Defined in GitHash

Methods

showsPrec :: Int -> GitInfo -> ShowS

show :: GitInfo -> String #

showList :: [GitInfo] -> ShowS

Show KeyId 
Instance details

Defined in Hackage.Security.Key

Methods

showsPrec :: Int -> KeyId -> ShowS

show :: KeyId -> String #

showList :: [KeyId] -> ShowS

Show Delegation 
Instance details

Defined in Hackage.Security.TUF.Patterns

Methods

showsPrec :: Int -> Delegation -> ShowS

show :: Delegation -> String #

showList :: [Delegation] -> ShowS

Show Half 
Instance details

Defined in Numeric.Half.Internal

Methods

showsPrec :: Int -> Half -> ShowS

show :: Half -> String #

showList :: [Half] -> ShowS

Show Dependencies 
Instance details

Defined in HiFileParser

Methods

showsPrec :: Int -> Dependencies -> ShowS

show :: Dependencies -> String #

showList :: [Dependencies] -> ShowS

Show Dictionary 
Instance details

Defined in HiFileParser

Methods

showsPrec :: Int -> Dictionary -> ShowS

show :: Dictionary -> String #

showList :: [Dictionary] -> ShowS

Show IfaceVersion 
Instance details

Defined in HiFileParser

Methods

showsPrec :: Int -> IfaceVersion -> ShowS

show :: IfaceVersion -> String #

showList :: [IfaceVersion] -> ShowS

Show Interface 
Instance details

Defined in HiFileParser

Methods

showsPrec :: Int -> Interface -> ShowS

show :: Interface -> String #

showList :: [Interface] -> ShowS

Show Module 
Instance details

Defined in HiFileParser

Methods

showsPrec :: Int -> Module -> ShowS

show :: Module -> String #

showList :: [Module] -> ShowS

Show Usage 
Instance details

Defined in HiFileParser

Methods

showsPrec :: Int -> Usage -> ShowS

show :: Usage -> String #

showList :: [Usage] -> ShowS

Show GenerateHashStrategy 
Instance details

Defined in Hpack

Show Result 
Instance details

Defined in Hpack

Methods

showsPrec :: Int -> Result -> ShowS

show :: Result -> String #

showList :: [Result] -> ShowS

Show Status 
Instance details

Defined in Hpack

Methods

showsPrec :: Int -> Status -> ShowS

show :: Status -> String #

showList :: [Status] -> ShowS

Show BuildTool 
Instance details

Defined in Hpack.Config

Methods

showsPrec :: Int -> BuildTool -> ShowS

show :: BuildTool -> String #

showList :: [BuildTool] -> ShowS

Show BuildType 
Instance details

Defined in Hpack.Config

Methods

showsPrec :: Int -> BuildType -> ShowS

show :: BuildType -> String #

showList :: [BuildType] -> ShowS

Show Cond 
Instance details

Defined in Hpack.Config

Methods

showsPrec :: Int -> Cond -> ShowS

show :: Cond -> String #

showList :: [Cond] -> ShowS

Show Condition 
Instance details

Defined in Hpack.Config

Methods

showsPrec :: Int -> Condition -> ShowS

show :: Condition -> String #

showList :: [Condition] -> ShowS

Show CustomSetup 
Instance details

Defined in Hpack.Config

Methods

showsPrec :: Int -> CustomSetup -> ShowS

show :: CustomSetup -> String #

showList :: [CustomSetup] -> ShowS

Show CustomSetupSection 
Instance details

Defined in Hpack.Config

Methods

showsPrec :: Int -> CustomSetupSection -> ShowS

show :: CustomSetupSection -> String #

showList :: [CustomSetupSection] -> ShowS

Show DecodeResult 
Instance details

Defined in Hpack.Config

Methods

showsPrec :: Int -> DecodeResult -> ShowS

show :: DecodeResult -> String #

showList :: [DecodeResult] -> ShowS

Show Empty 
Instance details

Defined in Hpack.Config

Methods

showsPrec :: Int -> Empty -> ShowS

show :: Empty -> String #

showList :: [Empty] -> ShowS

Show Executable 
Instance details

Defined in Hpack.Config

Methods

showsPrec :: Int -> Executable -> ShowS

show :: Executable -> String #

showList :: [Executable] -> ShowS

Show ExecutableSection 
Instance details

Defined in Hpack.Config

Methods

showsPrec :: Int -> ExecutableSection -> ShowS

show :: ExecutableSection -> String #

showList :: [ExecutableSection] -> ShowS

Show Flag 
Instance details

Defined in Hpack.Config

Methods

showsPrec :: Int -> Flag -> ShowS

show :: Flag -> String #

showList :: [Flag] -> ShowS

Show FlagSection 
Instance details

Defined in Hpack.Config

Methods

showsPrec :: Int -> FlagSection -> ShowS

show :: FlagSection -> String #

showList :: [FlagSection] -> ShowS

Show Language 
Instance details

Defined in Hpack.Config

Methods

showsPrec :: Int -> Language -> ShowS

show :: Language -> String #

showList :: [Language] -> ShowS

Show Library 
Instance details

Defined in Hpack.Config

Methods

showsPrec :: Int -> Library -> ShowS

show :: Library -> String #

showList :: [Library] -> ShowS

Show LibrarySection 
Instance details

Defined in Hpack.Config

Methods

showsPrec :: Int -> LibrarySection -> ShowS

show :: LibrarySection -> String #

showList :: [LibrarySection] -> ShowS

Show Package 
Instance details

Defined in Hpack.Config

Methods

showsPrec :: Int -> Package -> ShowS

show :: Package -> String #

showList :: [Package] -> ShowS

Show Path 
Instance details

Defined in Hpack.Config

Methods

showsPrec :: Int -> Path -> ShowS

show :: Path -> String #

showList :: [Path] -> ShowS

Show SourceRepository 
Instance details

Defined in Hpack.Config

Show SpecVersion 
Instance details

Defined in Hpack.Config

Methods

showsPrec :: Int -> SpecVersion -> ShowS

show :: SpecVersion -> String #

showList :: [SpecVersion] -> ShowS

Show Verbatim 
Instance details

Defined in Hpack.Config

Methods

showsPrec :: Int -> Verbatim -> ShowS

show :: Verbatim -> String #

showList :: [Verbatim] -> ShowS

Show VerbatimValue 
Instance details

Defined in Hpack.Config

Methods

showsPrec :: Int -> VerbatimValue -> ShowS

show :: VerbatimValue -> String #

showList :: [VerbatimValue] -> ShowS

Show HpackError 
Instance details

Defined in Hpack.Error

Methods

showsPrec :: Int -> HpackError -> ShowS

show :: HpackError -> String #

showList :: [HpackError] -> ShowS

Show ProgramName 
Instance details

Defined in Hpack.Error

Methods

showsPrec :: Int -> ProgramName -> ShowS

show :: ProgramName -> String #

showList :: [ProgramName] -> ShowS

Show Module 
Instance details

Defined in Hpack.Module

Methods

showsPrec :: Int -> Module -> ShowS

show :: Module -> String #

showList :: [Module] -> ShowS

Show Force 
Instance details

Defined in Hpack.Options

Methods

showsPrec :: Int -> Force -> ShowS

show :: Force -> String #

showList :: [Force] -> ShowS

Show OutputStrategy 
Instance details

Defined in Hpack.Options

Show ParseOptions 
Instance details

Defined in Hpack.Options

Methods

showsPrec :: Int -> ParseOptions -> ShowS

show :: ParseOptions -> String #

showList :: [ParseOptions] -> ShowS

Show ParseResult 
Instance details

Defined in Hpack.Options

Methods

showsPrec :: Int -> ParseResult -> ShowS

show :: ParseResult -> String #

showList :: [ParseResult] -> ShowS

Show Verbose 
Instance details

Defined in Hpack.Options

Methods

showsPrec :: Int -> Verbose -> ShowS

show :: Verbose -> String #

showList :: [Verbose] -> ShowS

Show BuildTools 
Instance details

Defined in Hpack.Syntax.BuildTools

Methods

showsPrec :: Int -> BuildTools -> ShowS

show :: BuildTools -> String #

showList :: [BuildTools] -> ShowS

Show ParseBuildTool 
Instance details

Defined in Hpack.Syntax.BuildTools

Methods

showsPrec :: Int -> ParseBuildTool -> ShowS

show :: ParseBuildTool -> String #

showList :: [ParseBuildTool] -> ShowS

Show SystemBuildTools 
Instance details

Defined in Hpack.Syntax.BuildTools

Show Defaults 
Instance details

Defined in Hpack.Syntax.Defaults

Methods

showsPrec :: Int -> Defaults -> ShowS

show :: Defaults -> String #

showList :: [Defaults] -> ShowS

Show Github 
Instance details

Defined in Hpack.Syntax.Defaults

Methods

showsPrec :: Int -> Github -> ShowS

show :: Github -> String #

showList :: [Github] -> ShowS

Show Local 
Instance details

Defined in Hpack.Syntax.Defaults

Methods

showsPrec :: Int -> Local -> ShowS

show :: Local -> String #

showList :: [Local] -> ShowS

Show Dependencies 
Instance details

Defined in Hpack.Syntax.Dependencies

Methods

showsPrec :: Int -> Dependencies -> ShowS

show :: Dependencies -> String #

showList :: [Dependencies] -> ShowS

Show DependencyInfo 
Instance details

Defined in Hpack.Syntax.Dependencies

Show BoxLabel 
Instance details

Defined in Trace.Hpc.Mix

Methods

showsPrec :: Int -> BoxLabel -> ShowS

show :: BoxLabel -> String #

showList :: [BoxLabel] -> ShowS

Show CondBox 
Instance details

Defined in Trace.Hpc.Mix

Methods

showsPrec :: Int -> CondBox -> ShowS

show :: CondBox -> String #

showList :: [CondBox] -> ShowS

Show Mix 
Instance details

Defined in Trace.Hpc.Mix

Methods

showsPrec :: Int -> Mix -> ShowS

show :: Mix -> String #

showList :: [Mix] -> ShowS

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

Methods

showsPrec :: Int -> TixModule -> ShowS

show :: TixModule -> String #

showList :: [TixModule] -> ShowS

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

Methods

showsPrec :: Int -> HpcPos -> ShowS

show :: HpcPos -> String #

showList :: [HpcPos] -> 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

Methods

showsPrec :: Int -> ConnHost -> ShowS

show :: ConnHost -> String #

showList :: [ConnHost] -> ShowS

Show ConnKey 
Instance details

Defined in Network.HTTP.Client.Types

Methods

showsPrec :: Int -> ConnKey -> ShowS

show :: ConnKey -> String #

showList :: [ConnKey] -> ShowS

Show Cookie 
Instance details

Defined in Network.HTTP.Client.Types

Methods

showsPrec :: Int -> Cookie -> ShowS

show :: Cookie -> String #

showList :: [Cookie] -> ShowS

Show CookieJar 
Instance details

Defined in Network.HTTP.Client.Types

Methods

showsPrec :: Int -> CookieJar -> ShowS

show :: CookieJar -> String #

showList :: [CookieJar] -> ShowS

Show HttpException 
Instance details

Defined in Network.HTTP.Client.Types

Methods

showsPrec :: Int -> HttpException -> ShowS

show :: HttpException -> String #

showList :: [HttpException] -> ShowS

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

Methods

showsPrec :: Int -> MaxHeaderLength -> ShowS

show :: MaxHeaderLength -> String #

showList :: [MaxHeaderLength] -> ShowS

Show MaxNumberHeaders 
Instance details

Defined in Network.HTTP.Client.Types

Methods

showsPrec :: Int -> MaxNumberHeaders -> ShowS

show :: MaxNumberHeaders -> String #

showList :: [MaxNumberHeaders] -> ShowS

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

Methods

showsPrec :: Int -> ProxySecureMode -> ShowS

show :: ProxySecureMode -> String #

showList :: [ProxySecureMode] -> ShowS

Show Request 
Instance details

Defined in Network.HTTP.Client.Types

Methods

showsPrec :: Int -> Request -> ShowS

show :: Request -> String #

showList :: [Request] -> ShowS

Show ResponseClose 
Instance details

Defined in Network.HTTP.Client.Types

Methods

showsPrec :: Int -> ResponseClose -> ShowS

show :: ResponseClose -> String #

showList :: [ResponseClose] -> ShowS

Show ResponseTimeout 
Instance details

Defined in Network.HTTP.Client.Types

Methods

showsPrec :: Int -> ResponseTimeout -> ShowS

show :: ResponseTimeout -> String #

showList :: [ResponseTimeout] -> ShowS

Show StatusHeaders 
Instance details

Defined in Network.HTTP.Client.Types

Methods

showsPrec :: Int -> StatusHeaders -> ShowS

show :: StatusHeaders -> String #

showList :: [StatusHeaders] -> ShowS

Show StreamFileStatus 
Instance details

Defined in Network.HTTP.Client.Types

Methods

showsPrec :: Int -> StreamFileStatus -> ShowS

show :: StreamFileStatus -> String #

showList :: [StreamFileStatus] -> ShowS

Show DigestAuthException 
Instance details

Defined in Network.HTTP.Client.TLS

Methods

showsPrec :: Int -> DigestAuthException -> ShowS

show :: DigestAuthException -> String #

showList :: [DigestAuthException] -> ShowS

Show DigestAuthExceptionDetails 
Instance details

Defined in Network.HTTP.Client.TLS

Methods

showsPrec :: Int -> DigestAuthExceptionDetails -> ShowS

show :: DigestAuthExceptionDetails -> String #

showList :: [DigestAuthExceptionDetails] -> ShowS

Show JSONException 
Instance details

Defined in Network.HTTP.Simple

Methods

showsPrec :: Int -> JSONException -> ShowS

show :: JSONException -> String #

showList :: [JSONException] -> ShowS

Show DownloadException 
Instance details

Defined in Network.HTTP.Download

Show CheckHexDigest 
Instance details

Defined in Network.HTTP.Download.Verified

Show HashCheck 
Instance details

Defined in Network.HTTP.Download.Verified

Methods

showsPrec :: Int -> HashCheck -> ShowS

show :: HashCheck -> String #

showList :: [HashCheck] -> ShowS

Show VerifiedDownloadException 
Instance details

Defined in Network.HTTP.Download.Verified

Show VerifyFileException 
Instance details

Defined in Network.HTTP.Download.Verified

Methods

showsPrec :: Int -> VerifyFileException -> ShowS

show :: VerifyFileException -> String #

showList :: [VerifyFileException] -> ShowS

Show ByteRange 
Instance details

Defined in Network.HTTP.Types.Header

Methods

showsPrec :: Int -> ByteRange -> ShowS

show :: ByteRange -> String #

showList :: [ByteRange] -> ShowS

Show StdMethod 
Instance details

Defined in Network.HTTP.Types.Method

Methods

showsPrec :: Int -> StdMethod -> ShowS

show :: StdMethod -> String #

showList :: [StdMethod] -> ShowS

Show Status 
Instance details

Defined in Network.HTTP.Types.Status

Methods

showsPrec :: Int -> Status -> ShowS

show :: Status -> String #

showList :: [Status] -> ShowS

Show EscapeItem 
Instance details

Defined in Network.HTTP.Types.URI

Methods

showsPrec :: Int -> EscapeItem -> ShowS

show :: EscapeItem -> String #

showList :: [EscapeItem] -> ShowS

Show HttpVersion 
Instance details

Defined in Network.HTTP.Types.Version

Methods

showsPrec :: Int -> HttpVersion -> ShowS

show :: HttpVersion -> String #

showList :: [HttpVersion] -> ShowS

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

Methods

showsPrec :: Int -> IPRange -> ShowS

show :: IPRange -> String #

showList :: [IPRange] -> ShowS

Show Event 
Instance details

Defined in Text.Libyaml

Methods

showsPrec :: Int -> Event -> ShowS

show :: Event -> String #

showList :: [Event] -> ShowS

Show EventType 
Instance details

Defined in Text.Libyaml

Methods

showsPrec :: Int -> EventType -> ShowS

show :: EventType -> String #

showList :: [EventType] -> ShowS

Show MappingStyle 
Instance details

Defined in Text.Libyaml

Methods

showsPrec :: Int -> MappingStyle -> ShowS

show :: MappingStyle -> String #

showList :: [MappingStyle] -> ShowS

Show SequenceStyle 
Instance details

Defined in Text.Libyaml

Methods

showsPrec :: Int -> SequenceStyle -> ShowS

show :: SequenceStyle -> String #

showList :: [SequenceStyle] -> ShowS

Show Style 
Instance details

Defined in Text.Libyaml

Methods

showsPrec :: Int -> Style -> ShowS

show :: Style -> String #

showList :: [Style] -> ShowS

Show Tag 
Instance details

Defined in Text.Libyaml

Methods

showsPrec :: Int -> Tag -> ShowS

show :: Tag -> String #

showList :: [Tag] -> ShowS

Show ToEventRawException 
Instance details

Defined in Text.Libyaml

Methods

showsPrec :: Int -> ToEventRawException -> ShowS

show :: ToEventRawException -> String #

showList :: [ToEventRawException] -> ShowS

Show YamlException 
Instance details

Defined in Text.Libyaml

Methods

showsPrec :: Int -> YamlException -> ShowS

show :: YamlException -> String #

showList :: [YamlException] -> ShowS

Show YamlMark 
Instance details

Defined in Text.Libyaml

Methods

showsPrec :: Int -> YamlMark -> ShowS

show :: YamlMark -> String #

showList :: [YamlMark] -> ShowS

Show Base 
Instance details

Defined in Data.ByteArray.Encoding

Methods

showsPrec :: Int -> Base -> ShowS

show :: Base -> String #

showList :: [Base] -> ShowS

Show Endianness 
Instance details

Defined in Data.Memory.Endian

Methods

showsPrec :: Int -> Endianness -> ShowS

show :: Endianness -> String #

showList :: [Endianness] -> ShowS

Show Word128 
Instance details

Defined in Data.Memory.ExtendedWords

Methods

showsPrec :: Int -> Word128 -> ShowS

show :: Word128 -> String #

showList :: [Word128] -> ShowS

Show LogLevel 
Instance details

Defined in Control.Monad.Logger

Methods

showsPrec :: Int -> LogLevel -> ShowS

show :: LogLevel -> String #

showList :: [LogLevel] -> ShowS

Show NullError 
Instance details

Defined in Data.NonNull

Methods

showsPrec :: Int -> NullError -> ShowS

show :: NullError -> String #

showList :: [NullError] -> ShowS

Show DataIdentifier 
Instance details

Defined in Text.Mustache.Internal.Types

Show SubstitutionError 
Instance details

Defined in Text.Mustache.Internal.Types

Show Template 
Instance details

Defined in Text.Mustache.Internal.Types

Methods

showsPrec :: Int -> Template -> ShowS

show :: Template -> String #

showList :: [Template] -> ShowS

Show Value 
Instance details

Defined in Text.Mustache.Internal.Types

Methods

showsPrec :: Int -> Value -> ShowS

show :: Value -> String #

showList :: [Value] -> ShowS

Show AddrInfo 
Instance details

Defined in Network.Socket.Info

Methods

showsPrec :: Int -> AddrInfo -> ShowS

show :: AddrInfo -> String #

showList :: [AddrInfo] -> ShowS

Show AddrInfoFlag 
Instance details

Defined in Network.Socket.Info

Methods

showsPrec :: Int -> AddrInfoFlag -> ShowS

show :: AddrInfoFlag -> String #

showList :: [AddrInfoFlag] -> ShowS

Show NameInfoFlag 
Instance details

Defined in Network.Socket.Info

Methods

showsPrec :: Int -> NameInfoFlag -> ShowS

show :: NameInfoFlag -> String #

showList :: [NameInfoFlag] -> ShowS

Show Family 
Instance details

Defined in Network.Socket.Types

Methods

showsPrec :: Int -> Family -> ShowS

show :: Family -> String #

showList :: [Family] -> ShowS

Show PortNumber 
Instance details

Defined in Network.Socket.Types

Methods

showsPrec :: Int -> PortNumber -> ShowS

show :: PortNumber -> String #

showList :: [PortNumber] -> ShowS

Show Socket 
Instance details

Defined in Network.Socket.Types

Methods

showsPrec :: Int -> Socket -> ShowS

show :: Socket -> String #

showList :: [Socket] -> ShowS

Show SocketType 
Instance details

Defined in Network.Socket.Types

Methods

showsPrec :: Int -> SocketType -> ShowS

show :: SocketType -> String #

showList :: [SocketType] -> ShowS

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

Methods

showsPrec :: Int -> URIAuth -> ShowS

show :: URIAuth -> String #

showList :: [URIAuth] -> ShowS

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

Methods

showsPrec :: Int -> ParserHelp -> ShowS

show :: ParserHelp -> String #

showList :: [ParserHelp] -> ShowS

Show AltNodeType 
Instance details

Defined in Options.Applicative.Types

Methods

showsPrec :: Int -> AltNodeType -> ShowS

show :: AltNodeType -> String #

showList :: [AltNodeType] -> ShowS

Show ArgPolicy 
Instance details

Defined in Options.Applicative.Types

Methods

showsPrec :: Int -> ArgPolicy -> ShowS

show :: ArgPolicy -> String #

showList :: [ArgPolicy] -> ShowS

Show ArgumentReachability 
Instance details

Defined in Options.Applicative.Types

Methods

showsPrec :: Int -> ArgumentReachability -> ShowS

show :: ArgumentReachability -> String #

showList :: [ArgumentReachability] -> ShowS

Show Backtracking 
Instance details

Defined in Options.Applicative.Types

Methods

showsPrec :: Int -> Backtracking -> ShowS

show :: Backtracking -> String #

showList :: [Backtracking] -> ShowS

Show CompletionResult 
Instance details

Defined in Options.Applicative.Types

Methods

showsPrec :: Int -> CompletionResult -> ShowS

show :: CompletionResult -> String #

showList :: [CompletionResult] -> ShowS

Show IsCmdStart 
Instance details

Defined in Options.Applicative.Types

Methods

showsPrec :: Int -> IsCmdStart -> ShowS

show :: IsCmdStart -> String #

showList :: [IsCmdStart] -> ShowS

Show OptName 
Instance details

Defined in Options.Applicative.Types

Methods

showsPrec :: Int -> OptName -> ShowS

show :: OptName -> String #

showList :: [OptName] -> ShowS

Show OptProperties 
Instance details

Defined in Options.Applicative.Types

Methods

showsPrec :: Int -> OptProperties -> ShowS

show :: OptProperties -> String #

showList :: [OptProperties] -> ShowS

Show OptVisibility 
Instance details

Defined in Options.Applicative.Types

Methods

showsPrec :: Int -> OptVisibility -> ShowS

show :: OptVisibility -> String #

showList :: [OptVisibility] -> ShowS

Show ParserPrefs 
Instance details

Defined in Options.Applicative.Types

Methods

showsPrec :: Int -> ParserPrefs -> ShowS

show :: ParserPrefs -> String #

showList :: [ParserPrefs] -> ShowS

Show OsChar 
Instance details

Defined in System.OsString.Internal.Types

Methods

showsPrec :: Int -> OsChar -> ShowS

show :: OsChar -> String #

showList :: [OsChar] -> ShowS

Show OsString 
Instance details

Defined in System.OsString.Internal.Types

Methods

showsPrec :: Int -> OsString -> ShowS

show :: OsString -> String #

showList :: [OsString] -> ShowS

Show PosixChar 
Instance details

Defined in System.OsString.Internal.Types

Methods

showsPrec :: Int -> PosixChar -> ShowS

show :: PosixChar -> String #

showList :: [PosixChar] -> ShowS

Show PosixString 
Instance details

Defined in System.OsString.Internal.Types

Methods

showsPrec :: Int -> PosixString -> ShowS

show :: PosixString -> String #

showList :: [PosixString] -> ShowS

Show WindowsChar 
Instance details

Defined in System.OsString.Internal.Types

Methods

showsPrec :: Int -> WindowsChar -> ShowS

show :: WindowsChar -> String #

showList :: [WindowsChar] -> ShowS

Show WindowsString 
Instance details

Defined in System.OsString.Internal.Types

Methods

showsPrec :: Int -> WindowsString -> ShowS

show :: WindowsString -> String #

showList :: [WindowsString] -> ShowS

Show RequireHackageIndex 
Instance details

Defined in Pantry.Hackage

Show UsePreferredVersions 
Instance details

Defined in Pantry.Hackage

Show CachedTree 
Instance details

Defined in Pantry.Storage

Methods

showsPrec :: Int -> CachedTree -> ShowS

show :: CachedTree -> String #

showList :: [CachedTree] -> ShowS

Show LoadCachedTreeException 
Instance details

Defined in Pantry.Storage

Methods

showsPrec :: Int -> LoadCachedTreeException -> ShowS

show :: LoadCachedTreeException -> String #

showList :: [LoadCachedTreeException] -> ShowS

Show SHA256 
Instance details

Defined in Pantry.SHA256

Methods

showsPrec :: Int -> SHA256 -> ShowS

show :: SHA256 -> String #

showList :: [SHA256] -> ShowS

Show SHA256Exception 
Instance details

Defined in Pantry.SHA256

Methods

showsPrec :: Int -> SHA256Exception -> ShowS

show :: SHA256Exception -> String #

showList :: [SHA256Exception] -> ShowS

Show AggregateRepo 
Instance details

Defined in Pantry.Types

Methods

showsPrec :: Int -> AggregateRepo -> ShowS

show :: AggregateRepo -> String #

showList :: [AggregateRepo] -> ShowS

Show Archive 
Instance details

Defined in Pantry.Types

Methods

showsPrec :: Int -> Archive -> ShowS

show :: Archive -> String #

showList :: [Archive] -> ShowS

Show ArchiveLocation 
Instance details

Defined in Pantry.Types

Show BlobKey 
Instance details

Defined in Pantry.Types

Methods

showsPrec :: Int -> BlobKey -> ShowS

show :: BlobKey -> String #

showList :: [BlobKey] -> ShowS

Show BuildFile 
Instance details

Defined in Pantry.Types

Methods

showsPrec :: Int -> BuildFile -> ShowS

show :: BuildFile -> String #

showList :: [BuildFile] -> ShowS

Show CabalFileInfo 
Instance details

Defined in Pantry.Types

Methods

showsPrec :: Int -> CabalFileInfo -> ShowS

show :: CabalFileInfo -> String #

showList :: [CabalFileInfo] -> ShowS

Show FileSize 
Instance details

Defined in Pantry.Types

Methods

showsPrec :: Int -> FileSize -> ShowS

show :: FileSize -> String #

showList :: [FileSize] -> ShowS

Show FileType 
Instance details

Defined in Pantry.Types

Methods

showsPrec :: Int -> FileType -> ShowS

show :: FileType -> String #

showList :: [FileType] -> ShowS

Show GlobalHintsLocation 
Instance details

Defined in Pantry.Types

Show HackageSecurityConfig 
Instance details

Defined in Pantry.Types

Show HpackExecutable 
Instance details

Defined in Pantry.Types

Show ModuleNameP 
Instance details

Defined in Pantry.Types

Methods

showsPrec :: Int -> ModuleNameP -> ShowS

show :: ModuleNameP -> String #

showList :: [ModuleNameP] -> ShowS

Show OptionalSubdirs 
Instance details

Defined in Pantry.Types

Methods

showsPrec :: Int -> OptionalSubdirs -> ShowS

show :: OptionalSubdirs -> String #

showList :: [OptionalSubdirs] -> ShowS

Show PHpack 
Instance details

Defined in Pantry.Types

Methods

showsPrec :: Int -> PHpack -> ShowS

show :: PHpack -> String #

showList :: [PHpack] -> ShowS

Show Package 
Instance details

Defined in Pantry.Types

Methods

showsPrec :: Int -> Package -> ShowS

show :: Package -> String #

showList :: [Package] -> ShowS

Show PackageCabal 
Instance details

Defined in Pantry.Types

Methods

showsPrec :: Int -> PackageCabal -> ShowS

show :: PackageCabal -> String #

showList :: [PackageCabal] -> ShowS

Show PackageIdentifierRevision 
Instance details

Defined in Pantry.Types

Show PackageIndexConfig 
Instance details

Defined in Pantry.Types

Show PackageLocation 
Instance details

Defined in Pantry.Types

Show PackageLocationImmutable 
Instance details

Defined in Pantry.Types

Show PackageMetadata 
Instance details

Defined in Pantry.Types

Show PackageNameP 
Instance details

Defined in Pantry.Types

Methods

showsPrec :: Int -> PackageNameP -> ShowS

show :: PackageNameP -> String #

showList :: [PackageNameP] -> ShowS

Show PantryException 
Instance details

Defined in Pantry.Types

Show RawArchive 
Instance details

Defined in Pantry.Types

Methods

showsPrec :: Int -> RawArchive -> ShowS

show :: RawArchive -> String #

showList :: [RawArchive] -> ShowS

Show RawPackageLocation 
Instance details

Defined in Pantry.Types

Show RawPackageLocationImmutable 
Instance details

Defined in Pantry.Types

Show RawPackageMetadata 
Instance details

Defined in Pantry.Types

Show RawSnapshotLayer 
Instance details

Defined in Pantry.Types

Show RawSnapshotLocation 
Instance details

Defined in Pantry.Types

Show RelFilePath 
Instance details

Defined in Pantry.Types

Methods

showsPrec :: Int -> RelFilePath -> ShowS

show :: RelFilePath -> String #

showList :: [RelFilePath] -> ShowS

Show Repo 
Instance details

Defined in Pantry.Types

Methods

showsPrec :: Int -> Repo -> ShowS

show :: Repo -> String #

showList :: [Repo] -> ShowS

Show RepoType 
Instance details

Defined in Pantry.Types

Methods

showsPrec :: Int -> RepoType -> ShowS

show :: RepoType -> String #

showList :: [RepoType] -> ShowS

Show Revision 
Instance details

Defined in Pantry.Types

Methods

showsPrec :: Int -> Revision -> ShowS

show :: Revision -> String #

showList :: [Revision] -> ShowS

Show SafeFilePath 
Instance details

Defined in Pantry.Types

Methods

showsPrec :: Int -> SafeFilePath -> ShowS

show :: SafeFilePath -> String #

showList :: [SafeFilePath] -> ShowS

Show SimpleRepo 
Instance details

Defined in Pantry.Types

Methods

showsPrec :: Int -> SimpleRepo -> ShowS

show :: SimpleRepo -> String #

showList :: [SimpleRepo] -> ShowS

Show SnapName 
Instance details

Defined in Pantry.Types

Methods

showsPrec :: Int -> SnapName -> ShowS

show :: SnapName -> String #

showList :: [SnapName] -> ShowS

Show SnapshotCacheHash 
Instance details

Defined in Pantry.Types

Show SnapshotLayer 
Instance details

Defined in Pantry.Types

Methods

showsPrec :: Int -> SnapshotLayer -> ShowS

show :: SnapshotLayer -> String #

showList :: [SnapshotLayer] -> ShowS

Show SnapshotLocation 
Instance details

Defined in Pantry.Types

Show SnapshotPackage 
Instance details

Defined in Pantry.Types

Show Tree 
Instance details

Defined in Pantry.Types

Methods

showsPrec :: Int -> Tree -> ShowS

show :: Tree -> String #

showList :: [Tree] -> ShowS

Show TreeEntry 
Instance details

Defined in Pantry.Types

Methods

showsPrec :: Int -> TreeEntry -> ShowS

show :: TreeEntry -> String #

showList :: [TreeEntry] -> ShowS

Show TreeKey 
Instance details

Defined in Pantry.Types

Methods

showsPrec :: Int -> TreeKey -> ShowS

show :: TreeKey -> String #

showList :: [TreeKey] -> ShowS

Show VersionP 
Instance details

Defined in Pantry.Types

Methods

showsPrec :: Int -> VersionP -> ShowS

show :: VersionP -> String #

showList :: [VersionP] -> ShowS

Show WantedCompiler 
Instance details

Defined in Pantry.Types

Show ParseError 
Instance details

Defined in Text.Parsec.Error

Methods

showsPrec :: Int -> ParseError -> ShowS

show :: ParseError -> String #

showList :: [ParseError] -> ShowS

Show PathException 
Instance details

Defined in Path.Posix

Methods

showsPrec :: Int -> PathException -> ShowS

show :: PathException -> String #

showList :: [PathException] -> ShowS

Show PathException 
Instance details

Defined in Path.Windows

Methods

showsPrec :: Int -> PathException -> ShowS

show :: PathException -> String #

showList :: [PathException] -> ShowS

Show OverflowNatural 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

showsPrec :: Int -> OverflowNatural -> ShowS

show :: OverflowNatural -> String #

showList :: [OverflowNatural] -> ShowS

Show ConstraintNameDB 
Instance details

Defined in Database.Persist.Names

Methods

showsPrec :: Int -> ConstraintNameDB -> ShowS

show :: ConstraintNameDB -> String #

showList :: [ConstraintNameDB] -> ShowS

Show ConstraintNameHS 
Instance details

Defined in Database.Persist.Names

Methods

showsPrec :: Int -> ConstraintNameHS -> ShowS

show :: ConstraintNameHS -> String #

showList :: [ConstraintNameHS] -> ShowS

Show EntityNameDB 
Instance details

Defined in Database.Persist.Names

Methods

showsPrec :: Int -> EntityNameDB -> ShowS

show :: EntityNameDB -> String #

showList :: [EntityNameDB] -> ShowS

Show EntityNameHS 
Instance details

Defined in Database.Persist.Names

Methods

showsPrec :: Int -> EntityNameHS -> ShowS

show :: EntityNameHS -> String #

showList :: [EntityNameHS] -> ShowS

Show FieldNameDB 
Instance details

Defined in Database.Persist.Names

Methods

showsPrec :: Int -> FieldNameDB -> ShowS

show :: FieldNameDB -> String #

showList :: [FieldNameDB] -> ShowS

Show FieldNameHS 
Instance details

Defined in Database.Persist.Names

Methods

showsPrec :: Int -> FieldNameHS -> ShowS

show :: FieldNameHS -> String #

showList :: [FieldNameHS] -> ShowS

Show LiteralType 
Instance details

Defined in Database.Persist.PersistValue

Methods

showsPrec :: Int -> LiteralType -> ShowS

show :: LiteralType -> String #

showList :: [LiteralType] -> ShowS

Show PersistValue 
Instance details

Defined in Database.Persist.PersistValue

Methods

showsPrec :: Int -> PersistValue -> ShowS

show :: PersistValue -> String #

showList :: [PersistValue] -> ShowS

Show ForeignFieldReference 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

showsPrec :: Int -> ForeignFieldReference -> ShowS

show :: ForeignFieldReference -> String #

showList :: [ForeignFieldReference] -> ShowS

Show Line 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

showsPrec :: Int -> Line -> ShowS

show :: Line -> String #

showList :: [Line] -> ShowS

Show LinesWithComments 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

showsPrec :: Int -> LinesWithComments -> ShowS

show :: LinesWithComments -> String #

showList :: [LinesWithComments] -> ShowS

Show PrimarySpec 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

showsPrec :: Int -> PrimarySpec -> ShowS

show :: PrimarySpec -> String #

showList :: [PrimarySpec] -> ShowS

Show Token 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

showsPrec :: Int -> Token -> ShowS

show :: Token -> String #

showList :: [Token] -> ShowS

Show UnboundCompositeDef 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

showsPrec :: Int -> UnboundCompositeDef -> ShowS

show :: UnboundCompositeDef -> String #

showList :: [UnboundCompositeDef] -> ShowS

Show UnboundEntityDef 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

showsPrec :: Int -> UnboundEntityDef -> ShowS

show :: UnboundEntityDef -> String #

showList :: [UnboundEntityDef] -> ShowS

Show UnboundFieldDef 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

showsPrec :: Int -> UnboundFieldDef -> ShowS

show :: UnboundFieldDef -> String #

showList :: [UnboundFieldDef] -> ShowS

Show UnboundForeignDef 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

showsPrec :: Int -> UnboundForeignDef -> ShowS

show :: UnboundForeignDef -> String #

showList :: [UnboundForeignDef] -> ShowS

Show UnboundForeignFieldList 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

showsPrec :: Int -> UnboundForeignFieldList -> ShowS

show :: UnboundForeignFieldList -> String #

showList :: [UnboundForeignFieldList] -> ShowS

Show UnboundIdDef 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

showsPrec :: Int -> UnboundIdDef -> ShowS

show :: UnboundIdDef -> String #

showList :: [UnboundIdDef] -> ShowS

Show PersistUnsafeMigrationException 
Instance details

Defined in Database.Persist.Sql.Migration

Methods

showsPrec :: Int -> PersistUnsafeMigrationException -> ShowS

show :: PersistUnsafeMigrationException -> String #

showList :: [PersistUnsafeMigrationException] -> ShowS

Show IsolationLevel 
Instance details

Defined in Database.Persist.SqlBackend.Internal.IsolationLevel

Methods

showsPrec :: Int -> IsolationLevel -> ShowS

show :: IsolationLevel -> String #

showList :: [IsolationLevel] -> ShowS

Show FTTypeConDescr 
Instance details

Defined in Database.Persist.TH

Methods

showsPrec :: Int -> FTTypeConDescr -> ShowS

show :: FTTypeConDescr -> String #

showList :: [FTTypeConDescr] -> ShowS

Show SqlTypeExp 
Instance details

Defined in Database.Persist.TH

Methods

showsPrec :: Int -> SqlTypeExp -> ShowS

show :: SqlTypeExp -> String #

showList :: [SqlTypeExp] -> ShowS

Show CascadeAction 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> CascadeAction -> ShowS

show :: CascadeAction -> String #

showList :: [CascadeAction] -> ShowS

Show Checkmark 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> Checkmark -> ShowS

show :: Checkmark -> String #

showList :: [Checkmark] -> ShowS

Show CompositeDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> CompositeDef -> ShowS

show :: CompositeDef -> String #

showList :: [CompositeDef] -> ShowS

Show EmbedEntityDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> EmbedEntityDef -> ShowS

show :: EmbedEntityDef -> String #

showList :: [EmbedEntityDef] -> ShowS

Show EmbedFieldDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> EmbedFieldDef -> ShowS

show :: EmbedFieldDef -> String #

showList :: [EmbedFieldDef] -> ShowS

Show EntityDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> EntityDef -> ShowS

show :: EntityDef -> String #

showList :: [EntityDef] -> ShowS

Show EntityIdDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> EntityIdDef -> ShowS

show :: EntityIdDef -> String #

showList :: [EntityIdDef] -> ShowS

Show FieldAttr 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> FieldAttr -> ShowS

show :: FieldAttr -> String #

showList :: [FieldAttr] -> ShowS

Show FieldCascade 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> FieldCascade -> ShowS

show :: FieldCascade -> String #

showList :: [FieldCascade] -> ShowS

Show FieldDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> FieldDef -> ShowS

show :: FieldDef -> String #

showList :: [FieldDef] -> ShowS

Show FieldType 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> FieldType -> ShowS

show :: FieldType -> String #

showList :: [FieldType] -> ShowS

Show FieldTypeLit 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> FieldTypeLit -> ShowS

show :: FieldTypeLit -> String #

showList :: [FieldTypeLit] -> ShowS

Show ForeignDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> ForeignDef -> ShowS

show :: ForeignDef -> String #

showList :: [ForeignDef] -> ShowS

Show IsNullable 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> IsNullable -> ShowS

show :: IsNullable -> String #

showList :: [IsNullable] -> ShowS

Show OnlyUniqueException 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> OnlyUniqueException -> ShowS

show :: OnlyUniqueException -> String #

showList :: [OnlyUniqueException] -> ShowS

Show PersistException 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> PersistException -> ShowS

show :: PersistException -> String #

showList :: [PersistException] -> ShowS

Show PersistFilter 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> PersistFilter -> ShowS

show :: PersistFilter -> String #

showList :: [PersistFilter] -> ShowS

Show PersistUpdate 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> PersistUpdate -> ShowS

show :: PersistUpdate -> String #

showList :: [PersistUpdate] -> ShowS

Show ReferenceDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> ReferenceDef -> ShowS

show :: ReferenceDef -> String #

showList :: [ReferenceDef] -> ShowS

Show SelfEmbed 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> SelfEmbed -> ShowS

show :: SelfEmbed -> String #

showList :: [SelfEmbed] -> ShowS

Show SqlType 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> SqlType -> ShowS

show :: SqlType -> String #

showList :: [SqlType] -> ShowS

Show UniqueDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> UniqueDef -> ShowS

show :: UniqueDef -> String #

showList :: [UniqueDef] -> ShowS

Show UpdateException 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> UpdateException -> ShowS

show :: UpdateException -> String #

showList :: [UpdateException] -> ShowS

Show WhyNullable 
Instance details

Defined in Database.Persist.Types.Base

Methods

showsPrec :: Int -> WhyNullable -> ShowS

show :: WhyNullable -> String #

showList :: [WhyNullable] -> ShowS

Show ForeignKeyViolation 
Instance details

Defined in Database.Persist.Sqlite

Methods

showsPrec :: Int -> ForeignKeyViolation -> ShowS

show :: ForeignKeyViolation -> String #

showList :: [ForeignKeyViolation] -> ShowS

Show SqliteConf 
Instance details

Defined in Database.Persist.Sqlite

Methods

showsPrec :: Int -> SqliteConf -> ShowS

show :: SqliteConf -> String #

showList :: [SqliteConf] -> ShowS

Show SqliteConnectionInfo 
Instance details

Defined in Database.Persist.Sqlite

Methods

showsPrec :: Int -> SqliteConnectionInfo -> ShowS

show :: SqliteConnectionInfo -> String #

showList :: [SqliteConnectionInfo] -> ShowS

Show ColumnType 
Instance details

Defined in Database.Sqlite

Methods

showsPrec :: Int -> ColumnType -> ShowS

show :: ColumnType -> String #

showList :: [ColumnType] -> ShowS

Show Error 
Instance details

Defined in Database.Sqlite

Methods

showsPrec :: Int -> Error -> ShowS

show :: Error -> String #

showList :: [Error] -> ShowS

Show SqliteException 
Instance details

Defined in Database.Sqlite

Methods

showsPrec :: Int -> SqliteException -> ShowS

show :: SqliteException -> String #

showList :: [SqliteException] -> ShowS

Show SqliteStatus 
Instance details

Defined in Database.Sqlite

Methods

showsPrec :: Int -> SqliteStatus -> ShowS

show :: SqliteStatus -> String #

showList :: [SqliteStatus] -> ShowS

Show StepResult 
Instance details

Defined in Database.Sqlite

Methods

showsPrec :: Int -> StepResult -> ShowS

show :: StepResult -> String #

showList :: [StepResult] -> ShowS

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

Methods

showsPrec :: Int -> TextDetails -> ShowS

show :: TextDetails -> String #

showList :: [TextDetails] -> ShowS

Show PrettyLevel 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJClass

Methods

showsPrec :: Int -> PrettyLevel -> ShowS

show :: PrettyLevel -> String #

showList :: [PrettyLevel] -> ShowS

Show Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Methods

showsPrec :: Int -> Doc -> ShowS

show :: Doc -> String #

showList :: [Doc] -> ShowS

Show PrettyLevel 
Instance details

Defined in Text.PrettyPrint.HughesPJClass

Methods

showsPrec :: Int -> PrettyLevel -> ShowS

show :: PrettyLevel -> String #

showList :: [PrettyLevel] -> ShowS

Show FusionDepth 
Instance details

Defined in Prettyprinter.Internal

Methods

showsPrec :: Int -> FusionDepth -> ShowS

show :: FusionDepth -> String #

showList :: [FusionDepth] -> ShowS

Show LayoutOptions 
Instance details

Defined in Prettyprinter.Internal

Methods

showsPrec :: Int -> LayoutOptions -> ShowS

show :: LayoutOptions -> String #

showList :: [LayoutOptions] -> ShowS

Show PageWidth 
Instance details

Defined in Prettyprinter.Internal

Methods

showsPrec :: Int -> PageWidth -> ShowS

show :: PageWidth -> String #

showList :: [PageWidth] -> ShowS

Show AnsiStyle 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

showsPrec :: Int -> AnsiStyle -> ShowS

show :: AnsiStyle -> String #

showList :: [AnsiStyle] -> ShowS

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

Methods

showsPrec :: Int -> Intensity -> ShowS

show :: Intensity -> String #

showList :: [Intensity] -> ShowS

Show Italicized 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

showsPrec :: Int -> Italicized -> ShowS

show :: Italicized -> String #

showList :: [Italicized] -> ShowS

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

Methods

showsPrec :: Int -> Underlined -> ShowS

show :: Underlined -> String #

showList :: [Underlined] -> ShowS

Show CmdSpec 
Instance details

Defined in System.Process.Common

Methods

showsPrec :: Int -> CmdSpec -> ShowS

show :: CmdSpec -> String #

showList :: [CmdSpec] -> ShowS

Show CreateProcess 
Instance details

Defined in System.Process.Common

Methods

showsPrec :: Int -> CreateProcess -> ShowS

show :: CreateProcess -> String #

showList :: [CreateProcess] -> ShowS

Show StdStream 
Instance details

Defined in System.Process.Common

Methods

showsPrec :: Int -> StdStream -> ShowS

show :: StdStream -> String #

showList :: [StdStream] -> ShowS

Show CommunicationHandle 
Instance details

Defined in System.Process.CommunicationHandle.Internal

Methods

showsPrec :: Int -> CommunicationHandle -> ShowS

show :: CommunicationHandle -> String #

showList :: [CommunicationHandle] -> ShowS

Show ProjectTemplateException 
Instance details

Defined in Text.ProjectTemplate

Show StdGen 
Instance details

Defined in System.Random.Internal

Methods

showsPrec :: Int -> StdGen -> ShowS

show :: StdGen -> String #

showList :: [StdGen] -> ShowS

Show InvalidAccess 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

showsPrec :: Int -> InvalidAccess -> ShowS

show :: InvalidAccess -> String #

showList :: [InvalidAccess] -> ShowS

Show ResourceCleanupException 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

showsPrec :: Int -> ResourceCleanupException -> ShowS

show :: ResourceCleanupException -> String #

showList :: [ResourceCleanupException] -> ShowS

Show RetryAction 
Instance details

Defined in Control.Retry

Methods

showsPrec :: Int -> RetryAction -> ShowS

show :: RetryAction -> String #

showList :: [RetryAction] -> ShowS

Show RetryStatus 
Instance details

Defined in Control.Retry

Methods

showsPrec :: Int -> RetryStatus -> ShowS

show :: RetryStatus -> String #

showList :: [RetryStatus] -> ShowS

Show LogLevel 
Instance details

Defined in RIO.Prelude.Logger

Methods

showsPrec :: Int -> LogLevel -> ShowS

show :: LogLevel -> String #

showList :: [LogLevel] -> ShowS

Show ProcessException 
Instance details

Defined in RIO.Process

Methods

showsPrec :: Int -> ProcessException -> ShowS

show :: ProcessException -> String #

showList :: [ProcessException] -> ShowS

Show PrettyException 
Instance details

Defined in RIO.PrettyPrint.PrettyException

Show StylesUpdate 
Instance details

Defined in RIO.PrettyPrint.StylesUpdate

Methods

showsPrec :: Int -> StylesUpdate -> ShowS

show :: StylesUpdate -> String #

showList :: [StylesUpdate] -> ShowS

Show Style 
Instance details

Defined in RIO.PrettyPrint.Types

Methods

showsPrec :: Int -> Style -> ShowS

show :: Style -> String #

showList :: [Style] -> ShowS

Show AnsiAnn 
Instance details

Defined in Text.PrettyPrint.Leijen.Extended

Methods

showsPrec :: Int -> AnsiAnn -> ShowS

show :: AnsiAnn -> String #

showList :: [AnsiAnn] -> ShowS

Show StyleAnn 
Instance details

Defined in Text.PrettyPrint.Leijen.Extended

Methods

showsPrec :: Int -> StyleAnn -> ShowS

show :: StyleAnn -> String #

showList :: [StyleAnn] -> ShowS

Show StyleDoc 
Instance details

Defined in Text.PrettyPrint.Leijen.Extended

Methods

showsPrec :: Int -> StyleDoc -> ShowS

show :: StyleDoc -> String #

showList :: [StyleDoc] -> ShowS

Show AsyncExceptionWrapper 
Instance details

Defined in Control.Exception.Safe

Show StringException 
Instance details

Defined in Control.Exception.Safe

Methods

showsPrec :: Int -> StringException -> ShowS

show :: StringException -> String #

showList :: [StringException] -> ShowS

Show SyncExceptionWrapper 
Instance details

Defined in Control.Exception.Safe

Show Scientific 
Instance details

Defined in Data.Scientific

Methods

showsPrec :: Int -> Scientific -> ShowS

show :: Scientific -> String #

showList :: [Scientific] -> ShowS

Show CondensePolicy 
Instance details

Defined in Data.List.Split.Internals

Methods

showsPrec :: Int -> CondensePolicy -> ShowS

show :: CondensePolicy -> String #

showList :: [CondensePolicy] -> ShowS

Show DelimPolicy 
Instance details

Defined in Data.List.Split.Internals

Methods

showsPrec :: Int -> DelimPolicy -> ShowS

show :: DelimPolicy -> String #

showList :: [DelimPolicy] -> ShowS

Show EndPolicy 
Instance details

Defined in Data.List.Split.Internals

Methods

showsPrec :: Int -> EndPolicy -> ShowS

show :: EndPolicy -> String #

showList :: [EndPolicy] -> ShowS

Show ActionId Source # 
Instance details

Defined in Control.Concurrent.Execute

Methods

showsPrec :: Int -> ActionId -> ShowS

show :: ActionId -> String #

showList :: [ActionId] -> ShowS

Show ActionType Source # 
Instance details

Defined in Control.Concurrent.Execute

Methods

showsPrec :: Int -> ActionType -> ShowS

show :: ActionType -> String #

showList :: [ActionType] -> ShowS

Show EscapingMode Source # 
Instance details

Defined in Data.Attoparsec.Args

Methods

showsPrec :: Int -> EscapingMode -> ShowS

show :: EscapingMode -> String #

showList :: [EscapingMode] -> ShowS

Show RawTarget Source # 
Instance details

Defined in Stack.Build.Target

Methods

showsPrec :: Int -> RawTarget -> ShowS

show :: RawTarget -> String #

showList :: [RawTarget] -> ShowS

Show UnresolvedComponent Source # 
Instance details

Defined in Stack.Build.Target

Show BuildPlanCheck Source # 
Instance details

Defined in Stack.BuildPlan

Show BuildPlanException Source # 
Instance details

Defined in Stack.BuildPlan

Show DepError Source # 
Instance details

Defined in Stack.BuildPlan

Methods

showsPrec :: Int -> DepError -> ShowS

show :: DepError -> String #

showList :: [DepError] -> ShowS

Show ConfigDockerException Source # 
Instance details

Defined in Stack.Config.Docker

Show HpcReportOpts Source # 
Instance details

Defined in Stack.Coverage

Methods

showsPrec :: Int -> HpcReportOpts -> ShowS

show :: HpcReportOpts -> String #

showList :: [HpcReportOpts] -> ShowS

Show EvalOpts Source # 
Instance details

Defined in Stack.Eval

Methods

showsPrec :: Int -> EvalOpts -> ShowS

show :: EvalOpts -> String #

showList :: [EvalOpts] -> ShowS

Show ExecOpts Source # 
Instance details

Defined in Stack.Exec

Methods

showsPrec :: Int -> ExecOpts -> ShowS

show :: ExecOpts -> String #

showList :: [ExecOpts] -> ShowS

Show ExecOptsExtra Source # 
Instance details

Defined in Stack.Exec

Methods

showsPrec :: Int -> ExecOptsExtra -> ShowS

show :: ExecOptsExtra -> String #

showList :: [ExecOptsExtra] -> ShowS

Show SpecialExecCmd Source # 
Instance details

Defined in Stack.Exec

Show GhciException Source # 
Instance details

Defined in Stack.Ghci

Methods

showsPrec :: Int -> GhciException -> ShowS

show :: GhciException -> String #

showList :: [GhciException] -> ShowS

Show GhciOpts Source # 
Instance details

Defined in Stack.Ghci

Methods

showsPrec :: Int -> GhciOpts -> ShowS

show :: GhciOpts -> String #

showList :: [GhciOpts] -> ShowS

Show GhciPkgInfo Source # 
Instance details

Defined in Stack.Ghci

Methods

showsPrec :: Int -> GhciPkgInfo -> ShowS

show :: GhciPkgInfo -> String #

showList :: [GhciPkgInfo] -> ShowS

Show GhciPrettyException Source # 
Instance details

Defined in Stack.Ghci

Show Locked Source # 
Instance details

Defined in Stack.Lock

Methods

showsPrec :: Int -> Locked -> ShowS

show :: Locked -> String #

showList :: [Locked] -> ShowS

Show ListStylesOpts Source # 
Instance details

Defined in Stack.Ls

Show LsView Source # 
Instance details

Defined in Stack.Ls

Methods

showsPrec :: Int -> LsView -> ShowS

show :: LsView -> String #

showList :: [LsView] -> ShowS

Show SnapshotOpts Source # 
Instance details

Defined in Stack.Ls

Methods

showsPrec :: Int -> SnapshotOpts -> ShowS

show :: SnapshotOpts -> String #

showList :: [SnapshotOpts] -> ShowS

Show GlobalOptsContext Source # 
Instance details

Defined in Stack.Options.Utils

Show FirstFalse Source # 
Instance details

Defined in Stack.Prelude

Methods

showsPrec :: Int -> FirstFalse -> ShowS

show :: FirstFalse -> String #

showList :: [FirstFalse] -> ShowS

Show FirstTrue Source # 
Instance details

Defined in Stack.Prelude

Methods

showsPrec :: Int -> FirstTrue -> ShowS

show :: FirstTrue -> String #

showList :: [FirstTrue] -> ShowS

Show ScriptExecute Source # 
Instance details

Defined in Stack.Script

Methods

showsPrec :: Int -> ScriptExecute -> ShowS

show :: ScriptExecute -> String #

showList :: [ScriptExecute] -> ShowS

Show ScriptOpts Source # 
Instance details

Defined in Stack.Script

Methods

showsPrec :: Int -> ScriptOpts -> ShowS

show :: ScriptOpts -> String #

showList :: [ScriptOpts] -> ShowS

Show ShouldRun Source # 
Instance details

Defined in Stack.Script

Methods

showsPrec :: Int -> ShouldRun -> ShowS

show :: ShouldRun -> String #

showList :: [ShouldRun] -> ShowS

Show SetupOpts Source # 
Instance details

Defined in Stack.Setup

Methods

showsPrec :: Int -> SetupOpts -> ShowS

show :: SetupOpts -> String #

showList :: [SetupOpts] -> ShowS

Show AllowNewerDeps Source # 
Instance details

Defined in Stack.Types.AllowNewerDeps

Show ApplyGhcOptions Source # 
Instance details

Defined in Stack.Types.ApplyGhcOptions

Show ApplyProgOptions Source # 
Instance details

Defined in Stack.Types.ApplyProgOptions

Show BuildCache Source # 
Instance details

Defined in Stack.Types.Build

Methods

showsPrec :: Int -> BuildCache -> ShowS

show :: BuildCache -> String #

showList :: [BuildCache] -> ShowS

Show CachePkgSrc Source # 
Instance details

Defined in Stack.Types.Build

Methods

showsPrec :: Int -> CachePkgSrc -> ShowS

show :: CachePkgSrc -> String #

showList :: [CachePkgSrc] -> ShowS

Show ConfigCache Source # 
Instance details

Defined in Stack.Types.Build

Methods

showsPrec :: Int -> ConfigCache -> ShowS

show :: ConfigCache -> String #

showList :: [ConfigCache] -> ShowS

Show Plan Source # 
Instance details

Defined in Stack.Types.Build

Methods

showsPrec :: Int -> Plan -> ShowS

show :: Plan -> String #

showList :: [Plan] -> ShowS

Show Task Source # 
Instance details

Defined in Stack.Types.Build

Methods

showsPrec :: Int -> Task -> ShowS

show :: Task -> String #

showList :: [Task] -> ShowS

Show TaskConfigOpts Source # 
Instance details

Defined in Stack.Types.Build

Show TaskType Source # 
Instance details

Defined in Stack.Types.Build

Methods

showsPrec :: Int -> TaskType -> ShowS

show :: TaskType -> String #

showList :: [TaskType] -> ShowS

Show AddDepRes Source # 
Instance details

Defined in Stack.Types.Build.ConstructPlan

Methods

showsPrec :: Int -> AddDepRes -> ShowS

show :: AddDepRes -> String #

showList :: [AddDepRes] -> ShowS

Show MissingPresentDeps Source # 
Instance details

Defined in Stack.Types.Build.ConstructPlan

Show PackageInfo Source # 
Instance details

Defined in Stack.Types.Build.ConstructPlan

Methods

showsPrec :: Int -> PackageInfo -> ShowS

show :: PackageInfo -> String #

showList :: [PackageInfo] -> ShowS

Show ToolWarning Source # 
Instance details

Defined in Stack.Types.Build.ConstructPlan

Methods

showsPrec :: Int -> ToolWarning -> ShowS

show :: ToolWarning -> String #

showList :: [ToolWarning] -> ShowS

Show BadDependency Source # 
Instance details

Defined in Stack.Types.Build.Exception

Methods

showsPrec :: Int -> BadDependency -> ShowS

show :: BadDependency -> String #

showList :: [BadDependency] -> ShowS

Show BuildException Source # 
Instance details

Defined in Stack.Types.Build.Exception

Show BuildPrettyException Source # 
Instance details

Defined in Stack.Types.Build.Exception

Show ConstructPlanException Source # 
Instance details

Defined in Stack.Types.Build.Exception

Show BenchmarkOpts Source # 
Instance details

Defined in Stack.Types.BuildOpts

Methods

showsPrec :: Int -> BenchmarkOpts -> ShowS

show :: BenchmarkOpts -> String #

showList :: [BenchmarkOpts] -> ShowS

Show BuildOpts Source # 
Instance details

Defined in Stack.Types.BuildOpts

Methods

showsPrec :: Int -> BuildOpts -> ShowS

show :: BuildOpts -> String #

showList :: [BuildOpts] -> ShowS

Show HaddockOpts Source # 
Instance details

Defined in Stack.Types.BuildOpts

Methods

showsPrec :: Int -> HaddockOpts -> ShowS

show :: HaddockOpts -> String #

showList :: [HaddockOpts] -> ShowS

Show TestOpts Source # 
Instance details

Defined in Stack.Types.BuildOpts

Methods

showsPrec :: Int -> TestOpts -> ShowS

show :: TestOpts -> String #

showList :: [TestOpts] -> ShowS

Show ApplyCLIFlag Source # 
Instance details

Defined in Stack.Types.BuildOptsCLI

Methods

showsPrec :: Int -> ApplyCLIFlag -> ShowS

show :: ApplyCLIFlag -> String #

showList :: [ApplyCLIFlag] -> ShowS

Show BuildCommand Source # 
Instance details

Defined in Stack.Types.BuildOptsCLI

Methods

showsPrec :: Int -> BuildCommand -> ShowS

show :: BuildCommand -> String #

showList :: [BuildCommand] -> ShowS

Show BuildOptsCLI Source # 
Instance details

Defined in Stack.Types.BuildOptsCLI

Methods

showsPrec :: Int -> BuildOptsCLI -> ShowS

show :: BuildOptsCLI -> String #

showList :: [BuildOptsCLI] -> ShowS

Show BuildSubset Source # 
Instance details

Defined in Stack.Types.BuildOptsCLI

Methods

showsPrec :: Int -> BuildSubset -> ShowS

show :: BuildSubset -> String #

showList :: [BuildSubset] -> ShowS

Show FileWatchOpts Source # 
Instance details

Defined in Stack.Types.BuildOptsCLI

Methods

showsPrec :: Int -> FileWatchOpts -> ShowS

show :: FileWatchOpts -> String #

showList :: [FileWatchOpts] -> ShowS

Show BenchmarkOptsMonoid Source # 
Instance details

Defined in Stack.Types.BuildOptsMonoid

Show BuildOptsMonoid Source # 
Instance details

Defined in Stack.Types.BuildOptsMonoid

Show CabalVerbosity Source # 
Instance details

Defined in Stack.Types.BuildOptsMonoid

Show HaddockOptsMonoid Source # 
Instance details

Defined in Stack.Types.BuildOptsMonoid

Show ProgressBarFormat Source # 
Instance details

Defined in Stack.Types.BuildOptsMonoid

Show TestOptsMonoid Source # 
Instance details

Defined in Stack.Types.BuildOptsMonoid

Show CabalConfigKey Source # 
Instance details

Defined in Stack.Types.CabalConfigKey

Show Action Source # 
Instance details

Defined in Stack.Types.Cache

Methods

showsPrec :: Int -> Action -> ShowS

show :: Action -> String #

showList :: [Action] -> ShowS

Show ConfigCacheType Source # 
Instance details

Defined in Stack.Types.Cache

Show CasaOptsMonoid Source # 
Instance details

Defined in Stack.Types.Casa

Show ColorWhen Source # 
Instance details

Defined in Stack.Types.ColorWhen

Methods

showsPrec :: Int -> ColorWhen -> ShowS

show :: ColorWhen -> String #

showList :: [ColorWhen] -> ShowS

Show ActualCompiler Source # 
Instance details

Defined in Stack.Types.Compiler

Show CompilerException Source # 
Instance details

Defined in Stack.Types.Compiler

Show CompilerRepository Source # 
Instance details

Defined in Stack.Types.Compiler

Show WhichCompiler Source # 
Instance details

Defined in Stack.Types.Compiler

Methods

showsPrec :: Int -> WhichCompiler -> ShowS

show :: WhichCompiler -> String #

showList :: [WhichCompiler] -> ShowS

Show CompilerBuild Source # 
Instance details

Defined in Stack.Types.CompilerBuild

Methods

showsPrec :: Int -> CompilerBuild -> ShowS

show :: CompilerBuild -> String #

showList :: [CompilerBuild] -> ShowS

Show CompilerPaths Source # 
Instance details

Defined in Stack.Types.CompilerPaths

Methods

showsPrec :: Int -> CompilerPaths -> ShowS

show :: CompilerPaths -> String #

showList :: [CompilerPaths] -> ShowS

Show GhcPkgExe Source # 
Instance details

Defined in Stack.Types.CompilerPaths

Methods

showsPrec :: Int -> GhcPkgExe -> ShowS

show :: GhcPkgExe -> String #

showList :: [GhcPkgExe] -> ShowS

Show StackBenchmark Source # 
Instance details

Defined in Stack.Types.Component

Show StackBuildInfo Source # 
Instance details

Defined in Stack.Types.Component

Show StackExecutable Source # 
Instance details

Defined in Stack.Types.Component

Show StackForeignLibrary Source # 
Instance details

Defined in Stack.Types.Component

Show StackLibrary Source # 
Instance details

Defined in Stack.Types.Component

Methods

showsPrec :: Int -> StackLibrary -> ShowS

show :: StackLibrary -> String #

showList :: [StackLibrary] -> ShowS

Show StackTestSuite Source # 
Instance details

Defined in Stack.Types.Component

Show StackUnqualCompName Source # 
Instance details

Defined in Stack.Types.ComponentUtils

Show ConfigException Source # 
Instance details

Defined in Stack.Types.Config.Exception

Show ConfigPrettyException Source # 
Instance details

Defined in Stack.Types.Config.Exception

Show ParseAbsolutePathException Source # 
Instance details

Defined in Stack.Types.Config.Exception

Show BaseConfigOpts Source # 
Instance details

Defined in Stack.Types.ConfigureOpts

Show ConfigureOpts Source # 
Instance details

Defined in Stack.Types.ConfigureOpts

Methods

showsPrec :: Int -> ConfigureOpts -> ShowS

show :: ConfigureOpts -> String #

showList :: [ConfigureOpts] -> ShowS

Show PackageConfigureOpts Source # 
Instance details

Defined in Stack.Types.ConfigureOpts

Show Curator Source # 
Instance details

Defined in Stack.Types.Curator

Methods

showsPrec :: Int -> Curator -> ShowS

show :: Curator -> String #

showList :: [Curator] -> ShowS

Show DepLibrary Source # 
Instance details

Defined in Stack.Types.Dependency

Methods

showsPrec :: Int -> DepLibrary -> ShowS

show :: DepLibrary -> String #

showList :: [DepLibrary] -> ShowS

Show DepType Source # 
Instance details

Defined in Stack.Types.Dependency

Methods

showsPrec :: Int -> DepType -> ShowS

show :: DepType -> String #

showList :: [DepType] -> ShowS

Show DepValue Source # 
Instance details

Defined in Stack.Types.Dependency

Methods

showsPrec :: Int -> DepValue -> ShowS

show :: DepValue -> String #

showList :: [DepValue] -> ShowS

Show DotPayload Source # 
Instance details

Defined in Stack.Types.DependencyTree

Methods

showsPrec :: Int -> DotPayload -> ShowS

show :: DotPayload -> String #

showList :: [DotPayload] -> ShowS

Show DockerException Source # 
Instance details

Defined in Stack.Types.Docker

Show DockerMonoidRepoOrImage Source # 
Instance details

Defined in Stack.Types.Docker

Show DockerOpts Source # 
Instance details

Defined in Stack.Types.Docker

Methods

showsPrec :: Int -> DockerOpts -> ShowS

show :: DockerOpts -> String #

showList :: [DockerOpts] -> ShowS

Show DockerOptsMonoid Source # 
Instance details

Defined in Stack.Types.Docker

Show DockerStackExe Source # 
Instance details

Defined in Stack.Types.Docker

Show Mount Source #

Show instance.

Instance details

Defined in Stack.Types.Docker

Methods

showsPrec :: Int -> Mount -> ShowS

show :: Mount -> String #

showList :: [Mount] -> ShowS

Show DockerEntrypoint Source # 
Instance details

Defined in Stack.Types.DockerEntrypoint

Show DockerUser Source # 
Instance details

Defined in Stack.Types.DockerEntrypoint

Methods

showsPrec :: Int -> DockerUser -> ShowS

show :: DockerUser -> String #

showList :: [DockerUser] -> ShowS

Show DownloadInfo Source # 
Instance details

Defined in Stack.Types.DownloadInfo

Methods

showsPrec :: Int -> DownloadInfo -> ShowS

show :: DownloadInfo -> String #

showList :: [DownloadInfo] -> ShowS

Show DumpLogs Source # 
Instance details

Defined in Stack.Types.DumpLogs

Methods

showsPrec :: Int -> DumpLogs -> ShowS

show :: DumpLogs -> String #

showList :: [DumpLogs] -> ShowS

Show DumpPackage Source # 
Instance details

Defined in Stack.Types.DumpPackage

Methods

showsPrec :: Int -> DumpPackage -> ShowS

show :: DumpPackage -> String #

showList :: [DumpPackage] -> ShowS

Show SublibDump Source # 
Instance details

Defined in Stack.Types.DumpPackage

Methods

showsPrec :: Int -> SublibDump -> ShowS

show :: SublibDump -> String #

showList :: [SublibDump] -> ShowS

Show EnvSettings Source # 
Instance details

Defined in Stack.Types.EnvSettings

Methods

showsPrec :: Int -> EnvSettings -> ShowS

show :: EnvSettings -> String #

showList :: [EnvSettings] -> ShowS

Show ExtraDirs Source # 
Instance details

Defined in Stack.Types.ExtraDirs

Methods

showsPrec :: Int -> ExtraDirs -> ShowS

show :: ExtraDirs -> String #

showList :: [ExtraDirs] -> ShowS

Show GHCDownloadInfo Source # 
Instance details

Defined in Stack.Types.GHCDownloadInfo

Show GHCVariant Source # 
Instance details

Defined in Stack.Types.GHCVariant

Methods

showsPrec :: Int -> GHCVariant -> ShowS

show :: GHCVariant -> String #

showList :: [GHCVariant] -> ShowS

Show GhcPkgId Source # 
Instance details

Defined in Stack.Types.GhcPkgId

Methods

showsPrec :: Int -> GhcPkgId -> ShowS

show :: GhcPkgId -> String #

showList :: [GhcPkgId] -> ShowS

Show InstallLocation Source # 
Instance details

Defined in Stack.Types.Installed

Show Installed Source # 
Instance details

Defined in Stack.Types.Installed

Methods

showsPrec :: Int -> Installed -> ShowS

show :: Installed -> String #

showList :: [Installed] -> ShowS

Show InstalledLibraryInfo Source # 
Instance details

Defined in Stack.Types.Installed

Show InstalledPackageLocation Source # 
Instance details

Defined in Stack.Types.Installed

Show PackageDatabase Source # 
Instance details

Defined in Stack.Types.Installed

Show PackageDbVariety Source # 
Instance details

Defined in Stack.Types.Installed

Show IsMutable Source # 
Instance details

Defined in Stack.Types.IsMutable

Methods

showsPrec :: Int -> IsMutable -> ShowS

show :: IsMutable -> String #

showList :: [IsMutable] -> ShowS

Show LockFileBehavior Source # 
Instance details

Defined in Stack.Types.LockFileBehavior

Show MsysEnvironment Source # 
Instance details

Defined in Stack.Types.MsysEnvironment

Show NamedComponent Source # 
Instance details

Defined in Stack.Types.NamedComponent

Show NixOpts Source # 
Instance details

Defined in Stack.Types.Nix

Methods

showsPrec :: Int -> NixOpts -> ShowS

show :: NixOpts -> String #

showList :: [NixOpts] -> ShowS

Show NixOptsMonoid Source # 
Instance details

Defined in Stack.Types.Nix

Methods

showsPrec :: Int -> NixOptsMonoid -> ShowS

show :: NixOptsMonoid -> String #

showList :: [NixOptsMonoid] -> ShowS

Show BuildInfoOpts Source # 
Instance details

Defined in Stack.Types.Package

Methods

showsPrec :: Int -> BuildInfoOpts -> ShowS

show :: BuildInfoOpts -> String #

showList :: [BuildInfoOpts] -> ShowS

Show ExeName Source # 
Instance details

Defined in Stack.Types.Package

Methods

showsPrec :: Int -> ExeName -> ShowS

show :: ExeName -> String #

showList :: [ExeName] -> ShowS

Show FileCacheInfo Source # 
Instance details

Defined in Stack.Types.Package

Methods

showsPrec :: Int -> FileCacheInfo -> ShowS

show :: FileCacheInfo -> String #

showList :: [FileCacheInfo] -> ShowS

Show LocalPackage Source # 
Instance details

Defined in Stack.Types.Package

Methods

showsPrec :: Int -> LocalPackage -> ShowS

show :: LocalPackage -> String #

showList :: [LocalPackage] -> ShowS

Show Package Source # 
Instance details

Defined in Stack.Types.Package

Methods

showsPrec :: Int -> Package -> ShowS

show :: Package -> String #

showList :: [Package] -> ShowS

Show PackageConfig Source # 
Instance details

Defined in Stack.Types.Package

Methods

showsPrec :: Int -> PackageConfig -> ShowS

show :: PackageConfig -> String #

showList :: [PackageConfig] -> ShowS

Show PackageException Source # 
Instance details

Defined in Stack.Types.Package

Show PackageSource Source # 
Instance details

Defined in Stack.Types.Package

Methods

showsPrec :: Int -> PackageSource -> ShowS

show :: PackageSource -> String #

showList :: [PackageSource] -> ShowS

Show DotCabalDescriptor Source # 
Instance details

Defined in Stack.Types.PackageFile

Show DotCabalPath Source # 
Instance details

Defined in Stack.Types.PackageFile

Methods

showsPrec :: Int -> DotCabalPath -> ShowS

show :: DotCabalPath -> String #

showList :: [DotCabalPath] -> ShowS

Show StackPackageFile Source # 
Instance details

Defined in Stack.Types.PackageFile

Show Project Source # 
Instance details

Defined in Stack.Types.Project

Methods

showsPrec :: Int -> Project -> ShowS

show :: Project -> String #

showList :: [Project] -> ShowS

Show PvpBounds Source # 
Instance details

Defined in Stack.Types.PvpBounds

Methods

showsPrec :: Int -> PvpBounds -> ShowS

show :: PvpBounds -> String #

showList :: [PvpBounds] -> ShowS

Show PvpBoundsType Source # 
Instance details

Defined in Stack.Types.PvpBounds

Methods

showsPrec :: Int -> PvpBoundsType -> ShowS

show :: PvpBoundsType -> String #

showList :: [PvpBoundsType] -> ShowS

Show SCM Source # 
Instance details

Defined in Stack.Types.SCM

Methods

showsPrec :: Int -> SCM -> ShowS

show :: SCM -> String #

showList :: [SCM] -> ShowS

Show SetupInfo Source # 
Instance details

Defined in Stack.Types.SetupInfo

Methods

showsPrec :: Int -> SetupInfo -> ShowS

show :: SetupInfo -> String #

showList :: [SetupInfo] -> ShowS

Show AbstractSnapshot Source # 
Instance details

Defined in Stack.Types.Snapshot

Show Snapshots Source # 
Instance details

Defined in Stack.Types.Snapshot

Methods

showsPrec :: Int -> Snapshots -> ShowS

show :: Snapshots -> String #

showList :: [Snapshots] -> ShowS

Show FromSnapshot Source # 
Instance details

Defined in Stack.Types.SourceMap

Methods

showsPrec :: Int -> FromSnapshot -> ShowS

show :: FromSnapshot -> String #

showList :: [FromSnapshot] -> ShowS

Show PackageType Source # 
Instance details

Defined in Stack.Types.SourceMap

Methods

showsPrec :: Int -> PackageType -> ShowS

show :: PackageType -> String #

showList :: [PackageType] -> ShowS

Show StackYamlLoc Source # 
Instance details

Defined in Stack.Types.StackYamlLoc

Methods

showsPrec :: Int -> StackYamlLoc -> ShowS

show :: StackYamlLoc -> String #

showList :: [StackYamlLoc] -> ShowS

Show StoragePrettyException Source # 
Instance details

Defined in Stack.Types.Storage

Show RepoService Source # 
Instance details

Defined in Stack.Types.TemplateName

Methods

showsPrec :: Int -> RepoService -> ShowS

show :: RepoService -> String #

showList :: [RepoService] -> ShowS

Show RepoTemplatePath Source # 
Instance details

Defined in Stack.Types.TemplateName

Show TemplateName Source # 
Instance details

Defined in Stack.Types.TemplateName

Methods

showsPrec :: Int -> TemplateName -> ShowS

show :: TemplateName -> String #

showList :: [TemplateName] -> ShowS

Show TemplatePath Source # 
Instance details

Defined in Stack.Types.TemplateName

Methods

showsPrec :: Int -> TemplatePath -> ShowS

show :: TemplatePath -> String #

showList :: [TemplatePath] -> ShowS

Show FlagSource Source # 
Instance details

Defined in Stack.Types.UnusedFlags

Methods

showsPrec :: Int -> FlagSource -> ShowS

show :: FlagSource -> String #

showList :: [FlagSource] -> ShowS

Show UnusedFlags Source # 
Instance details

Defined in Stack.Types.UnusedFlags

Methods

showsPrec :: Int -> UnusedFlags -> ShowS

show :: UnusedFlags -> String #

showList :: [UnusedFlags] -> ShowS

Show IntersectingVersionRange Source # 
Instance details

Defined in Stack.Types.Version

Show VersionCheck Source # 
Instance details

Defined in Stack.Types.Version

Methods

showsPrec :: Int -> VersionCheck -> ShowS

show :: VersionCheck -> String #

showList :: [VersionCheck] -> ShowS

Show VersionedDownloadInfo Source # 
Instance details

Defined in Stack.Types.VersionedDownloadInfo

Show WantedCompilerSetter Source # 
Instance details

Defined in Stack.Types.WantedCompilerSetter

Show BinaryOpts Source # 
Instance details

Defined in Stack.Upgrade

Methods

showsPrec :: Int -> BinaryOpts -> ShowS

show :: BinaryOpts -> String #

showList :: [BinaryOpts] -> ShowS

Show SourceOpts Source # 
Instance details

Defined in Stack.Upgrade

Methods

showsPrec :: Int -> SourceOpts -> ShowS

show :: SourceOpts -> String #

showList :: [SourceOpts] -> ShowS

Show UpgradeOpts Source # 
Instance details

Defined in Stack.Upgrade

Methods

showsPrec :: Int -> UpgradeOpts -> ShowS

show :: UpgradeOpts -> String #

showList :: [UpgradeOpts] -> ShowS

Show HackageAuth Source # 
Instance details

Defined in Stack.Upload

Methods

showsPrec :: Int -> HackageAuth -> ShowS

show :: HackageAuth -> String #

showList :: [HackageAuth] -> ShowS

Show HackageCreds Source # 
Instance details

Defined in Stack.Upload

Methods

showsPrec :: Int -> HackageCreds -> ShowS

show :: HackageCreds -> String #

showList :: [HackageCreds] -> ShowS

Show HackageKey Source # 
Instance details

Defined in Stack.Upload

Methods

showsPrec :: Int -> HackageKey -> ShowS

show :: HackageKey -> String #

showList :: [HackageKey] -> ShowS

Show PagerException Source # 
Instance details

Defined in System.Process.Pager

Show Bytes128 
Instance details

Defined in Data.StaticBytes

Methods

showsPrec :: Int -> Bytes128 -> ShowS

show :: Bytes128 -> String #

showList :: [Bytes128] -> ShowS

Show Bytes16 
Instance details

Defined in Data.StaticBytes

Methods

showsPrec :: Int -> Bytes16 -> ShowS

show :: Bytes16 -> String #

showList :: [Bytes16] -> ShowS

Show Bytes32 
Instance details

Defined in Data.StaticBytes

Methods

showsPrec :: Int -> Bytes32 -> ShowS

show :: Bytes32 -> String #

showList :: [Bytes32] -> ShowS

Show Bytes64 
Instance details

Defined in Data.StaticBytes

Methods

showsPrec :: Int -> Bytes64 -> ShowS

show :: Bytes64 -> String #

showList :: [Bytes64] -> ShowS

Show Bytes8 
Instance details

Defined in Data.StaticBytes

Methods

showsPrec :: Int -> Bytes8 -> ShowS

show :: Bytes8 -> String #

showList :: [Bytes8] -> ShowS

Show StaticBytesException 
Instance details

Defined in Data.StaticBytes

Show FormatError 
Instance details

Defined in Codec.Archive.Tar.Read

Methods

showsPrec :: Int -> FormatError -> ShowS

show :: FormatError -> String #

showList :: [FormatError] -> ShowS

Show Format 
Instance details

Defined in Codec.Archive.Tar.Types

Methods

showsPrec :: Int -> Format -> ShowS

show :: Format -> String #

showList :: [Format] -> ShowS

Show LinkTarget 
Instance details

Defined in Codec.Archive.Tar.Types

Methods

showsPrec :: Int -> LinkTarget -> ShowS

show :: LinkTarget -> String #

showList :: [LinkTarget] -> ShowS

Show LinkTargetException 
Instance details

Defined in Codec.Archive.Tar.Types

Methods

showsPrec :: Int -> LinkTargetException -> ShowS

show :: LinkTargetException -> String #

showList :: [LinkTargetException] -> ShowS

Show Ownership 
Instance details

Defined in Codec.Archive.Tar.Types

Methods

showsPrec :: Int -> Ownership -> ShowS

show :: Ownership -> String #

showList :: [Ownership] -> ShowS

Show TarPath 
Instance details

Defined in Codec.Archive.Tar.Types

Methods

showsPrec :: Int -> TarPath -> ShowS

show :: TarPath -> String #

showList :: [TarPath] -> ShowS

Show FileInfo 
Instance details

Defined in Data.Conduit.Tar.Types

Methods

showsPrec :: Int -> FileInfo -> ShowS

show :: FileInfo -> String #

showList :: [FileInfo] -> ShowS

Show FileType 
Instance details

Defined in Data.Conduit.Tar.Types

Methods

showsPrec :: Int -> FileType -> ShowS

show :: FileType -> String #

showList :: [FileType] -> ShowS

Show Header 
Instance details

Defined in Data.Conduit.Tar.Types

Methods

showsPrec :: Int -> Header -> ShowS

show :: Header -> String #

showList :: [Header] -> ShowS

Show TarChunk 
Instance details

Defined in Data.Conduit.Tar.Types

Methods

showsPrec :: Int -> TarChunk -> ShowS

show :: TarChunk -> String #

showList :: [TarChunk] -> ShowS

Show TarCreateException 
Instance details

Defined in Data.Conduit.Tar.Types

Methods

showsPrec :: Int -> TarCreateException -> ShowS

show :: TarCreateException -> String #

showList :: [TarCreateException] -> ShowS

Show TarException 
Instance details

Defined in Data.Conduit.Tar.Types

Methods

showsPrec :: Int -> TarException -> ShowS

show :: TarException -> String #

showList :: [TarException] -> ShowS

Show ForallVisFlag 
Instance details

Defined in Language.Haskell.TH.Ppr

Methods

showsPrec :: Int -> ForallVisFlag -> ShowS

show :: ForallVisFlag -> String #

showList :: [ForallVisFlag] -> ShowS

Show Doc 
Instance details

Defined in Language.Haskell.TH.PprLib

Methods

showsPrec :: Int -> Doc -> ShowS

show :: Doc -> String #

showList :: [Doc] -> ShowS

Show AnnLookup 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> AnnLookup -> ShowS

show :: AnnLookup -> String #

showList :: [AnnLookup] -> ShowS

Show AnnTarget 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> AnnTarget -> ShowS

show :: AnnTarget -> String #

showList :: [AnnTarget] -> ShowS

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

Methods

showsPrec :: Int -> BndrVis -> ShowS

show :: BndrVis -> String #

showList :: [BndrVis] -> ShowS

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

Methods

showsPrec :: Int -> Callconv -> ShowS

show :: Callconv -> String #

showList :: [Callconv] -> ShowS

Show Clause 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Clause -> ShowS

show :: Clause -> String #

showList :: [Clause] -> ShowS

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

Methods

showsPrec :: Int -> DecidedStrictness -> ShowS

show :: DecidedStrictness -> String #

showList :: [DecidedStrictness] -> ShowS

Show DerivClause 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> DerivClause -> ShowS

show :: DerivClause -> String #

showList :: [DerivClause] -> ShowS

Show DerivStrategy 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> DerivStrategy -> ShowS

show :: DerivStrategy -> String #

showList :: [DerivStrategy] -> ShowS

Show DocLoc 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> DocLoc -> ShowS

show :: DocLoc -> String #

showList :: [DocLoc] -> ShowS

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

Methods

showsPrec :: Int -> FamilyResultSig -> ShowS

show :: FamilyResultSig -> String #

showList :: [FamilyResultSig] -> ShowS

Show Fixity 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Fixity -> ShowS

show :: Fixity -> String #

showList :: [Fixity] -> ShowS

Show FixityDirection 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> FixityDirection -> ShowS

show :: FixityDirection -> String #

showList :: [FixityDirection] -> ShowS

Show Foreign 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Foreign -> ShowS

show :: Foreign -> String #

showList :: [Foreign] -> ShowS

Show FunDep 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> FunDep -> ShowS

show :: FunDep -> String #

showList :: [FunDep] -> ShowS

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

Methods

showsPrec :: Int -> InjectivityAnn -> ShowS

show :: InjectivityAnn -> String #

showList :: [InjectivityAnn] -> ShowS

Show Inline 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Inline -> ShowS

show :: Inline -> String #

showList :: [Inline] -> ShowS

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

Methods

showsPrec :: Int -> ModName -> ShowS

show :: ModName -> String #

showList :: [ModName] -> ShowS

Show Module 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Module -> ShowS

show :: Module -> String #

showList :: [Module] -> ShowS

Show ModuleInfo 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> ModuleInfo -> ShowS

show :: ModuleInfo -> String #

showList :: [ModuleInfo] -> ShowS

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

Methods

showsPrec :: Int -> NameFlavour -> ShowS

show :: NameFlavour -> String #

showList :: [NameFlavour] -> ShowS

Show NameSpace 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> NameSpace -> ShowS

show :: NameSpace -> String #

showList :: [NameSpace] -> ShowS

Show OccName 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> OccName -> ShowS

show :: OccName -> String #

showList :: [OccName] -> ShowS

Show Overlap 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Overlap -> ShowS

show :: Overlap -> String #

showList :: [Overlap] -> ShowS

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

Methods

showsPrec :: Int -> PatSynArgs -> ShowS

show :: PatSynArgs -> String #

showList :: [PatSynArgs] -> ShowS

Show PatSynDir 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> PatSynDir -> ShowS

show :: PatSynDir -> String #

showList :: [PatSynDir] -> ShowS

Show Phases 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Phases -> ShowS

show :: Phases -> String #

showList :: [Phases] -> ShowS

Show PkgName 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> PkgName -> ShowS

show :: PkgName -> String #

showList :: [PkgName] -> ShowS

Show Pragma 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Pragma -> ShowS

show :: Pragma -> String #

showList :: [Pragma] -> ShowS

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

Methods

showsPrec :: Int -> RuleBndr -> ShowS

show :: RuleBndr -> String #

showList :: [RuleBndr] -> ShowS

Show RuleMatch 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> RuleMatch -> ShowS

show :: RuleMatch -> String #

showList :: [RuleMatch] -> ShowS

Show Safety 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Safety -> ShowS

show :: Safety -> String #

showList :: [Safety] -> ShowS

Show SourceStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> SourceStrictness -> ShowS

show :: SourceStrictness -> String #

showList :: [SourceStrictness] -> ShowS

Show SourceUnpackedness 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> SourceUnpackedness -> ShowS

show :: SourceUnpackedness -> String #

showList :: [SourceUnpackedness] -> ShowS

Show Specificity 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Specificity -> ShowS

show :: Specificity -> String #

showList :: [Specificity] -> ShowS

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

Methods

showsPrec :: Int -> TySynEqn -> ShowS

show :: TySynEqn -> String #

showList :: [TySynEqn] -> ShowS

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

Methods

showsPrec :: Int -> TypeFamilyHead -> ShowS

show :: TypeFamilyHead -> String #

showList :: [TypeFamilyHead] -> ShowS

Show Decoding 
Instance details

Defined in Data.Text.Encoding

Methods

showsPrec :: Int -> Decoding -> ShowS

show :: Decoding -> String #

showList :: [Decoding] -> ShowS

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

Methods

showsPrec :: Int -> Builder -> ShowS

show :: Builder -> String #

showList :: [Builder] -> ShowS

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

Methods

showsPrec :: Int -> Utf8State -> ShowS

show :: Utf8State -> String #

showList :: [Utf8State] -> ShowS

Show DecoderState 
Instance details

Defined in Data.Text.Internal.Encoding.Utf8

Methods

showsPrec :: Int -> DecoderState -> ShowS

show :: DecoderState -> String #

showList :: [DecoderState] -> ShowS

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

Methods

showsPrec :: Int -> FPFormat -> ShowS

show :: FPFormat -> String #

showList :: [FPFormat] -> ShowS

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

Methods

showsPrec :: Int -> ShortText -> ShowS

show :: ShortText -> String #

showList :: [ShortText] -> ShowS

Show ConstructorInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

showsPrec :: Int -> ConstructorInfo -> ShowS

show :: ConstructorInfo -> String #

showList :: [ConstructorInfo] -> ShowS

Show ConstructorVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

showsPrec :: Int -> ConstructorVariant -> ShowS

show :: ConstructorVariant -> String #

showList :: [ConstructorVariant] -> ShowS

Show DatatypeInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

showsPrec :: Int -> DatatypeInfo -> ShowS

show :: DatatypeInfo -> String #

showList :: [DatatypeInfo] -> ShowS

Show DatatypeVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

showsPrec :: Int -> DatatypeVariant -> ShowS

show :: DatatypeVariant -> String #

showList :: [DatatypeVariant] -> ShowS

Show FieldStrictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

showsPrec :: Int -> FieldStrictness -> ShowS

show :: FieldStrictness -> String #

showList :: [FieldStrictness] -> ShowS

Show Strictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

showsPrec :: Int -> Strictness -> ShowS

show :: Strictness -> String #

showList :: [Strictness] -> ShowS

Show Unpackedness 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

showsPrec :: Int -> Unpackedness -> ShowS

show :: Unpackedness -> String #

showList :: [Unpackedness] -> ShowS

Show Month 
Instance details

Defined in Data.Time.Calendar.Month

Methods

showsPrec :: Int -> Month -> ShowS

show :: Month -> String #

showList :: [Month] -> ShowS

Show Quarter 
Instance details

Defined in Data.Time.Calendar.Quarter

Methods

showsPrec :: Int -> Quarter -> ShowS

show :: Quarter -> String #

showList :: [Quarter] -> ShowS

Show QuarterOfYear 
Instance details

Defined in Data.Time.Calendar.Quarter

Methods

showsPrec :: Int -> QuarterOfYear -> ShowS

show :: QuarterOfYear -> String #

showList :: [QuarterOfYear] -> ShowS

Show DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Methods

showsPrec :: Int -> DiffTime -> ShowS

show :: DiffTime -> String #

showList :: [DiffTime] -> ShowS

Show NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Methods

showsPrec :: Int -> NominalDiffTime -> ShowS

show :: NominalDiffTime -> String #

showList :: [NominalDiffTime] -> ShowS

Show TimeLocale 
Instance details

Defined in Data.Time.Format.Locale

Methods

showsPrec :: Int -> TimeLocale -> ShowS

show :: TimeLocale -> String #

showList :: [TimeLocale] -> ShowS

Show LocalTime 
Instance details

Defined in Data.Time.LocalTime.Internal.LocalTime

Methods

showsPrec :: Int -> LocalTime -> ShowS

show :: LocalTime -> String #

showList :: [LocalTime] -> ShowS

Show ZonedTime 
Instance details

Defined in Data.Time.LocalTime.Internal.ZonedTime

Methods

showsPrec :: Int -> ZonedTime -> ShowS

show :: ZonedTime -> String #

showList :: [ZonedTime] -> ShowS

Show Group 
Instance details

Defined in Network.TLS.Crypto.Types

Methods

showsPrec :: Int -> Group -> ShowS

show :: Group -> String #

showList :: [Group] -> ShowS

Show KeyExchangeSignatureAlg 
Instance details

Defined in Network.TLS.Crypto.Types

Methods

showsPrec :: Int -> KeyExchangeSignatureAlg -> ShowS

show :: KeyExchangeSignatureAlg -> String #

showList :: [KeyExchangeSignatureAlg] -> ShowS

Show Direction 
Instance details

Defined in Network.TLS.Types

Methods

showsPrec :: Int -> Direction -> ShowS

show :: Direction -> String #

showList :: [Direction] -> ShowS

Show MainSecret 
Instance details

Defined in Network.TLS.Types

Methods

showsPrec :: Int -> MainSecret -> ShowS

show :: MainSecret -> String #

showList :: [MainSecret] -> ShowS

Show Role 
Instance details

Defined in Network.TLS.Types

Methods

showsPrec :: Int -> Role -> ShowS

show :: Role -> String #

showList :: [Role] -> ShowS

Show SessionData 
Instance details

Defined in Network.TLS.Types

Methods

showsPrec :: Int -> SessionData -> ShowS

show :: SessionData -> String #

showList :: [SessionData] -> ShowS

Show SessionFlag 
Instance details

Defined in Network.TLS.Types

Methods

showsPrec :: Int -> SessionFlag -> ShowS

show :: SessionFlag -> String #

showList :: [SessionFlag] -> ShowS

Show TLS13TicketInfo 
Instance details

Defined in Network.TLS.Types

Methods

showsPrec :: Int -> TLS13TicketInfo -> ShowS

show :: TLS13TicketInfo -> String #

showList :: [TLS13TicketInfo] -> ShowS

Show Version 
Instance details

Defined in Network.TLS.Types

Methods

showsPrec :: Int -> Version -> ShowS

show :: Version -> String #

showList :: [Version] -> ShowS

Show ByteStringOutputException 
Instance details

Defined in System.Process.Typed.Internal

Methods

showsPrec :: Int -> ByteStringOutputException -> ShowS

show :: ByteStringOutputException -> String #

showList :: [ByteStringOutputException] -> ShowS

Show ExitCodeException 
Instance details

Defined in System.Process.Typed.Internal

Methods

showsPrec :: Int -> ExitCodeException -> ShowS

show :: ExitCodeException -> String #

showList :: [ExitCodeException] -> ShowS

Show DL 
Instance details

Defined in System.Posix.DynamicLinker.Prim

Methods

showsPrec :: Int -> DL -> ShowS

show :: DL -> String #

showList :: [DL] -> ShowS

Show RTLDFlags 
Instance details

Defined in System.Posix.DynamicLinker.Prim

Methods

showsPrec :: Int -> RTLDFlags -> ShowS

show :: RTLDFlags -> String #

showList :: [RTLDFlags] -> ShowS

Show CAttributes 
Instance details

Defined in System.Posix.Files.Common

Methods

showsPrec :: Int -> CAttributes -> ShowS

show :: CAttributes -> String #

showList :: [CAttributes] -> ShowS

Show StatxFlags 
Instance details

Defined in System.Posix.Files.Common

Methods

showsPrec :: Int -> StatxFlags -> ShowS

show :: StatxFlags -> String #

showList :: [StatxFlags] -> ShowS

Show StatxMask 
Instance details

Defined in System.Posix.Files.Common

Methods

showsPrec :: Int -> StatxMask -> ShowS

show :: StatxMask -> String #

showList :: [StatxMask] -> ShowS

Show ProcessStatus 
Instance details

Defined in System.Posix.Process.Internals

Methods

showsPrec :: Int -> ProcessStatus -> ShowS

show :: ProcessStatus -> String #

showList :: [ProcessStatus] -> ShowS

Show Resource 
Instance details

Defined in System.Posix.Resource

Methods

showsPrec :: Int -> Resource -> ShowS

show :: Resource -> String #

showList :: [Resource] -> ShowS

Show ResourceLimit 
Instance details

Defined in System.Posix.Resource

Methods

showsPrec :: Int -> ResourceLimit -> ShowS

show :: ResourceLimit -> String #

showList :: [ResourceLimit] -> ShowS

Show ResourceLimits 
Instance details

Defined in System.Posix.Resource

Methods

showsPrec :: Int -> ResourceLimits -> ShowS

show :: ResourceLimits -> String #

showList :: [ResourceLimits] -> ShowS

Show GroupEntry 
Instance details

Defined in System.Posix.User.Common

Methods

showsPrec :: Int -> GroupEntry -> ShowS

show :: GroupEntry -> String #

showList :: [GroupEntry] -> ShowS

Show UserEntry 
Instance details

Defined in System.Posix.User.Common

Methods

showsPrec :: Int -> UserEntry -> ShowS

show :: UserEntry -> String #

showList :: [UserEntry] -> ShowS

Show UnixDiffTime 
Instance details

Defined in Data.UnixTime.Types

Methods

showsPrec :: Int -> UnixDiffTime -> ShowS

show :: UnixDiffTime -> String #

showList :: [UnixDiffTime] -> ShowS

Show UnixTime 
Instance details

Defined in Data.UnixTime.Types

Methods

showsPrec :: Int -> UnixTime -> ShowS

show :: UnixTime -> String #

showList :: [UnixTime] -> ShowS

Show StringException 
Instance details

Defined in UnliftIO.Exception

Show ConcException 
Instance details

Defined in UnliftIO.Internals.Async

Methods

showsPrec :: Int -> ConcException -> ShowS

show :: ConcException -> String #

showList :: [ConcException] -> ShowS

Show SubHashPath 
Instance details

Defined in Data.HashMap.Internal.Debug

Methods

showsPrec :: Int -> SubHashPath -> ShowS

show :: SubHashPath -> String #

showList :: [SubHashPath] -> ShowS

Show UUID 
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

Methods

showsPrec :: Int -> UnpackedUUID -> ShowS

show :: UnpackedUUID -> String #

showList :: [UnpackedUUID] -> ShowS

Show Size 
Instance details

Defined in Data.Vector.Fusion.Bundle.Size

Methods

showsPrec :: Int -> Size -> ShowS

show :: Size -> String #

showList :: [Size] -> ShowS

Show ParseException 
Instance details

Defined in Data.Yaml.Internal

Show Warning 
Instance details

Defined in Data.Yaml.Internal

Methods

showsPrec :: Int -> Warning -> ShowS

show :: Warning -> String #

showList :: [Warning] -> ShowS

Show RawDoc 
Instance details

Defined in Data.Yaml.Parser

Methods

showsPrec :: Int -> RawDoc -> ShowS

show :: RawDoc -> String #

showList :: [RawDoc] -> ShowS

Show YamlParseException 
Instance details

Defined in Data.Yaml.Parser

Methods

showsPrec :: Int -> YamlParseException -> ShowS

show :: YamlParseException -> String #

showList :: [YamlParseException] -> ShowS

Show YamlValue 
Instance details

Defined in Data.Yaml.Parser

Methods

showsPrec :: Int -> YamlValue -> ShowS

show :: YamlValue -> String #

showList :: [YamlValue] -> ShowS

Show CompressParams 
Instance details

Defined in Codec.Compression.Zlib.Internal

Methods

showsPrec :: Int -> CompressParams -> ShowS

show :: CompressParams -> String #

showList :: [CompressParams] -> ShowS

Show DecompressError 
Instance details

Defined in Codec.Compression.Zlib.Internal

Methods

showsPrec :: Int -> DecompressError -> ShowS

show :: DecompressError -> String #

showList :: [DecompressError] -> ShowS

Show DecompressParams 
Instance details

Defined in Codec.Compression.Zlib.Internal

Methods

showsPrec :: Int -> DecompressParams -> ShowS

show :: DecompressParams -> String #

showList :: [DecompressParams] -> ShowS

Show CompressionLevel 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

showsPrec :: Int -> CompressionLevel -> ShowS

show :: CompressionLevel -> String #

showList :: [CompressionLevel] -> ShowS

Show CompressionStrategy 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

showsPrec :: Int -> CompressionStrategy -> ShowS

show :: CompressionStrategy -> String #

showList :: [CompressionStrategy] -> ShowS

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

Methods

showsPrec :: Int -> Format -> ShowS

show :: Format -> String #

showList :: [Format] -> ShowS

Show MemoryLevel 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

showsPrec :: Int -> MemoryLevel -> ShowS

show :: MemoryLevel -> String #

showList :: [MemoryLevel] -> ShowS

Show Method 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

showsPrec :: Int -> Method -> ShowS

show :: Method -> String #

showList :: [Method] -> ShowS

Show WindowBits 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

showsPrec :: Int -> WindowBits -> ShowS

show :: WindowBits -> String #

showList :: [WindowBits] -> ShowS

Show Integer 
Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Integer -> ShowS

show :: Integer -> String #

showList :: [Integer] -> ShowS

Show Natural 
Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Natural -> ShowS

show :: Natural -> String #

showList :: [Natural] -> ShowS

Show () 
Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> () -> ShowS

show :: () -> String #

showList :: [()] -> ShowS

Show Bool 
Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Bool -> ShowS

show :: Bool -> String #

showList :: [Bool] -> ShowS

Show Char 
Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Char -> ShowS

show :: Char -> String #

showList :: [Char] -> ShowS

Show Int 
Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Int -> ShowS

show :: Int -> String #

showList :: [Int] -> ShowS

Show Levity 
Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Levity -> ShowS

show :: Levity -> String #

showList :: [Levity] -> ShowS

Show RuntimeRep 
Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> RuntimeRep -> ShowS

show :: RuntimeRep -> String #

showList :: [RuntimeRep] -> ShowS

Show VecCount 
Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> VecCount -> ShowS

show :: VecCount -> String #

showList :: [VecCount] -> ShowS

Show VecElem 
Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> VecElem -> ShowS

show :: VecElem -> String #

showList :: [VecElem] -> ShowS

Show Word 
Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Word -> ShowS

show :: Word -> String #

showList :: [Word] -> ShowS

Show a => Show (Match a) 
Instance details

Defined in Distribution.Simple.BuildTarget

Methods

showsPrec :: Int -> Match a -> ShowS

show :: Match a -> String #

showList :: [Match a] -> ShowS

Show a => Show (MaybeAmbiguous a) 
Instance details

Defined in Distribution.Simple.BuildTarget

Methods

showsPrec :: Int -> MaybeAmbiguous a -> ShowS

show :: MaybeAmbiguous a -> String #

showList :: [MaybeAmbiguous a] -> ShowS

Show a => Show (Flag a) 
Instance details

Defined in Distribution.Simple.Flag

Methods

showsPrec :: Int -> Flag a -> ShowS

show :: Flag a -> String #

showList :: [Flag a] -> ShowS

Show a => Show (GlobResult a) 
Instance details

Defined in Distribution.Simple.Glob

Methods

showsPrec :: Int -> GlobResult a -> ShowS

show :: GlobResult a -> String #

showList :: [GlobResult a] -> ShowS

Show dir => Show (InstallDirs dir) 
Instance details

Defined in Distribution.Simple.InstallDirs

Methods

showsPrec :: Int -> InstallDirs dir -> ShowS

show :: InstallDirs dir -> String #

showList :: [InstallDirs dir] -> ShowS

Show a => Show (PackageIndex a) 
Instance details

Defined in Distribution.Simple.PackageIndex

Methods

showsPrec :: Int -> PackageIndex a -> ShowS

show :: PackageIndex a -> String #

showList :: [PackageIndex a] -> ShowS

Show id => Show (AnnotatedId id) 
Instance details

Defined in Distribution.Types.AnnotatedId

Methods

showsPrec :: Int -> AnnotatedId id -> ShowS

show :: AnnotatedId id -> String #

showList :: [AnnotatedId id] -> ShowS

Show a => Show (NubList a) 
Instance details

Defined in Distribution.Utils.NubList

Methods

showsPrec :: Int -> NubList a -> ShowS

show :: NubList a -> String #

showList :: [NubList a] -> ShowS

Show a => Show (NubListR a) 
Instance details

Defined in Distribution.Utils.NubList

Methods

showsPrec :: Int -> NubListR a -> ShowS

show :: NubListR a -> String #

showList :: [NubListR a] -> ShowS

Show a => Show (Graph a) 
Instance details

Defined in Distribution.Compat.Graph

Methods

showsPrec :: Int -> Graph a -> ShowS

show :: Graph a -> String #

showList :: [Graph a] -> ShowS

Show a => Show (NonEmptySet a) 
Instance details

Defined in Distribution.Compat.NonEmptySet

Methods

showsPrec :: Int -> NonEmptySet a -> ShowS

show :: NonEmptySet a -> String #

showList :: [NonEmptySet a] -> ShowS

Show a => Show (First' a) 
Instance details

Defined in Distribution.Compat.Semigroup

Methods

showsPrec :: Int -> First' a -> ShowS

show :: First' a -> String #

showList :: [First' a] -> ShowS

Show a => Show (Last' a) 
Instance details

Defined in Distribution.Compat.Semigroup

Methods

showsPrec :: Int -> Last' a -> ShowS

show :: Last' a -> String #

showList :: [Last' a] -> ShowS

Show a => Show (Option' a) 
Instance details

Defined in Distribution.Compat.Semigroup

Methods

showsPrec :: Int -> Option' a -> ShowS

show :: Option' a -> String #

showList :: [Option' a] -> ShowS

Show v => Show (PerCompilerFlavor v) 
Instance details

Defined in Distribution.Compiler

Methods

showsPrec :: Int -> PerCompilerFlavor v -> ShowS

show :: PerCompilerFlavor v -> String #

showList :: [PerCompilerFlavor v] -> ShowS

Show ann => Show (NamelessField ann) 
Instance details

Defined in Distribution.FieldGrammar.Parsec

Methods

showsPrec :: Int -> NamelessField ann -> ShowS

show :: NamelessField ann -> String #

showList :: [NamelessField ann] -> ShowS

Show ann => Show (Section ann) 
Instance details

Defined in Distribution.FieldGrammar.Parsec

Methods

showsPrec :: Int -> Section ann -> ShowS

show :: Section ann -> String #

showList :: [Section ann] -> ShowS

Show ann => Show (Field ann) 
Instance details

Defined in Distribution.Fields.Field

Methods

showsPrec :: Int -> Field ann -> ShowS

show :: Field ann -> String #

showList :: [Field ann] -> ShowS

Show ann => Show (FieldLine ann) 
Instance details

Defined in Distribution.Fields.Field

Methods

showsPrec :: Int -> FieldLine ann -> ShowS

show :: FieldLine ann -> String #

showList :: [FieldLine ann] -> ShowS

Show ann => Show (Name ann) 
Instance details

Defined in Distribution.Fields.Field

Methods

showsPrec :: Int -> Name ann -> ShowS

show :: Name ann -> String #

showList :: [Name ann] -> ShowS

Show ann => Show (SectionArg ann) 
Instance details

Defined in Distribution.Fields.Field

Methods

showsPrec :: Int -> SectionArg ann -> ShowS

show :: SectionArg ann -> String #

showList :: [SectionArg ann] -> ShowS

Show c => Show (Condition c) 
Instance details

Defined in Distribution.Types.Condition

Methods

showsPrec :: Int -> Condition c -> ShowS

show :: Condition c -> String #

showList :: [Condition c] -> ShowS

Show a => Show (VersionRangeF a) 
Instance details

Defined in Distribution.Types.VersionRange.Internal

Methods

showsPrec :: Int -> VersionRangeF a -> ShowS

show :: VersionRangeF a -> String #

showList :: [VersionRangeF a] -> ShowS

Show (Encoding' a) 
Instance details

Defined in Data.Aeson.Encoding.Internal

Methods

showsPrec :: Int -> Encoding' a -> ShowS

show :: Encoding' a -> String #

showList :: [Encoding' a] -> ShowS

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

Methods

showsPrec :: Int -> WithJSONWarnings a -> ShowS

show :: WithJSONWarnings a -> String #

showList :: [WithJSONWarnings a] -> ShowS

Show (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.Leijen

Methods

showsPrec :: Int -> Doc a -> ShowS

show :: Doc a -> String #

showList :: [Doc a] -> ShowS

Show r => Show (Result r) 
Instance details

Defined in Data.Attoparsec.ByteString.Lazy

Methods

showsPrec :: Int -> Result r -> ShowS

show :: Result r -> String #

showList :: [Result r] -> ShowS

Show r => Show (Result r) 
Instance details

Defined in Data.Attoparsec.Text.Lazy

Methods

showsPrec :: Int -> Result r -> ShowS

show :: Result r -> String #

showList :: [Result r] -> ShowS

Show a => Show (ZipList a) 
Instance details

Defined in Control.Applicative

Methods

showsPrec :: Int -> ZipList a -> ShowS

show :: ZipList a -> String #

showList :: [ZipList a] -> ShowS

Show a => Show (And a) 
Instance details

Defined in Data.Bits

Methods

showsPrec :: Int -> And a -> ShowS

show :: And a -> String #

showList :: [And a] -> ShowS

Show a => Show (Iff a) 
Instance details

Defined in Data.Bits

Methods

showsPrec :: Int -> Iff a -> ShowS

show :: Iff a -> String #

showList :: [Iff a] -> ShowS

Show a => Show (Ior a) 
Instance details

Defined in Data.Bits

Methods

showsPrec :: Int -> Ior a -> ShowS

show :: Ior a -> String #

showList :: [Ior a] -> ShowS

Show a => Show (Xor a) 
Instance details

Defined in Data.Bits

Methods

showsPrec :: Int -> Xor a -> ShowS

show :: Xor a -> String #

showList :: [Xor a] -> ShowS

Show a => Show (Complex a) 
Instance details

Defined in Data.Complex

Methods

showsPrec :: Int -> Complex a -> ShowS

show :: Complex a -> String #

showList :: [Complex a] -> ShowS

Show a => Show (Identity a) 
Instance details

Defined in Data.Functor.Identity

Methods

showsPrec :: Int -> Identity a -> ShowS

show :: Identity a -> String #

showList :: [Identity a] -> ShowS

Show a => Show (First a) 
Instance details

Defined in Data.Monoid

Methods

showsPrec :: Int -> First a -> ShowS

show :: First a -> String #

showList :: [First a] -> ShowS

Show a => Show (Last a) 
Instance details

Defined in Data.Monoid

Methods

showsPrec :: Int -> Last a -> ShowS

show :: Last a -> String #

showList :: [Last a] -> ShowS

Show a => Show (Down a) 
Instance details

Defined in Data.Ord

Methods

showsPrec :: Int -> Down a -> ShowS

show :: Down a -> String #

showList :: [Down a] -> ShowS

Show a => Show (First a) 
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) 
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) 
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) 
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) 
Instance details

Defined in Data.Semigroup

Methods

showsPrec :: Int -> WrappedMonoid m -> ShowS

show :: WrappedMonoid m -> String #

showList :: [WrappedMonoid m] -> ShowS

Show a => Show (Dual a) 
Instance details

Defined in Data.Semigroup.Internal

Methods

showsPrec :: Int -> Dual a -> ShowS

show :: Dual a -> String #

showList :: [Dual a] -> ShowS

Show a => Show (Product a) 
Instance details

Defined in Data.Semigroup.Internal

Methods

showsPrec :: Int -> Product a -> ShowS

show :: Product a -> String #

showList :: [Product a] -> ShowS

Show a => Show (Sum a) 
Instance details

Defined in Data.Semigroup.Internal

Methods

showsPrec :: Int -> Sum a -> ShowS

show :: Sum a -> String #

showList :: [Sum a] -> ShowS

Show (ConstPtr a) 
Instance details

Defined in Foreign.C.ConstPtr

Methods

showsPrec :: Int -> ConstPtr a -> ShowS

show :: ConstPtr a -> String #

showList :: [ConstPtr a] -> ShowS

Show a => Show (NonEmpty a) 
Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> NonEmpty a -> ShowS

show :: NonEmpty a -> String #

showList :: [NonEmpty a] -> ShowS

Show (ForeignPtr a) 
Instance details

Defined in GHC.ForeignPtr

Methods

showsPrec :: Int -> ForeignPtr a -> ShowS

show :: ForeignPtr a -> String #

showList :: [ForeignPtr a] -> ShowS

Show p => Show (Par1 p) 
Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> Par1 p -> ShowS

show :: Par1 p -> String #

showList :: [Par1 p] -> ShowS

Show (FunPtr a) 
Instance details

Defined in GHC.Ptr

Methods

showsPrec :: Int -> FunPtr a -> ShowS

show :: FunPtr a -> String #

showList :: [FunPtr a] -> ShowS

Show (Ptr a) 
Instance details

Defined in GHC.Ptr

Methods

showsPrec :: Int -> Ptr a -> ShowS

show :: Ptr a -> String #

showList :: [Ptr a] -> ShowS

Show a => Show (Ratio a) 
Instance details

Defined in GHC.Real

Methods

showsPrec :: Int -> Ratio a -> ShowS

show :: Ratio a -> String #

showList :: [Ratio a] -> ShowS

Show (SChar c) 
Instance details

Defined in GHC.TypeLits

Methods

showsPrec :: Int -> SChar c -> ShowS

show :: SChar c -> String #

showList :: [SChar c] -> ShowS

Show (SSymbol s) 
Instance details

Defined in GHC.TypeLits

Methods

showsPrec :: Int -> SSymbol s -> ShowS

show :: SSymbol s -> String #

showList :: [SSymbol s] -> ShowS

Show (SNat n) 
Instance details

Defined in GHC.TypeNats

Methods

showsPrec :: Int -> SNat n -> ShowS

show :: SNat n -> String #

showList :: [SNat n] -> ShowS

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 s => Show (CI s) 
Instance details

Defined in Data.CaseInsensitive.Internal

Methods

showsPrec :: Int -> CI s -> ShowS

show :: CI s -> String #

showList :: [CI s] -> 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) 
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

Methods

showsPrec :: Int -> Intersection a -> ShowS

show :: Intersection a -> String #

showList :: [Intersection a] -> ShowS

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

Methods

showsPrec :: Int -> CryptoFailable a -> ShowS

show :: CryptoFailable a -> String #

showList :: [CryptoFailable a] -> ShowS

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 h => Show (TOTPParams h) 
Instance details

Defined in Crypto.OTP

Methods

showsPrec :: Int -> TOTPParams h -> ShowS

show :: TOTPParams h -> String #

showList :: [TOTPParams h] -> ShowS

Show (Scalar curve) => Show (Signature curve) 
Instance details

Defined in Crypto.PubKey.ECDSA

Methods

showsPrec :: Int -> Signature curve -> ShowS

show :: Signature curve -> String #

showList :: [Signature curve] -> ShowS

Show (SecretKey curve) 
Instance details

Defined in Crypto.PubKey.EdDSA

Methods

showsPrec :: Int -> SecretKey curve -> ShowS

show :: SecretKey curve -> String #

showList :: [SecretKey curve] -> 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

Methods

showsPrec :: Int -> DNonEmpty a -> ShowS

show :: DNonEmpty a -> String #

showList :: [DNonEmpty a] -> ShowS

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 a => Show (RB a) 
Instance details

Defined in Data.List.Extra

Methods

showsPrec :: Int -> RB a -> ShowS

show :: RB a -> String #

showList :: [RB a] -> ShowS

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 (Key typ) 
Instance details

Defined in Hackage.Security.Key

Methods

showsPrec :: Int -> Key typ -> ShowS

show :: Key typ -> String #

showList :: [Key typ] -> ShowS

Show (KeyType typ) 
Instance details

Defined in Hackage.Security.Key

Methods

showsPrec :: Int -> KeyType typ -> ShowS

show :: KeyType typ -> String #

showList :: [KeyType typ] -> ShowS

Show (PrivateKey typ) 
Instance details

Defined in Hackage.Security.Key

Methods

showsPrec :: Int -> PrivateKey typ -> ShowS

show :: PrivateKey typ -> String #

showList :: [PrivateKey typ] -> ShowS

Show (PublicKey typ) 
Instance details

Defined in Hackage.Security.Key

Methods

showsPrec :: Int -> PublicKey typ -> ShowS

show :: PublicKey typ -> String #

showList :: [PublicKey typ] -> ShowS

Show (Pattern typ) 
Instance details

Defined in Hackage.Security.TUF.Patterns

Methods

showsPrec :: Int -> Pattern typ -> ShowS

show :: Pattern typ -> String #

showList :: [Pattern typ] -> ShowS

Show (Replacement typ) 
Instance details

Defined in Hackage.Security.TUF.Patterns

Methods

showsPrec :: Int -> Replacement typ -> ShowS

show :: Replacement typ -> String #

showList :: [Replacement typ] -> ShowS

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 (List a) 
Instance details

Defined in HiFileParser

Methods

showsPrec :: Int -> List a -> ShowS

show :: List a -> String #

showList :: [List a] -> ShowS

Show a => Show (List a) 
Instance details

Defined in Data.Aeson.Config.Types

Methods

showsPrec :: Int -> List a -> ShowS

show :: List a -> String #

showList :: [List a] -> ShowS

Show a => Show (Conditional a) 
Instance details

Defined in Hpack.Config

Methods

showsPrec :: Int -> Conditional a -> ShowS

show :: Conditional a -> String #

showList :: [Conditional a] -> ShowS

Show a => Show (Section a) 
Instance details

Defined in Hpack.Config

Methods

showsPrec :: Int -> Section a -> ShowS

show :: Section a -> String #

showList :: [Section a] -> ShowS

Show a => Show (LenientData a) 
Instance details

Defined in Web.Internal.HttpApiData

Methods

showsPrec :: Int -> LenientData a -> ShowS

show :: LenientData a -> String #

showList :: [LenientData a] -> ShowS

Show body => Show (HistoriedResponse body) 
Instance details

Defined in Network.HTTP.Client

Methods

showsPrec :: Int -> HistoriedResponse body -> ShowS

show :: HistoriedResponse body -> String #

showList :: [HistoriedResponse body] -> ShowS

Show (PartM m) 
Instance details

Defined in Network.HTTP.Client.MultipartFormData

Methods

showsPrec :: Int -> PartM m -> ShowS

show :: PartM m -> String #

showList :: [PartM m] -> ShowS

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

Methods

showsPrec :: Int -> AddrRange a -> ShowS

show :: AddrRange a -> String #

showList :: [AddrRange a] -> ShowS

Show a => Show (BE a) 
Instance details

Defined in Data.Memory.Endian

Methods

showsPrec :: Int -> BE a -> ShowS

show :: BE a -> String #

showList :: [BE a] -> ShowS

Show a => Show (LE a) 
Instance details

Defined in Data.Memory.Endian

Methods

showsPrec :: Int -> LE a -> ShowS

show :: LE a -> String #

showList :: [LE a] -> 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 α => Show (Context α) 
Instance details

Defined in Text.Mustache.Internal.Types

Methods

showsPrec :: Int -> Context α -> ShowS

show :: Context α -> String #

showList :: [Context α] -> ShowS

Show α => Show (Node α) 
Instance details

Defined in Text.Mustache.Internal.Types

Methods

showsPrec :: Int -> Node α -> ShowS

show :: Node α -> String #

showList :: [Node α] -> 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

Methods

showsPrec :: Int -> ParserFailure h -> ShowS

show :: ParserFailure h -> String #

showList :: [ParserFailure h] -> ShowS

Show a => Show (ParserResult a) 
Instance details

Defined in Options.Applicative.Types

Methods

showsPrec :: Int -> ParserResult a -> ShowS

show :: ParserResult a -> String #

showList :: [ParserResult a] -> ShowS

Show a => Show (CabalString a) 
Instance details

Defined in Pantry.Types

Methods

showsPrec :: Int -> CabalString a -> ShowS

show :: CabalString a -> String #

showList :: [CabalString a] -> ShowS

Show (ResolvedPath t) 
Instance details

Defined in Pantry.Types

Methods

showsPrec :: Int -> ResolvedPath t -> ShowS

show :: ResolvedPath t -> String #

showList :: [ResolvedPath t] -> ShowS

Show (SomeBase t) 
Instance details

Defined in Path.Posix

Methods

showsPrec :: Int -> SomeBase t -> ShowS

show :: SomeBase t -> String #

showList :: [SomeBase t] -> ShowS

Show (SomeBase t) 
Instance details

Defined in Path.Windows

Methods

showsPrec :: Int -> SomeBase t -> ShowS

show :: SomeBase t -> String #

showList :: [SomeBase t] -> ShowS

Show (WalkAction b) 
Instance details

Defined in Path.IO

Methods

showsPrec :: Int -> WalkAction b -> ShowS

show :: WalkAction b -> String #

showList :: [WalkAction b] -> ShowS

(Show (Key record), Show record) => Show (Entity record) 
Instance details

Defined in Database.Persist.Class.PersistEntity

Methods

showsPrec :: Int -> Entity record -> ShowS

show :: Entity record -> String #

showList :: [Entity record] -> ShowS

Show (Key ArchiveCache) 
Instance details

Defined in Pantry.Storage

Methods

showsPrec :: Int -> Key ArchiveCache -> ShowS

show :: Key ArchiveCache -> String #

showList :: [Key ArchiveCache] -> ShowS

Show (Key Blob) 
Instance details

Defined in Pantry.Storage

Methods

showsPrec :: Int -> Key Blob -> ShowS

show :: Key Blob -> String #

showList :: [Key Blob] -> ShowS

Show (Key CacheUpdate) 
Instance details

Defined in Pantry.Storage

Methods

showsPrec :: Int -> Key CacheUpdate -> ShowS

show :: Key CacheUpdate -> String #

showList :: [Key CacheUpdate] -> ShowS

Show (Key FilePath) 
Instance details

Defined in Pantry.Storage

Methods

showsPrec :: Int -> Key FilePath -> ShowS

show :: Key FilePath -> String #

showList :: [Key FilePath] -> ShowS

Show (Key HPack) 
Instance details

Defined in Pantry.Storage

Methods

showsPrec :: Int -> Key HPack -> ShowS

show :: Key HPack -> String #

showList :: [Key HPack] -> ShowS

Show (Key HackageCabal) 
Instance details

Defined in Pantry.Storage

Methods

showsPrec :: Int -> Key HackageCabal -> ShowS

show :: Key HackageCabal -> String #

showList :: [Key HackageCabal] -> ShowS

Show (Key HackageTarball) 
Instance details

Defined in Pantry.Storage

Methods

showsPrec :: Int -> Key HackageTarball -> ShowS

show :: Key HackageTarball -> String #

showList :: [Key HackageTarball] -> ShowS

Show (Key ModuleName) 
Instance details

Defined in Pantry.Storage

Methods

showsPrec :: Int -> Key ModuleName -> ShowS

show :: Key ModuleName -> String #

showList :: [Key ModuleName] -> ShowS

Show (Key PackageExposedModule) 
Instance details

Defined in Pantry.Storage

Methods

showsPrec :: Int -> Key PackageExposedModule -> ShowS

show :: Key PackageExposedModule -> String #

showList :: [Key PackageExposedModule] -> ShowS

Show (Key PackageName) 
Instance details

Defined in Pantry.Storage

Methods

showsPrec :: Int -> Key PackageName -> ShowS

show :: Key PackageName -> String #

showList :: [Key PackageName] -> ShowS

Show (Key PreferredVersions) 
Instance details

Defined in Pantry.Storage

Methods

showsPrec :: Int -> Key PreferredVersions -> ShowS

show :: Key PreferredVersions -> String #

showList :: [Key PreferredVersions] -> ShowS

Show (Key RepoCache) 
Instance details

Defined in Pantry.Storage

Methods

showsPrec :: Int -> Key RepoCache -> ShowS

show :: Key RepoCache -> String #

showList :: [Key RepoCache] -> ShowS

Show (Key SnapshotCache) 
Instance details

Defined in Pantry.Storage

Methods

showsPrec :: Int -> Key SnapshotCache -> ShowS

show :: Key SnapshotCache -> String #

showList :: [Key SnapshotCache] -> ShowS

Show (Key Tree) 
Instance details

Defined in Pantry.Storage

Methods

showsPrec :: Int -> Key Tree -> ShowS

show :: Key Tree -> String #

showList :: [Key Tree] -> ShowS

Show (Key TreeEntry) 
Instance details

Defined in Pantry.Storage

Methods

showsPrec :: Int -> Key TreeEntry -> ShowS

show :: Key TreeEntry -> String #

showList :: [Key TreeEntry] -> ShowS

Show (Key UrlBlob) 
Instance details

Defined in Pantry.Storage

Methods

showsPrec :: Int -> Key UrlBlob -> ShowS

show :: Key UrlBlob -> String #

showList :: [Key UrlBlob] -> ShowS

Show (Key Version) 
Instance details

Defined in Pantry.Storage

Methods

showsPrec :: Int -> Key Version -> ShowS

show :: Key Version -> String #

showList :: [Key Version] -> ShowS

(BackendCompatible b s, Show (BackendKey b)) => Show (BackendKey (Compatible b s)) 
Instance details

Defined in Database.Persist.Compatible.Types

Methods

showsPrec :: Int -> BackendKey (Compatible b s) -> ShowS

show :: BackendKey (Compatible b s) -> String #

showList :: [BackendKey (Compatible b s)] -> ShowS

(PersistCore b, PersistCore (RawSqlite b), Show (BackendKey b)) => Show (BackendKey (RawSqlite b)) 
Instance details

Defined in Database.Persist.Sqlite

Methods

showsPrec :: Int -> BackendKey (RawSqlite b) -> ShowS

show :: BackendKey (RawSqlite b) -> String #

showList :: [BackendKey (RawSqlite b)] -> ShowS

Show a => Show (ParseState a) 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

showsPrec :: Int -> ParseState a -> ShowS

show :: ParseState a -> String #

showList :: [ParseState a] -> ShowS

Show a => Show (AnnotDetails a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

showsPrec :: Int -> AnnotDetails a -> ShowS

show :: AnnotDetails a -> String #

showList :: [AnnotDetails a] -> ShowS

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 (Doc ann) 
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

Methods

showsPrec :: Int -> SimpleDocStream ann -> ShowS

show :: SimpleDocStream ann -> String #

showList :: [SimpleDocStream ann] -> ShowS

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) 
Instance details

Defined in Data.Primitive.PrimArray

Methods

showsPrec :: Int -> PrimArray a -> ShowS

show :: PrimArray a -> String #

showList :: [PrimArray a] -> ShowS

Show a => Show (SmallArray a) 
Instance details

Defined in Data.Primitive.SmallArray

Methods

showsPrec :: Int -> SmallArray a -> ShowS

show :: SmallArray a -> String #

showList :: [SmallArray a] -> ShowS

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

Methods

showsPrec :: Int -> AtomicGen g -> ShowS

show :: AtomicGen g -> String #

showList :: [AtomicGen g] -> ShowS

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 (Chunk a) 
Instance details

Defined in Data.List.Split.Internals

Methods

showsPrec :: Int -> Chunk a -> ShowS

show :: Chunk a -> String #

showList :: [Chunk a] -> ShowS

Show (PrecompiledCache base) Source # 
Instance details

Defined in Stack.Types.Build

Methods

showsPrec :: Int -> PrecompiledCache base -> ShowS

show :: PrecompiledCache base -> String #

showList :: [PrecompiledCache base] -> ShowS

Show component => Show (CompCollection component) Source # 
Instance details

Defined in Stack.Types.CompCollection

Methods

showsPrec :: Int -> CompCollection component -> ShowS

show :: CompCollection component -> String #

showList :: [CompCollection component] -> 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 linkTarget => Show (GenEntryContent linkTarget) 
Instance details

Defined in Codec.Archive.Tar.Types

Methods

showsPrec :: Int -> GenEntryContent linkTarget -> ShowS

show :: GenEntryContent linkTarget -> String #

showList :: [GenEntryContent linkTarget] -> 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 (AnyTrafficSecret a) 
Instance details

Defined in Network.TLS.Types

Methods

showsPrec :: Int -> AnyTrafficSecret a -> ShowS

show :: AnyTrafficSecret a -> String #

showList :: [AnyTrafficSecret a] -> ShowS

Show (BaseSecret a) 
Instance details

Defined in Network.TLS.Types

Methods

showsPrec :: Int -> BaseSecret a -> ShowS

show :: BaseSecret a -> String #

showList :: [BaseSecret a] -> ShowS

Show (ClientTrafficSecret a) 
Instance details

Defined in Network.TLS.Types

Methods

showsPrec :: Int -> ClientTrafficSecret a -> ShowS

show :: ClientTrafficSecret a -> String #

showList :: [ClientTrafficSecret a] -> ShowS

Show (SecretTriple a) 
Instance details

Defined in Network.TLS.Types

Methods

showsPrec :: Int -> SecretTriple a -> ShowS

show :: SecretTriple a -> String #

showList :: [SecretTriple a] -> ShowS

Show (ServerTrafficSecret a) 
Instance details

Defined in Network.TLS.Types

Methods

showsPrec :: Int -> ServerTrafficSecret a -> ShowS

show :: ServerTrafficSecret a -> String #

showList :: [ServerTrafficSecret a] -> ShowS

Show (Memoized a) 
Instance details

Defined in UnliftIO.Memoize

Methods

showsPrec :: Int -> Memoized a -> ShowS

show :: Memoized a -> String #

showList :: [Memoized a] -> ShowS

Show a => Show (Array a) 
Instance details

Defined in Data.HashMap.Internal.Array

Methods

showsPrec :: Int -> Array a -> ShowS

show :: Array a -> String #

showList :: [Array a] -> ShowS

Show k => Show (Error k) 
Instance details

Defined in Data.HashMap.Internal.Debug

Methods

showsPrec :: Int -> Error k -> ShowS

show :: Error k -> String #

showList :: [Error k] -> ShowS

Show k => Show (Validity k) 
Instance details

Defined in Data.HashMap.Internal.Debug

Methods

showsPrec :: Int -> Validity k -> ShowS

show :: Validity k -> String #

showList :: [Validity k] -> 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 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 (Vector a) 
Instance details

Defined in Data.Vector.Strict

Methods

showsPrec :: Int -> Vector a -> ShowS

show :: Vector a -> String #

showList :: [Vector a] -> ShowS

Show a => Show (Maybe a) 
Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Maybe a -> ShowS

show :: Maybe a -> String #

showList :: [Maybe a] -> ShowS

Show a => Show (Solo a) 
Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Solo a -> ShowS

show :: Solo a -> String #

showList :: [Solo a] -> ShowS

Show a => Show [a] 
Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> [a] -> ShowS

show :: [a] -> String #

showList :: [[a]] -> ShowS

(Show a, Show k) => Show (Node k a) 
Instance details

Defined in Distribution.Compat.Graph

Methods

showsPrec :: Int -> Node k a -> ShowS

show :: Node k a -> String #

showList :: [Node k a] -> ShowS

Show (SymbolicPath from to) 
Instance details

Defined in Distribution.Utils.Path

Methods

showsPrec :: Int -> SymbolicPath from to -> ShowS

show :: SymbolicPath from to -> String #

showList :: [SymbolicPath from to] -> 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

(Show a, Show b) => Show (Either a b) 
Instance details

Defined in Data.Either

Methods

showsPrec :: Int -> Either a b -> ShowS

show :: Either a b -> String #

showList :: [Either a b] -> ShowS

HasResolution a => Show (Fixed a) 
Instance details

Defined in Data.Fixed

Methods

showsPrec :: Int -> Fixed a -> ShowS

show :: Fixed a -> String #

showList :: [Fixed a] -> ShowS

Show (Proxy s) 
Instance details

Defined in Data.Proxy

Methods

showsPrec :: Int -> Proxy s -> ShowS

show :: Proxy s -> String #

showList :: [Proxy s] -> ShowS

(Show a, Show b) => Show (Arg a b) 
Instance details

Defined in Data.Semigroup

Methods

showsPrec :: Int -> Arg a b -> ShowS

show :: Arg a b -> String #

showList :: [Arg a b] -> ShowS

Show (TypeRep a) 
Instance details

Defined in Data.Typeable.Internal

Methods

showsPrec :: Int -> TypeRep a -> ShowS

show :: TypeRep a -> String #

showList :: [TypeRep a] -> ShowS

(Ix a, Show a, Show b) => Show (Array a b) 
Instance details

Defined in GHC.Arr

Methods

showsPrec :: Int -> Array a b -> ShowS

show :: Array a b -> String #

showList :: [Array a b] -> ShowS

Show (U1 p) 
Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> U1 p -> ShowS

show :: U1 p -> String #

showList :: [U1 p] -> ShowS

Show (V1 p) 
Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> V1 p -> ShowS

show :: V1 p -> String #

showList :: [V1 p] -> ShowS

Show (ST s a) 
Instance details

Defined in GHC.ST

Methods

showsPrec :: Int -> ST s a -> ShowS

show :: ST s a -> String #

showList :: [ST s a] -> 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

Show (PublicKey curve hash) 
Instance details

Defined in Crypto.PubKey.EdDSA

Methods

showsPrec :: Int -> PublicKey curve hash -> ShowS

show :: PublicKey curve hash -> String #

showList :: [PublicKey curve hash] -> ShowS

Show (Signature curve hash) 
Instance details

Defined in Crypto.PubKey.EdDSA

Methods

showsPrec :: Int -> Signature curve hash -> ShowS

show :: Signature curve hash -> String #

showList :: [Signature curve hash] -> ShowS

(Show a, Show b) => Show (Product a b) 
Instance details

Defined in Data.Aeson.Config.Types

Methods

showsPrec :: Int -> Product a b -> ShowS

show :: Product a b -> String #

showList :: [Product a b] -> ShowS

(Show ba, Show a) => Show (Result ba a) 
Instance details

Defined in Data.ByteArray.Parse

Methods

showsPrec :: Int -> Result ba a -> ShowS

show :: Result ba a -> String #

showList :: [Result ba a] -> ShowS

Show ba => Show (SizedByteArray n ba) 
Instance details

Defined in Data.ByteArray.Sized

Methods

showsPrec :: Int -> SizedByteArray n ba -> ShowS

show :: SizedByteArray n ba -> String #

showList :: [SizedByteArray n ba] -> ShowS

Show (Path b t) 
Instance details

Defined in Path.Internal.Posix

Methods

showsPrec :: Int -> Path b t -> ShowS

show :: Path b t -> String #

showList :: [Path b t] -> ShowS

Show (Path b t) 
Instance details

Defined in Path.Internal.Windows

Methods

showsPrec :: Int -> Path b t -> ShowS

show :: Path b t -> String #

showList :: [Path b t] -> ShowS

(Show k, Show a) => Show (MonoidMap k a) Source # 
Instance details

Defined in Data.Monoid.Map

Methods

showsPrec :: Int -> MonoidMap k a -> ShowS

show :: MonoidMap k a -> String #

showList :: [MonoidMap k a] -> ShowS

(Show a, Show b) => Show (LockedLocation a b) Source # 
Instance details

Defined in Stack.Lock

Methods

showsPrec :: Int -> LockedLocation a b -> ShowS

show :: LockedLocation a b -> String #

showList :: [LockedLocation a b] -> ShowS

Show (MemoizedWith env a) Source # 
Instance details

Defined in Stack.Types.Package

Methods

showsPrec :: Int -> MemoizedWith env a -> ShowS

show :: MemoizedWith env a -> String #

showList :: [MemoizedWith env 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 tarPath, Show linkTarget) => Show (GenEntry tarPath linkTarget) 
Instance details

Defined in Codec.Archive.Tar.Types

Methods

showsPrec :: Int -> GenEntry tarPath linkTarget -> ShowS

show :: GenEntry tarPath linkTarget -> String #

showList :: [GenEntry tarPath linkTarget] -> 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) 
Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a, b) -> ShowS

show :: (a, b) -> String #

showList :: [(a, b)] -> ShowS

(Show v, Show a, Show c) => Show (CondBranch v c a) 
Instance details

Defined in Distribution.Types.CondTree

Methods

showsPrec :: Int -> CondBranch v c a -> ShowS

show :: CondBranch v c a -> String #

showList :: [CondBranch v c a] -> ShowS

(Show a, Show c, Show v) => Show (CondTree v c a) 
Instance details

Defined in Distribution.Types.CondTree

Methods

showsPrec :: Int -> CondTree v c a -> ShowS

show :: CondTree v c a -> String #

showList :: [CondTree v c a] -> ShowS

Show a => Show (Const a b) 
Instance details

Defined in 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) 
Instance details

Defined in 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) 
Instance details

Defined in Data.Semigroup.Internal

Methods

showsPrec :: Int -> Alt f a -> ShowS

show :: Alt f a -> String #

showList :: [Alt f a] -> ShowS

Show (Coercion a b) 
Instance details

Defined in Data.Type.Coercion

Methods

showsPrec :: Int -> Coercion a b -> ShowS

show :: Coercion a b -> String #

showList :: [Coercion a b] -> ShowS

Show (a :~: b) 
Instance details

Defined in 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 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) 
Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> Rec1 f p -> ShowS

show :: Rec1 f p -> String #

showList :: [Rec1 f p] -> ShowS

Show (URec Char p) 
Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> URec Char p -> ShowS

show :: URec Char p -> String #

showList :: [URec Char p] -> ShowS

Show (URec Double p) 
Instance details

Defined in GHC.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.Generics

Methods

showsPrec :: Int -> URec Float p -> ShowS

show :: URec Float p -> String #

showList :: [URec Float p] -> ShowS

Show (URec Int p) 
Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> URec Int p -> ShowS

show :: URec Int p -> String #

showList :: [URec Int p] -> ShowS

Show (URec Word p) 
Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> URec Word p -> ShowS

show :: URec Word p -> String #

showList :: [URec Word p] -> ShowS

Show a => Show (Alias deprecated alias a) 
Instance details

Defined in Data.Aeson.Config.FromValue

Methods

showsPrec :: Int -> Alias deprecated alias a -> ShowS

show :: Alias deprecated alias a -> String #

showList :: [Alias deprecated alias a] -> 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 tarPath, Show linkTarget, Show e) => Show (GenEntries tarPath linkTarget e) 
Instance details

Defined in Codec.Archive.Tar.Types

Methods

showsPrec :: Int -> GenEntries tarPath linkTarget e -> ShowS

show :: GenEntries tarPath linkTarget e -> String #

showList :: [GenEntries tarPath linkTarget e] -> 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 (Process stdin stdout stderr) 
Instance details

Defined in System.Process.Typed

Methods

showsPrec :: Int -> Process stdin stdout stderr -> ShowS

show :: Process stdin stdout stderr -> String #

showList :: [Process stdin stdout stderr] -> ShowS

Show (ProcessConfig stdin stdout stderr) 
Instance details

Defined in System.Process.Typed.Internal

Methods

showsPrec :: Int -> ProcessConfig stdin stdout stderr -> ShowS

show :: ProcessConfig stdin stdout stderr -> String #

showList :: [ProcessConfig stdin stdout stderr] -> ShowS

(Show a, Show b, Show c) => Show (a, b, c) 
Instance details

Defined in GHC.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) 
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) 
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) 
Instance details

Defined in 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) 
Instance details

Defined in GHC.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) 
Instance details

Defined in GHC.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) 
Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> K1 i c p -> ShowS

show :: K1 i c p -> String #

showList :: [K1 i c p] -> ShowS

(Show a, Show b, Show c, Show d) => Show (a, b, c, d) 
Instance details

Defined in GHC.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) 
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 (g p)) => Show ((f :.: g) p) 
Instance details

Defined in GHC.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) 
Instance details

Defined in GHC.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 uid, Show modulename, Show mod, Show srcpkgid, Show srcpkgname) => Show (GenericUnitInfo srcpkgid srcpkgname uid modulename mod) 
Instance details

Defined in GHC.Unit.Database

Methods

showsPrec :: Int -> GenericUnitInfo srcpkgid srcpkgname uid modulename mod -> ShowS

show :: GenericUnitInfo srcpkgid srcpkgname uid modulename mod -> String #

showList :: [GenericUnitInfo srcpkgid srcpkgname uid modulename mod] -> ShowS

(Show a, Show b, Show c, Show d, Show e) => Show (a, b, c, d, e) 
Instance details

Defined in GHC.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 a, Show b, Show c, Show d, Show e, Show f) => Show (a, b, c, d, e, f) 
Instance details

Defined in GHC.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 a, Show b, Show c, Show d, Show e, Show f, Show g) => Show (a, b, c, d, e, f, g) 
Instance details

Defined in GHC.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) 
Instance details

Defined in GHC.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 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) 
Instance details

Defined in GHC.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) 
Instance details

Defined in GHC.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) 
Instance details

Defined in GHC.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) 
Instance details

Defined in GHC.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) 
Instance details

Defined in GHC.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) 
Instance details

Defined in GHC.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) 
Instance details

Defined in GHC.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

data Word16 #

Instances

Instances details
Structured Word16 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy Word16 -> Structure

structureHash' :: Tagged Word16 MD5

FromJSON Word16 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Word16 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction Word16

fromJSONKeyList :: FromJSONKeyFunction [Word16]

ToJSON Word16 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Word16 -> Value

toEncoding :: Word16 -> Encoding

toJSONList :: [Word16] -> Value

toEncodingList :: [Word16] -> Encoding

omitField :: Word16 -> Bool

ToJSONKey Word16 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction Word16

toJSONKeyList :: ToJSONKeyFunction [Word16]

Data Word16 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Word16 -> c Word16 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Word16 #

toConstr :: Word16 -> Constr #

dataTypeOf :: Word16 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Word16) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Word16) #

gmapT :: (forall b. Data b => b -> b) -> Word16 -> Word16 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Word16 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Word16 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Word16 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Word16 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Word16 -> m Word16 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Word16 -> m Word16 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Word16 -> m Word16 #

Storable Word16 
Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Word16 -> Int

alignment :: Word16 -> Int

peekElemOff :: Ptr Word16 -> Int -> IO Word16

pokeElemOff :: Ptr Word16 -> Int -> Word16 -> IO ()

peekByteOff :: Ptr b -> Int -> IO Word16

pokeByteOff :: Ptr b -> Int -> Word16 -> IO ()

peek :: Ptr Word16 -> IO Word16

poke :: Ptr Word16 -> Word16 -> IO ()

Bits Word16 
Instance details

Defined in GHC.Word

FiniteBits Word16 
Instance details

Defined in GHC.Word

Bounded Word16 
Instance details

Defined in GHC.Word

Enum Word16 
Instance details

Defined in GHC.Word

Ix Word16 
Instance details

Defined in GHC.Word

Num Word16 
Instance details

Defined in GHC.Word

Read Word16 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS Word16

readList :: ReadS [Word16]

readPrec :: ReadPrec Word16

readListPrec :: ReadPrec [Word16]

Integral Word16 
Instance details

Defined in GHC.Word

Real Word16 
Instance details

Defined in GHC.Word

Show Word16 
Instance details

Defined in GHC.Word

Methods

showsPrec :: Int -> Word16 -> ShowS

show :: Word16 -> String #

showList :: [Word16] -> ShowS

PrintfArg Word16 
Instance details

Defined in Text.Printf

Methods

formatArg :: Word16 -> FieldFormatter

parseFormat :: Word16 -> ModifierParser

BitOps Word16 
Instance details

Defined in Basement.Bits

Methods

(.&.) :: Word16 -> Word16 -> Word16

(.|.) :: Word16 -> Word16 -> Word16

(.^.) :: Word16 -> Word16 -> Word16

(.<<.) :: Word16 -> CountOf Bool -> Word16

(.>>.) :: Word16 -> CountOf Bool -> Word16

bit :: Offset Bool -> Word16

isBitSet :: Word16 -> Offset Bool -> Bool

setBit :: Word16 -> Offset Bool -> Word16

clearBit :: Word16 -> Offset Bool -> Word16

FiniteBitsOps Word16 
Instance details

Defined in Basement.Bits

Methods

numberOfBits :: Word16 -> CountOf Bool

rotateL :: Word16 -> CountOf Bool -> Word16

rotateR :: Word16 -> CountOf Bool -> Word16

popCount :: Word16 -> CountOf Bool

bitFlip :: Word16 -> Word16

countLeadingZeros :: Word16 -> CountOf Bool

countTrailingZeros :: Word16 -> CountOf Bool

Subtractive Word16 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Word16 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Word16 = Word16

Methods

(-) :: Word16 -> Word16 -> Difference Word16

PrimMemoryComparable Word16 
Instance details

Defined in Basement.PrimType

PrimType Word16 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Word16 
Instance details

Defined in Basement.PrimType

type PrimSize Word16 = 2

Methods

primSizeInBytes :: Proxy Word16 -> CountOf Word8

primShiftToBytes :: Proxy Word16 -> Int

primBaUIndex :: ByteArray# -> Offset Word16 -> Word16

primMbaURead :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Word16 -> prim Word16

primMbaUWrite :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Word16 -> Word16 -> prim ()

primAddrIndex :: Addr# -> Offset Word16 -> Word16

primAddrRead :: PrimMonad prim => Addr# -> Offset Word16 -> prim Word16

primAddrWrite :: PrimMonad prim => Addr# -> Offset Word16 -> Word16 -> prim ()

Binary Word16 
Instance details

Defined in Data.Binary.Class

Methods

put :: Word16 -> Put

get :: Get Word16

putList :: [Word16] -> Put

NFData Word16 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word16 -> () #

GEnum Word16 
Instance details

Defined in Generics.Deriving.Enum

Methods

genum :: [Word16]

GIx Word16 
Instance details

Defined in Generics.Deriving.Enum

Methods

range :: (Word16, Word16) -> [Word16]

index :: (Word16, Word16) -> Word16 -> Int

inRange :: (Word16, Word16) -> Word16 -> Bool

GEq Word16 
Instance details

Defined in Generics.Deriving.Eq

Methods

geq :: Word16 -> Word16 -> Bool

GShow Word16 
Instance details

Defined in Generics.Deriving.Show

Methods

gshowsPrec :: Int -> Word16 -> ShowS

gshows :: Word16 -> ShowS

gshow :: Word16 -> String

gshowList :: [Word16] -> ShowS

Eq Word16 
Instance details

Defined in GHC.Word

Methods

(==) :: Word16 -> Word16 -> Bool #

(/=) :: Word16 -> Word16 -> Bool #

Ord Word16 
Instance details

Defined in GHC.Word

Hashable Word16 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word16 -> Int

hash :: Word16 -> Int

FromHttpApiData Word16 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Word16 
Instance details

Defined in Web.Internal.HttpApiData

ByteSwap Word16 
Instance details

Defined in Data.Memory.Endian

Methods

byteSwap :: Word16 -> Word16

ToMustache Word16 
Instance details

Defined in Text.Mustache.Internal.Types

PathPiece Word16 
Instance details

Defined in Web.PathPieces

PersistField Word16 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Word16 -> PersistValue

fromPersistValue :: PersistValue -> Either Text Word16

PersistFieldSql Word16 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Word16 -> SqlType

Pretty Word16 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Word16 -> Doc ann

prettyList :: [Word16] -> Doc ann

Random Word16 
Instance details

Defined in System.Random

Methods

randomR :: RandomGen g => (Word16, Word16) -> g -> (Word16, g)

random :: RandomGen g => g -> (Word16, g)

randomRs :: RandomGen g => (Word16, Word16) -> g -> [Word16]

randoms :: RandomGen g => g -> [Word16]

Uniform Word16 
Instance details

Defined in System.Random.Internal

Methods

uniformM :: StatefulGen g m => g -> m Word16

UniformRange Word16 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Word16, Word16) -> g -> m Word16

Display Word16 
Instance details

Defined in RIO.Prelude.Display

ByteSource Word16 
Instance details

Defined in Data.UUID.Types.Internal.Builder

Methods

(/-/) :: ByteSink Word16 g -> Word16 -> g

Unbox Word16 
Instance details

Defined in Data.Vector.Unboxed.Base

IArray UArray Word16 
Instance details

Defined in Data.Array.Base

Methods

bounds :: Ix i => UArray i Word16 -> (i, i)

numElements :: Ix i => UArray i Word16 -> Int

unsafeArray :: Ix i => (i, i) -> [(Int, Word16)] -> UArray i Word16

unsafeAt :: Ix i => UArray i Word16 -> Int -> Word16

unsafeReplace :: Ix i => UArray i Word16 -> [(Int, Word16)] -> UArray i Word16

unsafeAccum :: Ix i => (Word16 -> e' -> Word16) -> UArray i Word16 -> [(Int, e')] -> UArray i Word16

unsafeAccumArray :: Ix i => (Word16 -> e' -> Word16) -> Word16 -> (i, i) -> [(Int, e')] -> UArray i Word16

Lift Word16 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Word16 -> m Exp

liftTyped :: forall (m :: Type -> Type). Quote m => Word16 -> Code m Word16

Vector Vector Word16 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: Mutable Vector s Word16 -> ST s (Vector Word16)

basicUnsafeThaw :: Vector Word16 -> ST s (Mutable Vector s Word16)

basicLength :: Vector Word16 -> Int

basicUnsafeSlice :: Int -> Int -> Vector Word16 -> Vector Word16

basicUnsafeIndexM :: Vector Word16 -> Int -> Box Word16

basicUnsafeCopy :: Mutable Vector s Word16 -> Vector Word16 -> ST s ()

elemseq :: Vector Word16 -> Word16 -> b -> b

MVector MVector Word16 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s Word16 -> Int

basicUnsafeSlice :: Int -> Int -> MVector s Word16 -> MVector s Word16

basicOverlaps :: MVector s Word16 -> MVector s Word16 -> Bool

basicUnsafeNew :: Int -> ST s (MVector s Word16)

basicInitialize :: MVector s Word16 -> ST s ()

basicUnsafeReplicate :: Int -> Word16 -> ST s (MVector s Word16)

basicUnsafeRead :: MVector s Word16 -> Int -> ST s Word16

basicUnsafeWrite :: MVector s Word16 -> Int -> Word16 -> ST s ()

basicClear :: MVector s Word16 -> ST s ()

basicSet :: MVector s Word16 -> Word16 -> ST s ()

basicUnsafeCopy :: MVector s Word16 -> MVector s Word16 -> ST s ()

basicUnsafeMove :: MVector s Word16 -> MVector s Word16 -> ST s ()

basicUnsafeGrow :: MVector s Word16 -> Int -> ST s (MVector s Word16)

MArray IOUArray Word16 IO 
Instance details

Defined in Data.Array.IO.Internals

Methods

getBounds :: Ix i => IOUArray i Word16 -> IO (i, i)

getNumElements :: Ix i => IOUArray i Word16 -> IO Int

newArray :: Ix i => (i, i) -> Word16 -> IO (IOUArray i Word16)

newArray_ :: Ix i => (i, i) -> IO (IOUArray i Word16)

unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Word16)

unsafeRead :: Ix i => IOUArray i Word16 -> Int -> IO Word16

unsafeWrite :: Ix i => IOUArray i Word16 -> Int -> Word16 -> IO ()

MArray (STUArray s) Word16 (ST s) 
Instance details

Defined in Data.Array.Base

Methods

getBounds :: Ix i => STUArray s i Word16 -> ST s (i, i)

getNumElements :: Ix i => STUArray s i Word16 -> ST s Int

newArray :: Ix i => (i, i) -> Word16 -> ST s (STUArray s i Word16)

newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Word16)

unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Word16)

unsafeRead :: Ix i => STUArray s i Word16 -> Int -> ST s Word16

unsafeWrite :: Ix i => STUArray s i Word16 -> Int -> Word16 -> ST s ()

type NatNumMaxBound Word16 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Word16 = 65535
type Difference Word16 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Word16 = Word16
type PrimSize Word16 
Instance details

Defined in Basement.PrimType

type PrimSize Word16 = 2
newtype Vector Word16 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector Word16 = V_Word16 (Vector Word16)
type ByteSink Word16 g 
Instance details

Defined in Data.UUID.Types.Internal.Builder

type ByteSink Word16 g = Takes2Bytes g
newtype MVector s Word16 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Word16 = MV_Word16 (MVector s Word16)

data Word32 #

Instances

Instances details
Structured Word32 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy Word32 -> Structure

structureHash' :: Tagged Word32 MD5

FromJSON Word32 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Word32 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction Word32

fromJSONKeyList :: FromJSONKeyFunction [Word32]

ToJSON Word32 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Word32 -> Value

toEncoding :: Word32 -> Encoding

toJSONList :: [Word32] -> Value

toEncodingList :: [Word32] -> Encoding

omitField :: Word32 -> Bool

ToJSONKey Word32 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction Word32

toJSONKeyList :: ToJSONKeyFunction [Word32]

Data Word32 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Word32 -> c Word32 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Word32 #

toConstr :: Word32 -> Constr #

dataTypeOf :: Word32 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Word32) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Word32) #

gmapT :: (forall b. Data b => b -> b) -> Word32 -> Word32 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Word32 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Word32 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Word32 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Word32 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Word32 -> m Word32 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Word32 -> m Word32 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Word32 -> m Word32 #

Storable Word32 
Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Word32 -> Int

alignment :: Word32 -> Int

peekElemOff :: Ptr Word32 -> Int -> IO Word32

pokeElemOff :: Ptr Word32 -> Int -> Word32 -> IO ()

peekByteOff :: Ptr b -> Int -> IO Word32

pokeByteOff :: Ptr b -> Int -> Word32 -> IO ()

peek :: Ptr Word32 -> IO Word32

poke :: Ptr Word32 -> Word32 -> IO ()

Bits Word32 
Instance details

Defined in GHC.Word

FiniteBits Word32 
Instance details

Defined in GHC.Word

Bounded Word32 
Instance details

Defined in GHC.Word

Enum Word32 
Instance details

Defined in GHC.Word

Ix Word32 
Instance details

Defined in GHC.Word

Num Word32 
Instance details

Defined in GHC.Word

Read Word32 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS Word32

readList :: ReadS [Word32]

readPrec :: ReadPrec Word32

readListPrec :: ReadPrec [Word32]

Integral Word32 
Instance details

Defined in GHC.Word

Real Word32 
Instance details

Defined in GHC.Word

Show Word32 
Instance details

Defined in GHC.Word

Methods

showsPrec :: Int -> Word32 -> ShowS

show :: Word32 -> String #

showList :: [Word32] -> ShowS

PrintfArg Word32 
Instance details

Defined in Text.Printf

Methods

formatArg :: Word32 -> FieldFormatter

parseFormat :: Word32 -> ModifierParser

BitOps Word32 
Instance details

Defined in Basement.Bits

Methods

(.&.) :: Word32 -> Word32 -> Word32

(.|.) :: Word32 -> Word32 -> Word32

(.^.) :: Word32 -> Word32 -> Word32

(.<<.) :: Word32 -> CountOf Bool -> Word32

(.>>.) :: Word32 -> CountOf Bool -> Word32

bit :: Offset Bool -> Word32

isBitSet :: Word32 -> Offset Bool -> Bool

setBit :: Word32 -> Offset Bool -> Word32

clearBit :: Word32 -> Offset Bool -> Word32

FiniteBitsOps Word32 
Instance details

Defined in Basement.Bits

Methods

numberOfBits :: Word32 -> CountOf Bool

rotateL :: Word32 -> CountOf Bool -> Word32

rotateR :: Word32 -> CountOf Bool -> Word32

popCount :: Word32 -> CountOf Bool

bitFlip :: Word32 -> Word32

countLeadingZeros :: Word32 -> CountOf Bool

countTrailingZeros :: Word32 -> CountOf Bool

Subtractive Word32 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Word32 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Word32 = Word32

Methods

(-) :: Word32 -> Word32 -> Difference Word32

PrimMemoryComparable Word32 
Instance details

Defined in Basement.PrimType

PrimType Word32 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Word32 
Instance details

Defined in Basement.PrimType

type PrimSize Word32 = 4

Methods

primSizeInBytes :: Proxy Word32 -> CountOf Word8

primShiftToBytes :: Proxy Word32 -> Int

primBaUIndex :: ByteArray# -> Offset Word32 -> Word32

primMbaURead :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Word32 -> prim Word32

primMbaUWrite :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Word32 -> Word32 -> prim ()

primAddrIndex :: Addr# -> Offset Word32 -> Word32

primAddrRead :: PrimMonad prim => Addr# -> Offset Word32 -> prim Word32

primAddrWrite :: PrimMonad prim => Addr# -> Offset Word32 -> Word32 -> prim ()

Binary Word32 
Instance details

Defined in Data.Binary.Class

Methods

put :: Word32 -> Put

get :: Get Word32

putList :: [Word32] -> Put

NFData Word32 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word32 -> () #

GEnum Word32 
Instance details

Defined in Generics.Deriving.Enum

Methods

genum :: [Word32]

GIx Word32 
Instance details

Defined in Generics.Deriving.Enum

Methods

range :: (Word32, Word32) -> [Word32]

index :: (Word32, Word32) -> Word32 -> Int

inRange :: (Word32, Word32) -> Word32 -> Bool

GEq Word32 
Instance details

Defined in Generics.Deriving.Eq

Methods

geq :: Word32 -> Word32 -> Bool

GShow Word32 
Instance details

Defined in Generics.Deriving.Show

Methods

gshowsPrec :: Int -> Word32 -> ShowS

gshows :: Word32 -> ShowS

gshow :: Word32 -> String

gshowList :: [Word32] -> ShowS

Eq Word32 
Instance details

Defined in GHC.Word

Methods

(==) :: Word32 -> Word32 -> Bool #

(/=) :: Word32 -> Word32 -> Bool #

Ord Word32 
Instance details

Defined in GHC.Word

Hashable Word32 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word32 -> Int

hash :: Word32 -> Int

FromHttpApiData Word32 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Word32 
Instance details

Defined in Web.Internal.HttpApiData

ByteSwap Word32 
Instance details

Defined in Data.Memory.Endian

Methods

byteSwap :: Word32 -> Word32

ToMustache Word32 
Instance details

Defined in Text.Mustache.Internal.Types

PathPiece Word32 
Instance details

Defined in Web.PathPieces

PersistField Word32 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Word32 -> PersistValue

fromPersistValue :: PersistValue -> Either Text Word32

PersistFieldSql Word32 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Word32 -> SqlType

Pretty Word32 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Word32 -> Doc ann

prettyList :: [Word32] -> Doc ann

Random Word32 
Instance details

Defined in System.Random

Methods

randomR :: RandomGen g => (Word32, Word32) -> g -> (Word32, g)

random :: RandomGen g => g -> (Word32, g)

randomRs :: RandomGen g => (Word32, Word32) -> g -> [Word32]

randoms :: RandomGen g => g -> [Word32]

Uniform Word32 
Instance details

Defined in System.Random.Internal

Methods

uniformM :: StatefulGen g m => g -> m Word32

UniformRange Word32 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Word32, Word32) -> g -> m Word32

Display Word32 
Instance details

Defined in RIO.Prelude.Display

ByteSource Word32 
Instance details

Defined in Data.UUID.Types.Internal.Builder

Methods

(/-/) :: ByteSink Word32 g -> Word32 -> g

Unbox Word32 
Instance details

Defined in Data.Vector.Unboxed.Base

IArray UArray Word32 
Instance details

Defined in Data.Array.Base

Methods

bounds :: Ix i => UArray i Word32 -> (i, i)

numElements :: Ix i => UArray i Word32 -> Int

unsafeArray :: Ix i => (i, i) -> [(Int, Word32)] -> UArray i Word32

unsafeAt :: Ix i => UArray i Word32 -> Int -> Word32

unsafeReplace :: Ix i => UArray i Word32 -> [(Int, Word32)] -> UArray i Word32

unsafeAccum :: Ix i => (Word32 -> e' -> Word32) -> UArray i Word32 -> [(Int, e')] -> UArray i Word32

unsafeAccumArray :: Ix i => (Word32 -> e' -> Word32) -> Word32 -> (i, i) -> [(Int, e')] -> UArray i Word32

Lift Word32 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Word32 -> m Exp

liftTyped :: forall (m :: Type -> Type). Quote m => Word32 -> Code m Word32

Vector Vector Word32 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: Mutable Vector s Word32 -> ST s (Vector Word32)

basicUnsafeThaw :: Vector Word32 -> ST s (Mutable Vector s Word32)

basicLength :: Vector Word32 -> Int

basicUnsafeSlice :: Int -> Int -> Vector Word32 -> Vector Word32

basicUnsafeIndexM :: Vector Word32 -> Int -> Box Word32

basicUnsafeCopy :: Mutable Vector s Word32 -> Vector Word32 -> ST s ()

elemseq :: Vector Word32 -> Word32 -> b -> b

MVector MVector Word32 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s Word32 -> Int

basicUnsafeSlice :: Int -> Int -> MVector s Word32 -> MVector s Word32

basicOverlaps :: MVector s Word32 -> MVector s Word32 -> Bool

basicUnsafeNew :: Int -> ST s (MVector s Word32)

basicInitialize :: MVector s Word32 -> ST s ()

basicUnsafeReplicate :: Int -> Word32 -> ST s (MVector s Word32)

basicUnsafeRead :: MVector s Word32 -> Int -> ST s Word32

basicUnsafeWrite :: MVector s Word32 -> Int -> Word32 -> ST s ()

basicClear :: MVector s Word32 -> ST s ()

basicSet :: MVector s Word32 -> Word32 -> ST s ()

basicUnsafeCopy :: MVector s Word32 -> MVector s Word32 -> ST s ()

basicUnsafeMove :: MVector s Word32 -> MVector s Word32 -> ST s ()

basicUnsafeGrow :: MVector s Word32 -> Int -> ST s (MVector s Word32)

MArray IOUArray Word32 IO 
Instance details

Defined in Data.Array.IO.Internals

Methods

getBounds :: Ix i => IOUArray i Word32 -> IO (i, i)

getNumElements :: Ix i => IOUArray i Word32 -> IO Int

newArray :: Ix i => (i, i) -> Word32 -> IO (IOUArray i Word32)

newArray_ :: Ix i => (i, i) -> IO (IOUArray i Word32)

unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Word32)

unsafeRead :: Ix i => IOUArray i Word32 -> Int -> IO Word32

unsafeWrite :: Ix i => IOUArray i Word32 -> Int -> Word32 -> IO ()

MArray (STUArray s) Word32 (ST s) 
Instance details

Defined in Data.Array.Base

Methods

getBounds :: Ix i => STUArray s i Word32 -> ST s (i, i)

getNumElements :: Ix i => STUArray s i Word32 -> ST s Int

newArray :: Ix i => (i, i) -> Word32 -> ST s (STUArray s i Word32)

newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Word32)

unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Word32)

unsafeRead :: Ix i => STUArray s i Word32 -> Int -> ST s Word32

unsafeWrite :: Ix i => STUArray s i Word32 -> Int -> Word32 -> ST s ()

type NatNumMaxBound Word32 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Word32 = 4294967295
type Difference Word32 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Word32 = Word32
type PrimSize Word32 
Instance details

Defined in Basement.PrimType

type PrimSize Word32 = 4
newtype Vector Word32 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector Word32 = V_Word32 (Vector Word32)
type ByteSink Word32 g 
Instance details

Defined in Data.UUID.Types.Internal.Builder

type ByteSink Word32 g = Takes4Bytes g
newtype MVector s Word32 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Word32 = MV_Word32 (MVector s Word32)

data Word64 #

Instances

Instances details
Structured Word64 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy Word64 -> Structure

structureHash' :: Tagged Word64 MD5

FromJSON Word64 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Word64 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction Word64

fromJSONKeyList :: FromJSONKeyFunction [Word64]

ToJSON Word64 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Word64 -> Value

toEncoding :: Word64 -> Encoding

toJSONList :: [Word64] -> Value

toEncodingList :: [Word64] -> Encoding

omitField :: Word64 -> Bool

ToJSONKey Word64 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction Word64

toJSONKeyList :: ToJSONKeyFunction [Word64]

Data Word64 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Word64 -> c Word64 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Word64 #

toConstr :: Word64 -> Constr #

dataTypeOf :: Word64 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Word64) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Word64) #

gmapT :: (forall b. Data b => b -> b) -> Word64 -> Word64 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Word64 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Word64 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Word64 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Word64 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Word64 -> m Word64 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Word64 -> m Word64 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Word64 -> m Word64 #

Storable Word64 
Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Word64 -> Int

alignment :: Word64 -> Int

peekElemOff :: Ptr Word64 -> Int -> IO Word64

pokeElemOff :: Ptr Word64 -> Int -> Word64 -> IO ()

peekByteOff :: Ptr b -> Int -> IO Word64

pokeByteOff :: Ptr b -> Int -> Word64 -> IO ()

peek :: Ptr Word64 -> IO Word64

poke :: Ptr Word64 -> Word64 -> IO ()

Bits Word64 
Instance details

Defined in GHC.Word

FiniteBits Word64 
Instance details

Defined in GHC.Word

Bounded Word64 
Instance details

Defined in GHC.Word

Enum Word64 
Instance details

Defined in GHC.Word

Ix Word64 
Instance details

Defined in GHC.Word

Num Word64 
Instance details

Defined in GHC.Word

Read Word64 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS Word64

readList :: ReadS [Word64]

readPrec :: ReadPrec Word64

readListPrec :: ReadPrec [Word64]

Integral Word64 
Instance details

Defined in GHC.Word

Real Word64 
Instance details

Defined in GHC.Word

Show Word64 
Instance details

Defined in GHC.Word

Methods

showsPrec :: Int -> Word64 -> ShowS

show :: Word64 -> String #

showList :: [Word64] -> ShowS

PrintfArg Word64 
Instance details

Defined in Text.Printf

Methods

formatArg :: Word64 -> FieldFormatter

parseFormat :: Word64 -> ModifierParser

BitOps Word64 
Instance details

Defined in Basement.Bits

Methods

(.&.) :: Word64 -> Word64 -> Word64

(.|.) :: Word64 -> Word64 -> Word64

(.^.) :: Word64 -> Word64 -> Word64

(.<<.) :: Word64 -> CountOf Bool -> Word64

(.>>.) :: Word64 -> CountOf Bool -> Word64

bit :: Offset Bool -> Word64

isBitSet :: Word64 -> Offset Bool -> Bool

setBit :: Word64 -> Offset Bool -> Word64

clearBit :: Word64 -> Offset Bool -> Word64

FiniteBitsOps Word64 
Instance details

Defined in Basement.Bits

Methods

numberOfBits :: Word64 -> CountOf Bool

rotateL :: Word64 -> CountOf Bool -> Word64

rotateR :: Word64 -> CountOf Bool -> Word64

popCount :: Word64 -> CountOf Bool

bitFlip :: Word64 -> Word64

countLeadingZeros :: Word64 -> CountOf Bool

countTrailingZeros :: Word64 -> CountOf Bool

Subtractive Word64 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Word64 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Word64 = Word64

Methods

(-) :: Word64 -> Word64 -> Difference Word64

PrimMemoryComparable Word64 
Instance details

Defined in Basement.PrimType

PrimType Word64 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Word64 
Instance details

Defined in Basement.PrimType

type PrimSize Word64 = 8

Methods

primSizeInBytes :: Proxy Word64 -> CountOf Word8

primShiftToBytes :: Proxy Word64 -> Int

primBaUIndex :: ByteArray# -> Offset Word64 -> Word64

primMbaURead :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Word64 -> prim Word64

primMbaUWrite :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Word64 -> Word64 -> prim ()

primAddrIndex :: Addr# -> Offset Word64 -> Word64

primAddrRead :: PrimMonad prim => Addr# -> Offset Word64 -> prim Word64

primAddrWrite :: PrimMonad prim => Addr# -> Offset Word64 -> Word64 -> prim ()

Binary Word64 
Instance details

Defined in Data.Binary.Class

Methods

put :: Word64 -> Put

get :: Get Word64

putList :: [Word64] -> Put

NFData Word64 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word64 -> () #

GEnum Word64 
Instance details

Defined in Generics.Deriving.Enum

Methods

genum :: [Word64]

GIx Word64 
Instance details

Defined in Generics.Deriving.Enum

Methods

range :: (Word64, Word64) -> [Word64]

index :: (Word64, Word64) -> Word64 -> Int

inRange :: (Word64, Word64) -> Word64 -> Bool

GEq Word64 
Instance details

Defined in Generics.Deriving.Eq

Methods

geq :: Word64 -> Word64 -> Bool

GShow Word64 
Instance details

Defined in Generics.Deriving.Show

Methods

gshowsPrec :: Int -> Word64 -> ShowS

gshows :: Word64 -> ShowS

gshow :: Word64 -> String

gshowList :: [Word64] -> ShowS

Eq Word64 
Instance details

Defined in GHC.Word

Methods

(==) :: Word64 -> Word64 -> Bool #

(/=) :: Word64 -> Word64 -> Bool #

Ord Word64 
Instance details

Defined in GHC.Word

Hashable Word64 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word64 -> Int

hash :: Word64 -> Int

FromHttpApiData Word64 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Word64 
Instance details

Defined in Web.Internal.HttpApiData

ByteSwap Word64 
Instance details

Defined in Data.Memory.Endian

Methods

byteSwap :: Word64 -> Word64

ToMustache Word64 
Instance details

Defined in Text.Mustache.Internal.Types

PathPiece Word64 
Instance details

Defined in Web.PathPieces

PersistField Word64 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Word64 -> PersistValue

fromPersistValue :: PersistValue -> Either Text Word64

PersistFieldSql Word64 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Word64 -> SqlType

Pretty Word64 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Word64 -> Doc ann

prettyList :: [Word64] -> Doc ann

Random Word64 
Instance details

Defined in System.Random

Methods

randomR :: RandomGen g => (Word64, Word64) -> g -> (Word64, g)

random :: RandomGen g => g -> (Word64, g)

randomRs :: RandomGen g => (Word64, Word64) -> g -> [Word64]

randoms :: RandomGen g => g -> [Word64]

Uniform Word64 
Instance details

Defined in System.Random.Internal

Methods

uniformM :: StatefulGen g m => g -> m Word64

UniformRange Word64 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Word64, Word64) -> g -> m Word64

Display Word64 
Instance details

Defined in RIO.Prelude.Display

ByteSource Word64 
Instance details

Defined in Data.UUID.Types.Internal.Builder

Methods

(/-/) :: ByteSink Word64 g -> Word64 -> g

Unbox Word64 
Instance details

Defined in Data.Vector.Unboxed.Base

IArray UArray Word64 
Instance details

Defined in Data.Array.Base

Methods

bounds :: Ix i => UArray i Word64 -> (i, i)

numElements :: Ix i => UArray i Word64 -> Int

unsafeArray :: Ix i => (i, i) -> [(Int, Word64)] -> UArray i Word64

unsafeAt :: Ix i => UArray i Word64 -> Int -> Word64

unsafeReplace :: Ix i => UArray i Word64 -> [(Int, Word64)] -> UArray i Word64

unsafeAccum :: Ix i => (Word64 -> e' -> Word64) -> UArray i Word64 -> [(Int, e')] -> UArray i Word64

unsafeAccumArray :: Ix i => (Word64 -> e' -> Word64) -> Word64 -> (i, i) -> [(Int, e')] -> UArray i Word64

Lift Word64 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Word64 -> m Exp

liftTyped :: forall (m :: Type -> Type). Quote m => Word64 -> Code m Word64

Vector Vector Word64 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: Mutable Vector s Word64 -> ST s (Vector Word64)

basicUnsafeThaw :: Vector Word64 -> ST s (Mutable Vector s Word64)

basicLength :: Vector Word64 -> Int

basicUnsafeSlice :: Int -> Int -> Vector Word64 -> Vector Word64

basicUnsafeIndexM :: Vector Word64 -> Int -> Box Word64

basicUnsafeCopy :: Mutable Vector s Word64 -> Vector Word64 -> ST s ()

elemseq :: Vector Word64 -> Word64 -> b -> b

MVector MVector Word64 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s Word64 -> Int

basicUnsafeSlice :: Int -> Int -> MVector s Word64 -> MVector s Word64

basicOverlaps :: MVector s Word64 -> MVector s Word64 -> Bool

basicUnsafeNew :: Int -> ST s (MVector s Word64)

basicInitialize :: MVector s Word64 -> ST s ()

basicUnsafeReplicate :: Int -> Word64 -> ST s (MVector s Word64)

basicUnsafeRead :: MVector s Word64 -> Int -> ST s Word64

basicUnsafeWrite :: MVector s Word64 -> Int -> Word64 -> ST s ()

basicClear :: MVector s Word64 -> ST s ()

basicSet :: MVector s Word64 -> Word64 -> ST s ()

basicUnsafeCopy :: MVector s Word64 -> MVector s Word64 -> ST s ()

basicUnsafeMove :: MVector s Word64 -> MVector s Word64 -> ST s ()

basicUnsafeGrow :: MVector s Word64 -> Int -> ST s (MVector s Word64)

MArray IOUArray Word64 IO 
Instance details

Defined in Data.Array.IO.Internals

Methods

getBounds :: Ix i => IOUArray i Word64 -> IO (i, i)

getNumElements :: Ix i => IOUArray i Word64 -> IO Int

newArray :: Ix i => (i, i) -> Word64 -> IO (IOUArray i Word64)

newArray_ :: Ix i => (i, i) -> IO (IOUArray i Word64)

unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Word64)

unsafeRead :: Ix i => IOUArray i Word64 -> Int -> IO Word64

unsafeWrite :: Ix i => IOUArray i Word64 -> Int -> Word64 -> IO ()

MArray (STUArray s) Word64 (ST s) 
Instance details

Defined in Data.Array.Base

Methods

getBounds :: Ix i => STUArray s i Word64 -> ST s (i, i)

getNumElements :: Ix i => STUArray s i Word64 -> ST s Int

newArray :: Ix i => (i, i) -> Word64 -> ST s (STUArray s i Word64)

newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Word64)

unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Word64)

unsafeRead :: Ix i => STUArray s i Word64 -> Int -> ST s Word64

unsafeWrite :: Ix i => STUArray s i Word64 -> Int -> Word64 -> ST s ()

type NatNumMaxBound Word64 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Word64 = 18446744073709551615
type Difference Word64 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Word64 = Word64
type PrimSize Word64 
Instance details

Defined in Basement.PrimType

type PrimSize Word64 = 8
newtype Vector Word64 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector Word64 = V_Word64 (Vector Word64)
type ByteSink Word64 g 
Instance details

Defined in Data.UUID.Types.Internal.Builder

type ByteSink Word64 g = Takes8Bytes g
newtype MVector s Word64 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Word64 = MV_Word64 (MVector s Word64)

data Word8 #

Instances

Instances details
Structured Word8 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy Word8 -> Structure

structureHash' :: Tagged Word8 MD5

FromJSON Word8 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Word8

parseJSONList :: Value -> Parser [Word8]

omittedField :: Maybe Word8

FromJSONKey Word8 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

fromJSONKey :: FromJSONKeyFunction Word8

fromJSONKeyList :: FromJSONKeyFunction [Word8]

ToJSON Word8 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Word8 -> Value

toEncoding :: Word8 -> Encoding

toJSONList :: [Word8] -> Value

toEncodingList :: [Word8] -> Encoding

omitField :: Word8 -> Bool

ToJSONKey Word8 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSONKey :: ToJSONKeyFunction Word8

toJSONKeyList :: ToJSONKeyFunction [Word8]

Data Word8 
Instance details

Defined in Data.Data

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Word8 -> c Word8 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Word8 #

toConstr :: Word8 -> Constr #

dataTypeOf :: Word8 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Word8) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Word8) #

gmapT :: (forall b. Data b => b -> b) -> Word8 -> Word8 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Word8 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Word8 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Word8 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Word8 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Word8 -> m Word8 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Word8 -> m Word8 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Word8 -> m Word8 #

Storable Word8 
Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Word8 -> Int

alignment :: Word8 -> Int

peekElemOff :: Ptr Word8 -> Int -> IO Word8

pokeElemOff :: Ptr Word8 -> Int -> Word8 -> IO ()

peekByteOff :: Ptr b -> Int -> IO Word8

pokeByteOff :: Ptr b -> Int -> Word8 -> IO ()

peek :: Ptr Word8 -> IO Word8

poke :: Ptr Word8 -> Word8 -> IO ()

Bits Word8 
Instance details

Defined in GHC.Word

FiniteBits Word8 
Instance details

Defined in GHC.Word

Bounded Word8 
Instance details

Defined in GHC.Word

Enum Word8 
Instance details

Defined in GHC.Word

Ix Word8 
Instance details

Defined in GHC.Word

Num Word8 
Instance details

Defined in GHC.Word

Read Word8 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS Word8

readList :: ReadS [Word8]

readPrec :: ReadPrec Word8

readListPrec :: ReadPrec [Word8]

Integral Word8 
Instance details

Defined in GHC.Word

Real Word8 
Instance details

Defined in GHC.Word

Methods

toRational :: Word8 -> Rational #

Show Word8 
Instance details

Defined in GHC.Word

Methods

showsPrec :: Int -> Word8 -> ShowS

show :: Word8 -> String #

showList :: [Word8] -> ShowS

PrintfArg Word8 
Instance details

Defined in Text.Printf

Methods

formatArg :: Word8 -> FieldFormatter

parseFormat :: Word8 -> ModifierParser

BitOps Word8 
Instance details

Defined in Basement.Bits

Methods

(.&.) :: Word8 -> Word8 -> Word8

(.|.) :: Word8 -> Word8 -> Word8

(.^.) :: Word8 -> Word8 -> Word8

(.<<.) :: Word8 -> CountOf Bool -> Word8

(.>>.) :: Word8 -> CountOf Bool -> Word8

bit :: Offset Bool -> Word8

isBitSet :: Word8 -> Offset Bool -> Bool

setBit :: Word8 -> Offset Bool -> Word8

clearBit :: Word8 -> Offset Bool -> Word8

FiniteBitsOps Word8 
Instance details

Defined in Basement.Bits

Methods

numberOfBits :: Word8 -> CountOf Bool

rotateL :: Word8 -> CountOf Bool -> Word8

rotateR :: Word8 -> CountOf Bool -> Word8

popCount :: Word8 -> CountOf Bool

bitFlip :: Word8 -> Word8

countLeadingZeros :: Word8 -> CountOf Bool

countTrailingZeros :: Word8 -> CountOf Bool

Subtractive Word8 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Word8 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Word8 = Word8

Methods

(-) :: Word8 -> Word8 -> Difference Word8

PrimMemoryComparable Word8 
Instance details

Defined in Basement.PrimType

PrimType Word8 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Word8 
Instance details

Defined in Basement.PrimType

type PrimSize Word8 = 1

Methods

primSizeInBytes :: Proxy Word8 -> CountOf Word8

primShiftToBytes :: Proxy Word8 -> Int

primBaUIndex :: ByteArray# -> Offset Word8 -> Word8

primMbaURead :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Word8 -> prim Word8

primMbaUWrite :: PrimMonad prim => MutableByteArray# (PrimState prim) -> Offset Word8 -> Word8 -> prim ()

primAddrIndex :: Addr# -> Offset Word8 -> Word8

primAddrRead :: PrimMonad prim => Addr# -> Offset Word8 -> prim Word8

primAddrWrite :: PrimMonad prim => Addr# -> Offset Word8 -> Word8 -> prim ()

Binary Word8 
Instance details

Defined in Data.Binary.Class

Methods

put :: Word8 -> Put

get :: Get Word8

putList :: [Word8] -> Put

NFData Word8 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word8 -> () #

GEnum Word8 
Instance details

Defined in Generics.Deriving.Enum

Methods

genum :: [Word8]

GIx Word8 
Instance details

Defined in Generics.Deriving.Enum

Methods

range :: (Word8, Word8) -> [Word8]

index :: (Word8, Word8) -> Word8 -> Int

inRange :: (Word8, Word8) -> Word8 -> Bool

GEq Word8 
Instance details

Defined in Generics.Deriving.Eq

Methods

geq :: Word8 -> Word8 -> Bool

GShow Word8 
Instance details

Defined in Generics.Deriving.Show

Methods

gshowsPrec :: Int -> Word8 -> ShowS

gshows :: Word8 -> ShowS

gshow :: Word8 -> String

gshowList :: [Word8] -> ShowS

Eq Word8 
Instance details

Defined in GHC.Word

Methods

(==) :: Word8 -> Word8 -> Bool #

(/=) :: Word8 -> Word8 -> Bool #

Ord Word8 
Instance details

Defined in GHC.Word

Methods

compare :: Word8 -> Word8 -> Ordering #

(<) :: Word8 -> Word8 -> Bool #

(<=) :: Word8 -> Word8 -> Bool #

(>) :: Word8 -> Word8 -> Bool #

(>=) :: Word8 -> Word8 -> Bool #

max :: Word8 -> Word8 -> Word8 #

min :: Word8 -> Word8 -> Word8 #

Hashable Word8 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word8 -> Int

hash :: Word8 -> Int

FromHttpApiData Word8 
Instance details

Defined in Web.Internal.HttpApiData

ToHttpApiData Word8 
Instance details

Defined in Web.Internal.HttpApiData

ToMustache Word8 
Instance details

Defined in Text.Mustache.Internal.Types

PathPiece Word8 
Instance details

Defined in Web.PathPieces

PersistField Word8 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Word8 -> PersistValue

fromPersistValue :: PersistValue -> Either Text Word8

PersistFieldSql Word8 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy Word8 -> SqlType

Pretty Word8 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Word8 -> Doc ann

prettyList :: [Word8] -> Doc ann

Random Word8 
Instance details

Defined in System.Random

Methods

randomR :: RandomGen g => (Word8, Word8) -> g -> (Word8, g)

random :: RandomGen g => g -> (Word8, g)

randomRs :: RandomGen g => (Word8, Word8) -> g -> [Word8]

randoms :: RandomGen g => g -> [Word8]

Uniform Word8 
Instance details

Defined in System.Random.Internal

Methods

uniformM :: StatefulGen g m => g -> m Word8

UniformRange Word8 
Instance details

Defined in System.Random.Internal

Methods

uniformRM :: StatefulGen g m => (Word8, Word8) -> g -> m Word8

Display Word8 
Instance details

Defined in RIO.Prelude.Display

ByteSource Word8 
Instance details

Defined in Data.UUID.Types.Internal.Builder

Methods

(/-/) :: ByteSink Word8 g -> Word8 -> g

Unbox Word8 
Instance details

Defined in Data.Vector.Unboxed.Base

IArray UArray Word8 
Instance details

Defined in Data.Array.Base

Methods

bounds :: Ix i => UArray i Word8 -> (i, i)

numElements :: Ix i => UArray i Word8 -> Int

unsafeArray :: Ix i => (i, i) -> [(Int, Word8)] -> UArray i Word8

unsafeAt :: Ix i => UArray i Word8 -> Int -> Word8

unsafeReplace :: Ix i => UArray i Word8 -> [(Int, Word8)] -> UArray i Word8

unsafeAccum :: Ix i => (Word8 -> e' -> Word8) -> UArray i Word8 -> [(Int, e')] -> UArray i Word8

unsafeAccumArray :: Ix i => (Word8 -> e' -> Word8) -> Word8 -> (i, i) -> [(Int, e')] -> UArray i Word8

Lift Word8 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Word8 -> m Exp

liftTyped :: forall (m :: Type -> Type). Quote m => Word8 -> Code m Word8

Vector Vector Word8 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: Mutable Vector s Word8 -> ST s (Vector Word8)

basicUnsafeThaw :: Vector Word8 -> ST s (Mutable Vector s Word8)

basicLength :: Vector Word8 -> Int

basicUnsafeSlice :: Int -> Int -> Vector Word8 -> Vector Word8

basicUnsafeIndexM :: Vector Word8 -> Int -> Box Word8

basicUnsafeCopy :: Mutable Vector s Word8 -> Vector Word8 -> ST s ()

elemseq :: Vector Word8 -> Word8 -> b -> b

MVector MVector Word8 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s Word8 -> Int

basicUnsafeSlice :: Int -> Int -> MVector s Word8 -> MVector s Word8

basicOverlaps :: MVector s Word8 -> MVector s Word8 -> Bool

basicUnsafeNew :: Int -> ST s (MVector s Word8)

basicInitialize :: MVector s Word8 -> ST s ()

basicUnsafeReplicate :: Int -> Word8 -> ST s (MVector s Word8)

basicUnsafeRead :: MVector s Word8 -> Int -> ST s Word8

basicUnsafeWrite :: MVector s Word8 -> Int -> Word8 -> ST s ()

basicClear :: MVector s Word8 -> ST s ()

basicSet :: MVector s Word8 -> Word8 -> ST s ()

basicUnsafeCopy :: MVector s Word8 -> MVector s Word8 -> ST s ()

basicUnsafeMove :: MVector s Word8 -> MVector s Word8 -> ST s ()

basicUnsafeGrow :: MVector s Word8 -> Int -> ST s (MVector s Word8)

MArray IOUArray Word8 IO 
Instance details

Defined in Data.Array.IO.Internals

Methods

getBounds :: Ix i => IOUArray i Word8 -> IO (i, i)

getNumElements :: Ix i => IOUArray i Word8 -> IO Int

newArray :: Ix i => (i, i) -> Word8 -> IO (IOUArray i Word8)

newArray_ :: Ix i => (i, i) -> IO (IOUArray i Word8)

unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Word8)

unsafeRead :: Ix i => IOUArray i Word8 -> Int -> IO Word8

unsafeWrite :: Ix i => IOUArray i Word8 -> Int -> Word8 -> IO ()

MArray (STUArray s) Word8 (ST s) 
Instance details

Defined in Data.Array.Base

Methods

getBounds :: Ix i => STUArray s i Word8 -> ST s (i, i)

getNumElements :: Ix i => STUArray s i Word8 -> ST s Int

newArray :: Ix i => (i, i) -> Word8 -> ST s (STUArray s i Word8)

newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Word8)

unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Word8)

unsafeRead :: Ix i => STUArray s i Word8 -> Int -> ST s Word8

unsafeWrite :: Ix i => STUArray s i Word8 -> Int -> Word8 -> ST s ()

type NatNumMaxBound Word8 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Word8 = 255
type Difference Word8 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Word8 = Word8
type PrimSize Word8 
Instance details

Defined in Basement.PrimType

type PrimSize Word8 = 1
newtype Vector Word8 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector Word8 = V_Word8 (Vector Word8)
type ByteSink Word8 g 
Instance details

Defined in Data.UUID.Types.Internal.Builder

type ByteSink Word8 g = Takes1Byte g
newtype MVector s Word8 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Word8 = MV_Word8 (MVector s Word8)

class Eq a where #

Minimal complete definition

(==) | (/=)

Methods

(==) :: a -> a -> Bool #

(/=) :: a -> a -> Bool #

Instances

Instances details
Eq ModuleShape 
Instance details

Defined in Distribution.Backpack.ModuleShape

Methods

(==) :: ModuleShape -> ModuleShape -> Bool #

(/=) :: ModuleShape -> ModuleShape -> Bool #

Eq PreModuleShape 
Instance details

Defined in Distribution.Backpack.PreModuleShape

Methods

(==) :: PreModuleShape -> PreModuleShape -> Bool #

(/=) :: PreModuleShape -> PreModuleShape -> Bool #

Eq ModTime 
Instance details

Defined in Distribution.Compat.Time

Methods

(==) :: ModTime -> ModTime -> Bool #

(/=) :: ModTime -> ModTime -> Bool #

Eq CEField 
Instance details

Defined in Distribution.PackageDescription.Check

Methods

(==) :: CEField -> CEField -> Bool #

(/=) :: CEField -> CEField -> Bool #

Eq CEType 
Instance details

Defined in Distribution.PackageDescription.Check

Methods

(==) :: CEType -> CEType -> Bool #

(/=) :: CEType -> CEType -> Bool #

Eq CheckExplanation 
Instance details

Defined in Distribution.PackageDescription.Check

Methods

(==) :: CheckExplanation -> CheckExplanation -> Bool #

(/=) :: CheckExplanation -> CheckExplanation -> Bool #

Eq PackageCheck 
Instance details

Defined in Distribution.PackageDescription.Check

Methods

(==) :: PackageCheck -> PackageCheck -> Bool #

(/=) :: PackageCheck -> PackageCheck -> Bool #

Eq PathKind 
Instance details

Defined in Distribution.PackageDescription.Check

Methods

(==) :: PathKind -> PathKind -> Bool #

(/=) :: PathKind -> PathKind -> Bool #

Eq BuildTarget 
Instance details

Defined in Distribution.Simple.BuildTarget

Methods

(==) :: BuildTarget -> BuildTarget -> Bool #

(/=) :: BuildTarget -> BuildTarget -> Bool #

Eq ComponentKind 
Instance details

Defined in Distribution.Simple.BuildTarget

Methods

(==) :: ComponentKind -> ComponentKind -> Bool #

(/=) :: ComponentKind -> ComponentKind -> Bool #

Eq MatchError 
Instance details

Defined in Distribution.Simple.BuildTarget

Methods

(==) :: MatchError -> MatchError -> Bool #

(/=) :: MatchError -> MatchError -> Bool #

Eq UserBuildTarget 
Instance details

Defined in Distribution.Simple.BuildTarget

Methods

(==) :: UserBuildTarget -> UserBuildTarget -> Bool #

(/=) :: UserBuildTarget -> UserBuildTarget -> Bool #

Eq CDialect 
Instance details

Defined in Distribution.Simple.CCompiler

Methods

(==) :: CDialect -> CDialect -> Bool #

(/=) :: CDialect -> CDialect -> Bool #

Eq Compiler 
Instance details

Defined in Distribution.Simple.Compiler

Methods

(==) :: Compiler -> Compiler -> Bool #

(/=) :: Compiler -> Compiler -> Bool #

Eq DebugInfoLevel 
Instance details

Defined in Distribution.Simple.Compiler

Methods

(==) :: DebugInfoLevel -> DebugInfoLevel -> Bool #

(/=) :: DebugInfoLevel -> DebugInfoLevel -> Bool #

Eq OptimisationLevel 
Instance details

Defined in Distribution.Simple.Compiler

Methods

(==) :: OptimisationLevel -> OptimisationLevel -> Bool #

(/=) :: OptimisationLevel -> OptimisationLevel -> Bool #

Eq PackageDB 
Instance details

Defined in Distribution.Simple.Compiler

Methods

(==) :: PackageDB -> PackageDB -> Bool #

(/=) :: PackageDB -> PackageDB -> Bool #

Eq ProfDetailLevel 
Instance details

Defined in Distribution.Simple.Compiler

Methods

(==) :: ProfDetailLevel -> ProfDetailLevel -> Bool #

(/=) :: ProfDetailLevel -> ProfDetailLevel -> Bool #

Eq GlobSyntaxError 
Instance details

Defined in Distribution.Simple.Glob

Methods

(==) :: GlobSyntaxError -> GlobSyntaxError -> Bool #

(/=) :: GlobSyntaxError -> GlobSyntaxError -> Bool #

Eq IsRecursive 
Instance details

Defined in Distribution.Simple.Glob

Methods

(==) :: IsRecursive -> IsRecursive -> Bool #

(/=) :: IsRecursive -> IsRecursive -> Bool #

Eq Directory 
Instance details

Defined in Distribution.Simple.Haddock

Methods

(==) :: Directory -> Directory -> Bool #

(/=) :: Directory -> Directory -> Bool #

Eq Output 
Instance details

Defined in Distribution.Simple.Haddock

Methods

(==) :: Output -> Output -> Bool #

(/=) :: Output -> Output -> Bool #

Eq Way 
Instance details

Defined in Distribution.Simple.Hpc

Methods

(==) :: Way -> Way -> Bool #

(/=) :: Way -> Way -> Bool #

Eq CopyDest 
Instance details

Defined in Distribution.Simple.InstallDirs

Methods

(==) :: CopyDest -> CopyDest -> Bool #

(/=) :: CopyDest -> CopyDest -> Bool #

Eq PathTemplate 
Instance details

Defined in Distribution.Simple.InstallDirs

Methods

(==) :: PathTemplate -> PathTemplate -> Bool #

(/=) :: PathTemplate -> PathTemplate -> Bool #

Eq PathComponent 
Instance details

Defined in Distribution.Simple.InstallDirs.Internal

Methods

(==) :: PathComponent -> PathComponent -> Bool #

(/=) :: PathComponent -> PathComponent -> Bool #

Eq PathTemplateVariable 
Instance details

Defined in Distribution.Simple.InstallDirs.Internal

Methods

(==) :: PathTemplateVariable -> PathTemplateVariable -> Bool #

(/=) :: PathTemplateVariable -> PathTemplateVariable -> Bool #

Eq GhcDynLinkMode 
Instance details

Defined in Distribution.Simple.Program.GHC

Methods

(==) :: GhcDynLinkMode -> GhcDynLinkMode -> Bool #

(/=) :: GhcDynLinkMode -> GhcDynLinkMode -> Bool #

Eq GhcMode 
Instance details

Defined in Distribution.Simple.Program.GHC

Methods

(==) :: GhcMode -> GhcMode -> Bool #

(/=) :: GhcMode -> GhcMode -> Bool #

Eq GhcOptimisation 
Instance details

Defined in Distribution.Simple.Program.GHC

Methods

(==) :: GhcOptimisation -> GhcOptimisation -> Bool #

(/=) :: GhcOptimisation -> GhcOptimisation -> Bool #

Eq GhcProfAuto 
Instance details

Defined in Distribution.Simple.Program.GHC

Methods

(==) :: GhcProfAuto -> GhcProfAuto -> Bool #

(/=) :: GhcProfAuto -> GhcProfAuto -> Bool #

Eq ConfiguredProgram 
Instance details

Defined in Distribution.Simple.Program.Types

Methods

(==) :: ConfiguredProgram -> ConfiguredProgram -> Bool #

(/=) :: ConfiguredProgram -> ConfiguredProgram -> Bool #

Eq ProgramLocation 
Instance details

Defined in Distribution.Simple.Program.Types

Methods

(==) :: ProgramLocation -> ProgramLocation -> Bool #

(/=) :: ProgramLocation -> ProgramLocation -> Bool #

Eq ProgramSearchPathEntry 
Instance details

Defined in Distribution.Simple.Program.Types

Methods

(==) :: ProgramSearchPathEntry -> ProgramSearchPathEntry -> Bool #

(/=) :: ProgramSearchPathEntry -> ProgramSearchPathEntry -> Bool #

Eq ConfigFlags 
Instance details

Defined in Distribution.Simple.Setup

Methods

(==) :: ConfigFlags -> ConfigFlags -> Bool #

(/=) :: ConfigFlags -> ConfigFlags -> Bool #

Eq HaddockTarget 
Instance details

Defined in Distribution.Simple.Setup

Methods

(==) :: HaddockTarget -> HaddockTarget -> Bool #

(/=) :: HaddockTarget -> HaddockTarget -> Bool #

Eq TestShowDetails 
Instance details

Defined in Distribution.Simple.Setup

Methods

(==) :: TestShowDetails -> TestShowDetails -> Bool #

(/=) :: TestShowDetails -> TestShowDetails -> Bool #

Eq Visibility 
Instance details

Defined in Distribution.Simple.Setup

Methods

(==) :: Visibility -> Visibility -> Bool #

(/=) :: Visibility -> Visibility -> Bool #

Eq PackageLog 
Instance details

Defined in Distribution.Simple.Test.Log

Methods

(==) :: PackageLog -> PackageLog -> Bool #

(/=) :: PackageLog -> PackageLog -> Bool #

Eq TestLogs 
Instance details

Defined in Distribution.Simple.Test.Log

Methods

(==) :: TestLogs -> TestLogs -> Bool #

(/=) :: TestLogs -> TestLogs -> Bool #

Eq TestSuiteLog 
Instance details

Defined in Distribution.Simple.Test.Log

Methods

(==) :: TestSuiteLog -> TestSuiteLog -> Bool #

(/=) :: TestSuiteLog -> TestSuiteLog -> Bool #

Eq TraceWhen 
Instance details

Defined in Distribution.Simple.Utils

Methods

(==) :: TraceWhen -> TraceWhen -> Bool #

(/=) :: TraceWhen -> TraceWhen -> Bool #

Eq OptionDescr 
Instance details

Defined in Distribution.TestSuite

Methods

(==) :: OptionDescr -> OptionDescr -> Bool #

(/=) :: OptionDescr -> OptionDescr -> Bool #

Eq OptionType 
Instance details

Defined in Distribution.TestSuite

Methods

(==) :: OptionType -> OptionType -> Bool #

(/=) :: OptionType -> OptionType -> Bool #

Eq Result 
Instance details

Defined in Distribution.TestSuite

Methods

(==) :: Result -> Result -> Bool #

(/=) :: Result -> Result -> Bool #

Eq DumpBuildInfo 
Instance details

Defined in Distribution.Types.DumpBuildInfo

Methods

(==) :: DumpBuildInfo -> DumpBuildInfo -> Bool #

(/=) :: DumpBuildInfo -> DumpBuildInfo -> Bool #

Eq GivenComponent 
Instance details

Defined in Distribution.Types.GivenComponent

Methods

(==) :: GivenComponent -> GivenComponent -> Bool #

(/=) :: GivenComponent -> GivenComponent -> Bool #

Eq Verbosity 
Instance details

Defined in Distribution.Verbosity

Methods

(==) :: Verbosity -> Verbosity -> Bool #

(/=) :: Verbosity -> Verbosity -> Bool #

Eq VerbosityFlag 
Instance details

Defined in Distribution.Verbosity.Internal

Methods

(==) :: VerbosityFlag -> VerbosityFlag -> Bool #

(/=) :: VerbosityFlag -> VerbosityFlag -> Bool #

Eq VerbosityLevel 
Instance details

Defined in Distribution.Verbosity.Internal

Methods

(==) :: VerbosityLevel -> VerbosityLevel -> Bool #

(/=) :: VerbosityLevel -> VerbosityLevel -> Bool #

Eq OpenModule 
Instance details

Defined in Distribution.Backpack

Methods

(==) :: OpenModule -> OpenModule -> Bool #

(/=) :: OpenModule -> OpenModule -> Bool #

Eq OpenUnitId 
Instance details

Defined in Distribution.Backpack

Methods

(==) :: OpenUnitId -> OpenUnitId -> Bool #

(/=) :: OpenUnitId -> OpenUnitId -> Bool #

Eq CabalSpecVersion 
Instance details

Defined in Distribution.CabalSpecVersion

Methods

(==) :: CabalSpecVersion -> CabalSpecVersion -> Bool #

(/=) :: CabalSpecVersion -> CabalSpecVersion -> Bool #

Eq HasCommonStanzas 
Instance details

Defined in Distribution.CabalSpecVersion

Methods

(==) :: HasCommonStanzas -> HasCommonStanzas -> Bool #

(/=) :: HasCommonStanzas -> HasCommonStanzas -> Bool #

Eq HasElif 
Instance details

Defined in Distribution.CabalSpecVersion

Methods

(==) :: HasElif -> HasElif -> Bool #

(/=) :: HasElif -> HasElif -> Bool #

Eq AbiTag 
Instance details

Defined in Distribution.Compiler

Methods

(==) :: AbiTag -> AbiTag -> Bool #

(/=) :: AbiTag -> AbiTag -> Bool #

Eq CompilerFlavor 
Instance details

Defined in Distribution.Compiler

Methods

(==) :: CompilerFlavor -> CompilerFlavor -> Bool #

(/=) :: CompilerFlavor -> CompilerFlavor -> Bool #

Eq CompilerId 
Instance details

Defined in Distribution.Compiler

Methods

(==) :: CompilerId -> CompilerId -> Bool #

(/=) :: CompilerId -> CompilerId -> Bool #

Eq SpecLicense 
Instance details

Defined in Distribution.FieldGrammar.Newtypes

Methods

(==) :: SpecLicense -> SpecLicense -> Bool #

(/=) :: SpecLicense -> SpecLicense -> Bool #

Eq SpecVersion 
Instance details

Defined in Distribution.FieldGrammar.Newtypes

Methods

(==) :: SpecVersion -> SpecVersion -> Bool #

(/=) :: SpecVersion -> SpecVersion -> Bool #

Eq LexWarningType 
Instance details

Defined in Distribution.Fields.LexerMonad

Methods

(==) :: LexWarningType -> LexWarningType -> Bool #

(/=) :: LexWarningType -> LexWarningType -> Bool #

Eq Margin 
Instance details

Defined in Distribution.Fields.Pretty

Methods

(==) :: Margin -> Margin -> Bool #

(/=) :: Margin -> Margin -> Bool #

Eq License 
Instance details

Defined in Distribution.License

Methods

(==) :: License -> License -> Bool #

(/=) :: License -> License -> Bool #

Eq ModuleName 
Instance details

Defined in Distribution.ModuleName

Eq Syntax 
Instance details

Defined in Distribution.PackageDescription.Parsec

Methods

(==) :: Syntax -> Syntax -> Bool #

(/=) :: Syntax -> Syntax -> Bool #

Eq Position 
Instance details

Defined in Distribution.Parsec.Position

Methods

(==) :: Position -> Position -> Bool #

(/=) :: Position -> Position -> Bool #

Eq PWarnType 
Instance details

Defined in Distribution.Parsec.Warning

Methods

(==) :: PWarnType -> PWarnType -> Bool #

(/=) :: PWarnType -> PWarnType -> Bool #

Eq PWarning 
Instance details

Defined in Distribution.Parsec.Warning

Methods

(==) :: PWarning -> PWarning -> Bool #

(/=) :: PWarning -> PWarning -> Bool #

Eq License 
Instance details

Defined in Distribution.SPDX.License

Methods

(==) :: License -> License -> Bool #

(/=) :: License -> License -> Bool #

Eq LicenseExceptionId 
Instance details

Defined in Distribution.SPDX.LicenseExceptionId

Methods

(==) :: LicenseExceptionId -> LicenseExceptionId -> Bool #

(/=) :: LicenseExceptionId -> LicenseExceptionId -> Bool #

Eq LicenseExpression 
Instance details

Defined in Distribution.SPDX.LicenseExpression

Methods

(==) :: LicenseExpression -> LicenseExpression -> Bool #

(/=) :: LicenseExpression -> LicenseExpression -> Bool #

Eq SimpleLicenseExpression 
Instance details

Defined in Distribution.SPDX.LicenseExpression

Methods

(==) :: SimpleLicenseExpression -> SimpleLicenseExpression -> Bool #

(/=) :: SimpleLicenseExpression -> SimpleLicenseExpression -> Bool #

Eq LicenseId 
Instance details

Defined in Distribution.SPDX.LicenseId

Methods

(==) :: LicenseId -> LicenseId -> Bool #

(/=) :: LicenseId -> LicenseId -> Bool #

Eq LicenseListVersion 
Instance details

Defined in Distribution.SPDX.LicenseListVersion

Methods

(==) :: LicenseListVersion -> LicenseListVersion -> Bool #

(/=) :: LicenseListVersion -> LicenseListVersion -> Bool #

Eq LicenseRef 
Instance details

Defined in Distribution.SPDX.LicenseReference

Methods

(==) :: LicenseRef -> LicenseRef -> Bool #

(/=) :: LicenseRef -> LicenseRef -> Bool #

Eq Arch 
Instance details

Defined in Distribution.System

Methods

(==) :: Arch -> Arch -> Bool #

(/=) :: Arch -> Arch -> Bool #

Eq OS 
Instance details

Defined in Distribution.System

Methods

(==) :: OS -> OS -> Bool #

(/=) :: OS -> OS -> Bool #

Eq Platform 
Instance details

Defined in Distribution.System

Methods

(==) :: Platform -> Platform -> Bool #

(/=) :: Platform -> Platform -> Bool #

Eq AbiDependency 
Instance details

Defined in Distribution.Types.AbiDependency

Methods

(==) :: AbiDependency -> AbiDependency -> Bool #

(/=) :: AbiDependency -> AbiDependency -> Bool #

Eq AbiHash 
Instance details

Defined in Distribution.Types.AbiHash

Methods

(==) :: AbiHash -> AbiHash -> Bool #

(/=) :: AbiHash -> AbiHash -> Bool #

Eq Benchmark 
Instance details

Defined in Distribution.Types.Benchmark

Methods

(==) :: Benchmark -> Benchmark -> Bool #

(/=) :: Benchmark -> Benchmark -> Bool #

Eq BenchmarkInterface 
Instance details

Defined in Distribution.Types.BenchmarkInterface

Methods

(==) :: BenchmarkInterface -> BenchmarkInterface -> Bool #

(/=) :: BenchmarkInterface -> BenchmarkInterface -> Bool #

Eq BenchmarkType 
Instance details

Defined in Distribution.Types.BenchmarkType

Methods

(==) :: BenchmarkType -> BenchmarkType -> Bool #

(/=) :: BenchmarkType -> BenchmarkType -> Bool #

Eq BuildInfo 
Instance details

Defined in Distribution.Types.BuildInfo

Methods

(==) :: BuildInfo -> BuildInfo -> Bool #

(/=) :: BuildInfo -> BuildInfo -> Bool #

Eq BuildType 
Instance details

Defined in Distribution.Types.BuildType

Methods

(==) :: BuildType -> BuildType -> Bool #

(/=) :: BuildType -> BuildType -> Bool #

Eq Component 
Instance details

Defined in Distribution.Types.Component

Methods

(==) :: Component -> Component -> Bool #

(/=) :: Component -> Component -> Bool #

Eq ComponentId 
Instance details

Defined in Distribution.Types.ComponentId

Methods

(==) :: ComponentId -> ComponentId -> Bool #

(/=) :: ComponentId -> ComponentId -> Bool #

Eq ComponentName 
Instance details

Defined in Distribution.Types.ComponentName

Methods

(==) :: ComponentName -> ComponentName -> Bool #

(/=) :: ComponentName -> ComponentName -> Bool #

Eq NotLibComponentName 
Instance details

Defined in Distribution.Types.ComponentName

Methods

(==) :: NotLibComponentName -> NotLibComponentName -> Bool #

(/=) :: NotLibComponentName -> NotLibComponentName -> Bool #

Eq ComponentRequestedSpec 
Instance details

Defined in Distribution.Types.ComponentRequestedSpec

Methods

(==) :: ComponentRequestedSpec -> ComponentRequestedSpec -> Bool #

(/=) :: ComponentRequestedSpec -> ComponentRequestedSpec -> Bool #

Eq ConfVar 
Instance details

Defined in Distribution.Types.ConfVar

Methods

(==) :: ConfVar -> ConfVar -> Bool #

(/=) :: ConfVar -> ConfVar -> Bool #

Eq Dependency 
Instance details

Defined in Distribution.Types.Dependency

Methods

(==) :: Dependency -> Dependency -> Bool #

(/=) :: Dependency -> Dependency -> Bool #

Eq DependencyMap 
Instance details

Defined in Distribution.Types.DependencyMap

Methods

(==) :: DependencyMap -> DependencyMap -> Bool #

(/=) :: DependencyMap -> DependencyMap -> Bool #

Eq ExeDependency 
Instance details

Defined in Distribution.Types.ExeDependency

Methods

(==) :: ExeDependency -> ExeDependency -> Bool #

(/=) :: ExeDependency -> ExeDependency -> Bool #

Eq Executable 
Instance details

Defined in Distribution.Types.Executable

Methods

(==) :: Executable -> Executable -> Bool #

(/=) :: Executable -> Executable -> Bool #

Eq ExecutableScope 
Instance details

Defined in Distribution.Types.ExecutableScope

Methods

(==) :: ExecutableScope -> ExecutableScope -> Bool #

(/=) :: ExecutableScope -> ExecutableScope -> Bool #

Eq ExposedModule 
Instance details

Defined in Distribution.Types.ExposedModule

Methods

(==) :: ExposedModule -> ExposedModule -> Bool #

(/=) :: ExposedModule -> ExposedModule -> Bool #

Eq FlagAssignment 
Instance details

Defined in Distribution.Types.Flag

Methods

(==) :: FlagAssignment -> FlagAssignment -> Bool #

(/=) :: FlagAssignment -> FlagAssignment -> Bool #

Eq FlagName 
Instance details

Defined in Distribution.Types.Flag

Eq PackageFlag 
Instance details

Defined in Distribution.Types.Flag

Methods

(==) :: PackageFlag -> PackageFlag -> Bool #

(/=) :: PackageFlag -> PackageFlag -> Bool #

Eq ForeignLib 
Instance details

Defined in Distribution.Types.ForeignLib

Methods

(==) :: ForeignLib -> ForeignLib -> Bool #

(/=) :: ForeignLib -> ForeignLib -> Bool #

Eq LibVersionInfo 
Instance details

Defined in Distribution.Types.ForeignLib

Methods

(==) :: LibVersionInfo -> LibVersionInfo -> Bool #

(/=) :: LibVersionInfo -> LibVersionInfo -> Bool #

Eq ForeignLibOption 
Instance details

Defined in Distribution.Types.ForeignLibOption

Methods

(==) :: ForeignLibOption -> ForeignLibOption -> Bool #

(/=) :: ForeignLibOption -> ForeignLibOption -> Bool #

Eq ForeignLibType 
Instance details

Defined in Distribution.Types.ForeignLibType

Methods

(==) :: ForeignLibType -> ForeignLibType -> Bool #

(/=) :: ForeignLibType -> ForeignLibType -> Bool #

Eq GenericPackageDescription 
Instance details

Defined in Distribution.Types.GenericPackageDescription

Methods

(==) :: GenericPackageDescription -> GenericPackageDescription -> Bool #

(/=) :: GenericPackageDescription -> GenericPackageDescription -> Bool #

Eq IncludeRenaming 
Instance details

Defined in Distribution.Types.IncludeRenaming

Methods

(==) :: IncludeRenaming -> IncludeRenaming -> Bool #

(/=) :: IncludeRenaming -> IncludeRenaming -> Bool #

Eq InstalledPackageInfo 
Instance details

Defined in Distribution.Types.InstalledPackageInfo

Methods

(==) :: InstalledPackageInfo -> InstalledPackageInfo -> Bool #

(/=) :: InstalledPackageInfo -> InstalledPackageInfo -> Bool #

Eq LegacyExeDependency 
Instance details

Defined in Distribution.Types.LegacyExeDependency

Methods

(==) :: LegacyExeDependency -> LegacyExeDependency -> Bool #

(/=) :: LegacyExeDependency -> LegacyExeDependency -> Bool #

Eq Library 
Instance details

Defined in Distribution.Types.Library

Methods

(==) :: Library -> Library -> Bool #

(/=) :: Library -> Library -> Bool #

Eq LibraryName 
Instance details

Defined in Distribution.Types.LibraryName

Eq LibraryVisibility 
Instance details

Defined in Distribution.Types.LibraryVisibility

Methods

(==) :: LibraryVisibility -> LibraryVisibility -> Bool #

(/=) :: LibraryVisibility -> LibraryVisibility -> Bool #

Eq Mixin 
Instance details

Defined in Distribution.Types.Mixin

Methods

(==) :: Mixin -> Mixin -> Bool #

(/=) :: Mixin -> Mixin -> Bool #

Eq Module 
Instance details

Defined in Distribution.Types.Module

Methods

(==) :: Module -> Module -> Bool #

(/=) :: Module -> Module -> Bool #

Eq ModuleReexport 
Instance details

Defined in Distribution.Types.ModuleReexport

Methods

(==) :: ModuleReexport -> ModuleReexport -> Bool #

(/=) :: ModuleReexport -> ModuleReexport -> Bool #

Eq ModuleRenaming 
Instance details

Defined in Distribution.Types.ModuleRenaming

Methods

(==) :: ModuleRenaming -> ModuleRenaming -> Bool #

(/=) :: ModuleRenaming -> ModuleRenaming -> Bool #

Eq MungedPackageId 
Instance details

Defined in Distribution.Types.MungedPackageId

Eq MungedPackageName 
Instance details

Defined in Distribution.Types.MungedPackageName

Eq PackageDescription 
Instance details

Defined in Distribution.Types.PackageDescription

Methods

(==) :: PackageDescription -> PackageDescription -> Bool #

(/=) :: PackageDescription -> PackageDescription -> Bool #

Eq PackageIdentifier 
Instance details

Defined in Distribution.Types.PackageId

Eq PackageName 
Instance details

Defined in Distribution.Types.PackageName

Eq PackageVersionConstraint 
Instance details

Defined in Distribution.Types.PackageVersionConstraint

Methods

(==) :: PackageVersionConstraint -> PackageVersionConstraint -> Bool #

(/=) :: PackageVersionConstraint -> PackageVersionConstraint -> Bool #

Eq PkgconfigDependency 
Instance details

Defined in Distribution.Types.PkgconfigDependency

Methods

(==) :: PkgconfigDependency -> PkgconfigDependency -> Bool #

(/=) :: PkgconfigDependency -> PkgconfigDependency -> Bool #

Eq PkgconfigName 
Instance details

Defined in Distribution.Types.PkgconfigName

Methods

(==) :: PkgconfigName -> PkgconfigName -> Bool #

(/=) :: PkgconfigName -> PkgconfigName -> Bool #

Eq PkgconfigVersion 
Instance details

Defined in Distribution.Types.PkgconfigVersion

Methods

(==) :: PkgconfigVersion -> PkgconfigVersion -> Bool #

(/=) :: PkgconfigVersion -> PkgconfigVersion -> Bool #

Eq PkgconfigVersionRange 
Instance details

Defined in Distribution.Types.PkgconfigVersionRange

Methods

(==) :: PkgconfigVersionRange -> PkgconfigVersionRange -> Bool #

(/=) :: PkgconfigVersionRange -> PkgconfigVersionRange -> Bool #

Eq SetupBuildInfo 
Instance details

Defined in Distribution.Types.SetupBuildInfo

Methods

(==) :: SetupBuildInfo -> SetupBuildInfo -> Bool #

(/=) :: SetupBuildInfo -> SetupBuildInfo -> Bool #

Eq KnownRepoType 
Instance details

Defined in Distribution.Types.SourceRepo

Methods

(==) :: KnownRepoType -> KnownRepoType -> Bool #

(/=) :: KnownRepoType -> KnownRepoType -> Bool #

Eq RepoKind 
Instance details

Defined in Distribution.Types.SourceRepo

Methods

(==) :: RepoKind -> RepoKind -> Bool #

(/=) :: RepoKind -> RepoKind -> Bool #

Eq RepoType 
Instance details

Defined in Distribution.Types.SourceRepo

Methods

(==) :: RepoType -> RepoType -> Bool #

(/=) :: RepoType -> RepoType -> Bool #

Eq SourceRepo 
Instance details

Defined in Distribution.Types.SourceRepo

Methods

(==) :: SourceRepo -> SourceRepo -> Bool #

(/=) :: SourceRepo -> SourceRepo -> Bool #

Eq TestSuite 
Instance details

Defined in Distribution.Types.TestSuite

Methods

(==) :: TestSuite -> TestSuite -> Bool #

(/=) :: TestSuite -> TestSuite -> Bool #

Eq TestSuiteInterface 
Instance details

Defined in Distribution.Types.TestSuiteInterface

Methods

(==) :: TestSuiteInterface -> TestSuiteInterface -> Bool #

(/=) :: TestSuiteInterface -> TestSuiteInterface -> Bool #

Eq TestType 
Instance details

Defined in Distribution.Types.TestType

Methods

(==) :: TestType -> TestType -> Bool #

(/=) :: TestType -> TestType -> Bool #

Eq DefUnitId 
Instance details

Defined in Distribution.Types.UnitId

Methods

(==) :: DefUnitId -> DefUnitId -> Bool #

(/=) :: DefUnitId -> DefUnitId -> Bool #

Eq UnitId 
Instance details

Defined in Distribution.Types.UnitId

Methods

(==) :: UnitId -> UnitId -> Bool #

(/=) :: UnitId -> UnitId -> Bool #

Eq UnqualComponentName 
Instance details

Defined in Distribution.Types.UnqualComponentName

Methods

(==) :: UnqualComponentName -> UnqualComponentName -> Bool #

(/=) :: UnqualComponentName -> UnqualComponentName -> Bool #

Eq Version 
Instance details

Defined in Distribution.Types.Version

Methods

(==) :: Version -> Version -> Bool #

(/=) :: Version -> Version -> Bool #

Eq Bound 
Instance details

Defined in Distribution.Types.VersionInterval

Methods

(==) :: Bound -> Bound -> Bool #

(/=) :: Bound -> Bound -> Bool #

Eq LowerBound 
Instance details

Defined in Distribution.Types.VersionInterval

Methods

(==) :: LowerBound -> LowerBound -> Bool #

(/=) :: LowerBound -> LowerBound -> Bool #

Eq UpperBound 
Instance details

Defined in Distribution.Types.VersionInterval

Methods

(==) :: UpperBound -> UpperBound -> Bool #

(/=) :: UpperBound -> UpperBound -> Bool #

Eq VersionInterval 
Instance details

Defined in Distribution.Types.VersionInterval

Methods

(==) :: VersionInterval -> VersionInterval -> Bool #

(/=) :: VersionInterval -> VersionInterval -> Bool #

Eq VersionIntervals 
Instance details

Defined in Distribution.Types.VersionInterval

Methods

(==) :: VersionIntervals -> VersionIntervals -> Bool #

(/=) :: VersionIntervals -> VersionIntervals -> Bool #

Eq Bound 
Instance details

Defined in Distribution.Types.VersionInterval.Legacy

Methods

(==) :: Bound -> Bound -> Bool #

(/=) :: Bound -> Bound -> Bool #

Eq LowerBound 
Instance details

Defined in Distribution.Types.VersionInterval.Legacy

Methods

(==) :: LowerBound -> LowerBound -> Bool #

(/=) :: LowerBound -> LowerBound -> Bool #

Eq UpperBound 
Instance details

Defined in Distribution.Types.VersionInterval.Legacy

Methods

(==) :: UpperBound -> UpperBound -> Bool #

(/=) :: UpperBound -> UpperBound -> Bool #

Eq VersionIntervals 
Instance details

Defined in Distribution.Types.VersionInterval.Legacy

Methods

(==) :: VersionIntervals -> VersionIntervals -> Bool #

(/=) :: VersionIntervals -> VersionIntervals -> Bool #

Eq VersionRange 
Instance details

Defined in Distribution.Types.VersionRange.Internal

Eq ShortText 
Instance details

Defined in Distribution.Utils.ShortText

Methods

(==) :: ShortText -> ShortText -> Bool #

(/=) :: ShortText -> ShortText -> Bool #

Eq Structure 
Instance details

Defined in Distribution.Utils.Structured

Methods

(==) :: Structure -> Structure -> Bool #

(/=) :: Structure -> Structure -> Bool #

Eq Extension 
Instance details

Defined in Language.Haskell.Extension

Methods

(==) :: Extension -> Extension -> Bool #

(/=) :: Extension -> Extension -> Bool #

Eq KnownExtension 
Instance details

Defined in Language.Haskell.Extension

Methods

(==) :: KnownExtension -> KnownExtension -> Bool #

(/=) :: KnownExtension -> KnownExtension -> Bool #

Eq Language 
Instance details

Defined in Language.Haskell.Extension

Methods

(==) :: Language -> Language -> Bool #

(/=) :: Language -> Language -> Bool #

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

Methods

(==) :: DotNetTime -> DotNetTime -> Bool #

(/=) :: DotNetTime -> DotNetTime -> Bool #

Eq JSONPathElement 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

(==) :: JSONPathElement -> JSONPathElement -> Bool #

(/=) :: JSONPathElement -> JSONPathElement -> Bool #

Eq SumEncoding 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

(==) :: SumEncoding -> SumEncoding -> Bool #

(/=) :: SumEncoding -> SumEncoding -> Bool #

Eq Value 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

(==) :: Value -> Value -> Bool #

(/=) :: Value -> Value -> Bool #

Eq JSONWarning 
Instance details

Defined in Data.Aeson.WarningParser

Eq BlinkSpeed 
Instance details

Defined in System.Console.ANSI.Types

Methods

(==) :: BlinkSpeed -> BlinkSpeed -> Bool #

(/=) :: BlinkSpeed -> BlinkSpeed -> Bool #

Eq Color 
Instance details

Defined in System.Console.ANSI.Types

Methods

(==) :: Color -> Color -> Bool #

(/=) :: Color -> Color -> Bool #

Eq ColorIntensity 
Instance details

Defined in System.Console.ANSI.Types

Methods

(==) :: ColorIntensity -> ColorIntensity -> Bool #

(/=) :: ColorIntensity -> ColorIntensity -> Bool #

Eq ConsoleIntensity 
Instance details

Defined in System.Console.ANSI.Types

Methods

(==) :: ConsoleIntensity -> ConsoleIntensity -> Bool #

(/=) :: ConsoleIntensity -> ConsoleIntensity -> Bool #

Eq ConsoleLayer 
Instance details

Defined in System.Console.ANSI.Types

Methods

(==) :: ConsoleLayer -> ConsoleLayer -> Bool #

(/=) :: ConsoleLayer -> ConsoleLayer -> Bool #

Eq SGR 
Instance details

Defined in System.Console.ANSI.Types

Methods

(==) :: SGR -> SGR -> Bool #

(/=) :: SGR -> SGR -> Bool #

Eq Underlining 
Instance details

Defined in System.Console.ANSI.Types

Methods

(==) :: Underlining -> Underlining -> Bool #

(/=) :: Underlining -> Underlining -> Bool #

Eq AsyncCancelled 
Instance details

Defined in Control.Concurrent.Async.Internal

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 Number 
Instance details

Defined in Data.Attoparsec.Number

Methods

(==) :: Number -> Number -> Bool #

(/=) :: Number -> Number -> Bool #

Eq ByteArray 
Instance details

Defined in Data.Array.Byte

Methods

(==) :: ByteArray -> ByteArray -> Bool #

(/=) :: ByteArray -> ByteArray -> Bool #

Eq Constr 
Instance details

Defined in Data.Data

Methods

(==) :: Constr -> Constr -> Bool #

(/=) :: Constr -> Constr -> Bool #

Eq ConstrRep 
Instance details

Defined in Data.Data

Methods

(==) :: ConstrRep -> ConstrRep -> Bool #

(/=) :: ConstrRep -> ConstrRep -> Bool #

Eq DataRep 
Instance details

Defined in Data.Data

Methods

(==) :: DataRep -> DataRep -> Bool #

(/=) :: DataRep -> DataRep -> Bool #

Eq Fixity 
Instance details

Defined in Data.Data

Methods

(==) :: Fixity -> Fixity -> Bool #

(/=) :: Fixity -> Fixity -> Bool #

Eq All 
Instance details

Defined in Data.Semigroup.Internal

Methods

(==) :: All -> All -> Bool #

(/=) :: All -> All -> Bool #

Eq Any 
Instance details

Defined in Data.Semigroup.Internal

Methods

(==) :: Any -> Any -> Bool #

(/=) :: Any -> Any -> Bool #

Eq SomeTypeRep 
Instance details

Defined in Data.Typeable.Internal

Methods

(==) :: SomeTypeRep -> SomeTypeRep -> Bool #

(/=) :: SomeTypeRep -> SomeTypeRep -> Bool #

Eq Unique 
Instance details

Defined in Data.Unique

Methods

(==) :: Unique -> Unique -> Bool #

(/=) :: Unique -> Unique -> Bool #

Eq Version 
Instance details

Defined in Data.Version

Methods

(==) :: Version -> Version -> Bool #

(/=) :: Version -> Version -> Bool #

Eq Errno 
Instance details

Defined in Foreign.C.Error

Methods

(==) :: Errno -> Errno -> Bool #

(/=) :: Errno -> Errno -> Bool #

Eq CBool 
Instance details

Defined in Foreign.C.Types

Methods

(==) :: CBool -> CBool -> Bool #

(/=) :: CBool -> CBool -> Bool #

Eq CChar 
Instance details

Defined in Foreign.C.Types

Methods

(==) :: CChar -> CChar -> Bool #

(/=) :: CChar -> CChar -> Bool #

Eq CClock 
Instance details

Defined in Foreign.C.Types

Methods

(==) :: CClock -> CClock -> Bool #

(/=) :: CClock -> CClock -> Bool #

Eq CDouble 
Instance details

Defined in Foreign.C.Types

Methods

(==) :: CDouble -> CDouble -> Bool #

(/=) :: CDouble -> CDouble -> Bool #

Eq CFloat 
Instance details

Defined in Foreign.C.Types

Methods

(==) :: CFloat -> CFloat -> Bool #

(/=) :: CFloat -> CFloat -> Bool #

Eq CInt 
Instance details

Defined in Foreign.C.Types

Methods

(==) :: CInt -> CInt -> Bool #

(/=) :: CInt -> CInt -> Bool #

Eq CIntMax 
Instance details

Defined in Foreign.C.Types

Methods

(==) :: CIntMax -> CIntMax -> Bool #

(/=) :: CIntMax -> CIntMax -> Bool #

Eq CIntPtr 
Instance details

Defined in Foreign.C.Types

Methods

(==) :: CIntPtr -> CIntPtr -> Bool #

(/=) :: CIntPtr -> CIntPtr -> Bool #

Eq CLLong 
Instance details

Defined in Foreign.C.Types

Methods

(==) :: CLLong -> CLLong -> Bool #

(/=) :: CLLong -> CLLong -> Bool #

Eq CLong 
Instance details

Defined in Foreign.C.Types

Methods

(==) :: CLong -> CLong -> Bool #

(/=) :: CLong -> CLong -> Bool #

Eq CPtrdiff 
Instance details

Defined in Foreign.C.Types

Methods

(==) :: CPtrdiff -> CPtrdiff -> Bool #

(/=) :: CPtrdiff -> CPtrdiff -> Bool #

Eq CSChar 
Instance details

Defined in Foreign.C.Types

Methods

(==) :: CSChar -> CSChar -> Bool #

(/=) :: CSChar -> CSChar -> Bool #

Eq CSUSeconds 
Instance details

Defined in Foreign.C.Types

Methods

(==) :: CSUSeconds -> CSUSeconds -> Bool #

(/=) :: CSUSeconds -> CSUSeconds -> Bool #

Eq CShort 
Instance details

Defined in Foreign.C.Types

Methods

(==) :: CShort -> CShort -> Bool #

(/=) :: CShort -> CShort -> Bool #

Eq CSigAtomic 
Instance details

Defined in Foreign.C.Types

Methods

(==) :: CSigAtomic -> CSigAtomic -> Bool #

(/=) :: CSigAtomic -> CSigAtomic -> Bool #

Eq CSize 
Instance details

Defined in Foreign.C.Types

Methods

(==) :: CSize -> CSize -> Bool #

(/=) :: CSize -> CSize -> Bool #

Eq CTime 
Instance details

Defined in Foreign.C.Types

Methods

(==) :: CTime -> CTime -> Bool #

(/=) :: CTime -> CTime -> Bool #

Eq CUChar 
Instance details

Defined in Foreign.C.Types

Methods

(==) :: CUChar -> CUChar -> Bool #

(/=) :: CUChar -> CUChar -> Bool #

Eq CUInt 
Instance details

Defined in Foreign.C.Types

Methods

(==) :: CUInt -> CUInt -> Bool #

(/=) :: CUInt -> CUInt -> Bool #

Eq CUIntMax 
Instance details

Defined in Foreign.C.Types

Methods

(==) :: CUIntMax -> CUIntMax -> Bool #

(/=) :: CUIntMax -> CUIntMax -> Bool #

Eq CUIntPtr 
Instance details

Defined in Foreign.C.Types

Methods

(==) :: CUIntPtr -> CUIntPtr -> Bool #

(/=) :: CUIntPtr -> CUIntPtr -> Bool #

Eq CULLong 
Instance details

Defined in Foreign.C.Types

Methods

(==) :: CULLong -> CULLong -> Bool #

(/=) :: CULLong -> CULLong -> Bool #

Eq CULong 
Instance details

Defined in Foreign.C.Types

Methods

(==) :: CULong -> CULong -> Bool #

(/=) :: CULong -> CULong -> Bool #

Eq CUSeconds 
Instance details

Defined in Foreign.C.Types

Methods

(==) :: CUSeconds -> CUSeconds -> Bool #

(/=) :: CUSeconds -> CUSeconds -> Bool #

Eq CUShort 
Instance details

Defined in Foreign.C.Types

Methods

(==) :: CUShort -> CUShort -> Bool #

(/=) :: CUShort -> CUShort -> Bool #

Eq CWchar 
Instance details

Defined in Foreign.C.Types

Methods

(==) :: CWchar -> CWchar -> Bool #

(/=) :: CWchar -> CWchar -> Bool #

Eq IntPtr 
Instance details

Defined in Foreign.Ptr

Methods

(==) :: IntPtr -> IntPtr -> Bool #

(/=) :: IntPtr -> IntPtr -> Bool #

Eq WordPtr 
Instance details

Defined in Foreign.Ptr

Methods

(==) :: WordPtr -> WordPtr -> Bool #

(/=) :: WordPtr -> WordPtr -> Bool #

Eq Void 
Instance details

Defined in GHC.Base

Methods

(==) :: Void -> Void -> Bool #

(/=) :: Void -> Void -> Bool #

Eq ByteOrder 
Instance details

Defined in GHC.ByteOrder

Methods

(==) :: ByteOrder -> ByteOrder -> Bool #

(/=) :: ByteOrder -> ByteOrder -> Bool #

Eq BlockReason 
Instance details

Defined in GHC.Conc.Sync

Methods

(==) :: BlockReason -> BlockReason -> Bool #

(/=) :: BlockReason -> BlockReason -> Bool #

Eq ThreadId 
Instance details

Defined in GHC.Conc.Sync

Eq ThreadStatus 
Instance details

Defined in GHC.Conc.Sync

Methods

(==) :: ThreadStatus -> ThreadStatus -> Bool #

(/=) :: ThreadStatus -> ThreadStatus -> Bool #

Eq TimeoutKey 
Instance details

Defined in GHC.Event.TimeOut

Methods

(==) :: TimeoutKey -> TimeoutKey -> Bool #

(/=) :: TimeoutKey -> TimeoutKey -> Bool #

Eq ErrorCall 
Instance details

Defined in GHC.Exception

Methods

(==) :: ErrorCall -> ErrorCall -> Bool #

(/=) :: ErrorCall -> ErrorCall -> Bool #

Eq ArithException 
Instance details

Defined in GHC.Exception.Type

Methods

(==) :: ArithException -> ArithException -> Bool #

(/=) :: ArithException -> ArithException -> Bool #

Eq SpecConstrAnnotation 
Instance details

Defined in GHC.Exts

Methods

(==) :: SpecConstrAnnotation -> SpecConstrAnnotation -> Bool #

(/=) :: SpecConstrAnnotation -> SpecConstrAnnotation -> Bool #

Eq Fingerprint 
Instance details

Defined in GHC.Fingerprint.Type

Methods

(==) :: Fingerprint -> Fingerprint -> Bool #

(/=) :: Fingerprint -> Fingerprint -> Bool #

Eq Associativity 
Instance details

Defined in GHC.Generics

Methods

(==) :: Associativity -> Associativity -> Bool #

(/=) :: Associativity -> Associativity -> Bool #

Eq DecidedStrictness 
Instance details

Defined in GHC.Generics

Methods

(==) :: DecidedStrictness -> DecidedStrictness -> Bool #

(/=) :: DecidedStrictness -> DecidedStrictness -> Bool #

Eq Fixity 
Instance details

Defined in GHC.Generics

Methods

(==) :: Fixity -> Fixity -> Bool #

(/=) :: Fixity -> Fixity -> Bool #

Eq SourceStrictness 
Instance details

Defined in GHC.Generics

Methods

(==) :: SourceStrictness -> SourceStrictness -> Bool #

(/=) :: SourceStrictness -> SourceStrictness -> Bool #

Eq SourceUnpackedness 
Instance details

Defined in GHC.Generics

Methods

(==) :: SourceUnpackedness -> SourceUnpackedness -> Bool #

(/=) :: SourceUnpackedness -> SourceUnpackedness -> Bool #

Eq MaskingState 
Instance details

Defined in GHC.IO

Methods

(==) :: MaskingState -> MaskingState -> Bool #

(/=) :: MaskingState -> MaskingState -> Bool #

Eq BufferState 
Instance details

Defined in GHC.IO.Buffer

Methods

(==) :: BufferState -> BufferState -> Bool #

(/=) :: BufferState -> BufferState -> Bool #

Eq IODeviceType 
Instance details

Defined in GHC.IO.Device

Methods

(==) :: IODeviceType -> IODeviceType -> Bool #

(/=) :: IODeviceType -> IODeviceType -> Bool #

Eq SeekMode 
Instance details

Defined in GHC.IO.Device

Eq CodingProgress 
Instance details

Defined in GHC.IO.Encoding.Types

Methods

(==) :: CodingProgress -> CodingProgress -> Bool #

(/=) :: CodingProgress -> CodingProgress -> Bool #

Eq ArrayException 
Instance details

Defined in GHC.IO.Exception

Methods

(==) :: ArrayException -> ArrayException -> Bool #

(/=) :: ArrayException -> ArrayException -> Bool #

Eq AsyncException 
Instance details

Defined in GHC.IO.Exception

Methods

(==) :: AsyncException -> AsyncException -> Bool #

(/=) :: AsyncException -> AsyncException -> Bool #

Eq ExitCode 
Instance details

Defined in GHC.IO.Exception

Eq IOErrorType 
Instance details

Defined in GHC.IO.Exception

Methods

(==) :: IOErrorType -> IOErrorType -> Bool #

(/=) :: IOErrorType -> IOErrorType -> Bool #

Eq IOException 
Instance details

Defined in GHC.IO.Exception

Eq HandlePosn 
Instance details

Defined in GHC.IO.Handle

Methods

(==) :: HandlePosn -> HandlePosn -> Bool #

(/=) :: HandlePosn -> HandlePosn -> Bool #

Eq BufferMode 
Instance details

Defined in GHC.IO.Handle.Types

Eq Handle 
Instance details

Defined in GHC.IO.Handle.Types

Methods

(==) :: Handle -> Handle -> Bool #

(/=) :: Handle -> Handle -> Bool #

Eq Newline 
Instance details

Defined in GHC.IO.Handle.Types

Methods

(==) :: Newline -> Newline -> Bool #

(/=) :: Newline -> Newline -> Bool #

Eq NewlineMode 
Instance details

Defined in GHC.IO.Handle.Types

Methods

(==) :: NewlineMode -> NewlineMode -> Bool #

(/=) :: NewlineMode -> NewlineMode -> Bool #

Eq IOMode 
Instance details

Defined in GHC.IO.IOMode

Methods

(==) :: IOMode -> IOMode -> Bool #

(/=) :: IOMode -> IOMode -> Bool #

Eq InfoProv 
Instance details

Defined in GHC.InfoProv

Methods

(==) :: InfoProv -> InfoProv -> Bool #

(/=) :: InfoProv -> InfoProv -> Bool #

Eq Int16 
Instance details

Defined in GHC.Int

Methods

(==) :: Int16 -> Int16 -> Bool #

(/=) :: Int16 -> Int16 -> Bool #

Eq Int32 
Instance details

Defined in GHC.Int

Methods

(==) :: Int32 -> Int32 -> Bool #

(/=) :: Int32 -> Int32 -> Bool #

Eq Int64 
Instance details

Defined in GHC.Int

Methods

(==) :: Int64 -> Int64 -> Bool #

(/=) :: Int64 -> Int64 -> Bool #

Eq Int8 
Instance details

Defined in GHC.Int

Methods

(==) :: Int8 -> Int8 -> Bool #

(/=) :: Int8 -> Int8 -> Bool #

Eq IoSubSystem 
Instance details

Defined in GHC.RTS.Flags

Methods

(==) :: IoSubSystem -> IoSubSystem -> Bool #

(/=) :: IoSubSystem -> IoSubSystem -> Bool #

Eq StackEntry 
Instance details

Defined in GHC.Stack.CloneStack

Methods

(==) :: StackEntry -> StackEntry -> Bool #

(/=) :: StackEntry -> StackEntry -> Bool #

Eq SrcLoc 
Instance details

Defined in GHC.Stack.Types

Methods

(==) :: SrcLoc -> SrcLoc -> Bool #

(/=) :: SrcLoc -> SrcLoc -> Bool #

Eq SomeChar 
Instance details

Defined in GHC.TypeLits

Methods

(==) :: SomeChar -> SomeChar -> Bool #

(/=) :: SomeChar -> SomeChar -> Bool #

Eq SomeSymbol 
Instance details

Defined in GHC.TypeLits

Methods

(==) :: SomeSymbol -> SomeSymbol -> Bool #

(/=) :: SomeSymbol -> SomeSymbol -> Bool #

Eq SomeNat 
Instance details

Defined in GHC.TypeNats

Methods

(==) :: SomeNat -> SomeNat -> Bool #

(/=) :: SomeNat -> SomeNat -> Bool #

Eq GeneralCategory 
Instance details

Defined in GHC.Unicode

Methods

(==) :: GeneralCategory -> GeneralCategory -> Bool #

(/=) :: GeneralCategory -> GeneralCategory -> Bool #

Eq Word16 
Instance details

Defined in GHC.Word

Methods

(==) :: Word16 -> Word16 -> Bool #

(/=) :: Word16 -> Word16 -> Bool #

Eq Word32 
Instance details

Defined in GHC.Word

Methods

(==) :: Word32 -> Word32 -> Bool #

(/=) :: Word32 -> Word32 -> Bool #

Eq Word64 
Instance details

Defined in GHC.Word

Methods

(==) :: Word64 -> Word64 -> Bool #

(/=) :: Word64 -> Word64 -> Bool #

Eq Word8 
Instance details

Defined in GHC.Word

Methods

(==) :: Word8 -> Word8 -> Bool #

(/=) :: Word8 -> Word8 -> Bool #

Eq CBlkCnt 
Instance details

Defined in System.Posix.Types

Methods

(==) :: CBlkCnt -> CBlkCnt -> Bool #

(/=) :: CBlkCnt -> CBlkCnt -> Bool #

Eq CBlkSize 
Instance details

Defined in System.Posix.Types

Methods

(==) :: CBlkSize -> CBlkSize -> Bool #

(/=) :: CBlkSize -> CBlkSize -> Bool #

Eq CCc 
Instance details

Defined in System.Posix.Types

Methods

(==) :: CCc -> CCc -> Bool #

(/=) :: CCc -> CCc -> Bool #

Eq CClockId 
Instance details

Defined in System.Posix.Types

Methods

(==) :: CClockId -> CClockId -> Bool #

(/=) :: CClockId -> CClockId -> Bool #

Eq CDev 
Instance details

Defined in System.Posix.Types

Methods

(==) :: CDev -> CDev -> Bool #

(/=) :: CDev -> CDev -> Bool #

Eq CFsBlkCnt 
Instance details

Defined in System.Posix.Types

Methods

(==) :: CFsBlkCnt -> CFsBlkCnt -> Bool #

(/=) :: CFsBlkCnt -> CFsBlkCnt -> Bool #

Eq CFsFilCnt 
Instance details

Defined in System.Posix.Types

Methods

(==) :: CFsFilCnt -> CFsFilCnt -> Bool #

(/=) :: CFsFilCnt -> CFsFilCnt -> Bool #

Eq CGid 
Instance details

Defined in System.Posix.Types

Methods

(==) :: CGid -> CGid -> Bool #

(/=) :: CGid -> CGid -> Bool #

Eq CId 
Instance details

Defined in System.Posix.Types

Methods

(==) :: CId -> CId -> Bool #

(/=) :: CId -> CId -> Bool #

Eq CIno 
Instance details

Defined in System.Posix.Types

Methods

(==) :: CIno -> CIno -> Bool #

(/=) :: CIno -> CIno -> Bool #

Eq CKey 
Instance details

Defined in System.Posix.Types

Methods

(==) :: CKey -> CKey -> Bool #

(/=) :: CKey -> CKey -> Bool #

Eq CMode 
Instance details

Defined in System.Posix.Types

Methods

(==) :: CMode -> CMode -> Bool #

(/=) :: CMode -> CMode -> Bool #

Eq CNfds 
Instance details

Defined in System.Posix.Types

Methods

(==) :: CNfds -> CNfds -> Bool #

(/=) :: CNfds -> CNfds -> Bool #

Eq CNlink 
Instance details

Defined in System.Posix.Types

Methods

(==) :: CNlink -> CNlink -> Bool #

(/=) :: CNlink -> CNlink -> Bool #

Eq COff 
Instance details

Defined in System.Posix.Types

Methods

(==) :: COff -> COff -> Bool #

(/=) :: COff -> COff -> Bool #

Eq CPid 
Instance details

Defined in System.Posix.Types

Methods

(==) :: CPid -> CPid -> Bool #

(/=) :: CPid -> CPid -> Bool #

Eq CRLim 
Instance details

Defined in System.Posix.Types

Methods

(==) :: CRLim -> CRLim -> Bool #

(/=) :: CRLim -> CRLim -> Bool #

Eq CSocklen 
Instance details

Defined in System.Posix.Types

Methods

(==) :: CSocklen -> CSocklen -> Bool #

(/=) :: CSocklen -> CSocklen -> Bool #

Eq CSpeed 
Instance details

Defined in System.Posix.Types

Methods

(==) :: CSpeed -> CSpeed -> Bool #

(/=) :: CSpeed -> CSpeed -> Bool #

Eq CSsize 
Instance details

Defined in System.Posix.Types

Methods

(==) :: CSsize -> CSsize -> Bool #

(/=) :: CSsize -> CSsize -> Bool #

Eq CTcflag 
Instance details

Defined in System.Posix.Types

Methods

(==) :: CTcflag -> CTcflag -> Bool #

(/=) :: CTcflag -> CTcflag -> Bool #

Eq CTimer 
Instance details

Defined in System.Posix.Types

Methods

(==) :: CTimer -> CTimer -> Bool #

(/=) :: CTimer -> CTimer -> Bool #

Eq CUid 
Instance details

Defined in System.Posix.Types

Methods

(==) :: CUid -> CUid -> Bool #

(/=) :: CUid -> CUid -> Bool #

Eq Fd 
Instance details

Defined in System.Posix.Types

Methods

(==) :: Fd -> Fd -> Bool #

(/=) :: Fd -> Fd -> Bool #

Eq Timeout 
Instance details

Defined in System.Timeout

Methods

(==) :: Timeout -> Timeout -> Bool #

(/=) :: Timeout -> Timeout -> Bool #

Eq Lexeme 
Instance details

Defined in Text.Read.Lex

Methods

(==) :: Lexeme -> Lexeme -> Bool #

(/=) :: Lexeme -> Lexeme -> Bool #

Eq Number 
Instance details

Defined in Text.Read.Lex

Methods

(==) :: Number -> Number -> Bool #

(/=) :: Number -> Number -> Bool #

Eq Encoding 
Instance details

Defined in Basement.String

Methods

(==) :: Encoding -> Encoding -> Bool #

(/=) :: Encoding -> Encoding -> Bool #

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

Methods

(==) :: FileSize -> FileSize -> Bool #

(/=) :: FileSize -> FileSize -> Bool #

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

Methods

(==) :: ByteString -> ByteString -> Bool #

(/=) :: ByteString -> ByteString -> Bool #

Eq ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Eq ByteArray 
Instance details

Defined in Codec.CBOR.ByteArray

Methods

(==) :: ByteArray -> ByteArray -> Bool #

(/=) :: ByteArray -> ByteArray -> Bool #

Eq SlicedByteArray 
Instance details

Defined in Codec.CBOR.ByteArray.Sliced

Methods

(==) :: SlicedByteArray -> SlicedByteArray -> Bool #

(/=) :: SlicedByteArray -> SlicedByteArray -> Bool #

Eq Position 
Instance details

Defined in Data.Conduit.Attoparsec

Methods

(==) :: Position -> Position -> Bool #

(/=) :: Position -> Position -> Bool #

Eq PositionRange 
Instance details

Defined in Data.Conduit.Attoparsec

Methods

(==) :: PositionRange -> PositionRange -> Bool #

(/=) :: PositionRange -> PositionRange -> Bool #

Eq IntSet 
Instance details

Defined in Data.IntSet.Internal

Methods

(==) :: IntSet -> IntSet -> Bool #

(/=) :: IntSet -> IntSet -> Bool #

Eq Nonce 
Instance details

Defined in Crypto.Cipher.AESGCMSIV

Methods

(==) :: Nonce -> Nonce -> Bool #

(/=) :: Nonce -> Nonce -> Bool #

Eq DES 
Instance details

Defined in Crypto.Cipher.DES

Methods

(==) :: DES -> DES -> Bool #

(/=) :: DES -> DES -> Bool #

Eq DES_EDE2 
Instance details

Defined in Crypto.Cipher.TripleDES

Methods

(==) :: DES_EDE2 -> DES_EDE2 -> Bool #

(/=) :: DES_EDE2 -> DES_EDE2 -> Bool #

Eq DES_EDE3 
Instance details

Defined in Crypto.Cipher.TripleDES

Methods

(==) :: DES_EDE3 -> DES_EDE3 -> Bool #

(/=) :: DES_EDE3 -> DES_EDE3 -> Bool #

Eq DES_EEE2 
Instance details

Defined in Crypto.Cipher.TripleDES

Methods

(==) :: DES_EEE2 -> DES_EEE2 -> Bool #

(/=) :: DES_EEE2 -> DES_EEE2 -> Bool #

Eq DES_EEE3 
Instance details

Defined in Crypto.Cipher.TripleDES

Methods

(==) :: DES_EEE3 -> DES_EEE3 -> Bool #

(/=) :: DES_EEE3 -> DES_EEE3 -> Bool #

Eq Format 
Instance details

Defined in Crypto.Data.Padding

Methods

(==) :: Format -> Format -> Bool #

(/=) :: Format -> Format -> Bool #

Eq SharedSecret 
Instance details

Defined in Crypto.ECC

Methods

(==) :: SharedSecret -> SharedSecret -> Bool #

(/=) :: SharedSecret -> SharedSecret -> Bool #

Eq Point 
Instance details

Defined in Crypto.ECC.Edwards25519

Methods

(==) :: Point -> Point -> Bool #

(/=) :: Point -> Point -> Bool #

Eq Scalar 
Instance details

Defined in Crypto.ECC.Edwards25519

Methods

(==) :: Scalar -> Scalar -> Bool #

(/=) :: Scalar -> Scalar -> Bool #

Eq CryptoError 
Instance details

Defined in Crypto.Error.Types

Methods

(==) :: CryptoError -> CryptoError -> Bool #

(/=) :: CryptoError -> CryptoError -> Bool #

Eq Options 
Instance details

Defined in Crypto.KDF.Argon2

Methods

(==) :: Options -> Options -> Bool #

(/=) :: Options -> Options -> Bool #

Eq Variant 
Instance details

Defined in Crypto.KDF.Argon2

Methods

(==) :: Variant -> Variant -> Bool #

(/=) :: Variant -> Variant -> Bool #

Eq Version 
Instance details

Defined in Crypto.KDF.Argon2

Methods

(==) :: Version -> Version -> Bool #

(/=) :: Version -> Version -> Bool #

Eq Parameters 
Instance details

Defined in Crypto.KDF.BCryptPBKDF

Methods

(==) :: Parameters -> Parameters -> Bool #

(/=) :: Parameters -> Parameters -> Bool #

Eq Auth 
Instance details

Defined in Crypto.MAC.Poly1305

Methods

(==) :: Auth -> Auth -> Bool #

(/=) :: Auth -> Auth -> Bool #

Eq GenTopPolicy 
Instance details

Defined in Crypto.Number.Generate

Methods

(==) :: GenTopPolicy -> GenTopPolicy -> Bool #

(/=) :: GenTopPolicy -> GenTopPolicy -> Bool #

Eq DhSecret 
Instance details

Defined in Crypto.PubKey.Curve25519

Methods

(==) :: DhSecret -> DhSecret -> Bool #

(/=) :: DhSecret -> DhSecret -> Bool #

Eq PublicKey 
Instance details

Defined in Crypto.PubKey.Curve25519

Methods

(==) :: PublicKey -> PublicKey -> Bool #

(/=) :: PublicKey -> PublicKey -> Bool #

Eq SecretKey 
Instance details

Defined in Crypto.PubKey.Curve25519

Methods

(==) :: SecretKey -> SecretKey -> Bool #

(/=) :: SecretKey -> SecretKey -> Bool #

Eq DhSecret 
Instance details

Defined in Crypto.PubKey.Curve448

Methods

(==) :: DhSecret -> DhSecret -> Bool #

(/=) :: DhSecret -> DhSecret -> Bool #

Eq PublicKey 
Instance details

Defined in Crypto.PubKey.Curve448

Methods

(==) :: PublicKey -> PublicKey -> Bool #

(/=) :: PublicKey -> PublicKey -> Bool #

Eq SecretKey 
Instance details

Defined in Crypto.PubKey.Curve448

Methods

(==) :: SecretKey -> SecretKey -> Bool #

(/=) :: SecretKey -> SecretKey -> Bool #

Eq Params 
Instance details

Defined in Crypto.PubKey.DH

Methods

(==) :: Params -> Params -> Bool #

(/=) :: Params -> Params -> Bool #

Eq PrivateNumber 
Instance details

Defined in Crypto.PubKey.DH

Methods

(==) :: PrivateNumber -> PrivateNumber -> Bool #

(/=) :: PrivateNumber -> PrivateNumber -> Bool #

Eq PublicNumber 
Instance details

Defined in Crypto.PubKey.DH

Methods

(==) :: PublicNumber -> PublicNumber -> Bool #

(/=) :: PublicNumber -> PublicNumber -> Bool #

Eq SharedKey 
Instance details

Defined in Crypto.PubKey.DH

Methods

(==) :: SharedKey -> SharedKey -> Bool #

(/=) :: SharedKey -> SharedKey -> Bool #

Eq KeyPair 
Instance details

Defined in Crypto.PubKey.DSA

Methods

(==) :: KeyPair -> KeyPair -> Bool #

(/=) :: KeyPair -> KeyPair -> Bool #

Eq Params 
Instance details

Defined in Crypto.PubKey.DSA

Methods

(==) :: Params -> Params -> Bool #

(/=) :: Params -> Params -> Bool #

Eq PrivateKey 
Instance details

Defined in Crypto.PubKey.DSA

Methods

(==) :: PrivateKey -> PrivateKey -> Bool #

(/=) :: PrivateKey -> PrivateKey -> Bool #

Eq PublicKey 
Instance details

Defined in Crypto.PubKey.DSA

Methods

(==) :: PublicKey -> PublicKey -> Bool #

(/=) :: PublicKey -> PublicKey -> Bool #

Eq Signature 
Instance details

Defined in Crypto.PubKey.DSA

Methods

(==) :: Signature -> Signature -> Bool #

(/=) :: Signature -> Signature -> Bool #

Eq ExtendedSignature 
Instance details

Defined in Crypto.PubKey.ECC.ECDSA

Methods

(==) :: ExtendedSignature -> ExtendedSignature -> Bool #

(/=) :: ExtendedSignature -> ExtendedSignature -> Bool #

Eq KeyPair 
Instance details

Defined in Crypto.PubKey.ECC.ECDSA

Methods

(==) :: KeyPair -> KeyPair -> Bool #

(/=) :: KeyPair -> KeyPair -> Bool #

Eq PrivateKey 
Instance details

Defined in Crypto.PubKey.ECC.ECDSA

Methods

(==) :: PrivateKey -> PrivateKey -> Bool #

(/=) :: PrivateKey -> PrivateKey -> Bool #

Eq PublicKey 
Instance details

Defined in Crypto.PubKey.ECC.ECDSA

Methods

(==) :: PublicKey -> PublicKey -> Bool #

(/=) :: PublicKey -> PublicKey -> Bool #

Eq Signature 
Instance details

Defined in Crypto.PubKey.ECC.ECDSA

Methods

(==) :: Signature -> Signature -> Bool #

(/=) :: Signature -> Signature -> Bool #

Eq Point 
Instance details

Defined in Crypto.PubKey.ECC.P256

Methods

(==) :: Point -> Point -> Bool #

(/=) :: Point -> Point -> Bool #

Eq Scalar 
Instance details

Defined in Crypto.PubKey.ECC.P256

Methods

(==) :: Scalar -> Scalar -> Bool #

(/=) :: Scalar -> Scalar -> Bool #

Eq Curve 
Instance details

Defined in Crypto.PubKey.ECC.Types

Methods

(==) :: Curve -> Curve -> Bool #

(/=) :: Curve -> Curve -> Bool #

Eq CurveBinary 
Instance details

Defined in Crypto.PubKey.ECC.Types

Methods

(==) :: CurveBinary -> CurveBinary -> Bool #

(/=) :: CurveBinary -> CurveBinary -> Bool #

Eq CurveCommon 
Instance details

Defined in Crypto.PubKey.ECC.Types

Methods

(==) :: CurveCommon -> CurveCommon -> Bool #

(/=) :: CurveCommon -> CurveCommon -> Bool #

Eq CurveName 
Instance details

Defined in Crypto.PubKey.ECC.Types

Methods

(==) :: CurveName -> CurveName -> Bool #

(/=) :: CurveName -> CurveName -> Bool #

Eq CurvePrime 
Instance details

Defined in Crypto.PubKey.ECC.Types

Methods

(==) :: CurvePrime -> CurvePrime -> Bool #

(/=) :: CurvePrime -> CurvePrime -> Bool #

Eq Point 
Instance details

Defined in Crypto.PubKey.ECC.Types

Methods

(==) :: Point -> Point -> Bool #

(/=) :: Point -> Point -> Bool #

Eq PublicKey 
Instance details

Defined in Crypto.PubKey.Ed25519

Methods

(==) :: PublicKey -> PublicKey -> Bool #

(/=) :: PublicKey -> PublicKey -> Bool #

Eq SecretKey 
Instance details

Defined in Crypto.PubKey.Ed25519

Methods

(==) :: SecretKey -> SecretKey -> Bool #

(/=) :: SecretKey -> SecretKey -> Bool #

Eq Signature 
Instance details

Defined in Crypto.PubKey.Ed25519

Methods

(==) :: Signature -> Signature -> Bool #

(/=) :: Signature -> Signature -> Bool #

Eq PublicKey 
Instance details

Defined in Crypto.PubKey.Ed448

Methods

(==) :: PublicKey -> PublicKey -> Bool #

(/=) :: PublicKey -> PublicKey -> Bool #

Eq SecretKey 
Instance details

Defined in Crypto.PubKey.Ed448

Methods

(==) :: SecretKey -> SecretKey -> Bool #

(/=) :: SecretKey -> SecretKey -> Bool #

Eq Signature 
Instance details

Defined in Crypto.PubKey.Ed448

Methods

(==) :: Signature -> Signature -> Bool #

(/=) :: Signature -> Signature -> Bool #

Eq Blinder 
Instance details

Defined in Crypto.PubKey.RSA.Types

Methods

(==) :: Blinder -> Blinder -> Bool #

(/=) :: Blinder -> Blinder -> Bool #

Eq Error 
Instance details

Defined in Crypto.PubKey.RSA.Types

Methods

(==) :: Error -> Error -> Bool #

(/=) :: Error -> Error -> Bool #

Eq KeyPair 
Instance details

Defined in Crypto.PubKey.RSA.Types

Methods

(==) :: KeyPair -> KeyPair -> Bool #

(/=) :: KeyPair -> KeyPair -> Bool #

Eq PrivateKey 
Instance details

Defined in Crypto.PubKey.RSA.Types

Methods

(==) :: PrivateKey -> PrivateKey -> Bool #

(/=) :: PrivateKey -> PrivateKey -> Bool #

Eq PublicKey 
Instance details

Defined in Crypto.PubKey.RSA.Types

Methods

(==) :: PublicKey -> PublicKey -> Bool #

(/=) :: PublicKey -> PublicKey -> Bool #

Eq PrivateKey 
Instance details

Defined in Crypto.PubKey.Rabin.Basic

Methods

(==) :: PrivateKey -> PrivateKey -> Bool #

(/=) :: PrivateKey -> PrivateKey -> Bool #

Eq PublicKey 
Instance details

Defined in Crypto.PubKey.Rabin.Basic

Methods

(==) :: PublicKey -> PublicKey -> Bool #

(/=) :: PublicKey -> PublicKey -> Bool #

Eq Signature 
Instance details

Defined in Crypto.PubKey.Rabin.Basic

Methods

(==) :: Signature -> Signature -> Bool #

(/=) :: Signature -> Signature -> Bool #

Eq PrivateKey 
Instance details

Defined in Crypto.PubKey.Rabin.Modified

Methods

(==) :: PrivateKey -> PrivateKey -> Bool #

(/=) :: PrivateKey -> PrivateKey -> Bool #

Eq PublicKey 
Instance details

Defined in Crypto.PubKey.Rabin.Modified

Methods

(==) :: PublicKey -> PublicKey -> Bool #

(/=) :: PublicKey -> PublicKey -> Bool #

Eq PrivateKey 
Instance details

Defined in Crypto.PubKey.Rabin.RW

Methods

(==) :: PrivateKey -> PrivateKey -> Bool #

(/=) :: PrivateKey -> PrivateKey -> Bool #

Eq PublicKey 
Instance details

Defined in Crypto.PubKey.Rabin.RW

Methods

(==) :: PublicKey -> PublicKey -> Bool #

(/=) :: PublicKey -> PublicKey -> Bool #

Eq Error 
Instance details

Defined in Crypto.PubKey.Rabin.Types

Methods

(==) :: Error -> Error -> Bool #

(/=) :: Error -> Error -> Bool #

Eq ProcessorOption 
Instance details

Defined in Crypto.System.CPU

Methods

(==) :: ProcessorOption -> ProcessorOption -> Bool #

(/=) :: ProcessorOption -> ProcessorOption -> Bool #

Eq FileType 
Instance details

Defined in System.Directory.Internal.Common

Methods

(==) :: FileType -> FileType -> Bool #

(/=) :: FileType -> FileType -> Bool #

Eq Permissions 
Instance details

Defined in System.Directory.Internal.Common

Methods

(==) :: Permissions -> Permissions -> Bool #

(/=) :: Permissions -> Permissions -> Bool #

Eq XdgDirectory 
Instance details

Defined in System.Directory.Internal.Common

Methods

(==) :: XdgDirectory -> XdgDirectory -> Bool #

(/=) :: XdgDirectory -> XdgDirectory -> Bool #

Eq XdgDirectoryList 
Instance details

Defined in System.Directory.Internal.Common

Methods

(==) :: XdgDirectoryList -> XdgDirectoryList -> Bool #

(/=) :: XdgDirectoryList -> XdgDirectoryList -> Bool #

Eq EchoState 
Instance details

Defined in System.IO.Echo.Internal

Methods

(==) :: EchoState -> EchoState -> Bool #

(/=) :: EchoState -> EchoState -> Bool #

Eq PublicKey 
Instance details

Defined in Crypto.Sign.Ed25519

Methods

(==) :: PublicKey -> PublicKey -> Bool #

(/=) :: PublicKey -> PublicKey -> Bool #

Eq SecretKey 
Instance details

Defined in Crypto.Sign.Ed25519

Methods

(==) :: SecretKey -> SecretKey -> Bool #

(/=) :: SecretKey -> SecretKey -> Bool #

Eq Signature 
Instance details

Defined in Crypto.Sign.Ed25519

Methods

(==) :: Signature -> Signature -> Bool #

(/=) :: Signature -> Signature -> Bool #

Eq Timeout 
Instance details

Defined in System.Time.Extra

Methods

(==) :: Timeout -> Timeout -> Bool #

(/=) :: Timeout -> Timeout -> Bool #

Eq FileLock 
Instance details

Defined in System.FileLock

Eq SharedExclusive 
Instance details

Defined in System.FileLock

Eq OsChar 
Instance details

Defined in System.OsString.Internal.Types.Hidden

Methods

(==) :: OsChar -> OsChar -> Bool #

(/=) :: OsChar -> OsChar -> Bool #

Eq OsString 
Instance details

Defined in System.OsString.Internal.Types.Hidden

Methods

(==) :: OsString -> OsString -> Bool #

(/=) :: OsString -> OsString -> Bool #

Eq PosixChar 
Instance details

Defined in System.OsString.Internal.Types.Hidden

Methods

(==) :: PosixChar -> PosixChar -> Bool #

(/=) :: PosixChar -> PosixChar -> Bool #

Eq PosixString 
Instance details

Defined in System.OsString.Internal.Types.Hidden

Methods

(==) :: PosixString -> PosixString -> Bool #

(/=) :: PosixString -> PosixString -> Bool #

Eq WindowsChar 
Instance details

Defined in System.OsString.Internal.Types.Hidden

Methods

(==) :: WindowsChar -> WindowsChar -> Bool #

(/=) :: WindowsChar -> WindowsChar -> Bool #

Eq WindowsString 
Instance details

Defined in System.OsString.Internal.Types.Hidden

Methods

(==) :: WindowsString -> WindowsString -> Bool #

(/=) :: WindowsString -> WindowsString -> Bool #

Eq Event 
Instance details

Defined in System.FSNotify.Types

Methods

(==) :: Event -> Event -> Bool #

(/=) :: Event -> Event -> Bool #

Eq EventIsDirectory 
Instance details

Defined in System.FSNotify.Types

Methods

(==) :: EventIsDirectory -> EventIsDirectory -> Bool #

(/=) :: EventIsDirectory -> EventIsDirectory -> Bool #

Eq Options 
Instance details

Defined in Generics.Deriving.TH

Methods

(==) :: Options -> Options -> Bool #

(/=) :: Options -> Options -> Bool #

Eq RepOptions 
Instance details

Defined in Generics.Deriving.TH

Methods

(==) :: RepOptions -> RepOptions -> Bool #

(/=) :: RepOptions -> RepOptions -> Bool #

Eq BigNat 
Instance details

Defined in GHC.Num.BigNat

Methods

(==) :: BigNat -> BigNat -> Bool #

(/=) :: BigNat -> BigNat -> Bool #

Eq ShortText 
Instance details

Defined in GHC.Data.ShortText

Methods

(==) :: ShortText -> ShortText -> Bool #

(/=) :: ShortText -> ShortText -> Bool #

Eq Arch 
Instance details

Defined in GHC.Platform.ArchOS

Methods

(==) :: Arch -> Arch -> Bool #

(/=) :: Arch -> Arch -> Bool #

Eq ArchOS 
Instance details

Defined in GHC.Platform.ArchOS

Methods

(==) :: ArchOS -> ArchOS -> Bool #

(/=) :: ArchOS -> ArchOS -> Bool #

Eq ArmABI 
Instance details

Defined in GHC.Platform.ArchOS

Methods

(==) :: ArmABI -> ArmABI -> Bool #

(/=) :: ArmABI -> ArmABI -> Bool #

Eq ArmISA 
Instance details

Defined in GHC.Platform.ArchOS

Methods

(==) :: ArmISA -> ArmISA -> Bool #

(/=) :: ArmISA -> ArmISA -> Bool #

Eq ArmISAExt 
Instance details

Defined in GHC.Platform.ArchOS

Methods

(==) :: ArmISAExt -> ArmISAExt -> Bool #

(/=) :: ArmISAExt -> ArmISAExt -> Bool #

Eq OS 
Instance details

Defined in GHC.Platform.ArchOS

Methods

(==) :: OS -> OS -> Bool #

(/=) :: OS -> OS -> Bool #

Eq PPC_64ABI 
Instance details

Defined in GHC.Platform.ArchOS

Methods

(==) :: PPC_64ABI -> PPC_64ABI -> Bool #

(/=) :: PPC_64ABI -> PPC_64ABI -> Bool #

Eq DbInstUnitId 
Instance details

Defined in GHC.Unit.Database

Methods

(==) :: DbInstUnitId -> DbInstUnitId -> Bool #

(/=) :: DbInstUnitId -> DbInstUnitId -> Bool #

Eq DbModule 
Instance details

Defined in GHC.Unit.Database

Methods

(==) :: DbModule -> DbModule -> Bool #

(/=) :: DbModule -> DbModule -> Bool #

Eq ForeignSrcLang 
Instance details

Defined in GHC.ForeignSrcLang.Type

Methods

(==) :: ForeignSrcLang -> ForeignSrcLang -> Bool #

(/=) :: ForeignSrcLang -> ForeignSrcLang -> Bool #

Eq Extension 
Instance details

Defined in GHC.LanguageExtensions.Type

Methods

(==) :: Extension -> Extension -> Bool #

(/=) :: Extension -> Extension -> 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 GitHashException 
Instance details

Defined in GitHash

Methods

(==) :: GitHashException -> GitHashException -> Bool #

(/=) :: GitHashException -> GitHashException -> Bool #

Eq KeyId 
Instance details

Defined in Hackage.Security.Key

Methods

(==) :: KeyId -> KeyId -> Bool #

(/=) :: KeyId -> KeyId -> Bool #

Eq Half 
Instance details

Defined in Numeric.Half.Internal

Methods

(==) :: Half -> Half -> Bool #

(/=) :: Half -> Half -> Bool #

Eq IfaceVersion 
Instance details

Defined in HiFileParser

Methods

(==) :: IfaceVersion -> IfaceVersion -> Bool #

(/=) :: IfaceVersion -> IfaceVersion -> Bool #

Eq GenerateHashStrategy 
Instance details

Defined in Hpack

Eq Result 
Instance details

Defined in Hpack

Methods

(==) :: Result -> Result -> Bool #

(/=) :: Result -> Result -> Bool #

Eq Status 
Instance details

Defined in Hpack

Methods

(==) :: Status -> Status -> Bool #

(/=) :: Status -> Status -> Bool #

Eq BuildTool 
Instance details

Defined in Hpack.Config

Eq BuildType 
Instance details

Defined in Hpack.Config

Eq Cond 
Instance details

Defined in Hpack.Config

Methods

(==) :: Cond -> Cond -> Bool #

(/=) :: Cond -> Cond -> Bool #

Eq Condition 
Instance details

Defined in Hpack.Config

Methods

(==) :: Condition -> Condition -> Bool #

(/=) :: Condition -> Condition -> Bool #

Eq CustomSetup 
Instance details

Defined in Hpack.Config

Eq CustomSetupSection 
Instance details

Defined in Hpack.Config

Methods

(==) :: CustomSetupSection -> CustomSetupSection -> Bool #

(/=) :: CustomSetupSection -> CustomSetupSection -> Bool #

Eq DecodeResult 
Instance details

Defined in Hpack.Config

Eq Empty 
Instance details

Defined in Hpack.Config

Methods

(==) :: Empty -> Empty -> Bool #

(/=) :: Empty -> Empty -> Bool #

Eq Executable 
Instance details

Defined in Hpack.Config

Eq ExecutableSection 
Instance details

Defined in Hpack.Config

Methods

(==) :: ExecutableSection -> ExecutableSection -> Bool #

(/=) :: ExecutableSection -> ExecutableSection -> Bool #

Eq Flag 
Instance details

Defined in Hpack.Config

Methods

(==) :: Flag -> Flag -> Bool #

(/=) :: Flag -> Flag -> Bool #

Eq FlagSection 
Instance details

Defined in Hpack.Config

Methods

(==) :: FlagSection -> FlagSection -> Bool #

(/=) :: FlagSection -> FlagSection -> Bool #

Eq Language 
Instance details

Defined in Hpack.Config

Eq Library 
Instance details

Defined in Hpack.Config

Methods

(==) :: Library -> Library -> Bool #

(/=) :: Library -> Library -> Bool #

Eq LibrarySection 
Instance details

Defined in Hpack.Config

Methods

(==) :: LibrarySection -> LibrarySection -> Bool #

(/=) :: LibrarySection -> LibrarySection -> Bool #

Eq Package 
Instance details

Defined in Hpack.Config

Methods

(==) :: Package -> Package -> Bool #

(/=) :: Package -> Package -> Bool #

Eq Path 
Instance details

Defined in Hpack.Config

Methods

(==) :: Path -> Path -> Bool #

(/=) :: Path -> Path -> Bool #

Eq SourceRepository 
Instance details

Defined in Hpack.Config

Eq SpecVersion 
Instance details

Defined in Hpack.Config

Methods

(==) :: SpecVersion -> SpecVersion -> Bool #

(/=) :: SpecVersion -> SpecVersion -> Bool #

Eq Verbatim 
Instance details

Defined in Hpack.Config

Eq VerbatimValue 
Instance details

Defined in Hpack.Config

Eq HpackError 
Instance details

Defined in Hpack.Error

Eq ProgramName 
Instance details

Defined in Hpack.Error

Eq Module 
Instance details

Defined in Hpack.Module

Methods

(==) :: Module -> Module -> Bool #

(/=) :: Module -> Module -> Bool #

Eq Force 
Instance details

Defined in Hpack.Options

Methods

(==) :: Force -> Force -> Bool #

(/=) :: Force -> Force -> Bool #

Eq OutputStrategy 
Instance details

Defined in Hpack.Options

Eq ParseOptions 
Instance details

Defined in Hpack.Options

Methods

(==) :: ParseOptions -> ParseOptions -> Bool #

(/=) :: ParseOptions -> ParseOptions -> Bool #

Eq ParseResult 
Instance details

Defined in Hpack.Options

Methods

(==) :: ParseResult -> ParseResult -> Bool #

(/=) :: ParseResult -> ParseResult -> Bool #

Eq Verbose 
Instance details

Defined in Hpack.Options

Methods

(==) :: Verbose -> Verbose -> Bool #

(/=) :: Verbose -> Verbose -> Bool #

Eq BuildTools 
Instance details

Defined in Hpack.Syntax.BuildTools

Methods

(==) :: BuildTools -> BuildTools -> Bool #

(/=) :: BuildTools -> BuildTools -> Bool #

Eq ParseBuildTool 
Instance details

Defined in Hpack.Syntax.BuildTools

Methods

(==) :: ParseBuildTool -> ParseBuildTool -> Bool #

(/=) :: ParseBuildTool -> ParseBuildTool -> Bool #

Eq SystemBuildTools 
Instance details

Defined in Hpack.Syntax.BuildTools

Eq Defaults 
Instance details

Defined in Hpack.Syntax.Defaults

Methods

(==) :: Defaults -> Defaults -> Bool #

(/=) :: Defaults -> Defaults -> Bool #

Eq Github 
Instance details

Defined in Hpack.Syntax.Defaults

Methods

(==) :: Github -> Github -> Bool #

(/=) :: Github -> Github -> Bool #

Eq Local 
Instance details

Defined in Hpack.Syntax.Defaults

Methods

(==) :: Local -> Local -> Bool #

(/=) :: Local -> Local -> Bool #

Eq Dependencies 
Instance details

Defined in Hpack.Syntax.Dependencies

Eq DependencyInfo 
Instance details

Defined in Hpack.Syntax.Dependencies

Eq BoxLabel 
Instance details

Defined in Trace.Hpc.Mix

Methods

(==) :: BoxLabel -> BoxLabel -> Bool #

(/=) :: BoxLabel -> BoxLabel -> Bool #

Eq CondBox 
Instance details

Defined in Trace.Hpc.Mix

Methods

(==) :: CondBox -> CondBox -> Bool #

(/=) :: CondBox -> CondBox -> Bool #

Eq Mix 
Instance details

Defined in Trace.Hpc.Mix

Methods

(==) :: Mix -> Mix -> Bool #

(/=) :: Mix -> Mix -> 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

Methods

(==) :: TixModule -> TixModule -> Bool #

(/=) :: TixModule -> TixModule -> Bool #

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 ConnHost 
Instance details

Defined in Network.HTTP.Client.Types

Methods

(==) :: ConnHost -> ConnHost -> Bool #

(/=) :: ConnHost -> ConnHost -> Bool #

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

Methods

(==) :: MaxHeaderLength -> MaxHeaderLength -> Bool #

(/=) :: MaxHeaderLength -> MaxHeaderLength -> Bool #

Eq MaxNumberHeaders 
Instance details

Defined in Network.HTTP.Client.Types

Methods

(==) :: MaxNumberHeaders -> MaxNumberHeaders -> Bool #

(/=) :: MaxNumberHeaders -> MaxNumberHeaders -> Bool #

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

Methods

(==) :: ProxySecureMode -> ProxySecureMode -> Bool #

(/=) :: ProxySecureMode -> ProxySecureMode -> Bool #

Eq ResponseTimeout 
Instance details

Defined in Network.HTTP.Client.Types

Methods

(==) :: ResponseTimeout -> ResponseTimeout -> Bool #

(/=) :: ResponseTimeout -> ResponseTimeout -> Bool #

Eq StatusHeaders 
Instance details

Defined in Network.HTTP.Client.Types

Methods

(==) :: StatusHeaders -> StatusHeaders -> Bool #

(/=) :: StatusHeaders -> StatusHeaders -> Bool #

Eq StreamFileStatus 
Instance details

Defined in Network.HTTP.Client.Types

Methods

(==) :: StreamFileStatus -> StreamFileStatus -> Bool #

(/=) :: StreamFileStatus -> StreamFileStatus -> Bool #

Eq DigestAuthExceptionDetails 
Instance details

Defined in Network.HTTP.Client.TLS

Methods

(==) :: DigestAuthExceptionDetails -> DigestAuthExceptionDetails -> Bool #

(/=) :: DigestAuthExceptionDetails -> DigestAuthExceptionDetails -> Bool #

Eq ByteRange 
Instance details

Defined in Network.HTTP.Types.Header

Methods

(==) :: ByteRange -> ByteRange -> Bool #

(/=) :: ByteRange -> ByteRange -> Bool #

Eq StdMethod 
Instance details

Defined in Network.HTTP.Types.Method

Methods

(==) :: StdMethod -> StdMethod -> Bool #

(/=) :: StdMethod -> StdMethod -> Bool #

Eq Status 
Instance details

Defined in Network.HTTP.Types.Status

Methods

(==) :: Status -> Status -> Bool #

(/=) :: Status -> Status -> Bool #

Eq EscapeItem 
Instance details

Defined in Network.HTTP.Types.URI

Methods

(==) :: EscapeItem -> EscapeItem -> Bool #

(/=) :: EscapeItem -> EscapeItem -> Bool #

Eq HttpVersion 
Instance details

Defined in Network.HTTP.Types.Version

Methods

(==) :: HttpVersion -> HttpVersion -> Bool #

(/=) :: HttpVersion -> HttpVersion -> Bool #

Eq IP 
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 Event 
Instance details

Defined in Text.Libyaml

Methods

(==) :: Event -> Event -> Bool #

(/=) :: Event -> Event -> Bool #

Eq MappingStyle 
Instance details

Defined in Text.Libyaml

Methods

(==) :: MappingStyle -> MappingStyle -> Bool #

(/=) :: MappingStyle -> MappingStyle -> Bool #

Eq SequenceStyle 
Instance details

Defined in Text.Libyaml

Methods

(==) :: SequenceStyle -> SequenceStyle -> Bool #

(/=) :: SequenceStyle -> SequenceStyle -> Bool #

Eq Style 
Instance details

Defined in Text.Libyaml

Methods

(==) :: Style -> Style -> Bool #

(/=) :: Style -> Style -> Bool #

Eq Tag 
Instance details

Defined in Text.Libyaml

Methods

(==) :: Tag -> Tag -> Bool #

(/=) :: Tag -> Tag -> Bool #

Eq Base 
Instance details

Defined in Data.ByteArray.Encoding

Methods

(==) :: Base -> Base -> Bool #

(/=) :: Base -> Base -> Bool #

Eq Endianness 
Instance details

Defined in Data.Memory.Endian

Methods

(==) :: Endianness -> Endianness -> Bool #

(/=) :: Endianness -> Endianness -> Bool #

Eq Word128 
Instance details

Defined in Data.Memory.ExtendedWords

Methods

(==) :: Word128 -> Word128 -> Bool #

(/=) :: Word128 -> Word128 -> Bool #

Eq LogLevel 
Instance details

Defined in Control.Monad.Logger

Methods

(==) :: LogLevel -> LogLevel -> Bool #

(/=) :: LogLevel -> LogLevel -> Bool #

Eq DataIdentifier 
Instance details

Defined in Text.Mustache.Internal.Types

Eq AddrInfo 
Instance details

Defined in Network.Socket.Info

Methods

(==) :: AddrInfo -> AddrInfo -> Bool #

(/=) :: AddrInfo -> AddrInfo -> Bool #

Eq AddrInfoFlag 
Instance details

Defined in Network.Socket.Info

Methods

(==) :: AddrInfoFlag -> AddrInfoFlag -> Bool #

(/=) :: AddrInfoFlag -> AddrInfoFlag -> Bool #

Eq NameInfoFlag 
Instance details

Defined in Network.Socket.Info

Methods

(==) :: NameInfoFlag -> NameInfoFlag -> Bool #

(/=) :: NameInfoFlag -> NameInfoFlag -> Bool #

Eq Family 
Instance details

Defined in Network.Socket.Types

Methods

(==) :: Family -> Family -> Bool #

(/=) :: Family -> Family -> Bool #

Eq PortNumber 
Instance details

Defined in Network.Socket.Types

Methods

(==) :: PortNumber -> PortNumber -> Bool #

(/=) :: PortNumber -> PortNumber -> Bool #

Eq SockAddr 
Instance details

Defined in Network.Socket.Types

Methods

(==) :: SockAddr -> SockAddr -> Bool #

(/=) :: SockAddr -> SockAddr -> Bool #

Eq Socket 
Instance details

Defined in Network.Socket.Types

Methods

(==) :: Socket -> Socket -> Bool #

(/=) :: Socket -> Socket -> Bool #

Eq SocketType 
Instance details

Defined in Network.Socket.Types

Methods

(==) :: SocketType -> SocketType -> Bool #

(/=) :: SocketType -> SocketType -> Bool #

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 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

Methods

(==) :: AltNodeType -> AltNodeType -> Bool #

(/=) :: AltNodeType -> AltNodeType -> Bool #

Eq ArgPolicy 
Instance details

Defined in Options.Applicative.Types

Methods

(==) :: ArgPolicy -> ArgPolicy -> Bool #

(/=) :: ArgPolicy -> ArgPolicy -> Bool #

Eq ArgumentReachability 
Instance details

Defined in Options.Applicative.Types

Methods

(==) :: ArgumentReachability -> ArgumentReachability -> Bool #

(/=) :: ArgumentReachability -> ArgumentReachability -> Bool #

Eq Backtracking 
Instance details

Defined in Options.Applicative.Types

Methods

(==) :: Backtracking -> Backtracking -> Bool #

(/=) :: Backtracking -> Backtracking -> Bool #

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

Methods

(==) :: OptVisibility -> OptVisibility -> Bool #

(/=) :: OptVisibility -> OptVisibility -> Bool #

Eq ParserPrefs 
Instance details

Defined in Options.Applicative.Types

Methods

(==) :: ParserPrefs -> ParserPrefs -> Bool #

(/=) :: ParserPrefs -> ParserPrefs -> Bool #

Eq OsChar 
Instance details

Defined in System.OsString.Internal.Types

Methods

(==) :: OsChar -> OsChar -> Bool #

(/=) :: OsChar -> OsChar -> Bool #

Eq OsString 
Instance details

Defined in System.OsString.Internal.Types

Methods

(==) :: OsString -> OsString -> Bool #

(/=) :: OsString -> OsString -> Bool #

Eq PosixChar 
Instance details

Defined in System.OsString.Internal.Types

Methods

(==) :: PosixChar -> PosixChar -> Bool #

(/=) :: PosixChar -> PosixChar -> Bool #

Eq PosixString 
Instance details

Defined in System.OsString.Internal.Types

Methods

(==) :: PosixString -> PosixString -> Bool #

(/=) :: PosixString -> PosixString -> Bool #

Eq WindowsChar 
Instance details

Defined in System.OsString.Internal.Types

Methods

(==) :: WindowsChar -> WindowsChar -> Bool #

(/=) :: WindowsChar -> WindowsChar -> Bool #

Eq WindowsString 
Instance details

Defined in System.OsString.Internal.Types

Methods

(==) :: WindowsString -> WindowsString -> Bool #

(/=) :: WindowsString -> WindowsString -> Bool #

Eq SHA256 
Instance details

Defined in Pantry.SHA256

Methods

(==) :: SHA256 -> SHA256 -> Bool #

(/=) :: SHA256 -> SHA256 -> Bool #

Eq AggregateRepo 
Instance details

Defined in Pantry.Types

Methods

(==) :: AggregateRepo -> AggregateRepo -> Bool #

(/=) :: AggregateRepo -> AggregateRepo -> Bool #

Eq Archive 
Instance details

Defined in Pantry.Types

Methods

(==) :: Archive -> Archive -> Bool #

(/=) :: Archive -> Archive -> Bool #

Eq ArchiveLocation 
Instance details

Defined in Pantry.Types

Eq BlobKey 
Instance details

Defined in Pantry.Types

Methods

(==) :: BlobKey -> BlobKey -> Bool #

(/=) :: BlobKey -> BlobKey -> Bool #

Eq BuildFile 
Instance details

Defined in Pantry.Types

Methods

(==) :: BuildFile -> BuildFile -> Bool #

(/=) :: BuildFile -> BuildFile -> Bool #

Eq CabalFileInfo 
Instance details

Defined in Pantry.Types

Eq FileSize 
Instance details

Defined in Pantry.Types

Eq FileType 
Instance details

Defined in Pantry.Types

Methods

(==) :: FileType -> FileType -> Bool #

(/=) :: FileType -> FileType -> Bool #

Eq GlobalHintsLocation 
Instance details

Defined in Pantry.Types

Eq HpackExecutable 
Instance details

Defined in Pantry.Types

Eq ModuleNameP 
Instance details

Defined in Pantry.Types

Eq OptionalSubdirs 
Instance details

Defined in Pantry.Types

Methods

(==) :: OptionalSubdirs -> OptionalSubdirs -> Bool #

(/=) :: OptionalSubdirs -> OptionalSubdirs -> Bool #

Eq PHpack 
Instance details

Defined in Pantry.Types

Methods

(==) :: PHpack -> PHpack -> Bool #

(/=) :: PHpack -> PHpack -> Bool #

Eq Package 
Instance details

Defined in Pantry.Types

Methods

(==) :: Package -> Package -> Bool #

(/=) :: Package -> Package -> Bool #

Eq PackageCabal 
Instance details

Defined in Pantry.Types

Methods

(==) :: PackageCabal -> PackageCabal -> Bool #

(/=) :: PackageCabal -> PackageCabal -> Bool #

Eq PackageIdentifierRevision 
Instance details

Defined in Pantry.Types

Eq PackageLocation 
Instance details

Defined in Pantry.Types

Eq PackageLocationImmutable 
Instance details

Defined in Pantry.Types

Eq PackageMetadata 
Instance details

Defined in Pantry.Types

Eq PackageNameP 
Instance details

Defined in Pantry.Types

Eq RawArchive 
Instance details

Defined in Pantry.Types

Eq RawPackageLocation 
Instance details

Defined in Pantry.Types

Eq RawPackageLocationImmutable 
Instance details

Defined in Pantry.Types

Eq RawPackageMetadata 
Instance details

Defined in Pantry.Types

Eq RawSnapshotLayer 
Instance details

Defined in Pantry.Types

Eq RawSnapshotLocation 
Instance details

Defined in Pantry.Types

Eq RelFilePath 
Instance details

Defined in Pantry.Types

Eq Repo 
Instance details

Defined in Pantry.Types

Methods

(==) :: Repo -> Repo -> Bool #

(/=) :: Repo -> Repo -> Bool #

Eq RepoType 
Instance details

Defined in Pantry.Types

Eq Revision 
Instance details

Defined in Pantry.Types

Eq SafeFilePath 
Instance details

Defined in Pantry.Types

Eq SimpleRepo 
Instance details

Defined in Pantry.Types

Eq SnapName 
Instance details

Defined in Pantry.Types

Eq SnapshotLayer 
Instance details

Defined in Pantry.Types

Eq SnapshotLocation 
Instance details

Defined in Pantry.Types

Eq Tree 
Instance details

Defined in Pantry.Types

Methods

(==) :: Tree -> Tree -> Bool #

(/=) :: Tree -> Tree -> Bool #

Eq TreeEntry 
Instance details

Defined in Pantry.Types

Methods

(==) :: TreeEntry -> TreeEntry -> Bool #

(/=) :: TreeEntry -> TreeEntry -> Bool #

Eq TreeKey 
Instance details

Defined in Pantry.Types

Methods

(==) :: TreeKey -> TreeKey -> Bool #

(/=) :: TreeKey -> TreeKey -> Bool #

Eq VersionP 
Instance details

Defined in Pantry.Types

Eq WantedCompiler 
Instance details

Defined in Pantry.Types

Eq Message 
Instance details

Defined in Text.Parsec.Error

Methods

(==) :: Message -> Message -> Bool #

(/=) :: Message -> Message -> Bool #

Eq ParseError 
Instance details

Defined in Text.Parsec.Error

Methods

(==) :: ParseError -> ParseError -> Bool #

(/=) :: ParseError -> ParseError -> Bool #

Eq PathException 
Instance details

Defined in Path.Posix

Methods

(==) :: PathException -> PathException -> Bool #

(/=) :: PathException -> PathException -> Bool #

Eq PathException 
Instance details

Defined in Path.Windows

Methods

(==) :: PathException -> PathException -> Bool #

(/=) :: PathException -> PathException -> Bool #

Eq OverflowNatural 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

(==) :: OverflowNatural -> OverflowNatural -> Bool #

(/=) :: OverflowNatural -> OverflowNatural -> Bool #

Eq ConstraintNameDB 
Instance details

Defined in Database.Persist.Names

Methods

(==) :: ConstraintNameDB -> ConstraintNameDB -> Bool #

(/=) :: ConstraintNameDB -> ConstraintNameDB -> Bool #

Eq ConstraintNameHS 
Instance details

Defined in Database.Persist.Names

Methods

(==) :: ConstraintNameHS -> ConstraintNameHS -> Bool #

(/=) :: ConstraintNameHS -> ConstraintNameHS -> Bool #

Eq EntityNameDB 
Instance details

Defined in Database.Persist.Names

Methods

(==) :: EntityNameDB -> EntityNameDB -> Bool #

(/=) :: EntityNameDB -> EntityNameDB -> Bool #

Eq EntityNameHS 
Instance details

Defined in Database.Persist.Names

Methods

(==) :: EntityNameHS -> EntityNameHS -> Bool #

(/=) :: EntityNameHS -> EntityNameHS -> Bool #

Eq FieldNameDB 
Instance details

Defined in Database.Persist.Names

Methods

(==) :: FieldNameDB -> FieldNameDB -> Bool #

(/=) :: FieldNameDB -> FieldNameDB -> Bool #

Eq FieldNameHS 
Instance details

Defined in Database.Persist.Names

Methods

(==) :: FieldNameHS -> FieldNameHS -> Bool #

(/=) :: FieldNameHS -> FieldNameHS -> Bool #

Eq LiteralType 
Instance details

Defined in Database.Persist.PersistValue

Methods

(==) :: LiteralType -> LiteralType -> Bool #

(/=) :: LiteralType -> LiteralType -> Bool #

Eq PersistValue 
Instance details

Defined in Database.Persist.PersistValue

Methods

(==) :: PersistValue -> PersistValue -> Bool #

(/=) :: PersistValue -> PersistValue -> Bool #

Eq ForeignFieldReference 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

(==) :: ForeignFieldReference -> ForeignFieldReference -> Bool #

(/=) :: ForeignFieldReference -> ForeignFieldReference -> Bool #

Eq Line 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

(==) :: Line -> Line -> Bool #

(/=) :: Line -> Line -> Bool #

Eq LinesWithComments 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

(==) :: LinesWithComments -> LinesWithComments -> Bool #

(/=) :: LinesWithComments -> LinesWithComments -> Bool #

Eq PrimarySpec 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

(==) :: PrimarySpec -> PrimarySpec -> Bool #

(/=) :: PrimarySpec -> PrimarySpec -> Bool #

Eq Token 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

(==) :: Token -> Token -> Bool #

(/=) :: Token -> Token -> Bool #

Eq UnboundCompositeDef 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

(==) :: UnboundCompositeDef -> UnboundCompositeDef -> Bool #

(/=) :: UnboundCompositeDef -> UnboundCompositeDef -> Bool #

Eq UnboundEntityDef 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

(==) :: UnboundEntityDef -> UnboundEntityDef -> Bool #

(/=) :: UnboundEntityDef -> UnboundEntityDef -> Bool #

Eq UnboundFieldDef 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

(==) :: UnboundFieldDef -> UnboundFieldDef -> Bool #

(/=) :: UnboundFieldDef -> UnboundFieldDef -> Bool #

Eq UnboundForeignDef 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

(==) :: UnboundForeignDef -> UnboundForeignDef -> Bool #

(/=) :: UnboundForeignDef -> UnboundForeignDef -> Bool #

Eq UnboundForeignFieldList 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

(==) :: UnboundForeignFieldList -> UnboundForeignFieldList -> Bool #

(/=) :: UnboundForeignFieldList -> UnboundForeignFieldList -> Bool #

Eq UnboundIdDef 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

(==) :: UnboundIdDef -> UnboundIdDef -> Bool #

(/=) :: UnboundIdDef -> UnboundIdDef -> Bool #

Eq IsolationLevel 
Instance details

Defined in Database.Persist.SqlBackend.Internal.IsolationLevel

Methods

(==) :: IsolationLevel -> IsolationLevel -> Bool #

(/=) :: IsolationLevel -> IsolationLevel -> Bool #

Eq CascadeAction 
Instance details

Defined in Database.Persist.Types.Base

Methods

(==) :: CascadeAction -> CascadeAction -> Bool #

(/=) :: CascadeAction -> CascadeAction -> Bool #

Eq Checkmark 
Instance details

Defined in Database.Persist.Types.Base

Methods

(==) :: Checkmark -> Checkmark -> Bool #

(/=) :: Checkmark -> Checkmark -> Bool #

Eq CompositeDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

(==) :: CompositeDef -> CompositeDef -> Bool #

(/=) :: CompositeDef -> CompositeDef -> Bool #

Eq EmbedEntityDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

(==) :: EmbedEntityDef -> EmbedEntityDef -> Bool #

(/=) :: EmbedEntityDef -> EmbedEntityDef -> Bool #

Eq EmbedFieldDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

(==) :: EmbedFieldDef -> EmbedFieldDef -> Bool #

(/=) :: EmbedFieldDef -> EmbedFieldDef -> Bool #

Eq EntityDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

(==) :: EntityDef -> EntityDef -> Bool #

(/=) :: EntityDef -> EntityDef -> Bool #

Eq EntityIdDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

(==) :: EntityIdDef -> EntityIdDef -> Bool #

(/=) :: EntityIdDef -> EntityIdDef -> Bool #

Eq FieldAttr 
Instance details

Defined in Database.Persist.Types.Base

Methods

(==) :: FieldAttr -> FieldAttr -> Bool #

(/=) :: FieldAttr -> FieldAttr -> Bool #

Eq FieldCascade 
Instance details

Defined in Database.Persist.Types.Base

Methods

(==) :: FieldCascade -> FieldCascade -> Bool #

(/=) :: FieldCascade -> FieldCascade -> Bool #

Eq FieldDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

(==) :: FieldDef -> FieldDef -> Bool #

(/=) :: FieldDef -> FieldDef -> Bool #

Eq FieldType 
Instance details

Defined in Database.Persist.Types.Base

Methods

(==) :: FieldType -> FieldType -> Bool #

(/=) :: FieldType -> FieldType -> Bool #

Eq FieldTypeLit 
Instance details

Defined in Database.Persist.Types.Base

Methods

(==) :: FieldTypeLit -> FieldTypeLit -> Bool #

(/=) :: FieldTypeLit -> FieldTypeLit -> Bool #

Eq ForeignDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

(==) :: ForeignDef -> ForeignDef -> Bool #

(/=) :: ForeignDef -> ForeignDef -> Bool #

Eq IsNullable 
Instance details

Defined in Database.Persist.Types.Base

Methods

(==) :: IsNullable -> IsNullable -> Bool #

(/=) :: IsNullable -> IsNullable -> Bool #

Eq ReferenceDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

(==) :: ReferenceDef -> ReferenceDef -> Bool #

(/=) :: ReferenceDef -> ReferenceDef -> Bool #

Eq SelfEmbed 
Instance details

Defined in Database.Persist.Types.Base

Methods

(==) :: SelfEmbed -> SelfEmbed -> Bool #

(/=) :: SelfEmbed -> SelfEmbed -> Bool #

Eq SqlType 
Instance details

Defined in Database.Persist.Types.Base

Methods

(==) :: SqlType -> SqlType -> Bool #

(/=) :: SqlType -> SqlType -> Bool #

Eq UniqueDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

(==) :: UniqueDef -> UniqueDef -> Bool #

(/=) :: UniqueDef -> UniqueDef -> Bool #

Eq WhyNullable 
Instance details

Defined in Database.Persist.Types.Base

Methods

(==) :: WhyNullable -> WhyNullable -> Bool #

(/=) :: WhyNullable -> WhyNullable -> Bool #

Eq ForeignKeyViolation 
Instance details

Defined in Database.Persist.Sqlite

Methods

(==) :: ForeignKeyViolation -> ForeignKeyViolation -> Bool #

(/=) :: ForeignKeyViolation -> ForeignKeyViolation -> Bool #

Eq ColumnType 
Instance details

Defined in Database.Sqlite

Methods

(==) :: ColumnType -> ColumnType -> Bool #

(/=) :: ColumnType -> ColumnType -> Bool #

Eq Error 
Instance details

Defined in Database.Sqlite

Methods

(==) :: Error -> Error -> Bool #

(/=) :: Error -> Error -> Bool #

Eq SqliteStatus 
Instance details

Defined in Database.Sqlite

Methods

(==) :: SqliteStatus -> SqliteStatus -> Bool #

(/=) :: SqliteStatus -> SqliteStatus -> Bool #

Eq StepResult 
Instance details

Defined in Database.Sqlite

Methods

(==) :: StepResult -> StepResult -> Bool #

(/=) :: StepResult -> StepResult -> Bool #

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

Methods

(==) :: TextDetails -> TextDetails -> Bool #

(/=) :: TextDetails -> TextDetails -> Bool #

Eq PrettyLevel 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJClass

Methods

(==) :: PrettyLevel -> PrettyLevel -> Bool #

(/=) :: PrettyLevel -> PrettyLevel -> Bool #

Eq Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Methods

(==) :: Doc -> Doc -> Bool #

(/=) :: Doc -> Doc -> Bool #

Eq PrettyLevel 
Instance details

Defined in Text.PrettyPrint.HughesPJClass

Methods

(==) :: PrettyLevel -> PrettyLevel -> Bool #

(/=) :: PrettyLevel -> PrettyLevel -> Bool #

Eq FusionDepth 
Instance details

Defined in Prettyprinter.Internal

Methods

(==) :: FusionDepth -> FusionDepth -> Bool #

(/=) :: FusionDepth -> FusionDepth -> Bool #

Eq LayoutOptions 
Instance details

Defined in Prettyprinter.Internal

Methods

(==) :: LayoutOptions -> LayoutOptions -> Bool #

(/=) :: LayoutOptions -> LayoutOptions -> Bool #

Eq PageWidth 
Instance details

Defined in Prettyprinter.Internal

Methods

(==) :: PageWidth -> PageWidth -> Bool #

(/=) :: PageWidth -> PageWidth -> Bool #

Eq AnsiStyle 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

(==) :: AnsiStyle -> AnsiStyle -> Bool #

(/=) :: AnsiStyle -> AnsiStyle -> Bool #

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

Methods

(==) :: Intensity -> Intensity -> Bool #

(/=) :: Intensity -> Intensity -> Bool #

Eq Italicized 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

(==) :: Italicized -> Italicized -> Bool #

(/=) :: Italicized -> Italicized -> Bool #

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

Methods

(==) :: Underlined -> Underlined -> Bool #

(/=) :: Underlined -> Underlined -> Bool #

Eq CmdSpec 
Instance details

Defined in System.Process.Common

Methods

(==) :: CmdSpec -> CmdSpec -> Bool #

(/=) :: CmdSpec -> CmdSpec -> Bool #

Eq CreateProcess 
Instance details

Defined in System.Process.Common

Methods

(==) :: CreateProcess -> CreateProcess -> Bool #

(/=) :: CreateProcess -> CreateProcess -> Bool #

Eq StdStream 
Instance details

Defined in System.Process.Common

Methods

(==) :: StdStream -> StdStream -> Bool #

(/=) :: StdStream -> StdStream -> Bool #

Eq CommunicationHandle 
Instance details

Defined in System.Process.CommunicationHandle.Internal

Methods

(==) :: CommunicationHandle -> CommunicationHandle -> Bool #

(/=) :: CommunicationHandle -> CommunicationHandle -> Bool #

Eq StdGen 
Instance details

Defined in System.Random.Internal

Methods

(==) :: StdGen -> StdGen -> Bool #

(/=) :: StdGen -> StdGen -> Bool #

Eq RetryAction 
Instance details

Defined in Control.Retry

Methods

(==) :: RetryAction -> RetryAction -> Bool #

(/=) :: RetryAction -> RetryAction -> Bool #

Eq RetryStatus 
Instance details

Defined in Control.Retry

Methods

(==) :: RetryStatus -> RetryStatus -> Bool #

(/=) :: RetryStatus -> RetryStatus -> Bool #

Eq LogLevel 
Instance details

Defined in RIO.Prelude.Logger

Eq ProcessException 
Instance details

Defined in RIO.Process

Methods

(==) :: ProcessException -> ProcessException -> Bool #

(/=) :: ProcessException -> ProcessException -> Bool #

Eq StylesUpdate 
Instance details

Defined in RIO.PrettyPrint.StylesUpdate

Eq Style 
Instance details

Defined in RIO.PrettyPrint.Types

Methods

(==) :: Style -> Style -> Bool #

(/=) :: Style -> Style -> Bool #

Eq AnsiAnn 
Instance details

Defined in Text.PrettyPrint.Leijen.Extended

Methods

(==) :: AnsiAnn -> AnsiAnn -> Bool #

(/=) :: AnsiAnn -> AnsiAnn -> Bool #

Eq SGRTag 
Instance details

Defined in Text.PrettyPrint.Leijen.Extended

Methods

(==) :: SGRTag -> SGRTag -> Bool #

(/=) :: SGRTag -> SGRTag -> Bool #

Eq StyleAnn 
Instance details

Defined in Text.PrettyPrint.Leijen.Extended

Methods

(==) :: StyleAnn -> StyleAnn -> Bool #

(/=) :: StyleAnn -> StyleAnn -> Bool #

Eq Scientific 
Instance details

Defined in Data.Scientific

Methods

(==) :: Scientific -> Scientific -> Bool #

(/=) :: Scientific -> Scientific -> Bool #

Eq CondensePolicy 
Instance details

Defined in Data.List.Split.Internals

Methods

(==) :: CondensePolicy -> CondensePolicy -> Bool #

(/=) :: CondensePolicy -> CondensePolicy -> Bool #

Eq DelimPolicy 
Instance details

Defined in Data.List.Split.Internals

Methods

(==) :: DelimPolicy -> DelimPolicy -> Bool #

(/=) :: DelimPolicy -> DelimPolicy -> Bool #

Eq EndPolicy 
Instance details

Defined in Data.List.Split.Internals

Methods

(==) :: EndPolicy -> EndPolicy -> Bool #

(/=) :: EndPolicy -> EndPolicy -> Bool #

Eq ActionId Source # 
Instance details

Defined in Control.Concurrent.Execute

Eq ActionType Source # 
Instance details

Defined in Control.Concurrent.Execute

Eq Concurrency Source # 
Instance details

Defined in Control.Concurrent.Execute

Eq EscapingMode Source # 
Instance details

Defined in Data.Attoparsec.Args

Eq RawTarget Source # 
Instance details

Defined in Stack.Build.Target

Eq UnresolvedComponent Source # 
Instance details

Defined in Stack.Build.Target

Eq SpecialExecCmd Source # 
Instance details

Defined in Stack.Exec

Eq Locked Source # 
Instance details

Defined in Stack.Lock

Methods

(==) :: Locked -> Locked -> Bool #

(/=) :: Locked -> Locked -> Bool #

Eq ListStylesOpts Source # 
Instance details

Defined in Stack.Ls

Eq LsView Source # 
Instance details

Defined in Stack.Ls

Methods

(==) :: LsView -> LsView -> Bool #

(/=) :: LsView -> LsView -> Bool #

Eq SnapshotOpts Source # 
Instance details

Defined in Stack.Ls

Eq GlobalOptsContext Source # 
Instance details

Defined in Stack.Options.Utils

Eq FirstFalse Source # 
Instance details

Defined in Stack.Prelude

Eq FirstTrue Source # 
Instance details

Defined in Stack.Prelude

Eq Tool Source # 
Instance details

Defined in Stack.Setup.Installed

Methods

(==) :: Tool -> Tool -> Bool #

(/=) :: Tool -> Tool -> Bool #

Eq AllowNewerDeps Source # 
Instance details

Defined in Stack.Types.AllowNewerDeps

Eq ApplyGhcOptions Source # 
Instance details

Defined in Stack.Types.ApplyGhcOptions

Eq ApplyProgOptions Source # 
Instance details

Defined in Stack.Types.ApplyProgOptions

Eq BuildCache Source # 
Instance details

Defined in Stack.Types.Build

Eq CachePkgSrc Source # 
Instance details

Defined in Stack.Types.Build

Eq ConfigCache Source # 
Instance details

Defined in Stack.Types.Build

Eq KeepOutputOpen Source # 
Instance details

Defined in Stack.Types.Build

Eq BadDependency Source # 
Instance details

Defined in Stack.Types.Build.Exception

Eq ConstructPlanException Source # 
Instance details

Defined in Stack.Types.Build.Exception

Eq BenchmarkOpts Source # 
Instance details

Defined in Stack.Types.BuildOpts

Eq HaddockOpts Source # 
Instance details

Defined in Stack.Types.BuildOpts

Eq TestOpts Source # 
Instance details

Defined in Stack.Types.BuildOpts

Eq ApplyCLIFlag Source # 
Instance details

Defined in Stack.Types.BuildOptsCLI

Eq BuildCommand Source # 
Instance details

Defined in Stack.Types.BuildOptsCLI

Eq BuildSubset Source # 
Instance details

Defined in Stack.Types.BuildOptsCLI

Eq FileWatchOpts Source # 
Instance details

Defined in Stack.Types.BuildOptsCLI

Eq CabalVerbosity Source # 
Instance details

Defined in Stack.Types.BuildOptsMonoid

Eq ProgressBarFormat Source # 
Instance details

Defined in Stack.Types.BuildOptsMonoid

Eq CabalConfigKey Source # 
Instance details

Defined in Stack.Types.CabalConfigKey

Eq Action Source # 
Instance details

Defined in Stack.Types.Cache

Methods

(==) :: Action -> Action -> Bool #

(/=) :: Action -> Action -> Bool #

Eq ConfigCacheType Source # 
Instance details

Defined in Stack.Types.Cache

Eq ColorWhen Source # 
Instance details

Defined in Stack.Types.ColorWhen

Eq ActualCompiler Source # 
Instance details

Defined in Stack.Types.Compiler

Eq WhichCompiler Source # 
Instance details

Defined in Stack.Types.Compiler

Eq StackUnqualCompName Source # 
Instance details

Defined in Stack.Types.ComponentUtils

Eq ConfigureOpts Source # 
Instance details

Defined in Stack.Types.ConfigureOpts

Eq DepLibrary Source # 
Instance details

Defined in Stack.Types.Dependency

Eq DepType Source # 
Instance details

Defined in Stack.Types.Dependency

Methods

(==) :: DepType -> DepType -> Bool #

(/=) :: DepType -> DepType -> Bool #

Eq DotPayload Source # 
Instance details

Defined in Stack.Types.DependencyTree

Eq DumpLogs Source # 
Instance details

Defined in Stack.Types.DumpLogs

Eq DumpPackage Source # 
Instance details

Defined in Stack.Types.DumpPackage

Eq SublibDump Source # 
Instance details

Defined in Stack.Types.DumpPackage

Eq EnvSettings Source # 
Instance details

Defined in Stack.Types.EnvSettings

Eq GhcOptionKey Source # 
Instance details

Defined in Stack.Types.GhcOptionKey

Eq GhcPkgId Source # 
Instance details

Defined in Stack.Types.GhcPkgId

Eq InstallLocation Source # 
Instance details

Defined in Stack.Types.Installed

Eq Installed Source # 
Instance details

Defined in Stack.Types.Installed

Eq InstalledLibraryInfo Source # 
Instance details

Defined in Stack.Types.Installed

Eq InstalledPackageLocation Source # 
Instance details

Defined in Stack.Types.Installed

Eq PackageDatabase Source # 
Instance details

Defined in Stack.Types.Installed

Eq PackageDbVariety Source # 
Instance details

Defined in Stack.Types.Installed

Eq InterfaceOpt Source # 
Instance details

Defined in Stack.Types.InterfaceOpt

Eq IsMutable Source # 
Instance details

Defined in Stack.Types.IsMutable

Eq MsysEnvironment Source # 
Instance details

Defined in Stack.Types.MsysEnvironment

Eq NamedComponent Source # 
Instance details

Defined in Stack.Types.NamedComponent

Eq NixOptsMonoid Source # 
Instance details

Defined in Stack.Types.Nix

Eq ExeName Source # 
Instance details

Defined in Stack.Types.Package

Methods

(==) :: ExeName -> ExeName -> Bool #

(/=) :: ExeName -> ExeName -> Bool #

Eq FileCacheInfo Source # 
Instance details

Defined in Stack.Types.Package

Eq Package Source #

Compares the package name.

Instance details

Defined in Stack.Types.Package

Methods

(==) :: Package -> Package -> Bool #

(/=) :: Package -> Package -> Bool #

Eq DotCabalDescriptor Source # 
Instance details

Defined in Stack.Types.PackageFile

Eq DotCabalPath Source # 
Instance details

Defined in Stack.Types.PackageFile

Eq PvpBounds Source # 
Instance details

Defined in Stack.Types.PvpBounds

Eq PvpBoundsType Source # 
Instance details

Defined in Stack.Types.PvpBounds

Eq GlobalPackage Source # 
Instance details

Defined in Stack.Types.SourceMap

Eq PackageType Source # 
Instance details

Defined in Stack.Types.SourceMap

Eq RepoService Source # 
Instance details

Defined in Stack.Types.TemplateName

Eq RepoTemplatePath Source # 
Instance details

Defined in Stack.Types.TemplateName

Eq TemplateName Source # 
Instance details

Defined in Stack.Types.TemplateName

Eq TemplatePath Source # 
Instance details

Defined in Stack.Types.TemplateName

Eq FlagSource Source # 
Instance details

Defined in Stack.Types.UnusedFlags

Eq UnusedFlags Source # 
Instance details

Defined in Stack.Types.UnusedFlags

Eq VersionCheck Source # 
Instance details

Defined in Stack.Types.Version

Eq HackageAuth Source # 
Instance details

Defined in Stack.Upload

Eq HackageCreds Source # 
Instance details

Defined in Stack.Upload

Eq HackageKey Source # 
Instance details

Defined in Stack.Upload

Eq Bytes128 
Instance details

Defined in Data.StaticBytes

Eq Bytes16 
Instance details

Defined in Data.StaticBytes

Methods

(==) :: Bytes16 -> Bytes16 -> Bool #

(/=) :: Bytes16 -> Bytes16 -> Bool #

Eq Bytes32 
Instance details

Defined in Data.StaticBytes

Methods

(==) :: Bytes32 -> Bytes32 -> Bool #

(/=) :: Bytes32 -> Bytes32 -> Bool #

Eq Bytes64 
Instance details

Defined in Data.StaticBytes

Methods

(==) :: Bytes64 -> Bytes64 -> Bool #

(/=) :: Bytes64 -> Bytes64 -> Bool #

Eq Bytes8 
Instance details

Defined in Data.StaticBytes

Methods

(==) :: Bytes8 -> Bytes8 -> Bool #

(/=) :: Bytes8 -> Bytes8 -> Bool #

Eq StaticBytesException 
Instance details

Defined in Data.StaticBytes

Eq TSem 
Instance details

Defined in Control.Concurrent.STM.TSem

Methods

(==) :: TSem -> TSem -> Bool #

(/=) :: TSem -> TSem -> Bool #

Eq FormatError 
Instance details

Defined in Codec.Archive.Tar.Read

Methods

(==) :: FormatError -> FormatError -> Bool #

(/=) :: FormatError -> FormatError -> Bool #

Eq Format 
Instance details

Defined in Codec.Archive.Tar.Types

Methods

(==) :: Format -> Format -> Bool #

(/=) :: Format -> Format -> Bool #

Eq LinkTarget 
Instance details

Defined in Codec.Archive.Tar.Types

Methods

(==) :: LinkTarget -> LinkTarget -> Bool #

(/=) :: LinkTarget -> LinkTarget -> Bool #

Eq Ownership 
Instance details

Defined in Codec.Archive.Tar.Types

Methods

(==) :: Ownership -> Ownership -> Bool #

(/=) :: Ownership -> Ownership -> Bool #

Eq TarPath 
Instance details

Defined in Codec.Archive.Tar.Types

Methods

(==) :: TarPath -> TarPath -> Bool #

(/=) :: TarPath -> TarPath -> Bool #

Eq FileInfo 
Instance details

Defined in Data.Conduit.Tar.Types

Methods

(==) :: FileInfo -> FileInfo -> Bool #

(/=) :: FileInfo -> FileInfo -> Bool #

Eq FileType 
Instance details

Defined in Data.Conduit.Tar.Types

Methods

(==) :: FileType -> FileType -> Bool #

(/=) :: FileType -> FileType -> Bool #

Eq AnnLookup 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: AnnLookup -> AnnLookup -> Bool #

(/=) :: AnnLookup -> AnnLookup -> Bool #

Eq AnnTarget 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: AnnTarget -> AnnTarget -> Bool #

(/=) :: AnnTarget -> AnnTarget -> Bool #

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

Methods

(==) :: Callconv -> Callconv -> Bool #

(/=) :: Callconv -> Callconv -> Bool #

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

Methods

(==) :: DecidedStrictness -> DecidedStrictness -> Bool #

(/=) :: DecidedStrictness -> DecidedStrictness -> Bool #

Eq DerivClause 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: DerivClause -> DerivClause -> Bool #

(/=) :: DerivClause -> DerivClause -> Bool #

Eq DerivStrategy 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: DerivStrategy -> DerivStrategy -> Bool #

(/=) :: DerivStrategy -> DerivStrategy -> Bool #

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

Methods

(==) :: FamilyResultSig -> FamilyResultSig -> Bool #

(/=) :: FamilyResultSig -> FamilyResultSig -> Bool #

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

Methods

(==) :: FixityDirection -> FixityDirection -> Bool #

(/=) :: FixityDirection -> FixityDirection -> Bool #

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

Methods

(==) :: InjectivityAnn -> InjectivityAnn -> Bool #

(/=) :: InjectivityAnn -> InjectivityAnn -> Bool #

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

Methods

(==) :: ModuleInfo -> ModuleInfo -> Bool #

(/=) :: ModuleInfo -> ModuleInfo -> Bool #

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

Methods

(==) :: NameFlavour -> NameFlavour -> Bool #

(/=) :: NameFlavour -> NameFlavour -> Bool #

Eq NameSpace 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: NameSpace -> NameSpace -> Bool #

(/=) :: NameSpace -> NameSpace -> Bool #

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

Methods

(==) :: PatSynArgs -> PatSynArgs -> Bool #

(/=) :: PatSynArgs -> PatSynArgs -> Bool #

Eq PatSynDir 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: PatSynDir -> PatSynDir -> Bool #

(/=) :: PatSynDir -> PatSynDir -> Bool #

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

Methods

(==) :: RuleBndr -> RuleBndr -> Bool #

(/=) :: RuleBndr -> RuleBndr -> Bool #

Eq RuleMatch 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: RuleMatch -> RuleMatch -> Bool #

(/=) :: RuleMatch -> RuleMatch -> Bool #

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

Methods

(==) :: SourceStrictness -> SourceStrictness -> Bool #

(/=) :: SourceStrictness -> SourceStrictness -> Bool #

Eq SourceUnpackedness 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: SourceUnpackedness -> SourceUnpackedness -> Bool #

(/=) :: SourceUnpackedness -> SourceUnpackedness -> Bool #

Eq Specificity 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(==) :: Specificity -> Specificity -> Bool #

(/=) :: Specificity -> Specificity -> Bool #

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

Methods

(==) :: TySynEqn -> TySynEqn -> Bool #

(/=) :: TySynEqn -> TySynEqn -> Bool #

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

Methods

(==) :: TypeFamilyHead -> TypeFamilyHead -> Bool #

(/=) :: TypeFamilyHead -> TypeFamilyHead -> Bool #

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

Methods

(==) :: Utf8State -> Utf8State -> Bool #

(/=) :: Utf8State -> Utf8State -> Bool #

Eq DecoderState 
Instance details

Defined in Data.Text.Internal.Encoding.Utf8

Methods

(==) :: DecoderState -> DecoderState -> Bool #

(/=) :: DecoderState -> DecoderState -> Bool #

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

Methods

(==) :: ShortText -> ShortText -> Bool #

(/=) :: ShortText -> ShortText -> Bool #

Eq ConstructorInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

(==) :: ConstructorInfo -> ConstructorInfo -> Bool #

(/=) :: ConstructorInfo -> ConstructorInfo -> Bool #

Eq ConstructorVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

(==) :: ConstructorVariant -> ConstructorVariant -> Bool #

(/=) :: ConstructorVariant -> ConstructorVariant -> Bool #

Eq DatatypeInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

(==) :: DatatypeInfo -> DatatypeInfo -> Bool #

(/=) :: DatatypeInfo -> DatatypeInfo -> Bool #

Eq DatatypeVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

(==) :: DatatypeVariant -> DatatypeVariant -> Bool #

(/=) :: DatatypeVariant -> DatatypeVariant -> Bool #

Eq FieldStrictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

(==) :: FieldStrictness -> FieldStrictness -> Bool #

(/=) :: FieldStrictness -> FieldStrictness -> Bool #

Eq Strictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

(==) :: Strictness -> Strictness -> Bool #

(/=) :: Strictness -> Strictness -> Bool #

Eq Unpackedness 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

(==) :: Unpackedness -> Unpackedness -> Bool #

(/=) :: Unpackedness -> Unpackedness -> Bool #

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

Methods

(==) :: QuarterOfYear -> QuarterOfYear -> Bool #

(/=) :: QuarterOfYear -> QuarterOfYear -> Bool #

Eq FirstWeekType 
Instance details

Defined in Data.Time.Calendar.WeekDate

Methods

(==) :: FirstWeekType -> FirstWeekType -> Bool #

(/=) :: FirstWeekType -> FirstWeekType -> Bool #

Eq DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Methods

(==) :: DiffTime -> DiffTime -> Bool #

(/=) :: DiffTime -> DiffTime -> Bool #

Eq NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Methods

(==) :: NominalDiffTime -> NominalDiffTime -> Bool #

(/=) :: NominalDiffTime -> NominalDiffTime -> Bool #

Eq UTCTime 
Instance details

Defined in Data.Time.Clock.Internal.UTCTime

Methods

(==) :: UTCTime -> UTCTime -> Bool #

(/=) :: UTCTime -> UTCTime -> Bool #

Eq TimeLocale 
Instance details

Defined in Data.Time.Format.Locale

Methods

(==) :: TimeLocale -> TimeLocale -> Bool #

(/=) :: TimeLocale -> TimeLocale -> Bool #

Eq LocalTime 
Instance details

Defined in Data.Time.LocalTime.Internal.LocalTime

Methods

(==) :: LocalTime -> LocalTime -> Bool #

(/=) :: LocalTime -> LocalTime -> Bool #

Eq Group 
Instance details

Defined in Network.TLS.Crypto.Types

Methods

(==) :: Group -> Group -> Bool #

(/=) :: Group -> Group -> Bool #

Eq KeyExchangeSignatureAlg 
Instance details

Defined in Network.TLS.Crypto.Types

Methods

(==) :: KeyExchangeSignatureAlg -> KeyExchangeSignatureAlg -> Bool #

(/=) :: KeyExchangeSignatureAlg -> KeyExchangeSignatureAlg -> Bool #

Eq Direction 
Instance details

Defined in Network.TLS.Types

Methods

(==) :: Direction -> Direction -> Bool #

(/=) :: Direction -> Direction -> Bool #

Eq Role 
Instance details

Defined in Network.TLS.Types

Methods

(==) :: Role -> Role -> Bool #

(/=) :: Role -> Role -> Bool #

Eq SessionData 
Instance details

Defined in Network.TLS.Types

Methods

(==) :: SessionData -> SessionData -> Bool #

(/=) :: SessionData -> SessionData -> Bool #

Eq SessionFlag 
Instance details

Defined in Network.TLS.Types

Methods

(==) :: SessionFlag -> SessionFlag -> Bool #

(/=) :: SessionFlag -> SessionFlag -> Bool #

Eq TLS13TicketInfo 
Instance details

Defined in Network.TLS.Types

Methods

(==) :: TLS13TicketInfo -> TLS13TicketInfo -> Bool #

(/=) :: TLS13TicketInfo -> TLS13TicketInfo -> Bool #

Eq Version 
Instance details

Defined in Network.TLS.Types

Methods

(==) :: Version -> Version -> Bool #

(/=) :: Version -> Version -> Bool #

Eq Advice 
Instance details

Defined in System.Posix.Fcntl

Methods

(==) :: Advice -> Advice -> Bool #

(/=) :: Advice -> Advice -> Bool #

Eq CAttributes 
Instance details

Defined in System.Posix.Files.Common

Methods

(==) :: CAttributes -> CAttributes -> Bool #

(/=) :: CAttributes -> CAttributes -> Bool #

Eq StatxFlags 
Instance details

Defined in System.Posix.Files.Common

Methods

(==) :: StatxFlags -> StatxFlags -> Bool #

(/=) :: StatxFlags -> StatxFlags -> Bool #

Eq StatxMask 
Instance details

Defined in System.Posix.Files.Common

Methods

(==) :: StatxMask -> StatxMask -> Bool #

(/=) :: StatxMask -> StatxMask -> Bool #

Eq ProcessStatus 
Instance details

Defined in System.Posix.Process.Internals

Methods

(==) :: ProcessStatus -> ProcessStatus -> Bool #

(/=) :: ProcessStatus -> ProcessStatus -> Bool #

Eq Resource 
Instance details

Defined in System.Posix.Resource

Methods

(==) :: Resource -> Resource -> Bool #

(/=) :: Resource -> Resource -> Bool #

Eq ResourceLimit 
Instance details

Defined in System.Posix.Resource

Methods

(==) :: ResourceLimit -> ResourceLimit -> Bool #

(/=) :: ResourceLimit -> ResourceLimit -> Bool #

Eq ResourceLimits 
Instance details

Defined in System.Posix.Resource

Methods

(==) :: ResourceLimits -> ResourceLimits -> Bool #

(/=) :: ResourceLimits -> ResourceLimits -> Bool #

Eq GroupEntry 
Instance details

Defined in System.Posix.User.Common

Methods

(==) :: GroupEntry -> GroupEntry -> Bool #

(/=) :: GroupEntry -> GroupEntry -> Bool #

Eq UserEntry 
Instance details

Defined in System.Posix.User.Common

Methods

(==) :: UserEntry -> UserEntry -> Bool #

(/=) :: UserEntry -> UserEntry -> Bool #

Eq UnixDiffTime 
Instance details

Defined in Data.UnixTime.Types

Methods

(==) :: UnixDiffTime -> UnixDiffTime -> Bool #

(/=) :: UnixDiffTime -> UnixDiffTime -> Bool #

Eq UnixTime 
Instance details

Defined in Data.UnixTime.Types

Methods

(==) :: UnixTime -> UnixTime -> Bool #

(/=) :: UnixTime -> UnixTime -> Bool #

Eq StringException 
Instance details

Defined in UnliftIO.Exception

Eq ConcException 
Instance details

Defined in UnliftIO.Internals.Async

Eq SubHashPath 
Instance details

Defined in Data.HashMap.Internal.Debug

Methods

(==) :: SubHashPath -> SubHashPath -> Bool #

(/=) :: SubHashPath -> SubHashPath -> Bool #

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

Methods

(==) :: UnpackedUUID -> UnpackedUUID -> Bool #

(/=) :: UnpackedUUID -> UnpackedUUID -> Bool #

Eq Size 
Instance details

Defined in Data.Vector.Fusion.Bundle.Size

Methods

(==) :: Size -> Size -> Bool #

(/=) :: Size -> Size -> Bool #

Eq Checks 
Instance details

Defined in Data.Vector.Internal.Check

Methods

(==) :: Checks -> Checks -> Bool #

(/=) :: Checks -> Checks -> Bool #

Eq Warning 
Instance details

Defined in Data.Yaml.Internal

Methods

(==) :: Warning -> Warning -> Bool #

(/=) :: Warning -> Warning -> Bool #

Eq CompressParams 
Instance details

Defined in Codec.Compression.Zlib.Internal

Methods

(==) :: CompressParams -> CompressParams -> Bool #

(/=) :: CompressParams -> CompressParams -> Bool #

Eq DecompressError 
Instance details

Defined in Codec.Compression.Zlib.Internal

Methods

(==) :: DecompressError -> DecompressError -> Bool #

(/=) :: DecompressError -> DecompressError -> Bool #

Eq DecompressParams 
Instance details

Defined in Codec.Compression.Zlib.Internal

Methods

(==) :: DecompressParams -> DecompressParams -> Bool #

(/=) :: DecompressParams -> DecompressParams -> Bool #

Eq CompressionLevel 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

(==) :: CompressionLevel -> CompressionLevel -> Bool #

(/=) :: CompressionLevel -> CompressionLevel -> Bool #

Eq CompressionStrategy 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

(==) :: CompressionStrategy -> CompressionStrategy -> Bool #

(/=) :: CompressionStrategy -> CompressionStrategy -> Bool #

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

Methods

(==) :: MemoryLevel -> MemoryLevel -> Bool #

(/=) :: MemoryLevel -> MemoryLevel -> Bool #

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

Methods

(==) :: WindowBits -> WindowBits -> Bool #

(/=) :: WindowBits -> WindowBits -> Bool #

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 
Instance details

Defined in GHC.Classes

Methods

(==) :: Double -> Double -> Bool #

(/=) :: Double -> Double -> Bool #

Eq Float 
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 (Flag a) 
Instance details

Defined in Distribution.Simple.Flag

Methods

(==) :: Flag a -> Flag a -> Bool #

(/=) :: Flag a -> Flag a -> Bool #

Eq a => Eq (GlobResult a) 
Instance details

Defined in Distribution.Simple.Glob

Methods

(==) :: GlobResult a -> GlobResult a -> Bool #

(/=) :: GlobResult a -> GlobResult a -> Bool #

Eq dir => Eq (InstallDirs dir) 
Instance details

Defined in Distribution.Simple.InstallDirs

Methods

(==) :: InstallDirs dir -> InstallDirs dir -> Bool #

(/=) :: InstallDirs dir -> InstallDirs dir -> Bool #

Eq a => Eq (PackageIndex a) 
Instance details

Defined in Distribution.Simple.PackageIndex

Methods

(==) :: PackageIndex a -> PackageIndex a -> Bool #

(/=) :: PackageIndex a -> PackageIndex a -> Bool #

Eq id => Eq (AnnotatedId id) 
Instance details

Defined in Distribution.Types.AnnotatedId

Methods

(==) :: AnnotatedId id -> AnnotatedId id -> Bool #

(/=) :: AnnotatedId id -> AnnotatedId id -> Bool #

Eq a => Eq (NubList a) 
Instance details

Defined in Distribution.Utils.NubList

Methods

(==) :: NubList a -> NubList a -> Bool #

(/=) :: NubList a -> NubList a -> Bool #

Eq a => Eq (NubListR a) 
Instance details

Defined in Distribution.Utils.NubList

Methods

(==) :: NubListR a -> NubListR a -> Bool #

(/=) :: NubListR a -> NubListR a -> Bool #

(Eq (Key a), Eq a) => Eq (Graph a) 
Instance details

Defined in Distribution.Compat.Graph

Methods

(==) :: Graph a -> Graph a -> Bool #

(/=) :: Graph a -> Graph a -> Bool #

Eq a => Eq (NonEmptySet a) 
Instance details

Defined in Distribution.Compat.NonEmptySet

Methods

(==) :: NonEmptySet a -> NonEmptySet a -> Bool #

(/=) :: NonEmptySet a -> NonEmptySet a -> Bool #

Eq a => Eq (First' a) 
Instance details

Defined in Distribution.Compat.Semigroup

Methods

(==) :: First' a -> First' a -> Bool #

(/=) :: First' a -> First' a -> Bool #

Eq a => Eq (Last' a) 
Instance details

Defined in Distribution.Compat.Semigroup

Methods

(==) :: Last' a -> Last' a -> Bool #

(/=) :: Last' a -> Last' a -> Bool #

Eq a => Eq (Option' a) 
Instance details

Defined in Distribution.Compat.Semigroup

Methods

(==) :: Option' a -> Option' a -> Bool #

(/=) :: Option' a -> Option' a -> Bool #

Eq v => Eq (PerCompilerFlavor v) 
Instance details

Defined in Distribution.Compiler

Methods

(==) :: PerCompilerFlavor v -> PerCompilerFlavor v -> Bool #

(/=) :: PerCompilerFlavor v -> PerCompilerFlavor v -> Bool #

Eq ann => Eq (NamelessField ann) 
Instance details

Defined in Distribution.FieldGrammar.Parsec

Methods

(==) :: NamelessField ann -> NamelessField ann -> Bool #

(/=) :: NamelessField ann -> NamelessField ann -> Bool #

Eq ann => Eq (Section ann) 
Instance details

Defined in Distribution.FieldGrammar.Parsec

Methods

(==) :: Section ann -> Section ann -> Bool #

(/=) :: Section ann -> Section ann -> Bool #

Eq ann => Eq (Field ann) 
Instance details

Defined in Distribution.Fields.Field

Methods

(==) :: Field ann -> Field ann -> Bool #

(/=) :: Field ann -> Field ann -> Bool #

Eq ann => Eq (FieldLine ann) 
Instance details

Defined in Distribution.Fields.Field

Methods

(==) :: FieldLine ann -> FieldLine ann -> Bool #

(/=) :: FieldLine ann -> FieldLine ann -> Bool #

Eq ann => Eq (Name ann) 
Instance details

Defined in Distribution.Fields.Field

Methods

(==) :: Name ann -> Name ann -> Bool #

(/=) :: Name ann -> Name ann -> Bool #

Eq ann => Eq (SectionArg ann) 
Instance details

Defined in Distribution.Fields.Field

Methods

(==) :: SectionArg ann -> SectionArg ann -> Bool #

(/=) :: SectionArg ann -> SectionArg ann -> Bool #

Eq c => Eq (Condition c) 
Instance details

Defined in Distribution.Types.Condition

Methods

(==) :: Condition c -> Condition c -> Bool #

(/=) :: Condition c -> Condition c -> Bool #

Eq a => Eq (VersionRangeF a) 
Instance details

Defined in Distribution.Types.VersionRange.Internal

Methods

(==) :: VersionRangeF a -> VersionRangeF a -> Bool #

(/=) :: VersionRangeF a -> VersionRangeF 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 (Async a) 
Instance details

Defined in Control.Concurrent.Async.Internal

Methods

(==) :: Async a -> Async a -> Bool #

(/=) :: Async a -> Async a -> Bool #

Eq a => Eq (ZipList a) 
Instance details

Defined in Control.Applicative

Methods

(==) :: ZipList a -> ZipList a -> Bool #

(/=) :: ZipList a -> ZipList a -> Bool #

Eq (Chan a) 
Instance details

Defined in Control.Concurrent.Chan

Methods

(==) :: Chan a -> Chan a -> Bool #

(/=) :: Chan a -> Chan a -> Bool #

Eq (MutableByteArray s) 
Instance details

Defined in Data.Array.Byte

Methods

(==) :: MutableByteArray s -> MutableByteArray s -> Bool #

(/=) :: MutableByteArray s -> MutableByteArray s -> Bool #

Eq a => Eq (And a) 
Instance details

Defined in Data.Bits

Methods

(==) :: And a -> And a -> Bool #

(/=) :: And a -> And a -> Bool #

Eq a => Eq (Iff a) 
Instance details

Defined in Data.Bits

Methods

(==) :: Iff a -> Iff a -> Bool #

(/=) :: Iff a -> Iff a -> Bool #

Eq a => Eq (Ior a) 
Instance details

Defined in Data.Bits

Methods

(==) :: Ior a -> Ior a -> Bool #

(/=) :: Ior a -> Ior a -> Bool #

Eq a => Eq (Xor a) 
Instance details

Defined in Data.Bits

Methods

(==) :: Xor a -> Xor a -> Bool #

(/=) :: Xor a -> Xor a -> Bool #

Eq a => Eq (Complex a) 
Instance details

Defined in Data.Complex

Methods

(==) :: Complex a -> Complex a -> Bool #

(/=) :: Complex a -> Complex a -> Bool #

Eq a => Eq (Identity a) 
Instance details

Defined in Data.Functor.Identity

Methods

(==) :: Identity a -> Identity a -> Bool #

(/=) :: Identity a -> Identity a -> Bool #

Eq a => Eq (First a) 
Instance details

Defined in Data.Monoid

Methods

(==) :: First a -> First a -> Bool #

(/=) :: First a -> First a -> Bool #

Eq a => Eq (Last a) 
Instance details

Defined in Data.Monoid

Methods

(==) :: Last a -> Last a -> Bool #

(/=) :: Last a -> Last a -> Bool #

Eq a => Eq (Down a) 
Instance details

Defined in Data.Ord

Methods

(==) :: Down a -> Down a -> Bool #

(/=) :: Down a -> Down a -> Bool #

Eq a => Eq (First a) 
Instance details

Defined in Data.Semigroup

Methods

(==) :: First a -> First a -> Bool #

(/=) :: First a -> First a -> Bool #

Eq a => Eq (Last a) 
Instance details

Defined in Data.Semigroup

Methods

(==) :: Last a -> Last a -> Bool #

(/=) :: Last a -> Last a -> Bool #

Eq a => Eq (Max a) 
Instance details

Defined in Data.Semigroup

Methods

(==) :: Max a -> Max a -> Bool #

(/=) :: Max a -> Max a -> Bool #

Eq a => Eq (Min a) 
Instance details

Defined in Data.Semigroup

Methods

(==) :: Min a -> Min a -> Bool #

(/=) :: Min a -> Min a -> Bool #

Eq m => Eq (WrappedMonoid m) 
Instance details

Defined in Data.Semigroup

Methods

(==) :: WrappedMonoid m -> WrappedMonoid m -> Bool #

(/=) :: WrappedMonoid m -> WrappedMonoid m -> Bool #

Eq a => Eq (Dual a) 
Instance details

Defined in Data.Semigroup.Internal

Methods

(==) :: Dual a -> Dual a -> Bool #

(/=) :: Dual a -> Dual a -> Bool #

Eq a => Eq (Product a) 
Instance details

Defined in Data.Semigroup.Internal

Methods

(==) :: Product a -> Product a -> Bool #

(/=) :: Product a -> Product a -> Bool #

Eq a => Eq (Sum a) 
Instance details

Defined in Data.Semigroup.Internal

Methods

(==) :: Sum a -> Sum a -> Bool #

(/=) :: Sum a -> Sum a -> Bool #

Eq (ConstPtr a) 
Instance details

Defined in Foreign.C.ConstPtr

Methods

(==) :: ConstPtr a -> ConstPtr a -> Bool #

(/=) :: ConstPtr a -> ConstPtr a -> Bool #

Eq a => Eq (NonEmpty a) 
Instance details

Defined in GHC.Base

Methods

(==) :: NonEmpty a -> NonEmpty a -> Bool #

(/=) :: NonEmpty a -> NonEmpty a -> Bool #

Eq (TVar a) 
Instance details

Defined in GHC.Conc.Sync

Methods

(==) :: TVar a -> TVar a -> Bool #

(/=) :: TVar a -> TVar a -> Bool #

Eq (ForeignPtr a) 
Instance details

Defined in GHC.ForeignPtr

Methods

(==) :: ForeignPtr a -> ForeignPtr a -> Bool #

(/=) :: ForeignPtr a -> ForeignPtr a -> Bool #

Eq p => Eq (Par1 p) 
Instance details

Defined in GHC.Generics

Methods

(==) :: Par1 p -> Par1 p -> Bool #

(/=) :: Par1 p -> Par1 p -> Bool #

Eq (IOPort a) 
Instance details

Defined in GHC.IOPort

Methods

(==) :: IOPort a -> IOPort a -> Bool #

(/=) :: IOPort a -> IOPort a -> Bool #

Eq (IORef a) 
Instance details

Defined in GHC.IORef

Methods

(==) :: IORef a -> IORef a -> Bool #

(/=) :: IORef a -> IORef a -> Bool #

Eq (MVar a) 
Instance details

Defined in GHC.MVar

Methods

(==) :: MVar a -> MVar a -> Bool #

(/=) :: MVar a -> MVar a -> Bool #

Eq (FunPtr a) 
Instance details

Defined in GHC.Ptr

Methods

(==) :: FunPtr a -> FunPtr a -> Bool #

(/=) :: FunPtr a -> FunPtr a -> Bool #

Eq (Ptr a) 
Instance details

Defined in GHC.Ptr

Methods

(==) :: Ptr a -> Ptr a -> Bool #

(/=) :: Ptr a -> Ptr a -> Bool #

Eq a => Eq (Ratio a) 
Instance details

Defined in GHC.Real

Methods

(==) :: Ratio a -> Ratio a -> Bool #

(/=) :: Ratio a -> Ratio a -> Bool #

Eq (StablePtr a) 
Instance details

Defined in GHC.Stable

Methods

(==) :: StablePtr a -> StablePtr a -> Bool #

(/=) :: StablePtr a -> StablePtr a -> Bool #

Eq (StableName a) 
Instance details

Defined in GHC.StableName

Methods

(==) :: StableName a -> StableName a -> Bool #

(/=) :: StableName a -> StableName a -> Bool #

Eq (SChar c) 
Instance details

Defined in GHC.TypeLits

Methods

(==) :: SChar c -> SChar c -> Bool #

(/=) :: SChar c -> SChar c -> Bool #

Eq (SSymbol s) 
Instance details

Defined in GHC.TypeLits

Methods

(==) :: SSymbol s -> SSymbol s -> Bool #

(/=) :: SSymbol s -> SSymbol s -> Bool #

Eq (SNat n) 
Instance details

Defined in GHC.TypeNats

Methods

(==) :: SNat n -> SNat n -> Bool #

(/=) :: SNat n -> SNat n -> Bool #

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 s => Eq (CI s) 
Instance details

Defined in Data.CaseInsensitive.Internal

Methods

(==) :: CI s -> CI s -> Bool #

(/=) :: CI s -> CI s -> Bool #

Eq a => Eq (AlphaColour a) 
Instance details

Defined in Data.Colour.Internal

Methods

(==) :: AlphaColour a -> AlphaColour a -> Bool #

(/=) :: AlphaColour a -> AlphaColour a -> Bool #

Eq a => Eq (Colour a) 
Instance details

Defined in Data.Colour.Internal

Methods

(==) :: Colour a -> Colour a -> Bool #

(/=) :: Colour a -> Colour a -> 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) 
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

Methods

(==) :: Intersection a -> Intersection a -> Bool #

(/=) :: Intersection a -> Intersection a -> Bool #

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 (MiyaguchiPreneel a) 
Instance details

Defined in Crypto.ConstructHash.MiyaguchiPreneel

Methods

(==) :: MiyaguchiPreneel a -> MiyaguchiPreneel a -> Bool #

(/=) :: MiyaguchiPreneel a -> MiyaguchiPreneel a -> Bool #

Eq a => Eq (CryptoFailable a) 
Instance details

Defined in Crypto.Error.Types

Methods

(==) :: CryptoFailable a -> CryptoFailable a -> Bool #

(/=) :: CryptoFailable a -> CryptoFailable a -> Bool #

Eq (Digest a) 
Instance details

Defined in Crypto.Hash.Types

Methods

(==) :: Digest a -> Digest a -> Bool #

(/=) :: Digest a -> Digest a -> Bool #

Eq (PRK a) 
Instance details

Defined in Crypto.KDF.HKDF

Methods

(==) :: PRK a -> PRK a -> Bool #

(/=) :: PRK a -> PRK a -> Bool #

Eq (CMAC a) 
Instance details

Defined in Crypto.MAC.CMAC

Methods

(==) :: CMAC a -> CMAC a -> Bool #

(/=) :: CMAC a -> CMAC a -> Bool #

Eq (HMAC a) 
Instance details

Defined in Crypto.MAC.HMAC

Methods

(==) :: HMAC a -> HMAC a -> Bool #

(/=) :: HMAC a -> HMAC a -> Bool #

Eq (KMAC a) 
Instance details

Defined in Crypto.MAC.KMAC

Methods

(==) :: KMAC a -> KMAC a -> Bool #

(/=) :: KMAC a -> KMAC a -> Bool #

Eq (KeyedBlake2 a) 
Instance details

Defined in Crypto.MAC.KeyedBlake2

Methods

(==) :: KeyedBlake2 a -> KeyedBlake2 a -> Bool #

(/=) :: KeyedBlake2 a -> KeyedBlake2 a -> Bool #

Eq (Scalar curve) => Eq (Signature curve) 
Instance details

Defined in Crypto.PubKey.ECDSA

Methods

(==) :: Signature curve -> Signature curve -> Bool #

(/=) :: Signature curve -> Signature curve -> Bool #

Eq (SecretKey curve) 
Instance details

Defined in Crypto.PubKey.EdDSA

Methods

(==) :: SecretKey curve -> SecretKey curve -> Bool #

(/=) :: SecretKey curve -> SecretKey curve -> 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 (Key typ) 
Instance details

Defined in Hackage.Security.Key

Methods

(==) :: Key typ -> Key typ -> Bool #

(/=) :: Key typ -> Key typ -> Bool #

Eq (KeyType typ) 
Instance details

Defined in Hackage.Security.Key

Methods

(==) :: KeyType typ -> KeyType typ -> Bool #

(/=) :: KeyType typ -> KeyType typ -> Bool #

Eq (PrivateKey typ) 
Instance details

Defined in Hackage.Security.Key

Methods

(==) :: PrivateKey typ -> PrivateKey typ -> Bool #

(/=) :: PrivateKey typ -> PrivateKey typ -> Bool #

Eq (PublicKey typ) 
Instance details

Defined in Hackage.Security.Key

Methods

(==) :: PublicKey typ -> PublicKey typ -> Bool #

(/=) :: PublicKey typ -> PublicKey typ -> Bool #

Eq (Pattern typ) 
Instance details

Defined in Hackage.Security.TUF.Patterns

Methods

(==) :: Pattern typ -> Pattern typ -> Bool #

(/=) :: Pattern typ -> Pattern typ -> Bool #

Eq (Replacement typ) 
Instance details

Defined in Hackage.Security.TUF.Patterns

Methods

(==) :: Replacement typ -> Replacement typ -> Bool #

(/=) :: Replacement typ -> Replacement typ -> Bool #

Eq a => Eq (Hashed a) 
Instance details

Defined in Data.Hashable.Class

Methods

(==) :: Hashed a -> Hashed a -> Bool #

(/=) :: Hashed a -> Hashed a -> Bool #

Eq a => Eq (List a) 
Instance details

Defined in Data.Aeson.Config.Types

Methods

(==) :: List a -> List a -> Bool #

(/=) :: List a -> List a -> Bool #

Eq a => Eq (Conditional a) 
Instance details

Defined in Hpack.Config

Eq a => Eq (Section a) 
Instance details

Defined in Hpack.Config

Methods

(==) :: Section a -> Section a -> Bool #

(/=) :: Section a -> Section a -> Bool #

Eq a => Eq (LenientData a) 
Instance details

Defined in Web.Internal.HttpApiData

Methods

(==) :: LenientData a -> LenientData a -> Bool #

(/=) :: LenientData a -> LenientData a -> 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 (BE a) 
Instance details

Defined in Data.Memory.Endian

Methods

(==) :: BE a -> BE a -> Bool #

(/=) :: BE a -> BE a -> Bool #

Eq a => Eq (LE a) 
Instance details

Defined in Data.Memory.Endian

Methods

(==) :: LE a -> LE a -> Bool #

(/=) :: LE a -> LE a -> Bool #

Eq mono => Eq (NonNull mono) 
Instance details

Defined in Data.NonNull

Methods

(==) :: NonNull mono -> NonNull mono -> Bool #

(/=) :: NonNull mono -> NonNull mono -> Bool #

Eq α => Eq (Context α) 
Instance details

Defined in Text.Mustache.Internal.Types

Methods

(==) :: Context α -> Context α -> Bool #

(/=) :: Context α -> Context α -> Bool #

Eq α => Eq (Node α) 
Instance details

Defined in Text.Mustache.Internal.Types

Methods

(==) :: Node α -> Node α -> Bool #

(/=) :: Node α -> Node α -> Bool #

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 (CabalString a) 
Instance details

Defined in Pantry.Types

Eq (ResolvedPath t) 
Instance details

Defined in Pantry.Types

Eq (SomeBase t) 
Instance details

Defined in Path.Posix

Methods

(==) :: SomeBase t -> SomeBase t -> Bool #

(/=) :: SomeBase t -> SomeBase t -> Bool #

Eq (SomeBase t) 
Instance details

Defined in Path.Windows

Methods

(==) :: SomeBase t -> SomeBase t -> Bool #

(/=) :: SomeBase t -> SomeBase t -> Bool #

Eq (WalkAction b) 
Instance details

Defined in Path.IO

Methods

(==) :: WalkAction b -> WalkAction b -> Bool #

(/=) :: WalkAction b -> WalkAction b -> Bool #

(Eq (Key record), Eq record) => Eq (Entity record) 
Instance details

Defined in Database.Persist.Class.PersistEntity

Methods

(==) :: Entity record -> Entity record -> Bool #

(/=) :: Entity record -> Entity record -> Bool #

Eq (Key ArchiveCache) 
Instance details

Defined in Pantry.Storage

Methods

(==) :: Key ArchiveCache -> Key ArchiveCache -> Bool #

(/=) :: Key ArchiveCache -> Key ArchiveCache -> Bool #

Eq (Key Blob) 
Instance details

Defined in Pantry.Storage

Methods

(==) :: Key Blob -> Key Blob -> Bool #

(/=) :: Key Blob -> Key Blob -> Bool #

Eq (Key CacheUpdate) 
Instance details

Defined in Pantry.Storage

Methods

(==) :: Key CacheUpdate -> Key CacheUpdate -> Bool #

(/=) :: Key CacheUpdate -> Key CacheUpdate -> Bool #

Eq (Key FilePath) 
Instance details

Defined in Pantry.Storage

Methods

(==) :: Key FilePath -> Key FilePath -> Bool #

(/=) :: Key FilePath -> Key FilePath -> Bool #

Eq (Key HPack) 
Instance details

Defined in Pantry.Storage

Methods

(==) :: Key HPack -> Key HPack -> Bool #

(/=) :: Key HPack -> Key HPack -> Bool #

Eq (Key HackageCabal) 
Instance details

Defined in Pantry.Storage

Methods

(==) :: Key HackageCabal -> Key HackageCabal -> Bool #

(/=) :: Key HackageCabal -> Key HackageCabal -> Bool #

Eq (Key HackageTarball) 
Instance details

Defined in Pantry.Storage

Methods

(==) :: Key HackageTarball -> Key HackageTarball -> Bool #

(/=) :: Key HackageTarball -> Key HackageTarball -> Bool #

Eq (Key ModuleName) 
Instance details

Defined in Pantry.Storage

Methods

(==) :: Key ModuleName -> Key ModuleName -> Bool #

(/=) :: Key ModuleName -> Key ModuleName -> Bool #

Eq (Key PackageExposedModule) 
Instance details

Defined in Pantry.Storage

Methods

(==) :: Key PackageExposedModule -> Key PackageExposedModule -> Bool #

(/=) :: Key PackageExposedModule -> Key PackageExposedModule -> Bool #

Eq (Key PackageName) 
Instance details

Defined in Pantry.Storage

Eq (Key PreferredVersions) 
Instance details

Defined in Pantry.Storage

Methods

(==) :: Key PreferredVersions -> Key PreferredVersions -> Bool #

(/=) :: Key PreferredVersions -> Key PreferredVersions -> Bool #

Eq (Key RepoCache) 
Instance details

Defined in Pantry.Storage

Methods

(==) :: Key RepoCache -> Key RepoCache -> Bool #

(/=) :: Key RepoCache -> Key RepoCache -> Bool #

Eq (Key SnapshotCache) 
Instance details

Defined in Pantry.Storage

Methods

(==) :: Key SnapshotCache -> Key SnapshotCache -> Bool #

(/=) :: Key SnapshotCache -> Key SnapshotCache -> Bool #

Eq (Key Tree) 
Instance details

Defined in Pantry.Storage

Methods

(==) :: Key Tree -> Key Tree -> Bool #

(/=) :: Key Tree -> Key Tree -> Bool #

Eq (Key TreeEntry) 
Instance details

Defined in Pantry.Storage

Methods

(==) :: Key TreeEntry -> Key TreeEntry -> Bool #

(/=) :: Key TreeEntry -> Key TreeEntry -> Bool #

Eq (Key UrlBlob) 
Instance details

Defined in Pantry.Storage

Methods

(==) :: Key UrlBlob -> Key UrlBlob -> Bool #

(/=) :: Key UrlBlob -> Key UrlBlob -> Bool #

Eq (Key Version) 
Instance details

Defined in Pantry.Storage

(BackendCompatible b s, Eq (BackendKey b)) => Eq (BackendKey (Compatible b s)) 
Instance details

Defined in Database.Persist.Compatible.Types

Methods

(==) :: BackendKey (Compatible b s) -> BackendKey (Compatible b s) -> Bool #

(/=) :: BackendKey (Compatible b s) -> BackendKey (Compatible b s) -> Bool #

(PersistCore b, PersistCore (RawSqlite b), Eq (BackendKey b)) => Eq (BackendKey (RawSqlite b)) 
Instance details

Defined in Database.Persist.Sqlite

Methods

(==) :: BackendKey (RawSqlite b) -> BackendKey (RawSqlite b) -> Bool #

(/=) :: BackendKey (RawSqlite b) -> BackendKey (RawSqlite b) -> Bool #

Eq a => Eq (AnnotDetails a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

(==) :: AnnotDetails a -> AnnotDetails a -> Bool #

(/=) :: AnnotDetails a -> AnnotDetails a -> Bool #

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 ann => Eq (SimpleDocStream ann) 
Instance details

Defined in Prettyprinter.Internal

Methods

(==) :: SimpleDocStream ann -> SimpleDocStream ann -> Bool #

(/=) :: SimpleDocStream ann -> SimpleDocStream ann -> Bool #

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) 
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 (Chunk a) 
Instance details

Defined in Data.List.Split.Internals

Methods

(==) :: Chunk a -> Chunk a -> Bool #

(/=) :: Chunk a -> Chunk a -> Bool #

Eq (PrecompiledCache base) Source # 
Instance details

Defined in Stack.Types.Build

Eq (TBQueue a) 
Instance details

Defined in Control.Concurrent.STM.TBQueue

Methods

(==) :: TBQueue a -> TBQueue a -> Bool #

(/=) :: TBQueue a -> TBQueue a -> Bool #

Eq (TChan a) 
Instance details

Defined in Control.Concurrent.STM.TChan

Methods

(==) :: TChan a -> TChan a -> Bool #

(/=) :: TChan a -> TChan 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 (TQueue a) 
Instance details

Defined in Control.Concurrent.STM.TQueue

Methods

(==) :: TQueue a -> TQueue a -> Bool #

(/=) :: TQueue a -> TQueue 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 linkTarget => Eq (GenEntryContent linkTarget) 
Instance details

Defined in Codec.Archive.Tar.Types

Methods

(==) :: GenEntryContent linkTarget -> GenEntryContent linkTarget -> Bool #

(/=) :: GenEntryContent linkTarget -> GenEntryContent linkTarget -> 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 k => Eq (Error k) 
Instance details

Defined in Data.HashMap.Internal.Debug

Methods

(==) :: Error k -> Error k -> Bool #

(/=) :: Error k -> Error k -> Bool #

Eq k => Eq (Validity k) 
Instance details

Defined in Data.HashMap.Internal.Debug

Methods

(==) :: Validity k -> Validity k -> Bool #

(/=) :: Validity k -> Validity k -> Bool #

Eq a => Eq (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Methods

(==) :: HashSet a -> HashSet a -> Bool #

(/=) :: HashSet a -> HashSet 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 (Vector a) 
Instance details

Defined in Data.Vector.Strict

Methods

(==) :: Vector a -> Vector a -> Bool #

(/=) :: Vector a -> Vector a -> Bool #

Eq a => Eq (Maybe a) 
Instance details

Defined in GHC.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 a, Eq k) => Eq (Node k a) 
Instance details

Defined in Distribution.Compat.Graph

Methods

(==) :: Node k a -> Node k a -> Bool #

(/=) :: Node k a -> Node k a -> Bool #

Eq (SymbolicPath from to) 
Instance details

Defined in Distribution.Utils.Path

Methods

(==) :: SymbolicPath from to -> SymbolicPath from to -> Bool #

(/=) :: SymbolicPath from to -> SymbolicPath from to -> 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 (IOUArray i e) 
Instance details

Defined in Data.Array.IO.Internals

Methods

(==) :: IOUArray i e -> IOUArray i e -> Bool #

(/=) :: IOUArray i e -> IOUArray i e -> Bool #

(Eq a, Eq b) => Eq (Either a b) 
Instance details

Defined in Data.Either

Methods

(==) :: Either a b -> Either a b -> Bool #

(/=) :: Either a b -> Either a b -> Bool #

Eq (Fixed a) 
Instance details

Defined in Data.Fixed

Methods

(==) :: Fixed a -> Fixed a -> Bool #

(/=) :: Fixed a -> Fixed a -> Bool #

Eq (Proxy s) 
Instance details

Defined in Data.Proxy

Methods

(==) :: Proxy s -> Proxy s -> Bool #

(/=) :: Proxy s -> Proxy s -> Bool #

Eq a => Eq (Arg a b) 
Instance details

Defined in Data.Semigroup

Methods

(==) :: Arg a b -> Arg a b -> Bool #

(/=) :: Arg a b -> Arg a b -> Bool #

Eq (TypeRep a) 
Instance details

Defined in Data.Typeable.Internal

Methods

(==) :: TypeRep a -> TypeRep a -> Bool #

(/=) :: TypeRep a -> TypeRep a -> Bool #

(Ix i, Eq e) => Eq (Array i e) 
Instance details

Defined in GHC.Arr

Methods

(==) :: Array i e -> Array i e -> Bool #

(/=) :: Array i e -> Array i e -> Bool #

Eq (U1 p) 
Instance details

Defined in GHC.Generics

Methods

(==) :: U1 p -> U1 p -> Bool #

(/=) :: U1 p -> U1 p -> Bool #

Eq (V1 p) 
Instance details

Defined in GHC.Generics

Methods

(==) :: V1 p -> V1 p -> Bool #

(/=) :: V1 p -> V1 p -> Bool #

Eq (IOArray i e) 
Instance details

Defined in GHC.IOArray

Methods

(==) :: IOArray i e -> IOArray i e -> Bool #

(/=) :: IOArray i e -> IOArray i e -> Bool #

Eq (STRef s a) 
Instance details

Defined in GHC.STRef

Methods

(==) :: STRef s a -> STRef s a -> Bool #

(/=) :: STRef s a -> STRef s a -> 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 #

Eq (PublicKey curve hash) 
Instance details

Defined in Crypto.PubKey.EdDSA

Methods

(==) :: PublicKey curve hash -> PublicKey curve hash -> Bool #

(/=) :: PublicKey curve hash -> PublicKey curve hash -> Bool #

Eq (Signature curve hash) 
Instance details

Defined in Crypto.PubKey.EdDSA

Methods

(==) :: Signature curve hash -> Signature curve hash -> Bool #

(/=) :: Signature curve hash -> Signature curve hash -> Bool #

(Eq a, Eq b) => Eq (Product a b) 
Instance details

Defined in Data.Aeson.Config.Types

Methods

(==) :: Product a b -> Product a b -> Bool #

(/=) :: Product a b -> Product a b -> Bool #

Eq ba => Eq (SizedByteArray n ba) 
Instance details

Defined in Data.ByteArray.Sized

Methods

(==) :: SizedByteArray n ba -> SizedByteArray n ba -> Bool #

(/=) :: SizedByteArray n ba -> SizedByteArray n ba -> Bool #

Eq (Path b t) 
Instance details

Defined in Path.Internal.Posix

Methods

(==) :: Path b t -> Path b t -> Bool #

(/=) :: Path b t -> Path b t -> Bool #

Eq (Path b t) 
Instance details

Defined in Path.Internal.Windows

Methods

(==) :: Path b t -> Path b t -> Bool #

(/=) :: Path b t -> Path b t -> 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

Methods

(==) :: MutablePrimArray s a -> MutablePrimArray s a -> Bool #

(/=) :: MutablePrimArray s a -> MutablePrimArray s a -> Bool #

Eq (SmallMutableArray s a) 
Instance details

Defined in Data.Primitive.SmallArray

Methods

(==) :: SmallMutableArray s a -> SmallMutableArray s a -> Bool #

(/=) :: SmallMutableArray s a -> SmallMutableArray s a -> Bool #

(Eq k, Eq a) => Eq (MonoidMap k a) Source # 
Instance details

Defined in Data.Monoid.Map

Methods

(==) :: MonoidMap k a -> MonoidMap k a -> Bool #

(/=) :: MonoidMap k a -> MonoidMap k a -> Bool #

(Eq a, Eq b) => Eq (LockedLocation a b) Source # 
Instance details

Defined in Stack.Lock

(Eq i, Eq e) => Eq (TArray i e) 
Instance details

Defined in Control.Concurrent.STM.TArray

Methods

(==) :: TArray i e -> TArray i e -> Bool #

(/=) :: TArray i e -> TArray i e -> 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 tarPath, Eq linkTarget) => Eq (GenEntry tarPath linkTarget) 
Instance details

Defined in Codec.Archive.Tar.Types

Methods

(==) :: GenEntry tarPath linkTarget -> GenEntry tarPath linkTarget -> Bool #

(/=) :: GenEntry tarPath linkTarget -> GenEntry tarPath linkTarget -> 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) 
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 v, Eq a, Eq c) => Eq (CondBranch v c a) 
Instance details

Defined in Distribution.Types.CondTree

Methods

(==) :: CondBranch v c a -> CondBranch v c a -> Bool #

(/=) :: CondBranch v c a -> CondBranch v c a -> Bool #

(Eq a, Eq c, Eq v) => Eq (CondTree v c a) 
Instance details

Defined in Distribution.Types.CondTree

Methods

(==) :: CondTree v c a -> CondTree v c a -> Bool #

(/=) :: CondTree v c a -> CondTree v c a -> 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 a => Eq (Const a b) 
Instance details

Defined in 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) 
Instance details

Defined in Data.Monoid

Methods

(==) :: Ap f a -> Ap f a -> Bool #

(/=) :: Ap f a -> Ap f a -> Bool #

Eq (f a) => Eq (Alt f a) 
Instance details

Defined in Data.Semigroup.Internal

Methods

(==) :: Alt f a -> Alt f a -> Bool #

(/=) :: Alt f a -> Alt f a -> Bool #

Eq (Coercion a b) 
Instance details

Defined in Data.Type.Coercion

Methods

(==) :: Coercion a b -> Coercion a b -> Bool #

(/=) :: Coercion a b -> Coercion a b -> Bool #

Eq (a :~: b) 
Instance details

Defined in Data.Type.Equality

Methods

(==) :: (a :~: b) -> (a :~: b) -> Bool #

(/=) :: (a :~: b) -> (a :~: b) -> Bool #

Eq (OrderingI a b) 
Instance details

Defined in Data.Type.Ord

Methods

(==) :: OrderingI a b -> OrderingI a b -> Bool #

(/=) :: OrderingI a b -> OrderingI a b -> Bool #

Eq (STArray s i e) 
Instance details

Defined in GHC.Arr

Methods

(==) :: STArray s i e -> STArray s i e -> Bool #

(/=) :: STArray s i e -> STArray s i e -> Bool #

(Generic1 f, Eq (Rep1 f a)) => Eq (Generically1 f a) 
Instance details

Defined in GHC.Generics

Methods

(==) :: Generically1 f a -> Generically1 f a -> Bool #

(/=) :: Generically1 f a -> Generically1 f a -> Bool #

Eq (f p) => Eq (Rec1 f p) 
Instance details

Defined in GHC.Generics

Methods

(==) :: Rec1 f p -> Rec1 f p -> Bool #

(/=) :: Rec1 f p -> Rec1 f p -> Bool #

Eq (URec (Ptr ()) p) 
Instance details

Defined in GHC.Generics

Methods

(==) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool #

(/=) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool #

Eq (URec Char p) 
Instance details

Defined in GHC.Generics

Methods

(==) :: URec Char p -> URec Char p -> Bool #

(/=) :: URec Char p -> URec Char p -> Bool #

Eq (URec Double p) 
Instance details

Defined in GHC.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.Generics

Methods

(==) :: URec Float p -> URec Float p -> Bool #

(/=) :: URec Float p -> URec Float p -> Bool #

Eq (URec Int p) 
Instance details

Defined in GHC.Generics

Methods

(==) :: URec Int p -> URec Int p -> Bool #

(/=) :: URec Int p -> URec Int p -> Bool #

Eq (URec Word p) 
Instance details

Defined in GHC.Generics

Methods

(==) :: URec Word p -> URec Word p -> Bool #

(/=) :: URec Word p -> URec Word p -> Bool #

Eq a => Eq (Alias deprecated alias a) 
Instance details

Defined in Data.Aeson.Config.FromValue

Methods

(==) :: Alias deprecated alias a -> Alias deprecated alias a -> Bool #

(/=) :: Alias deprecated alias a -> Alias deprecated alias a -> 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 tarPath, Eq linkTarget, Eq e) => Eq (GenEntries tarPath linkTarget e) 
Instance details

Defined in Codec.Archive.Tar.Types

Methods

(==) :: GenEntries tarPath linkTarget e -> GenEntries tarPath linkTarget e -> Bool #

(/=) :: GenEntries tarPath linkTarget e -> GenEntries tarPath linkTarget e -> 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) 
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) 
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) 
Instance details

Defined in Data.Type.Equality

Methods

(==) :: (a :~~: b) -> (a :~~: b) -> Bool #

(/=) :: (a :~~: b) -> (a :~~: b) -> Bool #

(Eq (f p), Eq (g p)) => Eq ((f :*: g) p) 
Instance details

Defined in GHC.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) 
Instance details

Defined in GHC.Generics

Methods

(==) :: (f :+: g) p -> (f :+: g) p -> Bool #

(/=) :: (f :+: g) p -> (f :+: g) p -> Bool #

Eq c => Eq (K1 i c p) 
Instance details

Defined in GHC.Generics

Methods

(==) :: K1 i c p -> K1 i c p -> Bool #

(/=) :: K1 i c p -> K1 i c p -> 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) 
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 (g p)) => Eq ((f :.: g) p) 
Instance details

Defined in GHC.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) 
Instance details

Defined in GHC.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 uid, Eq modulename, Eq mod, Eq srcpkgid, Eq srcpkgname) => Eq (GenericUnitInfo srcpkgid srcpkgname uid modulename mod) 
Instance details

Defined in GHC.Unit.Database

Methods

(==) :: GenericUnitInfo srcpkgid srcpkgname uid modulename mod -> GenericUnitInfo srcpkgid srcpkgname uid modulename mod -> Bool #

(/=) :: GenericUnitInfo srcpkgid srcpkgname uid modulename mod -> GenericUnitInfo srcpkgid srcpkgname uid modulename mod -> 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 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 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 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 #

class Eq a => Ord a where #

Minimal complete definition

compare | (<=)

Methods

compare :: a -> a -> Ordering #

(<) :: a -> a -> Bool #

(<=) :: a -> a -> Bool #

(>) :: a -> a -> Bool #

(>=) :: a -> a -> Bool #

max :: a -> a -> a #

min :: a -> a -> a #

Instances

Instances details
Ord ModTime 
Instance details

Defined in Distribution.Compat.Time

Methods

compare :: ModTime -> ModTime -> Ordering #

(<) :: ModTime -> ModTime -> Bool #

(<=) :: ModTime -> ModTime -> Bool #

(>) :: ModTime -> ModTime -> Bool #

(>=) :: ModTime -> ModTime -> Bool #

max :: ModTime -> ModTime -> ModTime #

min :: ModTime -> ModTime -> ModTime #

Ord CEField 
Instance details

Defined in Distribution.PackageDescription.Check

Methods

compare :: CEField -> CEField -> Ordering #

(<) :: CEField -> CEField -> Bool #

(<=) :: CEField -> CEField -> Bool #

(>) :: CEField -> CEField -> Bool #

(>=) :: CEField -> CEField -> Bool #

max :: CEField -> CEField -> CEField #

min :: CEField -> CEField -> CEField #

Ord CEType 
Instance details

Defined in Distribution.PackageDescription.Check

Methods

compare :: CEType -> CEType -> Ordering #

(<) :: CEType -> CEType -> Bool #

(<=) :: CEType -> CEType -> Bool #

(>) :: CEType -> CEType -> Bool #

(>=) :: CEType -> CEType -> Bool #

max :: CEType -> CEType -> CEType #

min :: CEType -> CEType -> CEType #

Ord CheckExplanation 
Instance details

Defined in Distribution.PackageDescription.Check

Methods

compare :: CheckExplanation -> CheckExplanation -> Ordering #

(<) :: CheckExplanation -> CheckExplanation -> Bool #

(<=) :: CheckExplanation -> CheckExplanation -> Bool #

(>) :: CheckExplanation -> CheckExplanation -> Bool #

(>=) :: CheckExplanation -> CheckExplanation -> Bool #

max :: CheckExplanation -> CheckExplanation -> CheckExplanation #

min :: CheckExplanation -> CheckExplanation -> CheckExplanation #

Ord PackageCheck 
Instance details

Defined in Distribution.PackageDescription.Check

Methods

compare :: PackageCheck -> PackageCheck -> Ordering #

(<) :: PackageCheck -> PackageCheck -> Bool #

(<=) :: PackageCheck -> PackageCheck -> Bool #

(>) :: PackageCheck -> PackageCheck -> Bool #

(>=) :: PackageCheck -> PackageCheck -> Bool #

max :: PackageCheck -> PackageCheck -> PackageCheck #

min :: PackageCheck -> PackageCheck -> PackageCheck #

Ord ComponentKind 
Instance details

Defined in Distribution.Simple.BuildTarget

Methods

compare :: ComponentKind -> ComponentKind -> Ordering #

(<) :: ComponentKind -> ComponentKind -> Bool #

(<=) :: ComponentKind -> ComponentKind -> Bool #

(>) :: ComponentKind -> ComponentKind -> Bool #

(>=) :: ComponentKind -> ComponentKind -> Bool #

max :: ComponentKind -> ComponentKind -> ComponentKind #

min :: ComponentKind -> ComponentKind -> ComponentKind #

Ord UserBuildTarget 
Instance details

Defined in Distribution.Simple.BuildTarget

Methods

compare :: UserBuildTarget -> UserBuildTarget -> Ordering #

(<) :: UserBuildTarget -> UserBuildTarget -> Bool #

(<=) :: UserBuildTarget -> UserBuildTarget -> Bool #

(>) :: UserBuildTarget -> UserBuildTarget -> Bool #

(>=) :: UserBuildTarget -> UserBuildTarget -> Bool #

max :: UserBuildTarget -> UserBuildTarget -> UserBuildTarget #

min :: UserBuildTarget -> UserBuildTarget -> UserBuildTarget #

Ord PackageDB 
Instance details

Defined in Distribution.Simple.Compiler

Methods

compare :: PackageDB -> PackageDB -> Ordering #

(<) :: PackageDB -> PackageDB -> Bool #

(<=) :: PackageDB -> PackageDB -> Bool #

(>) :: PackageDB -> PackageDB -> Bool #

(>=) :: PackageDB -> PackageDB -> Bool #

max :: PackageDB -> PackageDB -> PackageDB #

min :: PackageDB -> PackageDB -> PackageDB #

Ord Directory 
Instance details

Defined in Distribution.Simple.Haddock

Methods

compare :: Directory -> Directory -> Ordering #

(<) :: Directory -> Directory -> Bool #

(<=) :: Directory -> Directory -> Bool #

(>) :: Directory -> Directory -> Bool #

(>=) :: Directory -> Directory -> Bool #

max :: Directory -> Directory -> Directory #

min :: Directory -> Directory -> Directory #

Ord PathTemplate 
Instance details

Defined in Distribution.Simple.InstallDirs

Methods

compare :: PathTemplate -> PathTemplate -> Ordering #

(<) :: PathTemplate -> PathTemplate -> Bool #

(<=) :: PathTemplate -> PathTemplate -> Bool #

(>) :: PathTemplate -> PathTemplate -> Bool #

(>=) :: PathTemplate -> PathTemplate -> Bool #

max :: PathTemplate -> PathTemplate -> PathTemplate #

min :: PathTemplate -> PathTemplate -> PathTemplate #

Ord PathComponent 
Instance details

Defined in Distribution.Simple.InstallDirs.Internal

Methods

compare :: PathComponent -> PathComponent -> Ordering #

(<) :: PathComponent -> PathComponent -> Bool #

(<=) :: PathComponent -> PathComponent -> Bool #

(>) :: PathComponent -> PathComponent -> Bool #

(>=) :: PathComponent -> PathComponent -> Bool #

max :: PathComponent -> PathComponent -> PathComponent #

min :: PathComponent -> PathComponent -> PathComponent #

Ord PathTemplateVariable 
Instance details

Defined in Distribution.Simple.InstallDirs.Internal

Methods

compare :: PathTemplateVariable -> PathTemplateVariable -> Ordering #

(<) :: PathTemplateVariable -> PathTemplateVariable -> Bool #

(<=) :: PathTemplateVariable -> PathTemplateVariable -> Bool #

(>) :: PathTemplateVariable -> PathTemplateVariable -> Bool #

(>=) :: PathTemplateVariable -> PathTemplateVariable -> Bool #

max :: PathTemplateVariable -> PathTemplateVariable -> PathTemplateVariable #

min :: PathTemplateVariable -> PathTemplateVariable -> PathTemplateVariable #

Ord TestShowDetails 
Instance details

Defined in Distribution.Simple.Setup

Methods

compare :: TestShowDetails -> TestShowDetails -> Ordering #

(<) :: TestShowDetails -> TestShowDetails -> Bool #

(<=) :: TestShowDetails -> TestShowDetails -> Bool #

(>) :: TestShowDetails -> TestShowDetails -> Bool #

(>=) :: TestShowDetails -> TestShowDetails -> Bool #

max :: TestShowDetails -> TestShowDetails -> TestShowDetails #

min :: TestShowDetails -> TestShowDetails -> TestShowDetails #

Ord DumpBuildInfo 
Instance details

Defined in Distribution.Types.DumpBuildInfo

Methods

compare :: DumpBuildInfo -> DumpBuildInfo -> Ordering #

(<) :: DumpBuildInfo -> DumpBuildInfo -> Bool #

(<=) :: DumpBuildInfo -> DumpBuildInfo -> Bool #

(>) :: DumpBuildInfo -> DumpBuildInfo -> Bool #

(>=) :: DumpBuildInfo -> DumpBuildInfo -> Bool #

max :: DumpBuildInfo -> DumpBuildInfo -> DumpBuildInfo #

min :: DumpBuildInfo -> DumpBuildInfo -> DumpBuildInfo #

Ord Verbosity 
Instance details

Defined in Distribution.Verbosity

Methods

compare :: Verbosity -> Verbosity -> Ordering #

(<) :: Verbosity -> Verbosity -> Bool #

(<=) :: Verbosity -> Verbosity -> Bool #

(>) :: Verbosity -> Verbosity -> Bool #

(>=) :: Verbosity -> Verbosity -> Bool #

max :: Verbosity -> Verbosity -> Verbosity #

min :: Verbosity -> Verbosity -> Verbosity #

Ord VerbosityFlag 
Instance details

Defined in Distribution.Verbosity.Internal

Methods

compare :: VerbosityFlag -> VerbosityFlag -> Ordering #

(<) :: VerbosityFlag -> VerbosityFlag -> Bool #

(<=) :: VerbosityFlag -> VerbosityFlag -> Bool #

(>) :: VerbosityFlag -> VerbosityFlag -> Bool #

(>=) :: VerbosityFlag -> VerbosityFlag -> Bool #

max :: VerbosityFlag -> VerbosityFlag -> VerbosityFlag #

min :: VerbosityFlag -> VerbosityFlag -> VerbosityFlag #

Ord VerbosityLevel 
Instance details

Defined in Distribution.Verbosity.Internal

Methods

compare :: VerbosityLevel -> VerbosityLevel -> Ordering #

(<) :: VerbosityLevel -> VerbosityLevel -> Bool #

(<=) :: VerbosityLevel -> VerbosityLevel -> Bool #

(>) :: VerbosityLevel -> VerbosityLevel -> Bool #

(>=) :: VerbosityLevel -> VerbosityLevel -> Bool #

max :: VerbosityLevel -> VerbosityLevel -> VerbosityLevel #

min :: VerbosityLevel -> VerbosityLevel -> VerbosityLevel #

Ord OpenModule 
Instance details

Defined in Distribution.Backpack

Methods

compare :: OpenModule -> OpenModule -> Ordering #

(<) :: OpenModule -> OpenModule -> Bool #

(<=) :: OpenModule -> OpenModule -> Bool #

(>) :: OpenModule -> OpenModule -> Bool #

(>=) :: OpenModule -> OpenModule -> Bool #

max :: OpenModule -> OpenModule -> OpenModule #

min :: OpenModule -> OpenModule -> OpenModule #

Ord OpenUnitId 
Instance details

Defined in Distribution.Backpack

Methods

compare :: OpenUnitId -> OpenUnitId -> Ordering #

(<) :: OpenUnitId -> OpenUnitId -> Bool #

(<=) :: OpenUnitId -> OpenUnitId -> Bool #

(>) :: OpenUnitId -> OpenUnitId -> Bool #

(>=) :: OpenUnitId -> OpenUnitId -> Bool #

max :: OpenUnitId -> OpenUnitId -> OpenUnitId #

min :: OpenUnitId -> OpenUnitId -> OpenUnitId #

Ord CabalSpecVersion 
Instance details

Defined in Distribution.CabalSpecVersion

Methods

compare :: CabalSpecVersion -> CabalSpecVersion -> Ordering #

(<) :: CabalSpecVersion -> CabalSpecVersion -> Bool #

(<=) :: CabalSpecVersion -> CabalSpecVersion -> Bool #

(>) :: CabalSpecVersion -> CabalSpecVersion -> Bool #

(>=) :: CabalSpecVersion -> CabalSpecVersion -> Bool #

max :: CabalSpecVersion -> CabalSpecVersion -> CabalSpecVersion #

min :: CabalSpecVersion -> CabalSpecVersion -> CabalSpecVersion #

Ord CompilerFlavor 
Instance details

Defined in Distribution.Compiler

Methods

compare :: CompilerFlavor -> CompilerFlavor -> Ordering #

(<) :: CompilerFlavor -> CompilerFlavor -> Bool #

(<=) :: CompilerFlavor -> CompilerFlavor -> Bool #

(>) :: CompilerFlavor -> CompilerFlavor -> Bool #

(>=) :: CompilerFlavor -> CompilerFlavor -> Bool #

max :: CompilerFlavor -> CompilerFlavor -> CompilerFlavor #

min :: CompilerFlavor -> CompilerFlavor -> CompilerFlavor #

Ord CompilerId 
Instance details

Defined in Distribution.Compiler

Methods

compare :: CompilerId -> CompilerId -> Ordering #

(<) :: CompilerId -> CompilerId -> Bool #

(<=) :: CompilerId -> CompilerId -> Bool #

(>) :: CompilerId -> CompilerId -> Bool #

(>=) :: CompilerId -> CompilerId -> Bool #

max :: CompilerId -> CompilerId -> CompilerId #

min :: CompilerId -> CompilerId -> CompilerId #

Ord LexWarningType 
Instance details

Defined in Distribution.Fields.LexerMonad

Methods

compare :: LexWarningType -> LexWarningType -> Ordering #

(<) :: LexWarningType -> LexWarningType -> Bool #

(<=) :: LexWarningType -> LexWarningType -> Bool #

(>) :: LexWarningType -> LexWarningType -> Bool #

(>=) :: LexWarningType -> LexWarningType -> Bool #

max :: LexWarningType -> LexWarningType -> LexWarningType #

min :: LexWarningType -> LexWarningType -> LexWarningType #

Ord License 
Instance details

Defined in Distribution.License

Methods

compare :: License -> License -> Ordering #

(<) :: License -> License -> Bool #

(<=) :: License -> License -> Bool #

(>) :: License -> License -> Bool #

(>=) :: License -> License -> Bool #

max :: License -> License -> License #

min :: License -> License -> License #

Ord ModuleName 
Instance details

Defined in Distribution.ModuleName

Ord Position 
Instance details

Defined in Distribution.Parsec.Position

Methods

compare :: Position -> Position -> Ordering #

(<) :: Position -> Position -> Bool #

(<=) :: Position -> Position -> Bool #

(>) :: Position -> Position -> Bool #

(>=) :: Position -> Position -> Bool #

max :: Position -> Position -> Position #

min :: Position -> Position -> Position #

Ord PWarnType 
Instance details

Defined in Distribution.Parsec.Warning

Methods

compare :: PWarnType -> PWarnType -> Ordering #

(<) :: PWarnType -> PWarnType -> Bool #

(<=) :: PWarnType -> PWarnType -> Bool #

(>) :: PWarnType -> PWarnType -> Bool #

(>=) :: PWarnType -> PWarnType -> Bool #

max :: PWarnType -> PWarnType -> PWarnType #

min :: PWarnType -> PWarnType -> PWarnType #

Ord PWarning 
Instance details

Defined in Distribution.Parsec.Warning

Methods

compare :: PWarning -> PWarning -> Ordering #

(<) :: PWarning -> PWarning -> Bool #

(<=) :: PWarning -> PWarning -> Bool #

(>) :: PWarning -> PWarning -> Bool #

(>=) :: PWarning -> PWarning -> Bool #

max :: PWarning -> PWarning -> PWarning #

min :: PWarning -> PWarning -> PWarning #

Ord License 
Instance details

Defined in Distribution.SPDX.License

Methods

compare :: License -> License -> Ordering #

(<) :: License -> License -> Bool #

(<=) :: License -> License -> Bool #

(>) :: License -> License -> Bool #

(>=) :: License -> License -> Bool #

max :: License -> License -> License #

min :: License -> License -> License #

Ord LicenseExceptionId 
Instance details

Defined in Distribution.SPDX.LicenseExceptionId

Methods

compare :: LicenseExceptionId -> LicenseExceptionId -> Ordering #

(<) :: LicenseExceptionId -> LicenseExceptionId -> Bool #

(<=) :: LicenseExceptionId -> LicenseExceptionId -> Bool #

(>) :: LicenseExceptionId -> LicenseExceptionId -> Bool #

(>=) :: LicenseExceptionId -> LicenseExceptionId -> Bool #

max :: LicenseExceptionId -> LicenseExceptionId -> LicenseExceptionId #

min :: LicenseExceptionId -> LicenseExceptionId -> LicenseExceptionId #

Ord LicenseExpression 
Instance details

Defined in Distribution.SPDX.LicenseExpression

Methods

compare :: LicenseExpression -> LicenseExpression -> Ordering #

(<) :: LicenseExpression -> LicenseExpression -> Bool #

(<=) :: LicenseExpression -> LicenseExpression -> Bool #

(>) :: LicenseExpression -> LicenseExpression -> Bool #

(>=) :: LicenseExpression -> LicenseExpression -> Bool #

max :: LicenseExpression -> LicenseExpression -> LicenseExpression #

min :: LicenseExpression -> LicenseExpression -> LicenseExpression #

Ord SimpleLicenseExpression 
Instance details

Defined in Distribution.SPDX.LicenseExpression

Methods

compare :: SimpleLicenseExpression -> SimpleLicenseExpression -> Ordering #

(<) :: SimpleLicenseExpression -> SimpleLicenseExpression -> Bool #

(<=) :: SimpleLicenseExpression -> SimpleLicenseExpression -> Bool #

(>) :: SimpleLicenseExpression -> SimpleLicenseExpression -> Bool #

(>=) :: SimpleLicenseExpression -> SimpleLicenseExpression -> Bool #

max :: SimpleLicenseExpression -> SimpleLicenseExpression -> SimpleLicenseExpression #

min :: SimpleLicenseExpression -> SimpleLicenseExpression -> SimpleLicenseExpression #

Ord LicenseId 
Instance details

Defined in Distribution.SPDX.LicenseId

Methods

compare :: LicenseId -> LicenseId -> Ordering #

(<) :: LicenseId -> LicenseId -> Bool #

(<=) :: LicenseId -> LicenseId -> Bool #

(>) :: LicenseId -> LicenseId -> Bool #

(>=) :: LicenseId -> LicenseId -> Bool #

max :: LicenseId -> LicenseId -> LicenseId #

min :: LicenseId -> LicenseId -> LicenseId #

Ord LicenseListVersion 
Instance details

Defined in Distribution.SPDX.LicenseListVersion

Methods

compare :: LicenseListVersion -> LicenseListVersion -> Ordering #

(<) :: LicenseListVersion -> LicenseListVersion -> Bool #

(<=) :: LicenseListVersion -> LicenseListVersion -> Bool #

(>) :: LicenseListVersion -> LicenseListVersion -> Bool #

(>=) :: LicenseListVersion -> LicenseListVersion -> Bool #

max :: LicenseListVersion -> LicenseListVersion -> LicenseListVersion #

min :: LicenseListVersion -> LicenseListVersion -> LicenseListVersion #

Ord LicenseRef 
Instance details

Defined in Distribution.SPDX.LicenseReference

Methods

compare :: LicenseRef -> LicenseRef -> Ordering #

(<) :: LicenseRef -> LicenseRef -> Bool #

(<=) :: LicenseRef -> LicenseRef -> Bool #

(>) :: LicenseRef -> LicenseRef -> Bool #

(>=) :: LicenseRef -> LicenseRef -> Bool #

max :: LicenseRef -> LicenseRef -> LicenseRef #

min :: LicenseRef -> LicenseRef -> LicenseRef #

Ord Arch 
Instance details

Defined in Distribution.System

Methods

compare :: Arch -> Arch -> Ordering #

(<) :: Arch -> Arch -> Bool #

(<=) :: Arch -> Arch -> Bool #

(>) :: Arch -> Arch -> Bool #

(>=) :: Arch -> Arch -> Bool #

max :: Arch -> Arch -> Arch #

min :: Arch -> Arch -> Arch #

Ord OS 
Instance details

Defined in Distribution.System

Methods

compare :: OS -> OS -> Ordering #

(<) :: OS -> OS -> Bool #

(<=) :: OS -> OS -> Bool #

(>) :: OS -> OS -> Bool #

(>=) :: OS -> OS -> Bool #

max :: OS -> OS -> OS #

min :: OS -> OS -> OS #

Ord Platform 
Instance details

Defined in Distribution.System

Methods

compare :: Platform -> Platform -> Ordering #

(<) :: Platform -> Platform -> Bool #

(<=) :: Platform -> Platform -> Bool #

(>) :: Platform -> Platform -> Bool #

(>=) :: Platform -> Platform -> Bool #

max :: Platform -> Platform -> Platform #

min :: Platform -> Platform -> Platform #

Ord Benchmark 
Instance details

Defined in Distribution.Types.Benchmark

Methods

compare :: Benchmark -> Benchmark -> Ordering #

(<) :: Benchmark -> Benchmark -> Bool #

(<=) :: Benchmark -> Benchmark -> Bool #

(>) :: Benchmark -> Benchmark -> Bool #

(>=) :: Benchmark -> Benchmark -> Bool #

max :: Benchmark -> Benchmark -> Benchmark #

min :: Benchmark -> Benchmark -> Benchmark #

Ord BenchmarkInterface 
Instance details

Defined in Distribution.Types.BenchmarkInterface

Methods

compare :: BenchmarkInterface -> BenchmarkInterface -> Ordering #

(<) :: BenchmarkInterface -> BenchmarkInterface -> Bool #

(<=) :: BenchmarkInterface -> BenchmarkInterface -> Bool #

(>) :: BenchmarkInterface -> BenchmarkInterface -> Bool #

(>=) :: BenchmarkInterface -> BenchmarkInterface -> Bool #

max :: BenchmarkInterface -> BenchmarkInterface -> BenchmarkInterface #

min :: BenchmarkInterface -> BenchmarkInterface -> BenchmarkInterface #

Ord BenchmarkType 
Instance details

Defined in Distribution.Types.BenchmarkType

Methods

compare :: BenchmarkType -> BenchmarkType -> Ordering #

(<) :: BenchmarkType -> BenchmarkType -> Bool #

(<=) :: BenchmarkType -> BenchmarkType -> Bool #

(>) :: BenchmarkType -> BenchmarkType -> Bool #

(>=) :: BenchmarkType -> BenchmarkType -> Bool #

max :: BenchmarkType -> BenchmarkType -> BenchmarkType #

min :: BenchmarkType -> BenchmarkType -> BenchmarkType #

Ord BuildInfo 
Instance details

Defined in Distribution.Types.BuildInfo

Methods

compare :: BuildInfo -> BuildInfo -> Ordering #

(<) :: BuildInfo -> BuildInfo -> Bool #

(<=) :: BuildInfo -> BuildInfo -> Bool #

(>) :: BuildInfo -> BuildInfo -> Bool #

(>=) :: BuildInfo -> BuildInfo -> Bool #

max :: BuildInfo -> BuildInfo -> BuildInfo #

min :: BuildInfo -> BuildInfo -> BuildInfo #

Ord BuildType 
Instance details

Defined in Distribution.Types.BuildType

Methods

compare :: BuildType -> BuildType -> Ordering #

(<) :: BuildType -> BuildType -> Bool #

(<=) :: BuildType -> BuildType -> Bool #

(>) :: BuildType -> BuildType -> Bool #

(>=) :: BuildType -> BuildType -> Bool #

max :: BuildType -> BuildType -> BuildType #

min :: BuildType -> BuildType -> BuildType #

Ord ComponentId 
Instance details

Defined in Distribution.Types.ComponentId

Methods

compare :: ComponentId -> ComponentId -> Ordering #

(<) :: ComponentId -> ComponentId -> Bool #

(<=) :: ComponentId -> ComponentId -> Bool #

(>) :: ComponentId -> ComponentId -> Bool #

(>=) :: ComponentId -> ComponentId -> Bool #

max :: ComponentId -> ComponentId -> ComponentId #

min :: ComponentId -> ComponentId -> ComponentId #

Ord ComponentName 
Instance details

Defined in Distribution.Types.ComponentName

Methods

compare :: ComponentName -> ComponentName -> Ordering #

(<) :: ComponentName -> ComponentName -> Bool #

(<=) :: ComponentName -> ComponentName -> Bool #

(>) :: ComponentName -> ComponentName -> Bool #

(>=) :: ComponentName -> ComponentName -> Bool #

max :: ComponentName -> ComponentName -> ComponentName #

min :: ComponentName -> ComponentName -> ComponentName #

Ord NotLibComponentName 
Instance details

Defined in Distribution.Types.ComponentName

Methods

compare :: NotLibComponentName -> NotLibComponentName -> Ordering #

(<) :: NotLibComponentName -> NotLibComponentName -> Bool #

(<=) :: NotLibComponentName -> NotLibComponentName -> Bool #

(>) :: NotLibComponentName -> NotLibComponentName -> Bool #

(>=) :: NotLibComponentName -> NotLibComponentName -> Bool #

max :: NotLibComponentName -> NotLibComponentName -> NotLibComponentName #

min :: NotLibComponentName -> NotLibComponentName -> NotLibComponentName #

Ord Dependency 
Instance details

Defined in Distribution.Types.Dependency

Methods

compare :: Dependency -> Dependency -> Ordering #

(<) :: Dependency -> Dependency -> Bool #

(<=) :: Dependency -> Dependency -> Bool #

(>) :: Dependency -> Dependency -> Bool #

(>=) :: Dependency -> Dependency -> Bool #

max :: Dependency -> Dependency -> Dependency #

min :: Dependency -> Dependency -> Dependency #

Ord ExeDependency 
Instance details

Defined in Distribution.Types.ExeDependency

Methods

compare :: ExeDependency -> ExeDependency -> Ordering #

(<) :: ExeDependency -> ExeDependency -> Bool #

(<=) :: ExeDependency -> ExeDependency -> Bool #

(>) :: ExeDependency -> ExeDependency -> Bool #

(>=) :: ExeDependency -> ExeDependency -> Bool #

max :: ExeDependency -> ExeDependency -> ExeDependency #

min :: ExeDependency -> ExeDependency -> ExeDependency #

Ord Executable 
Instance details

Defined in Distribution.Types.Executable

Methods

compare :: Executable -> Executable -> Ordering #

(<) :: Executable -> Executable -> Bool #

(<=) :: Executable -> Executable -> Bool #

(>) :: Executable -> Executable -> Bool #

(>=) :: Executable -> Executable -> Bool #

max :: Executable -> Executable -> Executable #

min :: Executable -> Executable -> Executable #

Ord ExecutableScope 
Instance details

Defined in Distribution.Types.ExecutableScope

Methods

compare :: ExecutableScope -> ExecutableScope -> Ordering #

(<) :: ExecutableScope -> ExecutableScope -> Bool #

(<=) :: ExecutableScope -> ExecutableScope -> Bool #

(>) :: ExecutableScope -> ExecutableScope -> Bool #

(>=) :: ExecutableScope -> ExecutableScope -> Bool #

max :: ExecutableScope -> ExecutableScope -> ExecutableScope #

min :: ExecutableScope -> ExecutableScope -> ExecutableScope #

Ord FlagAssignment 
Instance details

Defined in Distribution.Types.Flag

Methods

compare :: FlagAssignment -> FlagAssignment -> Ordering #

(<) :: FlagAssignment -> FlagAssignment -> Bool #

(<=) :: FlagAssignment -> FlagAssignment -> Bool #

(>) :: FlagAssignment -> FlagAssignment -> Bool #

(>=) :: FlagAssignment -> FlagAssignment -> Bool #

max :: FlagAssignment -> FlagAssignment -> FlagAssignment #

min :: FlagAssignment -> FlagAssignment -> FlagAssignment #

Ord FlagName 
Instance details

Defined in Distribution.Types.Flag

Ord ForeignLib 
Instance details

Defined in Distribution.Types.ForeignLib

Methods

compare :: ForeignLib -> ForeignLib -> Ordering #

(<) :: ForeignLib -> ForeignLib -> Bool #

(<=) :: ForeignLib -> ForeignLib -> Bool #

(>) :: ForeignLib -> ForeignLib -> Bool #

(>=) :: ForeignLib -> ForeignLib -> Bool #

max :: ForeignLib -> ForeignLib -> ForeignLib #

min :: ForeignLib -> ForeignLib -> ForeignLib #

Ord LibVersionInfo 
Instance details

Defined in Distribution.Types.ForeignLib

Methods

compare :: LibVersionInfo -> LibVersionInfo -> Ordering #

(<) :: LibVersionInfo -> LibVersionInfo -> Bool #

(<=) :: LibVersionInfo -> LibVersionInfo -> Bool #

(>) :: LibVersionInfo -> LibVersionInfo -> Bool #

(>=) :: LibVersionInfo -> LibVersionInfo -> Bool #

max :: LibVersionInfo -> LibVersionInfo -> LibVersionInfo #

min :: LibVersionInfo -> LibVersionInfo -> LibVersionInfo #

Ord ForeignLibOption 
Instance details

Defined in Distribution.Types.ForeignLibOption

Methods

compare :: ForeignLibOption -> ForeignLibOption -> Ordering #

(<) :: ForeignLibOption -> ForeignLibOption -> Bool #

(<=) :: ForeignLibOption -> ForeignLibOption -> Bool #

(>) :: ForeignLibOption -> ForeignLibOption -> Bool #

(>=) :: ForeignLibOption -> ForeignLibOption -> Bool #

max :: ForeignLibOption -> ForeignLibOption -> ForeignLibOption #

min :: ForeignLibOption -> ForeignLibOption -> ForeignLibOption #

Ord ForeignLibType 
Instance details

Defined in Distribution.Types.ForeignLibType

Methods

compare :: ForeignLibType -> ForeignLibType -> Ordering #

(<) :: ForeignLibType -> ForeignLibType -> Bool #

(<=) :: ForeignLibType -> ForeignLibType -> Bool #

(>) :: ForeignLibType -> ForeignLibType -> Bool #

(>=) :: ForeignLibType -> ForeignLibType -> Bool #

max :: ForeignLibType -> ForeignLibType -> ForeignLibType #

min :: ForeignLibType -> ForeignLibType -> ForeignLibType #

Ord IncludeRenaming 
Instance details

Defined in Distribution.Types.IncludeRenaming

Methods

compare :: IncludeRenaming -> IncludeRenaming -> Ordering #

(<) :: IncludeRenaming -> IncludeRenaming -> Bool #

(<=) :: IncludeRenaming -> IncludeRenaming -> Bool #

(>) :: IncludeRenaming -> IncludeRenaming -> Bool #

(>=) :: IncludeRenaming -> IncludeRenaming -> Bool #

max :: IncludeRenaming -> IncludeRenaming -> IncludeRenaming #

min :: IncludeRenaming -> IncludeRenaming -> IncludeRenaming #

Ord LegacyExeDependency 
Instance details

Defined in Distribution.Types.LegacyExeDependency

Methods

compare :: LegacyExeDependency -> LegacyExeDependency -> Ordering #

(<) :: LegacyExeDependency -> LegacyExeDependency -> Bool #

(<=) :: LegacyExeDependency -> LegacyExeDependency -> Bool #

(>) :: LegacyExeDependency -> LegacyExeDependency -> Bool #

(>=) :: LegacyExeDependency -> LegacyExeDependency -> Bool #

max :: LegacyExeDependency -> LegacyExeDependency -> LegacyExeDependency #

min :: LegacyExeDependency -> LegacyExeDependency -> LegacyExeDependency #

Ord Library 
Instance details

Defined in Distribution.Types.Library

Methods

compare :: Library -> Library -> Ordering #

(<) :: Library -> Library -> Bool #

(<=) :: Library -> Library -> Bool #

(>) :: Library -> Library -> Bool #

(>=) :: Library -> Library -> Bool #

max :: Library -> Library -> Library #

min :: Library -> Library -> Library #

Ord LibraryName 
Instance details

Defined in Distribution.Types.LibraryName

Ord LibraryVisibility 
Instance details

Defined in Distribution.Types.LibraryVisibility

Methods

compare :: LibraryVisibility -> LibraryVisibility -> Ordering #

(<) :: LibraryVisibility -> LibraryVisibility -> Bool #

(<=) :: LibraryVisibility -> LibraryVisibility -> Bool #

(>) :: LibraryVisibility -> LibraryVisibility -> Bool #

(>=) :: LibraryVisibility -> LibraryVisibility -> Bool #

max :: LibraryVisibility -> LibraryVisibility -> LibraryVisibility #

min :: LibraryVisibility -> LibraryVisibility -> LibraryVisibility #

Ord Mixin 
Instance details

Defined in Distribution.Types.Mixin

Methods

compare :: Mixin -> Mixin -> Ordering #

(<) :: Mixin -> Mixin -> Bool #

(<=) :: Mixin -> Mixin -> Bool #

(>) :: Mixin -> Mixin -> Bool #

(>=) :: Mixin -> Mixin -> Bool #

max :: Mixin -> Mixin -> Mixin #

min :: Mixin -> Mixin -> Mixin #

Ord Module 
Instance details

Defined in Distribution.Types.Module

Methods

compare :: Module -> Module -> Ordering #

(<) :: Module -> Module -> Bool #

(<=) :: Module -> Module -> Bool #

(>) :: Module -> Module -> Bool #

(>=) :: Module -> Module -> Bool #

max :: Module -> Module -> Module #

min :: Module -> Module -> Module #

Ord ModuleReexport 
Instance details

Defined in Distribution.Types.ModuleReexport

Methods

compare :: ModuleReexport -> ModuleReexport -> Ordering #

(<) :: ModuleReexport -> ModuleReexport -> Bool #

(<=) :: ModuleReexport -> ModuleReexport -> Bool #

(>) :: ModuleReexport -> ModuleReexport -> Bool #

(>=) :: ModuleReexport -> ModuleReexport -> Bool #

max :: ModuleReexport -> ModuleReexport -> ModuleReexport #

min :: ModuleReexport -> ModuleReexport -> ModuleReexport #

Ord ModuleRenaming 
Instance details

Defined in Distribution.Types.ModuleRenaming

Methods

compare :: ModuleRenaming -> ModuleRenaming -> Ordering #

(<) :: ModuleRenaming -> ModuleRenaming -> Bool #

(<=) :: ModuleRenaming -> ModuleRenaming -> Bool #

(>) :: ModuleRenaming -> ModuleRenaming -> Bool #

(>=) :: ModuleRenaming -> ModuleRenaming -> Bool #

max :: ModuleRenaming -> ModuleRenaming -> ModuleRenaming #

min :: ModuleRenaming -> ModuleRenaming -> ModuleRenaming #

Ord MungedPackageId 
Instance details

Defined in Distribution.Types.MungedPackageId

Ord MungedPackageName 
Instance details

Defined in Distribution.Types.MungedPackageName

Ord PackageDescription 
Instance details

Defined in Distribution.Types.PackageDescription

Methods

compare :: PackageDescription -> PackageDescription -> Ordering #

(<) :: PackageDescription -> PackageDescription -> Bool #

(<=) :: PackageDescription -> PackageDescription -> Bool #

(>) :: PackageDescription -> PackageDescription -> Bool #

(>=) :: PackageDescription -> PackageDescription -> Bool #

max :: PackageDescription -> PackageDescription -> PackageDescription #

min :: PackageDescription -> PackageDescription -> PackageDescription #

Ord PackageIdentifier 
Instance details

Defined in Distribution.Types.PackageId

Ord PackageName 
Instance details

Defined in Distribution.Types.PackageName

Ord PkgconfigDependency 
Instance details

Defined in Distribution.Types.PkgconfigDependency

Methods

compare :: PkgconfigDependency -> PkgconfigDependency -> Ordering #

(<) :: PkgconfigDependency -> PkgconfigDependency -> Bool #

(<=) :: PkgconfigDependency -> PkgconfigDependency -> Bool #

(>) :: PkgconfigDependency -> PkgconfigDependency -> Bool #

(>=) :: PkgconfigDependency -> PkgconfigDependency -> Bool #

max :: PkgconfigDependency -> PkgconfigDependency -> PkgconfigDependency #

min :: PkgconfigDependency -> PkgconfigDependency -> PkgconfigDependency #

Ord PkgconfigName 
Instance details

Defined in Distribution.Types.PkgconfigName

Methods

compare :: PkgconfigName -> PkgconfigName -> Ordering #

(<) :: PkgconfigName -> PkgconfigName -> Bool #

(<=) :: PkgconfigName -> PkgconfigName -> Bool #

(>) :: PkgconfigName -> PkgconfigName -> Bool #

(>=) :: PkgconfigName -> PkgconfigName -> Bool #

max :: PkgconfigName -> PkgconfigName -> PkgconfigName #

min :: PkgconfigName -> PkgconfigName -> PkgconfigName #

Ord PkgconfigVersion 
Instance details

Defined in Distribution.Types.PkgconfigVersion

Methods

compare :: PkgconfigVersion -> PkgconfigVersion -> Ordering #

(<) :: PkgconfigVersion -> PkgconfigVersion -> Bool #

(<=) :: PkgconfigVersion -> PkgconfigVersion -> Bool #

(>) :: PkgconfigVersion -> PkgconfigVersion -> Bool #

(>=) :: PkgconfigVersion -> PkgconfigVersion -> Bool #

max :: PkgconfigVersion -> PkgconfigVersion -> PkgconfigVersion #

min :: PkgconfigVersion -> PkgconfigVersion -> PkgconfigVersion #

Ord PkgconfigVersionRange 
Instance details

Defined in Distribution.Types.PkgconfigVersionRange

Methods

compare :: PkgconfigVersionRange -> PkgconfigVersionRange -> Ordering #

(<) :: PkgconfigVersionRange -> PkgconfigVersionRange -> Bool #

(<=) :: PkgconfigVersionRange -> PkgconfigVersionRange -> Bool #

(>) :: PkgconfigVersionRange -> PkgconfigVersionRange -> Bool #

(>=) :: PkgconfigVersionRange -> PkgconfigVersionRange -> Bool #

max :: PkgconfigVersionRange -> PkgconfigVersionRange -> PkgconfigVersionRange #

min :: PkgconfigVersionRange -> PkgconfigVersionRange -> PkgconfigVersionRange #

Ord SetupBuildInfo 
Instance details

Defined in Distribution.Types.SetupBuildInfo

Methods

compare :: SetupBuildInfo -> SetupBuildInfo -> Ordering #

(<) :: SetupBuildInfo -> SetupBuildInfo -> Bool #

(<=) :: SetupBuildInfo -> SetupBuildInfo -> Bool #

(>) :: SetupBuildInfo -> SetupBuildInfo -> Bool #

(>=) :: SetupBuildInfo -> SetupBuildInfo -> Bool #

max :: SetupBuildInfo -> SetupBuildInfo -> SetupBuildInfo #

min :: SetupBuildInfo -> SetupBuildInfo -> SetupBuildInfo #

Ord KnownRepoType 
Instance details

Defined in Distribution.Types.SourceRepo

Methods

compare :: KnownRepoType -> KnownRepoType -> Ordering #

(<) :: KnownRepoType -> KnownRepoType -> Bool #

(<=) :: KnownRepoType -> KnownRepoType -> Bool #

(>) :: KnownRepoType -> KnownRepoType -> Bool #

(>=) :: KnownRepoType -> KnownRepoType -> Bool #

max :: KnownRepoType -> KnownRepoType -> KnownRepoType #

min :: KnownRepoType -> KnownRepoType -> KnownRepoType #

Ord RepoKind 
Instance details

Defined in Distribution.Types.SourceRepo

Methods

compare :: RepoKind -> RepoKind -> Ordering #

(<) :: RepoKind -> RepoKind -> Bool #

(<=) :: RepoKind -> RepoKind -> Bool #

(>) :: RepoKind -> RepoKind -> Bool #

(>=) :: RepoKind -> RepoKind -> Bool #

max :: RepoKind -> RepoKind -> RepoKind #

min :: RepoKind -> RepoKind -> RepoKind #

Ord RepoType 
Instance details

Defined in Distribution.Types.SourceRepo

Methods

compare :: RepoType -> RepoType -> Ordering #

(<) :: RepoType -> RepoType -> Bool #

(<=) :: RepoType -> RepoType -> Bool #

(>) :: RepoType -> RepoType -> Bool #

(>=) :: RepoType -> RepoType -> Bool #

max :: RepoType -> RepoType -> RepoType #

min :: RepoType -> RepoType -> RepoType #

Ord SourceRepo 
Instance details

Defined in Distribution.Types.SourceRepo

Methods

compare :: SourceRepo -> SourceRepo -> Ordering #

(<) :: SourceRepo -> SourceRepo -> Bool #

(<=) :: SourceRepo -> SourceRepo -> Bool #

(>) :: SourceRepo -> SourceRepo -> Bool #

(>=) :: SourceRepo -> SourceRepo -> Bool #

max :: SourceRepo -> SourceRepo -> SourceRepo #

min :: SourceRepo -> SourceRepo -> SourceRepo #

Ord TestSuite 
Instance details

Defined in Distribution.Types.TestSuite

Methods

compare :: TestSuite -> TestSuite -> Ordering #

(<) :: TestSuite -> TestSuite -> Bool #

(<=) :: TestSuite -> TestSuite -> Bool #

(>) :: TestSuite -> TestSuite -> Bool #

(>=) :: TestSuite -> TestSuite -> Bool #

max :: TestSuite -> TestSuite -> TestSuite #

min :: TestSuite -> TestSuite -> TestSuite #

Ord TestSuiteInterface 
Instance details

Defined in Distribution.Types.TestSuiteInterface

Methods

compare :: TestSuiteInterface -> TestSuiteInterface -> Ordering #

(<) :: TestSuiteInterface -> TestSuiteInterface -> Bool #

(<=) :: TestSuiteInterface -> TestSuiteInterface -> Bool #

(>) :: TestSuiteInterface -> TestSuiteInterface -> Bool #

(>=) :: TestSuiteInterface -> TestSuiteInterface -> Bool #

max :: TestSuiteInterface -> TestSuiteInterface -> TestSuiteInterface #

min :: TestSuiteInterface -> TestSuiteInterface -> TestSuiteInterface #

Ord TestType 
Instance details

Defined in Distribution.Types.TestType

Methods

compare :: TestType -> TestType -> Ordering #

(<) :: TestType -> TestType -> Bool #

(<=) :: TestType -> TestType -> Bool #

(>) :: TestType -> TestType -> Bool #

(>=) :: TestType -> TestType -> Bool #

max :: TestType -> TestType -> TestType #

min :: TestType -> TestType -> TestType #

Ord DefUnitId 
Instance details

Defined in Distribution.Types.UnitId

Methods

compare :: DefUnitId -> DefUnitId -> Ordering #

(<) :: DefUnitId -> DefUnitId -> Bool #

(<=) :: DefUnitId -> DefUnitId -> Bool #

(>) :: DefUnitId -> DefUnitId -> Bool #

(>=) :: DefUnitId -> DefUnitId -> Bool #

max :: DefUnitId -> DefUnitId -> DefUnitId #

min :: DefUnitId -> DefUnitId -> DefUnitId #

Ord UnitId 
Instance details

Defined in Distribution.Types.UnitId

Methods

compare :: UnitId -> UnitId -> Ordering #

(<) :: UnitId -> UnitId -> Bool #

(<=) :: UnitId -> UnitId -> Bool #

(>) :: UnitId -> UnitId -> Bool #

(>=) :: UnitId -> UnitId -> Bool #

max :: UnitId -> UnitId -> UnitId #

min :: UnitId -> UnitId -> UnitId #

Ord UnqualComponentName 
Instance details

Defined in Distribution.Types.UnqualComponentName

Methods

compare :: UnqualComponentName -> UnqualComponentName -> Ordering #

(<) :: UnqualComponentName -> UnqualComponentName -> Bool #

(<=) :: UnqualComponentName -> UnqualComponentName -> Bool #

(>) :: UnqualComponentName -> UnqualComponentName -> Bool #

(>=) :: UnqualComponentName -> UnqualComponentName -> Bool #

max :: UnqualComponentName -> UnqualComponentName -> UnqualComponentName #

min :: UnqualComponentName -> UnqualComponentName -> UnqualComponentName #

Ord Version 
Instance details

Defined in Distribution.Types.Version

Ord LowerBound 
Instance details

Defined in Distribution.Types.VersionInterval.Legacy

Methods

compare :: LowerBound -> LowerBound -> Ordering #

(<) :: LowerBound -> LowerBound -> Bool #

(<=) :: LowerBound -> LowerBound -> Bool #

(>) :: LowerBound -> LowerBound -> Bool #

(>=) :: LowerBound -> LowerBound -> Bool #

max :: LowerBound -> LowerBound -> LowerBound #

min :: LowerBound -> LowerBound -> LowerBound #

Ord UpperBound 
Instance details

Defined in Distribution.Types.VersionInterval.Legacy

Methods

compare :: UpperBound -> UpperBound -> Ordering #

(<) :: UpperBound -> UpperBound -> Bool #

(<=) :: UpperBound -> UpperBound -> Bool #

(>) :: UpperBound -> UpperBound -> Bool #

(>=) :: UpperBound -> UpperBound -> Bool #

max :: UpperBound -> UpperBound -> UpperBound #

min :: UpperBound -> UpperBound -> UpperBound #

Ord VersionRange 
Instance details

Defined in Distribution.Types.VersionRange.Internal

Ord ShortText 
Instance details

Defined in Distribution.Utils.ShortText

Methods

compare :: ShortText -> ShortText -> Ordering #

(<) :: ShortText -> ShortText -> Bool #

(<=) :: ShortText -> ShortText -> Bool #

(>) :: ShortText -> ShortText -> Bool #

(>=) :: ShortText -> ShortText -> Bool #

max :: ShortText -> ShortText -> ShortText #

min :: ShortText -> ShortText -> ShortText #

Ord Structure 
Instance details

Defined in Distribution.Utils.Structured

Methods

compare :: Structure -> Structure -> Ordering #

(<) :: Structure -> Structure -> Bool #

(<=) :: Structure -> Structure -> Bool #

(>) :: Structure -> Structure -> Bool #

(>=) :: Structure -> Structure -> Bool #

max :: Structure -> Structure -> Structure #

min :: Structure -> Structure -> Structure #

Ord Extension 
Instance details

Defined in Language.Haskell.Extension

Methods

compare :: Extension -> Extension -> Ordering #

(<) :: Extension -> Extension -> Bool #

(<=) :: Extension -> Extension -> Bool #

(>) :: Extension -> Extension -> Bool #

(>=) :: Extension -> Extension -> Bool #

max :: Extension -> Extension -> Extension #

min :: Extension -> Extension -> Extension #

Ord KnownExtension 
Instance details

Defined in Language.Haskell.Extension

Methods

compare :: KnownExtension -> KnownExtension -> Ordering #

(<) :: KnownExtension -> KnownExtension -> Bool #

(<=) :: KnownExtension -> KnownExtension -> Bool #

(>) :: KnownExtension -> KnownExtension -> Bool #

(>=) :: KnownExtension -> KnownExtension -> Bool #

max :: KnownExtension -> KnownExtension -> KnownExtension #

min :: KnownExtension -> KnownExtension -> KnownExtension #

Ord Language 
Instance details

Defined in Language.Haskell.Extension

Methods

compare :: Language -> Language -> Ordering #

(<) :: Language -> Language -> Bool #

(<=) :: Language -> Language -> Bool #

(>) :: Language -> Language -> Bool #

(>=) :: Language -> Language -> Bool #

max :: Language -> Language -> Language #

min :: Language -> Language -> Language #

Ord Key 
Instance details

Defined in Data.Aeson.Key

Methods

compare :: Key -> Key -> Ordering #

(<) :: Key -> Key -> Bool #

(<=) :: Key -> Key -> Bool #

(>) :: Key -> Key -> Bool #

(>=) :: Key -> Key -> Bool #

max :: Key -> Key -> Key #

min :: Key -> Key -> Key #

Ord Arity 
Instance details

Defined in Data.Aeson.TH

Methods

compare :: Arity -> Arity -> Ordering #

(<) :: Arity -> Arity -> Bool #

(<=) :: Arity -> Arity -> Bool #

(>) :: Arity -> Arity -> Bool #

(>=) :: Arity -> Arity -> Bool #

max :: Arity -> Arity -> Arity #

min :: Arity -> Arity -> Arity #

Ord DotNetTime 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

compare :: DotNetTime -> DotNetTime -> Ordering #

(<) :: DotNetTime -> DotNetTime -> Bool #

(<=) :: DotNetTime -> DotNetTime -> Bool #

(>) :: DotNetTime -> DotNetTime -> Bool #

(>=) :: DotNetTime -> DotNetTime -> Bool #

max :: DotNetTime -> DotNetTime -> DotNetTime #

min :: DotNetTime -> DotNetTime -> DotNetTime #

Ord JSONPathElement 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

compare :: JSONPathElement -> JSONPathElement -> Ordering #

(<) :: JSONPathElement -> JSONPathElement -> Bool #

(<=) :: JSONPathElement -> JSONPathElement -> Bool #

(>) :: JSONPathElement -> JSONPathElement -> Bool #

(>=) :: JSONPathElement -> JSONPathElement -> Bool #

max :: JSONPathElement -> JSONPathElement -> JSONPathElement #

min :: JSONPathElement -> JSONPathElement -> JSONPathElement #

Ord Value 
Instance details

Defined in Data.Aeson.Types.Internal

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 #

Ord BlinkSpeed 
Instance details

Defined in System.Console.ANSI.Types

Methods

compare :: BlinkSpeed -> BlinkSpeed -> Ordering #

(<) :: BlinkSpeed -> BlinkSpeed -> Bool #

(<=) :: BlinkSpeed -> BlinkSpeed -> Bool #

(>) :: BlinkSpeed -> BlinkSpeed -> Bool #

(>=) :: BlinkSpeed -> BlinkSpeed -> Bool #

max :: BlinkSpeed -> BlinkSpeed -> BlinkSpeed #

min :: BlinkSpeed -> BlinkSpeed -> BlinkSpeed #

Ord Color 
Instance details

Defined in System.Console.ANSI.Types

Methods

compare :: Color -> Color -> Ordering #

(<) :: Color -> Color -> Bool #

(<=) :: Color -> Color -> Bool #

(>) :: Color -> Color -> Bool #

(>=) :: Color -> Color -> Bool #

max :: Color -> Color -> Color #

min :: Color -> Color -> Color #

Ord ColorIntensity 
Instance details

Defined in System.Console.ANSI.Types

Methods

compare :: ColorIntensity -> ColorIntensity -> Ordering #

(<) :: ColorIntensity -> ColorIntensity -> Bool #

(<=) :: ColorIntensity -> ColorIntensity -> Bool #

(>) :: ColorIntensity -> ColorIntensity -> Bool #

(>=) :: ColorIntensity -> ColorIntensity -> Bool #

max :: ColorIntensity -> ColorIntensity -> ColorIntensity #

min :: ColorIntensity -> ColorIntensity -> ColorIntensity #

Ord ConsoleIntensity 
Instance details

Defined in System.Console.ANSI.Types

Methods

compare :: ConsoleIntensity -> ConsoleIntensity -> Ordering #

(<) :: ConsoleIntensity -> ConsoleIntensity -> Bool #

(<=) :: ConsoleIntensity -> ConsoleIntensity -> Bool #

(>) :: ConsoleIntensity -> ConsoleIntensity -> Bool #

(>=) :: ConsoleIntensity -> ConsoleIntensity -> Bool #

max :: ConsoleIntensity -> ConsoleIntensity -> ConsoleIntensity #

min :: ConsoleIntensity -> ConsoleIntensity -> ConsoleIntensity #

Ord ConsoleLayer 
Instance details

Defined in System.Console.ANSI.Types

Methods

compare :: ConsoleLayer -> ConsoleLayer -> Ordering #

(<) :: ConsoleLayer -> ConsoleLayer -> Bool #

(<=) :: ConsoleLayer -> ConsoleLayer -> Bool #

(>) :: ConsoleLayer -> ConsoleLayer -> Bool #

(>=) :: ConsoleLayer -> ConsoleLayer -> Bool #

max :: ConsoleLayer -> ConsoleLayer -> ConsoleLayer #

min :: ConsoleLayer -> ConsoleLayer -> ConsoleLayer #

Ord Underlining 
Instance details

Defined in System.Console.ANSI.Types

Methods

compare :: Underlining -> Underlining -> Ordering #

(<) :: Underlining -> Underlining -> Bool #

(<=) :: Underlining -> Underlining -> Bool #

(>) :: Underlining -> Underlining -> Bool #

(>=) :: Underlining -> Underlining -> Bool #

max :: Underlining -> Underlining -> Underlining #

min :: Underlining -> Underlining -> Underlining #

Ord Pos 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

compare :: Pos -> Pos -> Ordering #

(<) :: Pos -> Pos -> Bool #

(<=) :: Pos -> Pos -> Bool #

(>) :: Pos -> Pos -> Bool #

(>=) :: Pos -> Pos -> Bool #

max :: Pos -> Pos -> Pos #

min :: Pos -> Pos -> Pos #

Ord Number 
Instance details

Defined in Data.Attoparsec.Number

Methods

compare :: Number -> Number -> Ordering #

(<) :: Number -> Number -> Bool #

(<=) :: Number -> Number -> Bool #

(>) :: Number -> Number -> Bool #

(>=) :: Number -> Number -> Bool #

max :: Number -> Number -> Number #

min :: Number -> Number -> Number #

Ord ByteArray 
Instance details

Defined in Data.Array.Byte

Methods

compare :: ByteArray -> ByteArray -> Ordering #

(<) :: ByteArray -> ByteArray -> Bool #

(<=) :: ByteArray -> ByteArray -> Bool #

(>) :: ByteArray -> ByteArray -> Bool #

(>=) :: ByteArray -> ByteArray -> Bool #

max :: ByteArray -> ByteArray -> ByteArray #

min :: ByteArray -> ByteArray -> ByteArray #

Ord All 
Instance details

Defined in Data.Semigroup.Internal

Methods

compare :: All -> All -> Ordering #

(<) :: All -> All -> Bool #

(<=) :: All -> All -> Bool #

(>) :: All -> All -> Bool #

(>=) :: All -> All -> Bool #

max :: All -> All -> All #

min :: All -> All -> All #

Ord Any 
Instance details

Defined in Data.Semigroup.Internal

Methods

compare :: Any -> Any -> Ordering #

(<) :: Any -> Any -> Bool #

(<=) :: Any -> Any -> Bool #

(>) :: Any -> Any -> Bool #

(>=) :: Any -> Any -> Bool #

max :: Any -> Any -> Any #

min :: Any -> Any -> Any #

Ord SomeTypeRep 
Instance details

Defined in Data.Typeable.Internal

Methods

compare :: SomeTypeRep -> SomeTypeRep -> Ordering #

(<) :: SomeTypeRep -> SomeTypeRep -> Bool #

(<=) :: SomeTypeRep -> SomeTypeRep -> Bool #

(>) :: SomeTypeRep -> SomeTypeRep -> Bool #

(>=) :: SomeTypeRep -> SomeTypeRep -> Bool #

max :: SomeTypeRep -> SomeTypeRep -> SomeTypeRep #

min :: SomeTypeRep -> SomeTypeRep -> SomeTypeRep #

Ord Unique 
Instance details

Defined in Data.Unique

Methods

compare :: Unique -> Unique -> Ordering #

(<) :: Unique -> Unique -> Bool #

(<=) :: Unique -> Unique -> Bool #

(>) :: Unique -> Unique -> Bool #

(>=) :: Unique -> Unique -> Bool #

max :: Unique -> Unique -> Unique #

min :: Unique -> Unique -> Unique #

Ord Version 
Instance details

Defined in Data.Version

Methods

compare :: Version -> Version -> Ordering #

(<) :: Version -> Version -> Bool #

(<=) :: Version -> Version -> Bool #

(>) :: Version -> Version -> Bool #

(>=) :: Version -> Version -> Bool #

max :: Version -> Version -> Version #

min :: Version -> Version -> Version #

Ord CBool 
Instance details

Defined in Foreign.C.Types

Methods

compare :: CBool -> CBool -> Ordering #

(<) :: CBool -> CBool -> Bool #

(<=) :: CBool -> CBool -> Bool #

(>) :: CBool -> CBool -> Bool #

(>=) :: CBool -> CBool -> Bool #

max :: CBool -> CBool -> CBool #

min :: CBool -> CBool -> CBool #

Ord CChar 
Instance details

Defined in Foreign.C.Types

Methods

compare :: CChar -> CChar -> Ordering #

(<) :: CChar -> CChar -> Bool #

(<=) :: CChar -> CChar -> Bool #

(>) :: CChar -> CChar -> Bool #

(>=) :: CChar -> CChar -> Bool #

max :: CChar -> CChar -> CChar #

min :: CChar -> CChar -> CChar #

Ord CClock 
Instance details

Defined in Foreign.C.Types

Methods

compare :: CClock -> CClock -> Ordering #

(<) :: CClock -> CClock -> Bool #

(<=) :: CClock -> CClock -> Bool #

(>) :: CClock -> CClock -> Bool #

(>=) :: CClock -> CClock -> Bool #

max :: CClock -> CClock -> CClock #

min :: CClock -> CClock -> CClock #

Ord CDouble 
Instance details

Defined in Foreign.C.Types

Methods

compare :: CDouble -> CDouble -> Ordering #

(<) :: CDouble -> CDouble -> Bool #

(<=) :: CDouble -> CDouble -> Bool #

(>) :: CDouble -> CDouble -> Bool #

(>=) :: CDouble -> CDouble -> Bool #

max :: CDouble -> CDouble -> CDouble #

min :: CDouble -> CDouble -> CDouble #

Ord CFloat 
Instance details

Defined in Foreign.C.Types

Methods

compare :: CFloat -> CFloat -> Ordering #

(<) :: CFloat -> CFloat -> Bool #

(<=) :: CFloat -> CFloat -> Bool #

(>) :: CFloat -> CFloat -> Bool #

(>=) :: CFloat -> CFloat -> Bool #

max :: CFloat -> CFloat -> CFloat #

min :: CFloat -> CFloat -> CFloat #

Ord CInt 
Instance details

Defined in Foreign.C.Types

Methods

compare :: CInt -> CInt -> Ordering #

(<) :: CInt -> CInt -> Bool #

(<=) :: CInt -> CInt -> Bool #

(>) :: CInt -> CInt -> Bool #

(>=) :: CInt -> CInt -> Bool #

max :: CInt -> CInt -> CInt #

min :: CInt -> CInt -> CInt #

Ord CIntMax 
Instance details

Defined in Foreign.C.Types

Methods

compare :: CIntMax -> CIntMax -> Ordering #

(<) :: CIntMax -> CIntMax -> Bool #

(<=) :: CIntMax -> CIntMax -> Bool #

(>) :: CIntMax -> CIntMax -> Bool #

(>=) :: CIntMax -> CIntMax -> Bool #

max :: CIntMax -> CIntMax -> CIntMax #

min :: CIntMax -> CIntMax -> CIntMax #

Ord CIntPtr 
Instance details

Defined in Foreign.C.Types

Methods

compare :: CIntPtr -> CIntPtr -> Ordering #

(<) :: CIntPtr -> CIntPtr -> Bool #

(<=) :: CIntPtr -> CIntPtr -> Bool #

(>) :: CIntPtr -> CIntPtr -> Bool #

(>=) :: CIntPtr -> CIntPtr -> Bool #

max :: CIntPtr -> CIntPtr -> CIntPtr #

min :: CIntPtr -> CIntPtr -> CIntPtr #

Ord CLLong 
Instance details

Defined in Foreign.C.Types

Methods

compare :: CLLong -> CLLong -> Ordering #

(<) :: CLLong -> CLLong -> Bool #

(<=) :: CLLong -> CLLong -> Bool #

(>) :: CLLong -> CLLong -> Bool #

(>=) :: CLLong -> CLLong -> Bool #

max :: CLLong -> CLLong -> CLLong #

min :: CLLong -> CLLong -> CLLong #

Ord CLong 
Instance details

Defined in Foreign.C.Types

Methods

compare :: CLong -> CLong -> Ordering #

(<) :: CLong -> CLong -> Bool #

(<=) :: CLong -> CLong -> Bool #

(>) :: CLong -> CLong -> Bool #

(>=) :: CLong -> CLong -> Bool #

max :: CLong -> CLong -> CLong #

min :: CLong -> CLong -> CLong #

Ord CPtrdiff 
Instance details

Defined in Foreign.C.Types

Methods

compare :: CPtrdiff -> CPtrdiff -> Ordering #

(<) :: CPtrdiff -> CPtrdiff -> Bool #

(<=) :: CPtrdiff -> CPtrdiff -> Bool #

(>) :: CPtrdiff -> CPtrdiff -> Bool #

(>=) :: CPtrdiff -> CPtrdiff -> Bool #

max :: CPtrdiff -> CPtrdiff -> CPtrdiff #

min :: CPtrdiff -> CPtrdiff -> CPtrdiff #

Ord CSChar 
Instance details

Defined in Foreign.C.Types

Methods

compare :: CSChar -> CSChar -> Ordering #

(<) :: CSChar -> CSChar -> Bool #

(<=) :: CSChar -> CSChar -> Bool #

(>) :: CSChar -> CSChar -> Bool #

(>=) :: CSChar -> CSChar -> Bool #

max :: CSChar -> CSChar -> CSChar #

min :: CSChar -> CSChar -> CSChar #

Ord CSUSeconds 
Instance details

Defined in Foreign.C.Types

Methods

compare :: CSUSeconds -> CSUSeconds -> Ordering #

(<) :: CSUSeconds -> CSUSeconds -> Bool #

(<=) :: CSUSeconds -> CSUSeconds -> Bool #

(>) :: CSUSeconds -> CSUSeconds -> Bool #

(>=) :: CSUSeconds -> CSUSeconds -> Bool #

max :: CSUSeconds -> CSUSeconds -> CSUSeconds #

min :: CSUSeconds -> CSUSeconds -> CSUSeconds #

Ord CShort 
Instance details

Defined in Foreign.C.Types

Methods

compare :: CShort -> CShort -> Ordering #

(<) :: CShort -> CShort -> Bool #

(<=) :: CShort -> CShort -> Bool #

(>) :: CShort -> CShort -> Bool #

(>=) :: CShort -> CShort -> Bool #

max :: CShort -> CShort -> CShort #

min :: CShort -> CShort -> CShort #

Ord CSigAtomic 
Instance details

Defined in Foreign.C.Types

Methods

compare :: CSigAtomic -> CSigAtomic -> Ordering #

(<) :: CSigAtomic -> CSigAtomic -> Bool #

(<=) :: CSigAtomic -> CSigAtomic -> Bool #

(>) :: CSigAtomic -> CSigAtomic -> Bool #

(>=) :: CSigAtomic -> CSigAtomic -> Bool #

max :: CSigAtomic -> CSigAtomic -> CSigAtomic #

min :: CSigAtomic -> CSigAtomic -> CSigAtomic #

Ord CSize 
Instance details

Defined in Foreign.C.Types

Methods

compare :: CSize -> CSize -> Ordering #

(<) :: CSize -> CSize -> Bool #

(<=) :: CSize -> CSize -> Bool #

(>) :: CSize -> CSize -> Bool #

(>=) :: CSize -> CSize -> Bool #

max :: CSize -> CSize -> CSize #

min :: CSize -> CSize -> CSize #

Ord CTime 
Instance details

Defined in Foreign.C.Types

Methods

compare :: CTime -> CTime -> Ordering #

(<) :: CTime -> CTime -> Bool #

(<=) :: CTime -> CTime -> Bool #

(>) :: CTime -> CTime -> Bool #

(>=) :: CTime -> CTime -> Bool #

max :: CTime -> CTime -> CTime #

min :: CTime -> CTime -> CTime #

Ord CUChar 
Instance details

Defined in Foreign.C.Types

Methods

compare :: CUChar -> CUChar -> Ordering #

(<) :: CUChar -> CUChar -> Bool #

(<=) :: CUChar -> CUChar -> Bool #

(>) :: CUChar -> CUChar -> Bool #

(>=) :: CUChar -> CUChar -> Bool #

max :: CUChar -> CUChar -> CUChar #

min :: CUChar -> CUChar -> CUChar #

Ord CUInt 
Instance details

Defined in Foreign.C.Types

Methods

compare :: CUInt -> CUInt -> Ordering #

(<) :: CUInt -> CUInt -> Bool #

(<=) :: CUInt -> CUInt -> Bool #

(>) :: CUInt -> CUInt -> Bool #

(>=) :: CUInt -> CUInt -> Bool #

max :: CUInt -> CUInt -> CUInt #

min :: CUInt -> CUInt -> CUInt #

Ord CUIntMax 
Instance details

Defined in Foreign.C.Types

Methods

compare :: CUIntMax -> CUIntMax -> Ordering #

(<) :: CUIntMax -> CUIntMax -> Bool #

(<=) :: CUIntMax -> CUIntMax -> Bool #

(>) :: CUIntMax -> CUIntMax -> Bool #

(>=) :: CUIntMax -> CUIntMax -> Bool #

max :: CUIntMax -> CUIntMax -> CUIntMax #

min :: CUIntMax -> CUIntMax -> CUIntMax #

Ord CUIntPtr 
Instance details

Defined in Foreign.C.Types

Methods

compare :: CUIntPtr -> CUIntPtr -> Ordering #

(<) :: CUIntPtr -> CUIntPtr -> Bool #

(<=) :: CUIntPtr -> CUIntPtr -> Bool #

(>) :: CUIntPtr -> CUIntPtr -> Bool #

(>=) :: CUIntPtr -> CUIntPtr -> Bool #

max :: CUIntPtr -> CUIntPtr -> CUIntPtr #

min :: CUIntPtr -> CUIntPtr -> CUIntPtr #

Ord CULLong 
Instance details

Defined in Foreign.C.Types

Methods

compare :: CULLong -> CULLong -> Ordering #

(<) :: CULLong -> CULLong -> Bool #

(<=) :: CULLong -> CULLong -> Bool #

(>) :: CULLong -> CULLong -> Bool #

(>=) :: CULLong -> CULLong -> Bool #

max :: CULLong -> CULLong -> CULLong #

min :: CULLong -> CULLong -> CULLong #

Ord CULong 
Instance details

Defined in Foreign.C.Types

Methods

compare :: CULong -> CULong -> Ordering #

(<) :: CULong -> CULong -> Bool #

(<=) :: CULong -> CULong -> Bool #

(>) :: CULong -> CULong -> Bool #

(>=) :: CULong -> CULong -> Bool #

max :: CULong -> CULong -> CULong #

min :: CULong -> CULong -> CULong #

Ord CUSeconds 
Instance details

Defined in Foreign.C.Types

Methods

compare :: CUSeconds -> CUSeconds -> Ordering #

(<) :: CUSeconds -> CUSeconds -> Bool #

(<=) :: CUSeconds -> CUSeconds -> Bool #

(>) :: CUSeconds -> CUSeconds -> Bool #

(>=) :: CUSeconds -> CUSeconds -> Bool #

max :: CUSeconds -> CUSeconds -> CUSeconds #

min :: CUSeconds -> CUSeconds -> CUSeconds #

Ord CUShort 
Instance details

Defined in Foreign.C.Types

Methods

compare :: CUShort -> CUShort -> Ordering #

(<) :: CUShort -> CUShort -> Bool #

(<=) :: CUShort -> CUShort -> Bool #

(>) :: CUShort -> CUShort -> Bool #

(>=) :: CUShort -> CUShort -> Bool #

max :: CUShort -> CUShort -> CUShort #

min :: CUShort -> CUShort -> CUShort #

Ord CWchar 
Instance details

Defined in Foreign.C.Types

Methods

compare :: CWchar -> CWchar -> Ordering #

(<) :: CWchar -> CWchar -> Bool #

(<=) :: CWchar -> CWchar -> Bool #

(>) :: CWchar -> CWchar -> Bool #

(>=) :: CWchar -> CWchar -> Bool #

max :: CWchar -> CWchar -> CWchar #

min :: CWchar -> CWchar -> CWchar #

Ord IntPtr 
Instance details

Defined in Foreign.Ptr

Methods

compare :: IntPtr -> IntPtr -> Ordering #

(<) :: IntPtr -> IntPtr -> Bool #

(<=) :: IntPtr -> IntPtr -> Bool #

(>) :: IntPtr -> IntPtr -> Bool #

(>=) :: IntPtr -> IntPtr -> Bool #

max :: IntPtr -> IntPtr -> IntPtr #

min :: IntPtr -> IntPtr -> IntPtr #

Ord WordPtr 
Instance details

Defined in Foreign.Ptr

Methods

compare :: WordPtr -> WordPtr -> Ordering #

(<) :: WordPtr -> WordPtr -> Bool #

(<=) :: WordPtr -> WordPtr -> Bool #

(>) :: WordPtr -> WordPtr -> Bool #

(>=) :: WordPtr -> WordPtr -> Bool #

max :: WordPtr -> WordPtr -> WordPtr #

min :: WordPtr -> WordPtr -> WordPtr #

Ord Void 
Instance details

Defined in GHC.Base

Methods

compare :: Void -> Void -> Ordering #

(<) :: Void -> Void -> Bool #

(<=) :: Void -> Void -> Bool #

(>) :: Void -> Void -> Bool #

(>=) :: Void -> Void -> Bool #

max :: Void -> Void -> Void #

min :: Void -> Void -> Void #

Ord ByteOrder 
Instance details

Defined in GHC.ByteOrder

Methods

compare :: ByteOrder -> ByteOrder -> Ordering #

(<) :: ByteOrder -> ByteOrder -> Bool #

(<=) :: ByteOrder -> ByteOrder -> Bool #

(>) :: ByteOrder -> ByteOrder -> Bool #

(>=) :: ByteOrder -> ByteOrder -> Bool #

max :: ByteOrder -> ByteOrder -> ByteOrder #

min :: ByteOrder -> ByteOrder -> ByteOrder #

Ord BlockReason 
Instance details

Defined in GHC.Conc.Sync

Methods

compare :: BlockReason -> BlockReason -> Ordering #

(<) :: BlockReason -> BlockReason -> Bool #

(<=) :: BlockReason -> BlockReason -> Bool #

(>) :: BlockReason -> BlockReason -> Bool #

(>=) :: BlockReason -> BlockReason -> Bool #

max :: BlockReason -> BlockReason -> BlockReason #

min :: BlockReason -> BlockReason -> BlockReason #

Ord ThreadId 
Instance details

Defined in GHC.Conc.Sync

Ord ThreadStatus 
Instance details

Defined in GHC.Conc.Sync

Methods

compare :: ThreadStatus -> ThreadStatus -> Ordering #

(<) :: ThreadStatus -> ThreadStatus -> Bool #

(<=) :: ThreadStatus -> ThreadStatus -> Bool #

(>) :: ThreadStatus -> ThreadStatus -> Bool #

(>=) :: ThreadStatus -> ThreadStatus -> Bool #

max :: ThreadStatus -> ThreadStatus -> ThreadStatus #

min :: ThreadStatus -> ThreadStatus -> ThreadStatus #

Ord TimeoutKey 
Instance details

Defined in GHC.Event.TimeOut

Methods

compare :: TimeoutKey -> TimeoutKey -> Ordering #

(<) :: TimeoutKey -> TimeoutKey -> Bool #

(<=) :: TimeoutKey -> TimeoutKey -> Bool #

(>) :: TimeoutKey -> TimeoutKey -> Bool #

(>=) :: TimeoutKey -> TimeoutKey -> Bool #

max :: TimeoutKey -> TimeoutKey -> TimeoutKey #

min :: TimeoutKey -> TimeoutKey -> TimeoutKey #

Ord ErrorCall 
Instance details

Defined in GHC.Exception

Methods

compare :: ErrorCall -> ErrorCall -> Ordering #

(<) :: ErrorCall -> ErrorCall -> Bool #

(<=) :: ErrorCall -> ErrorCall -> Bool #

(>) :: ErrorCall -> ErrorCall -> Bool #

(>=) :: ErrorCall -> ErrorCall -> Bool #

max :: ErrorCall -> ErrorCall -> ErrorCall #

min :: ErrorCall -> ErrorCall -> ErrorCall #

Ord ArithException 
Instance details

Defined in GHC.Exception.Type

Methods

compare :: ArithException -> ArithException -> Ordering #

(<) :: ArithException -> ArithException -> Bool #

(<=) :: ArithException -> ArithException -> Bool #

(>) :: ArithException -> ArithException -> Bool #

(>=) :: ArithException -> ArithException -> Bool #

max :: ArithException -> ArithException -> ArithException #

min :: ArithException -> ArithException -> ArithException #

Ord Fingerprint 
Instance details

Defined in GHC.Fingerprint.Type

Methods

compare :: Fingerprint -> Fingerprint -> Ordering #

(<) :: Fingerprint -> Fingerprint -> Bool #

(<=) :: Fingerprint -> Fingerprint -> Bool #

(>) :: Fingerprint -> Fingerprint -> Bool #

(>=) :: Fingerprint -> Fingerprint -> Bool #

max :: Fingerprint -> Fingerprint -> Fingerprint #

min :: Fingerprint -> Fingerprint -> Fingerprint #

Ord Associativity 
Instance details

Defined in GHC.Generics

Methods

compare :: Associativity -> Associativity -> Ordering #

(<) :: Associativity -> Associativity -> Bool #

(<=) :: Associativity -> Associativity -> Bool #

(>) :: Associativity -> Associativity -> Bool #

(>=) :: Associativity -> Associativity -> Bool #

max :: Associativity -> Associativity -> Associativity #

min :: Associativity -> Associativity -> Associativity #

Ord DecidedStrictness 
Instance details

Defined in GHC.Generics

Methods

compare :: DecidedStrictness -> DecidedStrictness -> Ordering #

(<) :: DecidedStrictness -> DecidedStrictness -> Bool #

(<=) :: DecidedStrictness -> DecidedStrictness -> Bool #

(>) :: DecidedStrictness -> DecidedStrictness -> Bool #

(>=) :: DecidedStrictness -> DecidedStrictness -> Bool #

max :: DecidedStrictness -> DecidedStrictness -> DecidedStrictness #

min :: DecidedStrictness -> DecidedStrictness -> DecidedStrictness #

Ord Fixity 
Instance details

Defined in GHC.Generics

Methods

compare :: Fixity -> Fixity -> Ordering #

(<) :: Fixity -> Fixity -> Bool #

(<=) :: Fixity -> Fixity -> Bool #

(>) :: Fixity -> Fixity -> Bool #

(>=) :: Fixity -> Fixity -> Bool #

max :: Fixity -> Fixity -> Fixity #

min :: Fixity -> Fixity -> Fixity #

Ord SourceStrictness 
Instance details

Defined in GHC.Generics

Methods

compare :: SourceStrictness -> SourceStrictness -> Ordering #

(<) :: SourceStrictness -> SourceStrictness -> Bool #

(<=) :: SourceStrictness -> SourceStrictness -> Bool #

(>) :: SourceStrictness -> SourceStrictness -> Bool #

(>=) :: SourceStrictness -> SourceStrictness -> Bool #

max :: SourceStrictness -> SourceStrictness -> SourceStrictness #

min :: SourceStrictness -> SourceStrictness -> SourceStrictness #

Ord SourceUnpackedness 
Instance details

Defined in GHC.Generics

Methods

compare :: SourceUnpackedness -> SourceUnpackedness -> Ordering #

(<) :: SourceUnpackedness -> SourceUnpackedness -> Bool #

(<=) :: SourceUnpackedness -> SourceUnpackedness -> Bool #

(>) :: SourceUnpackedness -> SourceUnpackedness -> Bool #

(>=) :: SourceUnpackedness -> SourceUnpackedness -> Bool #

max :: SourceUnpackedness -> SourceUnpackedness -> SourceUnpackedness #

min :: SourceUnpackedness -> SourceUnpackedness -> SourceUnpackedness #

Ord SeekMode 
Instance details

Defined in GHC.IO.Device

Ord ArrayException 
Instance details

Defined in GHC.IO.Exception

Methods

compare :: ArrayException -> ArrayException -> Ordering #

(<) :: ArrayException -> ArrayException -> Bool #

(<=) :: ArrayException -> ArrayException -> Bool #

(>) :: ArrayException -> ArrayException -> Bool #

(>=) :: ArrayException -> ArrayException -> Bool #

max :: ArrayException -> ArrayException -> ArrayException #

min :: ArrayException -> ArrayException -> ArrayException #

Ord AsyncException 
Instance details

Defined in GHC.IO.Exception

Methods

compare :: AsyncException -> AsyncException -> Ordering #

(<) :: AsyncException -> AsyncException -> Bool #

(<=) :: AsyncException -> AsyncException -> Bool #

(>) :: AsyncException -> AsyncException -> Bool #

(>=) :: AsyncException -> AsyncException -> Bool #

max :: AsyncException -> AsyncException -> AsyncException #

min :: AsyncException -> AsyncException -> AsyncException #

Ord ExitCode 
Instance details

Defined in GHC.IO.Exception

Ord BufferMode 
Instance details

Defined in GHC.IO.Handle.Types

Ord Newline 
Instance details

Defined in GHC.IO.Handle.Types

Methods

compare :: Newline -> Newline -> Ordering #

(<) :: Newline -> Newline -> Bool #

(<=) :: Newline -> Newline -> Bool #

(>) :: Newline -> Newline -> Bool #

(>=) :: Newline -> Newline -> Bool #

max :: Newline -> Newline -> Newline #

min :: Newline -> Newline -> Newline #

Ord NewlineMode 
Instance details

Defined in GHC.IO.Handle.Types

Methods

compare :: NewlineMode -> NewlineMode -> Ordering #

(<) :: NewlineMode -> NewlineMode -> Bool #

(<=) :: NewlineMode -> NewlineMode -> Bool #

(>) :: NewlineMode -> NewlineMode -> Bool #

(>=) :: NewlineMode -> NewlineMode -> Bool #

max :: NewlineMode -> NewlineMode -> NewlineMode #

min :: NewlineMode -> NewlineMode -> NewlineMode #

Ord IOMode 
Instance details

Defined in GHC.IO.IOMode

Ord Int16 
Instance details

Defined in GHC.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 #

Ord Int32 
Instance details

Defined in GHC.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 #

Ord Int64 
Instance details

Defined in GHC.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 #

Ord Int8 
Instance details

Defined in GHC.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 #

Ord SomeChar 
Instance details

Defined in GHC.TypeLits

Methods

compare :: SomeChar -> SomeChar -> Ordering #

(<) :: SomeChar -> SomeChar -> Bool #

(<=) :: SomeChar -> SomeChar -> Bool #

(>) :: SomeChar -> SomeChar -> Bool #

(>=) :: SomeChar -> SomeChar -> Bool #

max :: SomeChar -> SomeChar -> SomeChar #

min :: SomeChar -> SomeChar -> SomeChar #

Ord SomeSymbol 
Instance details

Defined in GHC.TypeLits

Methods

compare :: SomeSymbol -> SomeSymbol -> Ordering #

(<) :: SomeSymbol -> SomeSymbol -> Bool #

(<=) :: SomeSymbol -> SomeSymbol -> Bool #

(>) :: SomeSymbol -> SomeSymbol -> Bool #

(>=) :: SomeSymbol -> SomeSymbol -> Bool #

max :: SomeSymbol -> SomeSymbol -> SomeSymbol #

min :: SomeSymbol -> SomeSymbol -> SomeSymbol #

Ord SomeNat 
Instance details

Defined in GHC.TypeNats

Methods

compare :: SomeNat -> SomeNat -> Ordering #

(<) :: SomeNat -> SomeNat -> Bool #

(<=) :: SomeNat -> SomeNat -> Bool #

(>) :: SomeNat -> SomeNat -> Bool #

(>=) :: SomeNat -> SomeNat -> Bool #

max :: SomeNat -> SomeNat -> SomeNat #

min :: SomeNat -> SomeNat -> SomeNat #

Ord GeneralCategory 
Instance details

Defined in GHC.Unicode

Methods

compare :: GeneralCategory -> GeneralCategory -> Ordering #

(<) :: GeneralCategory -> GeneralCategory -> Bool #

(<=) :: GeneralCategory -> GeneralCategory -> Bool #

(>) :: GeneralCategory -> GeneralCategory -> Bool #

(>=) :: GeneralCategory -> GeneralCategory -> Bool #

max :: GeneralCategory -> GeneralCategory -> GeneralCategory #

min :: GeneralCategory -> GeneralCategory -> GeneralCategory #

Ord Word16 
Instance details

Defined in GHC.Word

Ord Word32 
Instance details

Defined in GHC.Word

Ord Word64 
Instance details

Defined in GHC.Word

Ord Word8 
Instance details

Defined in GHC.Word

Methods

compare :: Word8 -> Word8 -> Ordering #

(<) :: Word8 -> Word8 -> Bool #

(<=) :: Word8 -> Word8 -> Bool #

(>) :: Word8 -> Word8 -> Bool #

(>=) :: Word8 -> Word8 -> Bool #

max :: Word8 -> Word8 -> Word8 #

min :: Word8 -> Word8 -> Word8 #

Ord CBlkCnt 
Instance details

Defined in System.Posix.Types

Methods

compare :: CBlkCnt -> CBlkCnt -> Ordering #

(<) :: CBlkCnt -> CBlkCnt -> Bool #

(<=) :: CBlkCnt -> CBlkCnt -> Bool #

(>) :: CBlkCnt -> CBlkCnt -> Bool #

(>=) :: CBlkCnt -> CBlkCnt -> Bool #

max :: CBlkCnt -> CBlkCnt -> CBlkCnt #

min :: CBlkCnt -> CBlkCnt -> CBlkCnt #

Ord CBlkSize 
Instance details

Defined in System.Posix.Types

Methods

compare :: CBlkSize -> CBlkSize -> Ordering #

(<) :: CBlkSize -> CBlkSize -> Bool #

(<=) :: CBlkSize -> CBlkSize -> Bool #

(>) :: CBlkSize -> CBlkSize -> Bool #

(>=) :: CBlkSize -> CBlkSize -> Bool #

max :: CBlkSize -> CBlkSize -> CBlkSize #

min :: CBlkSize -> CBlkSize -> CBlkSize #

Ord CCc 
Instance details

Defined in System.Posix.Types

Methods

compare :: CCc -> CCc -> Ordering #

(<) :: CCc -> CCc -> Bool #

(<=) :: CCc -> CCc -> Bool #

(>) :: CCc -> CCc -> Bool #

(>=) :: CCc -> CCc -> Bool #

max :: CCc -> CCc -> CCc #

min :: CCc -> CCc -> CCc #

Ord CClockId 
Instance details

Defined in System.Posix.Types

Methods

compare :: CClockId -> CClockId -> Ordering #

(<) :: CClockId -> CClockId -> Bool #

(<=) :: CClockId -> CClockId -> Bool #

(>) :: CClockId -> CClockId -> Bool #

(>=) :: CClockId -> CClockId -> Bool #

max :: CClockId -> CClockId -> CClockId #

min :: CClockId -> CClockId -> CClockId #

Ord CDev 
Instance details

Defined in System.Posix.Types

Methods

compare :: CDev -> CDev -> Ordering #

(<) :: CDev -> CDev -> Bool #

(<=) :: CDev -> CDev -> Bool #

(>) :: CDev -> CDev -> Bool #

(>=) :: CDev -> CDev -> Bool #

max :: CDev -> CDev -> CDev #

min :: CDev -> CDev -> CDev #

Ord CFsBlkCnt 
Instance details

Defined in System.Posix.Types

Methods

compare :: CFsBlkCnt -> CFsBlkCnt -> Ordering #

(<) :: CFsBlkCnt -> CFsBlkCnt -> Bool #

(<=) :: CFsBlkCnt -> CFsBlkCnt -> Bool #

(>) :: CFsBlkCnt -> CFsBlkCnt -> Bool #

(>=) :: CFsBlkCnt -> CFsBlkCnt -> Bool #

max :: CFsBlkCnt -> CFsBlkCnt -> CFsBlkCnt #

min :: CFsBlkCnt -> CFsBlkCnt -> CFsBlkCnt #

Ord CFsFilCnt 
Instance details

Defined in System.Posix.Types

Methods

compare :: CFsFilCnt -> CFsFilCnt -> Ordering #

(<) :: CFsFilCnt -> CFsFilCnt -> Bool #

(<=) :: CFsFilCnt -> CFsFilCnt -> Bool #

(>) :: CFsFilCnt -> CFsFilCnt -> Bool #

(>=) :: CFsFilCnt -> CFsFilCnt -> Bool #

max :: CFsFilCnt -> CFsFilCnt -> CFsFilCnt #

min :: CFsFilCnt -> CFsFilCnt -> CFsFilCnt #

Ord CGid 
Instance details

Defined in System.Posix.Types

Methods

compare :: CGid -> CGid -> Ordering #

(<) :: CGid -> CGid -> Bool #

(<=) :: CGid -> CGid -> Bool #

(>) :: CGid -> CGid -> Bool #

(>=) :: CGid -> CGid -> Bool #

max :: CGid -> CGid -> CGid #

min :: CGid -> CGid -> CGid #

Ord CId 
Instance details

Defined in System.Posix.Types

Methods

compare :: CId -> CId -> Ordering #

(<) :: CId -> CId -> Bool #

(<=) :: CId -> CId -> Bool #

(>) :: CId -> CId -> Bool #

(>=) :: CId -> CId -> Bool #

max :: CId -> CId -> CId #

min :: CId -> CId -> CId #

Ord CIno 
Instance details

Defined in System.Posix.Types

Methods

compare :: CIno -> CIno -> Ordering #

(<) :: CIno -> CIno -> Bool #

(<=) :: CIno -> CIno -> Bool #

(>) :: CIno -> CIno -> Bool #

(>=) :: CIno -> CIno -> Bool #

max :: CIno -> CIno -> CIno #

min :: CIno -> CIno -> CIno #

Ord CKey 
Instance details

Defined in System.Posix.Types

Methods

compare :: CKey -> CKey -> Ordering #

(<) :: CKey -> CKey -> Bool #

(<=) :: CKey -> CKey -> Bool #

(>) :: CKey -> CKey -> Bool #

(>=) :: CKey -> CKey -> Bool #

max :: CKey -> CKey -> CKey #

min :: CKey -> CKey -> CKey #

Ord CMode 
Instance details

Defined in System.Posix.Types

Methods

compare :: CMode -> CMode -> Ordering #

(<) :: CMode -> CMode -> Bool #

(<=) :: CMode -> CMode -> Bool #

(>) :: CMode -> CMode -> Bool #

(>=) :: CMode -> CMode -> Bool #

max :: CMode -> CMode -> CMode #

min :: CMode -> CMode -> CMode #

Ord CNfds 
Instance details

Defined in System.Posix.Types

Methods

compare :: CNfds -> CNfds -> Ordering #

(<) :: CNfds -> CNfds -> Bool #

(<=) :: CNfds -> CNfds -> Bool #

(>) :: CNfds -> CNfds -> Bool #

(>=) :: CNfds -> CNfds -> Bool #

max :: CNfds -> CNfds -> CNfds #

min :: CNfds -> CNfds -> CNfds #

Ord CNlink 
Instance details

Defined in System.Posix.Types

Methods

compare :: CNlink -> CNlink -> Ordering #

(<) :: CNlink -> CNlink -> Bool #

(<=) :: CNlink -> CNlink -> Bool #

(>) :: CNlink -> CNlink -> Bool #

(>=) :: CNlink -> CNlink -> Bool #

max :: CNlink -> CNlink -> CNlink #

min :: CNlink -> CNlink -> CNlink #

Ord COff 
Instance details

Defined in System.Posix.Types

Methods

compare :: COff -> COff -> Ordering #

(<) :: COff -> COff -> Bool #

(<=) :: COff -> COff -> Bool #

(>) :: COff -> COff -> Bool #

(>=) :: COff -> COff -> Bool #

max :: COff -> COff -> COff #

min :: COff -> COff -> COff #

Ord CPid 
Instance details

Defined in System.Posix.Types

Methods

compare :: CPid -> CPid -> Ordering #

(<) :: CPid -> CPid -> Bool #

(<=) :: CPid -> CPid -> Bool #

(>) :: CPid -> CPid -> Bool #

(>=) :: CPid -> CPid -> Bool #

max :: CPid -> CPid -> CPid #

min :: CPid -> CPid -> CPid #

Ord CRLim 
Instance details

Defined in System.Posix.Types

Methods

compare :: CRLim -> CRLim -> Ordering #

(<) :: CRLim -> CRLim -> Bool #

(<=) :: CRLim -> CRLim -> Bool #

(>) :: CRLim -> CRLim -> Bool #

(>=) :: CRLim -> CRLim -> Bool #

max :: CRLim -> CRLim -> CRLim #

min :: CRLim -> CRLim -> CRLim #

Ord CSocklen 
Instance details

Defined in System.Posix.Types

Methods

compare :: CSocklen -> CSocklen -> Ordering #

(<) :: CSocklen -> CSocklen -> Bool #

(<=) :: CSocklen -> CSocklen -> Bool #

(>) :: CSocklen -> CSocklen -> Bool #

(>=) :: CSocklen -> CSocklen -> Bool #

max :: CSocklen -> CSocklen -> CSocklen #

min :: CSocklen -> CSocklen -> CSocklen #

Ord CSpeed 
Instance details

Defined in System.Posix.Types

Methods

compare :: CSpeed -> CSpeed -> Ordering #

(<) :: CSpeed -> CSpeed -> Bool #

(<=) :: CSpeed -> CSpeed -> Bool #

(>) :: CSpeed -> CSpeed -> Bool #

(>=) :: CSpeed -> CSpeed -> Bool #

max :: CSpeed -> CSpeed -> CSpeed #

min :: CSpeed -> CSpeed -> CSpeed #

Ord CSsize 
Instance details

Defined in System.Posix.Types

Methods

compare :: CSsize -> CSsize -> Ordering #

(<) :: CSsize -> CSsize -> Bool #

(<=) :: CSsize -> CSsize -> Bool #

(>) :: CSsize -> CSsize -> Bool #

(>=) :: CSsize -> CSsize -> Bool #

max :: CSsize -> CSsize -> CSsize #

min :: CSsize -> CSsize -> CSsize #

Ord CTcflag 
Instance details

Defined in System.Posix.Types

Methods

compare :: CTcflag -> CTcflag -> Ordering #

(<) :: CTcflag -> CTcflag -> Bool #

(<=) :: CTcflag -> CTcflag -> Bool #

(>) :: CTcflag -> CTcflag -> Bool #

(>=) :: CTcflag -> CTcflag -> Bool #

max :: CTcflag -> CTcflag -> CTcflag #

min :: CTcflag -> CTcflag -> CTcflag #

Ord CTimer 
Instance details

Defined in System.Posix.Types

Methods

compare :: CTimer -> CTimer -> Ordering #

(<) :: CTimer -> CTimer -> Bool #

(<=) :: CTimer -> CTimer -> Bool #

(>) :: CTimer -> CTimer -> Bool #

(>=) :: CTimer -> CTimer -> Bool #

max :: CTimer -> CTimer -> CTimer #

min :: CTimer -> CTimer -> CTimer #

Ord CUid 
Instance details

Defined in System.Posix.Types

Methods

compare :: CUid -> CUid -> Ordering #

(<) :: CUid -> CUid -> Bool #

(<=) :: CUid -> CUid -> Bool #

(>) :: CUid -> CUid -> Bool #

(>=) :: CUid -> CUid -> Bool #

max :: CUid -> CUid -> CUid #

min :: CUid -> CUid -> CUid #

Ord Fd 
Instance details

Defined in System.Posix.Types

Methods

compare :: Fd -> Fd -> Ordering #

(<) :: Fd -> Fd -> Bool #

(<=) :: Fd -> Fd -> Bool #

(>) :: Fd -> Fd -> Bool #

(>=) :: Fd -> Fd -> Bool #

max :: Fd -> Fd -> Fd #

min :: Fd -> Fd -> Fd #

Ord Encoding 
Instance details

Defined in Basement.String

Methods

compare :: Encoding -> Encoding -> Ordering #

(<) :: Encoding -> Encoding -> Bool #

(<=) :: Encoding -> Encoding -> Bool #

(>) :: Encoding -> Encoding -> Bool #

(>=) :: Encoding -> Encoding -> Bool #

max :: Encoding -> Encoding -> Encoding #

min :: Encoding -> Encoding -> Encoding #

Ord UTF32_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF32

Methods

compare :: UTF32_Invalid -> UTF32_Invalid -> Ordering #

(<) :: UTF32_Invalid -> UTF32_Invalid -> Bool #

(<=) :: UTF32_Invalid -> UTF32_Invalid -> Bool #

(>) :: UTF32_Invalid -> UTF32_Invalid -> Bool #

(>=) :: UTF32_Invalid -> UTF32_Invalid -> Bool #

max :: UTF32_Invalid -> UTF32_Invalid -> UTF32_Invalid #

min :: UTF32_Invalid -> UTF32_Invalid -> UTF32_Invalid #

Ord FileSize 
Instance details

Defined in Basement.Types.OffsetSize

Methods

compare :: FileSize -> FileSize -> Ordering #

(<) :: FileSize -> FileSize -> Bool #

(<=) :: FileSize -> FileSize -> Bool #

(>) :: FileSize -> FileSize -> Bool #

(>=) :: FileSize -> FileSize -> Bool #

max :: FileSize -> FileSize -> FileSize #

min :: FileSize -> FileSize -> FileSize #

Ord String 
Instance details

Defined in Basement.UTF8.Base

Methods

compare :: String -> String -> Ordering #

(<) :: String -> String -> Bool #

(<=) :: String -> String -> Bool #

(>) :: String -> String -> Bool #

(>=) :: String -> String -> Bool #

max :: String -> String -> String #

min :: String -> String -> String #

Ord ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

Ord ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Methods

compare :: ByteString -> ByteString -> Ordering #

(<) :: ByteString -> ByteString -> Bool #

(<=) :: ByteString -> ByteString -> Bool #

(>) :: ByteString -> ByteString -> Bool #

(>=) :: ByteString -> ByteString -> Bool #

max :: ByteString -> ByteString -> ByteString #

min :: ByteString -> ByteString -> ByteString #

Ord ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Ord ByteArray 
Instance details

Defined in Codec.CBOR.ByteArray

Methods

compare :: ByteArray -> ByteArray -> Ordering #

(<) :: ByteArray -> ByteArray -> Bool #

(<=) :: ByteArray -> ByteArray -> Bool #

(>) :: ByteArray -> ByteArray -> Bool #

(>=) :: ByteArray -> ByteArray -> Bool #

max :: ByteArray -> ByteArray -> ByteArray #

min :: ByteArray -> ByteArray -> ByteArray #

Ord SlicedByteArray 
Instance details

Defined in Codec.CBOR.ByteArray.Sliced

Methods

compare :: SlicedByteArray -> SlicedByteArray -> Ordering #

(<) :: SlicedByteArray -> SlicedByteArray -> Bool #

(<=) :: SlicedByteArray -> SlicedByteArray -> Bool #

(>) :: SlicedByteArray -> SlicedByteArray -> Bool #

(>=) :: SlicedByteArray -> SlicedByteArray -> Bool #

max :: SlicedByteArray -> SlicedByteArray -> SlicedByteArray #

min :: SlicedByteArray -> SlicedByteArray -> SlicedByteArray #

Ord Position 
Instance details

Defined in Data.Conduit.Attoparsec

Methods

compare :: Position -> Position -> Ordering #

(<) :: Position -> Position -> Bool #

(<=) :: Position -> Position -> Bool #

(>) :: Position -> Position -> Bool #

(>=) :: Position -> Position -> Bool #

max :: Position -> Position -> Position #

min :: Position -> Position -> Position #

Ord PositionRange 
Instance details

Defined in Data.Conduit.Attoparsec

Methods

compare :: PositionRange -> PositionRange -> Ordering #

(<) :: PositionRange -> PositionRange -> Bool #

(<=) :: PositionRange -> PositionRange -> Bool #

(>) :: PositionRange -> PositionRange -> Bool #

(>=) :: PositionRange -> PositionRange -> Bool #

max :: PositionRange -> PositionRange -> PositionRange #

min :: PositionRange -> PositionRange -> PositionRange #

Ord IntSet 
Instance details

Defined in Data.IntSet.Internal

Ord Options 
Instance details

Defined in Crypto.KDF.Argon2

Methods

compare :: Options -> Options -> Ordering #

(<) :: Options -> Options -> Bool #

(<=) :: Options -> Options -> Bool #

(>) :: Options -> Options -> Bool #

(>=) :: Options -> Options -> Bool #

max :: Options -> Options -> Options #

min :: Options -> Options -> Options #

Ord Variant 
Instance details

Defined in Crypto.KDF.Argon2

Methods

compare :: Variant -> Variant -> Ordering #

(<) :: Variant -> Variant -> Bool #

(<=) :: Variant -> Variant -> Bool #

(>) :: Variant -> Variant -> Bool #

(>=) :: Variant -> Variant -> Bool #

max :: Variant -> Variant -> Variant #

min :: Variant -> Variant -> Variant #

Ord Version 
Instance details

Defined in Crypto.KDF.Argon2

Methods

compare :: Version -> Version -> Ordering #

(<) :: Version -> Version -> Bool #

(<=) :: Version -> Version -> Bool #

(>) :: Version -> Version -> Bool #

(>=) :: Version -> Version -> Bool #

max :: Version -> Version -> Version #

min :: Version -> Version -> Version #

Ord Parameters 
Instance details

Defined in Crypto.KDF.BCryptPBKDF

Methods

compare :: Parameters -> Parameters -> Ordering #

(<) :: Parameters -> Parameters -> Bool #

(<=) :: Parameters -> Parameters -> Bool #

(>) :: Parameters -> Parameters -> Bool #

(>=) :: Parameters -> Parameters -> Bool #

max :: Parameters -> Parameters -> Parameters #

min :: Parameters -> Parameters -> Parameters #

Ord PrivateNumber 
Instance details

Defined in Crypto.PubKey.DH

Methods

compare :: PrivateNumber -> PrivateNumber -> Ordering #

(<) :: PrivateNumber -> PrivateNumber -> Bool #

(<=) :: PrivateNumber -> PrivateNumber -> Bool #

(>) :: PrivateNumber -> PrivateNumber -> Bool #

(>=) :: PrivateNumber -> PrivateNumber -> Bool #

max :: PrivateNumber -> PrivateNumber -> PrivateNumber #

min :: PrivateNumber -> PrivateNumber -> PrivateNumber #

Ord PublicNumber 
Instance details

Defined in Crypto.PubKey.DH

Methods

compare :: PublicNumber -> PublicNumber -> Ordering #

(<) :: PublicNumber -> PublicNumber -> Bool #

(<=) :: PublicNumber -> PublicNumber -> Bool #

(>) :: PublicNumber -> PublicNumber -> Bool #

(>=) :: PublicNumber -> PublicNumber -> Bool #

max :: PublicNumber -> PublicNumber -> PublicNumber #

min :: PublicNumber -> PublicNumber -> PublicNumber #

Ord CurveName 
Instance details

Defined in Crypto.PubKey.ECC.Types

Methods

compare :: CurveName -> CurveName -> Ordering #

(<) :: CurveName -> CurveName -> Bool #

(<=) :: CurveName -> CurveName -> Bool #

(>) :: CurveName -> CurveName -> Bool #

(>=) :: CurveName -> CurveName -> Bool #

max :: CurveName -> CurveName -> CurveName #

min :: CurveName -> CurveName -> CurveName #

Ord FileType 
Instance details

Defined in System.Directory.Internal.Common

Methods

compare :: FileType -> FileType -> Ordering #

(<) :: FileType -> FileType -> Bool #

(<=) :: FileType -> FileType -> Bool #

(>) :: FileType -> FileType -> Bool #

(>=) :: FileType -> FileType -> Bool #

max :: FileType -> FileType -> FileType #

min :: FileType -> FileType -> FileType #

Ord Permissions 
Instance details

Defined in System.Directory.Internal.Common

Methods

compare :: Permissions -> Permissions -> Ordering #

(<) :: Permissions -> Permissions -> Bool #

(<=) :: Permissions -> Permissions -> Bool #

(>) :: Permissions -> Permissions -> Bool #

(>=) :: Permissions -> Permissions -> Bool #

max :: Permissions -> Permissions -> Permissions #

min :: Permissions -> Permissions -> Permissions #

Ord XdgDirectory 
Instance details

Defined in System.Directory.Internal.Common

Methods

compare :: XdgDirectory -> XdgDirectory -> Ordering #

(<) :: XdgDirectory -> XdgDirectory -> Bool #

(<=) :: XdgDirectory -> XdgDirectory -> Bool #

(>) :: XdgDirectory -> XdgDirectory -> Bool #

(>=) :: XdgDirectory -> XdgDirectory -> Bool #

max :: XdgDirectory -> XdgDirectory -> XdgDirectory #

min :: XdgDirectory -> XdgDirectory -> XdgDirectory #

Ord XdgDirectoryList 
Instance details

Defined in System.Directory.Internal.Common

Methods

compare :: XdgDirectoryList -> XdgDirectoryList -> Ordering #

(<) :: XdgDirectoryList -> XdgDirectoryList -> Bool #

(<=) :: XdgDirectoryList -> XdgDirectoryList -> Bool #

(>) :: XdgDirectoryList -> XdgDirectoryList -> Bool #

(>=) :: XdgDirectoryList -> XdgDirectoryList -> Bool #

max :: XdgDirectoryList -> XdgDirectoryList -> XdgDirectoryList #

min :: XdgDirectoryList -> XdgDirectoryList -> XdgDirectoryList #

Ord EchoState 
Instance details

Defined in System.IO.Echo.Internal

Methods

compare :: EchoState -> EchoState -> Ordering #

(<) :: EchoState -> EchoState -> Bool #

(<=) :: EchoState -> EchoState -> Bool #

(>) :: EchoState -> EchoState -> Bool #

(>=) :: EchoState -> EchoState -> Bool #

max :: EchoState -> EchoState -> EchoState #

min :: EchoState -> EchoState -> EchoState #

Ord PublicKey 
Instance details

Defined in Crypto.Sign.Ed25519

Methods

compare :: PublicKey -> PublicKey -> Ordering #

(<) :: PublicKey -> PublicKey -> Bool #

(<=) :: PublicKey -> PublicKey -> Bool #

(>) :: PublicKey -> PublicKey -> Bool #

(>=) :: PublicKey -> PublicKey -> Bool #

max :: PublicKey -> PublicKey -> PublicKey #

min :: PublicKey -> PublicKey -> PublicKey #

Ord SecretKey 
Instance details

Defined in Crypto.Sign.Ed25519

Methods

compare :: SecretKey -> SecretKey -> Ordering #

(<) :: SecretKey -> SecretKey -> Bool #

(<=) :: SecretKey -> SecretKey -> Bool #

(>) :: SecretKey -> SecretKey -> Bool #

(>=) :: SecretKey -> SecretKey -> Bool #

max :: SecretKey -> SecretKey -> SecretKey #

min :: SecretKey -> SecretKey -> SecretKey #

Ord Signature 
Instance details

Defined in Crypto.Sign.Ed25519

Methods

compare :: Signature -> Signature -> Ordering #

(<) :: Signature -> Signature -> Bool #

(<=) :: Signature -> Signature -> Bool #

(>) :: Signature -> Signature -> Bool #

(>=) :: Signature -> Signature -> Bool #

max :: Signature -> Signature -> Signature #

min :: Signature -> Signature -> Signature #

Ord OsChar 
Instance details

Defined in System.OsString.Internal.Types.Hidden

Methods

compare :: OsChar -> OsChar -> Ordering #

(<) :: OsChar -> OsChar -> Bool #

(<=) :: OsChar -> OsChar -> Bool #

(>) :: OsChar -> OsChar -> Bool #

(>=) :: OsChar -> OsChar -> Bool #

max :: OsChar -> OsChar -> OsChar #

min :: OsChar -> OsChar -> OsChar #

Ord OsString 
Instance details

Defined in System.OsString.Internal.Types.Hidden

Methods

compare :: OsString -> OsString -> Ordering #

(<) :: OsString -> OsString -> Bool #

(<=) :: OsString -> OsString -> Bool #

(>) :: OsString -> OsString -> Bool #

(>=) :: OsString -> OsString -> Bool #

max :: OsString -> OsString -> OsString #

min :: OsString -> OsString -> OsString #

Ord PosixChar 
Instance details

Defined in System.OsString.Internal.Types.Hidden

Methods

compare :: PosixChar -> PosixChar -> Ordering #

(<) :: PosixChar -> PosixChar -> Bool #

(<=) :: PosixChar -> PosixChar -> Bool #

(>) :: PosixChar -> PosixChar -> Bool #

(>=) :: PosixChar -> PosixChar -> Bool #

max :: PosixChar -> PosixChar -> PosixChar #

min :: PosixChar -> PosixChar -> PosixChar #

Ord PosixString 
Instance details

Defined in System.OsString.Internal.Types.Hidden

Methods

compare :: PosixString -> PosixString -> Ordering #

(<) :: PosixString -> PosixString -> Bool #

(<=) :: PosixString -> PosixString -> Bool #

(>) :: PosixString -> PosixString -> Bool #

(>=) :: PosixString -> PosixString -> Bool #

max :: PosixString -> PosixString -> PosixString #

min :: PosixString -> PosixString -> PosixString #

Ord WindowsChar 
Instance details

Defined in System.OsString.Internal.Types.Hidden

Methods

compare :: WindowsChar -> WindowsChar -> Ordering #

(<) :: WindowsChar -> WindowsChar -> Bool #

(<=) :: WindowsChar -> WindowsChar -> Bool #

(>) :: WindowsChar -> WindowsChar -> Bool #

(>=) :: WindowsChar -> WindowsChar -> Bool #

max :: WindowsChar -> WindowsChar -> WindowsChar #

min :: WindowsChar -> WindowsChar -> WindowsChar #

Ord WindowsString 
Instance details

Defined in System.OsString.Internal.Types.Hidden

Methods

compare :: WindowsString -> WindowsString -> Ordering #

(<) :: WindowsString -> WindowsString -> Bool #

(<=) :: WindowsString -> WindowsString -> Bool #

(>) :: WindowsString -> WindowsString -> Bool #

(>=) :: WindowsString -> WindowsString -> Bool #

max :: WindowsString -> WindowsString -> WindowsString #

min :: WindowsString -> WindowsString -> WindowsString #

Ord Options 
Instance details

Defined in Generics.Deriving.TH

Methods

compare :: Options -> Options -> Ordering #

(<) :: Options -> Options -> Bool #

(<=) :: Options -> Options -> Bool #

(>) :: Options -> Options -> Bool #

(>=) :: Options -> Options -> Bool #

max :: Options -> Options -> Options #

min :: Options -> Options -> Options #

Ord RepOptions 
Instance details

Defined in Generics.Deriving.TH

Methods

compare :: RepOptions -> RepOptions -> Ordering #

(<) :: RepOptions -> RepOptions -> Bool #

(<=) :: RepOptions -> RepOptions -> Bool #

(>) :: RepOptions -> RepOptions -> Bool #

(>=) :: RepOptions -> RepOptions -> Bool #

max :: RepOptions -> RepOptions -> RepOptions #

min :: RepOptions -> RepOptions -> RepOptions #

Ord BigNat 
Instance details

Defined in GHC.Num.BigNat

Methods

compare :: BigNat -> BigNat -> Ordering #

(<) :: BigNat -> BigNat -> Bool #

(<=) :: BigNat -> BigNat -> Bool #

(>) :: BigNat -> BigNat -> Bool #

(>=) :: BigNat -> BigNat -> Bool #

max :: BigNat -> BigNat -> BigNat #

min :: BigNat -> BigNat -> BigNat #

Ord ShortText 
Instance details

Defined in GHC.Data.ShortText

Methods

compare :: ShortText -> ShortText -> Ordering #

(<) :: ShortText -> ShortText -> Bool #

(<=) :: ShortText -> ShortText -> Bool #

(>) :: ShortText -> ShortText -> Bool #

(>=) :: ShortText -> ShortText -> Bool #

max :: ShortText -> ShortText -> ShortText #

min :: ShortText -> ShortText -> ShortText #

Ord Arch 
Instance details

Defined in GHC.Platform.ArchOS

Methods

compare :: Arch -> Arch -> Ordering #

(<) :: Arch -> Arch -> Bool #

(<=) :: Arch -> Arch -> Bool #

(>) :: Arch -> Arch -> Bool #

(>=) :: Arch -> Arch -> Bool #

max :: Arch -> Arch -> Arch #

min :: Arch -> Arch -> Arch #

Ord ArchOS 
Instance details

Defined in GHC.Platform.ArchOS

Methods

compare :: ArchOS -> ArchOS -> Ordering #

(<) :: ArchOS -> ArchOS -> Bool #

(<=) :: ArchOS -> ArchOS -> Bool #

(>) :: ArchOS -> ArchOS -> Bool #

(>=) :: ArchOS -> ArchOS -> Bool #

max :: ArchOS -> ArchOS -> ArchOS #

min :: ArchOS -> ArchOS -> ArchOS #

Ord ArmABI 
Instance details

Defined in GHC.Platform.ArchOS

Methods

compare :: ArmABI -> ArmABI -> Ordering #

(<) :: ArmABI -> ArmABI -> Bool #

(<=) :: ArmABI -> ArmABI -> Bool #

(>) :: ArmABI -> ArmABI -> Bool #

(>=) :: ArmABI -> ArmABI -> Bool #

max :: ArmABI -> ArmABI -> ArmABI #

min :: ArmABI -> ArmABI -> ArmABI #

Ord ArmISA 
Instance details

Defined in GHC.Platform.ArchOS

Methods

compare :: ArmISA -> ArmISA -> Ordering #

(<) :: ArmISA -> ArmISA -> Bool #

(<=) :: ArmISA -> ArmISA -> Bool #

(>) :: ArmISA -> ArmISA -> Bool #

(>=) :: ArmISA -> ArmISA -> Bool #

max :: ArmISA -> ArmISA -> ArmISA #

min :: ArmISA -> ArmISA -> ArmISA #

Ord ArmISAExt 
Instance details

Defined in GHC.Platform.ArchOS

Methods

compare :: ArmISAExt -> ArmISAExt -> Ordering #

(<) :: ArmISAExt -> ArmISAExt -> Bool #

(<=) :: ArmISAExt -> ArmISAExt -> Bool #

(>) :: ArmISAExt -> ArmISAExt -> Bool #

(>=) :: ArmISAExt -> ArmISAExt -> Bool #

max :: ArmISAExt -> ArmISAExt -> ArmISAExt #

min :: ArmISAExt -> ArmISAExt -> ArmISAExt #

Ord OS 
Instance details

Defined in GHC.Platform.ArchOS

Methods

compare :: OS -> OS -> Ordering #

(<) :: OS -> OS -> Bool #

(<=) :: OS -> OS -> Bool #

(>) :: OS -> OS -> Bool #

(>=) :: OS -> OS -> Bool #

max :: OS -> OS -> OS #

min :: OS -> OS -> OS #

Ord PPC_64ABI 
Instance details

Defined in GHC.Platform.ArchOS

Methods

compare :: PPC_64ABI -> PPC_64ABI -> Ordering #

(<) :: PPC_64ABI -> PPC_64ABI -> Bool #

(<=) :: PPC_64ABI -> PPC_64ABI -> Bool #

(>) :: PPC_64ABI -> PPC_64ABI -> Bool #

(>=) :: PPC_64ABI -> PPC_64ABI -> Bool #

max :: PPC_64ABI -> PPC_64ABI -> PPC_64ABI #

min :: PPC_64ABI -> PPC_64ABI -> PPC_64ABI #

Ord Extension 
Instance details

Defined in GHC.LanguageExtensions.Type

Methods

compare :: Extension -> Extension -> Ordering #

(<) :: Extension -> Extension -> Bool #

(<=) :: Extension -> Extension -> Bool #

(>) :: Extension -> Extension -> Bool #

(>=) :: Extension -> Extension -> Bool #

max :: Extension -> Extension -> Extension #

min :: Extension -> Extension -> Extension #

Ord Ordering 
Instance details

Defined in GHC.Classes

Ord TyCon 
Instance details

Defined in GHC.Classes

Methods

compare :: TyCon -> TyCon -> Ordering #

(<) :: TyCon -> TyCon -> Bool #

(<=) :: TyCon -> TyCon -> Bool #

(>) :: TyCon -> TyCon -> Bool #

(>=) :: TyCon -> TyCon -> Bool #

max :: TyCon -> TyCon -> TyCon #

min :: TyCon -> TyCon -> TyCon #

Ord KeyId 
Instance details

Defined in Hackage.Security.Key

Methods

compare :: KeyId -> KeyId -> Ordering #

(<) :: KeyId -> KeyId -> Bool #

(<=) :: KeyId -> KeyId -> Bool #

(>) :: KeyId -> KeyId -> Bool #

(>=) :: KeyId -> KeyId -> Bool #

max :: KeyId -> KeyId -> KeyId #

min :: KeyId -> KeyId -> KeyId #

Ord Half 
Instance details

Defined in Numeric.Half.Internal

Methods

compare :: Half -> Half -> Ordering #

(<) :: Half -> Half -> Bool #

(<=) :: Half -> Half -> Bool #

(>) :: Half -> Half -> Bool #

(>=) :: Half -> Half -> Bool #

max :: Half -> Half -> Half #

min :: Half -> Half -> Half #

Ord IfaceVersion 
Instance details

Defined in HiFileParser

Methods

compare :: IfaceVersion -> IfaceVersion -> Ordering #

(<) :: IfaceVersion -> IfaceVersion -> Bool #

(<=) :: IfaceVersion -> IfaceVersion -> Bool #

(>) :: IfaceVersion -> IfaceVersion -> Bool #

(>=) :: IfaceVersion -> IfaceVersion -> Bool #

max :: IfaceVersion -> IfaceVersion -> IfaceVersion #

min :: IfaceVersion -> IfaceVersion -> IfaceVersion #

Ord BuildTool 
Instance details

Defined in Hpack.Config

Ord Path 
Instance details

Defined in Hpack.Config

Methods

compare :: Path -> Path -> Ordering #

(<) :: Path -> Path -> Bool #

(<=) :: Path -> Path -> Bool #

(>) :: Path -> Path -> Bool #

(>=) :: Path -> Path -> Bool #

max :: Path -> Path -> Path #

min :: Path -> Path -> Path #

Ord SpecVersion 
Instance details

Defined in Hpack.Config

Methods

compare :: SpecVersion -> SpecVersion -> Ordering #

(<) :: SpecVersion -> SpecVersion -> Bool #

(<=) :: SpecVersion -> SpecVersion -> Bool #

(>) :: SpecVersion -> SpecVersion -> Bool #

(>=) :: SpecVersion -> SpecVersion -> Bool #

max :: SpecVersion -> SpecVersion -> SpecVersion #

min :: SpecVersion -> SpecVersion -> SpecVersion #

Ord Module 
Instance details

Defined in Hpack.Module

Ord DependencyInfo 
Instance details

Defined in Hpack.Syntax.Dependencies

Ord BoxLabel 
Instance details

Defined in Trace.Hpc.Mix

Methods

compare :: BoxLabel -> BoxLabel -> Ordering #

(<) :: BoxLabel -> BoxLabel -> Bool #

(<=) :: BoxLabel -> BoxLabel -> Bool #

(>) :: BoxLabel -> BoxLabel -> Bool #

(>=) :: BoxLabel -> BoxLabel -> Bool #

max :: BoxLabel -> BoxLabel -> BoxLabel #

min :: BoxLabel -> BoxLabel -> BoxLabel #

Ord CondBox 
Instance details

Defined in Trace.Hpc.Mix

Methods

compare :: CondBox -> CondBox -> Ordering #

(<) :: CondBox -> CondBox -> Bool #

(<=) :: CondBox -> CondBox -> Bool #

(>) :: CondBox -> CondBox -> Bool #

(>=) :: CondBox -> CondBox -> Bool #

max :: CondBox -> CondBox -> CondBox #

min :: CondBox -> CondBox -> CondBox #

Ord HpcPos 
Instance details

Defined in Trace.Hpc.Util

Methods

compare :: HpcPos -> HpcPos -> Ordering #

(<) :: HpcPos -> HpcPos -> Bool #

(<=) :: HpcPos -> HpcPos -> Bool #

(>) :: HpcPos -> HpcPos -> Bool #

(>=) :: HpcPos -> HpcPos -> Bool #

max :: HpcPos -> HpcPos -> HpcPos #

min :: HpcPos -> HpcPos -> HpcPos #

Ord ConnHost 
Instance details

Defined in Network.HTTP.Client.Types

Methods

compare :: ConnHost -> ConnHost -> Ordering #

(<) :: ConnHost -> ConnHost -> Bool #

(<=) :: ConnHost -> ConnHost -> Bool #

(>) :: ConnHost -> ConnHost -> Bool #

(>=) :: ConnHost -> ConnHost -> Bool #

max :: ConnHost -> ConnHost -> ConnHost #

min :: ConnHost -> ConnHost -> ConnHost #

Ord ConnKey 
Instance details

Defined in Network.HTTP.Client.Types

Methods

compare :: ConnKey -> ConnKey -> Ordering #

(<) :: ConnKey -> ConnKey -> Bool #

(<=) :: ConnKey -> ConnKey -> Bool #

(>) :: ConnKey -> ConnKey -> Bool #

(>=) :: ConnKey -> ConnKey -> Bool #

max :: ConnKey -> ConnKey -> ConnKey #

min :: ConnKey -> ConnKey -> ConnKey #

Ord MaxHeaderLength 
Instance details

Defined in Network.HTTP.Client.Types

Methods

compare :: MaxHeaderLength -> MaxHeaderLength -> Ordering #

(<) :: MaxHeaderLength -> MaxHeaderLength -> Bool #

(<=) :: MaxHeaderLength -> MaxHeaderLength -> Bool #

(>) :: MaxHeaderLength -> MaxHeaderLength -> Bool #

(>=) :: MaxHeaderLength -> MaxHeaderLength -> Bool #

max :: MaxHeaderLength -> MaxHeaderLength -> MaxHeaderLength #

min :: MaxHeaderLength -> MaxHeaderLength -> MaxHeaderLength #

Ord MaxNumberHeaders 
Instance details

Defined in Network.HTTP.Client.Types

Methods

compare :: MaxNumberHeaders -> MaxNumberHeaders -> Ordering #

(<) :: MaxNumberHeaders -> MaxNumberHeaders -> Bool #

(<=) :: MaxNumberHeaders -> MaxNumberHeaders -> Bool #

(>) :: MaxNumberHeaders -> MaxNumberHeaders -> Bool #

(>=) :: MaxNumberHeaders -> MaxNumberHeaders -> Bool #

max :: MaxNumberHeaders -> MaxNumberHeaders -> MaxNumberHeaders #

min :: MaxNumberHeaders -> MaxNumberHeaders -> MaxNumberHeaders #

Ord Proxy 
Instance details

Defined in Network.HTTP.Client.Types

Methods

compare :: Proxy -> Proxy -> Ordering #

(<) :: Proxy -> Proxy -> Bool #

(<=) :: Proxy -> Proxy -> Bool #

(>) :: Proxy -> Proxy -> Bool #

(>=) :: Proxy -> Proxy -> Bool #

max :: Proxy -> Proxy -> Proxy #

min :: Proxy -> Proxy -> Proxy #

Ord ProxySecureMode 
Instance details

Defined in Network.HTTP.Client.Types

Methods

compare :: ProxySecureMode -> ProxySecureMode -> Ordering #

(<) :: ProxySecureMode -> ProxySecureMode -> Bool #

(<=) :: ProxySecureMode -> ProxySecureMode -> Bool #

(>) :: ProxySecureMode -> ProxySecureMode -> Bool #

(>=) :: ProxySecureMode -> ProxySecureMode -> Bool #

max :: ProxySecureMode -> ProxySecureMode -> ProxySecureMode #

min :: ProxySecureMode -> ProxySecureMode -> ProxySecureMode #

Ord StatusHeaders 
Instance details

Defined in Network.HTTP.Client.Types

Methods

compare :: StatusHeaders -> StatusHeaders -> Ordering #

(<) :: StatusHeaders -> StatusHeaders -> Bool #

(<=) :: StatusHeaders -> StatusHeaders -> Bool #

(>) :: StatusHeaders -> StatusHeaders -> Bool #

(>=) :: StatusHeaders -> StatusHeaders -> Bool #

max :: StatusHeaders -> StatusHeaders -> StatusHeaders #

min :: StatusHeaders -> StatusHeaders -> StatusHeaders #

Ord StreamFileStatus 
Instance details

Defined in Network.HTTP.Client.Types

Methods

compare :: StreamFileStatus -> StreamFileStatus -> Ordering #

(<) :: StreamFileStatus -> StreamFileStatus -> Bool #

(<=) :: StreamFileStatus -> StreamFileStatus -> Bool #

(>) :: StreamFileStatus -> StreamFileStatus -> Bool #

(>=) :: StreamFileStatus -> StreamFileStatus -> Bool #

max :: StreamFileStatus -> StreamFileStatus -> StreamFileStatus #

min :: StreamFileStatus -> StreamFileStatus -> StreamFileStatus #

Ord DigestAuthExceptionDetails 
Instance details

Defined in Network.HTTP.Client.TLS

Methods

compare :: DigestAuthExceptionDetails -> DigestAuthExceptionDetails -> Ordering #

(<) :: DigestAuthExceptionDetails -> DigestAuthExceptionDetails -> Bool #

(<=) :: DigestAuthExceptionDetails -> DigestAuthExceptionDetails -> Bool #

(>) :: DigestAuthExceptionDetails -> DigestAuthExceptionDetails -> Bool #

(>=) :: DigestAuthExceptionDetails -> DigestAuthExceptionDetails -> Bool #

max :: DigestAuthExceptionDetails -> DigestAuthExceptionDetails -> DigestAuthExceptionDetails #

min :: DigestAuthExceptionDetails -> DigestAuthExceptionDetails -> DigestAuthExceptionDetails #

Ord ByteRange 
Instance details

Defined in Network.HTTP.Types.Header

Methods

compare :: ByteRange -> ByteRange -> Ordering #

(<) :: ByteRange -> ByteRange -> Bool #

(<=) :: ByteRange -> ByteRange -> Bool #

(>) :: ByteRange -> ByteRange -> Bool #

(>=) :: ByteRange -> ByteRange -> Bool #

max :: ByteRange -> ByteRange -> ByteRange #

min :: ByteRange -> ByteRange -> ByteRange #

Ord StdMethod 
Instance details

Defined in Network.HTTP.Types.Method

Methods

compare :: StdMethod -> StdMethod -> Ordering #

(<) :: StdMethod -> StdMethod -> Bool #

(<=) :: StdMethod -> StdMethod -> Bool #

(>) :: StdMethod -> StdMethod -> Bool #

(>=) :: StdMethod -> StdMethod -> Bool #

max :: StdMethod -> StdMethod -> StdMethod #

min :: StdMethod -> StdMethod -> StdMethod #

Ord Status 
Instance details

Defined in Network.HTTP.Types.Status

Ord EscapeItem 
Instance details

Defined in Network.HTTP.Types.URI

Methods

compare :: EscapeItem -> EscapeItem -> Ordering #

(<) :: EscapeItem -> EscapeItem -> Bool #

(<=) :: EscapeItem -> EscapeItem -> Bool #

(>) :: EscapeItem -> EscapeItem -> Bool #

(>=) :: EscapeItem -> EscapeItem -> Bool #

max :: EscapeItem -> EscapeItem -> EscapeItem #

min :: EscapeItem -> EscapeItem -> EscapeItem #

Ord HttpVersion 
Instance details

Defined in Network.HTTP.Types.Version

Methods

compare :: HttpVersion -> HttpVersion -> Ordering #

(<) :: HttpVersion -> HttpVersion -> Bool #

(<=) :: HttpVersion -> HttpVersion -> Bool #

(>) :: HttpVersion -> HttpVersion -> Bool #

(>=) :: HttpVersion -> HttpVersion -> Bool #

max :: HttpVersion -> HttpVersion -> HttpVersion #

min :: HttpVersion -> HttpVersion -> HttpVersion #

Ord IP 
Instance details

Defined in Data.IP.Addr

Methods

compare :: IP -> IP -> Ordering #

(<) :: IP -> IP -> Bool #

(<=) :: IP -> IP -> Bool #

(>) :: IP -> IP -> Bool #

(>=) :: IP -> IP -> Bool #

max :: IP -> IP -> IP #

min :: IP -> IP -> IP #

Ord IPv4 
Instance details

Defined in Data.IP.Addr

Methods

compare :: IPv4 -> IPv4 -> Ordering #

(<) :: IPv4 -> IPv4 -> Bool #

(<=) :: IPv4 -> IPv4 -> Bool #

(>) :: IPv4 -> IPv4 -> Bool #

(>=) :: IPv4 -> IPv4 -> Bool #

max :: IPv4 -> IPv4 -> IPv4 #

min :: IPv4 -> IPv4 -> IPv4 #

Ord IPv6 
Instance details

Defined in Data.IP.Addr

Methods

compare :: IPv6 -> IPv6 -> Ordering #

(<) :: IPv6 -> IPv6 -> Bool #

(<=) :: IPv6 -> IPv6 -> Bool #

(>) :: IPv6 -> IPv6 -> Bool #

(>=) :: IPv6 -> IPv6 -> Bool #

max :: IPv6 -> IPv6 -> IPv6 #

min :: IPv6 -> IPv6 -> IPv6 #

Ord IPRange 
Instance details

Defined in Data.IP.Range

Methods

compare :: IPRange -> IPRange -> Ordering #

(<) :: IPRange -> IPRange -> Bool #

(<=) :: IPRange -> IPRange -> Bool #

(>) :: IPRange -> IPRange -> Bool #

(>=) :: IPRange -> IPRange -> Bool #

max :: IPRange -> IPRange -> IPRange #

min :: IPRange -> IPRange -> IPRange #

Ord MappingStyle 
Instance details

Defined in Text.Libyaml

Methods

compare :: MappingStyle -> MappingStyle -> Ordering #

(<) :: MappingStyle -> MappingStyle -> Bool #

(<=) :: MappingStyle -> MappingStyle -> Bool #

(>) :: MappingStyle -> MappingStyle -> Bool #

(>=) :: MappingStyle -> MappingStyle -> Bool #

max :: MappingStyle -> MappingStyle -> MappingStyle #

min :: MappingStyle -> MappingStyle -> MappingStyle #

Ord SequenceStyle 
Instance details

Defined in Text.Libyaml

Methods

compare :: SequenceStyle -> SequenceStyle -> Ordering #

(<) :: SequenceStyle -> SequenceStyle -> Bool #

(<=) :: SequenceStyle -> SequenceStyle -> Bool #

(>) :: SequenceStyle -> SequenceStyle -> Bool #

(>=) :: SequenceStyle -> SequenceStyle -> Bool #

max :: SequenceStyle -> SequenceStyle -> SequenceStyle #

min :: SequenceStyle -> SequenceStyle -> SequenceStyle #

Ord Style 
Instance details

Defined in Text.Libyaml

Methods

compare :: Style -> Style -> Ordering #

(<) :: Style -> Style -> Bool #

(<=) :: Style -> Style -> Bool #

(>) :: Style -> Style -> Bool #

(>=) :: Style -> Style -> Bool #

max :: Style -> Style -> Style #

min :: Style -> Style -> Style #

Ord LogLevel 
Instance details

Defined in Control.Monad.Logger

Methods

compare :: LogLevel -> LogLevel -> Ordering #

(<) :: LogLevel -> LogLevel -> Bool #

(<=) :: LogLevel -> LogLevel -> Bool #

(>) :: LogLevel -> LogLevel -> Bool #

(>=) :: LogLevel -> LogLevel -> Bool #

max :: LogLevel -> LogLevel -> LogLevel #

min :: LogLevel -> LogLevel -> LogLevel #

Ord Family 
Instance details

Defined in Network.Socket.Types

Methods

compare :: Family -> Family -> Ordering #

(<) :: Family -> Family -> Bool #

(<=) :: Family -> Family -> Bool #

(>) :: Family -> Family -> Bool #

(>=) :: Family -> Family -> Bool #

max :: Family -> Family -> Family #

min :: Family -> Family -> Family #

Ord PortNumber 
Instance details

Defined in Network.Socket.Types

Methods

compare :: PortNumber -> PortNumber -> Ordering #

(<) :: PortNumber -> PortNumber -> Bool #

(<=) :: PortNumber -> PortNumber -> Bool #

(>) :: PortNumber -> PortNumber -> Bool #

(>=) :: PortNumber -> PortNumber -> Bool #

max :: PortNumber -> PortNumber -> PortNumber #

min :: PortNumber -> PortNumber -> PortNumber #

Ord SockAddr 
Instance details

Defined in Network.Socket.Types

Methods

compare :: SockAddr -> SockAddr -> Ordering #

(<) :: SockAddr -> SockAddr -> Bool #

(<=) :: SockAddr -> SockAddr -> Bool #

(>) :: SockAddr -> SockAddr -> Bool #

(>=) :: SockAddr -> SockAddr -> Bool #

max :: SockAddr -> SockAddr -> SockAddr #

min :: SockAddr -> SockAddr -> SockAddr #

Ord SocketType 
Instance details

Defined in Network.Socket.Types

Methods

compare :: SocketType -> SocketType -> Ordering #

(<) :: SocketType -> SocketType -> Bool #

(<=) :: SocketType -> SocketType -> Bool #

(>) :: SocketType -> SocketType -> Bool #

(>=) :: SocketType -> SocketType -> Bool #

max :: SocketType -> SocketType -> SocketType #

min :: SocketType -> SocketType -> SocketType #

Ord URI 
Instance details

Defined in Network.URI

Methods

compare :: URI -> URI -> Ordering #

(<) :: URI -> URI -> Bool #

(<=) :: URI -> URI -> Bool #

(>) :: URI -> URI -> Bool #

(>=) :: URI -> URI -> Bool #

max :: URI -> URI -> URI #

min :: URI -> URI -> URI #

Ord URIAuth 
Instance details

Defined in Network.URI

Methods

compare :: URIAuth -> URIAuth -> Ordering #

(<) :: URIAuth -> URIAuth -> Bool #

(<=) :: URIAuth -> URIAuth -> Bool #

(>) :: URIAuth -> URIAuth -> Bool #

(>=) :: URIAuth -> URIAuth -> Bool #

max :: URIAuth -> URIAuth -> URIAuth #

min :: URIAuth -> URIAuth -> URIAuth #

Ord Richness 
Instance details

Defined in Options.Applicative.BashCompletion

Methods

compare :: Richness -> Richness -> Ordering #

(<) :: Richness -> Richness -> Bool #

(<=) :: Richness -> Richness -> Bool #

(>) :: Richness -> Richness -> Bool #

(>=) :: Richness -> Richness -> Bool #

max :: Richness -> Richness -> Richness #

min :: Richness -> Richness -> Richness #

Ord Parenthetic 
Instance details

Defined in Options.Applicative.Help.Core

Methods

compare :: Parenthetic -> Parenthetic -> Ordering #

(<) :: Parenthetic -> Parenthetic -> Bool #

(<=) :: Parenthetic -> Parenthetic -> Bool #

(>) :: Parenthetic -> Parenthetic -> Bool #

(>=) :: Parenthetic -> Parenthetic -> Bool #

max :: Parenthetic -> Parenthetic -> Parenthetic #

min :: Parenthetic -> Parenthetic -> Parenthetic #

Ord ArgPolicy 
Instance details

Defined in Options.Applicative.Types

Methods

compare :: ArgPolicy -> ArgPolicy -> Ordering #

(<) :: ArgPolicy -> ArgPolicy -> Bool #

(<=) :: ArgPolicy -> ArgPolicy -> Bool #

(>) :: ArgPolicy -> ArgPolicy -> Bool #

(>=) :: ArgPolicy -> ArgPolicy -> Bool #

max :: ArgPolicy -> ArgPolicy -> ArgPolicy #

min :: ArgPolicy -> ArgPolicy -> ArgPolicy #

Ord OptName 
Instance details

Defined in Options.Applicative.Types

Methods

compare :: OptName -> OptName -> Ordering #

(<) :: OptName -> OptName -> Bool #

(<=) :: OptName -> OptName -> Bool #

(>) :: OptName -> OptName -> Bool #

(>=) :: OptName -> OptName -> Bool #

max :: OptName -> OptName -> OptName #

min :: OptName -> OptName -> OptName #

Ord OptVisibility 
Instance details

Defined in Options.Applicative.Types

Methods

compare :: OptVisibility -> OptVisibility -> Ordering #

(<) :: OptVisibility -> OptVisibility -> Bool #

(<=) :: OptVisibility -> OptVisibility -> Bool #

(>) :: OptVisibility -> OptVisibility -> Bool #

(>=) :: OptVisibility -> OptVisibility -> Bool #

max :: OptVisibility -> OptVisibility -> OptVisibility #

min :: OptVisibility -> OptVisibility -> OptVisibility #

Ord OsChar 
Instance details

Defined in System.OsString.Internal.Types

Methods

compare :: OsChar -> OsChar -> Ordering #

(<) :: OsChar -> OsChar -> Bool #

(<=) :: OsChar -> OsChar -> Bool #

(>) :: OsChar -> OsChar -> Bool #

(>=) :: OsChar -> OsChar -> Bool #

max :: OsChar -> OsChar -> OsChar #

min :: OsChar -> OsChar -> OsChar #

Ord OsString 
Instance details

Defined in System.OsString.Internal.Types

Methods

compare :: OsString -> OsString -> Ordering #

(<) :: OsString -> OsString -> Bool #

(<=) :: OsString -> OsString -> Bool #

(>) :: OsString -> OsString -> Bool #

(>=) :: OsString -> OsString -> Bool #

max :: OsString -> OsString -> OsString #

min :: OsString -> OsString -> OsString #

Ord PosixChar 
Instance details

Defined in System.OsString.Internal.Types

Methods

compare :: PosixChar -> PosixChar -> Ordering #

(<) :: PosixChar -> PosixChar -> Bool #

(<=) :: PosixChar -> PosixChar -> Bool #

(>) :: PosixChar -> PosixChar -> Bool #

(>=) :: PosixChar -> PosixChar -> Bool #

max :: PosixChar -> PosixChar -> PosixChar #

min :: PosixChar -> PosixChar -> PosixChar #

Ord PosixString 
Instance details

Defined in System.OsString.Internal.Types

Methods

compare :: PosixString -> PosixString -> Ordering #

(<) :: PosixString -> PosixString -> Bool #

(<=) :: PosixString -> PosixString -> Bool #

(>) :: PosixString -> PosixString -> Bool #

(>=) :: PosixString -> PosixString -> Bool #

max :: PosixString -> PosixString -> PosixString #

min :: PosixString -> PosixString -> PosixString #

Ord WindowsChar 
Instance details

Defined in System.OsString.Internal.Types

Methods

compare :: WindowsChar -> WindowsChar -> Ordering #

(<) :: WindowsChar -> WindowsChar -> Bool #

(<=) :: WindowsChar -> WindowsChar -> Bool #

(>) :: WindowsChar -> WindowsChar -> Bool #

(>=) :: WindowsChar -> WindowsChar -> Bool #

max :: WindowsChar -> WindowsChar -> WindowsChar #

min :: WindowsChar -> WindowsChar -> WindowsChar #

Ord WindowsString 
Instance details

Defined in System.OsString.Internal.Types

Methods

compare :: WindowsString -> WindowsString -> Ordering #

(<) :: WindowsString -> WindowsString -> Bool #

(<=) :: WindowsString -> WindowsString -> Bool #

(>) :: WindowsString -> WindowsString -> Bool #

(>=) :: WindowsString -> WindowsString -> Bool #

max :: WindowsString -> WindowsString -> WindowsString #

min :: WindowsString -> WindowsString -> WindowsString #

Ord SHA256 
Instance details

Defined in Pantry.SHA256

Ord AggregateRepo 
Instance details

Defined in Pantry.Types

Methods

compare :: AggregateRepo -> AggregateRepo -> Ordering #

(<) :: AggregateRepo -> AggregateRepo -> Bool #

(<=) :: AggregateRepo -> AggregateRepo -> Bool #

(>) :: AggregateRepo -> AggregateRepo -> Bool #

(>=) :: AggregateRepo -> AggregateRepo -> Bool #

max :: AggregateRepo -> AggregateRepo -> AggregateRepo #

min :: AggregateRepo -> AggregateRepo -> AggregateRepo #

Ord Archive 
Instance details

Defined in Pantry.Types

Ord ArchiveLocation 
Instance details

Defined in Pantry.Types

Ord BlobKey 
Instance details

Defined in Pantry.Types

Ord CabalFileInfo 
Instance details

Defined in Pantry.Types

Ord FileSize 
Instance details

Defined in Pantry.Types

Ord FileType 
Instance details

Defined in Pantry.Types

Methods

compare :: FileType -> FileType -> Ordering #

(<) :: FileType -> FileType -> Bool #

(<=) :: FileType -> FileType -> Bool #

(>) :: FileType -> FileType -> Bool #

(>=) :: FileType -> FileType -> Bool #

max :: FileType -> FileType -> FileType #

min :: FileType -> FileType -> FileType #

Ord GlobalHintsLocation 
Instance details

Defined in Pantry.Types

Ord HpackExecutable 
Instance details

Defined in Pantry.Types

Ord ModuleNameP 
Instance details

Defined in Pantry.Types

Ord PHpack 
Instance details

Defined in Pantry.Types

Methods

compare :: PHpack -> PHpack -> Ordering #

(<) :: PHpack -> PHpack -> Bool #

(<=) :: PHpack -> PHpack -> Bool #

(>) :: PHpack -> PHpack -> Bool #

(>=) :: PHpack -> PHpack -> Bool #

max :: PHpack -> PHpack -> PHpack #

min :: PHpack -> PHpack -> PHpack #

Ord Package 
Instance details

Defined in Pantry.Types

Ord PackageCabal 
Instance details

Defined in Pantry.Types

Methods

compare :: PackageCabal -> PackageCabal -> Ordering #

(<) :: PackageCabal -> PackageCabal -> Bool #

(<=) :: PackageCabal -> PackageCabal -> Bool #

(>) :: PackageCabal -> PackageCabal -> Bool #

(>=) :: PackageCabal -> PackageCabal -> Bool #

max :: PackageCabal -> PackageCabal -> PackageCabal #

min :: PackageCabal -> PackageCabal -> PackageCabal #

Ord PackageIdentifierRevision 
Instance details

Defined in Pantry.Types

Ord PackageLocationImmutable 
Instance details

Defined in Pantry.Types

Ord PackageMetadata 
Instance details

Defined in Pantry.Types

Ord PackageNameP 
Instance details

Defined in Pantry.Types

Ord RawArchive 
Instance details

Defined in Pantry.Types

Ord RawPackageLocationImmutable 
Instance details

Defined in Pantry.Types

Ord RawPackageMetadata 
Instance details

Defined in Pantry.Types

Ord RawSnapshotLocation 
Instance details

Defined in Pantry.Types

Ord RelFilePath 
Instance details

Defined in Pantry.Types

Ord Repo 
Instance details

Defined in Pantry.Types

Methods

compare :: Repo -> Repo -> Ordering #

(<) :: Repo -> Repo -> Bool #

(<=) :: Repo -> Repo -> Bool #

(>) :: Repo -> Repo -> Bool #

(>=) :: Repo -> Repo -> Bool #

max :: Repo -> Repo -> Repo #

min :: Repo -> Repo -> Repo #

Ord RepoType 
Instance details

Defined in Pantry.Types

Ord Revision 
Instance details

Defined in Pantry.Types

Ord SafeFilePath 
Instance details

Defined in Pantry.Types

Ord SimpleRepo 
Instance details

Defined in Pantry.Types

Ord SnapName 
Instance details

Defined in Pantry.Types

Ord SnapshotLocation 
Instance details

Defined in Pantry.Types

Ord Tree 
Instance details

Defined in Pantry.Types

Methods

compare :: Tree -> Tree -> Ordering #

(<) :: Tree -> Tree -> Bool #

(<=) :: Tree -> Tree -> Bool #

(>) :: Tree -> Tree -> Bool #

(>=) :: Tree -> Tree -> Bool #

max :: Tree -> Tree -> Tree #

min :: Tree -> Tree -> Tree #

Ord TreeEntry 
Instance details

Defined in Pantry.Types

Methods

compare :: TreeEntry -> TreeEntry -> Ordering #

(<) :: TreeEntry -> TreeEntry -> Bool #

(<=) :: TreeEntry -> TreeEntry -> Bool #

(>) :: TreeEntry -> TreeEntry -> Bool #

(>=) :: TreeEntry -> TreeEntry -> Bool #

max :: TreeEntry -> TreeEntry -> TreeEntry #

min :: TreeEntry -> TreeEntry -> TreeEntry #

Ord TreeKey 
Instance details

Defined in Pantry.Types

Ord VersionP 
Instance details

Defined in Pantry.Types

Ord WantedCompiler 
Instance details

Defined in Pantry.Types

Ord Message 
Instance details

Defined in Text.Parsec.Error

Methods

compare :: Message -> Message -> Ordering #

(<) :: Message -> Message -> Bool #

(<=) :: Message -> Message -> Bool #

(>) :: Message -> Message -> Bool #

(>=) :: Message -> Message -> Bool #

max :: Message -> Message -> Message #

min :: Message -> Message -> Message #

Ord OverflowNatural 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

compare :: OverflowNatural -> OverflowNatural -> Ordering #

(<) :: OverflowNatural -> OverflowNatural -> Bool #

(<=) :: OverflowNatural -> OverflowNatural -> Bool #

(>) :: OverflowNatural -> OverflowNatural -> Bool #

(>=) :: OverflowNatural -> OverflowNatural -> Bool #

max :: OverflowNatural -> OverflowNatural -> OverflowNatural #

min :: OverflowNatural -> OverflowNatural -> OverflowNatural #

Ord ConstraintNameDB 
Instance details

Defined in Database.Persist.Names

Methods

compare :: ConstraintNameDB -> ConstraintNameDB -> Ordering #

(<) :: ConstraintNameDB -> ConstraintNameDB -> Bool #

(<=) :: ConstraintNameDB -> ConstraintNameDB -> Bool #

(>) :: ConstraintNameDB -> ConstraintNameDB -> Bool #

(>=) :: ConstraintNameDB -> ConstraintNameDB -> Bool #

max :: ConstraintNameDB -> ConstraintNameDB -> ConstraintNameDB #

min :: ConstraintNameDB -> ConstraintNameDB -> ConstraintNameDB #

Ord ConstraintNameHS 
Instance details

Defined in Database.Persist.Names

Methods

compare :: ConstraintNameHS -> ConstraintNameHS -> Ordering #

(<) :: ConstraintNameHS -> ConstraintNameHS -> Bool #

(<=) :: ConstraintNameHS -> ConstraintNameHS -> Bool #

(>) :: ConstraintNameHS -> ConstraintNameHS -> Bool #

(>=) :: ConstraintNameHS -> ConstraintNameHS -> Bool #

max :: ConstraintNameHS -> ConstraintNameHS -> ConstraintNameHS #

min :: ConstraintNameHS -> ConstraintNameHS -> ConstraintNameHS #

Ord EntityNameDB 
Instance details

Defined in Database.Persist.Names

Methods

compare :: EntityNameDB -> EntityNameDB -> Ordering #

(<) :: EntityNameDB -> EntityNameDB -> Bool #

(<=) :: EntityNameDB -> EntityNameDB -> Bool #

(>) :: EntityNameDB -> EntityNameDB -> Bool #

(>=) :: EntityNameDB -> EntityNameDB -> Bool #

max :: EntityNameDB -> EntityNameDB -> EntityNameDB #

min :: EntityNameDB -> EntityNameDB -> EntityNameDB #

Ord EntityNameHS 
Instance details

Defined in Database.Persist.Names

Methods

compare :: EntityNameHS -> EntityNameHS -> Ordering #

(<) :: EntityNameHS -> EntityNameHS -> Bool #

(<=) :: EntityNameHS -> EntityNameHS -> Bool #

(>) :: EntityNameHS -> EntityNameHS -> Bool #

(>=) :: EntityNameHS -> EntityNameHS -> Bool #

max :: EntityNameHS -> EntityNameHS -> EntityNameHS #

min :: EntityNameHS -> EntityNameHS -> EntityNameHS #

Ord FieldNameDB 
Instance details

Defined in Database.Persist.Names

Methods

compare :: FieldNameDB -> FieldNameDB -> Ordering #

(<) :: FieldNameDB -> FieldNameDB -> Bool #

(<=) :: FieldNameDB -> FieldNameDB -> Bool #

(>) :: FieldNameDB -> FieldNameDB -> Bool #

(>=) :: FieldNameDB -> FieldNameDB -> Bool #

max :: FieldNameDB -> FieldNameDB -> FieldNameDB #

min :: FieldNameDB -> FieldNameDB -> FieldNameDB #

Ord FieldNameHS 
Instance details

Defined in Database.Persist.Names

Methods

compare :: FieldNameHS -> FieldNameHS -> Ordering #

(<) :: FieldNameHS -> FieldNameHS -> Bool #

(<=) :: FieldNameHS -> FieldNameHS -> Bool #

(>) :: FieldNameHS -> FieldNameHS -> Bool #

(>=) :: FieldNameHS -> FieldNameHS -> Bool #

max :: FieldNameHS -> FieldNameHS -> FieldNameHS #

min :: FieldNameHS -> FieldNameHS -> FieldNameHS #

Ord LiteralType 
Instance details

Defined in Database.Persist.PersistValue

Methods

compare :: LiteralType -> LiteralType -> Ordering #

(<) :: LiteralType -> LiteralType -> Bool #

(<=) :: LiteralType -> LiteralType -> Bool #

(>) :: LiteralType -> LiteralType -> Bool #

(>=) :: LiteralType -> LiteralType -> Bool #

max :: LiteralType -> LiteralType -> LiteralType #

min :: LiteralType -> LiteralType -> LiteralType #

Ord PersistValue 
Instance details

Defined in Database.Persist.PersistValue

Methods

compare :: PersistValue -> PersistValue -> Ordering #

(<) :: PersistValue -> PersistValue -> Bool #

(<=) :: PersistValue -> PersistValue -> Bool #

(>) :: PersistValue -> PersistValue -> Bool #

(>=) :: PersistValue -> PersistValue -> Bool #

max :: PersistValue -> PersistValue -> PersistValue #

min :: PersistValue -> PersistValue -> PersistValue #

Ord ForeignFieldReference 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

compare :: ForeignFieldReference -> ForeignFieldReference -> Ordering #

(<) :: ForeignFieldReference -> ForeignFieldReference -> Bool #

(<=) :: ForeignFieldReference -> ForeignFieldReference -> Bool #

(>) :: ForeignFieldReference -> ForeignFieldReference -> Bool #

(>=) :: ForeignFieldReference -> ForeignFieldReference -> Bool #

max :: ForeignFieldReference -> ForeignFieldReference -> ForeignFieldReference #

min :: ForeignFieldReference -> ForeignFieldReference -> ForeignFieldReference #

Ord PrimarySpec 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

compare :: PrimarySpec -> PrimarySpec -> Ordering #

(<) :: PrimarySpec -> PrimarySpec -> Bool #

(<=) :: PrimarySpec -> PrimarySpec -> Bool #

(>) :: PrimarySpec -> PrimarySpec -> Bool #

(>=) :: PrimarySpec -> PrimarySpec -> Bool #

max :: PrimarySpec -> PrimarySpec -> PrimarySpec #

min :: PrimarySpec -> PrimarySpec -> PrimarySpec #

Ord UnboundCompositeDef 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

compare :: UnboundCompositeDef -> UnboundCompositeDef -> Ordering #

(<) :: UnboundCompositeDef -> UnboundCompositeDef -> Bool #

(<=) :: UnboundCompositeDef -> UnboundCompositeDef -> Bool #

(>) :: UnboundCompositeDef -> UnboundCompositeDef -> Bool #

(>=) :: UnboundCompositeDef -> UnboundCompositeDef -> Bool #

max :: UnboundCompositeDef -> UnboundCompositeDef -> UnboundCompositeDef #

min :: UnboundCompositeDef -> UnboundCompositeDef -> UnboundCompositeDef #

Ord UnboundEntityDef 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

compare :: UnboundEntityDef -> UnboundEntityDef -> Ordering #

(<) :: UnboundEntityDef -> UnboundEntityDef -> Bool #

(<=) :: UnboundEntityDef -> UnboundEntityDef -> Bool #

(>) :: UnboundEntityDef -> UnboundEntityDef -> Bool #

(>=) :: UnboundEntityDef -> UnboundEntityDef -> Bool #

max :: UnboundEntityDef -> UnboundEntityDef -> UnboundEntityDef #

min :: UnboundEntityDef -> UnboundEntityDef -> UnboundEntityDef #

Ord UnboundFieldDef 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

compare :: UnboundFieldDef -> UnboundFieldDef -> Ordering #

(<) :: UnboundFieldDef -> UnboundFieldDef -> Bool #

(<=) :: UnboundFieldDef -> UnboundFieldDef -> Bool #

(>) :: UnboundFieldDef -> UnboundFieldDef -> Bool #

(>=) :: UnboundFieldDef -> UnboundFieldDef -> Bool #

max :: UnboundFieldDef -> UnboundFieldDef -> UnboundFieldDef #

min :: UnboundFieldDef -> UnboundFieldDef -> UnboundFieldDef #

Ord UnboundForeignDef 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

compare :: UnboundForeignDef -> UnboundForeignDef -> Ordering #

(<) :: UnboundForeignDef -> UnboundForeignDef -> Bool #

(<=) :: UnboundForeignDef -> UnboundForeignDef -> Bool #

(>) :: UnboundForeignDef -> UnboundForeignDef -> Bool #

(>=) :: UnboundForeignDef -> UnboundForeignDef -> Bool #

max :: UnboundForeignDef -> UnboundForeignDef -> UnboundForeignDef #

min :: UnboundForeignDef -> UnboundForeignDef -> UnboundForeignDef #

Ord UnboundForeignFieldList 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

compare :: UnboundForeignFieldList -> UnboundForeignFieldList -> Ordering #

(<) :: UnboundForeignFieldList -> UnboundForeignFieldList -> Bool #

(<=) :: UnboundForeignFieldList -> UnboundForeignFieldList -> Bool #

(>) :: UnboundForeignFieldList -> UnboundForeignFieldList -> Bool #

(>=) :: UnboundForeignFieldList -> UnboundForeignFieldList -> Bool #

max :: UnboundForeignFieldList -> UnboundForeignFieldList -> UnboundForeignFieldList #

min :: UnboundForeignFieldList -> UnboundForeignFieldList -> UnboundForeignFieldList #

Ord UnboundIdDef 
Instance details

Defined in Database.Persist.Quasi.Internal

Methods

compare :: UnboundIdDef -> UnboundIdDef -> Ordering #

(<) :: UnboundIdDef -> UnboundIdDef -> Bool #

(<=) :: UnboundIdDef -> UnboundIdDef -> Bool #

(>) :: UnboundIdDef -> UnboundIdDef -> Bool #

(>=) :: UnboundIdDef -> UnboundIdDef -> Bool #

max :: UnboundIdDef -> UnboundIdDef -> UnboundIdDef #

min :: UnboundIdDef -> UnboundIdDef -> UnboundIdDef #

Ord IsolationLevel 
Instance details

Defined in Database.Persist.SqlBackend.Internal.IsolationLevel

Methods

compare :: IsolationLevel -> IsolationLevel -> Ordering #

(<) :: IsolationLevel -> IsolationLevel -> Bool #

(<=) :: IsolationLevel -> IsolationLevel -> Bool #

(>) :: IsolationLevel -> IsolationLevel -> Bool #

(>=) :: IsolationLevel -> IsolationLevel -> Bool #

max :: IsolationLevel -> IsolationLevel -> IsolationLevel #

min :: IsolationLevel -> IsolationLevel -> IsolationLevel #

Ord CascadeAction 
Instance details

Defined in Database.Persist.Types.Base

Methods

compare :: CascadeAction -> CascadeAction -> Ordering #

(<) :: CascadeAction -> CascadeAction -> Bool #

(<=) :: CascadeAction -> CascadeAction -> Bool #

(>) :: CascadeAction -> CascadeAction -> Bool #

(>=) :: CascadeAction -> CascadeAction -> Bool #

max :: CascadeAction -> CascadeAction -> CascadeAction #

min :: CascadeAction -> CascadeAction -> CascadeAction #

Ord Checkmark 
Instance details

Defined in Database.Persist.Types.Base

Methods

compare :: Checkmark -> Checkmark -> Ordering #

(<) :: Checkmark -> Checkmark -> Bool #

(<=) :: Checkmark -> Checkmark -> Bool #

(>) :: Checkmark -> Checkmark -> Bool #

(>=) :: Checkmark -> Checkmark -> Bool #

max :: Checkmark -> Checkmark -> Checkmark #

min :: Checkmark -> Checkmark -> Checkmark #

Ord CompositeDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

compare :: CompositeDef -> CompositeDef -> Ordering #

(<) :: CompositeDef -> CompositeDef -> Bool #

(<=) :: CompositeDef -> CompositeDef -> Bool #

(>) :: CompositeDef -> CompositeDef -> Bool #

(>=) :: CompositeDef -> CompositeDef -> Bool #

max :: CompositeDef -> CompositeDef -> CompositeDef #

min :: CompositeDef -> CompositeDef -> CompositeDef #

Ord EmbedEntityDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

compare :: EmbedEntityDef -> EmbedEntityDef -> Ordering #

(<) :: EmbedEntityDef -> EmbedEntityDef -> Bool #

(<=) :: EmbedEntityDef -> EmbedEntityDef -> Bool #

(>) :: EmbedEntityDef -> EmbedEntityDef -> Bool #

(>=) :: EmbedEntityDef -> EmbedEntityDef -> Bool #

max :: EmbedEntityDef -> EmbedEntityDef -> EmbedEntityDef #

min :: EmbedEntityDef -> EmbedEntityDef -> EmbedEntityDef #

Ord EmbedFieldDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

compare :: EmbedFieldDef -> EmbedFieldDef -> Ordering #

(<) :: EmbedFieldDef -> EmbedFieldDef -> Bool #

(<=) :: EmbedFieldDef -> EmbedFieldDef -> Bool #

(>) :: EmbedFieldDef -> EmbedFieldDef -> Bool #

(>=) :: EmbedFieldDef -> EmbedFieldDef -> Bool #

max :: EmbedFieldDef -> EmbedFieldDef -> EmbedFieldDef #

min :: EmbedFieldDef -> EmbedFieldDef -> EmbedFieldDef #

Ord EntityDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

compare :: EntityDef -> EntityDef -> Ordering #

(<) :: EntityDef -> EntityDef -> Bool #

(<=) :: EntityDef -> EntityDef -> Bool #

(>) :: EntityDef -> EntityDef -> Bool #

(>=) :: EntityDef -> EntityDef -> Bool #

max :: EntityDef -> EntityDef -> EntityDef #

min :: EntityDef -> EntityDef -> EntityDef #

Ord EntityIdDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

compare :: EntityIdDef -> EntityIdDef -> Ordering #

(<) :: EntityIdDef -> EntityIdDef -> Bool #

(<=) :: EntityIdDef -> EntityIdDef -> Bool #

(>) :: EntityIdDef -> EntityIdDef -> Bool #

(>=) :: EntityIdDef -> EntityIdDef -> Bool #

max :: EntityIdDef -> EntityIdDef -> EntityIdDef #

min :: EntityIdDef -> EntityIdDef -> EntityIdDef #

Ord FieldAttr 
Instance details

Defined in Database.Persist.Types.Base

Methods

compare :: FieldAttr -> FieldAttr -> Ordering #

(<) :: FieldAttr -> FieldAttr -> Bool #

(<=) :: FieldAttr -> FieldAttr -> Bool #

(>) :: FieldAttr -> FieldAttr -> Bool #

(>=) :: FieldAttr -> FieldAttr -> Bool #

max :: FieldAttr -> FieldAttr -> FieldAttr #

min :: FieldAttr -> FieldAttr -> FieldAttr #

Ord FieldCascade 
Instance details

Defined in Database.Persist.Types.Base

Methods

compare :: FieldCascade -> FieldCascade -> Ordering #

(<) :: FieldCascade -> FieldCascade -> Bool #

(<=) :: FieldCascade -> FieldCascade -> Bool #

(>) :: FieldCascade -> FieldCascade -> Bool #

(>=) :: FieldCascade -> FieldCascade -> Bool #

max :: FieldCascade -> FieldCascade -> FieldCascade #

min :: FieldCascade -> FieldCascade -> FieldCascade #

Ord FieldDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

compare :: FieldDef -> FieldDef -> Ordering #

(<) :: FieldDef -> FieldDef -> Bool #

(<=) :: FieldDef -> FieldDef -> Bool #

(>) :: FieldDef -> FieldDef -> Bool #

(>=) :: FieldDef -> FieldDef -> Bool #

max :: FieldDef -> FieldDef -> FieldDef #

min :: FieldDef -> FieldDef -> FieldDef #

Ord FieldType 
Instance details

Defined in Database.Persist.Types.Base

Methods

compare :: FieldType -> FieldType -> Ordering #

(<) :: FieldType -> FieldType -> Bool #

(<=) :: FieldType -> FieldType -> Bool #

(>) :: FieldType -> FieldType -> Bool #

(>=) :: FieldType -> FieldType -> Bool #

max :: FieldType -> FieldType -> FieldType #

min :: FieldType -> FieldType -> FieldType #

Ord FieldTypeLit 
Instance details

Defined in Database.Persist.Types.Base

Methods

compare :: FieldTypeLit -> FieldTypeLit -> Ordering #

(<) :: FieldTypeLit -> FieldTypeLit -> Bool #

(<=) :: FieldTypeLit -> FieldTypeLit -> Bool #

(>) :: FieldTypeLit -> FieldTypeLit -> Bool #

(>=) :: FieldTypeLit -> FieldTypeLit -> Bool #

max :: FieldTypeLit -> FieldTypeLit -> FieldTypeLit #

min :: FieldTypeLit -> FieldTypeLit -> FieldTypeLit #

Ord ForeignDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

compare :: ForeignDef -> ForeignDef -> Ordering #

(<) :: ForeignDef -> ForeignDef -> Bool #

(<=) :: ForeignDef -> ForeignDef -> Bool #

(>) :: ForeignDef -> ForeignDef -> Bool #

(>=) :: ForeignDef -> ForeignDef -> Bool #

max :: ForeignDef -> ForeignDef -> ForeignDef #

min :: ForeignDef -> ForeignDef -> ForeignDef #

Ord ReferenceDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

compare :: ReferenceDef -> ReferenceDef -> Ordering #

(<) :: ReferenceDef -> ReferenceDef -> Bool #

(<=) :: ReferenceDef -> ReferenceDef -> Bool #

(>) :: ReferenceDef -> ReferenceDef -> Bool #

(>=) :: ReferenceDef -> ReferenceDef -> Bool #

max :: ReferenceDef -> ReferenceDef -> ReferenceDef #

min :: ReferenceDef -> ReferenceDef -> ReferenceDef #

Ord SelfEmbed 
Instance details

Defined in Database.Persist.Types.Base

Methods

compare :: SelfEmbed -> SelfEmbed -> Ordering #

(<) :: SelfEmbed -> SelfEmbed -> Bool #

(<=) :: SelfEmbed -> SelfEmbed -> Bool #

(>) :: SelfEmbed -> SelfEmbed -> Bool #

(>=) :: SelfEmbed -> SelfEmbed -> Bool #

max :: SelfEmbed -> SelfEmbed -> SelfEmbed #

min :: SelfEmbed -> SelfEmbed -> SelfEmbed #

Ord SqlType 
Instance details

Defined in Database.Persist.Types.Base

Methods

compare :: SqlType -> SqlType -> Ordering #

(<) :: SqlType -> SqlType -> Bool #

(<=) :: SqlType -> SqlType -> Bool #

(>) :: SqlType -> SqlType -> Bool #

(>=) :: SqlType -> SqlType -> Bool #

max :: SqlType -> SqlType -> SqlType #

min :: SqlType -> SqlType -> SqlType #

Ord UniqueDef 
Instance details

Defined in Database.Persist.Types.Base

Methods

compare :: UniqueDef -> UniqueDef -> Ordering #

(<) :: UniqueDef -> UniqueDef -> Bool #

(<=) :: UniqueDef -> UniqueDef -> Bool #

(>) :: UniqueDef -> UniqueDef -> Bool #

(>=) :: UniqueDef -> UniqueDef -> Bool #

max :: UniqueDef -> UniqueDef -> UniqueDef #

min :: UniqueDef -> UniqueDef -> UniqueDef #

Ord ForeignKeyViolation 
Instance details

Defined in Database.Persist.Sqlite

Methods

compare :: ForeignKeyViolation -> ForeignKeyViolation -> Ordering #

(<) :: ForeignKeyViolation -> ForeignKeyViolation -> Bool #

(<=) :: ForeignKeyViolation -> ForeignKeyViolation -> Bool #

(>) :: ForeignKeyViolation -> ForeignKeyViolation -> Bool #

(>=) :: ForeignKeyViolation -> ForeignKeyViolation -> Bool #

max :: ForeignKeyViolation -> ForeignKeyViolation -> ForeignKeyViolation #

min :: ForeignKeyViolation -> ForeignKeyViolation -> ForeignKeyViolation #

Ord PrettyLevel 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJClass

Methods

compare :: PrettyLevel -> PrettyLevel -> Ordering #

(<) :: PrettyLevel -> PrettyLevel -> Bool #

(<=) :: PrettyLevel -> PrettyLevel -> Bool #

(>) :: PrettyLevel -> PrettyLevel -> Bool #

(>=) :: PrettyLevel -> PrettyLevel -> Bool #

max :: PrettyLevel -> PrettyLevel -> PrettyLevel #

min :: PrettyLevel -> PrettyLevel -> PrettyLevel #

Ord PrettyLevel 
Instance details

Defined in Text.PrettyPrint.HughesPJClass

Methods

compare :: PrettyLevel -> PrettyLevel -> Ordering #

(<) :: PrettyLevel -> PrettyLevel -> Bool #

(<=) :: PrettyLevel -> PrettyLevel -> Bool #

(>) :: PrettyLevel -> PrettyLevel -> Bool #

(>=) :: PrettyLevel -> PrettyLevel -> Bool #

max :: PrettyLevel -> PrettyLevel -> PrettyLevel #

min :: PrettyLevel -> PrettyLevel -> PrettyLevel #

Ord FusionDepth 
Instance details

Defined in Prettyprinter.Internal

Methods

compare :: FusionDepth -> FusionDepth -> Ordering #

(<) :: FusionDepth -> FusionDepth -> Bool #

(<=) :: FusionDepth -> FusionDepth -> Bool #

(>) :: FusionDepth -> FusionDepth -> Bool #

(>=) :: FusionDepth -> FusionDepth -> Bool #

max :: FusionDepth -> FusionDepth -> FusionDepth #

min :: FusionDepth -> FusionDepth -> FusionDepth #

Ord LayoutOptions 
Instance details

Defined in Prettyprinter.Internal

Methods

compare :: LayoutOptions -> LayoutOptions -> Ordering #

(<) :: LayoutOptions -> LayoutOptions -> Bool #

(<=) :: LayoutOptions -> LayoutOptions -> Bool #

(>) :: LayoutOptions -> LayoutOptions -> Bool #

(>=) :: LayoutOptions -> LayoutOptions -> Bool #

max :: LayoutOptions -> LayoutOptions -> LayoutOptions #

min :: LayoutOptions -> LayoutOptions -> LayoutOptions #

Ord PageWidth 
Instance details

Defined in Prettyprinter.Internal

Methods

compare :: PageWidth -> PageWidth -> Ordering #

(<) :: PageWidth -> PageWidth -> Bool #

(<=) :: PageWidth -> PageWidth -> Bool #

(>) :: PageWidth -> PageWidth -> Bool #

(>=) :: PageWidth -> PageWidth -> Bool #

max :: PageWidth -> PageWidth -> PageWidth #

min :: PageWidth -> PageWidth -> PageWidth #

Ord AnsiStyle 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

compare :: AnsiStyle -> AnsiStyle -> Ordering #

(<) :: AnsiStyle -> AnsiStyle -> Bool #

(<=) :: AnsiStyle -> AnsiStyle -> Bool #

(>) :: AnsiStyle -> AnsiStyle -> Bool #

(>=) :: AnsiStyle -> AnsiStyle -> Bool #

max :: AnsiStyle -> AnsiStyle -> AnsiStyle #

min :: AnsiStyle -> AnsiStyle -> AnsiStyle #

Ord Bold 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

compare :: Bold -> Bold -> Ordering #

(<) :: Bold -> Bold -> Bool #

(<=) :: Bold -> Bold -> Bool #

(>) :: Bold -> Bold -> Bool #

(>=) :: Bold -> Bold -> Bool #

max :: Bold -> Bold -> Bold #

min :: Bold -> Bold -> Bold #

Ord Color 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

compare :: Color -> Color -> Ordering #

(<) :: Color -> Color -> Bool #

(<=) :: Color -> Color -> Bool #

(>) :: Color -> Color -> Bool #

(>=) :: Color -> Color -> Bool #

max :: Color -> Color -> Color #

min :: Color -> Color -> Color #

Ord Intensity 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

compare :: Intensity -> Intensity -> Ordering #

(<) :: Intensity -> Intensity -> Bool #

(<=) :: Intensity -> Intensity -> Bool #

(>) :: Intensity -> Intensity -> Bool #

(>=) :: Intensity -> Intensity -> Bool #

max :: Intensity -> Intensity -> Intensity #

min :: Intensity -> Intensity -> Intensity #

Ord Italicized 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

compare :: Italicized -> Italicized -> Ordering #

(<) :: Italicized -> Italicized -> Bool #

(<=) :: Italicized -> Italicized -> Bool #

(>) :: Italicized -> Italicized -> Bool #

(>=) :: Italicized -> Italicized -> Bool #

max :: Italicized -> Italicized -> Italicized #

min :: Italicized -> Italicized -> Italicized #

Ord Layer 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

compare :: Layer -> Layer -> Ordering #

(<) :: Layer -> Layer -> Bool #

(<=) :: Layer -> Layer -> Bool #

(>) :: Layer -> Layer -> Bool #

(>=) :: Layer -> Layer -> Bool #

max :: Layer -> Layer -> Layer #

min :: Layer -> Layer -> Layer #

Ord Underlined 
Instance details

Defined in Prettyprinter.Render.Terminal.Internal

Methods

compare :: Underlined -> Underlined -> Ordering #

(<) :: Underlined -> Underlined -> Bool #

(<=) :: Underlined -> Underlined -> Bool #

(>) :: Underlined -> Underlined -> Bool #

(>=) :: Underlined -> Underlined -> Bool #

max :: Underlined -> Underlined -> Underlined #

min :: Underlined -> Underlined -> Underlined #

Ord CommunicationHandle 
Instance details

Defined in System.Process.CommunicationHandle.Internal

Methods

compare :: CommunicationHandle -> CommunicationHandle -> Ordering #

(<) :: CommunicationHandle -> CommunicationHandle -> Bool #

(<=) :: CommunicationHandle -> CommunicationHandle -> Bool #

(>) :: CommunicationHandle -> CommunicationHandle -> Bool #

(>=) :: CommunicationHandle -> CommunicationHandle -> Bool #

max :: CommunicationHandle -> CommunicationHandle -> CommunicationHandle #

min :: CommunicationHandle -> CommunicationHandle -> CommunicationHandle #

Ord LogLevel 
Instance details

Defined in RIO.Prelude.Logger

Ord Style 
Instance details

Defined in RIO.PrettyPrint.Types

Methods

compare :: Style -> Style -> Ordering #

(<) :: Style -> Style -> Bool #

(<=) :: Style -> Style -> Bool #

(>) :: Style -> Style -> Bool #

(>=) :: Style -> Style -> Bool #

max :: Style -> Style -> Style #

min :: Style -> Style -> Style #

Ord SGRTag 
Instance details

Defined in Text.PrettyPrint.Leijen.Extended

Methods

compare :: SGRTag -> SGRTag -> Ordering #

(<) :: SGRTag -> SGRTag -> Bool #

(<=) :: SGRTag -> SGRTag -> Bool #

(>) :: SGRTag -> SGRTag -> Bool #

(>=) :: SGRTag -> SGRTag -> Bool #

max :: SGRTag -> SGRTag -> SGRTag #

min :: SGRTag -> SGRTag -> SGRTag #

Ord Scientific 
Instance details

Defined in Data.Scientific

Methods

compare :: Scientific -> Scientific -> Ordering #

(<) :: Scientific -> Scientific -> Bool #

(<=) :: Scientific -> Scientific -> Bool #

(>) :: Scientific -> Scientific -> Bool #

(>=) :: Scientific -> Scientific -> Bool #

max :: Scientific -> Scientific -> Scientific #

min :: Scientific -> Scientific -> Scientific #

Ord ActionId Source # 
Instance details

Defined in Control.Concurrent.Execute

Ord ActionType Source # 
Instance details

Defined in Control.Concurrent.Execute

Ord UnresolvedComponent Source # 
Instance details

Defined in Stack.Build.Target

Ord ListStylesOpts Source # 
Instance details

Defined in Stack.Ls

Ord LsView Source # 
Instance details

Defined in Stack.Ls

Ord SnapshotOpts Source # 
Instance details

Defined in Stack.Ls

Ord FirstFalse Source # 
Instance details

Defined in Stack.Prelude

Ord FirstTrue Source # 
Instance details

Defined in Stack.Prelude

Ord Tool Source #

Tool values are ordered by name (being ghc-git, for ToolGhcGit _ _) alphabetically and then by version (later versions are ordered before earlier versions, where applicable).

Instance details

Defined in Stack.Setup.Installed

Methods

compare :: Tool -> Tool -> Ordering #

(<) :: Tool -> Tool -> Bool #

(<=) :: Tool -> Tool -> Bool #

(>) :: Tool -> Tool -> Bool #

(>=) :: Tool -> Tool -> Bool #

max :: Tool -> Tool -> Tool #

min :: Tool -> Tool -> Tool #

Ord AllowNewerDeps Source # 
Instance details

Defined in Stack.Types.AllowNewerDeps

Ord ApplyGhcOptions Source # 
Instance details

Defined in Stack.Types.ApplyGhcOptions

Ord ApplyProgOptions Source # 
Instance details

Defined in Stack.Types.ApplyProgOptions

Ord BadDependency Source # 
Instance details

Defined in Stack.Types.Build.Exception

Ord ApplyCLIFlag Source # 
Instance details

Defined in Stack.Types.BuildOptsCLI

Ord CabalConfigKey Source # 
Instance details

Defined in Stack.Types.CabalConfigKey

Ord Action Source # 
Instance details

Defined in Stack.Types.Cache

Ord ActualCompiler Source # 
Instance details

Defined in Stack.Types.Compiler

Ord WhichCompiler Source # 
Instance details

Defined in Stack.Types.Compiler

Ord StackUnqualCompName Source # 
Instance details

Defined in Stack.Types.ComponentUtils

Ord DumpLogs Source # 
Instance details

Defined in Stack.Types.DumpLogs

Ord EnvSettings Source # 
Instance details

Defined in Stack.Types.EnvSettings

Ord GhcOptionKey Source # 
Instance details

Defined in Stack.Types.GhcOptionKey

Ord GhcPkgId Source # 
Instance details

Defined in Stack.Types.GhcPkgId

Ord InterfaceOpt Source # 
Instance details

Defined in Stack.Types.InterfaceOpt

Ord MsysEnvironment Source # 
Instance details

Defined in Stack.Types.MsysEnvironment

Ord NamedComponent Source # 
Instance details

Defined in Stack.Types.NamedComponent

Ord ExeName Source # 
Instance details

Defined in Stack.Types.Package

Ord Package Source #

Compares the package name.

Instance details

Defined in Stack.Types.Package

Ord DotCabalDescriptor Source # 
Instance details

Defined in Stack.Types.PackageFile

Ord DotCabalPath Source # 
Instance details

Defined in Stack.Types.PackageFile

Ord PvpBounds Source # 
Instance details

Defined in Stack.Types.PvpBounds

Ord PvpBoundsType Source # 
Instance details

Defined in Stack.Types.PvpBounds

Ord RepoService Source # 
Instance details

Defined in Stack.Types.TemplateName

Ord RepoTemplatePath Source # 
Instance details

Defined in Stack.Types.TemplateName

Ord TemplateName Source # 
Instance details

Defined in Stack.Types.TemplateName

Ord TemplatePath Source # 
Instance details

Defined in Stack.Types.TemplateName

Ord FlagSource Source # 
Instance details

Defined in Stack.Types.UnusedFlags

Ord UnusedFlags Source # 
Instance details

Defined in Stack.Types.UnusedFlags

Ord VersionCheck Source # 
Instance details

Defined in Stack.Types.Version

Ord Bytes128 
Instance details

Defined in Data.StaticBytes

Ord Bytes16 
Instance details

Defined in Data.StaticBytes

Ord Bytes32 
Instance details

Defined in Data.StaticBytes

Ord Bytes64 
Instance details

Defined in Data.StaticBytes

Ord Bytes8 
Instance details

Defined in Data.StaticBytes

Ord Format 
Instance details

Defined in Codec.Archive.Tar.Types

Methods

compare :: Format -> Format -> Ordering #

(<) :: Format -> Format -> Bool #

(<=) :: Format -> Format -> Bool #

(>) :: Format -> Format -> Bool #

(>=) :: Format -> Format -> Bool #

max :: Format -> Format -> Format #

min :: Format -> Format -> Format #

Ord LinkTarget 
Instance details

Defined in Codec.Archive.Tar.Types

Methods

compare :: LinkTarget -> LinkTarget -> Ordering #

(<) :: LinkTarget -> LinkTarget -> Bool #

(<=) :: LinkTarget -> LinkTarget -> Bool #

(>) :: LinkTarget -> LinkTarget -> Bool #

(>=) :: LinkTarget -> LinkTarget -> Bool #

max :: LinkTarget -> LinkTarget -> LinkTarget #

min :: LinkTarget -> LinkTarget -> LinkTarget #

Ord Ownership 
Instance details

Defined in Codec.Archive.Tar.Types

Methods

compare :: Ownership -> Ownership -> Ordering #

(<) :: Ownership -> Ownership -> Bool #

(<=) :: Ownership -> Ownership -> Bool #

(>) :: Ownership -> Ownership -> Bool #

(>=) :: Ownership -> Ownership -> Bool #

max :: Ownership -> Ownership -> Ownership #

min :: Ownership -> Ownership -> Ownership #

Ord TarPath 
Instance details

Defined in Codec.Archive.Tar.Types

Methods

compare :: TarPath -> TarPath -> Ordering #

(<) :: TarPath -> TarPath -> Bool #

(<=) :: TarPath -> TarPath -> Bool #

(>) :: TarPath -> TarPath -> Bool #

(>=) :: TarPath -> TarPath -> Bool #

max :: TarPath -> TarPath -> TarPath #

min :: TarPath -> TarPath -> TarPath #

Ord AnnLookup 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: AnnLookup -> AnnLookup -> Ordering #

(<) :: AnnLookup -> AnnLookup -> Bool #

(<=) :: AnnLookup -> AnnLookup -> Bool #

(>) :: AnnLookup -> AnnLookup -> Bool #

(>=) :: AnnLookup -> AnnLookup -> Bool #

max :: AnnLookup -> AnnLookup -> AnnLookup #

min :: AnnLookup -> AnnLookup -> AnnLookup #

Ord AnnTarget 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: AnnTarget -> AnnTarget -> Ordering #

(<) :: AnnTarget -> AnnTarget -> Bool #

(<=) :: AnnTarget -> AnnTarget -> Bool #

(>) :: AnnTarget -> AnnTarget -> Bool #

(>=) :: AnnTarget -> AnnTarget -> Bool #

max :: AnnTarget -> AnnTarget -> AnnTarget #

min :: AnnTarget -> AnnTarget -> AnnTarget #

Ord Bang 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Bang -> Bang -> Ordering #

(<) :: Bang -> Bang -> Bool #

(<=) :: Bang -> Bang -> Bool #

(>) :: Bang -> Bang -> Bool #

(>=) :: Bang -> Bang -> Bool #

max :: Bang -> Bang -> Bang #

min :: Bang -> Bang -> Bang #

Ord BndrVis 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: BndrVis -> BndrVis -> Ordering #

(<) :: BndrVis -> BndrVis -> Bool #

(<=) :: BndrVis -> BndrVis -> Bool #

(>) :: BndrVis -> BndrVis -> Bool #

(>=) :: BndrVis -> BndrVis -> Bool #

max :: BndrVis -> BndrVis -> BndrVis #

min :: BndrVis -> BndrVis -> BndrVis #

Ord Body 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Body -> Body -> Ordering #

(<) :: Body -> Body -> Bool #

(<=) :: Body -> Body -> Bool #

(>) :: Body -> Body -> Bool #

(>=) :: Body -> Body -> Bool #

max :: Body -> Body -> Body #

min :: Body -> Body -> Body #

Ord Bytes 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Bytes -> Bytes -> Ordering #

(<) :: Bytes -> Bytes -> Bool #

(<=) :: Bytes -> Bytes -> Bool #

(>) :: Bytes -> Bytes -> Bool #

(>=) :: Bytes -> Bytes -> Bool #

max :: Bytes -> Bytes -> Bytes #

min :: Bytes -> Bytes -> Bytes #

Ord Callconv 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Callconv -> Callconv -> Ordering #

(<) :: Callconv -> Callconv -> Bool #

(<=) :: Callconv -> Callconv -> Bool #

(>) :: Callconv -> Callconv -> Bool #

(>=) :: Callconv -> Callconv -> Bool #

max :: Callconv -> Callconv -> Callconv #

min :: Callconv -> Callconv -> Callconv #

Ord Clause 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Clause -> Clause -> Ordering #

(<) :: Clause -> Clause -> Bool #

(<=) :: Clause -> Clause -> Bool #

(>) :: Clause -> Clause -> Bool #

(>=) :: Clause -> Clause -> Bool #

max :: Clause -> Clause -> Clause #

min :: Clause -> Clause -> Clause #

Ord Con 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Con -> Con -> Ordering #

(<) :: Con -> Con -> Bool #

(<=) :: Con -> Con -> Bool #

(>) :: Con -> Con -> Bool #

(>=) :: Con -> Con -> Bool #

max :: Con -> Con -> Con #

min :: Con -> Con -> Con #

Ord Dec 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Dec -> Dec -> Ordering #

(<) :: Dec -> Dec -> Bool #

(<=) :: Dec -> Dec -> Bool #

(>) :: Dec -> Dec -> Bool #

(>=) :: Dec -> Dec -> Bool #

max :: Dec -> Dec -> Dec #

min :: Dec -> Dec -> Dec #

Ord DecidedStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: DecidedStrictness -> DecidedStrictness -> Ordering #

(<) :: DecidedStrictness -> DecidedStrictness -> Bool #

(<=) :: DecidedStrictness -> DecidedStrictness -> Bool #

(>) :: DecidedStrictness -> DecidedStrictness -> Bool #

(>=) :: DecidedStrictness -> DecidedStrictness -> Bool #

max :: DecidedStrictness -> DecidedStrictness -> DecidedStrictness #

min :: DecidedStrictness -> DecidedStrictness -> DecidedStrictness #

Ord DerivClause 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: DerivClause -> DerivClause -> Ordering #

(<) :: DerivClause -> DerivClause -> Bool #

(<=) :: DerivClause -> DerivClause -> Bool #

(>) :: DerivClause -> DerivClause -> Bool #

(>=) :: DerivClause -> DerivClause -> Bool #

max :: DerivClause -> DerivClause -> DerivClause #

min :: DerivClause -> DerivClause -> DerivClause #

Ord DerivStrategy 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: DerivStrategy -> DerivStrategy -> Ordering #

(<) :: DerivStrategy -> DerivStrategy -> Bool #

(<=) :: DerivStrategy -> DerivStrategy -> Bool #

(>) :: DerivStrategy -> DerivStrategy -> Bool #

(>=) :: DerivStrategy -> DerivStrategy -> Bool #

max :: DerivStrategy -> DerivStrategy -> DerivStrategy #

min :: DerivStrategy -> DerivStrategy -> DerivStrategy #

Ord DocLoc 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: DocLoc -> DocLoc -> Ordering #

(<) :: DocLoc -> DocLoc -> Bool #

(<=) :: DocLoc -> DocLoc -> Bool #

(>) :: DocLoc -> DocLoc -> Bool #

(>=) :: DocLoc -> DocLoc -> Bool #

max :: DocLoc -> DocLoc -> DocLoc #

min :: DocLoc -> DocLoc -> DocLoc #

Ord Exp 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Exp -> Exp -> Ordering #

(<) :: Exp -> Exp -> Bool #

(<=) :: Exp -> Exp -> Bool #

(>) :: Exp -> Exp -> Bool #

(>=) :: Exp -> Exp -> Bool #

max :: Exp -> Exp -> Exp #

min :: Exp -> Exp -> Exp #

Ord FamilyResultSig 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: FamilyResultSig -> FamilyResultSig -> Ordering #

(<) :: FamilyResultSig -> FamilyResultSig -> Bool #

(<=) :: FamilyResultSig -> FamilyResultSig -> Bool #

(>) :: FamilyResultSig -> FamilyResultSig -> Bool #

(>=) :: FamilyResultSig -> FamilyResultSig -> Bool #

max :: FamilyResultSig -> FamilyResultSig -> FamilyResultSig #

min :: FamilyResultSig -> FamilyResultSig -> FamilyResultSig #

Ord Fixity 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Fixity -> Fixity -> Ordering #

(<) :: Fixity -> Fixity -> Bool #

(<=) :: Fixity -> Fixity -> Bool #

(>) :: Fixity -> Fixity -> Bool #

(>=) :: Fixity -> Fixity -> Bool #

max :: Fixity -> Fixity -> Fixity #

min :: Fixity -> Fixity -> Fixity #

Ord FixityDirection 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: FixityDirection -> FixityDirection -> Ordering #

(<) :: FixityDirection -> FixityDirection -> Bool #

(<=) :: FixityDirection -> FixityDirection -> Bool #

(>) :: FixityDirection -> FixityDirection -> Bool #

(>=) :: FixityDirection -> FixityDirection -> Bool #

max :: FixityDirection -> FixityDirection -> FixityDirection #

min :: FixityDirection -> FixityDirection -> FixityDirection #

Ord Foreign 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Foreign -> Foreign -> Ordering #

(<) :: Foreign -> Foreign -> Bool #

(<=) :: Foreign -> Foreign -> Bool #

(>) :: Foreign -> Foreign -> Bool #

(>=) :: Foreign -> Foreign -> Bool #

max :: Foreign -> Foreign -> Foreign #

min :: Foreign -> Foreign -> Foreign #

Ord FunDep 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: FunDep -> FunDep -> Ordering #

(<) :: FunDep -> FunDep -> Bool #

(<=) :: FunDep -> FunDep -> Bool #

(>) :: FunDep -> FunDep -> Bool #

(>=) :: FunDep -> FunDep -> Bool #

max :: FunDep -> FunDep -> FunDep #

min :: FunDep -> FunDep -> FunDep #

Ord Guard 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Guard -> Guard -> Ordering #

(<) :: Guard -> Guard -> Bool #

(<=) :: Guard -> Guard -> Bool #

(>) :: Guard -> Guard -> Bool #

(>=) :: Guard -> Guard -> Bool #

max :: Guard -> Guard -> Guard #

min :: Guard -> Guard -> Guard #

Ord Info 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Info -> Info -> Ordering #

(<) :: Info -> Info -> Bool #

(<=) :: Info -> Info -> Bool #

(>) :: Info -> Info -> Bool #

(>=) :: Info -> Info -> Bool #

max :: Info -> Info -> Info #

min :: Info -> Info -> Info #

Ord InjectivityAnn 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: InjectivityAnn -> InjectivityAnn -> Ordering #

(<) :: InjectivityAnn -> InjectivityAnn -> Bool #

(<=) :: InjectivityAnn -> InjectivityAnn -> Bool #

(>) :: InjectivityAnn -> InjectivityAnn -> Bool #

(>=) :: InjectivityAnn -> InjectivityAnn -> Bool #

max :: InjectivityAnn -> InjectivityAnn -> InjectivityAnn #

min :: InjectivityAnn -> InjectivityAnn -> InjectivityAnn #

Ord Inline 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Inline -> Inline -> Ordering #

(<) :: Inline -> Inline -> Bool #

(<=) :: Inline -> Inline -> Bool #

(>) :: Inline -> Inline -> Bool #

(>=) :: Inline -> Inline -> Bool #

max :: Inline -> Inline -> Inline #

min :: Inline -> Inline -> Inline #

Ord Lit 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Lit -> Lit -> Ordering #

(<) :: Lit -> Lit -> Bool #

(<=) :: Lit -> Lit -> Bool #

(>) :: Lit -> Lit -> Bool #

(>=) :: Lit -> Lit -> Bool #

max :: Lit -> Lit -> Lit #

min :: Lit -> Lit -> Lit #

Ord Loc 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Loc -> Loc -> Ordering #

(<) :: Loc -> Loc -> Bool #

(<=) :: Loc -> Loc -> Bool #

(>) :: Loc -> Loc -> Bool #

(>=) :: Loc -> Loc -> Bool #

max :: Loc -> Loc -> Loc #

min :: Loc -> Loc -> Loc #

Ord Match 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Match -> Match -> Ordering #

(<) :: Match -> Match -> Bool #

(<=) :: Match -> Match -> Bool #

(>) :: Match -> Match -> Bool #

(>=) :: Match -> Match -> Bool #

max :: Match -> Match -> Match #

min :: Match -> Match -> Match #

Ord ModName 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: ModName -> ModName -> Ordering #

(<) :: ModName -> ModName -> Bool #

(<=) :: ModName -> ModName -> Bool #

(>) :: ModName -> ModName -> Bool #

(>=) :: ModName -> ModName -> Bool #

max :: ModName -> ModName -> ModName #

min :: ModName -> ModName -> ModName #

Ord Module 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Module -> Module -> Ordering #

(<) :: Module -> Module -> Bool #

(<=) :: Module -> Module -> Bool #

(>) :: Module -> Module -> Bool #

(>=) :: Module -> Module -> Bool #

max :: Module -> Module -> Module #

min :: Module -> Module -> Module #

Ord ModuleInfo 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: ModuleInfo -> ModuleInfo -> Ordering #

(<) :: ModuleInfo -> ModuleInfo -> Bool #

(<=) :: ModuleInfo -> ModuleInfo -> Bool #

(>) :: ModuleInfo -> ModuleInfo -> Bool #

(>=) :: ModuleInfo -> ModuleInfo -> Bool #

max :: ModuleInfo -> ModuleInfo -> ModuleInfo #

min :: ModuleInfo -> ModuleInfo -> ModuleInfo #

Ord Name 
Instance details

Defined in Language.Haskell.TH.Syntax

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 #

Ord NameFlavour 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: NameFlavour -> NameFlavour -> Ordering #

(<) :: NameFlavour -> NameFlavour -> Bool #

(<=) :: NameFlavour -> NameFlavour -> Bool #

(>) :: NameFlavour -> NameFlavour -> Bool #

(>=) :: NameFlavour -> NameFlavour -> Bool #

max :: NameFlavour -> NameFlavour -> NameFlavour #

min :: NameFlavour -> NameFlavour -> NameFlavour #

Ord NameSpace 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: NameSpace -> NameSpace -> Ordering #

(<) :: NameSpace -> NameSpace -> Bool #

(<=) :: NameSpace -> NameSpace -> Bool #

(>) :: NameSpace -> NameSpace -> Bool #

(>=) :: NameSpace -> NameSpace -> Bool #

max :: NameSpace -> NameSpace -> NameSpace #

min :: NameSpace -> NameSpace -> NameSpace #

Ord OccName 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: OccName -> OccName -> Ordering #

(<) :: OccName -> OccName -> Bool #

(<=) :: OccName -> OccName -> Bool #

(>) :: OccName -> OccName -> Bool #

(>=) :: OccName -> OccName -> Bool #

max :: OccName -> OccName -> OccName #

min :: OccName -> OccName -> OccName #

Ord Overlap 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Overlap -> Overlap -> Ordering #

(<) :: Overlap -> Overlap -> Bool #

(<=) :: Overlap -> Overlap -> Bool #

(>) :: Overlap -> Overlap -> Bool #

(>=) :: Overlap -> Overlap -> Bool #

max :: Overlap -> Overlap -> Overlap #

min :: Overlap -> Overlap -> Overlap #

Ord Pat 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Pat -> Pat -> Ordering #

(<) :: Pat -> Pat -> Bool #

(<=) :: Pat -> Pat -> Bool #

(>) :: Pat -> Pat -> Bool #

(>=) :: Pat -> Pat -> Bool #

max :: Pat -> Pat -> Pat #

min :: Pat -> Pat -> Pat #

Ord PatSynArgs 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: PatSynArgs -> PatSynArgs -> Ordering #

(<) :: PatSynArgs -> PatSynArgs -> Bool #

(<=) :: PatSynArgs -> PatSynArgs -> Bool #

(>) :: PatSynArgs -> PatSynArgs -> Bool #

(>=) :: PatSynArgs -> PatSynArgs -> Bool #

max :: PatSynArgs -> PatSynArgs -> PatSynArgs #

min :: PatSynArgs -> PatSynArgs -> PatSynArgs #

Ord PatSynDir 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: PatSynDir -> PatSynDir -> Ordering #

(<) :: PatSynDir -> PatSynDir -> Bool #

(<=) :: PatSynDir -> PatSynDir -> Bool #

(>) :: PatSynDir -> PatSynDir -> Bool #

(>=) :: PatSynDir -> PatSynDir -> Bool #

max :: PatSynDir -> PatSynDir -> PatSynDir #

min :: PatSynDir -> PatSynDir -> PatSynDir #

Ord Phases 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Phases -> Phases -> Ordering #

(<) :: Phases -> Phases -> Bool #

(<=) :: Phases -> Phases -> Bool #

(>) :: Phases -> Phases -> Bool #

(>=) :: Phases -> Phases -> Bool #

max :: Phases -> Phases -> Phases #

min :: Phases -> Phases -> Phases #

Ord PkgName 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: PkgName -> PkgName -> Ordering #

(<) :: PkgName -> PkgName -> Bool #

(<=) :: PkgName -> PkgName -> Bool #

(>) :: PkgName -> PkgName -> Bool #

(>=) :: PkgName -> PkgName -> Bool #

max :: PkgName -> PkgName -> PkgName #

min :: PkgName -> PkgName -> PkgName #

Ord Pragma 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Pragma -> Pragma -> Ordering #

(<) :: Pragma -> Pragma -> Bool #

(<=) :: Pragma -> Pragma -> Bool #

(>) :: Pragma -> Pragma -> Bool #

(>=) :: Pragma -> Pragma -> Bool #

max :: Pragma -> Pragma -> Pragma #

min :: Pragma -> Pragma -> Pragma #

Ord Range 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Range -> Range -> Ordering #

(<) :: Range -> Range -> Bool #

(<=) :: Range -> Range -> Bool #

(>) :: Range -> Range -> Bool #

(>=) :: Range -> Range -> Bool #

max :: Range -> Range -> Range #

min :: Range -> Range -> Range #

Ord Role 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Role -> Role -> Ordering #

(<) :: Role -> Role -> Bool #

(<=) :: Role -> Role -> Bool #

(>) :: Role -> Role -> Bool #

(>=) :: Role -> Role -> Bool #

max :: Role -> Role -> Role #

min :: Role -> Role -> Role #

Ord RuleBndr 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: RuleBndr -> RuleBndr -> Ordering #

(<) :: RuleBndr -> RuleBndr -> Bool #

(<=) :: RuleBndr -> RuleBndr -> Bool #

(>) :: RuleBndr -> RuleBndr -> Bool #

(>=) :: RuleBndr -> RuleBndr -> Bool #

max :: RuleBndr -> RuleBndr -> RuleBndr #

min :: RuleBndr -> RuleBndr -> RuleBndr #

Ord RuleMatch 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: RuleMatch -> RuleMatch -> Ordering #

(<) :: RuleMatch -> RuleMatch -> Bool #

(<=) :: RuleMatch -> RuleMatch -> Bool #

(>) :: RuleMatch -> RuleMatch -> Bool #

(>=) :: RuleMatch -> RuleMatch -> Bool #

max :: RuleMatch -> RuleMatch -> RuleMatch #

min :: RuleMatch -> RuleMatch -> RuleMatch #

Ord Safety 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Safety -> Safety -> Ordering #

(<) :: Safety -> Safety -> Bool #

(<=) :: Safety -> Safety -> Bool #

(>) :: Safety -> Safety -> Bool #

(>=) :: Safety -> Safety -> Bool #

max :: Safety -> Safety -> Safety #

min :: Safety -> Safety -> Safety #

Ord SourceStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: SourceStrictness -> SourceStrictness -> Ordering #

(<) :: SourceStrictness -> SourceStrictness -> Bool #

(<=) :: SourceStrictness -> SourceStrictness -> Bool #

(>) :: SourceStrictness -> SourceStrictness -> Bool #

(>=) :: SourceStrictness -> SourceStrictness -> Bool #

max :: SourceStrictness -> SourceStrictness -> SourceStrictness #

min :: SourceStrictness -> SourceStrictness -> SourceStrictness #

Ord SourceUnpackedness 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: SourceUnpackedness -> SourceUnpackedness -> Ordering #

(<) :: SourceUnpackedness -> SourceUnpackedness -> Bool #

(<=) :: SourceUnpackedness -> SourceUnpackedness -> Bool #

(>) :: SourceUnpackedness -> SourceUnpackedness -> Bool #

(>=) :: SourceUnpackedness -> SourceUnpackedness -> Bool #

max :: SourceUnpackedness -> SourceUnpackedness -> SourceUnpackedness #

min :: SourceUnpackedness -> SourceUnpackedness -> SourceUnpackedness #

Ord Specificity 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Specificity -> Specificity -> Ordering #

(<) :: Specificity -> Specificity -> Bool #

(<=) :: Specificity -> Specificity -> Bool #

(>) :: Specificity -> Specificity -> Bool #

(>=) :: Specificity -> Specificity -> Bool #

max :: Specificity -> Specificity -> Specificity #

min :: Specificity -> Specificity -> Specificity #

Ord Stmt 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: Stmt -> Stmt -> Ordering #

(<) :: Stmt -> Stmt -> Bool #

(<=) :: Stmt -> Stmt -> Bool #

(>) :: Stmt -> Stmt -> Bool #

(>=) :: Stmt -> Stmt -> Bool #

max :: Stmt -> Stmt -> Stmt #

min :: Stmt -> Stmt -> Stmt #

Ord TyLit 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: TyLit -> TyLit -> Ordering #

(<) :: TyLit -> TyLit -> Bool #

(<=) :: TyLit -> TyLit -> Bool #

(>) :: TyLit -> TyLit -> Bool #

(>=) :: TyLit -> TyLit -> Bool #

max :: TyLit -> TyLit -> TyLit #

min :: TyLit -> TyLit -> TyLit #

Ord TySynEqn 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: TySynEqn -> TySynEqn -> Ordering #

(<) :: TySynEqn -> TySynEqn -> Bool #

(<=) :: TySynEqn -> TySynEqn -> Bool #

(>) :: TySynEqn -> TySynEqn -> Bool #

(>=) :: TySynEqn -> TySynEqn -> Bool #

max :: TySynEqn -> TySynEqn -> TySynEqn #

min :: TySynEqn -> TySynEqn -> TySynEqn #

Ord Type 
Instance details

Defined in Language.Haskell.TH.Syntax

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 #

Ord TypeFamilyHead 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: TypeFamilyHead -> TypeFamilyHead -> Ordering #

(<) :: TypeFamilyHead -> TypeFamilyHead -> Bool #

(<=) :: TypeFamilyHead -> TypeFamilyHead -> Bool #

(>) :: TypeFamilyHead -> TypeFamilyHead -> Bool #

(>=) :: TypeFamilyHead -> TypeFamilyHead -> Bool #

max :: TypeFamilyHead -> TypeFamilyHead -> TypeFamilyHead #

min :: TypeFamilyHead -> TypeFamilyHead -> TypeFamilyHead #

Ord I8 
Instance details

Defined in Data.Text.Foreign

Methods

compare :: I8 -> I8 -> Ordering #

(<) :: I8 -> I8 -> Bool #

(<=) :: I8 -> I8 -> Bool #

(>) :: I8 -> I8 -> Bool #

(>=) :: I8 -> I8 -> Bool #

max :: I8 -> I8 -> I8 #

min :: I8 -> I8 -> I8 #

Ord Builder 
Instance details

Defined in Data.Text.Internal.Builder

Methods

compare :: Builder -> Builder -> Ordering #

(<) :: Builder -> Builder -> Bool #

(<=) :: Builder -> Builder -> Bool #

(>) :: Builder -> Builder -> Bool #

(>=) :: Builder -> Builder -> Bool #

max :: Builder -> Builder -> Builder #

min :: Builder -> Builder -> Builder #

Ord B 
Instance details

Defined in Data.Text.Short.Internal

Methods

compare :: B -> B -> Ordering #

(<) :: B -> B -> Bool #

(<=) :: B -> B -> Bool #

(>) :: B -> B -> Bool #

(>=) :: B -> B -> Bool #

max :: B -> B -> B #

min :: B -> B -> B #

Ord ShortText 
Instance details

Defined in Data.Text.Short.Internal

Methods

compare :: ShortText -> ShortText -> Ordering #

(<) :: ShortText -> ShortText -> Bool #

(<=) :: ShortText -> ShortText -> Bool #

(>) :: ShortText -> ShortText -> Bool #

(>=) :: ShortText -> ShortText -> Bool #

max :: ShortText -> ShortText -> ShortText #

min :: ShortText -> ShortText -> ShortText #

Ord ConstructorVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

compare :: ConstructorVariant -> ConstructorVariant -> Ordering #

(<) :: ConstructorVariant -> ConstructorVariant -> Bool #

(<=) :: ConstructorVariant -> ConstructorVariant -> Bool #

(>) :: ConstructorVariant -> ConstructorVariant -> Bool #

(>=) :: ConstructorVariant -> ConstructorVariant -> Bool #

max :: ConstructorVariant -> ConstructorVariant -> ConstructorVariant #

min :: ConstructorVariant -> ConstructorVariant -> ConstructorVariant #

Ord DatatypeVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

compare :: DatatypeVariant -> DatatypeVariant -> Ordering #

(<) :: DatatypeVariant -> DatatypeVariant -> Bool #

(<=) :: DatatypeVariant -> DatatypeVariant -> Bool #

(>) :: DatatypeVariant -> DatatypeVariant -> Bool #

(>=) :: DatatypeVariant -> DatatypeVariant -> Bool #

max :: DatatypeVariant -> DatatypeVariant -> DatatypeVariant #

min :: DatatypeVariant -> DatatypeVariant -> DatatypeVariant #

Ord FieldStrictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

compare :: FieldStrictness -> FieldStrictness -> Ordering #

(<) :: FieldStrictness -> FieldStrictness -> Bool #

(<=) :: FieldStrictness -> FieldStrictness -> Bool #

(>) :: FieldStrictness -> FieldStrictness -> Bool #

(>=) :: FieldStrictness -> FieldStrictness -> Bool #

max :: FieldStrictness -> FieldStrictness -> FieldStrictness #

min :: FieldStrictness -> FieldStrictness -> FieldStrictness #

Ord Strictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

compare :: Strictness -> Strictness -> Ordering #

(<) :: Strictness -> Strictness -> Bool #

(<=) :: Strictness -> Strictness -> Bool #

(>) :: Strictness -> Strictness -> Bool #

(>=) :: Strictness -> Strictness -> Bool #

max :: Strictness -> Strictness -> Strictness #

min :: Strictness -> Strictness -> Strictness #

Ord Unpackedness 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

compare :: Unpackedness -> Unpackedness -> Ordering #

(<) :: Unpackedness -> Unpackedness -> Bool #

(<=) :: Unpackedness -> Unpackedness -> Bool #

(>) :: Unpackedness -> Unpackedness -> Bool #

(>=) :: Unpackedness -> Unpackedness -> Bool #

max :: Unpackedness -> Unpackedness -> Unpackedness #

min :: Unpackedness -> Unpackedness -> Unpackedness #

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 #

Ord Month 
Instance details

Defined in Data.Time.Calendar.Month

Methods

compare :: Month -> Month -> Ordering #

(<) :: Month -> Month -> Bool #

(<=) :: Month -> Month -> Bool #

(>) :: Month -> Month -> Bool #

(>=) :: Month -> Month -> Bool #

max :: Month -> Month -> Month #

min :: Month -> Month -> Month #

Ord Quarter 
Instance details

Defined in Data.Time.Calendar.Quarter

Methods

compare :: Quarter -> Quarter -> Ordering #

(<) :: Quarter -> Quarter -> Bool #

(<=) :: Quarter -> Quarter -> Bool #

(>) :: Quarter -> Quarter -> Bool #

(>=) :: Quarter -> Quarter -> Bool #

max :: Quarter -> Quarter -> Quarter #

min :: Quarter -> Quarter -> Quarter #

Ord QuarterOfYear 
Instance details

Defined in Data.Time.Calendar.Quarter

Methods

compare :: QuarterOfYear -> QuarterOfYear -> Ordering #

(<) :: QuarterOfYear -> QuarterOfYear -> Bool #

(<=) :: QuarterOfYear -> QuarterOfYear -> Bool #

(>) :: QuarterOfYear -> QuarterOfYear -> Bool #

(>=) :: QuarterOfYear -> QuarterOfYear -> Bool #

max :: QuarterOfYear -> QuarterOfYear -> QuarterOfYear #

min :: QuarterOfYear -> QuarterOfYear -> QuarterOfYear #

Ord DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Methods

compare :: DiffTime -> DiffTime -> Ordering #

(<) :: DiffTime -> DiffTime -> Bool #

(<=) :: DiffTime -> DiffTime -> Bool #

(>) :: DiffTime -> DiffTime -> Bool #

(>=) :: DiffTime -> DiffTime -> Bool #

max :: DiffTime -> DiffTime -> DiffTime #

min :: DiffTime -> DiffTime -> DiffTime #

Ord NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Methods

compare :: NominalDiffTime -> NominalDiffTime -> Ordering #

(<) :: NominalDiffTime -> NominalDiffTime -> Bool #

(<=) :: NominalDiffTime -> NominalDiffTime -> Bool #

(>) :: NominalDiffTime -> NominalDiffTime -> Bool #

(>=) :: NominalDiffTime -> NominalDiffTime -> Bool #

max :: NominalDiffTime -> NominalDiffTime -> NominalDiffTime #

min :: NominalDiffTime -> NominalDiffTime -> NominalDiffTime #

Ord UTCTime 
Instance details

Defined in Data.Time.Clock.Internal.UTCTime

Methods

compare :: UTCTime -> UTCTime -> Ordering #

(<) :: UTCTime -> UTCTime -> Bool #

(<=) :: UTCTime -> UTCTime -> Bool #

(>) :: UTCTime -> UTCTime -> Bool #

(>=) :: UTCTime -> UTCTime -> Bool #

max :: UTCTime -> UTCTime -> UTCTime #

min :: UTCTime -> UTCTime -> UTCTime #

Ord TimeLocale 
Instance details

Defined in Data.Time.Format.Locale

Methods

compare :: TimeLocale -> TimeLocale -> Ordering #

(<) :: TimeLocale -> TimeLocale -> Bool #

(<=) :: TimeLocale -> TimeLocale -> Bool #

(>) :: TimeLocale -> TimeLocale -> Bool #

(>=) :: TimeLocale -> TimeLocale -> Bool #

max :: TimeLocale -> TimeLocale -> TimeLocale #

min :: TimeLocale -> TimeLocale -> TimeLocale #

Ord LocalTime 
Instance details

Defined in Data.Time.LocalTime.Internal.LocalTime

Methods

compare :: LocalTime -> LocalTime -> Ordering #

(<) :: LocalTime -> LocalTime -> Bool #

(<=) :: LocalTime -> LocalTime -> Bool #

(>) :: LocalTime -> LocalTime -> Bool #

(>=) :: LocalTime -> LocalTime -> Bool #

max :: LocalTime -> LocalTime -> LocalTime #

min :: LocalTime -> LocalTime -> LocalTime #

Ord Version 
Instance details

Defined in Network.TLS.Types

Methods

compare :: Version -> Version -> Ordering #

(<) :: Version -> Version -> Bool #

(<=) :: Version -> Version -> Bool #

(>) :: Version -> Version -> Bool #

(>=) :: Version -> Version -> Bool #

max :: Version -> Version -> Version #

min :: Version -> Version -> Version #

Ord CAttributes 
Instance details

Defined in System.Posix.Files.Common

Methods

compare :: CAttributes -> CAttributes -> Ordering #

(<) :: CAttributes -> CAttributes -> Bool #

(<=) :: CAttributes -> CAttributes -> Bool #

(>) :: CAttributes -> CAttributes -> Bool #

(>=) :: CAttributes -> CAttributes -> Bool #

max :: CAttributes -> CAttributes -> CAttributes #

min :: CAttributes -> CAttributes -> CAttributes #

Ord StatxFlags 
Instance details

Defined in System.Posix.Files.Common

Methods

compare :: StatxFlags -> StatxFlags -> Ordering #

(<) :: StatxFlags -> StatxFlags -> Bool #

(<=) :: StatxFlags -> StatxFlags -> Bool #

(>) :: StatxFlags -> StatxFlags -> Bool #

(>=) :: StatxFlags -> StatxFlags -> Bool #

max :: StatxFlags -> StatxFlags -> StatxFlags #

min :: StatxFlags -> StatxFlags -> StatxFlags #

Ord StatxMask 
Instance details

Defined in System.Posix.Files.Common

Methods

compare :: StatxMask -> StatxMask -> Ordering #

(<) :: StatxMask -> StatxMask -> Bool #

(<=) :: StatxMask -> StatxMask -> Bool #

(>) :: StatxMask -> StatxMask -> Bool #

(>=) :: StatxMask -> StatxMask -> Bool #

max :: StatxMask -> StatxMask -> StatxMask #

min :: StatxMask -> StatxMask -> StatxMask #

Ord ProcessStatus 
Instance details

Defined in System.Posix.Process.Internals

Methods

compare :: ProcessStatus -> ProcessStatus -> Ordering #

(<) :: ProcessStatus -> ProcessStatus -> Bool #

(<=) :: ProcessStatus -> ProcessStatus -> Bool #

(>) :: ProcessStatus -> ProcessStatus -> Bool #

(>=) :: ProcessStatus -> ProcessStatus -> Bool #

max :: ProcessStatus -> ProcessStatus -> ProcessStatus #

min :: ProcessStatus -> ProcessStatus -> ProcessStatus #

Ord UnixDiffTime 
Instance details

Defined in Data.UnixTime.Types

Methods

compare :: UnixDiffTime -> UnixDiffTime -> Ordering #

(<) :: UnixDiffTime -> UnixDiffTime -> Bool #

(<=) :: UnixDiffTime -> UnixDiffTime -> Bool #

(>) :: UnixDiffTime -> UnixDiffTime -> Bool #

(>=) :: UnixDiffTime -> UnixDiffTime -> Bool #

max :: UnixDiffTime -> UnixDiffTime -> UnixDiffTime #

min :: UnixDiffTime -> UnixDiffTime -> UnixDiffTime #

Ord UnixTime 
Instance details

Defined in Data.UnixTime.Types

Methods

compare :: UnixTime -> UnixTime -> Ordering #

(<) :: UnixTime -> UnixTime -> Bool #

(<=) :: UnixTime -> UnixTime -> Bool #

(>) :: UnixTime -> UnixTime -> Bool #

(>=) :: UnixTime -> UnixTime -> Bool #

max :: UnixTime -> UnixTime -> UnixTime #

min :: UnixTime -> UnixTime -> UnixTime #

Ord ConcException 
Instance details

Defined in UnliftIO.Internals.Async

Ord UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

compare :: UUID -> UUID -> Ordering #

(<) :: UUID -> UUID -> Bool #

(<=) :: UUID -> UUID -> Bool #

(>) :: UUID -> UUID -> Bool #

(>=) :: UUID -> UUID -> Bool #

max :: UUID -> UUID -> UUID #

min :: UUID -> UUID -> UUID #

Ord UnpackedUUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

compare :: UnpackedUUID -> UnpackedUUID -> Ordering #

(<) :: UnpackedUUID -> UnpackedUUID -> Bool #

(<=) :: UnpackedUUID -> UnpackedUUID -> Bool #

(>) :: UnpackedUUID -> UnpackedUUID -> Bool #

(>=) :: UnpackedUUID -> UnpackedUUID -> Bool #

max :: UnpackedUUID -> UnpackedUUID -> UnpackedUUID #

min :: UnpackedUUID -> UnpackedUUID -> UnpackedUUID #

Ord CompressParams 
Instance details

Defined in Codec.Compression.Zlib.Internal

Methods

compare :: CompressParams -> CompressParams -> Ordering #

(<) :: CompressParams -> CompressParams -> Bool #

(<=) :: CompressParams -> CompressParams -> Bool #

(>) :: CompressParams -> CompressParams -> Bool #

(>=) :: CompressParams -> CompressParams -> Bool #

max :: CompressParams -> CompressParams -> CompressParams #

min :: CompressParams -> CompressParams -> CompressParams #

Ord DecompressError 
Instance details

Defined in Codec.Compression.Zlib.Internal

Methods

compare :: DecompressError -> DecompressError -> Ordering #

(<) :: DecompressError -> DecompressError -> Bool #

(<=) :: DecompressError -> DecompressError -> Bool #

(>) :: DecompressError -> DecompressError -> Bool #

(>=) :: DecompressError -> DecompressError -> Bool #

max :: DecompressError -> DecompressError -> DecompressError #

min :: DecompressError -> DecompressError -> DecompressError #

Ord DecompressParams 
Instance details

Defined in Codec.Compression.Zlib.Internal

Methods

compare :: DecompressParams -> DecompressParams -> Ordering #

(<) :: DecompressParams -> DecompressParams -> Bool #

(<=) :: DecompressParams -> DecompressParams -> Bool #

(>) :: DecompressParams -> DecompressParams -> Bool #

(>=) :: DecompressParams -> DecompressParams -> Bool #

max :: DecompressParams -> DecompressParams -> DecompressParams #

min :: DecompressParams -> DecompressParams -> DecompressParams #

Ord CompressionLevel 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

compare :: CompressionLevel -> CompressionLevel -> Ordering #

(<) :: CompressionLevel -> CompressionLevel -> Bool #

(<=) :: CompressionLevel -> CompressionLevel -> Bool #

(>) :: CompressionLevel -> CompressionLevel -> Bool #

(>=) :: CompressionLevel -> CompressionLevel -> Bool #

max :: CompressionLevel -> CompressionLevel -> CompressionLevel #

min :: CompressionLevel -> CompressionLevel -> CompressionLevel #

Ord CompressionStrategy 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

compare :: CompressionStrategy -> CompressionStrategy -> Ordering #

(<) :: CompressionStrategy -> CompressionStrategy -> Bool #

(<=) :: CompressionStrategy -> CompressionStrategy -> Bool #

(>) :: CompressionStrategy -> CompressionStrategy -> Bool #

(>=) :: CompressionStrategy -> CompressionStrategy -> Bool #

max :: CompressionStrategy -> CompressionStrategy -> CompressionStrategy #

min :: CompressionStrategy -> CompressionStrategy -> CompressionStrategy #

Ord DictionaryHash 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

compare :: DictionaryHash -> DictionaryHash -> Ordering #

(<) :: DictionaryHash -> DictionaryHash -> Bool #

(<=) :: DictionaryHash -> DictionaryHash -> Bool #

(>) :: DictionaryHash -> DictionaryHash -> Bool #

(>=) :: DictionaryHash -> DictionaryHash -> Bool #

max :: DictionaryHash -> DictionaryHash -> DictionaryHash #

min :: DictionaryHash -> DictionaryHash -> DictionaryHash #

Ord Format 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

compare :: Format -> Format -> Ordering #

(<) :: Format -> Format -> Bool #

(<=) :: Format -> Format -> Bool #

(>) :: Format -> Format -> Bool #

(>=) :: Format -> Format -> Bool #

max :: Format -> Format -> Format #

min :: Format -> Format -> Format #

Ord MemoryLevel 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

compare :: MemoryLevel -> MemoryLevel -> Ordering #

(<) :: MemoryLevel -> MemoryLevel -> Bool #

(<=) :: MemoryLevel -> MemoryLevel -> Bool #

(>) :: MemoryLevel -> MemoryLevel -> Bool #

(>=) :: MemoryLevel -> MemoryLevel -> Bool #

max :: MemoryLevel -> MemoryLevel -> MemoryLevel #

min :: MemoryLevel -> MemoryLevel -> MemoryLevel #

Ord Method 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

compare :: Method -> Method -> Ordering #

(<) :: Method -> Method -> Bool #

(<=) :: Method -> Method -> Bool #

(>) :: Method -> Method -> Bool #

(>=) :: Method -> Method -> Bool #

max :: Method -> Method -> Method #

min :: Method -> Method -> Method #

Ord WindowBits 
Instance details

Defined in Codec.Compression.Zlib.Stream

Methods

compare :: WindowBits -> WindowBits -> Ordering #

(<) :: WindowBits -> WindowBits -> Bool #

(<=) :: WindowBits -> WindowBits -> Bool #

(>) :: WindowBits -> WindowBits -> Bool #

(>=) :: WindowBits -> WindowBits -> Bool #

max :: WindowBits -> WindowBits -> WindowBits #

min :: WindowBits -> WindowBits -> WindowBits #

Ord Integer 
Instance details

Defined in GHC.Num.Integer

Ord Natural 
Instance details

Defined in GHC.Num.Natural

Ord () 
Instance details

Defined in GHC.Classes

Methods

compare :: () -> () -> Ordering #

(<) :: () -> () -> Bool #

(<=) :: () -> () -> Bool #

(>) :: () -> () -> Bool #

(>=) :: () -> () -> Bool #

max :: () -> () -> () #

min :: () -> () -> () #

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 #

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 #

Ord Double 
Instance details

Defined in GHC.Classes

Ord Float 
Instance details

Defined in GHC.Classes

Methods

compare :: Float -> Float -> Ordering #

(<) :: Float -> Float -> Bool #

(<=) :: Float -> Float -> Bool #

(>) :: Float -> Float -> Bool #

(>=) :: Float -> Float -> Bool #

max :: Float -> Float -> Float #

min :: Float -> Float -> Float #

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 #

Ord Word 
Instance details

Defined in GHC.Classes

Methods

compare :: Word -> Word -> Ordering #

(<) :: Word -> Word -> Bool #

(<=) :: Word -> Word -> Bool #

(>) :: Word -> Word -> Bool #

(>=) :: Word -> Word -> Bool #

max :: Word -> Word -> Word #

min :: Word -> Word -> Word #

Ord a => Ord (GlobResult a) 
Instance details

Defined in Distribution.Simple.Glob

Methods

compare :: GlobResult a -> GlobResult a -> Ordering #

(<) :: GlobResult a -> GlobResult a -> Bool #

(<=) :: GlobResult a -> GlobResult a -> Bool #

(>) :: GlobResult a -> GlobResult a -> Bool #

(>=) :: GlobResult a -> GlobResult a -> Bool #

max :: GlobResult a -> GlobResult a -> GlobResult a #

min :: GlobResult a -> GlobResult a -> GlobResult a #

Ord id => Ord (AnnotatedId id) 
Instance details

Defined in Distribution.Types.AnnotatedId

Methods

compare :: AnnotatedId id -> AnnotatedId id -> Ordering #

(<) :: AnnotatedId id -> AnnotatedId id -> Bool #

(<=) :: AnnotatedId id -> AnnotatedId id -> Bool #

(>) :: AnnotatedId id -> AnnotatedId id -> Bool #

(>=) :: AnnotatedId id -> AnnotatedId id -> Bool #

max :: AnnotatedId id -> AnnotatedId id -> AnnotatedId id #

min :: AnnotatedId id -> AnnotatedId id -> AnnotatedId id #

Ord a => Ord (NonEmptySet a) 
Instance details

Defined in Distribution.Compat.NonEmptySet

Methods

compare :: NonEmptySet a -> NonEmptySet a -> Ordering #

(<) :: NonEmptySet a -> NonEmptySet a -> Bool #

(<=) :: NonEmptySet a -> NonEmptySet a -> Bool #

(>) :: NonEmptySet a -> NonEmptySet a -> Bool #

(>=) :: NonEmptySet a -> NonEmptySet a -> Bool #

max :: NonEmptySet a -> NonEmptySet a -> NonEmptySet a #

min :: NonEmptySet a -> NonEmptySet a -> NonEmptySet a #

Ord a => Ord (First' a) 
Instance details

Defined in Distribution.Compat.Semigroup

Methods

compare :: First' a -> First' a -> Ordering #

(<) :: First' a -> First' a -> Bool #

(<=) :: First' a -> First' a -> Bool #

(>) :: First' a -> First' a -> Bool #

(>=) :: First' a -> First' a -> Bool #

max :: First' a -> First' a -> First' a #

min :: First' a -> First' a -> First' a #

Ord a => Ord (Last' a) 
Instance details

Defined in Distribution.Compat.Semigroup

Methods

compare :: Last' a -> Last' a -> Ordering #

(<) :: Last' a -> Last' a -> Bool #

(<=) :: Last' a -> Last' a -> Bool #

(>) :: Last' a -> Last' a -> Bool #

(>=) :: Last' a -> Last' a -> Bool #

max :: Last' a -> Last' a -> Last' a #

min :: Last' a -> Last' a -> Last' a #

Ord a => Ord (Option' a) 
Instance details

Defined in Distribution.Compat.Semigroup

Methods

compare :: Option' a -> Option' a -> Ordering #

(<) :: Option' a -> Option' a -> Bool #

(<=) :: Option' a -> Option' a -> Bool #

(>) :: Option' a -> Option' a -> Bool #

(>=) :: Option' a -> Option' a -> Bool #

max :: Option' a -> Option' a -> Option' a #

min :: Option' a -> Option' a -> Option' a #

Ord v => Ord (PerCompilerFlavor v) 
Instance details

Defined in Distribution.Compiler

Methods

compare :: PerCompilerFlavor v -> PerCompilerFlavor v -> Ordering #

(<) :: PerCompilerFlavor v -> PerCompilerFlavor v -> Bool #

(<=) :: PerCompilerFlavor v -> PerCompilerFlavor v -> Bool #

(>) :: PerCompilerFlavor v -> PerCompilerFlavor v -> Bool #

(>=) :: PerCompilerFlavor v -> PerCompilerFlavor v -> Bool #

max :: PerCompilerFlavor v -> PerCompilerFlavor v -> PerCompilerFlavor v #

min :: PerCompilerFlavor v -> PerCompilerFlavor v -> PerCompilerFlavor v #

Ord (Encoding' a) 
Instance details

Defined in Data.Aeson.Encoding.Internal

Methods

compare :: Encoding' a -> Encoding' a -> Ordering #

(<) :: Encoding' a -> Encoding' a -> Bool #

(<=) :: Encoding' a -> Encoding' a -> Bool #

(>) :: Encoding' a -> Encoding' a -> Bool #

(>=) :: Encoding' a -> Encoding' a -> Bool #

max :: Encoding' a -> Encoding' a -> Encoding' a #

min :: Encoding' a -> Encoding' a -> Encoding' a #

Ord v => Ord (KeyMap v) 
Instance details

Defined in Data.Aeson.KeyMap

Methods

compare :: KeyMap v -> KeyMap v -> Ordering #

(<) :: KeyMap v -> KeyMap v -> Bool #

(<=) :: KeyMap v -> KeyMap v -> Bool #

(>) :: KeyMap v -> KeyMap v -> Bool #

(>=) :: KeyMap v -> KeyMap v -> Bool #

max :: KeyMap v -> KeyMap v -> KeyMap v #

min :: KeyMap v -> KeyMap v -> KeyMap v #

Ord (Async a) 
Instance details

Defined in Control.Concurrent.Async.Internal

Methods

compare :: Async a -> Async a -> Ordering #

(<) :: Async a -> Async a -> Bool #

(<=) :: Async a -> Async a -> Bool #

(>) :: Async a -> Async a -> Bool #

(>=) :: Async a -> Async a -> Bool #

max :: Async a -> Async a -> Async a #

min :: Async a -> Async a -> Async a #

Ord a => Ord (ZipList a) 
Instance details

Defined in Control.Applicative

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 #

Ord a => Ord (Identity a) 
Instance details

Defined in Data.Functor.Identity

Methods

compare :: Identity a -> Identity a -> Ordering #

(<) :: Identity a -> Identity a -> Bool #

(<=) :: Identity a -> Identity a -> Bool #

(>) :: Identity a -> Identity a -> Bool #

(>=) :: Identity a -> Identity a -> Bool #

max :: Identity a -> Identity a -> Identity a #

min :: Identity a -> Identity a -> Identity a #

Ord a => Ord (First a) 
Instance details

Defined in Data.Monoid

Methods

compare :: First a -> First a -> Ordering #

(<) :: First a -> First a -> Bool #

(<=) :: First a -> First a -> Bool #

(>) :: First a -> First a -> Bool #

(>=) :: First a -> First a -> Bool #

max :: First a -> First a -> First a #

min :: First a -> First a -> First a #

Ord a => Ord (Last a) 
Instance details

Defined in Data.Monoid

Methods

compare :: Last a -> Last a -> Ordering #

(<) :: Last a -> Last a -> Bool #

(<=) :: Last a -> Last a -> Bool #

(>) :: Last a -> Last a -> Bool #

(>=) :: Last a -> Last a -> Bool #

max :: Last a -> Last a -> Last a #

min :: Last a -> Last a -> Last a #

Ord a => Ord (Down a) 
Instance details

Defined in Data.Ord

Methods

compare :: Down a -> Down a -> Ordering #

(<) :: Down a -> Down a -> Bool #

(<=) :: Down a -> Down a -> Bool #

(>) :: Down a -> Down a -> Bool #

(>=) :: Down a -> Down a -> Bool #

max :: Down a -> Down a -> Down a #

min :: Down a -> Down a -> Down a #

Ord a => Ord (First a) 
Instance details

Defined in Data.Semigroup

Methods

compare :: First a -> First a -> Ordering #

(<) :: First a -> First a -> Bool #

(<=) :: First a -> First a -> Bool #

(>) :: First a -> First a -> Bool #

(>=) :: First a -> First a -> Bool #

max :: First a -> First a -> First a #

min :: First a -> First a -> First a #

Ord a => Ord (Last a) 
Instance details

Defined in Data.Semigroup

Methods

compare :: Last a -> Last a -> Ordering #

(<) :: Last a -> Last a -> Bool #

(<=) :: Last a -> Last a -> Bool #

(>) :: Last a -> Last a -> Bool #

(>=) :: Last a -> Last a -> Bool #

max :: Last a -> Last a -> Last a #

min :: Last a -> Last a -> Last a #

Ord a => Ord (Max a) 
Instance details

Defined in Data.Semigroup

Methods

compare :: Max a -> Max a -> Ordering #

(<) :: Max a -> Max a -> Bool #

(<=) :: Max a -> Max a -> Bool #

(>) :: Max a -> Max a -> Bool #

(>=) :: Max a -> Max a -> Bool #

max :: Max a -> Max a -> Max a #

min :: Max a -> Max a -> Max a #

Ord a => Ord (Min a) 
Instance details

Defined in Data.Semigroup

Methods

compare :: Min a -> Min a -> Ordering #

(<) :: Min a -> Min a -> Bool #

(<=) :: Min a -> Min a -> Bool #

(>) :: Min a -> Min a -> Bool #

(>=) :: Min a -> Min a -> Bool #

max :: Min a -> Min a -> Min a #

min :: Min a -> Min a -> Min a #

Ord m => Ord (WrappedMonoid m) 
Instance details

Defined in Data.Semigroup

Methods

compare :: WrappedMonoid m -> WrappedMonoid m -> Ordering #

(<) :: WrappedMonoid m -> WrappedMonoid m -> Bool #

(<=) :: WrappedMonoid m -> WrappedMonoid m -> Bool #

(>) :: WrappedMonoid m -> WrappedMonoid m -> Bool #

(>=) :: WrappedMonoid m -> WrappedMonoid m -> Bool #

max :: WrappedMonoid m -> WrappedMonoid m -> WrappedMonoid m #

min :: WrappedMonoid m -> WrappedMonoid m -> WrappedMonoid m #

Ord a => Ord (Dual a) 
Instance details

Defined in Data.Semigroup.Internal

Methods

compare :: Dual a -> Dual a -> Ordering #

(<) :: Dual a -> Dual a -> Bool #

(<=) :: Dual a -> Dual a -> Bool #

(>) :: Dual a -> Dual a -> Bool #

(>=) :: Dual a -> Dual a -> Bool #

max :: Dual a -> Dual a -> Dual a #

min :: Dual a -> Dual a -> Dual a #

Ord a => Ord (Product a) 
Instance details

Defined in Data.Semigroup.Internal

Methods

compare :: Product a -> Product a -> Ordering #

(<) :: Product a -> Product a -> Bool #

(<=) :: Product a -> Product a -> Bool #

(>) :: Product a -> Product a -> Bool #

(>=) :: Product a -> Product a -> Bool #

max :: Product a -> Product a -> Product a #

min :: Product a -> Product a -> Product a #

Ord a => Ord (Sum a) 
Instance details

Defined in Data.Semigroup.Internal

Methods

compare :: Sum a -> Sum a -> Ordering #

(<) :: Sum a -> Sum a -> Bool #

(<=) :: Sum a -> Sum a -> Bool #

(>) :: Sum a -> Sum a -> Bool #

(>=) :: Sum a -> Sum a -> Bool #

max :: Sum a -> Sum a -> Sum a #

min :: Sum a -> Sum a -> Sum a #

Ord (ConstPtr a) 
Instance details

Defined in Foreign.C.ConstPtr

Methods

compare :: ConstPtr a -> ConstPtr a -> Ordering #

(<) :: ConstPtr a -> ConstPtr a -> Bool #

(<=) :: ConstPtr a -> ConstPtr a -> Bool #

(>) :: ConstPtr a -> ConstPtr a -> Bool #

(>=) :: ConstPtr a -> ConstPtr a -> Bool #

max :: ConstPtr a -> ConstPtr a -> ConstPtr a #

min :: ConstPtr a -> ConstPtr a -> ConstPtr a #

Ord a => Ord (NonEmpty a) 
Instance details

Defined in GHC.Base

Methods

compare :: NonEmpty a -> NonEmpty a -> Ordering #

(<) :: NonEmpty a -> NonEmpty a -> Bool #

(<=) :: NonEmpty a -> NonEmpty a -> Bool #

(>) :: NonEmpty a -> NonEmpty a -> Bool #

(>=) :: NonEmpty a -> NonEmpty a -> Bool #

max :: NonEmpty a -> NonEmpty a -> NonEmpty a #

min :: NonEmpty a -> NonEmpty a -> NonEmpty a #

Ord (ForeignPtr a) 
Instance details

Defined in GHC.ForeignPtr

Methods

compare :: ForeignPtr a -> ForeignPtr a -> Ordering #

(<) :: ForeignPtr a -> ForeignPtr a -> Bool #

(<=) :: ForeignPtr a -> ForeignPtr a -> Bool #

(>) :: ForeignPtr a -> ForeignPtr a -> Bool #

(>=) :: ForeignPtr a -> ForeignPtr a -> Bool #

max :: ForeignPtr a -> ForeignPtr a -> ForeignPtr a #

min :: ForeignPtr a -> ForeignPtr a -> ForeignPtr a #

Ord p => Ord (Par1 p) 
Instance details

Defined in GHC.Generics

Methods

compare :: Par1 p -> Par1 p -> Ordering #

(<) :: Par1 p -> Par1 p -> Bool #

(<=) :: Par1 p -> Par1 p -> Bool #

(>) :: Par1 p -> Par1 p -> Bool #

(>=) :: Par1 p -> Par1 p -> Bool #

max :: Par1 p -> Par1 p -> Par1 p #

min :: Par1 p -> Par1 p -> Par1 p #

Ord (FunPtr a) 
Instance details

Defined in GHC.Ptr

Methods

compare :: FunPtr a -> FunPtr a -> Ordering #

(<) :: FunPtr a -> FunPtr a -> Bool #

(<=) :: FunPtr a -> FunPtr a -> Bool #

(>) :: FunPtr a -> FunPtr a -> Bool #

(>=) :: FunPtr a -> FunPtr a -> Bool #

max :: FunPtr a -> FunPtr a -> FunPtr a #

min :: FunPtr a -> FunPtr a -> FunPtr a #

Ord (Ptr a) 
Instance details

Defined in GHC.Ptr

Methods

compare :: Ptr a -> Ptr a -> Ordering #

(<) :: Ptr a -> Ptr a -> Bool #

(<=) :: Ptr a -> Ptr a -> Bool #

(>) :: Ptr a -> Ptr a -> Bool #

(>=) :: Ptr a -> Ptr a -> Bool #

max :: Ptr a -> Ptr a -> Ptr a #

min :: Ptr a -> Ptr a -> Ptr a #

Integral a => Ord (Ratio a) 
Instance details

Defined in GHC.Real

Methods

compare :: Ratio a -> Ratio a -> Ordering #

(<) :: Ratio a -> Ratio a -> Bool #

(<=) :: Ratio a -> Ratio a -> Bool #

(>) :: Ratio a -> Ratio a -> Bool #

(>=) :: Ratio a -> Ratio a -> Bool #

max :: Ratio a -> Ratio a -> Ratio a #

min :: Ratio a -> Ratio a -> Ratio a #

Ord (SChar c) 
Instance details

Defined in GHC.TypeLits

Methods

compare :: SChar c -> SChar c -> Ordering #

(<) :: SChar c -> SChar c -> Bool #

(<=) :: SChar c -> SChar c -> Bool #

(>) :: SChar c -> SChar c -> Bool #

(>=) :: SChar c -> SChar c -> Bool #

max :: SChar c -> SChar c -> SChar c #

min :: SChar c -> SChar c -> SChar c #

Ord (SSymbol s) 
Instance details

Defined in GHC.TypeLits

Methods

compare :: SSymbol s -> SSymbol s -> Ordering #

(<) :: SSymbol s -> SSymbol s -> Bool #

(<=) :: SSymbol s -> SSymbol s -> Bool #

(>) :: SSymbol s -> SSymbol s -> Bool #

(>=) :: SSymbol s -> SSymbol s -> Bool #

max :: SSymbol s -> SSymbol s -> SSymbol s #

min :: SSymbol s -> SSymbol s -> SSymbol s #

Ord (SNat n) 
Instance details

Defined in GHC.TypeNats

Methods

compare :: SNat n -> SNat n -> Ordering #

(<) :: SNat n -> SNat n -> Bool #

(<=) :: SNat n -> SNat n -> Bool #

(>) :: SNat n -> SNat n -> Bool #

(>=) :: SNat n -> SNat n -> Bool #

max :: SNat n -> SNat n -> SNat n #

min :: SNat n -> SNat n -> SNat n #

Ord (Bits n) 
Instance details

Defined in Basement.Bits

Methods

compare :: Bits n -> Bits n -> Ordering #

(<) :: Bits n -> Bits n -> Bool #

(<=) :: Bits n -> Bits n -> Bool #

(>) :: Bits n -> Bits n -> Bool #

(>=) :: Bits n -> Bits n -> Bool #

max :: Bits n -> Bits n -> Bits n #

min :: Bits n -> Bits n -> Bits n #

(PrimType ty, Ord ty) => Ord (Block ty) 
Instance details

Defined in Basement.Block.Base

Methods

compare :: Block ty -> Block ty -> Ordering #

(<) :: Block ty -> Block ty -> Bool #

(<=) :: Block ty -> Block ty -> Bool #

(>) :: Block ty -> Block ty -> Bool #

(>=) :: Block ty -> Block ty -> Bool #

max :: Block ty -> Block ty -> Block ty #

min :: Block ty -> Block ty -> Block ty #

Ord (Zn n) 
Instance details

Defined in Basement.Bounded

Methods

compare :: Zn n -> Zn n -> Ordering #

(<) :: Zn n -> Zn n -> Bool #

(<=) :: Zn n -> Zn n -> Bool #

(>) :: Zn n -> Zn n -> Bool #

(>=) :: Zn n -> Zn n -> Bool #

max :: Zn n -> Zn n -> Zn n #

min :: Zn n -> Zn n -> Zn n #

Ord (Zn64 n) 
Instance details

Defined in Basement.Bounded

Methods

compare :: Zn64 n -> Zn64 n -> Ordering #

(<) :: Zn64 n -> Zn64 n -> Bool #

(<=) :: Zn64 n -> Zn64 n -> Bool #

(>) :: Zn64 n -> Zn64 n -> Bool #

(>=) :: Zn64 n -> Zn64 n -> Bool #

max :: Zn64 n -> Zn64 n -> Zn64 n #

min :: Zn64 n -> Zn64 n -> Zn64 n #

Ord (CountOf ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

compare :: CountOf ty -> CountOf ty -> Ordering #

(<) :: CountOf ty -> CountOf ty -> Bool #

(<=) :: CountOf ty -> CountOf ty -> Bool #

(>) :: CountOf ty -> CountOf ty -> Bool #

(>=) :: CountOf ty -> CountOf ty -> Bool #

max :: CountOf ty -> CountOf ty -> CountOf ty #

min :: CountOf ty -> CountOf ty -> CountOf ty #

Ord (Offset ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

compare :: Offset ty -> Offset ty -> Ordering #

(<) :: Offset ty -> Offset ty -> Bool #

(<=) :: Offset ty -> Offset ty -> Bool #

(>) :: Offset ty -> Offset ty -> Bool #

(>=) :: Offset ty -> Offset ty -> Bool #

max :: Offset ty -> Offset ty -> Offset ty #

min :: Offset ty -> Offset ty -> Offset ty #

(PrimType ty, Ord ty) => Ord (UArray ty) 
Instance details

Defined in Basement.UArray.Base

Methods

compare :: UArray ty -> UArray ty -> Ordering #

(<) :: UArray ty -> UArray ty -> Bool #

(<=) :: UArray ty -> UArray ty -> Bool #

(>) :: UArray ty -> UArray ty -> Bool #

(>=) :: UArray ty -> UArray ty -> Bool #

max :: UArray ty -> UArray ty -> UArray ty #

min :: UArray ty -> UArray ty -> UArray ty #

Ord s => Ord (CI s) 
Instance details

Defined in Data.CaseInsensitive.Internal

Methods

compare :: CI s -> CI s -> Ordering #

(<) :: CI s -> CI s -> Bool #

(<=) :: CI s -> CI s -> Bool #

(>) :: CI s -> CI s -> Bool #

(>=) :: CI s -> CI s -> Bool #

max :: CI s -> CI s -> CI s #

min :: CI s -> CI s -> CI s #

Ord a => Ord (Flush a) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

compare :: Flush a -> Flush a -> Ordering #

(<) :: Flush a -> Flush a -> Bool #

(<=) :: Flush a -> Flush a -> Bool #

(>) :: Flush a -> Flush a -> Bool #

(>=) :: Flush a -> Flush a -> Bool #

max :: Flush a -> Flush a -> Flush a #

min :: Flush a -> Flush a -> Flush a #

Ord a => Ord (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

compare :: IntMap a -> IntMap a -> Ordering #

(<) :: IntMap a -> IntMap a -> Bool #

(<=) :: IntMap a -> IntMap a -> Bool #

(>) :: IntMap a -> IntMap a -> Bool #

(>=) :: IntMap a -> IntMap a -> Bool #

max :: IntMap a -> IntMap a -> IntMap a #

min :: IntMap a -> IntMap a -> IntMap a #

Ord a => Ord (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

compare :: Seq a -> Seq a -> Ordering #

(<) :: Seq a -> Seq a -> Bool #

(<=) :: Seq a -> Seq a -> Bool #

(>) :: Seq a -> Seq a -> Bool #

(>=) :: Seq a -> Seq a -> Bool #

max :: Seq a -> Seq a -> Seq a #

min :: Seq a -> Seq a -> Seq a #

Ord a => Ord (ViewL a) 
Instance details

Defined in Data.Sequence.Internal

Methods

compare :: ViewL a -> ViewL a -> Ordering #

(<) :: ViewL a -> ViewL a -> Bool #

(<=) :: ViewL a -> ViewL a -> Bool #

(>) :: ViewL a -> ViewL a -> Bool #

(>=) :: ViewL a -> ViewL a -> Bool #

max :: ViewL a -> ViewL a -> ViewL a #

min :: ViewL a -> ViewL a -> ViewL a #

Ord a => Ord (ViewR a) 
Instance details

Defined in Data.Sequence.Internal

Methods

compare :: ViewR a -> ViewR a -> Ordering #

(<) :: ViewR a -> ViewR a -> Bool #

(<=) :: ViewR a -> ViewR a -> Bool #

(>) :: ViewR a -> ViewR a -> Bool #

(>=) :: ViewR a -> ViewR a -> Bool #

max :: ViewR a -> ViewR a -> ViewR a #

min :: ViewR a -> ViewR a -> ViewR a #

Ord a => Ord (Intersection a) 
Instance details

Defined in Data.Set.Internal

Methods

compare :: Intersection a -> Intersection a -> Ordering #

(<) :: Intersection a -> Intersection a -> Bool #

(<=) :: Intersection a -> Intersection a -> Bool #

(>) :: Intersection a -> Intersection a -> Bool #

(>=) :: Intersection a -> Intersection a -> Bool #

max :: Intersection a -> Intersection a -> Intersection a #

min :: Intersection a -> Intersection a -> Intersection a #

Ord a => Ord (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

compare :: Set a -> Set a -> Ordering #

(<) :: Set a -> Set a -> Bool #

(<=) :: Set a -> Set a -> Bool #

(>) :: Set a -> Set a -> Bool #

(>=) :: Set a -> Set a -> Bool #

max :: Set a -> Set a -> Set a #

min :: Set a -> Set a -> Set a #

Ord a => Ord (Tree a) 
Instance details

Defined in Data.Tree

Methods

compare :: Tree a -> Tree a -> Ordering #

(<) :: Tree a -> Tree a -> Bool #

(<=) :: Tree a -> Tree a -> Bool #

(>) :: Tree a -> Tree a -> Bool #

(>=) :: Tree a -> Tree a -> Bool #

max :: Tree a -> Tree a -> Tree a #

min :: Tree a -> Tree a -> Tree a #

Ord (Digest a) 
Instance details

Defined in Crypto.Hash.Types

Methods

compare :: Digest a -> Digest a -> Ordering #

(<) :: Digest a -> Digest a -> Bool #

(<=) :: Digest a -> Digest a -> Bool #

(>) :: Digest a -> Digest a -> Bool #

(>=) :: Digest a -> Digest a -> Bool #

max :: Digest a -> Digest a -> Digest a #

min :: Digest a -> Digest a -> Digest a #

Ord1 f => Ord (Fix f) 
Instance details

Defined in Data.Fix

Methods

compare :: Fix f -> Fix f -> Ordering #

(<) :: Fix f -> Fix f -> Bool #

(<=) :: Fix f -> Fix f -> Bool #

(>) :: Fix f -> Fix f -> Bool #

(>=) :: Fix f -> Fix f -> Bool #

max :: Fix f -> Fix f -> Fix f #

min :: Fix f -> Fix f -> Fix f #

(Functor f, Ord1 f) => Ord (Mu f) 
Instance details

Defined in Data.Fix

Methods

compare :: Mu f -> Mu f -> Ordering #

(<) :: Mu f -> Mu f -> Bool #

(<=) :: Mu f -> Mu f -> Bool #

(>) :: Mu f -> Mu f -> Bool #

(>=) :: Mu f -> Mu f -> Bool #

max :: Mu f -> Mu f -> Mu f #

min :: Mu f -> Mu f -> Mu f #

(Functor f, Ord1 f) => Ord (Nu f) 
Instance details

Defined in Data.Fix

Methods

compare :: Nu f -> Nu f -> Ordering #

(<) :: Nu f -> Nu f -> Bool #

(<=) :: Nu f -> Nu f -> Bool #

(>) :: Nu f -> Nu f -> Bool #

(>=) :: Nu f -> Nu f -> Bool #

max :: Nu f -> Nu f -> Nu f #

min :: Nu f -> Nu f -> Nu f #

Ord a => Ord (DNonEmpty a) 
Instance details

Defined in Data.DList.DNonEmpty.Internal

Methods

compare :: DNonEmpty a -> DNonEmpty a -> Ordering #

(<) :: DNonEmpty a -> DNonEmpty a -> Bool #

(<=) :: DNonEmpty a -> DNonEmpty a -> Bool #

(>) :: DNonEmpty a -> DNonEmpty a -> Bool #

(>=) :: DNonEmpty a -> DNonEmpty a -> Bool #

max :: DNonEmpty a -> DNonEmpty a -> DNonEmpty a #

min :: DNonEmpty a -> DNonEmpty a -> DNonEmpty a #

Ord a => Ord (DList a) 
Instance details

Defined in Data.DList.Internal

Methods

compare :: DList a -> DList a -> Ordering #

(<) :: DList a -> DList a -> Bool #

(<=) :: DList a -> DList a -> Bool #

(>) :: DList a -> DList a -> Bool #

(>=) :: DList a -> DList a -> Bool #

max :: DList a -> DList a -> DList a #

min :: DList a -> DList a -> DList a #

Ord a => Ord (Hashed a) 
Instance details

Defined in Data.Hashable.Class

Methods

compare :: Hashed a -> Hashed a -> Ordering #

(<) :: Hashed a -> Hashed a -> Bool #

(<=) :: Hashed a -> Hashed a -> Bool #

(>) :: Hashed a -> Hashed a -> Bool #

(>=) :: Hashed a -> Hashed a -> Bool #

max :: Hashed a -> Hashed a -> Hashed a #

min :: Hashed a -> Hashed a -> Hashed a #

Ord a => Ord (LenientData a) 
Instance details

Defined in Web.Internal.HttpApiData

Methods

compare :: LenientData a -> LenientData a -> Ordering #

(<) :: LenientData a -> LenientData a -> Bool #

(<=) :: LenientData a -> LenientData a -> Bool #

(>) :: LenientData a -> LenientData a -> Bool #

(>=) :: LenientData a -> LenientData a -> Bool #

max :: LenientData a -> LenientData a -> LenientData a #

min :: LenientData a -> LenientData a -> LenientData a #

Ord a => Ord (AddrRange a) 
Instance details

Defined in Data.IP.Range

Methods

compare :: AddrRange a -> AddrRange a -> Ordering #

(<) :: AddrRange a -> AddrRange a -> Bool #

(<=) :: AddrRange a -> AddrRange a -> Bool #

(>) :: AddrRange a -> AddrRange a -> Bool #

(>=) :: AddrRange a -> AddrRange a -> Bool #

max :: AddrRange a -> AddrRange a -> AddrRange a #

min :: AddrRange a -> AddrRange a -> AddrRange a #

Ord mono => Ord (NonNull mono) 
Instance details

Defined in Data.NonNull

Methods

compare :: NonNull mono -> NonNull mono -> Ordering #

(<) :: NonNull mono -> NonNull mono -> Bool #

(<=) :: NonNull mono -> NonNull mono -> Bool #

(>) :: NonNull mono -> NonNull mono -> Bool #

(>=) :: NonNull mono -> NonNull mono -> Bool #

max :: NonNull mono -> NonNull mono -> NonNull mono #

min :: NonNull mono -> NonNull mono -> NonNull mono #

Ord α => Ord (Context α) 
Instance details

Defined in Text.Mustache.Internal.Types

Methods

compare :: Context α -> Context α -> Ordering #

(<) :: Context α -> Context α -> Bool #

(<=) :: Context α -> Context α -> Bool #

(>) :: Context α -> Context α -> Bool #

(>=) :: Context α -> Context α -> Bool #

max :: Context α -> Context α -> Context α #

min :: Context α -> Context α -> Context α #

Ord a => Ord (CabalString a) 
Instance details

Defined in Pantry.Types

Ord (ResolvedPath t) 
Instance details

Defined in Pantry.Types

Ord (SomeBase t) 
Instance details

Defined in Path.Posix

Methods

compare :: SomeBase t -> SomeBase t -> Ordering #

(<) :: SomeBase t -> SomeBase t -> Bool #

(<=) :: SomeBase t -> SomeBase t -> Bool #

(>) :: SomeBase t -> SomeBase t -> Bool #

(>=) :: SomeBase t -> SomeBase t -> Bool #

max :: SomeBase t -> SomeBase t -> SomeBase t #

min :: SomeBase t -> SomeBase t -> SomeBase t #

Ord (SomeBase t) 
Instance details

Defined in Path.Windows

Methods

compare :: SomeBase t -> SomeBase t -> Ordering #

(<) :: SomeBase t -> SomeBase t -> Bool #

(<=) :: SomeBase t -> SomeBase t -> Bool #

(>) :: SomeBase t -> SomeBase t -> Bool #

(>=) :: SomeBase t -> SomeBase t -> Bool #

max :: SomeBase t -> SomeBase t -> SomeBase t #

min :: SomeBase t -> SomeBase t -> SomeBase t #

(Ord (Key record), Ord record) => Ord (Entity record) 
Instance details

Defined in Database.Persist.Class.PersistEntity

Methods

compare :: Entity record -> Entity record -> Ordering #

(<) :: Entity record -> Entity record -> Bool #

(<=) :: Entity record -> Entity record -> Bool #

(>) :: Entity record -> Entity record -> Bool #

(>=) :: Entity record -> Entity record -> Bool #

max :: Entity record -> Entity record -> Entity record #

min :: Entity record -> Entity record -> Entity record #

Ord (Key ArchiveCache) 
Instance details

Defined in Pantry.Storage

Methods

compare :: Key ArchiveCache -> Key ArchiveCache -> Ordering #

(<) :: Key ArchiveCache -> Key ArchiveCache -> Bool #

(<=) :: Key ArchiveCache -> Key ArchiveCache -> Bool #

(>) :: Key ArchiveCache -> Key ArchiveCache -> Bool #

(>=) :: Key ArchiveCache -> Key ArchiveCache -> Bool #

max :: Key ArchiveCache -> Key ArchiveCache -> Key ArchiveCache #

min :: Key ArchiveCache -> Key ArchiveCache -> Key ArchiveCache #

Ord (Key Blob) 
Instance details

Defined in Pantry.Storage

Methods

compare :: Key Blob -> Key Blob -> Ordering #

(<) :: Key Blob -> Key Blob -> Bool #

(<=) :: Key Blob -> Key Blob -> Bool #

(>) :: Key Blob -> Key Blob -> Bool #

(>=) :: Key Blob -> Key Blob -> Bool #

max :: Key Blob -> Key Blob -> Key Blob #

min :: Key Blob -> Key Blob -> Key Blob #

Ord (Key CacheUpdate) 
Instance details

Defined in Pantry.Storage

Methods

compare :: Key CacheUpdate -> Key CacheUpdate -> Ordering #

(<) :: Key CacheUpdate -> Key CacheUpdate -> Bool #

(<=) :: Key CacheUpdate -> Key CacheUpdate -> Bool #

(>) :: Key CacheUpdate -> Key CacheUpdate -> Bool #

(>=) :: Key CacheUpdate -> Key CacheUpdate -> Bool #

max :: Key CacheUpdate -> Key CacheUpdate -> Key CacheUpdate #

min :: Key CacheUpdate -> Key CacheUpdate -> Key CacheUpdate #

Ord (Key FilePath) 
Instance details

Defined in Pantry.Storage

Methods

compare :: Key FilePath -> Key FilePath -> Ordering #

(<) :: Key FilePath -> Key FilePath -> Bool #

(<=) :: Key FilePath -> Key FilePath -> Bool #

(>) :: Key FilePath -> Key FilePath -> Bool #

(>=) :: Key FilePath -> Key FilePath -> Bool #

max :: Key FilePath -> Key FilePath -> Key FilePath #

min :: Key FilePath -> Key FilePath -> Key FilePath #

Ord (Key HPack) 
Instance details

Defined in Pantry.Storage

Methods

compare :: Key HPack -> Key HPack -> Ordering #

(<) :: Key HPack -> Key HPack -> Bool #

(<=) :: Key HPack -> Key HPack -> Bool #

(>) :: Key HPack -> Key HPack -> Bool #

(>=) :: Key HPack -> Key HPack -> Bool #

max :: Key HPack -> Key HPack -> Key HPack #

min :: Key HPack -> Key HPack -> Key HPack #

Ord (Key HackageCabal) 
Instance details

Defined in Pantry.Storage

Methods

compare :: Key HackageCabal -> Key HackageCabal -> Ordering #

(<) :: Key HackageCabal -> Key HackageCabal -> Bool #

(<=) :: Key HackageCabal -> Key HackageCabal -> Bool #

(>) :: Key HackageCabal -> Key HackageCabal -> Bool #

(>=) :: Key HackageCabal -> Key HackageCabal -> Bool #

max :: Key HackageCabal -> Key HackageCabal -> Key HackageCabal #

min :: Key HackageCabal -> Key HackageCabal -> Key HackageCabal #

Ord (Key HackageTarball) 
Instance details

Defined in Pantry.Storage

Methods

compare :: Key HackageTarball -> Key HackageTarball -> Ordering #

(<) :: Key HackageTarball -> Key HackageTarball -> Bool #

(<=) :: Key HackageTarball -> Key HackageTarball -> Bool #

(>) :: Key HackageTarball -> Key HackageTarball -> Bool #

(>=) :: Key HackageTarball -> Key HackageTarball -> Bool #

max :: Key HackageTarball -> Key HackageTarball -> Key HackageTarball #

min :: Key HackageTarball -> Key HackageTarball -> Key HackageTarball #

Ord (Key ModuleName) 
Instance details

Defined in Pantry.Storage

Methods

compare :: Key ModuleName -> Key ModuleName -> Ordering #

(<) :: Key ModuleName -> Key ModuleName -> Bool #

(<=) :: Key ModuleName -> Key ModuleName -> Bool #

(>) :: Key ModuleName -> Key ModuleName -> Bool #

(>=) :: Key ModuleName -> Key ModuleName -> Bool #

max :: Key ModuleName -> Key ModuleName -> Key ModuleName #

min :: Key ModuleName -> Key ModuleName -> Key ModuleName #

Ord (Key PackageExposedModule) 
Instance details

Defined in Pantry.Storage

Methods

compare :: Key PackageExposedModule -> Key PackageExposedModule -> Ordering #

(<) :: Key PackageExposedModule -> Key PackageExposedModule -> Bool #

(<=) :: Key PackageExposedModule -> Key PackageExposedModule -> Bool #

(>) :: Key PackageExposedModule -> Key PackageExposedModule -> Bool #

(>=) :: Key PackageExposedModule -> Key PackageExposedModule -> Bool #

max :: Key PackageExposedModule -> Key PackageExposedModule -> Key PackageExposedModule #

min :: Key PackageExposedModule -> Key PackageExposedModule -> Key PackageExposedModule #

Ord (Key PackageName) 
Instance details

Defined in Pantry.Storage

Ord (Key PreferredVersions) 
Instance details

Defined in Pantry.Storage

Methods

compare :: Key PreferredVersions -> Key PreferredVersions -> Ordering #

(<) :: Key PreferredVersions -> Key PreferredVersions -> Bool #

(<=) :: Key PreferredVersions -> Key PreferredVersions -> Bool #

(>) :: Key PreferredVersions -> Key PreferredVersions -> Bool #

(>=) :: Key PreferredVersions -> Key PreferredVersions -> Bool #

max :: Key PreferredVersions -> Key PreferredVersions -> Key PreferredVersions #

min :: Key PreferredVersions -> Key PreferredVersions -> Key PreferredVersions #

Ord (Key RepoCache) 
Instance details

Defined in Pantry.Storage

Methods

compare :: Key RepoCache -> Key RepoCache -> Ordering #

(<) :: Key RepoCache -> Key RepoCache -> Bool #

(<=) :: Key RepoCache -> Key RepoCache -> Bool #

(>) :: Key RepoCache -> Key RepoCache -> Bool #

(>=) :: Key RepoCache -> Key RepoCache -> Bool #

max :: Key RepoCache -> Key RepoCache -> Key RepoCache #

min :: Key RepoCache -> Key RepoCache -> Key RepoCache #

Ord (Key SnapshotCache) 
Instance details

Defined in Pantry.Storage

Methods

compare :: Key SnapshotCache -> Key SnapshotCache -> Ordering #

(<) :: Key SnapshotCache -> Key SnapshotCache -> Bool #

(<=) :: Key SnapshotCache -> Key SnapshotCache -> Bool #

(>) :: Key SnapshotCache -> Key SnapshotCache -> Bool #

(>=) :: Key SnapshotCache -> Key SnapshotCache -> Bool #

max :: Key SnapshotCache -> Key SnapshotCache -> Key SnapshotCache #

min :: Key SnapshotCache -> Key SnapshotCache -> Key SnapshotCache #

Ord (Key Tree) 
Instance details

Defined in Pantry.Storage

Methods

compare :: Key Tree -> Key Tree -> Ordering #

(<) :: Key Tree -> Key Tree -> Bool #

(<=) :: Key Tree -> Key Tree -> Bool #

(>) :: Key Tree -> Key Tree -> Bool #

(>=) :: Key Tree -> Key Tree -> Bool #

max :: Key Tree -> Key Tree -> Key Tree #

min :: Key Tree -> Key Tree -> Key Tree #

Ord (Key TreeEntry) 
Instance details

Defined in Pantry.Storage

Methods

compare :: Key TreeEntry -> Key TreeEntry -> Ordering #

(<) :: Key TreeEntry -> Key TreeEntry -> Bool #

(<=) :: Key TreeEntry -> Key TreeEntry -> Bool #

(>) :: Key TreeEntry -> Key TreeEntry -> Bool #

(>=) :: Key TreeEntry -> Key TreeEntry -> Bool #

max :: Key TreeEntry -> Key TreeEntry -> Key TreeEntry #

min :: Key TreeEntry -> Key TreeEntry -> Key TreeEntry #

Ord (Key UrlBlob) 
Instance details

Defined in Pantry.Storage

Methods

compare :: Key UrlBlob -> Key UrlBlob -> Ordering #

(<) :: Key UrlBlob -> Key UrlBlob -> Bool #

(<=) :: Key UrlBlob -> Key UrlBlob -> Bool #

(>) :: Key UrlBlob -> Key UrlBlob -> Bool #

(>=) :: Key UrlBlob -> Key UrlBlob -> Bool #

max :: Key UrlBlob -> Key UrlBlob -> Key UrlBlob #

min :: Key UrlBlob -> Key UrlBlob -> Key UrlBlob #

Ord (Key Version) 
Instance details

Defined in Pantry.Storage

(BackendCompatible b s, Ord (BackendKey b)) => Ord (BackendKey (Compatible b s)) 
Instance details

Defined in Database.Persist.Compatible.Types

Methods

compare :: BackendKey (Compatible b s) -> BackendKey (Compatible b s) -> Ordering #

(<) :: BackendKey (Compatible b s) -> BackendKey (Compatible b s) -> Bool #

(<=) :: BackendKey (Compatible b s) -> BackendKey (Compatible b s) -> Bool #

(>) :: BackendKey (Compatible b s) -> BackendKey (Compatible b s) -> Bool #

(>=) :: BackendKey (Compatible b s) -> BackendKey (Compatible b s) -> Bool #

max :: BackendKey (Compatible b s) -> BackendKey (Compatible b s) -> BackendKey (Compatible b s) #

min :: BackendKey (Compatible b s) -> BackendKey (Compatible b s) -> BackendKey (Compatible b s) #

(PersistCore b, PersistCore (RawSqlite b), Ord (BackendKey b)) => Ord (BackendKey (RawSqlite b)) 
Instance details

Defined in Database.Persist.Sqlite

Methods

compare :: BackendKey (RawSqlite b) -> BackendKey (RawSqlite b) -> Ordering #

(<) :: BackendKey (RawSqlite b) -> BackendKey (RawSqlite b) -> Bool #

(<=) :: BackendKey (RawSqlite b) -> BackendKey (RawSqlite b) -> Bool #

(>) :: BackendKey (RawSqlite b) -> BackendKey (RawSqlite b) -> Bool #

(>=) :: BackendKey (RawSqlite b) -> BackendKey (RawSqlite b) -> Bool #

max :: BackendKey (RawSqlite b) -> BackendKey (RawSqlite b) -> BackendKey (RawSqlite b) #

min :: BackendKey (RawSqlite b) -> BackendKey (RawSqlite b) -> BackendKey (RawSqlite b) #

Ord ann => Ord (SimpleDocStream ann) 
Instance details

Defined in Prettyprinter.Internal

Methods

compare :: SimpleDocStream ann -> SimpleDocStream ann -> Ordering #

(<) :: SimpleDocStream ann -> SimpleDocStream ann -> Bool #

(<=) :: SimpleDocStream ann -> SimpleDocStream ann -> Bool #

(>) :: SimpleDocStream ann -> SimpleDocStream ann -> Bool #

(>=) :: SimpleDocStream ann -> SimpleDocStream ann -> Bool #

max :: SimpleDocStream ann -> SimpleDocStream ann -> SimpleDocStream ann #

min :: SimpleDocStream ann -> SimpleDocStream ann -> SimpleDocStream ann #

Ord a => Ord (Array a) 
Instance details

Defined in Data.Primitive.Array

Methods

compare :: Array a -> Array a -> Ordering #

(<) :: Array a -> Array a -> Bool #

(<=) :: Array a -> Array a -> Bool #

(>) :: Array a -> Array a -> Bool #

(>=) :: Array a -> Array a -> Bool #

max :: Array a -> Array a -> Array a #

min :: Array a -> Array a -> Array a #

(Ord a, Prim a) => Ord (PrimArray a) 
Instance details

Defined in Data.Primitive.PrimArray

Methods

compare :: PrimArray a -> PrimArray a -> Ordering #

(<) :: PrimArray a -> PrimArray a -> Bool #

(<=) :: PrimArray a -> PrimArray a -> Bool #

(>) :: PrimArray a -> PrimArray a -> Bool #

(>=) :: PrimArray a -> PrimArray a -> Bool #

max :: PrimArray a -> PrimArray a -> PrimArray a #

min :: PrimArray a -> PrimArray a -> PrimArray a #

Ord a => Ord (SmallArray a) 
Instance details

Defined in Data.Primitive.SmallArray

Methods

compare :: SmallArray a -> SmallArray a -> Ordering #

(<) :: SmallArray a -> SmallArray a -> Bool #

(<=) :: SmallArray a -> SmallArray a -> Bool #

(>) :: SmallArray a -> SmallArray a -> Bool #

(>=) :: SmallArray a -> SmallArray a -> Bool #

max :: SmallArray a -> SmallArray a -> SmallArray a #

min :: SmallArray a -> SmallArray a -> SmallArray a #

Ord g => Ord (StateGen g) 
Instance details

Defined in System.Random.Internal

Methods

compare :: StateGen g -> StateGen g -> Ordering #

(<) :: StateGen g -> StateGen g -> Bool #

(<=) :: StateGen g -> StateGen g -> Bool #

(>) :: StateGen g -> StateGen g -> Bool #

(>=) :: StateGen g -> StateGen g -> Bool #

max :: StateGen g -> StateGen g -> StateGen g #

min :: StateGen g -> StateGen g -> StateGen g #

Ord g => Ord (AtomicGen g) 
Instance details

Defined in System.Random.Stateful

Methods

compare :: AtomicGen g -> AtomicGen g -> Ordering #

(<) :: AtomicGen g -> AtomicGen g -> Bool #

(<=) :: AtomicGen g -> AtomicGen g -> Bool #

(>) :: AtomicGen g -> AtomicGen g -> Bool #

(>=) :: AtomicGen g -> AtomicGen g -> Bool #

max :: AtomicGen g -> AtomicGen g -> AtomicGen g #

min :: AtomicGen g -> AtomicGen g -> AtomicGen g #

Ord g => Ord (IOGen g) 
Instance details

Defined in System.Random.Stateful

Methods

compare :: IOGen g -> IOGen g -> Ordering #

(<) :: IOGen g -> IOGen g -> Bool #

(<=) :: IOGen g -> IOGen g -> Bool #

(>) :: IOGen g -> IOGen g -> Bool #

(>=) :: IOGen g -> IOGen g -> Bool #

max :: IOGen g -> IOGen g -> IOGen g #

min :: IOGen g -> IOGen g -> IOGen g #

Ord g => Ord (STGen g) 
Instance details

Defined in System.Random.Stateful

Methods

compare :: STGen g -> STGen g -> Ordering #

(<) :: STGen g -> STGen g -> Bool #

(<=) :: STGen g -> STGen g -> Bool #

(>) :: STGen g -> STGen g -> Bool #

(>=) :: STGen g -> STGen g -> Bool #

max :: STGen g -> STGen g -> STGen g #

min :: STGen g -> STGen g -> STGen g #

Ord g => Ord (TGen g) 
Instance details

Defined in System.Random.Stateful

Methods

compare :: TGen g -> TGen g -> Ordering #

(<) :: TGen g -> TGen g -> Bool #

(<=) :: TGen g -> TGen g -> Bool #

(>) :: TGen g -> TGen g -> Bool #

(>=) :: TGen g -> TGen g -> Bool #

max :: TGen g -> TGen g -> TGen g #

min :: TGen g -> TGen g -> TGen g #

Ord a => Ord (Maybe a) 
Instance details

Defined in Data.Strict.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 #

Ord linkTarget => Ord (GenEntryContent linkTarget) 
Instance details

Defined in Codec.Archive.Tar.Types

Methods

compare :: GenEntryContent linkTarget -> GenEntryContent linkTarget -> Ordering #

(<) :: GenEntryContent linkTarget -> GenEntryContent linkTarget -> Bool #

(<=) :: GenEntryContent linkTarget -> GenEntryContent linkTarget -> Bool #

(>) :: GenEntryContent linkTarget -> GenEntryContent linkTarget -> Bool #

(>=) :: GenEntryContent linkTarget -> GenEntryContent linkTarget -> Bool #

max :: GenEntryContent linkTarget -> GenEntryContent linkTarget -> GenEntryContent linkTarget #

min :: GenEntryContent linkTarget -> GenEntryContent linkTarget -> GenEntryContent linkTarget #

Ord flag => Ord (TyVarBndr flag) 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

compare :: TyVarBndr flag -> TyVarBndr flag -> Ordering #

(<) :: TyVarBndr flag -> TyVarBndr flag -> Bool #

(<=) :: TyVarBndr flag -> TyVarBndr flag -> Bool #

(>) :: TyVarBndr flag -> TyVarBndr flag -> Bool #

(>=) :: TyVarBndr flag -> TyVarBndr flag -> Bool #

max :: TyVarBndr flag -> TyVarBndr flag -> TyVarBndr flag #

min :: TyVarBndr flag -> TyVarBndr flag -> TyVarBndr flag #

Ord a => Ord (Stream a) 
Instance details

Defined in Data.Text.Internal.Fusion.Types

Methods

compare :: Stream a -> Stream a -> Ordering #

(<) :: Stream a -> Stream a -> Bool #

(<=) :: Stream a -> Stream a -> Bool #

(>) :: Stream a -> Stream a -> Bool #

(>=) :: Stream a -> Stream a -> Bool #

max :: Stream a -> Stream a -> Stream a #

min :: Stream a -> Stream a -> Stream a #

Ord a => Ord (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Methods

compare :: HashSet a -> HashSet a -> Ordering #

(<) :: HashSet a -> HashSet a -> Bool #

(<=) :: HashSet a -> HashSet a -> Bool #

(>) :: HashSet a -> HashSet a -> Bool #

(>=) :: HashSet a -> HashSet a -> Bool #

max :: HashSet a -> HashSet a -> HashSet a #

min :: HashSet a -> HashSet a -> HashSet a #

Ord a => Ord (Vector a) 
Instance details

Defined in Data.Vector

Methods

compare :: Vector a -> Vector a -> Ordering #

(<) :: Vector a -> Vector a -> Bool #

(<=) :: Vector a -> Vector a -> Bool #

(>) :: Vector a -> Vector a -> Bool #

(>=) :: Vector a -> Vector a -> Bool #

max :: Vector a -> Vector a -> Vector a #

min :: Vector a -> Vector a -> Vector a #

(Prim a, Ord a) => Ord (Vector a) 
Instance details

Defined in Data.Vector.Primitive

Methods

compare :: Vector a -> Vector a -> Ordering #

(<) :: Vector a -> Vector a -> Bool #

(<=) :: Vector a -> Vector a -> Bool #

(>) :: Vector a -> Vector a -> Bool #

(>=) :: Vector a -> Vector a -> Bool #

max :: Vector a -> Vector a -> Vector a #

min :: Vector a -> Vector a -> Vector a #

(Storable a, Ord a) => Ord (Vector a) 
Instance details

Defined in Data.Vector.Storable

Methods

compare :: Vector a -> Vector a -> Ordering #

(<) :: Vector a -> Vector a -> Bool #

(<=) :: Vector a -> Vector a -> Bool #

(>) :: Vector a -> Vector a -> Bool #

(>=) :: Vector a -> Vector a -> Bool #

max :: Vector a -> Vector a -> Vector a #

min :: Vector a -> Vector a -> Vector a #

Ord a => Ord (Vector a) 
Instance details

Defined in Data.Vector.Strict

Methods

compare :: Vector a -> Vector a -> Ordering #

(<) :: Vector a -> Vector a -> Bool #

(<=) :: Vector a -> Vector a -> Bool #

(>) :: Vector a -> Vector a -> Bool #

(>=) :: Vector a -> Vector a -> Bool #

max :: Vector a -> Vector a -> Vector a #

min :: Vector a -> Vector a -> Vector a #

Ord a => Ord (Maybe a) 
Instance details

Defined in GHC.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 #

Ord a => Ord (Solo a) 
Instance details

Defined in GHC.Classes

Methods

compare :: Solo a -> Solo a -> Ordering #

(<) :: Solo a -> Solo a -> Bool #

(<=) :: Solo a -> Solo a -> Bool #

(>) :: Solo a -> Solo a -> Bool #

(>=) :: Solo a -> Solo a -> Bool #

max :: Solo a -> Solo a -> Solo a #

min :: Solo a -> Solo a -> Solo a #

Ord a => Ord [a] 
Instance details

Defined in GHC.Classes

Methods

compare :: [a] -> [a] -> Ordering #

(<) :: [a] -> [a] -> Bool #

(<=) :: [a] -> [a] -> Bool #

(>) :: [a] -> [a] -> Bool #

(>=) :: [a] -> [a] -> Bool #

max :: [a] -> [a] -> [a] #

min :: [a] -> [a] -> [a] #

Ord (SymbolicPath from to) 
Instance details

Defined in Distribution.Utils.Path

Methods

compare :: SymbolicPath from to -> SymbolicPath from to -> Ordering #

(<) :: SymbolicPath from to -> SymbolicPath from to -> Bool #

(<=) :: SymbolicPath from to -> SymbolicPath from to -> Bool #

(>) :: SymbolicPath from to -> SymbolicPath from to -> Bool #

(>=) :: SymbolicPath from to -> SymbolicPath from to -> Bool #

max :: SymbolicPath from to -> SymbolicPath from to -> SymbolicPath from to #

min :: SymbolicPath from to -> SymbolicPath from to -> SymbolicPath from to #

(Ix ix, Ord e, IArray UArray e) => Ord (UArray ix e) 
Instance details

Defined in Data.Array.Base

Methods

compare :: UArray ix e -> UArray ix e -> Ordering #

(<) :: UArray ix e -> UArray ix e -> Bool #

(<=) :: UArray ix e -> UArray ix e -> Bool #

(>) :: UArray ix e -> UArray ix e -> Bool #

(>=) :: UArray ix e -> UArray ix e -> Bool #

max :: UArray ix e -> UArray ix e -> UArray ix e #

min :: UArray ix e -> UArray ix e -> UArray ix e #

(Ord a, Ord b) => Ord (Either a b) 
Instance details

Defined in Data.Either

Methods

compare :: Either a b -> Either a b -> Ordering #

(<) :: Either a b -> Either a b -> Bool #

(<=) :: Either a b -> Either a b -> Bool #

(>) :: Either a b -> Either a b -> Bool #

(>=) :: Either a b -> Either a b -> Bool #

max :: Either a b -> Either a b -> Either a b #

min :: Either a b -> Either a b -> Either a b #

Ord (Fixed a) 
Instance details

Defined in Data.Fixed

Methods

compare :: Fixed a -> Fixed a -> Ordering #

(<) :: Fixed a -> Fixed a -> Bool #

(<=) :: Fixed a -> Fixed a -> Bool #

(>) :: Fixed a -> Fixed a -> Bool #

(>=) :: Fixed a -> Fixed a -> Bool #

max :: Fixed a -> Fixed a -> Fixed a #

min :: Fixed a -> Fixed a -> Fixed a #

Ord (Proxy s) 
Instance details

Defined in Data.Proxy

Methods

compare :: Proxy s -> Proxy s -> Ordering #

(<) :: Proxy s -> Proxy s -> Bool #

(<=) :: Proxy s -> Proxy s -> Bool #

(>) :: Proxy s -> Proxy s -> Bool #

(>=) :: Proxy s -> Proxy s -> Bool #

max :: Proxy s -> Proxy s -> Proxy s #

min :: Proxy s -> Proxy s -> Proxy s #

Ord a => Ord (Arg a b) 
Instance details

Defined in Data.Semigroup

Methods

compare :: Arg a b -> Arg a b -> Ordering #

(<) :: Arg a b -> Arg a b -> Bool #

(<=) :: Arg a b -> Arg a b -> Bool #

(>) :: Arg a b -> Arg a b -> Bool #

(>=) :: Arg a b -> Arg a b -> Bool #

max :: Arg a b -> Arg a b -> Arg a b #

min :: Arg a b -> Arg a b -> Arg a b #

Ord (TypeRep a) 
Instance details

Defined in Data.Typeable.Internal

Methods

compare :: TypeRep a -> TypeRep a -> Ordering #

(<) :: TypeRep a -> TypeRep a -> Bool #

(<=) :: TypeRep a -> TypeRep a -> Bool #

(>) :: TypeRep a -> TypeRep a -> Bool #

(>=) :: TypeRep a -> TypeRep a -> Bool #

max :: TypeRep a -> TypeRep a -> TypeRep a #

min :: TypeRep a -> TypeRep a -> TypeRep a #

(Ix i, Ord e) => Ord (Array i e) 
Instance details

Defined in GHC.Arr

Methods

compare :: Array i e -> Array i e -> Ordering #

(<) :: Array i e -> Array i e -> Bool #

(<=) :: Array i e -> Array i e -> Bool #

(>) :: Array i e -> Array i e -> Bool #

(>=) :: Array i e -> Array i e -> Bool #

max :: Array i e -> Array i e -> Array i e #

min :: Array i e -> Array i e -> Array i e #

Ord (U1 p) 
Instance details

Defined in GHC.Generics

Methods

compare :: U1 p -> U1 p -> Ordering #

(<) :: U1 p -> U1 p -> Bool #

(<=) :: U1 p -> U1 p -> Bool #

(>) :: U1 p -> U1 p -> Bool #

(>=) :: U1 p -> U1 p -> Bool #

max :: U1 p -> U1 p -> U1 p #

min :: U1 p -> U1 p -> U1 p #

Ord (V1 p) 
Instance details

Defined in GHC.Generics

Methods

compare :: V1 p -> V1 p -> Ordering #

(<) :: V1 p -> V1 p -> Bool #

(<=) :: V1 p -> V1 p -> Bool #

(>) :: V1 p -> V1 p -> Bool #

(>=) :: V1 p -> V1 p -> Bool #

max :: V1 p -> V1 p -> V1 p #

min :: V1 p -> V1 p -> V1 p #

(Ord k, Ord v) => Ord (Map k v) 
Instance details

Defined in Data.Map.Internal

Methods

compare :: Map k v -> Map k v -> Ordering #

(<) :: Map k v -> Map k v -> Bool #

(<=) :: Map k v -> Map k v -> Bool #

(>) :: Map k v -> Map k v -> Bool #

(>=) :: Map k v -> Map k v -> Bool #

max :: Map k v -> Map k v -> Map k v #

min :: Map k v -> Map k v -> Map k v #

Ord ba => Ord (SizedByteArray n ba) 
Instance details

Defined in Data.ByteArray.Sized

Methods

compare :: SizedByteArray n ba -> SizedByteArray n ba -> Ordering #

(<) :: SizedByteArray n ba -> SizedByteArray n ba -> Bool #

(<=) :: SizedByteArray n ba -> SizedByteArray n ba -> Bool #

(>) :: SizedByteArray n ba -> SizedByteArray n ba -> Bool #

(>=) :: SizedByteArray n ba -> SizedByteArray n ba -> Bool #

max :: SizedByteArray n ba -> SizedByteArray n ba -> SizedByteArray n ba #

min :: SizedByteArray n ba -> SizedByteArray n ba -> SizedByteArray n ba #

Ord (Path b t) 
Instance details

Defined in Path.Internal.Posix

Methods

compare :: Path b t -> Path b t -> Ordering #

(<) :: Path b t -> Path b t -> Bool #

(<=) :: Path b t -> Path b t -> Bool #

(>) :: Path b t -> Path b t -> Bool #

(>=) :: Path b t -> Path b t -> Bool #

max :: Path b t -> Path b t -> Path b t #

min :: Path b t -> Path b t -> Path b t #

Ord (Path b t) 
Instance details

Defined in Path.Internal.Windows

Methods

compare :: Path b t -> Path b t -> Ordering #

(<) :: Path b t -> Path b t -> Bool #

(<=) :: Path b t -> Path b t -> Bool #

(>) :: Path b t -> Path b t -> Bool #

(>=) :: Path b t -> Path b t -> Bool #

max :: Path b t -> Path b t -> Path b t #

min :: Path b t -> Path b t -> Path b t #

(Ord k, Ord a) => Ord (MonoidMap k a) Source # 
Instance details

Defined in Data.Monoid.Map

Methods

compare :: MonoidMap k a -> MonoidMap k a -> Ordering #

(<) :: MonoidMap k a -> MonoidMap k a -> Bool #

(<=) :: MonoidMap k a -> MonoidMap k a -> Bool #

(>) :: MonoidMap k a -> MonoidMap k a -> Bool #

(>=) :: MonoidMap k a -> MonoidMap k a -> Bool #

max :: MonoidMap k a -> MonoidMap k a -> MonoidMap k a #

min :: MonoidMap k a -> MonoidMap k a -> MonoidMap k a #

(Ord a, Ord b) => Ord (Either a b) 
Instance details

Defined in Data.Strict.Either

Methods

compare :: Either a b -> Either a b -> Ordering #

(<) :: Either a b -> Either a b -> Bool #

(<=) :: Either a b -> Either a b -> Bool #

(>) :: Either a b -> Either a b -> Bool #

(>=) :: Either a b -> Either a b -> Bool #

max :: Either a b -> Either a b -> Either a b #

min :: Either a b -> Either a b -> Either a b #

(Ord a, Ord b) => Ord (These a b) 
Instance details

Defined in Data.Strict.These

Methods

compare :: These a b -> These a b -> Ordering #

(<) :: These a b -> These a b -> Bool #

(<=) :: These a b -> These a b -> Bool #

(>) :: These a b -> These a b -> Bool #

(>=) :: These a b -> These a b -> Bool #

max :: These a b -> These a b -> These a b #

min :: These a b -> These a b -> These a b #

(Ord a, Ord b) => Ord (Pair a b) 
Instance details

Defined in Data.Strict.Tuple

Methods

compare :: Pair a b -> Pair a b -> Ordering #

(<) :: Pair a b -> Pair a b -> Bool #

(<=) :: Pair a b -> Pair a b -> Bool #

(>) :: Pair a b -> Pair a b -> Bool #

(>=) :: Pair a b -> Pair a b -> Bool #

max :: Pair a b -> Pair a b -> Pair a b #

min :: Pair a b -> Pair a b -> Pair a b #

(Ord a, Ord b) => Ord (These a b) 
Instance details

Defined in Data.These

Methods

compare :: These a b -> These a b -> Ordering #

(<) :: These a b -> These a b -> Bool #

(<=) :: These a b -> These a b -> Bool #

(>) :: These a b -> These a b -> Bool #

(>=) :: These a b -> These a b -> Bool #

max :: These a b -> These a b -> These a b #

min :: These a b -> These a b -> These a b #

(Ord1 f, Ord a) => Ord (Lift f a) 
Instance details

Defined in Control.Applicative.Lift

Methods

compare :: Lift f a -> Lift f a -> Ordering #

(<) :: Lift f a -> Lift f a -> Bool #

(<=) :: Lift f a -> Lift f a -> Bool #

(>) :: Lift f a -> Lift f a -> Bool #

(>=) :: Lift f a -> Lift f a -> Bool #

max :: Lift f a -> Lift f a -> Lift f a #

min :: Lift f a -> Lift f a -> Lift f a #

(Ord1 m, Ord a) => Ord (MaybeT m a) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

compare :: MaybeT m a -> MaybeT m a -> Ordering #

(<) :: MaybeT m a -> MaybeT m a -> Bool #

(<=) :: MaybeT m a -> MaybeT m a -> Bool #

(>) :: MaybeT m a -> MaybeT m a -> Bool #

(>=) :: MaybeT m a -> MaybeT m a -> Bool #

max :: MaybeT m a -> MaybeT m a -> MaybeT m a #

min :: MaybeT m a -> MaybeT m a -> MaybeT m a #

(Ord k, Ord v) => Ord (HashMap k v) 
Instance details

Defined in Data.HashMap.Internal

Methods

compare :: HashMap k v -> HashMap k v -> Ordering #

(<) :: HashMap k v -> HashMap k v -> Bool #

(<=) :: HashMap k v -> HashMap k v -> Bool #

(>) :: HashMap k v -> HashMap k v -> Bool #

(>=) :: HashMap k v -> HashMap k v -> Bool #

max :: HashMap k v -> HashMap k v -> HashMap k v #

min :: HashMap k v -> HashMap k v -> HashMap k v #

(Ord a, Ord b) => Ord (a, b) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b) -> (a, b) -> Ordering #

(<) :: (a, b) -> (a, b) -> Bool #

(<=) :: (a, b) -> (a, b) -> Bool #

(>) :: (a, b) -> (a, b) -> Bool #

(>=) :: (a, b) -> (a, b) -> Bool #

max :: (a, b) -> (a, b) -> (a, b) #

min :: (a, b) -> (a, b) -> (a, b) #

Ord a => Ord (Const a b) 
Instance details

Defined in 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 #

Ord (f a) => Ord (Ap f a) 
Instance details

Defined in Data.Monoid

Methods

compare :: Ap f a -> Ap f a -> Ordering #

(<) :: Ap f a -> Ap f a -> Bool #

(<=) :: Ap f a -> Ap f a -> Bool #

(>) :: Ap f a -> Ap f a -> Bool #

(>=) :: Ap f a -> Ap f a -> Bool #

max :: Ap f a -> Ap f a -> Ap f a #

min :: Ap f a -> Ap f a -> Ap f a #

Ord (f a) => Ord (Alt f a) 
Instance details

Defined in Data.Semigroup.Internal

Methods

compare :: Alt f a -> Alt f a -> Ordering #

(<) :: Alt f a -> Alt f a -> Bool #

(<=) :: Alt f a -> Alt f a -> Bool #

(>) :: Alt f a -> Alt f a -> Bool #

(>=) :: Alt f a -> Alt f a -> Bool #

max :: Alt f a -> Alt f a -> Alt f a #

min :: Alt f a -> Alt f a -> Alt f a #

Ord (Coercion a b) 
Instance details

Defined in Data.Type.Coercion

Methods

compare :: Coercion a b -> Coercion a b -> Ordering #

(<) :: Coercion a b -> Coercion a b -> Bool #

(<=) :: Coercion a b -> Coercion a b -> Bool #

(>) :: Coercion a b -> Coercion a b -> Bool #

(>=) :: Coercion a b -> Coercion a b -> Bool #

max :: Coercion a b -> Coercion a b -> Coercion a b #

min :: Coercion a b -> Coercion a b -> Coercion a b #

Ord (a :~: b) 
Instance details

Defined in Data.Type.Equality

Methods

compare :: (a :~: b) -> (a :~: b) -> Ordering #

(<) :: (a :~: b) -> (a :~: b) -> Bool #

(<=) :: (a :~: b) -> (a :~: b) -> Bool #

(>) :: (a :~: b) -> (a :~: b) -> Bool #

(>=) :: (a :~: b) -> (a :~: b) -> Bool #

max :: (a :~: b) -> (a :~: b) -> a :~: b #

min :: (a :~: b) -> (a :~: b) -> a :~: b #

(Generic1 f, Ord (Rep1 f a)) => Ord (Generically1 f a) 
Instance details

Defined in GHC.Generics

Methods

compare :: Generically1 f a -> Generically1 f a -> Ordering #

(<) :: Generically1 f a -> Generically1 f a -> Bool #

(<=) :: Generically1 f a -> Generically1 f a -> Bool #

(>) :: Generically1 f a -> Generically1 f a -> Bool #

(>=) :: Generically1 f a -> Generically1 f a -> Bool #

max :: Generically1 f a -> Generically1 f a -> Generically1 f a #

min :: Generically1 f a -> Generically1 f a -> Generically1 f a #

Ord (f p) => Ord (Rec1 f p) 
Instance details

Defined in GHC.Generics

Methods

compare :: Rec1 f p -> Rec1 f p -> Ordering #

(<) :: Rec1 f p -> Rec1 f p -> Bool #

(<=) :: Rec1 f p -> Rec1 f p -> Bool #

(>) :: Rec1 f p -> Rec1 f p -> Bool #

(>=) :: Rec1 f p -> Rec1 f p -> Bool #

max :: Rec1 f p -> Rec1 f p -> Rec1 f p #

min :: Rec1 f p -> Rec1 f p -> Rec1 f p #

Ord (URec (Ptr ()) p) 
Instance details

Defined in GHC.Generics

Methods

compare :: URec (Ptr ()) p -> URec (Ptr ()) p -> Ordering #

(<) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool #

(<=) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool #

(>) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool #

(>=) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool #

max :: URec (Ptr ()) p -> URec (Ptr ()) p -> URec (Ptr ()) p #

min :: URec (Ptr ()) p -> URec (Ptr ()) p -> URec (Ptr ()) p #

Ord (URec Char p) 
Instance details

Defined in GHC.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 #

Ord (URec Double p) 
Instance details

Defined in GHC.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 #

Ord (URec Float p) 
Instance details

Defined in GHC.Generics

Methods

compare :: URec Float p -> URec Float p -> Ordering #

(<) :: URec Float p -> URec Float p -> Bool #

(<=) :: URec Float p -> URec Float p -> Bool #

(>) :: URec Float p -> URec Float p -> Bool #

(>=) :: URec Float p -> URec Float p -> Bool #

max :: URec Float p -> URec Float p -> URec Float p #

min :: URec Float p -> URec Float p -> URec Float p #

Ord (URec Int p) 
Instance details

Defined in GHC.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 #

Ord (URec Word p) 
Instance details

Defined in GHC.Generics

Methods

compare :: URec Word p -> URec Word p -> Ordering #

(<) :: URec Word p -> URec Word p -> Bool #

(<=) :: URec Word p -> URec Word p -> Bool #

(>) :: URec Word p -> URec Word p -> Bool #

(>=) :: URec Word p -> URec Word p -> Bool #

max :: URec Word p -> URec Word p -> URec Word p #

min :: URec Word p -> URec Word p -> URec Word p #

Ord b => Ord (Tagged s b) 
Instance details

Defined in Data.Tagged

Methods

compare :: Tagged s b -> Tagged s b -> Ordering #

(<) :: Tagged s b -> Tagged s b -> Bool #

(<=) :: Tagged s b -> Tagged s b -> Bool #

(>) :: Tagged s b -> Tagged s b -> Bool #

(>=) :: Tagged s b -> Tagged s b -> Bool #

max :: Tagged s b -> Tagged s b -> Tagged s b #

min :: Tagged s b -> Tagged s b -> Tagged s b #

(Ord (f a), Ord (g a), Ord a) => Ord (These1 f g a) 
Instance details

Defined in Data.Functor.These

Methods

compare :: These1 f g a -> These1 f g a -> Ordering #

(<) :: These1 f g a -> These1 f g a -> Bool #

(<=) :: These1 f g a -> These1 f g a -> Bool #

(>) :: These1 f g a -> These1 f g a -> Bool #

(>=) :: These1 f g a -> These1 f g a -> Bool #

max :: These1 f g a -> These1 f g a -> These1 f g a #

min :: These1 f g a -> These1 f g a -> These1 f g a #

(Ord1 f, Ord a) => Ord (Backwards f a) 
Instance details

Defined in Control.Applicative.Backwards

Methods

compare :: Backwards f a -> Backwards f a -> Ordering #

(<) :: Backwards f a -> Backwards f a -> Bool #

(<=) :: Backwards f a -> Backwards f a -> Bool #

(>) :: Backwards f a -> Backwards f a -> Bool #

(>=) :: Backwards f a -> Backwards f a -> Bool #

max :: Backwards f a -> Backwards f a -> Backwards f a #

min :: Backwards f a -> Backwards f a -> Backwards f a #

(Ord e, Ord1 m, Ord a) => Ord (ExceptT e m a) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

compare :: ExceptT e m a -> ExceptT e m a -> Ordering #

(<) :: ExceptT e m a -> ExceptT e m a -> Bool #

(<=) :: ExceptT e m a -> ExceptT e m a -> Bool #

(>) :: ExceptT e m a -> ExceptT e m a -> Bool #

(>=) :: ExceptT e m a -> ExceptT e m a -> Bool #

max :: ExceptT e m a -> ExceptT e m a -> ExceptT e m a #

min :: ExceptT e m a -> ExceptT e m a -> ExceptT e m a #

(Ord1 f, Ord a) => Ord (IdentityT f a) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

compare :: IdentityT f a -> IdentityT f a -> Ordering #

(<) :: IdentityT f a -> IdentityT f a -> Bool #

(<=) :: IdentityT f a -> IdentityT f a -> Bool #

(>) :: IdentityT f a -> IdentityT f a -> Bool #

(>=) :: IdentityT f a -> IdentityT f a -> Bool #

max :: IdentityT f a -> IdentityT f a -> IdentityT f a #

min :: IdentityT f a -> IdentityT f a -> IdentityT f a #

(Ord w, Ord1 m, Ord a) => Ord (WriterT w m a) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

compare :: WriterT w m a -> WriterT w m a -> Ordering #

(<) :: WriterT w m a -> WriterT w m a -> Bool #

(<=) :: WriterT w m a -> WriterT w m a -> Bool #

(>) :: WriterT w m a -> WriterT w m a -> Bool #

(>=) :: WriterT w m a -> WriterT w m a -> Bool #

max :: WriterT w m a -> WriterT w m a -> WriterT w m a #

min :: WriterT w m a -> WriterT w m a -> WriterT w m a #

(Ord w, Ord1 m, Ord a) => Ord (WriterT w m a) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

compare :: WriterT w m a -> WriterT w m a -> Ordering #

(<) :: WriterT w m a -> WriterT w m a -> Bool #

(<=) :: WriterT w m a -> WriterT w m a -> Bool #

(>) :: WriterT w m a -> WriterT w m a -> Bool #

(>=) :: WriterT w m a -> WriterT w m a -> Bool #

max :: WriterT w m a -> WriterT w m a -> WriterT w m a #

min :: WriterT w m a -> WriterT w m a -> WriterT w m a #

Ord a => Ord (Constant a b) 
Instance details

Defined in Data.Functor.Constant

Methods

compare :: Constant a b -> Constant a b -> Ordering #

(<) :: Constant a b -> Constant a b -> Bool #

(<=) :: Constant a b -> Constant a b -> Bool #

(>) :: Constant a b -> Constant a b -> Bool #

(>=) :: Constant a b -> Constant a b -> Bool #

max :: Constant a b -> Constant a b -> Constant a b #

min :: Constant a b -> Constant a b -> Constant a b #

(Ord1 f, Ord a) => Ord (Reverse f a) 
Instance details

Defined in Data.Functor.Reverse

Methods

compare :: Reverse f a -> Reverse f a -> Ordering #

(<) :: Reverse f a -> Reverse f a -> Bool #

(<=) :: Reverse f a -> Reverse f a -> Bool #

(>) :: Reverse f a -> Reverse f a -> Bool #

(>=) :: Reverse f a -> Reverse f a -> Bool #

max :: Reverse f a -> Reverse f a -> Reverse f a #

min :: Reverse f a -> Reverse f a -> Reverse f a #

(Ord a, Ord b, Ord c) => Ord (a, b, c) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c) -> (a, b, c) -> Ordering #

(<) :: (a, b, c) -> (a, b, c) -> Bool #

(<=) :: (a, b, c) -> (a, b, c) -> Bool #

(>) :: (a, b, c) -> (a, b, c) -> Bool #

(>=) :: (a, b, c) -> (a, b, c) -> Bool #

max :: (a, b, c) -> (a, b, c) -> (a, b, c) #

min :: (a, b, c) -> (a, b, c) -> (a, b, c) #

(Ord (f a), Ord (g a)) => Ord (Product f g a) 
Instance details

Defined in Data.Functor.Product

Methods

compare :: Product f g a -> Product f g a -> Ordering #

(<) :: Product f g a -> Product f g a -> Bool #

(<=) :: Product f g a -> Product f g a -> Bool #

(>) :: Product f g a -> Product f g a -> Bool #

(>=) :: Product f g a -> Product f g a -> Bool #

max :: Product f g a -> Product f g a -> Product f g a #

min :: Product f g a -> Product f g a -> Product f g a #

(Ord (f a), Ord (g a)) => Ord (Sum f g a) 
Instance details

Defined in Data.Functor.Sum

Methods

compare :: Sum f g a -> Sum f g a -> Ordering #

(<) :: Sum f g a -> Sum f g a -> Bool #

(<=) :: Sum f g a -> Sum f g a -> Bool #

(>) :: Sum f g a -> Sum f g a -> Bool #

(>=) :: Sum f g a -> Sum f g a -> Bool #

max :: Sum f g a -> Sum f g a -> Sum f g a #

min :: Sum f g a -> Sum f g a -> Sum f g a #

Ord (a :~~: b) 
Instance details

Defined in Data.Type.Equality

Methods

compare :: (a :~~: b) -> (a :~~: b) -> Ordering #

(<) :: (a :~~: b) -> (a :~~: b) -> Bool #

(<=) :: (a :~~: b) -> (a :~~: b) -> Bool #

(>) :: (a :~~: b) -> (a :~~: b) -> Bool #

(>=) :: (a :~~: b) -> (a :~~: b) -> Bool #

max :: (a :~~: b) -> (a :~~: b) -> a :~~: b #

min :: (a :~~: b) -> (a :~~: b) -> a :~~: b #

(Ord (f p), Ord (g p)) => Ord ((f :*: g) p) 
Instance details

Defined in GHC.Generics

Methods

compare :: (f :*: g) p -> (f :*: g) p -> Ordering #

(<) :: (f :*: g) p -> (f :*: g) p -> Bool #

(<=) :: (f :*: g) p -> (f :*: g) p -> Bool #

(>) :: (f :*: g) p -> (f :*: g) p -> Bool #

(>=) :: (f :*: g) p -> (f :*: g) p -> Bool #

max :: (f :*: g) p -> (f :*: g) p -> (f :*: g) p #

min :: (f :*: g) p -> (f :*: g) p -> (f :*: g) p #

(Ord (f p), Ord (g p)) => Ord ((f :+: g) p) 
Instance details

Defined in GHC.Generics

Methods

compare :: (f :+: g) p -> (f :+: g) p -> Ordering #

(<) :: (f :+: g) p -> (f :+: g) p -> Bool #

(<=) :: (f :+: g) p -> (f :+: g) p -> Bool #

(>) :: (f :+: g) p -> (f :+: g) p -> Bool #

(>=) :: (f :+: g) p -> (f :+: g) p -> Bool #

max :: (f :+: g) p -> (f :+: g) p -> (f :+: g) p #

min :: (f :+: g) p -> (f :+: g) p -> (f :+: g) p #

Ord c => Ord (K1 i c p) 
Instance details

Defined in GHC.Generics

Methods

compare :: K1 i c p -> K1 i c p -> Ordering #

(<) :: K1 i c p -> K1 i c p -> Bool #

(<=) :: K1 i c p -> K1 i c p -> Bool #

(>) :: K1 i c p -> K1 i c p -> Bool #

(>=) :: K1 i c p -> K1 i c p -> Bool #

max :: K1 i c p -> K1 i c p -> K1 i c p #

min :: K1 i c p -> K1 i c p -> K1 i c p #

(Ord a, Ord b, Ord c, Ord d) => Ord (a, b, c, d) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d) -> (a, b, c, d) -> Ordering #

(<) :: (a, b, c, d) -> (a, b, c, d) -> Bool #

(<=) :: (a, b, c, d) -> (a, b, c, d) -> Bool #

(>) :: (a, b, c, d) -> (a, b, c, d) -> Bool #

(>=) :: (a, b, c, d) -> (a, b, c, d) -> Bool #

max :: (a, b, c, d) -> (a, b, c, d) -> (a, b, c, d) #

min :: (a, b, c, d) -> (a, b, c, d) -> (a, b, c, d) #

Ord (f (g a)) => Ord (Compose f g a) 
Instance details

Defined in Data.Functor.Compose

Methods

compare :: Compose f g a -> Compose f g a -> Ordering #

(<) :: Compose f g a -> Compose f g a -> Bool #

(<=) :: Compose f g a -> Compose f g a -> Bool #

(>) :: Compose f g a -> Compose f g a -> Bool #

(>=) :: Compose f g a -> Compose f g a -> Bool #

max :: Compose f g a -> Compose f g a -> Compose f g a #

min :: Compose f g a -> Compose f g a -> Compose f g a #

Ord (f (g p)) => Ord ((f :.: g) p) 
Instance details

Defined in GHC.Generics

Methods

compare :: (f :.: g) p -> (f :.: g) p -> Ordering #

(<) :: (f :.: g) p -> (f :.: g) p -> Bool #

(<=) :: (f :.: g) p -> (f :.: g) p -> Bool #

(>) :: (f :.: g) p -> (f :.: g) p -> Bool #

(>=) :: (f :.: g) p -> (f :.: g) p -> Bool #

max :: (f :.: g) p -> (f :.: g) p -> (f :.: g) p #

min :: (f :.: g) p -> (f :.: g) p -> (f :.: g) p #

Ord (f p) => Ord (M1 i c f p) 
Instance details

Defined in GHC.Generics

Methods

compare :: M1 i c f p -> M1 i c f p -> Ordering #

(<) :: M1 i c f p -> M1 i c f p -> Bool #

(<=) :: M1 i c f p -> M1 i c f p -> Bool #

(>) :: M1 i c f p -> M1 i c f p -> Bool #

(>=) :: M1 i c f p -> M1 i c f p -> Bool #

max :: M1 i c f p -> M1 i c f p -> M1 i c f p #

min :: M1 i c f p -> M1 i c f p -> M1 i c f p #

(Ord a, Ord b, Ord c, Ord d, Ord e) => Ord (a, b, c, d, e) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d, e) -> (a, b, c, d, e) -> Ordering #

(<) :: (a, b, c, d, e) -> (a, b, c, d, e) -> Bool #

(<=) :: (a, b, c, d, e) -> (a, b, c, d, e) -> Bool #

(>) :: (a, b, c, d, e) -> (a, b, c, d, e) -> Bool #

(>=) :: (a, b, c, d, e) -> (a, b, c, d, e) -> Bool #

max :: (a, b, c, d, e) -> (a, b, c, d, e) -> (a, b, c, d, e) #

min :: (a, b, c, d, e) -> (a, b, c, d, e) -> (a, b, c, d, e) #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f) => Ord (a, b, c, d, e, f) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> Ordering #

(<) :: (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 #

(>) :: (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 #

max :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> (a, b, c, d, e, f) #

min :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> (a, b, c, d, e, f) #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g) => Ord (a, b, c, d, e, f, g) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> Ordering #

(<) :: (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 #

(>) :: (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 #

max :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) #

min :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h) => Ord (a, b, c, d, e, f, g, h) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> Ordering #

(<) :: (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 #

(>) :: (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 #

max :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) #

min :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i) => Ord (a, b, c, d, e, f, g, h, i) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> Ordering #

(<) :: (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 #

(>) :: (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 #

max :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) #

min :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j) => Ord (a, b, c, d, e, f, g, h, i, j) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> Ordering #

(<) :: (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 #

(>) :: (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 #

max :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) #

min :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j, Ord k) => Ord (a, b, c, d, e, f, g, h, i, j, k) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> Ordering #

(<) :: (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 #

(>) :: (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 #

max :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) #

min :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j, Ord k, Ord l) => Ord (a, b, c, d, e, f, g, h, i, j, k, l) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> Ordering #

(<) :: (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 #

(>) :: (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 #

max :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) #

min :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j, Ord k, Ord l, Ord m) => Ord (a, b, c, d, e, f, g, h, i, j, k, l, m) 
Instance details

Defined in GHC.Classes

Methods

compare :: (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) -> Ordering #

(<) :: (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 #

(>) :: (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 #

max :: (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) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) #

min :: (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) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j, Ord k, Ord l, Ord m, Ord n) => Ord (a, b, c, d, e, f, g, h, i, j, k, l, m, n) 
Instance details

Defined in GHC.Classes

Methods

compare :: (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) -> Ordering #

(<) :: (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 #

(>) :: (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 #

max :: (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) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) #

min :: (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) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) #

(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j, Ord k, Ord l, Ord m, Ord n, Ord o) => Ord (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) 
Instance details

Defined in GHC.Classes

Methods

compare :: (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) -> Ordering #

(<) :: (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 #

(>) :: (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 :: (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) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) #

min :: (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) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) #

data SHA256 #

Instances

Instances details
FromJSON SHA256 
Instance details

Defined in Pantry.SHA256

ToJSON SHA256 
Instance details

Defined in Pantry.SHA256

Methods

toJSON :: SHA256 -> Value

toEncoding :: SHA256 -> Encoding

toJSONList :: [SHA256] -> Value

toEncodingList :: [SHA256] -> Encoding

omitField :: SHA256 -> Bool

Data SHA256 
Instance details

Defined in Pantry.SHA256

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SHA256 -> c SHA256 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SHA256 #

toConstr :: SHA256 -> Constr #

dataTypeOf :: SHA256 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SHA256) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SHA256) #

gmapT :: (forall b. Data b => b -> b) -> SHA256 -> SHA256 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SHA256 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SHA256 -> r #

gmapQ :: (forall d. Data d => d -> u) -> SHA256 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SHA256 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SHA256 -> m SHA256 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA256 -> m SHA256 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SHA256 -> m SHA256 #

Generic SHA256 
Instance details

Defined in Pantry.SHA256

Associated Types

type Rep SHA256 
Instance details

Defined in Pantry.SHA256

type Rep SHA256 = D1 ('MetaData "SHA256" "Pantry.SHA256" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'True) (C1 ('MetaCons "SHA256" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bytes32)))

Methods

from :: SHA256 -> Rep SHA256 x

to :: Rep SHA256 x -> SHA256

Show SHA256 
Instance details

Defined in Pantry.SHA256

Methods

showsPrec :: Int -> SHA256 -> ShowS

show :: SHA256 -> String #

showList :: [SHA256] -> ShowS

NFData SHA256 
Instance details

Defined in Pantry.SHA256

Methods

rnf :: SHA256 -> () #

Eq SHA256 
Instance details

Defined in Pantry.SHA256

Methods

(==) :: SHA256 -> SHA256 -> Bool #

(/=) :: SHA256 -> SHA256 -> Bool #

Ord SHA256 
Instance details

Defined in Pantry.SHA256

Hashable SHA256 
Instance details

Defined in Pantry.SHA256

Methods

hashWithSalt :: Int -> SHA256 -> Int

hash :: SHA256 -> Int

PersistField SHA256 
Instance details

Defined in Pantry.SHA256

Methods

toPersistValue :: SHA256 -> PersistValue

fromPersistValue :: PersistValue -> Either Text SHA256

PersistFieldSql SHA256 
Instance details

Defined in Pantry.SHA256

Methods

sqlType :: Proxy SHA256 -> SqlType

Display SHA256 
Instance details

Defined in Pantry.SHA256

SymbolToField "sha" ArchiveCache SHA256 
Instance details

Defined in Pantry.Storage

Methods

symbolToField :: EntityField ArchiveCache SHA256

SymbolToField "sha" Blob SHA256 
Instance details

Defined in Pantry.Storage

SymbolToField "sha" CacheUpdate SHA256 
Instance details

Defined in Pantry.Storage

Methods

symbolToField :: EntityField CacheUpdate SHA256

SymbolToField "sha" HackageTarball SHA256 
Instance details

Defined in Pantry.Storage

Methods

symbolToField :: EntityField HackageTarball SHA256

SymbolToField "sha" SnapshotCache SHA256 
Instance details

Defined in Pantry.Storage

Methods

symbolToField :: EntityField SnapshotCache SHA256

type Rep SHA256 
Instance details

Defined in Pantry.SHA256

type Rep SHA256 = D1 ('MetaData "SHA256" "Pantry.SHA256" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'True) (C1 ('MetaCons "SHA256" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bytes32)))

data PackageIdentifier #

Instances

Instances details
Package PackageIdentifier 
Instance details

Defined in Distribution.Package

Parsec PackageIdentifier 
Instance details

Defined in Distribution.Types.PackageId

Methods

parsec :: CabalParsing m => m PackageIdentifier

Pretty PackageIdentifier 
Instance details

Defined in Distribution.Types.PackageId

Methods

pretty :: PackageIdentifier -> Doc

prettyVersioned :: CabalSpecVersion -> PackageIdentifier -> Doc

Structured PackageIdentifier 
Instance details

Defined in Distribution.Types.PackageId

Data PackageIdentifier 
Instance details

Defined in Distribution.Types.PackageId

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PackageIdentifier -> c PackageIdentifier #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PackageIdentifier #

toConstr :: PackageIdentifier -> Constr #

dataTypeOf :: PackageIdentifier -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PackageIdentifier) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PackageIdentifier) #

gmapT :: (forall b. Data b => b -> b) -> PackageIdentifier -> PackageIdentifier #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PackageIdentifier -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PackageIdentifier -> r #

gmapQ :: (forall d. Data d => d -> u) -> PackageIdentifier -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PackageIdentifier -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PackageIdentifier -> m PackageIdentifier #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PackageIdentifier -> m PackageIdentifier #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PackageIdentifier -> m PackageIdentifier #

Generic PackageIdentifier 
Instance details

Defined in Distribution.Types.PackageId

Associated Types

type Rep PackageIdentifier 
Instance details

Defined in Distribution.Types.PackageId

type Rep PackageIdentifier = D1 ('MetaData "PackageIdentifier" "Distribution.Types.PackageId" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "PackageIdentifier" 'PrefixI 'True) (S1 ('MetaSel ('Just "pkgName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PackageName) :*: S1 ('MetaSel ('Just "pkgVersion") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Version)))
Read PackageIdentifier 
Instance details

Defined in Distribution.Types.PackageId

Show PackageIdentifier 
Instance details

Defined in Distribution.Types.PackageId

Binary PackageIdentifier 
Instance details

Defined in Distribution.Types.PackageId

NFData PackageIdentifier 
Instance details

Defined in Distribution.Types.PackageId

Methods

rnf :: PackageIdentifier -> () #

Eq PackageIdentifier 
Instance details

Defined in Distribution.Types.PackageId

Ord PackageIdentifier 
Instance details

Defined in Distribution.Types.PackageId

IsCabalString PackageIdentifier 
Instance details

Defined in Pantry.Types

type Rep PackageIdentifier 
Instance details

Defined in Distribution.Types.PackageId

type Rep PackageIdentifier = D1 ('MetaData "PackageIdentifier" "Distribution.Types.PackageId" "Cabal-syntax-3.10.3.0-4da5" 'False) (C1 ('MetaCons "PackageIdentifier" 'PrefixI 'True) (S1 ('MetaSel ('Just "pkgName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PackageName) :*: S1 ('MetaSel ('Just "pkgVersion") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Version)))

data PackageName #

Instances

Instances details
Parsec PackageName 
Instance details

Defined in Distribution.Types.PackageName

Methods

parsec :: CabalParsing m => m PackageName

Pretty PackageName 
Instance details

Defined in Distribution.Types.PackageName

Methods

pretty :: PackageName -> Doc

prettyVersioned :: CabalSpecVersion -> PackageName -> Doc

Structured PackageName 
Instance details

Defined in Distribution.Types.PackageName

Methods

structure :: Proxy PackageName -> Structure

structureHash' :: Tagged PackageName MD5

Data PackageName 
Instance details

Defined in Distribution.Types.PackageName

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PackageName -> c PackageName #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PackageName #

toConstr :: PackageName -> Constr #

dataTypeOf :: PackageName -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PackageName) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PackageName) #

gmapT :: (forall b. Data b => b -> b) -> PackageName -> PackageName #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PackageName -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PackageName -> r #

gmapQ :: (forall d. Data d => d -> u) -> PackageName -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PackageName -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PackageName -> m PackageName #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PackageName -> m PackageName #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PackageName -> m PackageName #

IsString PackageName 
Instance details

Defined in Distribution.Types.PackageName

Generic PackageName 
Instance details

Defined in Distribution.Types.PackageName

Associated Types

type Rep PackageName 
Instance details

Defined in Distribution.Types.PackageName

type Rep PackageName = D1 ('MetaData "PackageName" "Distribution.Types.PackageName" "Cabal-syntax-3.10.3.0-4da5" 'True) (C1 ('MetaCons "PackageName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ShortText)))

Methods

from :: PackageName -> Rep PackageName x

to :: Rep PackageName x -> PackageName

Read PackageName 
Instance details

Defined in Distribution.Types.PackageName

Methods

readsPrec :: Int -> ReadS PackageName

readList :: ReadS [PackageName]

readPrec :: ReadPrec PackageName

readListPrec :: ReadPrec [PackageName]

Show PackageName 
Instance details

Defined in Distribution.Types.PackageName

Methods

showsPrec :: Int -> PackageName -> ShowS

show :: PackageName -> String #

showList :: [PackageName] -> ShowS

Binary PackageName 
Instance details

Defined in Distribution.Types.PackageName

Methods

put :: PackageName -> Put

get :: Get PackageName

putList :: [PackageName] -> Put

NFData PackageName 
Instance details

Defined in Distribution.Types.PackageName

Methods

rnf :: PackageName -> () #

Eq PackageName 
Instance details

Defined in Distribution.Types.PackageName

Ord PackageName 
Instance details

Defined in Distribution.Types.PackageName

IsCabalString PackageName 
Instance details

Defined in Pantry.Types

type Rep PackageName 
Instance details

Defined in Distribution.Types.PackageName

type Rep PackageName = D1 ('MetaData "PackageName" "Distribution.Types.PackageName" "Cabal-syntax-3.10.3.0-4da5" 'True) (C1 ('MetaCons "PackageName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ShortText)))

data GlobalHintsLocation #

Instances

Instances details
ToJSON GlobalHintsLocation 
Instance details

Defined in Pantry.Types

Generic GlobalHintsLocation 
Instance details

Defined in Pantry.Types

Associated Types

type Rep GlobalHintsLocation 
Instance details

Defined in Pantry.Types

type Rep GlobalHintsLocation = D1 ('MetaData "GlobalHintsLocation" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "GHLUrl" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text)) :+: C1 ('MetaCons "GHLFilePath" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (ResolvedPath File))))
Show GlobalHintsLocation 
Instance details

Defined in Pantry.Types

NFData GlobalHintsLocation 
Instance details

Defined in Pantry.Types

Methods

rnf :: GlobalHintsLocation -> () #

Eq GlobalHintsLocation 
Instance details

Defined in Pantry.Types

Ord GlobalHintsLocation 
Instance details

Defined in Pantry.Types

Display GlobalHintsLocation 
Instance details

Defined in Pantry.Types

Pretty GlobalHintsLocation 
Instance details

Defined in Pantry.Types

FromJSON (WithJSONWarnings (Unresolved GlobalHintsLocation)) 
Instance details

Defined in Pantry.Types

type Rep GlobalHintsLocation 
Instance details

Defined in Pantry.Types

type Rep GlobalHintsLocation = D1 ('MetaData "GlobalHintsLocation" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "GHLUrl" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text)) :+: C1 ('MetaCons "GHLFilePath" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (ResolvedPath File))))

newtype SnapshotCacheHash #

Instances

Instances details
Show SnapshotCacheHash 
Instance details

Defined in Pantry.Types

data SnapshotLayer #

Instances

Instances details
ToJSON SnapshotLayer 
Instance details

Defined in Pantry.Types

Generic SnapshotLayer 
Instance details

Defined in Pantry.Types

Associated Types

type Rep SnapshotLayer 
Instance details

Defined in Pantry.Types

type Rep SnapshotLayer = D1 ('MetaData "SnapshotLayer" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "SnapshotLayer" 'PrefixI 'True) (((S1 ('MetaSel ('Just "slParent") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SnapshotLocation) :*: S1 ('MetaSel ('Just "slCompiler") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe WantedCompiler))) :*: (S1 ('MetaSel ('Just "slLocations") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 [PackageLocationImmutable]) :*: S1 ('MetaSel ('Just "slDropPackages") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Set PackageName)))) :*: ((S1 ('MetaSel ('Just "slFlags") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Map PackageName (Map FlagName Bool))) :*: S1 ('MetaSel ('Just "slHidden") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Map PackageName Bool))) :*: (S1 ('MetaSel ('Just "slGhcOptions") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Map PackageName [Text])) :*: S1 ('MetaSel ('Just "slPublishTime") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe UTCTime))))))
Show SnapshotLayer 
Instance details

Defined in Pantry.Types

Methods

showsPrec :: Int -> SnapshotLayer -> ShowS

show :: SnapshotLayer -> String #

showList :: [SnapshotLayer] -> ShowS

Eq SnapshotLayer 
Instance details

Defined in Pantry.Types

type Rep SnapshotLayer 
Instance details

Defined in Pantry.Types

type Rep SnapshotLayer = D1 ('MetaData "SnapshotLayer" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "SnapshotLayer" 'PrefixI 'True) (((S1 ('MetaSel ('Just "slParent") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SnapshotLocation) :*: S1 ('MetaSel ('Just "slCompiler") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe WantedCompiler))) :*: (S1 ('MetaSel ('Just "slLocations") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 [PackageLocationImmutable]) :*: S1 ('MetaSel ('Just "slDropPackages") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Set PackageName)))) :*: ((S1 ('MetaSel ('Just "slFlags") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Map PackageName (Map FlagName Bool))) :*: S1 ('MetaSel ('Just "slHidden") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Map PackageName Bool))) :*: (S1 ('MetaSel ('Just "slGhcOptions") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Map PackageName [Text])) :*: S1 ('MetaSel ('Just "slPublishTime") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe UTCTime))))))

data RawSnapshotLayer #

Instances

Instances details
ToJSON RawSnapshotLayer 
Instance details

Defined in Pantry.Types

Generic RawSnapshotLayer 
Instance details

Defined in Pantry.Types

Associated Types

type Rep RawSnapshotLayer 
Instance details

Defined in Pantry.Types

type Rep RawSnapshotLayer = D1 ('MetaData "RawSnapshotLayer" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "RawSnapshotLayer" 'PrefixI 'True) (((S1 ('MetaSel ('Just "rslParent") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 RawSnapshotLocation) :*: S1 ('MetaSel ('Just "rslCompiler") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe WantedCompiler))) :*: (S1 ('MetaSel ('Just "rslLocations") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 [RawPackageLocationImmutable]) :*: S1 ('MetaSel ('Just "rslDropPackages") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Set PackageName)))) :*: ((S1 ('MetaSel ('Just "rslFlags") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Map PackageName (Map FlagName Bool))) :*: S1 ('MetaSel ('Just "rslHidden") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Map PackageName Bool))) :*: (S1 ('MetaSel ('Just "rslGhcOptions") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Map PackageName [Text])) :*: S1 ('MetaSel ('Just "rslPublishTime") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe UTCTime))))))
Show RawSnapshotLayer 
Instance details

Defined in Pantry.Types

NFData RawSnapshotLayer 
Instance details

Defined in Pantry.Types

Methods

rnf :: RawSnapshotLayer -> () #

Eq RawSnapshotLayer 
Instance details

Defined in Pantry.Types

FromJSON (WithJSONWarnings (Unresolved RawSnapshotLayer)) 
Instance details

Defined in Pantry.Types

type Rep RawSnapshotLayer 
Instance details

Defined in Pantry.Types

type Rep RawSnapshotLayer = D1 ('MetaData "RawSnapshotLayer" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "RawSnapshotLayer" 'PrefixI 'True) (((S1 ('MetaSel ('Just "rslParent") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 RawSnapshotLocation) :*: S1 ('MetaSel ('Just "rslCompiler") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe WantedCompiler))) :*: (S1 ('MetaSel ('Just "rslLocations") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 [RawPackageLocationImmutable]) :*: S1 ('MetaSel ('Just "rslDropPackages") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Set PackageName)))) :*: ((S1 ('MetaSel ('Just "rslFlags") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Map PackageName (Map FlagName Bool))) :*: S1 ('MetaSel ('Just "rslHidden") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Map PackageName Bool))) :*: (S1 ('MetaSel ('Just "rslGhcOptions") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Map PackageName [Text])) :*: S1 ('MetaSel ('Just "rslPublishTime") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe UTCTime))))))

data SnapshotPackage #

Instances

Instances details
Show SnapshotPackage 
Instance details

Defined in Pantry.Types

data SnapshotLocation #

Instances

Instances details
ToJSON SnapshotLocation 
Instance details

Defined in Pantry.Types

Generic SnapshotLocation 
Instance details

Defined in Pantry.Types

Associated Types

type Rep SnapshotLocation 
Instance details

Defined in Pantry.Types

type Rep SnapshotLocation = D1 ('MetaData "SnapshotLocation" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "SLCompiler" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 WantedCompiler)) :+: (C1 ('MetaCons "SLUrl" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 BlobKey)) :+: C1 ('MetaCons "SLFilePath" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (ResolvedPath File)))))
Show SnapshotLocation 
Instance details

Defined in Pantry.Types

NFData SnapshotLocation 
Instance details

Defined in Pantry.Types

Methods

rnf :: SnapshotLocation -> () #

Eq SnapshotLocation 
Instance details

Defined in Pantry.Types

Ord SnapshotLocation 
Instance details

Defined in Pantry.Types

Display SnapshotLocation 
Instance details

Defined in Pantry.Types

FromJSON (WithJSONWarnings (Unresolved SnapshotLocation)) 
Instance details

Defined in Pantry.Types

type Rep SnapshotLocation 
Instance details

Defined in Pantry.Types

type Rep SnapshotLocation = D1 ('MetaData "SnapshotLocation" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "SLCompiler" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 WantedCompiler)) :+: (C1 ('MetaCons "SLUrl" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 BlobKey)) :+: C1 ('MetaCons "SLFilePath" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (ResolvedPath File)))))

data RawSnapshotLocation #

Instances

Instances details
ToJSON RawSnapshotLocation 
Instance details

Defined in Pantry.Types

Generic RawSnapshotLocation 
Instance details

Defined in Pantry.Types

Associated Types

type Rep RawSnapshotLocation 
Instance details

Defined in Pantry.Types

type Rep RawSnapshotLocation = D1 ('MetaData "RawSnapshotLocation" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) ((C1 ('MetaCons "RSLCompiler" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 WantedCompiler)) :+: C1 ('MetaCons "RSLUrl" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe BlobKey)))) :+: (C1 ('MetaCons "RSLFilePath" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (ResolvedPath File))) :+: C1 ('MetaCons "RSLSynonym" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SnapName))))
Show RawSnapshotLocation 
Instance details

Defined in Pantry.Types

NFData RawSnapshotLocation 
Instance details

Defined in Pantry.Types

Methods

rnf :: RawSnapshotLocation -> () #

Eq RawSnapshotLocation 
Instance details

Defined in Pantry.Types

Ord RawSnapshotLocation 
Instance details

Defined in Pantry.Types

Display RawSnapshotLocation 
Instance details

Defined in Pantry.Types

Pretty RawSnapshotLocation 
Instance details

Defined in Pantry.Types

FromJSON (WithJSONWarnings (Unresolved RawSnapshotLocation)) 
Instance details

Defined in Pantry.Types

type Rep RawSnapshotLocation 
Instance details

Defined in Pantry.Types

type Rep RawSnapshotLocation = D1 ('MetaData "RawSnapshotLocation" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) ((C1 ('MetaCons "RSLCompiler" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 WantedCompiler)) :+: C1 ('MetaCons "RSLUrl" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe BlobKey)))) :+: (C1 ('MetaCons "RSLFilePath" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (ResolvedPath File))) :+: C1 ('MetaCons "RSLSynonym" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SnapName))))

data SnapName #

Constructors

LTS !Int !Int 
Nightly !Day 

Instances

Instances details
ToJSON SnapName 
Instance details

Defined in Pantry.Types

Generic SnapName 
Instance details

Defined in Pantry.Types

Associated Types

type Rep SnapName 
Instance details

Defined in Pantry.Types

type Rep SnapName = D1 ('MetaData "SnapName" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "LTS" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Int) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Int)) :+: C1 ('MetaCons "Nightly" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Day)))

Methods

from :: SnapName -> Rep SnapName x

to :: Rep SnapName x -> SnapName

Show SnapName 
Instance details

Defined in Pantry.Types

Methods

showsPrec :: Int -> SnapName -> ShowS

show :: SnapName -> String #

showList :: [SnapName] -> ShowS

NFData SnapName 
Instance details

Defined in Pantry.Types

Methods

rnf :: SnapName -> () #

Eq SnapName 
Instance details

Defined in Pantry.Types

Ord SnapName 
Instance details

Defined in Pantry.Types

Display SnapName 
Instance details

Defined in Pantry.Types

type Rep SnapName 
Instance details

Defined in Pantry.Types

type Rep SnapName = D1 ('MetaData "SnapName" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "LTS" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Int) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Int)) :+: C1 ('MetaCons "Nightly" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Day)))

data WantedCompiler #

Instances

Instances details
FromJSON WantedCompiler 
Instance details

Defined in Pantry.Types

FromJSONKey WantedCompiler 
Instance details

Defined in Pantry.Types

Methods

fromJSONKey :: FromJSONKeyFunction WantedCompiler

fromJSONKeyList :: FromJSONKeyFunction [WantedCompiler]

ToJSON WantedCompiler 
Instance details

Defined in Pantry.Types

Generic WantedCompiler 
Instance details

Defined in Pantry.Types

Associated Types

type Rep WantedCompiler 
Instance details

Defined in Pantry.Types

type Rep WantedCompiler = D1 ('MetaData "WantedCompiler" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "WCGhc" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Version)) :+: (C1 ('MetaCons "WCGhcGit" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text)) :+: C1 ('MetaCons "WCGhcjs" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Version) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Version))))
Show WantedCompiler 
Instance details

Defined in Pantry.Types

NFData WantedCompiler 
Instance details

Defined in Pantry.Types

Methods

rnf :: WantedCompiler -> () #

Eq WantedCompiler 
Instance details

Defined in Pantry.Types

Ord WantedCompiler 
Instance details

Defined in Pantry.Types

Display WantedCompiler 
Instance details

Defined in Pantry.Types

type Rep WantedCompiler 
Instance details

Defined in Pantry.Types

type Rep WantedCompiler = D1 ('MetaData "WantedCompiler" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "WCGhc" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Version)) :+: (C1 ('MetaCons "WCGhcGit" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text)) :+: C1 ('MetaCons "WCGhcjs" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Version) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Version))))

newtype CabalString a #

Constructors

CabalString 

Fields

Instances

Instances details
IsCabalString a => FromJSON (CabalString a) 
Instance details

Defined in Pantry.Types

IsCabalString a => FromJSONKey (CabalString a) 
Instance details

Defined in Pantry.Types

Methods

fromJSONKey :: FromJSONKeyFunction (CabalString a)

fromJSONKeyList :: FromJSONKeyFunction [CabalString a]

Pretty a => ToJSON (CabalString a) 
Instance details

Defined in Pantry.Types

Pretty a => ToJSONKey (CabalString a) 
Instance details

Defined in Pantry.Types

Methods

toJSONKey :: ToJSONKeyFunction (CabalString a)

toJSONKeyList :: ToJSONKeyFunction [CabalString a]

Show a => Show (CabalString a) 
Instance details

Defined in Pantry.Types

Methods

showsPrec :: Int -> CabalString a -> ShowS

show :: CabalString a -> String #

showList :: [CabalString a] -> ShowS

Eq a => Eq (CabalString a) 
Instance details

Defined in Pantry.Types

Ord a => Ord (CabalString a) 
Instance details

Defined in Pantry.Types

data ArchiveLocation #

Instances

Instances details
Generic ArchiveLocation 
Instance details

Defined in Pantry.Types

Associated Types

type Rep ArchiveLocation 
Instance details

Defined in Pantry.Types

type Rep ArchiveLocation = D1 ('MetaData "ArchiveLocation" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "ALUrl" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text)) :+: C1 ('MetaCons "ALFilePath" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (ResolvedPath File))))
Show ArchiveLocation 
Instance details

Defined in Pantry.Types

NFData ArchiveLocation 
Instance details

Defined in Pantry.Types

Methods

rnf :: ArchiveLocation -> () #

Eq ArchiveLocation 
Instance details

Defined in Pantry.Types

Ord ArchiveLocation 
Instance details

Defined in Pantry.Types

Display ArchiveLocation 
Instance details

Defined in Pantry.Types

Pretty ArchiveLocation 
Instance details

Defined in Pantry.Types

type Rep ArchiveLocation 
Instance details

Defined in Pantry.Types

type Rep ArchiveLocation = D1 ('MetaData "ArchiveLocation" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "ALUrl" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text)) :+: C1 ('MetaCons "ALFilePath" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (ResolvedPath File))))

newtype RelFilePath #

Constructors

RelFilePath Text 

Instances

Instances details
FromJSON RelFilePath 
Instance details

Defined in Pantry.Types

ToJSON RelFilePath 
Instance details

Defined in Pantry.Types

Generic RelFilePath 
Instance details

Defined in Pantry.Types

Associated Types

type Rep RelFilePath 
Instance details

Defined in Pantry.Types

type Rep RelFilePath = D1 ('MetaData "RelFilePath" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'True) (C1 ('MetaCons "RelFilePath" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

Methods

from :: RelFilePath -> Rep RelFilePath x

to :: Rep RelFilePath x -> RelFilePath

Show RelFilePath 
Instance details

Defined in Pantry.Types

Methods

showsPrec :: Int -> RelFilePath -> ShowS

show :: RelFilePath -> String #

showList :: [RelFilePath] -> ShowS

NFData RelFilePath 
Instance details

Defined in Pantry.Types

Methods

rnf :: RelFilePath -> () #

Eq RelFilePath 
Instance details

Defined in Pantry.Types

Ord RelFilePath 
Instance details

Defined in Pantry.Types

Display RelFilePath 
Instance details

Defined in Pantry.Types

type Rep RelFilePath 
Instance details

Defined in Pantry.Types

type Rep RelFilePath = D1 ('MetaData "RelFilePath" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'True) (C1 ('MetaCons "RelFilePath" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

data PackageMetadata #

Instances

Instances details
Generic PackageMetadata 
Instance details

Defined in Pantry.Types

Associated Types

type Rep PackageMetadata 
Instance details

Defined in Pantry.Types

type Rep PackageMetadata = D1 ('MetaData "PackageMetadata" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "PackageMetadata" 'PrefixI 'True) (S1 ('MetaSel ('Just "pmIdent") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 PackageIdentifier) :*: S1 ('MetaSel ('Just "pmTreeKey") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 TreeKey)))
Show PackageMetadata 
Instance details

Defined in Pantry.Types

NFData PackageMetadata 
Instance details

Defined in Pantry.Types

Methods

rnf :: PackageMetadata -> () #

Eq PackageMetadata 
Instance details

Defined in Pantry.Types

Ord PackageMetadata 
Instance details

Defined in Pantry.Types

Display PackageMetadata 
Instance details

Defined in Pantry.Types

type Rep PackageMetadata 
Instance details

Defined in Pantry.Types

type Rep PackageMetadata = D1 ('MetaData "PackageMetadata" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "PackageMetadata" 'PrefixI 'True) (S1 ('MetaSel ('Just "pmIdent") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 PackageIdentifier) :*: S1 ('MetaSel ('Just "pmTreeKey") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 TreeKey)))

data RawPackageMetadata #

Instances

Instances details
Generic RawPackageMetadata 
Instance details

Defined in Pantry.Types

Associated Types

type Rep RawPackageMetadata 
Instance details

Defined in Pantry.Types

type Rep RawPackageMetadata = D1 ('MetaData "RawPackageMetadata" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "RawPackageMetadata" 'PrefixI 'True) (S1 ('MetaSel ('Just "rpmName") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe PackageName)) :*: (S1 ('MetaSel ('Just "rpmVersion") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe Version)) :*: S1 ('MetaSel ('Just "rpmTreeKey") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe TreeKey)))))
Show RawPackageMetadata 
Instance details

Defined in Pantry.Types

NFData RawPackageMetadata 
Instance details

Defined in Pantry.Types

Methods

rnf :: RawPackageMetadata -> () #

Eq RawPackageMetadata 
Instance details

Defined in Pantry.Types

Ord RawPackageMetadata 
Instance details

Defined in Pantry.Types

Display RawPackageMetadata 
Instance details

Defined in Pantry.Types

type Rep RawPackageMetadata 
Instance details

Defined in Pantry.Types

type Rep RawPackageMetadata = D1 ('MetaData "RawPackageMetadata" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "RawPackageMetadata" 'PrefixI 'True) (S1 ('MetaSel ('Just "rpmName") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe PackageName)) :*: (S1 ('MetaSel ('Just "rpmVersion") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe Version)) :*: S1 ('MetaSel ('Just "rpmTreeKey") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe TreeKey)))))

newtype TreeKey #

Constructors

TreeKey BlobKey 

Instances

Instances details
FromJSON TreeKey 
Instance details

Defined in Pantry.Types

ToJSON TreeKey 
Instance details

Defined in Pantry.Types

Methods

toJSON :: TreeKey -> Value

toEncoding :: TreeKey -> Encoding

toJSONList :: [TreeKey] -> Value

toEncodingList :: [TreeKey] -> Encoding

omitField :: TreeKey -> Bool

Generic TreeKey 
Instance details

Defined in Pantry.Types

Associated Types

type Rep TreeKey 
Instance details

Defined in Pantry.Types

type Rep TreeKey = D1 ('MetaData "TreeKey" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'True) (C1 ('MetaCons "TreeKey" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 BlobKey)))

Methods

from :: TreeKey -> Rep TreeKey x

to :: Rep TreeKey x -> TreeKey

Show TreeKey 
Instance details

Defined in Pantry.Types

Methods

showsPrec :: Int -> TreeKey -> ShowS

show :: TreeKey -> String #

showList :: [TreeKey] -> ShowS

NFData TreeKey 
Instance details

Defined in Pantry.Types

Methods

rnf :: TreeKey -> () #

Eq TreeKey 
Instance details

Defined in Pantry.Types

Methods

(==) :: TreeKey -> TreeKey -> Bool #

(/=) :: TreeKey -> TreeKey -> Bool #

Ord TreeKey 
Instance details

Defined in Pantry.Types

Display TreeKey 
Instance details

Defined in Pantry.Types

type Rep TreeKey 
Instance details

Defined in Pantry.Types

type Rep TreeKey = D1 ('MetaData "TreeKey" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'True) (C1 ('MetaCons "TreeKey" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 BlobKey)))

data SafeFilePath #

Instances

Instances details
Show SafeFilePath 
Instance details

Defined in Pantry.Types

Methods

showsPrec :: Int -> SafeFilePath -> ShowS

show :: SafeFilePath -> String #

showList :: [SafeFilePath] -> ShowS

Eq SafeFilePath 
Instance details

Defined in Pantry.Types

Ord SafeFilePath 
Instance details

Defined in Pantry.Types

PersistField SafeFilePath 
Instance details

Defined in Pantry.Types

Methods

toPersistValue :: SafeFilePath -> PersistValue

fromPersistValue :: PersistValue -> Either Text SafeFilePath

PersistFieldSql SafeFilePath 
Instance details

Defined in Pantry.Types

Methods

sqlType :: Proxy SafeFilePath -> SqlType

Display SafeFilePath 
Instance details

Defined in Pantry.Types

SymbolToField "path" FilePath SafeFilePath 
Instance details

Defined in Pantry.Storage

data PantryException #

Constructors

PackageIdentifierRevisionParseFail !Text 
InvalidCabalFile !(Either RawPackageLocationImmutable (Path Abs File)) !(Maybe Version) ![PError] ![PWarning] 
TreeWithoutCabalFile !RawPackageLocationImmutable 
TreeWithMultipleCabalFiles !RawPackageLocationImmutable ![SafeFilePath] 
MismatchedCabalName !(Path Abs File) !PackageName 
NoLocalPackageDirFound !(Path Abs Dir) 
NoCabalFileFound !(Path Abs Dir) 
MultipleCabalFilesFound !(Path Abs Dir) ![Path Abs File] 
InvalidWantedCompiler !Text 
InvalidSnapshotLocation !(Path Abs Dir) !Text 
InvalidOverrideCompiler !WantedCompiler !WantedCompiler 
InvalidFilePathSnapshot !Text 
InvalidSnapshot !RawSnapshotLocation !SomeException 
InvalidGlobalHintsLocation !(Path Abs Dir) !Text 
InvalidFilePathGlobalHints !Text 
MismatchedPackageMetadata !RawPackageLocationImmutable !RawPackageMetadata !(Maybe TreeKey) !PackageIdentifier 
Non200ResponseStatus !Status 
InvalidBlobKey !(Mismatch BlobKey) 
Couldn'tParseSnapshot !RawSnapshotLocation !String 
WrongCabalFileName !RawPackageLocationImmutable !SafeFilePath !PackageName 
DownloadInvalidSHA256 !Text !(Mismatch SHA256) 
DownloadInvalidSize !Text !(Mismatch FileSize) 
DownloadTooLarge !Text !(Mismatch FileSize) 
LocalNoArchiveFileFound !(Path Abs File) 
LocalInvalidSHA256 !(Path Abs File) !(Mismatch SHA256) 
LocalInvalidSize !(Path Abs File) !(Mismatch FileSize) 
UnknownArchiveType !ArchiveLocation 
InvalidTarFileType !ArchiveLocation !FilePath !FileType 
UnsupportedTarball !ArchiveLocation !Text 
NoHackageCryptographicHash !PackageIdentifier 
FailedToCloneRepo !SimpleRepo 
TreeReferencesMissingBlob !RawPackageLocationImmutable !SafeFilePath !BlobKey 
CompletePackageMetadataMismatch !RawPackageLocationImmutable !PackageMetadata 
CRC32Mismatch !ArchiveLocation !FilePath !(Mismatch Word32) 
UnknownHackagePackage !PackageIdentifierRevision !FuzzyResults 
CannotCompleteRepoNonSHA1 !Repo 
MutablePackageLocationFromUrl !Text 
MismatchedCabalFileForHackage !PackageIdentifierRevision !(Mismatch PackageIdentifier) 
PackageNameParseFail !Text 
PackageVersionParseFail !Text 
InvalidCabalFilePath !(Path Abs File) 
DuplicatePackageNames !Utf8Builder ![(PackageName, [RawPackageLocationImmutable])] 
MigrationFailure !Text !(Path Abs File) !SomeException 
NoCasaConfig 
InvalidTreeFromCasa !BlobKey !ByteString 
ParseSnapNameException !Text 
HpackLibraryException !(Path Abs File) !String 
HpackExeException !FilePath !(Path Abs Dir) !SomeException 

data Mismatch a #

Constructors

Mismatch 

Fields

data PackageIdentifierRevision #

Instances

Instances details
FromJSON PackageIdentifierRevision 
Instance details

Defined in Pantry.Types

ToJSON PackageIdentifierRevision 
Instance details

Defined in Pantry.Types

Generic PackageIdentifierRevision 
Instance details

Defined in Pantry.Types

Associated Types

type Rep PackageIdentifierRevision 
Instance details

Defined in Pantry.Types

type Rep PackageIdentifierRevision = D1 ('MetaData "PackageIdentifierRevision" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "PackageIdentifierRevision" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 PackageName) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Version) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 CabalFileInfo))))
Show PackageIdentifierRevision 
Instance details

Defined in Pantry.Types

NFData PackageIdentifierRevision 
Instance details

Defined in Pantry.Types

Eq PackageIdentifierRevision 
Instance details

Defined in Pantry.Types

Ord PackageIdentifierRevision 
Instance details

Defined in Pantry.Types

Display PackageIdentifierRevision 
Instance details

Defined in Pantry.Types

type Rep PackageIdentifierRevision 
Instance details

Defined in Pantry.Types

type Rep PackageIdentifierRevision = D1 ('MetaData "PackageIdentifierRevision" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "PackageIdentifierRevision" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 PackageName) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Version) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 CabalFileInfo))))

data CabalFileInfo #

Instances

Instances details
Generic CabalFileInfo 
Instance details

Defined in Pantry.Types

Associated Types

type Rep CabalFileInfo 
Instance details

Defined in Pantry.Types

type Rep CabalFileInfo = D1 ('MetaData "CabalFileInfo" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "CFILatest" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "CFIHash" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SHA256) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe FileSize))) :+: C1 ('MetaCons "CFIRevision" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Revision))))
Show CabalFileInfo 
Instance details

Defined in Pantry.Types

Methods

showsPrec :: Int -> CabalFileInfo -> ShowS

show :: CabalFileInfo -> String #

showList :: [CabalFileInfo] -> ShowS

NFData CabalFileInfo 
Instance details

Defined in Pantry.Types

Methods

rnf :: CabalFileInfo -> () #

Eq CabalFileInfo 
Instance details

Defined in Pantry.Types

Ord CabalFileInfo 
Instance details

Defined in Pantry.Types

Hashable CabalFileInfo 
Instance details

Defined in Pantry.Types

Display CabalFileInfo 
Instance details

Defined in Pantry.Types

type Rep CabalFileInfo 
Instance details

Defined in Pantry.Types

type Rep CabalFileInfo = D1 ('MetaData "CabalFileInfo" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "CFILatest" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "CFIHash" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SHA256) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe FileSize))) :+: C1 ('MetaCons "CFIRevision" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 Revision))))

newtype FileSize #

Constructors

FileSize Word 

Instances

Instances details
FromJSON FileSize 
Instance details

Defined in Pantry.Types

ToJSON FileSize 
Instance details

Defined in Pantry.Types

Generic FileSize 
Instance details

Defined in Pantry.Types

Associated Types

type Rep FileSize 
Instance details

Defined in Pantry.Types

type Rep FileSize = D1 ('MetaData "FileSize" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'True) (C1 ('MetaCons "FileSize" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word)))

Methods

from :: FileSize -> Rep FileSize x

to :: Rep FileSize x -> FileSize

Show FileSize 
Instance details

Defined in Pantry.Types

Methods

showsPrec :: Int -> FileSize -> ShowS

show :: FileSize -> String #

showList :: [FileSize] -> ShowS

NFData FileSize 
Instance details

Defined in Pantry.Types

Methods

rnf :: FileSize -> () #

Eq FileSize 
Instance details

Defined in Pantry.Types

Ord FileSize 
Instance details

Defined in Pantry.Types

Hashable FileSize 
Instance details

Defined in Pantry.Types

PersistField FileSize 
Instance details

Defined in Pantry.Types

Methods

toPersistValue :: FileSize -> PersistValue

fromPersistValue :: PersistValue -> Either Text FileSize

PersistFieldSql FileSize 
Instance details

Defined in Pantry.Types

Methods

sqlType :: Proxy FileSize -> SqlType

Display FileSize 
Instance details

Defined in Pantry.Types

SymbolToField "size" ArchiveCache FileSize 
Instance details

Defined in Pantry.Storage

Methods

symbolToField :: EntityField ArchiveCache FileSize

SymbolToField "size" Blob FileSize 
Instance details

Defined in Pantry.Storage

SymbolToField "size" CacheUpdate FileSize 
Instance details

Defined in Pantry.Storage

Methods

symbolToField :: EntityField CacheUpdate FileSize

SymbolToField "size" HackageTarball FileSize 
Instance details

Defined in Pantry.Storage

Methods

symbolToField :: EntityField HackageTarball FileSize

type Rep FileSize 
Instance details

Defined in Pantry.Types

type Rep FileSize = D1 ('MetaData "FileSize" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'True) (C1 ('MetaCons "FileSize" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word)))

data SimpleRepo #

Constructors

SimpleRepo 

Instances

Instances details
Generic SimpleRepo 
Instance details

Defined in Pantry.Types

Associated Types

type Rep SimpleRepo 
Instance details

Defined in Pantry.Types

type Rep SimpleRepo = D1 ('MetaData "SimpleRepo" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "SimpleRepo" 'PrefixI 'True) (S1 ('MetaSel ('Just "sRepoUrl") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text) :*: (S1 ('MetaSel ('Just "sRepoCommit") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Just "sRepoType") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 RepoType))))

Methods

from :: SimpleRepo -> Rep SimpleRepo x

to :: Rep SimpleRepo x -> SimpleRepo

Show SimpleRepo 
Instance details

Defined in Pantry.Types

Methods

showsPrec :: Int -> SimpleRepo -> ShowS

show :: SimpleRepo -> String #

showList :: [SimpleRepo] -> ShowS

Eq SimpleRepo 
Instance details

Defined in Pantry.Types

Ord SimpleRepo 
Instance details

Defined in Pantry.Types

Display SimpleRepo 
Instance details

Defined in Pantry.Types

type Rep SimpleRepo 
Instance details

Defined in Pantry.Types

type Rep SimpleRepo = D1 ('MetaData "SimpleRepo" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "SimpleRepo" 'PrefixI 'True) (S1 ('MetaSel ('Just "sRepoUrl") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text) :*: (S1 ('MetaSel ('Just "sRepoCommit") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Just "sRepoType") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 RepoType))))

data Repo #

Constructors

Repo 

Instances

Instances details
Generic Repo 
Instance details

Defined in Pantry.Types

Associated Types

type Rep Repo 
Instance details

Defined in Pantry.Types

type Rep Repo = D1 ('MetaData "Repo" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "Repo" 'PrefixI 'True) ((S1 ('MetaSel ('Just "repoUrl") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Just "repoCommit") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text)) :*: (S1 ('MetaSel ('Just "repoType") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 RepoType) :*: S1 ('MetaSel ('Just "repoSubdir") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text))))

Methods

from :: Repo -> Rep Repo x

to :: Rep Repo x -> Repo

Show Repo 
Instance details

Defined in Pantry.Types

Methods

showsPrec :: Int -> Repo -> ShowS

show :: Repo -> String #

showList :: [Repo] -> ShowS

NFData Repo 
Instance details

Defined in Pantry.Types

Methods

rnf :: Repo -> () #

Eq Repo 
Instance details

Defined in Pantry.Types

Methods

(==) :: Repo -> Repo -> Bool #

(/=) :: Repo -> Repo -> Bool #

Ord Repo 
Instance details

Defined in Pantry.Types

Methods

compare :: Repo -> Repo -> Ordering #

(<) :: Repo -> Repo -> Bool #

(<=) :: Repo -> Repo -> Bool #

(>) :: Repo -> Repo -> Bool #

(>=) :: Repo -> Repo -> Bool #

max :: Repo -> Repo -> Repo #

min :: Repo -> Repo -> Repo #

Display Repo 
Instance details

Defined in Pantry.Types

type Rep Repo 
Instance details

Defined in Pantry.Types

type Rep Repo = D1 ('MetaData "Repo" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "Repo" 'PrefixI 'True) ((S1 ('MetaSel ('Just "repoUrl") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Just "repoCommit") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text)) :*: (S1 ('MetaSel ('Just "repoType") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 RepoType) :*: S1 ('MetaSel ('Just "repoSubdir") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text))))

data RepoType #

Constructors

RepoGit 
RepoHg 

Instances

Instances details
Generic RepoType 
Instance details

Defined in Pantry.Types

Associated Types

type Rep RepoType 
Instance details

Defined in Pantry.Types

type Rep RepoType = D1 ('MetaData "RepoType" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "RepoGit" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "RepoHg" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: RepoType -> Rep RepoType x

to :: Rep RepoType x -> RepoType

Show RepoType 
Instance details

Defined in Pantry.Types

Methods

showsPrec :: Int -> RepoType -> ShowS

show :: RepoType -> String #

showList :: [RepoType] -> ShowS

NFData RepoType 
Instance details

Defined in Pantry.Types

Methods

rnf :: RepoType -> () #

Eq RepoType 
Instance details

Defined in Pantry.Types

Ord RepoType 
Instance details

Defined in Pantry.Types

PersistField RepoType 
Instance details

Defined in Pantry.Types

Methods

toPersistValue :: RepoType -> PersistValue

fromPersistValue :: PersistValue -> Either Text RepoType

PersistFieldSql RepoType 
Instance details

Defined in Pantry.Types

Methods

sqlType :: Proxy RepoType -> SqlType

SymbolToField "type" RepoCache RepoType 
Instance details

Defined in Pantry.Storage

Methods

symbolToField :: EntityField RepoCache RepoType

type Rep RepoType 
Instance details

Defined in Pantry.Types

type Rep RepoType = D1 ('MetaData "RepoType" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "RepoGit" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "RepoHg" 'PrefixI 'False) (U1 :: Type -> Type))

data Archive #

Instances

Instances details
Generic Archive 
Instance details

Defined in Pantry.Types

Associated Types

type Rep Archive 
Instance details

Defined in Pantry.Types

type Rep Archive = D1 ('MetaData "Archive" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "Archive" 'PrefixI 'True) ((S1 ('MetaSel ('Just "archiveLocation") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 ArchiveLocation) :*: S1 ('MetaSel ('Just "archiveHash") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SHA256)) :*: (S1 ('MetaSel ('Just "archiveSize") 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 FileSize) :*: S1 ('MetaSel ('Just "archiveSubdir") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text))))

Methods

from :: Archive -> Rep Archive x

to :: Rep Archive x -> Archive

Show Archive 
Instance details

Defined in Pantry.Types

Methods

showsPrec :: Int -> Archive -> ShowS

show :: Archive -> String #

showList :: [Archive] -> ShowS

NFData Archive 
Instance details

Defined in Pantry.Types

Methods

rnf :: Archive -> () #

Eq Archive 
Instance details

Defined in Pantry.Types

Methods

(==) :: Archive -> Archive -> Bool #

(/=) :: Archive -> Archive -> Bool #

Ord Archive 
Instance details

Defined in Pantry.Types

type Rep Archive 
Instance details

Defined in Pantry.Types

type Rep Archive = D1 ('MetaData "Archive" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "Archive" 'PrefixI 'True) ((S1 ('MetaSel ('Just "archiveLocation") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 ArchiveLocation) :*: S1 ('MetaSel ('Just "archiveHash") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SHA256)) :*: (S1 ('MetaSel ('Just "archiveSize") 'NoSourceUnpackedness 'SourceStrict 'DecidedUnpack) (Rec0 FileSize) :*: S1 ('MetaSel ('Just "archiveSubdir") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text))))

data RawArchive #

Instances

Instances details
Generic RawArchive 
Instance details

Defined in Pantry.Types

Associated Types

type Rep RawArchive 
Instance details

Defined in Pantry.Types

type Rep RawArchive = D1 ('MetaData "RawArchive" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "RawArchive" 'PrefixI 'True) ((S1 ('MetaSel ('Just "raLocation") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 ArchiveLocation) :*: S1 ('MetaSel ('Just "raHash") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe SHA256))) :*: (S1 ('MetaSel ('Just "raSize") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe FileSize)) :*: S1 ('MetaSel ('Just "raSubdir") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text))))

Methods

from :: RawArchive -> Rep RawArchive x

to :: Rep RawArchive x -> RawArchive

Show RawArchive 
Instance details

Defined in Pantry.Types

Methods

showsPrec :: Int -> RawArchive -> ShowS

show :: RawArchive -> String #

showList :: [RawArchive] -> ShowS

NFData RawArchive 
Instance details

Defined in Pantry.Types

Methods

rnf :: RawArchive -> () #

Eq RawArchive 
Instance details

Defined in Pantry.Types

Ord RawArchive 
Instance details

Defined in Pantry.Types

type Rep RawArchive 
Instance details

Defined in Pantry.Types

type Rep RawArchive = D1 ('MetaData "RawArchive" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "RawArchive" 'PrefixI 'True) ((S1 ('MetaSel ('Just "raLocation") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 ArchiveLocation) :*: S1 ('MetaSel ('Just "raHash") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe SHA256))) :*: (S1 ('MetaSel ('Just "raSize") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe FileSize)) :*: S1 ('MetaSel ('Just "raSubdir") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text))))

data PackageLocationImmutable #

Instances

Instances details
ToJSON PackageLocationImmutable 
Instance details

Defined in Pantry.Types

Generic PackageLocationImmutable 
Instance details

Defined in Pantry.Types

Associated Types

type Rep PackageLocationImmutable 
Instance details

Defined in Pantry.Types

type Rep PackageLocationImmutable = D1 ('MetaData "PackageLocationImmutable" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "PLIHackage" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 PackageIdentifier) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 BlobKey) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 TreeKey))) :+: (C1 ('MetaCons "PLIArchive" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Archive) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 PackageMetadata)) :+: C1 ('MetaCons "PLIRepo" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Repo) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 PackageMetadata))))
Show PackageLocationImmutable 
Instance details

Defined in Pantry.Types

NFData PackageLocationImmutable 
Instance details

Defined in Pantry.Types

Eq PackageLocationImmutable 
Instance details

Defined in Pantry.Types

Ord PackageLocationImmutable 
Instance details

Defined in Pantry.Types

Display PackageLocationImmutable 
Instance details

Defined in Pantry.Types

FromJSON (WithJSONWarnings (Unresolved PackageLocationImmutable)) 
Instance details

Defined in Pantry.Types

type Rep PackageLocationImmutable 
Instance details

Defined in Pantry.Types

type Rep PackageLocationImmutable = D1 ('MetaData "PackageLocationImmutable" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "PLIHackage" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 PackageIdentifier) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 BlobKey) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 TreeKey))) :+: (C1 ('MetaCons "PLIArchive" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Archive) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 PackageMetadata)) :+: C1 ('MetaCons "PLIRepo" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Repo) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 PackageMetadata))))

data RawPackageLocationImmutable #

Instances

Instances details
ToJSON RawPackageLocationImmutable 
Instance details

Defined in Pantry.Types

Generic RawPackageLocationImmutable 
Instance details

Defined in Pantry.Types

Associated Types

type Rep RawPackageLocationImmutable 
Instance details

Defined in Pantry.Types

type Rep RawPackageLocationImmutable = D1 ('MetaData "RawPackageLocationImmutable" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "RPLIHackage" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 PackageIdentifierRevision) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe TreeKey))) :+: (C1 ('MetaCons "RPLIArchive" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 RawArchive) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 RawPackageMetadata)) :+: C1 ('MetaCons "RPLIRepo" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Repo) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 RawPackageMetadata))))
Show RawPackageLocationImmutable 
Instance details

Defined in Pantry.Types

NFData RawPackageLocationImmutable 
Instance details

Defined in Pantry.Types

Eq RawPackageLocationImmutable 
Instance details

Defined in Pantry.Types

Ord RawPackageLocationImmutable 
Instance details

Defined in Pantry.Types

Display RawPackageLocationImmutable 
Instance details

Defined in Pantry.Types

Pretty RawPackageLocationImmutable 
Instance details

Defined in Pantry.Types

FromJSON (WithJSONWarnings (Unresolved (NonEmpty RawPackageLocationImmutable))) 
Instance details

Defined in Pantry.Types

type Rep RawPackageLocationImmutable 
Instance details

Defined in Pantry.Types

type Rep RawPackageLocationImmutable = D1 ('MetaData "RawPackageLocationImmutable" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "RPLIHackage" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 PackageIdentifierRevision) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe TreeKey))) :+: (C1 ('MetaCons "RPLIArchive" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 RawArchive) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 RawPackageMetadata)) :+: C1 ('MetaCons "RPLIRepo" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Repo) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 RawPackageMetadata))))

data PackageLocation #

Instances

Instances details
Generic PackageLocation 
Instance details

Defined in Pantry.Types

Associated Types

type Rep PackageLocation 
Instance details

Defined in Pantry.Types

type Rep PackageLocation = D1 ('MetaData "PackageLocation" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "PLImmutable" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 PackageLocationImmutable)) :+: C1 ('MetaCons "PLMutable" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (ResolvedPath Dir))))
Show PackageLocation 
Instance details

Defined in Pantry.Types

NFData PackageLocation 
Instance details

Defined in Pantry.Types

Methods

rnf :: PackageLocation -> () #

Eq PackageLocation 
Instance details

Defined in Pantry.Types

Display PackageLocation 
Instance details

Defined in Pantry.Types

type Rep PackageLocation 
Instance details

Defined in Pantry.Types

type Rep PackageLocation = D1 ('MetaData "PackageLocation" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "PLImmutable" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 PackageLocationImmutable)) :+: C1 ('MetaCons "PLMutable" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (ResolvedPath Dir))))

data RawPackageLocation #

Instances

Instances details
ToJSON RawPackageLocation 
Instance details

Defined in Pantry.Types

Generic RawPackageLocation 
Instance details

Defined in Pantry.Types

Associated Types

type Rep RawPackageLocation 
Instance details

Defined in Pantry.Types

type Rep RawPackageLocation = D1 ('MetaData "RawPackageLocation" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "RPLImmutable" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 RawPackageLocationImmutable)) :+: C1 ('MetaCons "RPLMutable" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (ResolvedPath Dir))))
Show RawPackageLocation 
Instance details

Defined in Pantry.Types

NFData RawPackageLocation 
Instance details

Defined in Pantry.Types

Methods

rnf :: RawPackageLocation -> () #

Eq RawPackageLocation 
Instance details

Defined in Pantry.Types

FromJSON (WithJSONWarnings (Unresolved (NonEmpty RawPackageLocation))) 
Instance details

Defined in Pantry.Types

type Rep RawPackageLocation 
Instance details

Defined in Pantry.Types

type Rep RawPackageLocation = D1 ('MetaData "RawPackageLocation" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "RPLImmutable" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 RawPackageLocationImmutable)) :+: C1 ('MetaCons "RPLMutable" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (ResolvedPath Dir))))

data ResolvedPath t #

Instances

Instances details
Generic (ResolvedPath t) 
Instance details

Defined in Pantry.Types

Associated Types

type Rep (ResolvedPath t) 
Instance details

Defined in Pantry.Types

type Rep (ResolvedPath t) = D1 ('MetaData "ResolvedPath" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "ResolvedPath" 'PrefixI 'True) (S1 ('MetaSel ('Just "resolvedRelative") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 RelFilePath) :*: S1 ('MetaSel ('Just "resolvedAbsolute") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Path Abs t))))

Methods

from :: ResolvedPath t -> Rep (ResolvedPath t) x

to :: Rep (ResolvedPath t) x -> ResolvedPath t

Show (ResolvedPath t) 
Instance details

Defined in Pantry.Types

Methods

showsPrec :: Int -> ResolvedPath t -> ShowS

show :: ResolvedPath t -> String #

showList :: [ResolvedPath t] -> ShowS

NFData (ResolvedPath t) 
Instance details

Defined in Pantry.Types

Methods

rnf :: ResolvedPath t -> () #

Eq (ResolvedPath t) 
Instance details

Defined in Pantry.Types

Ord (ResolvedPath t) 
Instance details

Defined in Pantry.Types

type Rep (ResolvedPath t) 
Instance details

Defined in Pantry.Types

type Rep (ResolvedPath t) = D1 ('MetaData "ResolvedPath" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'False) (C1 ('MetaCons "ResolvedPath" 'PrefixI 'True) (S1 ('MetaSel ('Just "resolvedRelative") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 RelFilePath) :*: S1 ('MetaSel ('Just "resolvedAbsolute") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Path Abs t))))

data Unresolved a #

Instances

Instances details
Applicative Unresolved 
Instance details

Defined in Pantry.Types

Methods

pure :: a -> Unresolved a #

(<*>) :: Unresolved (a -> b) -> Unresolved a -> Unresolved b #

liftA2 :: (a -> b -> c) -> Unresolved a -> Unresolved b -> Unresolved c #

(*>) :: Unresolved a -> Unresolved b -> Unresolved b #

(<*) :: Unresolved a -> Unresolved b -> Unresolved a #

Functor Unresolved 
Instance details

Defined in Pantry.Types

Methods

fmap :: (a -> b) -> Unresolved a -> Unresolved b #

(<$) :: a -> Unresolved b -> Unresolved a #

FromJSON (WithJSONWarnings (Unresolved (NonEmpty RawPackageLocation))) 
Instance details

Defined in Pantry.Types

FromJSON (WithJSONWarnings (Unresolved (NonEmpty RawPackageLocationImmutable))) 
Instance details

Defined in Pantry.Types

FromJSON (WithJSONWarnings (Unresolved GlobalHintsLocation)) 
Instance details

Defined in Pantry.Types

FromJSON (WithJSONWarnings (Unresolved PackageLocationImmutable)) 
Instance details

Defined in Pantry.Types

FromJSON (WithJSONWarnings (Unresolved RawSnapshotLayer)) 
Instance details

Defined in Pantry.Types

FromJSON (WithJSONWarnings (Unresolved RawSnapshotLocation)) 
Instance details

Defined in Pantry.Types

FromJSON (WithJSONWarnings (Unresolved SnapshotLocation)) 
Instance details

Defined in Pantry.Types

FromJSON (WithJSONWarnings (Unresolved Locked)) 
Instance details

Defined in Stack.Lock

(FromJSON (WithJSONWarnings (Unresolved a)), FromJSON (WithJSONWarnings (Unresolved b))) => FromJSON (WithJSONWarnings (Unresolved (LockedLocation a b))) 
Instance details

Defined in Stack.Lock

FromJSON (Unresolved AbstractSnapshot) 
Instance details

Defined in Stack.Types.Snapshot

newtype Revision #

Constructors

Revision Word 

Instances

Instances details
Data Revision 
Instance details

Defined in Pantry.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Revision -> c Revision #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Revision #

toConstr :: Revision -> Constr #

dataTypeOf :: Revision -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Revision) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Revision) #

gmapT :: (forall b. Data b => b -> b) -> Revision -> Revision #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Revision -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Revision -> r #

gmapQ :: (forall d. Data d => d -> u) -> Revision -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Revision -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Revision -> m Revision #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Revision -> m Revision #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Revision -> m Revision #

Generic Revision 
Instance details

Defined in Pantry.Types

Associated Types

type Rep Revision 
Instance details

Defined in Pantry.Types

type Rep Revision = D1 ('MetaData "Revision" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'True) (C1 ('MetaCons "Revision" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word)))

Methods

from :: Revision -> Rep Revision x

to :: Rep Revision x -> Revision

Show Revision 
Instance details

Defined in Pantry.Types

Methods

showsPrec :: Int -> Revision -> ShowS

show :: Revision -> String #

showList :: [Revision] -> ShowS

NFData Revision 
Instance details

Defined in Pantry.Types

Methods

rnf :: Revision -> () #

Eq Revision 
Instance details

Defined in Pantry.Types

Ord Revision 
Instance details

Defined in Pantry.Types

Hashable Revision 
Instance details

Defined in Pantry.Types

PersistField Revision 
Instance details

Defined in Pantry.Types

Methods

toPersistValue :: Revision -> PersistValue

fromPersistValue :: PersistValue -> Either Text Revision

PersistFieldSql Revision 
Instance details

Defined in Pantry.Types

Methods

sqlType :: Proxy Revision -> SqlType

Display Revision 
Instance details

Defined in Pantry.Types

SymbolToField "revision" HackageCabal Revision 
Instance details

Defined in Pantry.Storage

Methods

symbolToField :: EntityField HackageCabal Revision

type Rep Revision 
Instance details

Defined in Pantry.Types

type Rep Revision = D1 ('MetaData "Revision" "Pantry.Types" "pantry-0.10.0-k8pqezVc1P83F7RDdYOvX-internal" 'True) (C1 ('MetaCons "Revision" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word)))

data FlagName #

Instances

Instances details
Parsec FlagName 
Instance details

Defined in Distribution.Types.Flag

Methods

parsec :: CabalParsing m => m FlagName

Pretty FlagName 
Instance details

Defined in Distribution.Types.Flag

Methods

pretty :: FlagName -> Doc

prettyVersioned :: CabalSpecVersion -> FlagName -> Doc

Structured FlagName 
Instance details

Defined in Distribution.Types.Flag

Methods

structure :: Proxy FlagName -> Structure

structureHash' :: Tagged FlagName MD5

Data FlagName 
Instance details

Defined in Distribution.Types.Flag

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FlagName -> c FlagName #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FlagName #

toConstr :: FlagName -> Constr #

dataTypeOf :: FlagName -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c FlagName) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FlagName) #

gmapT :: (forall b. Data b => b -> b) -> FlagName -> FlagName #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FlagName -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FlagName -> r #

gmapQ :: (forall d. Data d => d -> u) -> FlagName -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FlagName -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FlagName -> m FlagName #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FlagName -> m FlagName #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FlagName -> m FlagName #

IsString FlagName 
Instance details

Defined in Distribution.Types.Flag

Generic FlagName 
Instance details

Defined in Distribution.Types.Flag

Associated Types

type Rep FlagName 
Instance details

Defined in Distribution.Types.Flag

type Rep FlagName = D1 ('MetaData "FlagName" "Distribution.Types.Flag" "Cabal-syntax-3.10.3.0-4da5" 'True) (C1 ('MetaCons "FlagName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ShortText)))

Methods

from :: FlagName -> Rep FlagName x

to :: Rep FlagName x -> FlagName

Read FlagName 
Instance details

Defined in Distribution.Types.Flag

Methods

readsPrec :: Int -> ReadS FlagName

readList :: ReadS [FlagName]

readPrec :: ReadPrec FlagName

readListPrec :: ReadPrec [FlagName]

Show FlagName 
Instance details

Defined in Distribution.Types.Flag

Methods

showsPrec :: Int -> FlagName -> ShowS

show :: FlagName -> String #

showList :: [FlagName] -> ShowS

Binary FlagName 
Instance details

Defined in Distribution.Types.Flag

Methods

put :: FlagName -> Put

get :: Get FlagName

putList :: [FlagName] -> Put

NFData FlagName 
Instance details

Defined in Distribution.Types.Flag

Methods

rnf :: FlagName -> () #

Eq FlagName 
Instance details

Defined in Distribution.Types.Flag

Ord FlagName 
Instance details

Defined in Distribution.Types.Flag

IsCabalString FlagName 
Instance details

Defined in Pantry.Types

type Rep FlagName 
Instance details

Defined in Distribution.Types.Flag

type Rep FlagName = D1 ('MetaData "FlagName" "Distribution.Types.Flag" "Cabal-syntax-3.10.3.0-4da5" 'True) (C1 ('MetaCons "FlagName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ShortText)))

data RequireHackageIndex Source #

Require that the Hackage index is populated.

Since: pantry-0.1.0.0

Constructors

YesRequireHackageIndex

If there is nothing in the Hackage index, then perform an update

NoRequireHackageIndex

Do not perform an update

Instances

Instances details
Show RequireHackageIndex 
Instance details

Defined in Pantry.Hackage

data UsePreferredVersions Source #

Should we pay attention to Hackage's preferred versions?

Since: pantry-0.1.0.0

Instances

Instances details
Show UsePreferredVersions 
Instance details

Defined in Pantry.Hackage

data DidUpdateOccur Source #

Did an update occur when running updateHackageIndex?

Since: pantry-0.1.0.0

hackageIndexTarballL :: HasPantryConfig env => SimpleGetter env (Path Abs File) Source #

Where does pantry download its 01-index.tar file from Hackage?

Since: pantry-0.1.0.0

updateHackageIndex Source #

Arguments

:: (HasPantryConfig env, HasLogFunc env) 
=> Maybe Utf8Builder

reason for updating, if any

-> RIO env DidUpdateOccur 

Download the most recent 01-index.tar file from Hackage and update the database tables.

This function will only perform an update once per PantryConfig for user sanity. See the return value to find out if it happened.

Since: pantry-0.1.0.0

getHackageTypoCorrections :: (HasPantryConfig env, HasLogFunc env) => PackageName -> RIO env [PackageName] Source #

Try to come up with typo corrections for given package identifier using Hackage package names. This can provide more user-friendly information in error messages.

Since: pantry-0.1.0.0

getHackagePackageVersions Source #

Returns the versions of the package available on Hackage.

Since: pantry-0.1.0.0

fetchReposRaw :: (HasPantryConfig env, HasLogFunc env, HasProcessContext env) => [(Repo, RawPackageMetadata)] -> RIO env () Source #

Like fetchRepos, except with RawPackageMetadata instead of PackageMetadata.

Since: pantry-0.5.3

fetchRepos :: (HasPantryConfig env, HasLogFunc env, HasProcessContext env) => [(Repo, PackageMetadata)] -> RIO env () Source #

Fetch the given repositories at once and populate the pantry database.

Since: pantry-0.5.3

withRepo :: (HasLogFunc env, HasProcessContext env) => SimpleRepo -> RIO env a -> RIO env a Source #

Clone the repository (and, in the case of Git and if necessary, fetch the specific commit) and execute the action with the working directory set to the repository root.

Since: pantry-0.1.0.0

data PantryApp Source #

Convenient data type that allows you to work with pantry more easily than using withPantryConfig or withPantryConfig' directly. Uses basically sane settings, like sharing a pantry directory with Stack.

You can use runPantryApp to use this. A simple example is:

{-# LANGUAGE OverloadedStrings #-}

module Main (main) where

-- From package Cabal-syntax
import Distribution.Types.Version ( mkVersion )
-- From package pantry
import Pantry
         ( CabalFileInfo (..), PackageIdentifierRevision (..), PantryApp
         , RawPackageLocationImmutable (..), loadPackageRaw, runPantryApp
         )
-- From package rio
import RIO ( RIO, liftIO )

main :: IO ()
main = runPantryApp myPantryApp

myPantryApp :: RIO PantryApp ()
myPantryApp = loadPackageRaw baseLocation >>= liftIO . print
 where
  baseVersion = mkVersion [4, 19, 0, 0]
  basePkgId = PackageIdentifierRevision "base" baseVersion CFILatest
  baseLocation = RPLIHackage basePkgId Nothing

Since: pantry-0.1.0.0

Instances

Instances details
HasPantryConfig PantryApp 
Instance details

Defined in Pantry

HasLogFunc PantryApp 
Instance details

Defined in Pantry

HasProcessContext PantryApp 
Instance details

Defined in Pantry

Methods

processContextL :: Lens' PantryApp ProcessContext

HasTerm PantryApp 
Instance details

Defined in Pantry

HasStylesUpdate PantryApp 
Instance details

Defined in Pantry

data AddPackagesConfig Source #

Package settings to be passed to addPackagesToSnapshot.

Since: pantry-0.1.0.0

data CompletedSL Source #

A completed snapshot location, including the original raw and completed information.

Since: pantry-0.1.0.0

data CompletedPLI Source #

A completed package location, including the original raw and completed information.

Since: pantry-0.1.0.0

data CompletePackageLocation Source #

Complete package location, plus whether the package has a cabal file. This is relevant to reproducibility, see https://tech.fpcomplete.com/blog/storing-generated-cabal-files

Since: pantry-0.4.0.0

withPantryConfig Source #

Arguments

:: HasLogFunc env 
=> Path Abs Dir

pantry root directory, where the SQLite database and Hackage downloads are kept.

-> PackageIndexConfig

Package index configuration. You probably want defaultPackageIndexConfig.

-> HpackExecutable

When converting an hpack package.yaml file to a cabal file, what version of hpack should we use?

-> Int

Maximum connection count

-> CasaRepoPrefix

The casa pull URL e.g. https://casa.stackage.org/v1/pull.

-> Int

Max casa keys to pull per request.

-> (SnapName -> RawSnapshotLocation)

The location of snapshot synonyms

-> (WantedCompiler -> GlobalHintsLocation)

The location of global hints

-> (PantryConfig -> RIO env a)

What to do with the config

-> RIO env a 

Create a new PantryConfig with the given settings. For a version where Hpack's approach to overwriting Cabal files is configurable and the use of Casa (content-addressable storage archive) is optional, see withPantryConfig'.

For something easier to use in simple cases, see runPantryApp.

Since: pantry-0.1.0.0

withPantryConfig' Source #

Arguments

:: HasLogFunc env 
=> Path Abs Dir

pantry root directory, where the SQLite database and Hackage downloads are kept.

-> PackageIndexConfig

Package index configuration. You probably want defaultPackageIndexConfig.

-> HpackExecutable

When converting an hpack package.yaml file to a cabal file, what version of hpack should we use?

-> Force

Should Hpack force the overwriting of a Cabal file that has been modified manually?

Since: pantry-0.10.0

-> Int

Maximum connection count

-> Maybe (CasaRepoPrefix, Int)

Optionally, the Casa pull URL e.g. https://casa.fpcomplete.com and the maximum number of Casa keys to pull per request.

-> (SnapName -> RawSnapshotLocation)

The location of snapshot synonyms

-> (WantedCompiler -> GlobalHintsLocation)

The location of global hints

-> (PantryConfig -> RIO env a)

What to do with the config

-> RIO env a 

Create a new PantryConfig with the given settings.

For something easier to use in simple cases, see runPantryApp.

Since: pantry-0.8.3

defaultCasaRepoPrefix :: CasaRepoPrefix Source #

Default pull URL for Casa.

Since: pantry-0.1.1.1

defaultCasaMaxPerRequest :: Int Source #

Default max keys to pull per request.

Since: pantry-0.1.1.1

defaultPackageIndexConfig :: PackageIndexConfig Source #

Default PackageIndexConfig value using the official Hackage server.

Since: pantry-0.6.0

defaultDownloadPrefix :: Text Source #

The download prefix for the official Hackage server.

Since: pantry-0.6.0

getLatestHackageVersion Source #

Returns the latest version of the given package available from Hackage.

Since: pantry-0.1.0.0

getLatestHackageLocation Source #

Arguments

:: (HasPantryConfig env, HasLogFunc env, HasProcessContext env) 
=> RequireHackageIndex 
-> PackageName

package name

-> UsePreferredVersions 
-> RIO env (Maybe PackageLocationImmutable) 

Returns location of the latest version of the given package available from Hackage.

Since: pantry-0.1.0.0

getLatestHackageRevision Source #

Arguments

:: (HasPantryConfig env, HasLogFunc env, HasProcessContext env) 
=> RequireHackageIndex 
-> PackageName

package name

-> Version 
-> RIO env (Maybe (Revision, BlobKey, TreeKey)) 

Returns the latest revision of the given package version available from Hackage.

Since: pantry-0.1.0.0

fetchPackages :: (HasPantryConfig env, HasLogFunc env, HasProcessContext env, Foldable f) => f PackageLocationImmutable -> RIO env () Source #

Download all of the packages provided into the local cache without performing any unpacking. Can be useful for build tools wanting to prefetch or provide an offline mode.

Since: pantry-0.1.0.0

unpackPackageLocationRaw Source #

Arguments

:: (HasPantryConfig env, HasLogFunc env, HasProcessContext env) 
=> Path Abs Dir

unpack directory

-> RawPackageLocationImmutable 
-> RIO env () 

Unpack a given RawPackageLocationImmutable into the given directory. Does not generate any extra subdirectories.

Since: pantry-0.1.0.0

unpackPackageLocation Source #

Arguments

:: (HasPantryConfig env, HasLogFunc env, HasProcessContext env) 
=> Path Abs Dir

unpack directory

-> PackageLocationImmutable 
-> RIO env () 

Unpack a given PackageLocationImmutable into the given directory. Does not generate any extra subdirectories.

Since: pantry-0.1.0.0

loadCabalFileImmutable :: (HasPantryConfig env, HasLogFunc env, HasProcessContext env) => PackageLocationImmutable -> RIO env GenericPackageDescription Source #

Load the cabal file for the given PackageLocationImmutable.

This function ignores all warnings.

Since: pantry-0.1.0.0

loadCabalFileRawImmutable :: (HasPantryConfig env, HasLogFunc env, HasProcessContext env) => RawPackageLocationImmutable -> RIO env GenericPackageDescription Source #

Load the cabal file for the given RawPackageLocationImmutable.

This function ignores all warnings.

Note that, for now, this will not allow support for hpack files in these package locations. Instead, all PackageLocationImmutables will require a .cabal file. This may be relaxed in the future.

Since: pantry-0.1.0.0

loadCabalFileRaw Source #

Arguments

:: (HasPantryConfig env, HasLogFunc env, HasProcessContext env) 
=> Maybe Text

The program name used by Hpack (the library), defaults to "hpack".

-> RawPackageLocation 
-> RIO env GenericPackageDescription 

Same as loadCabalFileRawImmutable, but takes a RawPackageLocation. Never prints warnings, see loadCabalFilePath for that.

Since: pantry-0.8.0

loadCabalFile Source #

Arguments

:: (HasPantryConfig env, HasLogFunc env, HasProcessContext env) 
=> Maybe Text

The program name used by Hpack (the library), defaults to "hpack".

-> PackageLocation 
-> RIO env GenericPackageDescription 

Same as loadCabalFileImmutable, but takes a PackageLocation. Never prints warnings, see loadCabalFilePath for that.

Since: pantry-0.8.0

loadCabalFilePath Source #

Arguments

:: (HasPantryConfig env, HasLogFunc env, HasProcessContext env) 
=> Maybe Text

The program name used by Hpack (the library), defaults to "hpack".

-> Path Abs Dir

project directory, with a cabal file or hpack file

-> RIO env (PrintWarnings -> IO GenericPackageDescription, PackageName, Path Abs File) 

Parse the Cabal file for the package inside the given directory. Performs various sanity checks, such as the file name being correct and having only a single Cabal file.

Since: pantry-0.8.0

findOrGenerateCabalFile Source #

Arguments

:: (HasPantryConfig env, HasLogFunc env, HasProcessContext env) 
=> Maybe Text

The program name used by Hpack (the library), defaults to "hpack".

-> Path Abs Dir

package directory

-> RIO env (PackageName, Path Abs File) 

Get the file name for the Cabal file in the given directory.

If no Cabal file is present, or more than one is present, an exception is thrown via throwM.

If the directory contains a file named package.yaml, Hpack is used to generate a Cabal file from it.

Since: pantry-0.8.0

gpdPackageIdentifier :: GenericPackageDescription -> PackageIdentifier Source #

Get the PackageIdentifier from a GenericPackageDescription.

Since: pantry-0.1.0.0

gpdPackageName :: GenericPackageDescription -> PackageName Source #

Get the PackageName from a GenericPackageDescription.

Since: pantry-0.1.0.0

gpdVersion :: GenericPackageDescription -> Version Source #

Get the Version from a GenericPackageDescription.

Since: pantry-0.1.0.0

loadPackage :: (HasPantryConfig env, HasLogFunc env, HasProcessContext env) => PackageLocationImmutable -> RIO env Package Source #

Load a Package from a PackageLocationImmutable.

Since: pantry-0.1.0.0

loadPackageRaw :: (HasPantryConfig env, HasLogFunc env, HasProcessContext env) => RawPackageLocationImmutable -> RIO env Package Source #

Load a Package from a RawPackageLocationImmutable.

Load the package either from the local DB, Casa, or as a last resort, the third party (hackage, archive or repo).

Since: pantry-0.1.0.0

tryLoadPackageRawViaCasa :: (HasLogFunc env, HasPantryConfig env, HasProcessContext env) => RawPackageLocationImmutable -> TreeKey -> RIO env (Maybe Package) Source #

Maybe load the package from Casa.

completePackageLocation :: (HasPantryConfig env, HasLogFunc env, HasProcessContext env) => RawPackageLocationImmutable -> RIO env CompletePackageLocation Source #

Fill in optional fields in a PackageLocationImmutable for more reproducible builds.

Since: pantry-0.1.0.0

completeSnapshotLocation :: (HasPantryConfig env, HasLogFunc env) => RawSnapshotLocation -> RIO env SnapshotLocation Source #

Add in hashes to make a SnapshotLocation reproducible.

Since: pantry-0.1.0.0

loadAndCompleteSnapshot Source #

Arguments

:: (HasPantryConfig env, HasLogFunc env, HasProcessContext env) 
=> SnapshotLocation 
-> Map RawSnapshotLocation SnapshotLocation

Cached snapshot locations from lock file

-> Map RawPackageLocationImmutable PackageLocationImmutable

Cached locations from lock file

-> RIO env (Snapshot, [CompletedSL], [CompletedPLI]) 

Parse a Snapshot (all layers) from a SnapshotLocation noting any incomplete package locations. Debug output will include the raw snapshot layer.

Since: pantry-0.1.0.0

loadAndCompleteSnapshot' Source #

Arguments

:: (HasPantryConfig env, HasLogFunc env, HasProcessContext env) 
=> Bool

Debug output includes the raw snapshot layer

-> SnapshotLocation 
-> Map RawSnapshotLocation SnapshotLocation

Cached snapshot locations from lock file

-> Map RawPackageLocationImmutable PackageLocationImmutable

Cached locations from lock file

-> RIO env (Snapshot, [CompletedSL], [CompletedPLI]) 

As for loadAndCompleteSnapshot but allows toggling of the debug output of the raw snapshot layer.

Since: pantry-0.5.7

loadAndCompleteSnapshotRaw Source #

Arguments

:: (HasPantryConfig env, HasLogFunc env, HasProcessContext env) 
=> RawSnapshotLocation 
-> Map RawSnapshotLocation SnapshotLocation

Cached snapshot locations from lock file

-> Map RawPackageLocationImmutable PackageLocationImmutable

Cached locations from lock file

-> RIO env (Snapshot, [CompletedSL], [CompletedPLI]) 

Parse a Snapshot (all layers) from a RawSnapshotLocation completing any incomplete package locations. Debug output will include the raw snapshot layer.

Since: pantry-0.1.0.0

loadAndCompleteSnapshotRaw' Source #

Arguments

:: (HasPantryConfig env, HasLogFunc env, HasProcessContext env) 
=> Bool

Debug output includes the raw snapshot layer

-> RawSnapshotLocation 
-> Map RawSnapshotLocation SnapshotLocation

Cached snapshot locations from lock file

-> Map RawPackageLocationImmutable PackageLocationImmutable

Cached locations from lock file

-> RIO env (Snapshot, [CompletedSL], [CompletedPLI]) 

As for loadAndCompleteSnapshotRaw but allows toggling of the debug output of the raw snapshot layer.

Since: pantry-0.5.7

addPackagesToSnapshot Source #

Arguments

:: (HasPantryConfig env, HasLogFunc env, HasProcessContext env) 
=> Utf8Builder

Text description of where these new packages are coming from, for error messages only

-> [RawPackageLocationImmutable]

new packages

-> AddPackagesConfig 
-> Map PackageName RawSnapshotPackage

packages from parent

-> RIO env (Map PackageName RawSnapshotPackage, AddPackagesConfig) 

Add more packages to a snapshot

Note that any settings on a parent flag which is being replaced will be ignored. For example, if package foo is in the parent and has flag bar set, and foo also appears in new packages, then bar will no longer be set.

Returns any of the AddPackagesConfig values not used.

Since: pantry-0.1.0.0

loadRawSnapshotLayer :: (HasPantryConfig env, HasLogFunc env) => RawSnapshotLocation -> RIO env (Either WantedCompiler (RawSnapshotLayer, CompletedSL)) Source #

Parse a SnapshotLayer value from a SnapshotLocation.

Returns a Left value if provided an SLCompiler constructor. Otherwise, returns a Right value providing both the Snapshot and a hash of the input configuration file.

Since: pantry-0.1.0.0

loadSnapshotLayer :: (HasPantryConfig env, HasLogFunc env) => SnapshotLocation -> RIO env (Either WantedCompiler RawSnapshotLayer) Source #

Parse a SnapshotLayer value from a SnapshotLocation.

Returns a Left value if provided an SLCompiler constructor. Otherwise, returns a Right value providing both the Snapshot and a hash of the input configuration file.

Since: pantry-0.1.0.0

getPackageLocationName :: (HasPantryConfig env, HasLogFunc env, HasProcessContext env) => RawPackageLocationImmutable -> RIO env PackageName Source #

Get the PackageName of the package at the given location.

Since: pantry-0.1.0.0

packageLocationIdent :: PackageLocationImmutable -> PackageIdentifier Source #

Get the PackageIdentifier of the package at the given location.

Since: pantry-0.1.0.0

packageLocationVersion :: PackageLocationImmutable -> Version Source #

Get version of the package at the given location.

Since: pantry-0.1.0.0

getRawPackageLocationIdent :: (HasPantryConfig env, HasLogFunc env, HasProcessContext env) => RawPackageLocationImmutable -> RIO env PackageIdentifier Source #

Get the PackageIdentifier of the package at the given location.

Since: pantry-0.1.0.0

getRawPackageLocationTreeKey :: (HasPantryConfig env, HasLogFunc env, HasProcessContext env) => RawPackageLocationImmutable -> RIO env TreeKey Source #

Get the TreeKey of the package at the given location.

Since: pantry-0.1.0.0

getPackageLocationTreeKey :: (HasPantryConfig env, HasLogFunc env, HasProcessContext env) => PackageLocationImmutable -> RIO env TreeKey Source #

Get the TreeKey of the package at the given location.

Since: pantry-0.1.0.0

hpackExecutableL :: Lens' PantryConfig HpackExecutable Source #

Lens to view or modify the HpackExecutable of a PantryConfig.

Since: pantry-0.1.0.0

hpackForceL :: Lens' PantryConfig Force Source #

Lens to view or modify the Force of a PantryConfig.

Since: pantry-0.10.0

runPantryApp :: MonadIO m => RIO PantryApp a -> m a Source #

Run some code against pantry using basic sane settings.

For testing, see runPantryAppClean.

Since: pantry-0.1.0.0

runPantryAppWith :: MonadIO m => Int -> CasaRepoPrefix -> Int -> RIO PantryApp a -> m a Source #

Run some code against pantry using basic sane settings.

For testing, see runPantryAppClean.

Since: pantry-0.1.1.1

runPantryAppClean :: MonadIO m => RIO PantryApp a -> m a Source #

Like runPantryApp, but uses an empty pantry directory instead of sharing with Stack. Useful for testing.

Since: pantry-0.1.0.0

loadGlobalHints :: (HasTerm env, HasPantryConfig env) => WantedCompiler -> RIO env (Maybe (Map PackageName Version)) Source #

Load the global hints.

Since: pantry-9.4.0

partitionReplacedDependencies Source #

Arguments

:: Ord id 
=> Map PackageName a

global packages

-> (a -> PackageName)

package name getter

-> (a -> id)

returns unique package id used for dependency pruning

-> (a -> [id])

returns unique package ids of direct package dependencies

-> Set PackageName

overrides which global dependencies should get pruned

-> (Map PackageName [PackageName], Map PackageName a) 

Partition a map of global packages with its versions into a Set of replaced packages and its dependencies and a map of remaining (untouched) packages.

Since: pantry-0.1.0.0

withSnapshotCache :: (HasPantryConfig env, HasLogFunc env) => SnapshotCacheHash -> RIO env (Map PackageName (Set ModuleName)) -> ((ModuleName -> RIO env [PackageName]) -> RIO env a) -> RIO env a Source #

Use a snapshot cache, which caches which modules are in which packages in a given snapshot. This is mostly intended for usage by Stack.

Since: pantry-0.1.0.0

class Monad m => MonadThrow (m :: Type -> Type) where #

Methods

throwM :: (HasCallStack, Exception e) => e -> m a #

Instances

Instances details
MonadThrow STM 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: (HasCallStack, Exception e) => e -> STM a #

MonadThrow IO 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: (HasCallStack, Exception e) => e -> IO a #

MonadThrow Q 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: (HasCallStack, Exception e) => e -> Q a #

MonadThrow Maybe 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: (HasCallStack, Exception e) => e -> Maybe a #

MonadThrow [] 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: (HasCallStack, Exception e) => e -> [a] #

e ~ SomeException => MonadThrow (Either e) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: (HasCallStack, Exception e0) => e0 -> Either e a #

MonadThrow (ST s) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: (HasCallStack, Exception e) => e -> ST s a #

Monad m => MonadThrow (CatchT m) 
Instance details

Defined in Control.Monad.Catch.Pure

Methods

throwM :: (HasCallStack, Exception e) => e -> CatchT m a #

MonadThrow m => MonadThrow (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

throwM :: (HasCallStack, Exception e) => e -> LoggingT m a #

MonadThrow m => MonadThrow (NoLoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

throwM :: (HasCallStack, Exception e) => e -> NoLoggingT m a #

MonadThrow m => MonadThrow (WriterLoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

throwM :: (HasCallStack, Exception e) => e -> WriterLoggingT m a #

MonadThrow m => MonadThrow (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

throwM :: (HasCallStack, Exception e) => e -> ResourceT m a #

MonadThrow (RIO env) 
Instance details

Defined in RIO.Prelude.RIO

Methods

throwM :: (HasCallStack, Exception e) => e -> RIO env a #

MonadThrow m => MonadThrow (MaybeT m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: (HasCallStack, Exception e) => e -> MaybeT m a #

MonadThrow m => MonadThrow (ExceptT e m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: (HasCallStack, Exception e0) => e0 -> ExceptT e m a #

MonadThrow m => MonadThrow (IdentityT m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: (HasCallStack, Exception e) => e -> IdentityT m a #

MonadThrow m => MonadThrow (ReaderT r m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: (HasCallStack, Exception e) => e -> ReaderT r m a #

MonadThrow m => MonadThrow (StateT s m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: (HasCallStack, Exception e) => e -> StateT s m a #

MonadThrow m => MonadThrow (StateT s m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: (HasCallStack, Exception e) => e -> StateT s m a #

(MonadThrow m, Monoid w) => MonadThrow (WriterT w m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: (HasCallStack, Exception e) => e -> WriterT w m a #

(MonadThrow m, Monoid w) => MonadThrow (WriterT w m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: (HasCallStack, Exception e) => e -> WriterT w m a #

MonadThrow m => MonadThrow (ConduitT i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

throwM :: (HasCallStack, Exception e) => e -> ConduitT i o m a #

MonadThrow m => MonadThrow (ContT r m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: (HasCallStack, Exception e) => e -> ContT r m a #

(MonadThrow m, Monoid w) => MonadThrow (RWST r w s m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: (HasCallStack, Exception e) => e -> RWST r w s m a #

(MonadThrow m, Monoid w) => MonadThrow (RWST r w s m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: (HasCallStack, Exception e) => e -> RWST r w s m a #

MonadThrow m => MonadThrow (Pipe l i o u m) 
Instance details

Defined in Data.Conduit.Internal.Pipe

Methods

throwM :: (HasCallStack, Exception e) => e -> Pipe l i o u m a #

data Set a #

Instances

Instances details
ToJSON1 Set 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> Set a -> Value

liftToJSONList :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> [Set a] -> Value

liftToEncoding :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> Set a -> Encoding

liftToEncodingList :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> [Set a] -> Encoding

liftOmitField :: (a -> Bool) -> Set a -> Bool

Foldable Set 
Instance details

Defined in Data.Set.Internal

Methods

fold :: Monoid m => Set m -> m #

foldMap :: Monoid m => (a -> m) -> Set a -> m #

foldMap' :: Monoid m => (a -> m) -> Set a -> m

foldr :: (a -> b -> b) -> b -> Set a -> b #

foldr' :: (a -> b -> b) -> b -> Set a -> b #

foldl :: (b -> a -> b) -> b -> Set a -> b

foldl' :: (b -> a -> b) -> b -> Set a -> b #

foldr1 :: (a -> a -> a) -> Set a -> a

foldl1 :: (a -> a -> a) -> Set a -> a

toList :: Set a -> [a] #

null :: Set a -> Bool #

length :: Set a -> Int #

elem :: Eq a => a -> Set a -> Bool #

maximum :: Ord a => Set a -> a

minimum :: Ord a => Set a -> a

sum :: Num a => Set a -> a #

product :: Num a => Set a -> a #

Eq1 Set 
Instance details

Defined in Data.Set.Internal

Methods

liftEq :: (a -> b -> Bool) -> Set a -> Set b -> Bool

Ord1 Set 
Instance details

Defined in Data.Set.Internal

Methods

liftCompare :: (a -> b -> Ordering) -> Set a -> Set b -> Ordering

Show1 Set 
Instance details

Defined in Data.Set.Internal

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Set a -> ShowS

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Set a] -> ShowS

Hashable1 Set 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> Set a -> Int

Lift a => Lift (Set a :: Type) 
Instance details

Defined in Data.Set.Internal

Methods

lift :: Quote m => Set a -> m Exp

liftTyped :: forall (m :: Type -> Type). Quote m => Set a -> Code m (Set a)

ModSubst (Set ModuleName) 
Instance details

Defined in Distribution.Backpack.ModSubst

Methods

modSubst :: OpenModuleSubst -> Set ModuleName -> Set ModuleName

Structured k => Structured (Set k) 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy (Set k) -> Structure

structureHash' :: Tagged (Set k) MD5

(Ord a, FromJSON a) => FromJSON (Set a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Set a)

parseJSONList :: Value -> Parser [Set a]

omittedField :: Maybe (Set a)

ToJSON a => ToJSON (Set a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Set a -> Value

toEncoding :: Set a -> Encoding

toJSONList :: [Set a] -> Value

toEncodingList :: [Set a] -> Encoding

omitField :: Set a -> Bool

(Data a, Ord a) => Data (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Set a -> c (Set a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Set a) #

toConstr :: Set a -> Constr #

dataTypeOf :: Set a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Set a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Set a)) #

gmapT :: (forall b. Data b => b -> b) -> Set a -> Set a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Set a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Set a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Set a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Set a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Set a -> m (Set a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Set a -> m (Set a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Set a -> m (Set 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 #

Ord a => Semigroup (Set a) 
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

Ord a => IsList (Set a) 
Instance details

Defined in Data.Set.Internal

Associated Types

type Item (Set a) 
Instance details

Defined in Data.Set.Internal

type Item (Set a) = a

Methods

fromList :: [Item (Set a)] -> Set a

fromListN :: Int -> [Item (Set a)] -> Set a

toList :: Set a -> [Item (Set a)]

(Read a, Ord a) => Read (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

readsPrec :: Int -> ReadS (Set a)

readList :: ReadS [Set a]

readPrec :: ReadPrec (Set a)

readListPrec :: ReadPrec [Set a]

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

Binary a => Binary (Set a) 
Instance details

Defined in Data.Binary.Class

Methods

put :: Set a -> Put

get :: Get (Set a)

putList :: [Set a] -> Put

NFData a => NFData (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

rnf :: Set a -> () #

Eq a => Eq (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

(==) :: Set a -> Set a -> Bool #

(/=) :: Set a -> Set a -> Bool #

Ord a => Ord (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

compare :: Set a -> Set a -> Ordering #

(<) :: Set a -> Set a -> Bool #

(<=) :: Set a -> Set a -> Bool #

(>) :: Set a -> Set a -> Bool #

(>=) :: Set a -> Set a -> Bool #

max :: Set a -> Set a -> Set a #

min :: Set a -> Set a -> Set a #

Hashable v => Hashable (Set v) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Set v -> Int

hash :: Set v -> Int

Ord v => GrowingAppend (Set v) 
Instance details

Defined in Data.MonoTraversable

Ord e => MonoFoldable (Set e) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (Set e) -> m) -> Set e -> m

ofoldr :: (Element (Set e) -> b -> b) -> b -> Set e -> b

ofoldl' :: (a -> Element (Set e) -> a) -> a -> Set e -> a

otoList :: Set e -> [Element (Set e)]

oall :: (Element (Set e) -> Bool) -> Set e -> Bool

oany :: (Element (Set e) -> Bool) -> Set e -> Bool

onull :: Set e -> Bool

olength :: Set e -> Int

olength64 :: Set e -> Int64

ocompareLength :: Integral i => Set e -> i -> Ordering

otraverse_ :: Applicative f => (Element (Set e) -> f b) -> Set e -> f ()

ofor_ :: Applicative f => Set e -> (Element (Set e) -> f b) -> f ()

omapM_ :: Applicative m => (Element (Set e) -> m ()) -> Set e -> m ()

oforM_ :: Applicative m => Set e -> (Element (Set e) -> m ()) -> m ()

ofoldlM :: Monad m => (a -> Element (Set e) -> m a) -> a -> Set e -> m a

ofoldMap1Ex :: Semigroup m => (Element (Set e) -> m) -> Set e -> m

ofoldr1Ex :: (Element (Set e) -> Element (Set e) -> Element (Set e)) -> Set e -> Element (Set e)

ofoldl1Ex' :: (Element (Set e) -> Element (Set e) -> Element (Set e)) -> Set e -> Element (Set e)

headEx :: Set e -> Element (Set e)

lastEx :: Set e -> Element (Set e)

unsafeHead :: Set e -> Element (Set e)

unsafeLast :: Set e -> Element (Set e)

maximumByEx :: (Element (Set e) -> Element (Set e) -> Ordering) -> Set e -> Element (Set e)

minimumByEx :: (Element (Set e) -> Element (Set e) -> Ordering) -> Set e -> Element (Set e)

oelem :: Element (Set e) -> Set e -> Bool

onotElem :: Element (Set e) -> Set e -> Bool

MonoPointed (Set a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Set a) -> Set a

ToMustache ω => ToMustache (Set ω) 
Instance details

Defined in Text.Mustache.Internal.Types

Methods

toMustache :: Set ω -> Value Source #

listToMustache :: [Set ω] -> Value

(Ord a, PersistField a) => PersistField (Set a) 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Set a -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Set a)

(Ord a, PersistFieldSql a) => PersistFieldSql (Set a) 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy (Set a) -> SqlType

Newtype (Set a) (Set' sep wrapper a) 
Instance details

Defined in Distribution.FieldGrammar.Newtypes

Methods

pack :: Set a -> Set' sep wrapper a

unpack :: Set' sep wrapper a -> Set a

type Item (Set a) 
Instance details

Defined in Data.Set.Internal

type Item (Set a) = a
type Element (Set e) 
Instance details

Defined in Data.MonoTraversable

type Element (Set e) = e

data Map k a #

Instances

Instances details
Bifoldable Map 
Instance details

Defined in Data.Map.Internal

Methods

bifold :: Monoid m => Map m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> Map a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> Map a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> Map a b -> c #

Eq2 Map 
Instance details

Defined in Data.Map.Internal

Methods

liftEq2 :: (a -> b -> Bool) -> (c -> d -> Bool) -> Map a c -> Map b d -> Bool

Ord2 Map 
Instance details

Defined in Data.Map.Internal

Methods

liftCompare2 :: (a -> b -> Ordering) -> (c -> d -> Ordering) -> Map a c -> Map b d -> Ordering

Show2 Map 
Instance details

Defined in Data.Map.Internal

Methods

liftShowsPrec2 :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> (Int -> b -> ShowS) -> ([b] -> ShowS) -> Int -> Map a b -> ShowS

liftShowList2 :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> (Int -> b -> ShowS) -> ([b] -> ShowS) -> [Map a b] -> ShowS

Hashable2 Map 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt2 :: (Int -> a -> Int) -> (Int -> b -> Int) -> Int -> Map a b -> Int

(Lift k, Lift a) => Lift (Map k a :: Type) 
Instance details

Defined in Data.Map.Internal

Methods

lift :: Quote m => Map k a -> m Exp

liftTyped :: forall (m :: Type -> Type). Quote m => Map k a -> Code m (Map k a)

(FromJSONKey k, Ord k) => FromJSON1 (Map k) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: Maybe a -> (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (Map k a)

liftParseJSONList :: Maybe a -> (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [Map k a]

liftOmittedField :: Maybe a -> Maybe (Map k a)

ToJSONKey k => ToJSON1 (Map k) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> Map k a -> Value

liftToJSONList :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> [Map k a] -> Value

liftToEncoding :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> Map k a -> Encoding

liftToEncodingList :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> [Map k a] -> Encoding

liftOmitField :: (a -> Bool) -> Map k a -> Bool

Foldable (Map k) 
Instance details

Defined in Data.Map.Internal

Methods

fold :: Monoid m => Map k m -> m #

foldMap :: Monoid m => (a -> m) -> Map k a -> m #

foldMap' :: Monoid m => (a -> m) -> Map k a -> m

foldr :: (a -> b -> b) -> b -> Map k a -> b #

foldr' :: (a -> b -> b) -> b -> Map k a -> b #

foldl :: (b -> a -> b) -> b -> Map k a -> b

foldl' :: (b -> a -> b) -> b -> Map k a -> b #

foldr1 :: (a -> a -> a) -> Map k a -> a

foldl1 :: (a -> a -> a) -> Map k a -> a

toList :: Map k a -> [a] #

null :: Map k a -> Bool #

length :: Map k a -> Int #

elem :: Eq a => a -> Map k a -> Bool #

maximum :: Ord a => Map k a -> a

minimum :: Ord a => Map k a -> a

sum :: Num a => Map k a -> a #

product :: Num a => Map k a -> a #

Eq k => Eq1 (Map k) 
Instance details

Defined in Data.Map.Internal

Methods

liftEq :: (a -> b -> Bool) -> Map k a -> Map k b -> Bool

Ord k => Ord1 (Map k) 
Instance details

Defined in Data.Map.Internal

Methods

liftCompare :: (a -> b -> Ordering) -> Map k a -> Map k b -> Ordering

(Ord k, Read k) => Read1 (Map k) 
Instance details

Defined in Data.Map.Internal

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (Map k a)

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [Map k a]

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (Map k a)

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [Map k a]

Show k => Show1 (Map k) 
Instance details

Defined in Data.Map.Internal

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Map k a -> ShowS

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Map k a] -> ShowS

Traversable (Map k) 
Instance details

Defined in Data.Map.Internal

Methods

traverse :: Applicative f => (a -> f b) -> Map k a -> f (Map k b) #

sequenceA :: Applicative f => Map k (f a) -> f (Map k a) #

mapM :: Monad m => (a -> m b) -> Map k a -> m (Map k b) #

sequence :: Monad m => Map k (m a) -> m (Map k 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 #

Hashable k => Hashable1 (Map k) 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> Map k a -> Int

ModSubst a => ModSubst (Map k a) 
Instance details

Defined in Distribution.Backpack.ModSubst

Methods

modSubst :: OpenModuleSubst -> Map k a -> Map k a

(Structured k, Structured v) => Structured (Map k v) 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy (Map k v) -> Structure

structureHash' :: Tagged (Map k v) MD5

(FromJSONKey k, Ord k, FromJSON v) => FromJSON (Map k v) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Map k v)

parseJSONList :: Value -> Parser [Map k v]

omittedField :: Maybe (Map k v)

(ToJSON v, ToJSONKey k) => ToJSON (Map k v) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Map k v -> Value

toEncoding :: Map k v -> Encoding

toJSONList :: [Map k v] -> Value

toEncodingList :: [Map k v] -> Encoding

omitField :: Map k v -> Bool

(Data k, Data a, Ord k) => Data (Map k a) 
Instance details

Defined in Data.Map.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Map k a -> c (Map k a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Map k a) #

toConstr :: Map k a -> Constr #

dataTypeOf :: Map k a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Map k a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Map k a)) #

gmapT :: (forall b. Data b => b -> b) -> Map k a -> Map k a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Map k a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Map k a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Map k a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Map k a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Map k a -> m (Map k a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Map k a -> m (Map k a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Map k a -> m (Map k a) #

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 #

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

Ord k => IsList (Map k v) 
Instance details

Defined in Data.Map.Internal

Associated Types

type Item (Map k v) 
Instance details

Defined in Data.Map.Internal

type Item (Map k v) = (k, v)

Methods

fromList :: [Item (Map k v)] -> Map k v

fromListN :: Int -> [Item (Map k v)] -> Map k v

toList :: Map k v -> [Item (Map k v)]

(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]

(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

(Binary k, Binary e) => Binary (Map k e) 
Instance details

Defined in Data.Binary.Class

Methods

put :: Map k e -> Put

get :: Get (Map k e)

putList :: [Map k e] -> Put

(NFData k, NFData a) => NFData (Map k a) 
Instance details

Defined in Data.Map.Internal

Methods

rnf :: Map k a -> () #

(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 #

(Ord k, Ord v) => Ord (Map k v) 
Instance details

Defined in Data.Map.Internal

Methods

compare :: Map k v -> Map k v -> Ordering #

(<) :: Map k v -> Map k v -> Bool #

(<=) :: Map k v -> Map k v -> Bool #

(>) :: Map k v -> Map k v -> Bool #

(>=) :: Map k v -> Map k v -> Bool #

max :: Map k v -> Map k v -> Map k v #

min :: Map k v -> Map k v -> Map k v #

(Hashable k, Hashable v) => Hashable (Map k v) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Map k v -> Int

hash :: Map k v -> Int

FromValue a => FromValue (Map String a) 
Instance details

Defined in Data.Aeson.Config.FromValue

Ord k => GrowingAppend (Map k v) 
Instance details

Defined in Data.MonoTraversable

MonoFoldable (Map k v) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (Map k v) -> m) -> Map k v -> m

ofoldr :: (Element (Map k v) -> b -> b) -> b -> Map k v -> b

ofoldl' :: (a -> Element (Map k v) -> a) -> a -> Map k v -> a

otoList :: Map k v -> [Element (Map k v)]

oall :: (Element (Map k v) -> Bool) -> Map k v -> Bool

oany :: (Element (Map k v) -> Bool) -> Map k v -> Bool

onull :: Map k v -> Bool

olength :: Map k v -> Int

olength64 :: Map k v -> Int64

ocompareLength :: Integral i => Map k v -> i -> Ordering

otraverse_ :: Applicative f => (Element (Map k v) -> f b) -> Map k v -> f ()

ofor_ :: Applicative f => Map k v -> (Element (Map k v) -> f b) -> f ()

omapM_ :: Applicative m => (Element (Map k v) -> m ()) -> Map k v -> m ()

oforM_ :: Applicative m => Map k v -> (Element (Map k v) -> m ()) -> m ()

ofoldlM :: Monad m => (a -> Element (Map k v) -> m a) -> a -> Map k v -> m a

ofoldMap1Ex :: Semigroup m => (Element (Map k v) -> m) -> Map k v -> m

ofoldr1Ex :: (Element (Map k v) -> Element (Map k v) -> Element (Map k v)) -> Map k v -> Element (Map k v)

ofoldl1Ex' :: (Element (Map k v) -> Element (Map k v) -> Element (Map k v)) -> Map k v -> Element (Map k v)

headEx :: Map k v -> Element (Map k v)

lastEx :: Map k v -> Element (Map k v)

unsafeHead :: Map k v -> Element (Map k v)

unsafeLast :: Map k v -> Element (Map k v)

maximumByEx :: (Element (Map k v) -> Element (Map k v) -> Ordering) -> Map k v -> Element (Map k v)

minimumByEx :: (Element (Map k v) -> Element (Map k v) -> Ordering) -> Map k v -> Element (Map k v)

oelem :: Element (Map k v) -> Map k v -> Bool

onotElem :: Element (Map k v) -> Map k v -> Bool

MonoFunctor (Map k v) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Map k v) -> Element (Map k v)) -> Map k v -> Map k v

MonoTraversable (Map k v) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (Map k v) -> f (Element (Map k v))) -> Map k v -> f (Map k v)

omapM :: Applicative m => (Element (Map k v) -> m (Element (Map k v))) -> Map k v -> m (Map k v)

ToMustache ω => ToMustache (Map Text ω) 
Instance details

Defined in Text.Mustache.Internal.Types

ToMustache ω => ToMustache (Map Text ω) 
Instance details

Defined in Text.Mustache.Internal.Types

Methods

toMustache :: Map Text ω -> Value Source #

listToMustache :: [Map Text ω] -> Value

ToMustache ω => ToMustache (Map String ω) 
Instance details

Defined in Text.Mustache.Internal.Types

PersistField v => PersistField (Map Text v) 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Map Text v -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Map Text v)

PersistFieldSql v => PersistFieldSql (Map Text v) 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy (Map Text v) -> SqlType

type Item (Map k v) 
Instance details

Defined in Data.Map.Internal

type Item (Map k v) = (k, v)
type Element (Map k v) 
Instance details

Defined in Data.MonoTraversable

type Element (Map k v) = v

class Display a where #

Minimal complete definition

display | textDisplay

Methods

display :: a -> Utf8Builder #

textDisplay :: a -> Text #

Instances

Instances details
Display JSONWarning 
Instance details

Defined in Data.Aeson.WarningParser

Display SomeException 
Instance details

Defined in RIO.Prelude.Display

Display IOException 
Instance details

Defined in RIO.Prelude.Display

Display Int16 
Instance details

Defined in RIO.Prelude.Display

Display Int32 
Instance details

Defined in RIO.Prelude.Display

Display Int64 
Instance details

Defined in RIO.Prelude.Display

Display Int8 
Instance details

Defined in RIO.Prelude.Display

Display Word16 
Instance details

Defined in RIO.Prelude.Display

Display Word32 
Instance details

Defined in RIO.Prelude.Display

Display Word64 
Instance details

Defined in RIO.Prelude.Display

Display Word8 
Instance details

Defined in RIO.Prelude.Display

Display SHA256 
Instance details

Defined in Pantry.SHA256

Display SHA256Exception 
Instance details

Defined in Pantry.SHA256

Methods

display :: SHA256Exception -> Utf8Builder #

textDisplay :: SHA256Exception -> Text #

Display ArchiveLocation 
Instance details

Defined in Pantry.Types

Display BlobKey 
Instance details

Defined in Pantry.Types

Display CabalFileInfo 
Instance details

Defined in Pantry.Types

Display FileSize 
Instance details

Defined in Pantry.Types

Display GlobalHintsLocation 
Instance details

Defined in Pantry.Types

Display ModuleNameP 
Instance details

Defined in Pantry.Types

Display PackageIdentifierRevision 
Instance details

Defined in Pantry.Types

Display PackageLocation 
Instance details

Defined in Pantry.Types

Display PackageLocationImmutable 
Instance details

Defined in Pantry.Types

Display PackageMetadata 
Instance details

Defined in Pantry.Types

Display PackageNameP 
Instance details

Defined in Pantry.Types

Display PantryException 
Instance details

Defined in Pantry.Types

Display RawPackageLocationImmutable 
Instance details

Defined in Pantry.Types

Display RawPackageMetadata 
Instance details

Defined in Pantry.Types

Display RawSnapshotLocation 
Instance details

Defined in Pantry.Types

Display RelFilePath 
Instance details

Defined in Pantry.Types

Display Repo 
Instance details

Defined in Pantry.Types

Display Revision 
Instance details

Defined in Pantry.Types

Display SafeFilePath 
Instance details

Defined in Pantry.Types

Display SimpleRepo 
Instance details

Defined in Pantry.Types

Display SnapName 
Instance details

Defined in Pantry.Types

Display SnapshotLocation 
Instance details

Defined in Pantry.Types

Display TreeKey 
Instance details

Defined in Pantry.Types

Display VersionP 
Instance details

Defined in Pantry.Types

Display WantedCompiler 
Instance details

Defined in Pantry.Types

Display Utf8Builder 
Instance details

Defined in RIO.Prelude.Display

Display ActualCompiler Source # 
Instance details

Defined in Stack.Types.Compiler

Display AbstractSnapshot Source # 
Instance details

Defined in Stack.Types.Snapshot

Display Text 
Instance details

Defined in RIO.Prelude.Display

Display Text 
Instance details

Defined in RIO.Prelude.Display

Methods

display :: Text -> Utf8Builder #

textDisplay :: Text -> Text #

Display Integer 
Instance details

Defined in RIO.Prelude.Display

Display Char 
Instance details

Defined in RIO.Prelude.Display

Display Double 
Instance details

Defined in RIO.Prelude.Display

Display Float 
Instance details

Defined in RIO.Prelude.Display

Display Int 
Instance details

Defined in RIO.Prelude.Display

Display Word 
Instance details

Defined in RIO.Prelude.Display

Display (ProcessConfig a b c) 
Instance details

Defined in RIO.Prelude.Display

Methods

display :: ProcessConfig a b c -> Utf8Builder #

textDisplay :: ProcessConfig a b c -> Text #

type ConduitM = ConduitT #

data Abs #

Instances

Instances details
Data Abs 
Instance details

Defined in Path.Posix

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Abs -> c Abs #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Abs #

toConstr :: Abs -> Constr #

dataTypeOf :: Abs -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Abs) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Abs) #

gmapT :: (forall b. Data b => b -> b) -> Abs -> Abs #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Abs -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Abs -> r #

gmapQ :: (forall d. Data d => d -> u) -> Abs -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Abs -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Abs -> m Abs #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Abs -> m Abs #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Abs -> m Abs #

NFData (PrecompiledCache Abs) Source # 
Instance details

Defined in Stack.Types.Build

Methods

rnf :: PrecompiledCache Abs -> () #

FromJSON (Path Abs Dir) 
Instance details

Defined in Path.Posix

Methods

parseJSON :: Value -> Parser (Path Abs Dir)

parseJSONList :: Value -> Parser [Path Abs Dir]

omittedField :: Maybe (Path Abs Dir)

FromJSON (Path Abs File) 
Instance details

Defined in Path.Posix

FromJSONKey (Path Abs Dir) 
Instance details

Defined in Path.Posix

Methods

fromJSONKey :: FromJSONKeyFunction (Path Abs Dir)

fromJSONKeyList :: FromJSONKeyFunction [Path Abs Dir]

FromJSONKey (Path Abs File) 
Instance details

Defined in Path.Posix

Methods

fromJSONKey :: FromJSONKeyFunction (Path Abs File)

fromJSONKeyList :: FromJSONKeyFunction [Path Abs File]

data File #

Instances

Instances details
Data File 
Instance details

Defined in Path.Posix

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> File -> c File #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c File #

toConstr :: File -> Constr #

dataTypeOf :: File -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c File) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c File) #

gmapT :: (forall b. Data b => b -> b) -> File -> File #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> File -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> File -> r #

gmapQ :: (forall d. Data d => d -> u) -> File -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> File -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> File -> m File #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> File -> m File #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> File -> m File #

FromJSON (SomeBase File) 
Instance details

Defined in Path.Posix

Methods

parseJSON :: Value -> Parser (SomeBase File)

parseJSONList :: Value -> Parser [SomeBase File]

omittedField :: Maybe (SomeBase File)

AnyPath (SomeBase File) 
Instance details

Defined in Path.IO

Associated Types

type AbsPath (SomeBase File) 
Instance details

Defined in Path.IO

type AbsPath (SomeBase File) = Path Abs File
type RelPath (SomeBase File) 
Instance details

Defined in Path.IO

type RelPath (SomeBase File) = Path Rel File

Methods

canonicalizePath :: MonadIO m => SomeBase File -> m (AbsPath (SomeBase File))

makeAbsolute :: MonadIO m => SomeBase File -> m (AbsPath (SomeBase File))

makeRelative :: MonadThrow m => Path Abs Dir -> SomeBase File -> m (RelPath (SomeBase File))

makeRelativeToCurrentDir :: MonadIO m => SomeBase File -> m (RelPath (SomeBase File))

Pretty (SomeBase File) 
Instance details

Defined in Text.PrettyPrint.Leijen.Extended

Methods

pretty :: SomeBase File -> StyleDoc #

FromJSON (Path Abs File) 
Instance details

Defined in Path.Posix

FromJSON (Path Rel File) 
Instance details

Defined in Path.Posix

FromJSONKey (Path Abs File) 
Instance details

Defined in Path.Posix

Methods

fromJSONKey :: FromJSONKeyFunction (Path Abs File)

fromJSONKeyList :: FromJSONKeyFunction [Path Abs File]

FromJSONKey (Path Rel File) 
Instance details

Defined in Path.Posix

Methods

fromJSONKey :: FromJSONKeyFunction (Path Rel File)

fromJSONKeyList :: FromJSONKeyFunction [Path Rel File]

AnyPath (Path b File) 
Instance details

Defined in Path.IO

Associated Types

type AbsPath (Path b File) 
Instance details

Defined in Path.IO

type AbsPath (Path b File) = Path Abs File
type RelPath (Path b File) 
Instance details

Defined in Path.IO

type RelPath (Path b File) = Path Rel File

Methods

canonicalizePath :: MonadIO m => Path b File -> m (AbsPath (Path b File))

makeAbsolute :: MonadIO m => Path b File -> m (AbsPath (Path b File))

makeRelative :: MonadThrow m => Path Abs Dir -> Path b File -> m (RelPath (Path b File))

makeRelativeToCurrentDir :: MonadIO m => Path b File -> m (RelPath (Path b File))

Pretty (Path b File) 
Instance details

Defined in Text.PrettyPrint.Leijen.Extended

Methods

pretty :: Path b File -> StyleDoc #

type AbsPath (SomeBase File) 
Instance details

Defined in Path.IO

type AbsPath (SomeBase File) = Path Abs File
type RelPath (SomeBase File) 
Instance details

Defined in Path.IO

type RelPath (SomeBase File) = Path Rel File
type AbsPath (Path b File) 
Instance details

Defined in Path.IO

type AbsPath (Path b File) = Path Abs File
type RelPath (Path b File) 
Instance details

Defined in Path.IO

type RelPath (Path b File) = Path Rel File

data Dir #

Instances

Instances details
Data Dir 
Instance details

Defined in Path.Posix

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Dir -> c Dir #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Dir #

toConstr :: Dir -> Constr #

dataTypeOf :: Dir -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Dir) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Dir) #

gmapT :: (forall b. Data b => b -> b) -> Dir -> Dir #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Dir -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Dir -> r #

gmapQ :: (forall d. Data d => d -> u) -> Dir -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Dir -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Dir -> m Dir #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Dir -> m Dir #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Dir -> m Dir #

FromJSON (SomeBase Dir) 
Instance details

Defined in Path.Posix

Methods

parseJSON :: Value -> Parser (SomeBase Dir)

parseJSONList :: Value -> Parser [SomeBase Dir]

omittedField :: Maybe (SomeBase Dir)

AnyPath (SomeBase Dir) 
Instance details

Defined in Path.IO

Associated Types

type AbsPath (SomeBase Dir) 
Instance details

Defined in Path.IO

type AbsPath (SomeBase Dir) = Path Abs Dir
type RelPath (SomeBase Dir) 
Instance details

Defined in Path.IO

type RelPath (SomeBase Dir) = Path Rel Dir

Methods

canonicalizePath :: MonadIO m => SomeBase Dir -> m (AbsPath (SomeBase Dir))

makeAbsolute :: MonadIO m => SomeBase Dir -> m (AbsPath (SomeBase Dir))

makeRelative :: MonadThrow m => Path Abs Dir -> SomeBase Dir -> m (RelPath (SomeBase Dir))

makeRelativeToCurrentDir :: MonadIO m => SomeBase Dir -> m (RelPath (SomeBase Dir))

Pretty (SomeBase Dir) 
Instance details

Defined in Text.PrettyPrint.Leijen.Extended

Methods

pretty :: SomeBase Dir -> StyleDoc #

FromJSON (Path Abs Dir) 
Instance details

Defined in Path.Posix

Methods

parseJSON :: Value -> Parser (Path Abs Dir)

parseJSONList :: Value -> Parser [Path Abs Dir]

omittedField :: Maybe (Path Abs Dir)

FromJSON (Path Rel Dir) 
Instance details

Defined in Path.Posix

Methods

parseJSON :: Value -> Parser (Path Rel Dir)

parseJSONList :: Value -> Parser [Path Rel Dir]

omittedField :: Maybe (Path Rel Dir)

FromJSONKey (Path Abs Dir) 
Instance details

Defined in Path.Posix

Methods

fromJSONKey :: FromJSONKeyFunction (Path Abs Dir)

fromJSONKeyList :: FromJSONKeyFunction [Path Abs Dir]

FromJSONKey (Path Rel Dir) 
Instance details

Defined in Path.Posix

Methods

fromJSONKey :: FromJSONKeyFunction (Path Rel Dir)

fromJSONKeyList :: FromJSONKeyFunction [Path Rel Dir]

AnyPath (Path b Dir) 
Instance details

Defined in Path.IO

Associated Types

type AbsPath (Path b Dir) 
Instance details

Defined in Path.IO

type AbsPath (Path b Dir) = Path Abs Dir
type RelPath (Path b Dir) 
Instance details

Defined in Path.IO

type RelPath (Path b Dir) = Path Rel Dir

Methods

canonicalizePath :: MonadIO m => Path b Dir -> m (AbsPath (Path b Dir))

makeAbsolute :: MonadIO m => Path b Dir -> m (AbsPath (Path b Dir))

makeRelative :: MonadThrow m => Path Abs Dir -> Path b Dir -> m (RelPath (Path b Dir))

makeRelativeToCurrentDir :: MonadIO m => Path b Dir -> m (RelPath (Path b Dir))

Pretty (Path b Dir) 
Instance details

Defined in Text.PrettyPrint.Leijen.Extended

Methods

pretty :: Path b Dir -> StyleDoc #

type AbsPath (SomeBase Dir) 
Instance details

Defined in Path.IO

type AbsPath (SomeBase Dir) = Path Abs Dir
type RelPath (SomeBase Dir) 
Instance details

Defined in Path.IO

type RelPath (SomeBase Dir) = Path Rel Dir
type AbsPath (Path b Dir) 
Instance details

Defined in Path.IO

type AbsPath (Path b Dir) = Path Abs Dir
type RelPath (Path b Dir) 
Instance details

Defined in Path.IO

type RelPath (Path b Dir) = Path Rel Dir

data Builder #

Instances

Instances details
Monoid Builder 
Instance details

Defined in Data.ByteString.Builder.Internal

Semigroup Builder 
Instance details

Defined in Data.ByteString.Builder.Internal

MonoPointed Builder 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element Builder -> Builder

type Element Builder 
Instance details

Defined in Data.MonoTraversable

type Element Builder = Word8

data HashSet a #

Instances

Instances details
ToJSON1 HashSet 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> HashSet a -> Value

liftToJSONList :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> [HashSet a] -> Value

liftToEncoding :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> HashSet a -> Encoding

liftToEncodingList :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> [HashSet a] -> Encoding

liftOmitField :: (a -> Bool) -> HashSet a -> Bool

Foldable HashSet 
Instance details

Defined in Data.HashSet.Internal

Methods

fold :: Monoid m => HashSet m -> m #

foldMap :: Monoid m => (a -> m) -> HashSet a -> m #

foldMap' :: Monoid m => (a -> m) -> HashSet a -> m

foldr :: (a -> b -> b) -> b -> HashSet a -> b #

foldr' :: (a -> b -> b) -> b -> HashSet a -> b #

foldl :: (b -> a -> b) -> b -> HashSet a -> b

foldl' :: (b -> a -> b) -> b -> HashSet a -> b #

foldr1 :: (a -> a -> a) -> HashSet a -> a

foldl1 :: (a -> a -> a) -> HashSet a -> a

toList :: HashSet a -> [a] #

null :: HashSet a -> Bool #

length :: HashSet a -> Int #

elem :: Eq a => a -> HashSet a -> Bool #

maximum :: Ord a => HashSet a -> a

minimum :: Ord a => HashSet a -> a

sum :: Num a => HashSet a -> a #

product :: Num a => HashSet a -> a #

Eq1 HashSet 
Instance details

Defined in Data.HashSet.Internal

Methods

liftEq :: (a -> b -> Bool) -> HashSet a -> HashSet b -> Bool

Ord1 HashSet 
Instance details

Defined in Data.HashSet.Internal

Methods

liftCompare :: (a -> b -> Ordering) -> HashSet a -> HashSet b -> Ordering

Show1 HashSet 
Instance details

Defined in Data.HashSet.Internal

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> HashSet a -> ShowS

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [HashSet a] -> ShowS

NFData1 HashSet 
Instance details

Defined in Data.HashSet.Internal

Methods

liftRnf :: (a -> ()) -> HashSet a -> ()

Hashable1 HashSet 
Instance details

Defined in Data.HashSet.Internal

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> HashSet a -> Int

Lift a => Lift (HashSet a :: Type) 
Instance details

Defined in Data.HashSet.Internal

Methods

lift :: Quote m => HashSet a -> m Exp

liftTyped :: forall (m :: Type -> Type). Quote m => HashSet a -> Code m (HashSet a)

(Eq a, Hashable a, FromJSON a) => FromJSON (HashSet a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (HashSet a)

parseJSONList :: Value -> Parser [HashSet a]

omittedField :: Maybe (HashSet a)

ToJSON a => ToJSON (HashSet a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: HashSet a -> Value

toEncoding :: HashSet a -> Encoding

toJSONList :: [HashSet a] -> Value

toEncodingList :: [HashSet a] -> Encoding

omitField :: HashSet a -> Bool

(Data a, Eq a, Hashable a) => Data (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> HashSet a -> c (HashSet a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (HashSet a) #

toConstr :: HashSet a -> Constr #

dataTypeOf :: HashSet a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (HashSet a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (HashSet a)) #

gmapT :: (forall b. Data b => b -> b) -> HashSet a -> HashSet a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HashSet a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HashSet a -> r #

gmapQ :: (forall d. Data d => d -> u) -> HashSet a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> HashSet a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> HashSet a -> m (HashSet a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HashSet a -> m (HashSet a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HashSet a -> m (HashSet a) #

(Hashable a, Eq a) => Monoid (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Methods

mempty :: HashSet a #

mappend :: HashSet a -> HashSet a -> HashSet a #

mconcat :: [HashSet a] -> HashSet a #

(Hashable a, Eq a) => Semigroup (HashSet a) 
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

(Eq a, Hashable a) => IsList (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Associated Types

type Item (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

type Item (HashSet a) = a

Methods

fromList :: [Item (HashSet a)] -> HashSet a

fromListN :: Int -> [Item (HashSet a)] -> HashSet a

toList :: HashSet a -> [Item (HashSet a)]

(Eq a, Hashable a, Read a) => Read (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Methods

readsPrec :: Int -> ReadS (HashSet a)

readList :: ReadS [HashSet a]

readPrec :: ReadPrec (HashSet a)

readListPrec :: ReadPrec [HashSet a]

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

NFData a => NFData (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Methods

rnf :: HashSet a -> () #

Eq a => Eq (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Methods

(==) :: HashSet a -> HashSet a -> Bool #

(/=) :: HashSet a -> HashSet a -> Bool #

Ord a => Ord (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Methods

compare :: HashSet a -> HashSet a -> Ordering #

(<) :: HashSet a -> HashSet a -> Bool #

(<=) :: HashSet a -> HashSet a -> Bool #

(>) :: HashSet a -> HashSet a -> Bool #

(>=) :: HashSet a -> HashSet a -> Bool #

max :: HashSet a -> HashSet a -> HashSet a #

min :: HashSet a -> HashSet a -> HashSet a #

Hashable a => Hashable (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Methods

hashWithSalt :: Int -> HashSet a -> Int

hash :: HashSet a -> Int

(Eq v, Hashable v) => GrowingAppend (HashSet v) 
Instance details

Defined in Data.MonoTraversable

MonoFoldable (HashSet e) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (HashSet e) -> m) -> HashSet e -> m

ofoldr :: (Element (HashSet e) -> b -> b) -> b -> HashSet e -> b

ofoldl' :: (a -> Element (HashSet e) -> a) -> a -> HashSet e -> a

otoList :: HashSet e -> [Element (HashSet e)]

oall :: (Element (HashSet e) -> Bool) -> HashSet e -> Bool

oany :: (Element (HashSet e) -> Bool) -> HashSet e -> Bool

onull :: HashSet e -> Bool

olength :: HashSet e -> Int

olength64 :: HashSet e -> Int64

ocompareLength :: Integral i => HashSet e -> i -> Ordering

otraverse_ :: Applicative f => (Element (HashSet e) -> f b) -> HashSet e -> f ()

ofor_ :: Applicative f => HashSet e -> (Element (HashSet e) -> f b) -> f ()

omapM_ :: Applicative m => (Element (HashSet e) -> m ()) -> HashSet e -> m ()

oforM_ :: Applicative m => HashSet e -> (Element (HashSet e) -> m ()) -> m ()

ofoldlM :: Monad m => (a -> Element (HashSet e) -> m a) -> a -> HashSet e -> m a

ofoldMap1Ex :: Semigroup m => (Element (HashSet e) -> m) -> HashSet e -> m

ofoldr1Ex :: (Element (HashSet e) -> Element (HashSet e) -> Element (HashSet e)) -> HashSet e -> Element (HashSet e)

ofoldl1Ex' :: (Element (HashSet e) -> Element (HashSet e) -> Element (HashSet e)) -> HashSet e -> Element (HashSet e)

headEx :: HashSet e -> Element (HashSet e)

lastEx :: HashSet e -> Element (HashSet e)

unsafeHead :: HashSet e -> Element (HashSet e)

unsafeLast :: HashSet e -> Element (HashSet e)

maximumByEx :: (Element (HashSet e) -> Element (HashSet e) -> Ordering) -> HashSet e -> Element (HashSet e)

minimumByEx :: (Element (HashSet e) -> Element (HashSet e) -> Ordering) -> HashSet e -> Element (HashSet e)

oelem :: Element (HashSet e) -> HashSet e -> Bool

onotElem :: Element (HashSet e) -> HashSet e -> Bool

Hashable a => MonoPointed (HashSet a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (HashSet a) -> HashSet a

ToMustache ω => ToMustache (HashSet ω) 
Instance details

Defined in Text.Mustache.Internal.Types

type Item (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

type Item (HashSet a) = a
type Element (HashSet e) 
Instance details

Defined in Data.MonoTraversable

type Element (HashSet e) = e

data IntMap a #

Instances

Instances details
FromJSON1 IntMap 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: Maybe a -> (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (IntMap a)

liftParseJSONList :: Maybe a -> (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [IntMap a]

liftOmittedField :: Maybe a -> Maybe (IntMap a)

ToJSON1 IntMap 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> IntMap a -> Value

liftToJSONList :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> [IntMap a] -> Value

liftToEncoding :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> IntMap a -> Encoding

liftToEncodingList :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> [IntMap a] -> Encoding

liftOmitField :: (a -> Bool) -> IntMap a -> Bool

Foldable IntMap 
Instance details

Defined in Data.IntMap.Internal

Methods

fold :: Monoid m => IntMap m -> m #

foldMap :: Monoid m => (a -> m) -> IntMap a -> m #

foldMap' :: Monoid m => (a -> m) -> IntMap a -> m

foldr :: (a -> b -> b) -> b -> IntMap a -> b #

foldr' :: (a -> b -> b) -> b -> IntMap a -> b #

foldl :: (b -> a -> b) -> b -> IntMap a -> b

foldl' :: (b -> a -> b) -> b -> IntMap a -> b #

foldr1 :: (a -> a -> a) -> IntMap a -> a

foldl1 :: (a -> a -> a) -> IntMap a -> a

toList :: IntMap a -> [a] #

null :: IntMap a -> Bool #

length :: IntMap a -> Int #

elem :: Eq a => a -> IntMap a -> Bool #

maximum :: Ord a => IntMap a -> a

minimum :: Ord a => IntMap a -> a

sum :: Num a => IntMap a -> a #

product :: Num a => IntMap a -> a #

Eq1 IntMap 
Instance details

Defined in Data.IntMap.Internal

Methods

liftEq :: (a -> b -> Bool) -> IntMap a -> IntMap b -> Bool

Ord1 IntMap 
Instance details

Defined in Data.IntMap.Internal

Methods

liftCompare :: (a -> b -> Ordering) -> IntMap a -> IntMap b -> Ordering

Read1 IntMap 
Instance details

Defined in Data.IntMap.Internal

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (IntMap a)

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [IntMap a]

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (IntMap a)

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [IntMap a]

Show1 IntMap 
Instance details

Defined in Data.IntMap.Internal

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> IntMap a -> ShowS

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [IntMap a] -> ShowS

Traversable IntMap 
Instance details

Defined in Data.IntMap.Internal

Methods

traverse :: Applicative f => (a -> f b) -> IntMap a -> f (IntMap b) #

sequenceA :: Applicative f => IntMap (f a) -> f (IntMap a) #

mapM :: Monad m => (a -> m b) -> IntMap a -> m (IntMap b) #

sequence :: Monad m => IntMap (m a) -> m (IntMap a) #

Functor IntMap 
Instance details

Defined in Data.IntMap.Internal

Methods

fmap :: (a -> b) -> IntMap a -> IntMap b #

(<$) :: a -> IntMap b -> IntMap a #

Hashable1 IntMap 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> IntMap a -> Int

Lift a => Lift (IntMap a :: Type) 
Instance details

Defined in Data.IntMap.Internal

Methods

lift :: Quote m => IntMap a -> m Exp

liftTyped :: forall (m :: Type -> Type). Quote m => IntMap a -> Code m (IntMap a)

Structured v => Structured (IntMap v) 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy (IntMap v) -> Structure

structureHash' :: Tagged (IntMap v) MD5

FromJSON a => FromJSON (IntMap a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (IntMap a)

parseJSONList :: Value -> Parser [IntMap a]

omittedField :: Maybe (IntMap a)

ToJSON a => ToJSON (IntMap a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: IntMap a -> Value

toEncoding :: IntMap a -> Encoding

toJSONList :: [IntMap a] -> Value

toEncodingList :: [IntMap a] -> Encoding

omitField :: IntMap a -> Bool

Data a => Data (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IntMap a -> c (IntMap a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (IntMap a) #

toConstr :: IntMap a -> Constr #

dataTypeOf :: IntMap a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (IntMap a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (IntMap a)) #

gmapT :: (forall b. Data b => b -> b) -> IntMap a -> IntMap a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IntMap a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IntMap a -> r #

gmapQ :: (forall d. Data d => d -> u) -> IntMap a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IntMap a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IntMap a -> m (IntMap a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IntMap a -> m (IntMap a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IntMap a -> m (IntMap a) #

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 #

Semigroup (IntMap a) 
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

IsList (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Associated Types

type Item (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

type Item (IntMap a) = (Key, a)

Methods

fromList :: [Item (IntMap a)] -> IntMap a

fromListN :: Int -> [Item (IntMap a)] -> IntMap a

toList :: IntMap a -> [Item (IntMap a)]

Read e => Read (IntMap e) 
Instance details

Defined in Data.IntMap.Internal

Methods

readsPrec :: Int -> ReadS (IntMap e)

readList :: ReadS [IntMap e]

readPrec :: ReadPrec (IntMap e)

readListPrec :: ReadPrec [IntMap e]

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

Binary e => Binary (IntMap e) 
Instance details

Defined in Data.Binary.Class

Methods

put :: IntMap e -> Put

get :: Get (IntMap e)

putList :: [IntMap e] -> Put

NFData a => NFData (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

rnf :: IntMap a -> () #

Eq a => Eq (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

(==) :: IntMap a -> IntMap a -> Bool #

(/=) :: IntMap a -> IntMap a -> Bool #

Ord a => Ord (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

compare :: IntMap a -> IntMap a -> Ordering #

(<) :: IntMap a -> IntMap a -> Bool #

(<=) :: IntMap a -> IntMap a -> Bool #

(>) :: IntMap a -> IntMap a -> Bool #

(>=) :: IntMap a -> IntMap a -> Bool #

max :: IntMap a -> IntMap a -> IntMap a #

min :: IntMap a -> IntMap a -> IntMap a #

Hashable v => Hashable (IntMap v) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> IntMap v -> Int

hash :: IntMap v -> Int

GrowingAppend (IntMap v) 
Instance details

Defined in Data.MonoTraversable

MonoFoldable (IntMap a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (IntMap a) -> m) -> IntMap a -> m

ofoldr :: (Element (IntMap a) -> b -> b) -> b -> IntMap a -> b

ofoldl' :: (a0 -> Element (IntMap a) -> a0) -> a0 -> IntMap a -> a0

otoList :: IntMap a -> [Element (IntMap a)]

oall :: (Element (IntMap a) -> Bool) -> IntMap a -> Bool

oany :: (Element (IntMap a) -> Bool) -> IntMap a -> Bool

onull :: IntMap a -> Bool

olength :: IntMap a -> Int

olength64 :: IntMap a -> Int64

ocompareLength :: Integral i => IntMap a -> i -> Ordering

otraverse_ :: Applicative f => (Element (IntMap a) -> f b) -> IntMap a -> f ()

ofor_ :: Applicative f => IntMap a -> (Element (IntMap a) -> f b) -> f ()

omapM_ :: Applicative m => (Element (IntMap a) -> m ()) -> IntMap a -> m ()

oforM_ :: Applicative m => IntMap a -> (Element (IntMap a) -> m ()) -> m ()

ofoldlM :: Monad m => (a0 -> Element (IntMap a) -> m a0) -> a0 -> IntMap a -> m a0

ofoldMap1Ex :: Semigroup m => (Element (IntMap a) -> m) -> IntMap a -> m

ofoldr1Ex :: (Element (IntMap a) -> Element (IntMap a) -> Element (IntMap a)) -> IntMap a -> Element (IntMap a)

ofoldl1Ex' :: (Element (IntMap a) -> Element (IntMap a) -> Element (IntMap a)) -> IntMap a -> Element (IntMap a)

headEx :: IntMap a -> Element (IntMap a)

lastEx :: IntMap a -> Element (IntMap a)

unsafeHead :: IntMap a -> Element (IntMap a)

unsafeLast :: IntMap a -> Element (IntMap a)

maximumByEx :: (Element (IntMap a) -> Element (IntMap a) -> Ordering) -> IntMap a -> Element (IntMap a)

minimumByEx :: (Element (IntMap a) -> Element (IntMap a) -> Ordering) -> IntMap a -> Element (IntMap a)

oelem :: Element (IntMap a) -> IntMap a -> Bool

onotElem :: Element (IntMap a) -> IntMap a -> Bool

MonoFunctor (IntMap a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (IntMap a) -> Element (IntMap a)) -> IntMap a -> IntMap a

MonoTraversable (IntMap a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (IntMap a) -> f (Element (IntMap a))) -> IntMap a -> f (IntMap a)

omapM :: Applicative m => (Element (IntMap a) -> m (Element (IntMap a))) -> IntMap a -> m (IntMap a)

PersistField v => PersistField (IntMap v) 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: IntMap v -> PersistValue

fromPersistValue :: PersistValue -> Either Text (IntMap v)

PersistFieldSql v => PersistFieldSql (IntMap v) 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy (IntMap v) -> SqlType

type Item (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

type Item (IntMap a) = (Key, a)
type Element (IntMap a) 
Instance details

Defined in Data.MonoTraversable

type Element (IntMap a) = a

data Conc (m :: Type -> Type) a #

Instances

Instances details
MonadUnliftIO m => Alternative (Conc m) 
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 => Applicative (Conc m) 
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 #

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 #

(Monoid a, MonadUnliftIO m) => Monoid (Conc m a) 
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 #

(MonadUnliftIO m, Semigroup a) => Semigroup (Conc m a) 
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

class (forall (m :: Type -> Type). Monad m => Monad (t m)) => MonadTrans (t :: (Type -> Type) -> Type -> Type) where #

Methods

lift :: Monad m => m a -> t m a #

Instances

Instances details
MonadTrans CatchT 
Instance details

Defined in Control.Monad.Catch.Pure

Methods

lift :: Monad m => m a -> CatchT m a #

MonadTrans LoggingT 
Instance details

Defined in Control.Monad.Logger

Methods

lift :: Monad m => m a -> LoggingT m a #

MonadTrans NoLoggingT 
Instance details

Defined in Control.Monad.Logger

Methods

lift :: Monad m => m a -> NoLoggingT m a #

MonadTrans WriterLoggingT 
Instance details

Defined in Control.Monad.Logger

Methods

lift :: Monad m => m a -> WriterLoggingT m a #

MonadTrans ListT 
Instance details

Defined in Options.Applicative.Internal

Methods

lift :: Monad m => m a -> ListT m a #

MonadTrans NondetT 
Instance details

Defined in Options.Applicative.Internal

Methods

lift :: Monad m => m a -> NondetT m a #

MonadTrans ResourceT 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

lift :: Monad m => m a -> ResourceT m a #

MonadTrans MaybeT 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

lift :: Monad m => m a -> MaybeT m a #

Monoid w => MonadTrans (AccumT w) 
Instance details

Defined in Control.Monad.Trans.Accum

Methods

lift :: Monad m => m a -> AccumT w m a #

MonadTrans (ExceptT e) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

lift :: Monad m => m a -> ExceptT e m a #

MonadTrans (IdentityT :: (Type -> Type) -> Type -> Type) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

lift :: Monad m => m a -> IdentityT m a #

MonadTrans (ReaderT r) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

lift :: Monad m => m a -> ReaderT r m a #

MonadTrans (SelectT r) 
Instance details

Defined in Control.Monad.Trans.Select

Methods

lift :: Monad m => m a -> SelectT r m a #

MonadTrans (StateT s) 
Instance details

Defined in Control.Monad.Trans.State.Lazy

Methods

lift :: Monad m => m a -> StateT s m a #

MonadTrans (StateT s) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

lift :: Monad m => m a -> StateT s m a #

MonadTrans (WriterT w) 
Instance details

Defined in Control.Monad.Trans.Writer.CPS

Methods

lift :: Monad m => m a -> WriterT w m a #

Monoid w => MonadTrans (WriterT w) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

lift :: Monad m => m a -> WriterT w m a #

Monoid w => MonadTrans (WriterT w) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

lift :: Monad m => m a -> WriterT w m a #

MonadTrans (ConduitT i o) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

lift :: Monad m => m a -> ConduitT i o m a #

MonadTrans (ContT r) 
Instance details

Defined in Control.Monad.Trans.Cont

Methods

lift :: Monad m => m a -> ContT r m a #

MonadTrans (RWST r w s) 
Instance details

Defined in Control.Monad.Trans.RWS.CPS

Methods

lift :: Monad m => m a -> RWST r w s m a #

Monoid w => MonadTrans (RWST r w s) 
Instance details

Defined in Control.Monad.Trans.RWS.Lazy

Methods

lift :: Monad m => m a -> RWST r w s m a #

Monoid w => MonadTrans (RWST r w s) 
Instance details

Defined in Control.Monad.Trans.RWS.Strict

Methods

lift :: Monad m => m a -> RWST r w s m a #

MonadTrans (Pipe l i o u) 
Instance details

Defined in Data.Conduit.Internal.Pipe

Methods

lift :: Monad m => m a -> Pipe l i o u m a #

type Lens s t a b = forall (f :: Type -> Type). Functor f => (a -> f b) -> s -> f t #

data Seq a #

Instances

Instances details
FromJSON1 Seq 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: Maybe a -> (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (Seq a)

liftParseJSONList :: Maybe a -> (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [Seq a]

liftOmittedField :: Maybe a -> Maybe (Seq a)

ToJSON1 Seq 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> Seq a -> Value

liftToJSONList :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> [Seq a] -> Value

liftToEncoding :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> Seq a -> Encoding

liftToEncodingList :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> [Seq a] -> Encoding

liftOmitField :: (a -> Bool) -> Seq a -> Bool

MonadFix Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

mfix :: (a -> Seq a) -> Seq a

MonadZip Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

mzip :: Seq a -> Seq b -> Seq (a, b)

mzipWith :: (a -> b -> c) -> Seq a -> Seq b -> Seq c

munzip :: Seq (a, b) -> (Seq a, Seq b)

Foldable Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

fold :: Monoid m => Seq m -> m #

foldMap :: Monoid m => (a -> m) -> Seq a -> m #

foldMap' :: Monoid m => (a -> m) -> Seq a -> m

foldr :: (a -> b -> b) -> b -> Seq a -> b #

foldr' :: (a -> b -> b) -> b -> Seq a -> b #

foldl :: (b -> a -> b) -> b -> Seq a -> b

foldl' :: (b -> a -> b) -> b -> Seq a -> b #

foldr1 :: (a -> a -> a) -> Seq a -> a

foldl1 :: (a -> a -> a) -> Seq a -> a

toList :: Seq a -> [a] #

null :: Seq a -> Bool #

length :: Seq a -> Int #

elem :: Eq a => a -> Seq a -> Bool #

maximum :: Ord a => Seq a -> a

minimum :: Ord a => Seq a -> a

sum :: Num a => Seq a -> a #

product :: Num a => Seq a -> a #

Eq1 Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

liftEq :: (a -> b -> Bool) -> Seq a -> Seq b -> Bool

Ord1 Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

liftCompare :: (a -> b -> Ordering) -> Seq a -> Seq b -> Ordering

Read1 Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (Seq a)

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [Seq a]

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (Seq a)

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [Seq a]

Show1 Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Seq a -> ShowS

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Seq a] -> ShowS

Traversable Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

traverse :: Applicative f => (a -> f b) -> Seq a -> f (Seq b) #

sequenceA :: Applicative f => Seq (f a) -> f (Seq a) #

mapM :: Monad m => (a -> m b) -> Seq a -> m (Seq b) #

sequence :: Monad m => Seq (m a) -> m (Seq a) #

Alternative Seq 
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] #

Applicative Seq 
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 #

Functor Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

fmap :: (a -> b) -> Seq a -> Seq b #

(<$) :: a -> Seq b -> Seq 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 #

MonadPlus Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

mzero :: Seq a #

mplus :: Seq a -> Seq a -> Seq a #

UnzipWith Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

unzipWith' :: (x -> (a, b)) -> Seq x -> (Seq a, Seq b)

Hashable1 Seq 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> Seq a -> Int

Lift a => Lift (Seq a :: Type) 
Instance details

Defined in Data.Sequence.Internal

Methods

lift :: Quote m => Seq a -> m Exp

liftTyped :: forall (m :: Type -> Type). Quote m => Seq a -> Code m (Seq a)

Structured v => Structured (Seq v) 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy (Seq v) -> Structure

structureHash' :: Tagged (Seq v) MD5

FromJSON a => FromJSON (Seq a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Seq a)

parseJSONList :: Value -> Parser [Seq a]

omittedField :: Maybe (Seq a)

ToJSON a => ToJSON (Seq a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Seq a -> Value

toEncoding :: Seq a -> Encoding

toJSONList :: [Seq a] -> Value

toEncodingList :: [Seq a] -> Encoding

omitField :: Seq a -> Bool

Data a => Data (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Seq a -> c (Seq a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Seq a) #

toConstr :: Seq a -> Constr #

dataTypeOf :: Seq a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Seq a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Seq a)) #

gmapT :: (forall b. Data b => b -> b) -> Seq a -> Seq a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Seq a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Seq a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Seq a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Seq a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Seq a -> m (Seq a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Seq a -> m (Seq a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Seq a -> m (Seq a) #

a ~ Char => IsString (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

fromString :: String -> Seq 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 #

Semigroup (Seq a) 
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

IsList (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Associated Types

type Item (Seq a) 
Instance details

Defined in Data.Sequence.Internal

type Item (Seq a) = a

Methods

fromList :: [Item (Seq a)] -> Seq a

fromListN :: Int -> [Item (Seq a)] -> Seq a

toList :: Seq a -> [Item (Seq a)]

Read a => Read (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

readsPrec :: Int -> ReadS (Seq a)

readList :: ReadS [Seq a]

readPrec :: ReadPrec (Seq a)

readListPrec :: ReadPrec [Seq a]

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

Binary e => Binary (Seq e) 
Instance details

Defined in Data.Binary.Class

Methods

put :: Seq e -> Put

get :: Get (Seq e)

putList :: [Seq e] -> Put

NFData a => NFData (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

rnf :: Seq a -> () #

Eq a => Eq (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

(==) :: Seq a -> Seq a -> Bool #

(/=) :: Seq a -> Seq a -> Bool #

Ord a => Ord (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

compare :: Seq a -> Seq a -> Ordering #

(<) :: Seq a -> Seq a -> Bool #

(<=) :: Seq a -> Seq a -> Bool #

(>) :: Seq a -> Seq a -> Bool #

(>=) :: Seq a -> Seq a -> Bool #

max :: Seq a -> Seq a -> Seq a #

min :: Seq a -> Seq a -> Seq a #

Hashable v => Hashable (Seq v) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Seq v -> Int

hash :: Seq v -> Int

GrowingAppend (Seq a) 
Instance details

Defined in Data.MonoTraversable

MonoFoldable (Seq a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (Seq a) -> m) -> Seq a -> m

ofoldr :: (Element (Seq a) -> b -> b) -> b -> Seq a -> b

ofoldl' :: (a0 -> Element (Seq a) -> a0) -> a0 -> Seq a -> a0

otoList :: Seq a -> [Element (Seq a)]

oall :: (Element (Seq a) -> Bool) -> Seq a -> Bool

oany :: (Element (Seq a) -> Bool) -> Seq a -> Bool

onull :: Seq a -> Bool

olength :: Seq a -> Int

olength64 :: Seq a -> Int64

ocompareLength :: Integral i => Seq a -> i -> Ordering

otraverse_ :: Applicative f => (Element (Seq a) -> f b) -> Seq a -> f ()

ofor_ :: Applicative f => Seq a -> (Element (Seq a) -> f b) -> f ()

omapM_ :: Applicative m => (Element (Seq a) -> m ()) -> Seq a -> m ()

oforM_ :: Applicative m => Seq a -> (Element (Seq a) -> m ()) -> m ()

ofoldlM :: Monad m => (a0 -> Element (Seq a) -> m a0) -> a0 -> Seq a -> m a0

ofoldMap1Ex :: Semigroup m => (Element (Seq a) -> m) -> Seq a -> m

ofoldr1Ex :: (Element (Seq a) -> Element (Seq a) -> Element (Seq a)) -> Seq a -> Element (Seq a)

ofoldl1Ex' :: (Element (Seq a) -> Element (Seq a) -> Element (Seq a)) -> Seq a -> Element (Seq a)

headEx :: Seq a -> Element (Seq a)

lastEx :: Seq a -> Element (Seq a)

unsafeHead :: Seq a -> Element (Seq a)

unsafeLast :: Seq a -> Element (Seq a)

maximumByEx :: (Element (Seq a) -> Element (Seq a) -> Ordering) -> Seq a -> Element (Seq a)

minimumByEx :: (Element (Seq a) -> Element (Seq a) -> Ordering) -> Seq a -> Element (Seq a)

oelem :: Element (Seq a) -> Seq a -> Bool

onotElem :: Element (Seq a) -> Seq a -> Bool

MonoFunctor (Seq a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Seq a) -> Element (Seq a)) -> Seq a -> Seq a

MonoPointed (Seq a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Seq a) -> Seq a

MonoTraversable (Seq a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (Seq a) -> f (Element (Seq a))) -> Seq a -> f (Seq a)

omapM :: Applicative m => (Element (Seq a) -> m (Element (Seq a))) -> Seq a -> m (Seq a)

IsSequence (Seq a) 
Instance details

Defined in Data.Sequences

Methods

fromList :: [Element (Seq a)] -> Seq a

lengthIndex :: Seq a -> Index (Seq a)

break :: (Element (Seq a) -> Bool) -> Seq a -> (Seq a, Seq a)

span :: (Element (Seq a) -> Bool) -> Seq a -> (Seq a, Seq a)

dropWhile :: (Element (Seq a) -> Bool) -> Seq a -> Seq a

takeWhile :: (Element (Seq a) -> Bool) -> Seq a -> Seq a

splitAt :: Index (Seq a) -> Seq a -> (Seq a, Seq a)

unsafeSplitAt :: Index (Seq a) -> Seq a -> (Seq a, Seq a)

take :: Index (Seq a) -> Seq a -> Seq a

unsafeTake :: Index (Seq a) -> Seq a -> Seq a

drop :: Index (Seq a) -> Seq a -> Seq a

unsafeDrop :: Index (Seq a) -> Seq a -> Seq a

dropEnd :: Index (Seq a) -> Seq a -> Seq a

partition :: (Element (Seq a) -> Bool) -> Seq a -> (Seq a, Seq a)

uncons :: Seq a -> Maybe (Element (Seq a), Seq a)

unsnoc :: Seq a -> Maybe (Seq a, Element (Seq a))

filter :: (Element (Seq a) -> Bool) -> Seq a -> Seq a

filterM :: Monad m => (Element (Seq a) -> m Bool) -> Seq a -> m (Seq a)

replicate :: Index (Seq a) -> Element (Seq a) -> Seq a

replicateM :: Monad m => Index (Seq a) -> m (Element (Seq a)) -> m (Seq a)

groupBy :: (Element (Seq a) -> Element (Seq a) -> Bool) -> Seq a -> [Seq a]

groupAllOn :: Eq b => (Element (Seq a) -> b) -> Seq a -> [Seq a]

subsequences :: Seq a -> [Seq a]

permutations :: Seq a -> [Seq a]

tailEx :: Seq a -> Seq a

tailMay :: Seq a -> Maybe (Seq a)

initEx :: Seq a -> Seq a

initMay :: Seq a -> Maybe (Seq a)

unsafeTail :: Seq a -> Seq a

unsafeInit :: Seq a -> Seq a

index :: Seq a -> Index (Seq a) -> Maybe (Element (Seq a))

indexEx :: Seq a -> Index (Seq a) -> Element (Seq a)

unsafeIndex :: Seq a -> Index (Seq a) -> Element (Seq a)

splitWhen :: (Element (Seq a) -> Bool) -> Seq a -> [Seq a]

tails :: Seq a -> [Seq a]

inits :: Seq a -> [Seq a]

initTails :: Seq a -> [(Seq a, Seq a)]

SemiSequence (Seq a) 
Instance details

Defined in Data.Sequences

Associated Types

type Index (Seq a) 
Instance details

Defined in Data.Sequences

type Index (Seq a) = Int

Methods

intersperse :: Element (Seq a) -> Seq a -> Seq a

reverse :: Seq a -> Seq a

find :: (Element (Seq a) -> Bool) -> Seq a -> Maybe (Element (Seq a))

sortBy :: (Element (Seq a) -> Element (Seq a) -> Ordering) -> Seq a -> Seq a

cons :: Element (Seq a) -> Seq a -> Seq a

snoc :: Seq a -> Element (Seq a) -> Seq a

ToMustache ω => ToMustache (Seq ω) 
Instance details

Defined in Text.Mustache.Internal.Types

Methods

toMustache :: Seq ω -> Value Source #

listToMustache :: [Seq ω] -> Value

type Item (Seq a) 
Instance details

Defined in Data.Sequence.Internal

type Item (Seq a) = a
type Element (Seq a) 
Instance details

Defined in Data.MonoTraversable

type Element (Seq a) = a
type Index (Seq a) 
Instance details

Defined in Data.Sequences

type Index (Seq a) = Int

data Vector a #

Instances

Instances details
FromJSON1 Vector 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: Maybe a -> (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (Vector a)

liftParseJSONList :: Maybe a -> (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [Vector a]

liftOmittedField :: Maybe a -> Maybe (Vector a)

ToJSON1 Vector 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> Vector a -> Value

liftToJSONList :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> [Vector a] -> Value

liftToEncoding :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> Vector a -> Encoding

liftToEncodingList :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> [Vector a] -> Encoding

liftOmitField :: (a -> Bool) -> Vector a -> Bool

MonadFail Vector 
Instance details

Defined in Data.Vector

Methods

fail :: String -> Vector a #

MonadFix Vector 
Instance details

Defined in Data.Vector

Methods

mfix :: (a -> Vector a) -> Vector a

MonadZip Vector 
Instance details

Defined in Data.Vector

Methods

mzip :: Vector a -> Vector b -> Vector (a, b)

mzipWith :: (a -> b -> c) -> Vector a -> Vector b -> Vector c

munzip :: Vector (a, b) -> (Vector a, Vector b)

Foldable Vector 
Instance details

Defined in Data.Vector

Methods

fold :: Monoid m => Vector m -> m #

foldMap :: Monoid m => (a -> m) -> Vector a -> m #

foldMap' :: Monoid m => (a -> m) -> Vector a -> m

foldr :: (a -> b -> b) -> b -> Vector a -> b #

foldr' :: (a -> b -> b) -> b -> Vector a -> b #

foldl :: (b -> a -> b) -> b -> Vector a -> b

foldl' :: (b -> a -> b) -> b -> Vector a -> b #

foldr1 :: (a -> a -> a) -> Vector a -> a

foldl1 :: (a -> a -> a) -> Vector a -> a

toList :: Vector a -> [a] #

null :: Vector a -> Bool #

length :: Vector a -> Int #

elem :: Eq a => a -> Vector a -> Bool #

maximum :: Ord a => Vector a -> a

minimum :: Ord a => Vector a -> a

sum :: Num a => Vector a -> a #

product :: Num a => Vector a -> a #

Eq1 Vector 
Instance details

Defined in Data.Vector

Methods

liftEq :: (a -> b -> Bool) -> Vector a -> Vector b -> Bool

Ord1 Vector 
Instance details

Defined in Data.Vector

Methods

liftCompare :: (a -> b -> Ordering) -> Vector a -> Vector b -> Ordering

Read1 Vector 
Instance details

Defined in Data.Vector

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (Vector a)

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [Vector a]

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (Vector a)

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [Vector a]

Show1 Vector 
Instance details

Defined in Data.Vector

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Vector a -> ShowS

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Vector a] -> ShowS

Traversable Vector 
Instance details

Defined in Data.Vector

Methods

traverse :: Applicative f => (a -> f b) -> Vector a -> f (Vector b) #

sequenceA :: Applicative f => Vector (f a) -> f (Vector a) #

mapM :: Monad m => (a -> m b) -> Vector a -> m (Vector b) #

sequence :: Monad m => Vector (m a) -> m (Vector a) #

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] #

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 #

Functor Vector 
Instance details

Defined in Data.Vector

Methods

fmap :: (a -> b) -> Vector a -> Vector b #

(<$) :: a -> Vector b -> Vector 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 #

MonadPlus Vector 
Instance details

Defined in Data.Vector

Methods

mzero :: Vector a #

mplus :: Vector a -> Vector a -> Vector a #

NFData1 Vector 
Instance details

Defined in Data.Vector

Methods

liftRnf :: (a -> ()) -> Vector a -> ()

Vector Vector a 
Instance details

Defined in Data.Vector

Methods

basicUnsafeFreeze :: Mutable Vector s a -> ST s (Vector a)

basicUnsafeThaw :: Vector a -> ST s (Mutable Vector s a)

basicLength :: Vector a -> Int

basicUnsafeSlice :: Int -> Int -> Vector a -> Vector a

basicUnsafeIndexM :: Vector a -> Int -> Box a

basicUnsafeCopy :: Mutable Vector s a -> Vector a -> ST s ()

elemseq :: Vector a -> a -> b -> b

FromJSON a => FromJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Vector a)

parseJSONList :: Value -> Parser [Vector a]

omittedField :: Maybe (Vector a)

ToJSON a => ToJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Vector a -> Value

toEncoding :: Vector a -> Encoding

toJSONList :: [Vector a] -> Value

toEncodingList :: [Vector a] -> Encoding

omitField :: Vector a -> Bool

Data a => Data (Vector a) 
Instance details

Defined in Data.Vector

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Vector a -> c (Vector a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Vector a) #

toConstr :: Vector a -> Constr #

dataTypeOf :: Vector a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Vector a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Vector a)) #

gmapT :: (forall b. Data b => b -> b) -> Vector a -> Vector a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Vector a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Vector a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Vector a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Vector a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Vector a -> m (Vector a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Vector a -> m (Vector a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Vector a -> m (Vector 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 #

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

IsList (Vector a) 
Instance details

Defined in Data.Vector

Associated Types

type Item (Vector a) 
Instance details

Defined in Data.Vector

type Item (Vector a) = a

Methods

fromList :: [Item (Vector a)] -> Vector a

fromListN :: Int -> [Item (Vector a)] -> Vector a

toList :: Vector a -> [Item (Vector a)]

Read a => Read (Vector a) 
Instance details

Defined in Data.Vector

Methods

readsPrec :: Int -> ReadS (Vector a)

readList :: ReadS [Vector a]

readPrec :: ReadPrec (Vector a)

readListPrec :: ReadPrec [Vector a]

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

NFData a => NFData (Vector a) 
Instance details

Defined in Data.Vector

Methods

rnf :: Vector a -> () #

Eq a => Eq (Vector a) 
Instance details

Defined in Data.Vector

Methods

(==) :: Vector a -> Vector a -> Bool #

(/=) :: Vector a -> Vector a -> Bool #

Ord a => Ord (Vector a) 
Instance details

Defined in Data.Vector

Methods

compare :: Vector a -> Vector a -> Ordering #

(<) :: Vector a -> Vector a -> Bool #

(<=) :: Vector a -> Vector a -> Bool #

(>) :: Vector a -> Vector a -> Bool #

(>=) :: Vector a -> Vector a -> Bool #

max :: Vector a -> Vector a -> Vector a #

min :: Vector a -> Vector a -> Vector a #

GrowingAppend (Vector a) 
Instance details

Defined in Data.MonoTraversable

MonoFoldable (Vector a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (Vector a) -> m) -> Vector a -> m

ofoldr :: (Element (Vector a) -> b -> b) -> b -> Vector a -> b

ofoldl' :: (a0 -> Element (Vector a) -> a0) -> a0 -> Vector a -> a0

otoList :: Vector a -> [Element (Vector a)]

oall :: (Element (Vector a) -> Bool) -> Vector a -> Bool

oany :: (Element (Vector a) -> Bool) -> Vector a -> Bool

onull :: Vector a -> Bool

olength :: Vector a -> Int

olength64 :: Vector a -> Int64

ocompareLength :: Integral i => Vector a -> i -> Ordering

otraverse_ :: Applicative f => (Element (Vector a) -> f b) -> Vector a -> f ()

ofor_ :: Applicative f => Vector a -> (Element (Vector a) -> f b) -> f ()

omapM_ :: Applicative m => (Element (Vector a) -> m ()) -> Vector a -> m ()

oforM_ :: Applicative m => Vector a -> (Element (Vector a) -> m ()) -> m ()

ofoldlM :: Monad m => (a0 -> Element (Vector a) -> m a0) -> a0 -> Vector a -> m a0

ofoldMap1Ex :: Semigroup m => (Element (Vector a) -> m) -> Vector a -> m

ofoldr1Ex :: (Element (Vector a) -> Element (Vector a) -> Element (Vector a)) -> Vector a -> Element (Vector a)

ofoldl1Ex' :: (Element (Vector a) -> Element (Vector a) -> Element (Vector a)) -> Vector a -> Element (Vector a)

headEx :: Vector a -> Element (Vector a)

lastEx :: Vector a -> Element (Vector a)

unsafeHead :: Vector a -> Element (Vector a)

unsafeLast :: Vector a -> Element (Vector a)

maximumByEx :: (Element (Vector a) -> Element (Vector a) -> Ordering) -> Vector a -> Element (Vector a)

minimumByEx :: (Element (Vector a) -> Element (Vector a) -> Ordering) -> Vector a -> Element (Vector a)

oelem :: Element (Vector a) -> Vector a -> Bool

onotElem :: Element (Vector a) -> Vector a -> Bool

MonoFunctor (Vector a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Vector a) -> Element (Vector a)) -> Vector a -> Vector a

MonoPointed (Vector a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Vector a) -> Vector a

MonoTraversable (Vector a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (Vector a) -> f (Element (Vector a))) -> Vector a -> f (Vector a)

omapM :: Applicative m => (Element (Vector a) -> m (Element (Vector a))) -> Vector a -> m (Vector a)

IsSequence (Vector a) 
Instance details

Defined in Data.Sequences

Methods

fromList :: [Element (Vector a)] -> Vector a

lengthIndex :: Vector a -> Index (Vector a)

break :: (Element (Vector a) -> Bool) -> Vector a -> (Vector a, Vector a)

span :: (Element (Vector a) -> Bool) -> Vector a -> (Vector a, Vector a)

dropWhile :: (Element (Vector a) -> Bool) -> Vector a -> Vector a

takeWhile :: (Element (Vector a) -> Bool) -> Vector a -> Vector a

splitAt :: Index (Vector a) -> Vector a -> (Vector a, Vector a)

unsafeSplitAt :: Index (Vector a) -> Vector a -> (Vector a, Vector a)

take :: Index (Vector a) -> Vector a -> Vector a

unsafeTake :: Index (Vector a) -> Vector a -> Vector a

drop :: Index (Vector a) -> Vector a -> Vector a

unsafeDrop :: Index (Vector a) -> Vector a -> Vector a

dropEnd :: Index (Vector a) -> Vector a -> Vector a

partition :: (Element (Vector a) -> Bool) -> Vector a -> (Vector a, Vector a)

uncons :: Vector a -> Maybe (Element (Vector a), Vector a)

unsnoc :: Vector a -> Maybe (Vector a, Element (Vector a))

filter :: (Element (Vector a) -> Bool) -> Vector a -> Vector a

filterM :: Monad m => (Element (Vector a) -> m Bool) -> Vector a -> m (Vector a)

replicate :: Index (Vector a) -> Element (Vector a) -> Vector a

replicateM :: Monad m => Index (Vector a) -> m (Element (Vector a)) -> m (Vector a)

groupBy :: (Element (Vector a) -> Element (Vector a) -> Bool) -> Vector a -> [Vector a]

groupAllOn :: Eq b => (Element (Vector a) -> b) -> Vector a -> [Vector a]

subsequences :: Vector a -> [Vector a]

permutations :: Vector a -> [Vector a]

tailEx :: Vector a -> Vector a

tailMay :: Vector a -> Maybe (Vector a)

initEx :: Vector a -> Vector a

initMay :: Vector a -> Maybe (Vector a)

unsafeTail :: Vector a -> Vector a

unsafeInit :: Vector a -> Vector a

index :: Vector a -> Index (Vector a) -> Maybe (Element (Vector a))

indexEx :: Vector a -> Index (Vector a) -> Element (Vector a)

unsafeIndex :: Vector a -> Index (Vector a) -> Element (Vector a)

splitWhen :: (Element (Vector a) -> Bool) -> Vector a -> [Vector a]

tails :: Vector a -> [Vector a]

inits :: Vector a -> [Vector a]

initTails :: Vector a -> [(Vector a, Vector a)]

SemiSequence (Vector a) 
Instance details

Defined in Data.Sequences

Associated Types

type Index (Vector a) 
Instance details

Defined in Data.Sequences

type Index (Vector a) = Int

Methods

intersperse :: Element (Vector a) -> Vector a -> Vector a

reverse :: Vector a -> Vector a

find :: (Element (Vector a) -> Bool) -> Vector a -> Maybe (Element (Vector a))

sortBy :: (Element (Vector a) -> Element (Vector a) -> Ordering) -> Vector a -> Vector a

cons :: Element (Vector a) -> Vector a -> Vector a

snoc :: Vector a -> Element (Vector a) -> Vector a

ToMustache ω => ToMustache (Vector ω) 
Instance details

Defined in Text.Mustache.Internal.Types

PersistField a => PersistField (Vector a) 
Instance details

Defined in Database.Persist.Class.PersistField

Methods

toPersistValue :: Vector a -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Vector a)

PersistFieldSql a => PersistFieldSql (Vector a) 
Instance details

Defined in Database.Persist.Sql.Class

Methods

sqlType :: Proxy (Vector a) -> SqlType

type Mutable Vector 
Instance details

Defined in Data.Vector

type Mutable Vector = MVector
type Item (Vector a) 
Instance details

Defined in Data.Vector

type Item (Vector a) = a
type Element (Vector a) 
Instance details

Defined in Data.MonoTraversable

type Element (Vector a) = a
type Index (Vector a) 
Instance details

Defined in Data.Sequences

type Index (Vector a) = Int

runConduit :: Monad m => ConduitT () Void m r -> m r #

data Rel #

Instances

Instances details
Data Rel 
Instance details

Defined in Path.Posix

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Rel -> c Rel #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Rel #

toConstr :: Rel -> Constr #

dataTypeOf :: Rel -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Rel) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Rel) #

gmapT :: (forall b. Data b => b -> b) -> Rel -> Rel #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Rel -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Rel -> r #

gmapQ :: (forall d. Data d => d -> u) -> Rel -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Rel -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Rel -> m Rel #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Rel -> m Rel #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Rel -> m Rel #

NFData (PrecompiledCache Rel) Source # 
Instance details

Defined in Stack.Types.Build

Methods

rnf :: PrecompiledCache Rel -> () #

FromJSON (Path Rel Dir) 
Instance details

Defined in Path.Posix

Methods

parseJSON :: Value -> Parser (Path Rel Dir)

parseJSONList :: Value -> Parser [Path Rel Dir]

omittedField :: Maybe (Path Rel Dir)

FromJSON (Path Rel File) 
Instance details

Defined in Path.Posix

FromJSONKey (Path Rel Dir) 
Instance details

Defined in Path.Posix

Methods

fromJSONKey :: FromJSONKeyFunction (Path Rel Dir)

fromJSONKeyList :: FromJSONKeyFunction [Path Rel Dir]

FromJSONKey (Path Rel File) 
Instance details

Defined in Path.Posix

Methods

fromJSONKey :: FromJSONKeyFunction (Path Rel File)

fromJSONKeyList :: FromJSONKeyFunction [Path Rel File]

class Eq a => Hashable a #

Instances

Instances details
Hashable Key 
Instance details

Defined in Data.Aeson.Key

Methods

hashWithSalt :: Int -> Key -> Int

hash :: Key -> Int

Hashable Value 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

hashWithSalt :: Int -> Value -> Int

hash :: Value -> Int

Hashable ByteArray 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> ByteArray -> Int

hash :: ByteArray -> Int

Hashable SomeTypeRep 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> SomeTypeRep -> Int

hash :: SomeTypeRep -> Int

Hashable Unique 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Unique -> Int

hash :: Unique -> Int

Hashable Version 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Version -> Int

hash :: Version -> Int

Hashable IntPtr 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> IntPtr -> Int

hash :: IntPtr -> Int

Hashable WordPtr 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> WordPtr -> Int

hash :: WordPtr -> Int

Hashable Void 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Void -> Int

hash :: Void -> Int

Hashable ThreadId 
Instance details

Defined in Data.Hashable.Class

Hashable Fingerprint 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Fingerprint -> Int

hash :: Fingerprint -> Int

Hashable Int16 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int16 -> Int

hash :: Int16 -> Int

Hashable Int32 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int32 -> Int

hash :: Int32 -> Int

Hashable Int64 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int64 -> Int

hash :: Int64 -> Int

Hashable Int8 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int8 -> Int

hash :: Int8 -> Int

Hashable Word16 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word16 -> Int

hash :: Word16 -> Int

Hashable Word32 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word32 -> Int

hash :: Word32 -> Int

Hashable Word64 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word64 -> Int

hash :: Word64 -> Int

Hashable Word8 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word8 -> Int

hash :: Word8 -> Int

Hashable ByteString 
Instance details

Defined in Data.Hashable.Class

Hashable ByteString 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> ByteString -> Int

hash :: ByteString -> Int

Hashable ShortByteString 
Instance details

Defined in Data.Hashable.Class

Hashable IntSet 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> IntSet -> Int

hash :: IntSet -> Int

Hashable OsString 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> OsString -> Int

hash :: OsString -> Int

Hashable PosixString 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> PosixString -> Int

hash :: PosixString -> Int

Hashable WindowsString 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> WindowsString -> Int

hash :: WindowsString -> Int

Hashable BigNat 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> BigNat -> Int

hash :: BigNat -> Int

Hashable Ordering 
Instance details

Defined in Data.Hashable.Class

Hashable OsString 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> OsString -> Int

hash :: OsString -> Int

Hashable PosixString 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> PosixString -> Int

hash :: PosixString -> Int

Hashable WindowsString 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> WindowsString -> Int

hash :: WindowsString -> Int

Hashable SHA256 
Instance details

Defined in Pantry.SHA256

Methods

hashWithSalt :: Int -> SHA256 -> Int

hash :: SHA256 -> Int

Hashable CabalFileInfo 
Instance details

Defined in Pantry.Types

Hashable FileSize 
Instance details

Defined in Pantry.Types

Hashable Revision 
Instance details

Defined in Pantry.Types

Hashable Scientific 
Instance details

Defined in Data.Scientific

Methods

hashWithSalt :: Int -> Scientific -> Int

hash :: Scientific -> Int

Hashable StackUnqualCompName Source # 
Instance details

Defined in Stack.Types.ComponentUtils

Hashable GhcPkgId Source # 
Instance details

Defined in Stack.Types.GhcPkgId

Hashable ExeName Source # 
Instance details

Defined in Stack.Types.Package

Methods

hashWithSalt :: Int -> ExeName -> Int

hash :: ExeName -> Int

Hashable Bytes128 
Instance details

Defined in Data.StaticBytes

Hashable Bytes16 
Instance details

Defined in Data.StaticBytes

Methods

hashWithSalt :: Int -> Bytes16 -> Int

hash :: Bytes16 -> Int

Hashable Bytes32 
Instance details

Defined in Data.StaticBytes

Methods

hashWithSalt :: Int -> Bytes32 -> Int

hash :: Bytes32 -> Int

Hashable Bytes64 
Instance details

Defined in Data.StaticBytes

Methods

hashWithSalt :: Int -> Bytes64 -> Int

hash :: Bytes64 -> Int

Hashable Bytes8 
Instance details

Defined in Data.StaticBytes

Methods

hashWithSalt :: Int -> Bytes8 -> Int

hash :: Bytes8 -> Int

Hashable Text 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Text -> Int

hash :: Text -> Int

Hashable Text 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Text -> Int

hash :: Text -> Int

Hashable ShortText 
Instance details

Defined in Data.Text.Short.Internal

Methods

hashWithSalt :: Int -> ShortText -> Int

hash :: ShortText -> Int

Hashable UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

hashWithSalt :: Int -> UUID -> Int

hash :: UUID -> Int

Hashable Integer 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Integer -> Int

hash :: Integer -> Int

Hashable Natural 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Natural -> Int

hash :: Natural -> Int

Hashable () 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> () -> Int

hash :: () -> Int

Hashable Bool 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Bool -> Int

hash :: Bool -> Int

Hashable Char 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Char -> Int

hash :: Char -> Int

Hashable Double 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Double -> Int

hash :: Double -> Int

Hashable Float 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Float -> Int

hash :: Float -> Int

Hashable Int 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Int -> Int

hash :: Int -> Int

Hashable Word 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Word -> Int

hash :: Word -> Int

Hashable v => Hashable (KeyMap v) 
Instance details

Defined in Data.Aeson.KeyMap

Methods

hashWithSalt :: Int -> KeyMap v -> Int

hash :: KeyMap v -> Int

Hashable (Async a) 
Instance details

Defined in Control.Concurrent.Async.Internal

Methods

hashWithSalt :: Int -> Async a -> Int

hash :: Async a -> Int

Hashable a => Hashable (Complex a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Complex a -> Int

hash :: Complex a -> Int

Hashable a => Hashable (Identity a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Identity a -> Int

hash :: Identity a -> Int

Hashable a => Hashable (First a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> First a -> Int

hash :: First a -> Int

Hashable a => Hashable (Last a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Last a -> Int

hash :: Last a -> Int

Hashable a => Hashable (Max a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Max a -> Int

hash :: Max a -> Int

Hashable a => Hashable (Min a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Min a -> Int

hash :: Min a -> Int

Hashable a => Hashable (WrappedMonoid a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> WrappedMonoid a -> Int

hash :: WrappedMonoid a -> Int

Hashable a => Hashable (NonEmpty a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> NonEmpty a -> Int

hash :: NonEmpty a -> Int

Hashable (FunPtr a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> FunPtr a -> Int

hash :: FunPtr a -> Int

Hashable (Ptr a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Ptr a -> Int

hash :: Ptr a -> Int

Hashable a => Hashable (Ratio a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Ratio a -> Int

hash :: Ratio a -> Int

Hashable (StableName a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> StableName a -> Int

hash :: StableName a -> Int

Hashable s => Hashable (CI s) 
Instance details

Defined in Data.CaseInsensitive.Internal

Methods

hashWithSalt :: Int -> CI s -> Int

hash :: CI s -> Int

Hashable v => Hashable (IntMap v) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> IntMap v -> Int

hash :: IntMap v -> Int

Hashable v => Hashable (Seq v) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Seq v -> Int

hash :: Seq v -> Int

Hashable v => Hashable (Set v) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Set v -> Int

hash :: Set v -> Int

Hashable v => Hashable (Tree v) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Tree v -> Int

hash :: Tree v -> Int

Hashable1 f => Hashable (Fix f) 
Instance details

Defined in Data.Fix

Methods

hashWithSalt :: Int -> Fix f -> Int

hash :: Fix f -> Int

Eq a => Hashable (Hashed a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Hashed a -> Int

hash :: Hashed a -> Int

Hashable (SomeBase t) 
Instance details

Defined in Path.Posix

Methods

hashWithSalt :: Int -> SomeBase t -> Int

hash :: SomeBase t -> Int

Hashable (SomeBase t) 
Instance details

Defined in Path.Windows

Methods

hashWithSalt :: Int -> SomeBase t -> Int

hash :: SomeBase t -> Int

Hashable a => Hashable (Maybe a) 
Instance details

Defined in Data.Strict.Maybe

Methods

hashWithSalt :: Int -> Maybe a -> Int

hash :: Maybe a -> Int

Hashable a => Hashable (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Methods

hashWithSalt :: Int -> HashSet a -> Int

hash :: HashSet a -> Int

Hashable a => Hashable (Maybe a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Maybe a -> Int

hash :: Maybe a -> Int

Hashable a => Hashable (Solo a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Solo a -> Int

hash :: Solo a -> Int

Hashable a => Hashable [a] 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> [a] -> Int

hash :: [a] -> Int

(Hashable a, Hashable b) => Hashable (Either a b) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Either a b -> Int

hash :: Either a b -> Int

Hashable (Fixed a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Fixed a -> Int

hash :: Fixed a -> Int

Hashable (Proxy a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Proxy a -> Int

hash :: Proxy a -> Int

Hashable a => Hashable (Arg a b) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Arg a b -> Int

hash :: Arg a b -> Int

Hashable (TypeRep a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> TypeRep a -> Int

hash :: TypeRep a -> Int

(Hashable k, Hashable v) => Hashable (Map k v) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Map k v -> Int

hash :: Map k v -> Int

Hashable (Path b t) 
Instance details

Defined in Path.Internal.Posix

Methods

hashWithSalt :: Int -> Path b t -> Int

hash :: Path b t -> Int

Hashable (Path b t) 
Instance details

Defined in Path.Internal.Windows

Methods

hashWithSalt :: Int -> Path b t -> Int

hash :: Path b t -> Int

(Hashable a, Hashable b) => Hashable (Either a b) 
Instance details

Defined in Data.Strict.Either

Methods

hashWithSalt :: Int -> Either a b -> Int

hash :: Either a b -> Int

(Hashable a, Hashable b) => Hashable (These a b) 
Instance details

Defined in Data.Strict.These

Methods

hashWithSalt :: Int -> These a b -> Int

hash :: These a b -> Int

(Hashable a, Hashable b) => Hashable (Pair a b) 
Instance details

Defined in Data.Strict.Tuple

Methods

hashWithSalt :: Int -> Pair a b -> Int

hash :: Pair a b -> Int

(Hashable a, Hashable b) => Hashable (These a b) 
Instance details

Defined in Data.These

Methods

hashWithSalt :: Int -> These a b -> Int

hash :: These a b -> Int

(Hashable k, Hashable v) => Hashable (HashMap k v) 
Instance details

Defined in Data.HashMap.Internal

Methods

hashWithSalt :: Int -> HashMap k v -> Int

hash :: HashMap k v -> Int

(Hashable a1, Hashable a2) => Hashable (a1, a2) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> (a1, a2) -> Int

hash :: (a1, a2) -> Int

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

(Hashable a1, Hashable a2, Hashable a3) => Hashable (a1, a2, a3) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> (a1, a2, a3) -> Int

hash :: (a1, a2, a3) -> Int

(Hashable1 f, Hashable1 g, Hashable a) => Hashable (Product f g a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Product f g a -> Int

hash :: Product f g a -> Int

(Hashable1 f, Hashable1 g, Hashable a) => Hashable (Sum f g a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Sum f g a -> Int

hash :: Sum f g a -> Int

(Hashable a1, Hashable a2, Hashable a3, Hashable a4) => Hashable (a1, a2, a3, a4) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> (a1, a2, a3, a4) -> Int

hash :: (a1, a2, a3, a4) -> Int

(Hashable1 f, Hashable1 g, Hashable a) => Hashable (Compose f g a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Compose f g a -> Int

hash :: Compose f g a -> Int

(Hashable a1, Hashable a2, Hashable a3, Hashable a4, Hashable a5) => Hashable (a1, a2, a3, a4, a5) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> (a1, a2, a3, a4, a5) -> Int

hash :: (a1, a2, a3, a4, a5) -> Int

(Hashable a1, Hashable a2, Hashable a3, Hashable a4, Hashable a5, Hashable a6) => Hashable (a1, a2, a3, a4, a5, a6) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> (a1, a2, a3, a4, a5, a6) -> Int

hash :: (a1, a2, a3, a4, a5, a6) -> Int

(Hashable a1, Hashable a2, Hashable a3, Hashable a4, Hashable a5, Hashable a6, Hashable a7) => Hashable (a1, a2, a3, a4, a5, a6, a7) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> (a1, a2, a3, a4, a5, a6, a7) -> Int

hash :: (a1, a2, a3, a4, a5, a6, a7) -> Int

force :: NFData a => a -> a #

catchIO :: MonadUnliftIO m => m a -> (IOException -> m a) -> m a #

type LByteString = ByteString #

class MonadIO m => MonadUnliftIO (m :: Type -> Type) where #

Methods

withRunInIO :: ((forall a. m a -> IO a) -> IO b) -> m b #

Instances

Instances details
MonadUnliftIO IO 
Instance details

Defined in Control.Monad.IO.Unlift

Methods

withRunInIO :: ((forall a. IO a -> IO a) -> IO b) -> IO b #

MonadUnliftIO m => MonadUnliftIO (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

withRunInIO :: ((forall a. LoggingT m a -> IO a) -> IO b) -> LoggingT m b #

MonadUnliftIO m => MonadUnliftIO (NoLoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

withRunInIO :: ((forall a. NoLoggingT m a -> IO a) -> IO b) -> NoLoggingT m b #

MonadUnliftIO m => MonadUnliftIO (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

withRunInIO :: ((forall a. ResourceT m a -> IO a) -> IO b) -> ResourceT m b #

MonadUnliftIO (RIO env) 
Instance details

Defined in RIO.Prelude.RIO

Methods

withRunInIO :: ((forall a. RIO env a -> IO a) -> IO b) -> RIO env b #

MonadUnliftIO m => MonadUnliftIO (IdentityT m) 
Instance details

Defined in Control.Monad.IO.Unlift

Methods

withRunInIO :: ((forall a. IdentityT m a -> IO a) -> IO b) -> IdentityT m b #

MonadUnliftIO m => MonadUnliftIO (ReaderT r m) 
Instance details

Defined in Control.Monad.IO.Unlift

Methods

withRunInIO :: ((forall a. ReaderT r m a -> IO a) -> IO b) -> ReaderT r m b #

class HasLogFunc env where #

Methods

logFuncL :: Lens' env LogFunc #

Instances

Instances details
HasLogFunc PantryApp 
Instance details

Defined in Pantry

HasLogFunc LogFunc 
Instance details

Defined in RIO.Prelude.Logger

HasLogFunc SimpleApp 
Instance details

Defined in RIO.Prelude.Simple

HasLogFunc LoggedProcessContext 
Instance details

Defined in RIO.Process

Methods

logFuncL :: Lens' LoggedProcessContext LogFunc #

HasLogFunc SimplePrettyApp 
Instance details

Defined in RIO.PrettyPrint.Simple

Methods

logFuncL :: Lens' SimplePrettyApp LogFunc #

HasLogFunc EnvConfigPathInfo Source # 
Instance details

Defined in Stack.Path

HasLogFunc Ctx Source # 
Instance details

Defined in Stack.Types.Build.ConstructPlan

HasLogFunc BuildConfig Source # 
Instance details

Defined in Stack.Types.BuildConfig

HasLogFunc Config Source # 
Instance details

Defined in Stack.Types.Config

HasLogFunc DotConfig Source # 
Instance details

Defined in Stack.Types.DotConfig

HasLogFunc EnvConfig Source # 
Instance details

Defined in Stack.Types.EnvConfig

HasLogFunc GetPackageFileContext Source # 
Instance details

Defined in Stack.Types.PackageFile

HasLogFunc Runner Source # 
Instance details

Defined in Stack.Types.Runner

class Monad m => MonadReader r (m :: Type -> Type) | m -> r where #

Minimal complete definition

(ask | reader), local

Methods

ask :: m r #

local :: (r -> r) -> m a -> m a #

Instances

Instances details
MonadReader e m => MonadReader e (CatchT m) 
Instance details

Defined in Control.Monad.Catch.Pure

Methods

ask :: CatchT m e #

local :: (e -> e) -> CatchT m a -> CatchT m a #

reader :: (e -> a) -> CatchT m a

MonadReader env (RIO env) 
Instance details

Defined in RIO.Prelude.RIO

Methods

ask :: RIO env env #

local :: (env -> env) -> RIO env a -> RIO env a #

reader :: (env -> a) -> RIO env a

MonadReader r m => MonadReader r (LoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

ask :: LoggingT m r #

local :: (r -> r) -> LoggingT m a -> LoggingT m a #

reader :: (r -> a) -> LoggingT m a

MonadReader r m => MonadReader r (NoLoggingT m) 
Instance details

Defined in Control.Monad.Logger

Methods

ask :: NoLoggingT m r #

local :: (r -> r) -> NoLoggingT m a -> NoLoggingT m a #

reader :: (r -> a) -> NoLoggingT m a

MonadReader r m => MonadReader r (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

ask :: ResourceT m r #

local :: (r -> r) -> ResourceT m a -> ResourceT m a #

reader :: (r -> a) -> ResourceT m a

MonadReader r m => MonadReader r (MaybeT m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: MaybeT m r #

local :: (r -> r) -> MaybeT m a -> MaybeT m a #

reader :: (r -> a) -> MaybeT m a

(Monoid w, MonadReader r m) => MonadReader r (AccumT w m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: AccumT w m r #

local :: (r -> r) -> AccumT w m a -> AccumT w m a #

reader :: (r -> a) -> AccumT w m a

MonadReader r m => MonadReader r (ExceptT e m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: ExceptT e m r #

local :: (r -> r) -> ExceptT e m a -> ExceptT e m a #

reader :: (r -> a) -> ExceptT e m a

MonadReader r m => MonadReader r (IdentityT m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: IdentityT m r #

local :: (r -> r) -> IdentityT m a -> IdentityT m a #

reader :: (r -> a) -> IdentityT m a

Monad m => MonadReader r (ReaderT r m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: ReaderT r m r #

local :: (r -> r) -> ReaderT r m a -> ReaderT r m a #

reader :: (r -> a) -> ReaderT r m a

MonadReader r m => MonadReader r (StateT s m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: StateT s m r #

local :: (r -> r) -> StateT s m a -> StateT s m a #

reader :: (r -> a) -> StateT s m a

MonadReader r m => MonadReader r (StateT s m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: StateT s m r #

local :: (r -> r) -> StateT s m a -> StateT s m a #

reader :: (r -> a) -> StateT s m a

(Monoid w, MonadReader r m) => MonadReader r (WriterT w m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: WriterT w m r #

local :: (r -> r) -> WriterT w m a -> WriterT w m a #

reader :: (r -> a) -> WriterT w m a

(Monoid w, MonadReader r m) => MonadReader r (WriterT w m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: WriterT w m r #

local :: (r -> r) -> WriterT w m a -> WriterT w m a #

reader :: (r -> a) -> WriterT w m a

(Monoid w, MonadReader r m) => MonadReader r (WriterT w m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: WriterT w m r #

local :: (r -> r) -> WriterT w m a -> WriterT w m a #

reader :: (r -> a) -> WriterT w m a

MonadReader r' m => MonadReader r' (SelectT r m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: SelectT r m r' #

local :: (r' -> r') -> SelectT r m a -> SelectT r m a #

reader :: (r' -> a) -> SelectT r m a

MonadReader r m => MonadReader r (ConduitT i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

ask :: ConduitT i o m r #

local :: (r -> r) -> ConduitT i o m a -> ConduitT i o m a #

reader :: (r -> a) -> ConduitT i o m a

MonadReader r ((->) r) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: r -> r #

local :: (r -> r) -> (r -> a) -> r -> a #

reader :: (r -> a) -> r -> a

MonadReader r' m => MonadReader r' (ContT r m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: ContT r m r' #

local :: (r' -> r') -> ContT r m a -> ContT r m a #

reader :: (r' -> a) -> ContT r m a

(Monad m, Monoid w) => MonadReader r (RWST r w s m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: RWST r w s m r #

local :: (r -> r) -> RWST r w s m a -> RWST r w s m a #

reader :: (r -> a) -> RWST r w s m a

(Monad m, Monoid w) => MonadReader r (RWST r w s m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: RWST r w s m r #

local :: (r -> r) -> RWST r w s m a -> RWST r w s m a #

reader :: (r -> a) -> RWST r w s m a

(Monad m, Monoid w) => MonadReader r (RWST r w s m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: RWST r w s m r #

local :: (r -> r) -> RWST r w s m a -> RWST r w s m a #

reader :: (r -> a) -> RWST r w s m a

MonadReader r m => MonadReader r (Pipe l i o u m) 
Instance details

Defined in Data.Conduit.Internal.Pipe

Methods

ask :: Pipe l i o u m r #

local :: (r -> r) -> Pipe l i o u m a -> Pipe l i o u m a #

reader :: (r -> a) -> Pipe l i o u m a

MonadReader (Context Value, TemplateCache) SubM 
Instance details

Defined in Text.Mustache.Internal.Types

type HasCallStack = ?callStack :: CallStack #

data CallStack #

Instances

Instances details
IsList CallStack 
Instance details

Defined in GHC.IsList

Associated Types

type Item CallStack 
Instance details

Defined in GHC.IsList

type Item CallStack = (String, SrcLoc)

Methods

fromList :: [Item CallStack] -> CallStack

fromListN :: Int -> [Item CallStack] -> CallStack

toList :: CallStack -> [Item CallStack]

Show CallStack 
Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> CallStack -> ShowS

show :: CallStack -> String #

showList :: [CallStack] -> ShowS

NFData CallStack 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CallStack -> () #

type Item CallStack 
Instance details

Defined in GHC.IsList

type Item CallStack = (String, SrcLoc)

newtype ReaderT r (m :: Type -> Type) a #

Constructors

ReaderT 

Fields

Instances

Instances details
Generic1 (ReaderT r m :: Type -> Type) 
Instance details

Defined in Control.Monad.Trans.Reader

Associated Types

type Rep1 (ReaderT r m :: Type -> Type) 
Instance details

Defined in Control.Monad.Trans.Reader

type Rep1 (ReaderT r m :: Type -> Type) = D1 ('MetaData "ReaderT" "Control.Monad.Trans.Reader" "transformers-0.6.1.0-da7f" 'True) (C1 ('MetaCons "ReaderT" 'PrefixI 'True) (S1 ('MetaSel ('Just "runReaderT") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) ((FUN 'Many r :: Type -> Type) :.: Rec1 m)))

Methods

from1 :: ReaderT r m a -> Rep1 (ReaderT r m) a

to1 :: Rep1 (ReaderT r m) a -> ReaderT r m a

MonadBaseControl b m => MonadBaseControl b (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Control

Methods

liftBaseWith :: (RunInBase (ReaderT r m) b -> b a) -> ReaderT r m a

restoreM :: StM (ReaderT r m) a -> ReaderT r m a

MonadAccum w m => MonadAccum w (ReaderT r m) 
Instance details

Defined in Control.Monad.Accum

Methods

look :: ReaderT r m w

add :: w -> ReaderT r m ()

accum :: (w -> (a, w)) -> ReaderT r m a

MonadError e m => MonadError e (ReaderT r m) 
Instance details

Defined in Control.Monad.Error.Class

Methods

throwError :: e -> ReaderT r m a

catchError :: ReaderT r m a -> (e -> ReaderT r m a) -> ReaderT r m a

Monad m => MonadReader r (ReaderT r m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: ReaderT r m r #

local :: (r -> r) -> ReaderT r m a -> ReaderT r m a #

reader :: (r -> a) -> ReaderT r m a

MonadSelect r' m => MonadSelect r' (ReaderT r m) 
Instance details

Defined in Control.Monad.Select

Methods

select :: ((a -> r') -> a) -> ReaderT r m a

MonadState s m => MonadState s (ReaderT r m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: ReaderT r m s

put :: s -> ReaderT r m ()

state :: (s -> (a, s)) -> ReaderT r m a

MonadWriter w m => MonadWriter w (ReaderT r m) 
Instance details

Defined in Control.Monad.Writer.Class

Methods

writer :: (a, w) -> ReaderT r m a

tell :: w -> ReaderT r m ()

listen :: ReaderT r m a -> ReaderT r m (a, w)

pass :: ReaderT r m (a, w -> w) -> ReaderT r m a

MonadTransControl (ReaderT r) 
Instance details

Defined in Control.Monad.Trans.Control

Methods

liftWith :: Monad m => (Run (ReaderT r) -> m a) -> ReaderT r m a

restoreT :: Monad m => m (StT (ReaderT r) a) -> ReaderT r m a

MonadTrans (ReaderT r) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

lift :: Monad m => m a -> ReaderT r m a #

(CharParsing m, MonadPlus m) => CharParsing (ReaderT e m) 
Instance details

Defined in Distribution.Compat.CharParsing

Methods

satisfy :: (Char -> Bool) -> ReaderT e m Char

char :: Char -> ReaderT e m Char

notChar :: Char -> ReaderT e m Char

anyChar :: ReaderT e m Char

string :: String -> ReaderT e m String

text :: Text -> ReaderT e m Text

(Parsing m, MonadPlus m) => Parsing (ReaderT e m) 
Instance details

Defined in Distribution.Compat.Parsing

Methods

try :: ReaderT e m a -> ReaderT e m a

(<?>) :: ReaderT e m a -> String -> ReaderT e m a

skipMany :: ReaderT e m a -> ReaderT e m ()

skipSome :: ReaderT e m a -> ReaderT e m ()

unexpected :: String -> ReaderT e m a

eof :: ReaderT e m ()

notFollowedBy :: Show a => ReaderT e m a -> ReaderT e m ()

MonadFail m => MonadFail (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

fail :: String -> ReaderT r m a #

MonadFix m => MonadFix (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

mfix :: (a -> ReaderT r m a) -> ReaderT r m a

MonadIO m => MonadIO (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

liftIO :: IO a -> ReaderT r m a #

MonadZip m => MonadZip (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

mzip :: ReaderT r m a -> ReaderT r m b -> ReaderT r m (a, b)

mzipWith :: (a -> b -> c) -> ReaderT r m a -> ReaderT r m b -> ReaderT r m c

munzip :: ReaderT r m (a, b) -> (ReaderT r m a, ReaderT r m b)

Contravariant m => Contravariant (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

contramap :: (a' -> a) -> ReaderT r m a -> ReaderT r m a'

(>$) :: b -> ReaderT r m b -> ReaderT r 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] #

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 => 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 #

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 #

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 #

MonadActive m => MonadActive (ReaderT r m) 
Instance details

Defined in Data.Conduit.Lazy

Methods

monadActive :: ReaderT r m Bool

MonadCatch m => MonadCatch (ReaderT r m) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: (HasCallStack, Exception e) => ReaderT r m a -> (e -> ReaderT r m a) -> ReaderT r m a

MonadMask m => MonadMask (ReaderT r m) 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: HasCallStack => ((forall a. ReaderT r m a -> ReaderT r m a) -> ReaderT r m b) -> ReaderT r m b

uninterruptibleMask :: HasCallStack => ((forall a. ReaderT r m a -> ReaderT r m a) -> ReaderT r m b) -> ReaderT r m b

generalBracket :: HasCallStack => ReaderT r m a -> (a -> ExitCase b -> ReaderT r m c) -> (a -> ReaderT r m b) -> ReaderT r m (b, c)

MonadThrow m => MonadThrow (ReaderT r m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: (HasCallStack, Exception e) => e -> ReaderT r m a #

MonadLogger m => MonadLogger (ReaderT r m) 
Instance details

Defined in Control.Monad.Logger

Methods

monadLoggerLog :: ToLogStr msg => Loc -> LogSource -> LogLevel -> msg -> ReaderT r m ()

MonadLoggerIO m => MonadLoggerIO (ReaderT r m) 
Instance details

Defined in Control.Monad.Logger

Methods

askLoggerIO :: ReaderT r m (Loc -> LogSource -> LogLevel -> LogStr -> IO ())

MonadCont m => MonadCont (ReaderT r m) 
Instance details

Defined in Control.Monad.Cont.Class

Methods

callCC :: ((a -> ReaderT r m b) -> ReaderT r m a) -> ReaderT r m a

PrimMonad m => PrimMonad (ReaderT r m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (ReaderT r m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ReaderT r m) = PrimState m

Methods

primitive :: (State# (PrimState (ReaderT r m)) -> (# State# (PrimState (ReaderT r m)), a #)) -> ReaderT r m a #

MonadResource m => MonadResource (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

liftResourceT :: ResourceT IO a -> ReaderT r m a

MonadUnliftIO m => MonadUnliftIO (ReaderT r m) 
Instance details

Defined in Control.Monad.IO.Unlift

Methods

withRunInIO :: ((forall a. ReaderT r m a -> IO a) -> IO b) -> ReaderT r m b #

Monad m => Magnify (ReaderT b m) (ReaderT a m) b a 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

magnify :: LensLike' (Magnified (ReaderT b m) c) a b -> ReaderT b m c -> ReaderT a m c

Zoom m n s t => Zoom (ReaderT e m) (ReaderT e n) s t 
Instance details

Defined in Lens.Micro.Mtl.Internal

Methods

zoom :: LensLike' (Zoomed (ReaderT e m) c) t s -> ReaderT e m c -> ReaderT e n c

Generic (ReaderT r m a) 
Instance details

Defined in Control.Monad.Trans.Reader

Associated Types

type Rep (ReaderT r m a) 
Instance details

Defined in Control.Monad.Trans.Reader

type Rep (ReaderT r m a) = D1 ('MetaData "ReaderT" "Control.Monad.Trans.Reader" "transformers-0.6.1.0-da7f" 'True) (C1 ('MetaCons "ReaderT" 'PrefixI 'True) (S1 ('MetaSel ('Just "runReaderT") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (r -> m a))))

Methods

from :: ReaderT r m a -> Rep (ReaderT r m a) x

to :: Rep (ReaderT r m a) x -> ReaderT r m a

Functor m => MonoFunctor (ReaderT r m a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (ReaderT r m a) -> Element (ReaderT r m a)) -> ReaderT r m a -> ReaderT r m a

Applicative m => MonoPointed (ReaderT r m a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (ReaderT r m a) -> ReaderT r m a

type Rep1 (ReaderT r m :: Type -> Type) 
Instance details

Defined in Control.Monad.Trans.Reader

type Rep1 (ReaderT r m :: Type -> Type) = D1 ('MetaData "ReaderT" "Control.Monad.Trans.Reader" "transformers-0.6.1.0-da7f" 'True) (C1 ('MetaCons "ReaderT" 'PrefixI 'True) (S1 ('MetaSel ('Just "runReaderT") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) ((FUN 'Many r :: Type -> Type) :.: Rec1 m)))
type StT (ReaderT r) a 
Instance details

Defined in Control.Monad.Trans.Control

type StT (ReaderT r) a = a
type Magnified (ReaderT b m) 
Instance details

Defined in Lens.Micro.Mtl.Internal

type Magnified (ReaderT b m) = Effect m
type Zoomed (ReaderT e m) 
Instance details

Defined in Lens.Micro.Mtl.Internal

type Zoomed (ReaderT e m) = Zoomed m
type PrimState (ReaderT r m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ReaderT r m) = PrimState m
type StM (ReaderT r m) a 
Instance details

Defined in Control.Monad.Trans.Control

type StM (ReaderT r m) a = ComposeSt (ReaderT r) m a
type Rep (ReaderT r m a) 
Instance details

Defined in Control.Monad.Trans.Reader

type Rep (ReaderT r m a) = D1 ('MetaData "ReaderT" "Control.Monad.Trans.Reader" "transformers-0.6.1.0-da7f" 'True) (C1 ('MetaCons "ReaderT" 'PrefixI 'True) (S1 ('MetaSel ('Just "runReaderT") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (r -> m a))))
type Element (ReaderT r m a) 
Instance details

Defined in Data.MonoTraversable

type Element (ReaderT r m a) = a

foldMapM :: (Monad m, Monoid w, Foldable t) => (a -> m w) -> t a -> m w #

mapMaybeM :: Monad m => (a -> m (Maybe b)) -> [a] -> m [b] #

nubOrd :: Ord a => [a] -> [a] #

class NFData a where #

Minimal complete definition

Nothing

Methods

rnf :: a -> () #

Instances

Instances details
NFData IOData 
Instance details

Defined in Distribution.Utils.IOData

Methods

rnf :: IOData -> () #

NFData OpenModule 
Instance details

Defined in Distribution.Backpack

Methods

rnf :: OpenModule -> () #

NFData OpenUnitId 
Instance details

Defined in Distribution.Backpack

Methods

rnf :: OpenUnitId -> () #

NFData CabalSpecVersion 
Instance details

Defined in Distribution.CabalSpecVersion

Methods

rnf :: CabalSpecVersion -> () #

NFData CompilerFlavor 
Instance details

Defined in Distribution.Compiler

Methods

rnf :: CompilerFlavor -> () #

NFData CompilerId 
Instance details

Defined in Distribution.Compiler

Methods

rnf :: CompilerId -> () #

NFData License 
Instance details

Defined in Distribution.License

Methods

rnf :: License -> () #

NFData ModuleName 
Instance details

Defined in Distribution.ModuleName

Methods

rnf :: ModuleName -> () #

NFData PError 
Instance details

Defined in Distribution.Parsec.Error

Methods

rnf :: PError -> () #

NFData Position 
Instance details

Defined in Distribution.Parsec.Position

Methods

rnf :: Position -> () #

NFData PWarnType 
Instance details

Defined in Distribution.Parsec.Warning

Methods

rnf :: PWarnType -> () #

NFData PWarning 
Instance details

Defined in Distribution.Parsec.Warning

Methods

rnf :: PWarning -> () #

NFData License 
Instance details

Defined in Distribution.SPDX.License

Methods

rnf :: License -> () #

NFData LicenseExceptionId 
Instance details

Defined in Distribution.SPDX.LicenseExceptionId

Methods

rnf :: LicenseExceptionId -> () #

NFData LicenseExpression 
Instance details

Defined in Distribution.SPDX.LicenseExpression

Methods

rnf :: LicenseExpression -> () #

NFData SimpleLicenseExpression 
Instance details

Defined in Distribution.SPDX.LicenseExpression

Methods

rnf :: SimpleLicenseExpression -> () #

NFData LicenseId 
Instance details

Defined in Distribution.SPDX.LicenseId

Methods

rnf :: LicenseId -> () #

NFData LicenseRef 
Instance details

Defined in Distribution.SPDX.LicenseReference

Methods

rnf :: LicenseRef -> () #

NFData Arch 
Instance details

Defined in Distribution.System

Methods

rnf :: Arch -> () #

NFData OS 
Instance details

Defined in Distribution.System

Methods

rnf :: OS -> () #

NFData Platform 
Instance details

Defined in Distribution.System

Methods

rnf :: Platform -> () #

NFData AbiDependency 
Instance details

Defined in Distribution.Types.AbiDependency

Methods

rnf :: AbiDependency -> () #

NFData AbiHash 
Instance details

Defined in Distribution.Types.AbiHash

Methods

rnf :: AbiHash -> () #

NFData Benchmark 
Instance details

Defined in Distribution.Types.Benchmark

Methods

rnf :: Benchmark -> () #

NFData BenchmarkInterface 
Instance details

Defined in Distribution.Types.BenchmarkInterface

Methods

rnf :: BenchmarkInterface -> () #

NFData BenchmarkType 
Instance details

Defined in Distribution.Types.BenchmarkType

Methods

rnf :: BenchmarkType -> () #

NFData BuildInfo 
Instance details

Defined in Distribution.Types.BuildInfo

Methods

rnf :: BuildInfo -> () #

NFData BuildType 
Instance details

Defined in Distribution.Types.BuildType

Methods

rnf :: BuildType -> () #

NFData ComponentId 
Instance details

Defined in Distribution.Types.ComponentId

Methods

rnf :: ComponentId -> () #

NFData ConfVar 
Instance details

Defined in Distribution.Types.ConfVar

Methods

rnf :: ConfVar -> () #

NFData Dependency 
Instance details

Defined in Distribution.Types.Dependency

Methods

rnf :: Dependency -> () #

NFData ExeDependency 
Instance details

Defined in Distribution.Types.ExeDependency

Methods

rnf :: ExeDependency -> () #

NFData Executable 
Instance details

Defined in Distribution.Types.Executable

Methods

rnf :: Executable -> () #

NFData ExecutableScope 
Instance details

Defined in Distribution.Types.ExecutableScope

Methods

rnf :: ExecutableScope -> () #

NFData ExposedModule 
Instance details

Defined in Distribution.Types.ExposedModule

Methods

rnf :: ExposedModule -> () #

NFData FlagAssignment 
Instance details

Defined in Distribution.Types.Flag

Methods

rnf :: FlagAssignment -> () #

NFData FlagName 
Instance details

Defined in Distribution.Types.Flag

Methods

rnf :: FlagName -> () #

NFData PackageFlag 
Instance details

Defined in Distribution.Types.Flag

Methods

rnf :: PackageFlag -> () #

NFData ForeignLib 
Instance details

Defined in Distribution.Types.ForeignLib

Methods

rnf :: ForeignLib -> () #

NFData LibVersionInfo 
Instance details

Defined in Distribution.Types.ForeignLib

Methods

rnf :: LibVersionInfo -> () #

NFData ForeignLibOption 
Instance details

Defined in Distribution.Types.ForeignLibOption

Methods

rnf :: ForeignLibOption -> () #

NFData ForeignLibType 
Instance details

Defined in Distribution.Types.ForeignLibType

Methods

rnf :: ForeignLibType -> () #

NFData GenericPackageDescription 
Instance details

Defined in Distribution.Types.GenericPackageDescription

Methods

rnf :: GenericPackageDescription -> () #

NFData IncludeRenaming 
Instance details

Defined in Distribution.Types.IncludeRenaming

Methods

rnf :: IncludeRenaming -> () #

NFData InstalledPackageInfo 
Instance details

Defined in Distribution.Types.InstalledPackageInfo

Methods

rnf :: InstalledPackageInfo -> () #

NFData LegacyExeDependency 
Instance details

Defined in Distribution.Types.LegacyExeDependency

Methods

rnf :: LegacyExeDependency -> () #

NFData Library 
Instance details

Defined in Distribution.Types.Library

Methods

rnf :: Library -> () #

NFData LibraryName 
Instance details

Defined in Distribution.Types.LibraryName

Methods

rnf :: LibraryName -> () #

NFData LibraryVisibility 
Instance details

Defined in Distribution.Types.LibraryVisibility

Methods

rnf :: LibraryVisibility -> () #

NFData Mixin 
Instance details

Defined in Distribution.Types.Mixin

Methods

rnf :: Mixin -> () #

NFData Module 
Instance details

Defined in Distribution.Types.Module

Methods

rnf :: Module -> () #

NFData ModuleReexport 
Instance details

Defined in Distribution.Types.ModuleReexport

Methods

rnf :: ModuleReexport -> () #

NFData ModuleRenaming 
Instance details

Defined in Distribution.Types.ModuleRenaming

Methods

rnf :: ModuleRenaming -> () #

NFData MungedPackageId 
Instance details

Defined in Distribution.Types.MungedPackageId

Methods

rnf :: MungedPackageId -> () #

NFData MungedPackageName 
Instance details

Defined in Distribution.Types.MungedPackageName

Methods

rnf :: MungedPackageName -> () #

NFData PackageDescription 
Instance details

Defined in Distribution.Types.PackageDescription

Methods

rnf :: PackageDescription -> () #

NFData PackageIdentifier 
Instance details

Defined in Distribution.Types.PackageId

Methods

rnf :: PackageIdentifier -> () #

NFData PackageName 
Instance details

Defined in Distribution.Types.PackageName

Methods

rnf :: PackageName -> () #

NFData PackageVersionConstraint 
Instance details

Defined in Distribution.Types.PackageVersionConstraint

Methods

rnf :: PackageVersionConstraint -> () #

NFData PkgconfigDependency 
Instance details

Defined in Distribution.Types.PkgconfigDependency

Methods

rnf :: PkgconfigDependency -> () #

NFData PkgconfigName 
Instance details

Defined in Distribution.Types.PkgconfigName

Methods

rnf :: PkgconfigName -> () #

NFData PkgconfigVersion 
Instance details

Defined in Distribution.Types.PkgconfigVersion

Methods

rnf :: PkgconfigVersion -> () #

NFData PkgconfigVersionRange 
Instance details

Defined in Distribution.Types.PkgconfigVersionRange

Methods

rnf :: PkgconfigVersionRange -> () #

NFData SetupBuildInfo 
Instance details

Defined in Distribution.Types.SetupBuildInfo

Methods

rnf :: SetupBuildInfo -> () #

NFData KnownRepoType 
Instance details

Defined in Distribution.Types.SourceRepo

Methods

rnf :: KnownRepoType -> () #

NFData RepoKind 
Instance details

Defined in Distribution.Types.SourceRepo

Methods

rnf :: RepoKind -> () #

NFData RepoType 
Instance details

Defined in Distribution.Types.SourceRepo

Methods

rnf :: RepoType -> () #

NFData SourceRepo 
Instance details

Defined in Distribution.Types.SourceRepo

Methods

rnf :: SourceRepo -> () #

NFData TestSuite 
Instance details

Defined in Distribution.Types.TestSuite

Methods

rnf :: TestSuite -> () #

NFData TestSuiteInterface 
Instance details

Defined in Distribution.Types.TestSuiteInterface

Methods

rnf :: TestSuiteInterface -> () #

NFData TestType 
Instance details

Defined in Distribution.Types.TestType

Methods

rnf :: TestType -> () #

NFData DefUnitId 
Instance details

Defined in Distribution.Types.UnitId

Methods

rnf :: DefUnitId -> () #

NFData UnitId 
Instance details

Defined in Distribution.Types.UnitId

Methods

rnf :: UnitId -> () #

NFData UnqualComponentName 
Instance details

Defined in Distribution.Types.UnqualComponentName

Methods

rnf :: UnqualComponentName -> () #

NFData Version 
Instance details

Defined in Distribution.Types.Version

Methods

rnf :: Version -> () #

NFData VersionRange 
Instance details

Defined in Distribution.Types.VersionRange.Internal

Methods

rnf :: VersionRange -> () #

NFData ShortText 
Instance details

Defined in Distribution.Utils.ShortText

Methods

rnf :: ShortText -> () #

NFData Extension 
Instance details

Defined in Language.Haskell.Extension

Methods

rnf :: Extension -> () #

NFData KnownExtension 
Instance details

Defined in Language.Haskell.Extension

Methods

rnf :: KnownExtension -> () #

NFData Language 
Instance details

Defined in Language.Haskell.Extension

Methods

rnf :: Language -> () #

NFData Key 
Instance details

Defined in Data.Aeson.Key

Methods

rnf :: Key -> () #

NFData JSONPathElement 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

rnf :: JSONPathElement -> () #

NFData Value 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

rnf :: Value -> () #

NFData Number 
Instance details

Defined in Data.Attoparsec.Number

Methods

rnf :: Number -> () #

NFData ByteArray 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: ByteArray -> () #

NFData All 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: All -> () #

NFData Any 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Any -> () #

NFData TypeRep 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: TypeRep -> () #

NFData Unique 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Unique -> () #

NFData Version 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Version -> () #

NFData CBool 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CBool -> () #

NFData CChar 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CChar -> () #

NFData CClock 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CClock -> () #

NFData CDouble 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CDouble -> () #

NFData CFile 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CFile -> () #

NFData CFloat 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CFloat -> () #

NFData CFpos 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CFpos -> () #

NFData CInt 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CInt -> () #

NFData CIntMax 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CIntMax -> () #

NFData CIntPtr 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CIntPtr -> () #

NFData CJmpBuf 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CJmpBuf -> () #

NFData CLLong 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CLLong -> () #

NFData CLong 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CLong -> () #

NFData CPtrdiff 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CPtrdiff -> () #

NFData CSChar 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CSChar -> () #

NFData CSUSeconds 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CSUSeconds -> () #

NFData CShort 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CShort -> () #

NFData CSigAtomic 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CSigAtomic -> () #

NFData CSize 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CSize -> () #

NFData CTime 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CTime -> () #

NFData CUChar 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CUChar -> () #

NFData CUInt 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CUInt -> () #

NFData CUIntMax 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CUIntMax -> () #

NFData CUIntPtr 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CUIntPtr -> () #

NFData CULLong 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CULLong -> () #

NFData CULong 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CULong -> () #

NFData CUSeconds 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CUSeconds -> () #

NFData CUShort 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CUShort -> () #

NFData CWchar 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CWchar -> () #

NFData Void 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Void -> () #

NFData ThreadId 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: ThreadId -> () #

NFData Fingerprint 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Fingerprint -> () #

NFData MaskingState 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: MaskingState -> () #

NFData ExitCode 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: ExitCode -> () #

NFData Int16 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int16 -> () #

NFData Int32 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int32 -> () #

NFData Int64 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int64 -> () #

NFData Int8 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int8 -> () #

NFData CallStack 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CallStack -> () #

NFData SrcLoc 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: SrcLoc -> () #

NFData Word16 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word16 -> () #

NFData Word32 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word32 -> () #

NFData Word64 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word64 -> () #

NFData Word8 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word8 -> () #

NFData ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

Methods

rnf :: ByteString -> () #

NFData ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Methods

rnf :: ByteString -> () #

NFData ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Methods

rnf :: ShortByteString -> () #

NFData IntSet 
Instance details

Defined in Data.IntSet.Internal

Methods

rnf :: IntSet -> () #

NFData AES128 
Instance details

Defined in Crypto.Cipher.AES

Methods

rnf :: AES128 -> () #

NFData AES192 
Instance details

Defined in Crypto.Cipher.AES

Methods

rnf :: AES192 -> () #

NFData AES256 
Instance details

Defined in Crypto.Cipher.AES

Methods

rnf :: AES256 -> () #

NFData Blowfish 
Instance details

Defined in Crypto.Cipher.Blowfish

Methods

rnf :: Blowfish -> () #

NFData Blowfish128 
Instance details

Defined in Crypto.Cipher.Blowfish

Methods

rnf :: Blowfish128 -> () #

NFData Blowfish256 
Instance details

Defined in Crypto.Cipher.Blowfish

Methods

rnf :: Blowfish256 -> () #

NFData Blowfish448 
Instance details

Defined in Crypto.Cipher.Blowfish

Methods

rnf :: Blowfish448 -> () #

NFData Blowfish64 
Instance details

Defined in Crypto.Cipher.Blowfish

Methods

rnf :: Blowfish64 -> () #

NFData State 
Instance details

Defined in Crypto.Cipher.ChaCha

Methods

rnf :: State -> () #

NFData StateSimple 
Instance details

Defined in Crypto.Cipher.ChaCha

Methods

rnf :: StateSimple -> () #

NFData State 
Instance details

Defined in Crypto.Cipher.RC4

Methods

rnf :: State -> () #

NFData State 
Instance details

Defined in Crypto.Cipher.Salsa

Methods

rnf :: State -> () #

NFData SharedSecret 
Instance details

Defined in Crypto.ECC

Methods

rnf :: SharedSecret -> () #

NFData Point 
Instance details

Defined in Crypto.ECC.Edwards25519

Methods

rnf :: Point -> () #

NFData Scalar 
Instance details

Defined in Crypto.ECC.Edwards25519

Methods

rnf :: Scalar -> () #

NFData Auth 
Instance details

Defined in Crypto.MAC.Poly1305

Methods

rnf :: Auth -> () #

NFData DhSecret 
Instance details

Defined in Crypto.PubKey.Curve25519

Methods

rnf :: DhSecret -> () #

NFData PublicKey 
Instance details

Defined in Crypto.PubKey.Curve25519

Methods

rnf :: PublicKey -> () #

NFData SecretKey 
Instance details

Defined in Crypto.PubKey.Curve25519

Methods

rnf :: SecretKey -> () #

NFData DhSecret 
Instance details

Defined in Crypto.PubKey.Curve448

Methods

rnf :: DhSecret -> () #

NFData PublicKey 
Instance details

Defined in Crypto.PubKey.Curve448

Methods

rnf :: PublicKey -> () #

NFData SecretKey 
Instance details

Defined in Crypto.PubKey.Curve448

Methods

rnf :: SecretKey -> () #

NFData Params 
Instance details

Defined in Crypto.PubKey.DH

Methods

rnf :: Params -> () #

NFData PrivateNumber 
Instance details

Defined in Crypto.PubKey.DH

Methods

rnf :: PrivateNumber -> () #

NFData PublicNumber 
Instance details

Defined in Crypto.PubKey.DH

Methods

rnf :: PublicNumber -> () #

NFData SharedKey 
Instance details

Defined in Crypto.PubKey.DH

Methods

rnf :: SharedKey -> () #

NFData KeyPair 
Instance details

Defined in Crypto.PubKey.DSA

Methods

rnf :: KeyPair -> () #

NFData Params 
Instance details

Defined in Crypto.PubKey.DSA

Methods

rnf :: Params -> () #

NFData PrivateKey 
Instance details

Defined in Crypto.PubKey.DSA

Methods

rnf :: PrivateKey -> () #

NFData PublicKey 
Instance details

Defined in Crypto.PubKey.DSA

Methods

rnf :: PublicKey -> () #

NFData Signature 
Instance details

Defined in Crypto.PubKey.DSA

Methods

rnf :: Signature -> () #

NFData Point 
Instance details

Defined in Crypto.PubKey.ECC.P256

Methods

rnf :: Point -> () #

NFData Scalar 
Instance details

Defined in Crypto.PubKey.ECC.P256

Methods

rnf :: Scalar -> () #

NFData CurveBinary 
Instance details

Defined in Crypto.PubKey.ECC.Types

Methods

rnf :: CurveBinary -> () #

NFData Point 
Instance details

Defined in Crypto.PubKey.ECC.Types

Methods

rnf :: Point -> () #

NFData PublicKey 
Instance details

Defined in Crypto.PubKey.Ed25519

Methods

rnf :: PublicKey -> () #

NFData SecretKey 
Instance details

Defined in Crypto.PubKey.Ed25519

Methods

rnf :: SecretKey -> () #

NFData Signature 
Instance details

Defined in Crypto.PubKey.Ed25519

Methods

rnf :: Signature -> () #

NFData PublicKey 
Instance details

Defined in Crypto.PubKey.Ed448

Methods

rnf :: PublicKey -> () #

NFData SecretKey 
Instance details

Defined in Crypto.PubKey.Ed448

Methods

rnf :: SecretKey -> () #

NFData Signature 
Instance details

Defined in Crypto.PubKey.Ed448

Methods

rnf :: Signature -> () #

NFData KeyPair 
Instance details

Defined in Crypto.PubKey.RSA.Types

Methods

rnf :: KeyPair -> () #

NFData PrivateKey 
Instance details

Defined in Crypto.PubKey.RSA.Types

Methods

rnf :: PrivateKey -> () #

NFData PublicKey 
Instance details

Defined in Crypto.PubKey.RSA.Types

Methods

rnf :: PublicKey -> () #

NFData OsChar 
Instance details

Defined in System.OsString.Internal.Types.Hidden

Methods

rnf :: OsChar -> () #

NFData OsString 
Instance details

Defined in System.OsString.Internal.Types.Hidden

Methods

rnf :: OsString -> () #

NFData PosixChar 
Instance details

Defined in System.OsString.Internal.Types.Hidden

Methods

rnf :: PosixChar -> () #

NFData PosixString 
Instance details

Defined in System.OsString.Internal.Types.Hidden

Methods

rnf :: PosixString -> () #

NFData WindowsChar 
Instance details

Defined in System.OsString.Internal.Types.Hidden

Methods

rnf :: WindowsChar -> () #

NFData WindowsString 
Instance details

Defined in System.OsString.Internal.Types.Hidden

Methods

rnf :: WindowsString -> () #

NFData ShortText 
Instance details

Defined in GHC.Data.ShortText

Methods

rnf :: ShortText -> () #

NFData Module 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Module -> () #

NFData Ordering 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Ordering -> () #

NFData TyCon 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: TyCon -> () #

NFData Half 
Instance details

Defined in Numeric.Half.Internal

Methods

rnf :: Half -> () #

NFData Dependencies 
Instance details

Defined in HiFileParser

Methods

rnf :: Dependencies -> () #

NFData Dictionary 
Instance details

Defined in HiFileParser

Methods

rnf :: Dictionary -> () #

NFData Interface 
Instance details

Defined in HiFileParser

Methods

rnf :: Interface -> () #

NFData Module 
Instance details

Defined in HiFileParser

Methods

rnf :: Module -> () #

NFData Usage 
Instance details

Defined in HiFileParser

Methods

rnf :: Usage -> () #

NFData Tix 
Instance details

Defined in Trace.Hpc.Tix

Methods

rnf :: Tix -> () #

NFData TixModule 
Instance details

Defined in Trace.Hpc.Tix

Methods

rnf :: TixModule -> () #

NFData Hash 
Instance details

Defined in Trace.Hpc.Util

Methods

rnf :: Hash -> () #

NFData SockAddr 
Instance details

Defined in Network.Socket.Types

Methods

rnf :: SockAddr -> () #

NFData URI 
Instance details

Defined in Network.URI

Methods

rnf :: URI -> () #

NFData URIAuth 
Instance details

Defined in Network.URI

Methods

rnf :: URIAuth -> () #

NFData OsChar 
Instance details

Defined in System.OsString.Internal.Types

Methods

rnf :: OsChar -> () #

NFData OsString 
Instance details

Defined in System.OsString.Internal.Types

Methods

rnf :: OsString -> () #

NFData PosixChar 
Instance details

Defined in System.OsString.Internal.Types

Methods

rnf :: PosixChar -> () #

NFData PosixString 
Instance details

Defined in System.OsString.Internal.Types

Methods

rnf :: PosixString -> () #

NFData WindowsChar 
Instance details

Defined in System.OsString.Internal.Types

Methods

rnf :: WindowsChar -> () #

NFData WindowsString 
Instance details

Defined in System.OsString.Internal.Types

Methods

rnf :: WindowsString -> () #

NFData SHA256 
Instance details

Defined in Pantry.SHA256

Methods

rnf :: SHA256 -> () #

NFData Archive 
Instance details

Defined in Pantry.Types

Methods

rnf :: Archive -> () #

NFData ArchiveLocation 
Instance details

Defined in Pantry.Types

Methods

rnf :: ArchiveLocation -> () #

NFData BlobKey 
Instance details

Defined in Pantry.Types

Methods

rnf :: BlobKey -> () #

NFData CabalFileInfo 
Instance details

Defined in Pantry.Types

Methods

rnf :: CabalFileInfo -> () #

NFData FileSize 
Instance details

Defined in Pantry.Types

Methods

rnf :: FileSize -> () #

NFData GlobalHintsLocation 
Instance details

Defined in Pantry.Types

Methods

rnf :: GlobalHintsLocation -> () #

NFData ModuleNameP 
Instance details

Defined in Pantry.Types

Methods

rnf :: ModuleNameP -> () #

NFData OptionalSubdirs 
Instance details

Defined in Pantry.Types

Methods

rnf :: OptionalSubdirs -> () #

NFData PackageIdentifierRevision 
Instance details

Defined in Pantry.Types

NFData PackageLocation 
Instance details

Defined in Pantry.Types

Methods

rnf :: PackageLocation -> () #

NFData PackageLocationImmutable 
Instance details

Defined in Pantry.Types

NFData PackageMetadata 
Instance details

Defined in Pantry.Types

Methods

rnf :: PackageMetadata -> () #

NFData PackageNameP 
Instance details

Defined in Pantry.Types

Methods

rnf :: PackageNameP -> () #

NFData RawArchive 
Instance details

Defined in Pantry.Types

Methods

rnf :: RawArchive -> () #

NFData RawPackageLocation 
Instance details

Defined in Pantry.Types

Methods

rnf :: RawPackageLocation -> () #

NFData RawPackageLocationImmutable 
Instance details

Defined in Pantry.Types

NFData RawPackageMetadata 
Instance details

Defined in Pantry.Types

Methods

rnf :: RawPackageMetadata -> () #

NFData RawSnapshotLayer 
Instance details

Defined in Pantry.Types

Methods

rnf :: RawSnapshotLayer -> () #

NFData RawSnapshotLocation 
Instance details

Defined in Pantry.Types

Methods

rnf :: RawSnapshotLocation -> () #

NFData RelFilePath 
Instance details

Defined in Pantry.Types

Methods

rnf :: RelFilePath -> () #

NFData Repo 
Instance details

Defined in Pantry.Types

Methods

rnf :: Repo -> () #

NFData RepoType 
Instance details

Defined in Pantry.Types

Methods

rnf :: RepoType -> () #

NFData Revision 
Instance details

Defined in Pantry.Types

Methods

rnf :: Revision -> () #

NFData SnapName 
Instance details

Defined in Pantry.Types

Methods

rnf :: SnapName -> () #

NFData SnapshotLocation 
Instance details

Defined in Pantry.Types

Methods

rnf :: SnapshotLocation -> () #

NFData TreeKey 
Instance details

Defined in Pantry.Types

Methods

rnf :: TreeKey -> () #

NFData VersionP 
Instance details

Defined in Pantry.Types

Methods

rnf :: VersionP -> () #

NFData WantedCompiler 
Instance details

Defined in Pantry.Types

Methods

rnf :: WantedCompiler -> () #

NFData PersistValue 
Instance details

Defined in Database.Persist.PersistValue

Methods

rnf :: PersistValue -> () #

NFData TextDetails 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

rnf :: TextDetails -> () #

NFData Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Methods

rnf :: Doc -> () #

NFData StdGen 
Instance details

Defined in System.Random.Internal

Methods

rnf :: StdGen -> () #

NFData Scientific 
Instance details

Defined in Data.Scientific

Methods

rnf :: Scientific -> () #

NFData BuildCache Source # 
Instance details

Defined in Stack.Types.Build

Methods

rnf :: BuildCache -> () #

NFData CachePkgSrc Source # 
Instance details

Defined in Stack.Types.Build

Methods

rnf :: CachePkgSrc -> () #

NFData ConfigCache Source # 
Instance details

Defined in Stack.Types.Build

Methods

rnf :: ConfigCache -> () #

NFData ActualCompiler Source # 
Instance details

Defined in Stack.Types.Compiler

Methods

rnf :: ActualCompiler -> () #

NFData StackUnqualCompName Source # 
Instance details

Defined in Stack.Types.ComponentUtils

Methods

rnf :: StackUnqualCompName -> () #

NFData ConfigureOpts Source # 
Instance details

Defined in Stack.Types.ConfigureOpts

Methods

rnf :: ConfigureOpts -> () #

NFData GhcPkgId Source # 
Instance details

Defined in Stack.Types.GhcPkgId

Methods

rnf :: GhcPkgId -> () #

NFData ExeName Source # 
Instance details

Defined in Stack.Types.Package

Methods

rnf :: ExeName -> () #

NFData FileCacheInfo Source # 
Instance details

Defined in Stack.Types.Package

Methods

rnf :: FileCacheInfo -> () #

NFData Bytes128 
Instance details

Defined in Data.StaticBytes

Methods

rnf :: Bytes128 -> () #

NFData Bytes16 
Instance details

Defined in Data.StaticBytes

Methods

rnf :: Bytes16 -> () #

NFData Bytes32 
Instance details

Defined in Data.StaticBytes

Methods

rnf :: Bytes32 -> () #

NFData Bytes64 
Instance details

Defined in Data.StaticBytes

Methods

rnf :: Bytes64 -> () #

NFData Bytes8 
Instance details

Defined in Data.StaticBytes

Methods

rnf :: Bytes8 -> () #

NFData FormatError 
Instance details

Defined in Codec.Archive.Tar.Read

Methods

rnf :: FormatError -> () #

NFData LinkTarget 
Instance details

Defined in Codec.Archive.Tar.Types

Methods

rnf :: LinkTarget -> () #

NFData Ownership 
Instance details

Defined in Codec.Archive.Tar.Types

Methods

rnf :: Ownership -> () #

NFData TarPath 
Instance details

Defined in Codec.Archive.Tar.Types

Methods

rnf :: TarPath -> () #

NFData UnicodeException 
Instance details

Defined in Data.Text.Encoding.Error

Methods

rnf :: UnicodeException -> () #

NFData ShortText 
Instance details

Defined in Data.Text.Short.Internal

Methods

rnf :: ShortText -> () #

NFData Day 
Instance details

Defined in Data.Time.Calendar.Days

Methods

rnf :: Day -> () #

NFData Month 
Instance details

Defined in Data.Time.Calendar.Month

Methods

rnf :: Month -> () #

NFData Quarter 
Instance details

Defined in Data.Time.Calendar.Quarter

Methods

rnf :: Quarter -> () #

NFData QuarterOfYear 
Instance details

Defined in Data.Time.Calendar.Quarter

Methods

rnf :: QuarterOfYear -> () #

NFData DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Methods

rnf :: DiffTime -> () #

NFData NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Methods

rnf :: NominalDiffTime -> () #

NFData UTCTime 
Instance details

Defined in Data.Time.Clock.Internal.UTCTime

Methods

rnf :: UTCTime -> () #

NFData LocalTime 
Instance details

Defined in Data.Time.LocalTime.Internal.LocalTime

Methods

rnf :: LocalTime -> () #

NFData ZonedTime 
Instance details

Defined in Data.Time.LocalTime.Internal.ZonedTime

Methods

rnf :: ZonedTime -> () #

NFData UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

rnf :: UUID -> () #

NFData Integer 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Integer -> () #

NFData Natural 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Natural -> () #

NFData () 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: () -> () #

NFData Bool 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Bool -> () #

NFData Char 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Char -> () #

NFData Double 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Double -> () #

NFData Float 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Float -> () #

NFData Int 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int -> () #

NFData Word 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word -> () #

(NFData a, NFData (Key a)) => NFData (Graph a) 
Instance details

Defined in Distribution.Compat.Graph

Methods

rnf :: Graph a -> () #

NFData a => NFData (NonEmptySet a) 
Instance details

Defined in Distribution.Compat.NonEmptySet

Methods

rnf :: NonEmptySet a -> () #

NFData a => NFData (PerCompilerFlavor a) 
Instance details

Defined in Distribution.Compiler

Methods

rnf :: PerCompilerFlavor a -> () #

NFData c => NFData (Condition c) 
Instance details

Defined in Distribution.Types.Condition

Methods

rnf :: Condition c -> () #

NFData v => NFData (KeyMap v) 
Instance details

Defined in Data.Aeson.KeyMap

Methods

rnf :: KeyMap v -> () #

NFData a => NFData (IResult a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

rnf :: IResult a -> () #

NFData a => NFData (Result a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

rnf :: Result a -> () #

NFData r => NFData (Result r) 
Instance details

Defined in Data.Attoparsec.ByteString.Lazy

Methods

rnf :: Result r -> () #

NFData r => NFData (Result r) 
Instance details

Defined in Data.Attoparsec.Text.Lazy

Methods

rnf :: Result r -> () #

NFData a => NFData (ZipList a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: ZipList a -> () #

NFData (MutableByteArray s) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: MutableByteArray s -> () #

NFData a => NFData (Complex a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Complex a -> () #

NFData a => NFData (Identity a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Identity a -> () #

NFData a => NFData (First a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: First a -> () #

NFData a => NFData (Last a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Last a -> () #

NFData a => NFData (Down a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Down a -> () #

NFData a => NFData (First a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: First a -> () #

NFData a => NFData (Last a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Last a -> () #

NFData a => NFData (Max a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Max a -> () #

NFData a => NFData (Min a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Min a -> () #

NFData m => NFData (WrappedMonoid m) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: WrappedMonoid m -> () #

NFData a => NFData (Dual a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Dual a -> () #

NFData a => NFData (Product a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Product a -> () #

NFData a => NFData (Sum a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Sum a -> () #

NFData a => NFData (NonEmpty a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: NonEmpty a -> () #

NFData (IORef a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: IORef a -> () #

NFData (MVar a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: MVar a -> () #

NFData (FunPtr a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: FunPtr a -> () #

NFData (Ptr a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Ptr a -> () #

NFData a => NFData (Ratio a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Ratio a -> () #

NFData (StableName a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: StableName a -> () #

NFData s => NFData (CI s) 
Instance details

Defined in Data.CaseInsensitive.Internal

Methods

rnf :: CI s -> () #

NFData a => NFData (SCC a) 
Instance details

Defined in Data.Graph

Methods

rnf :: SCC a -> () #

NFData a => NFData (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

rnf :: IntMap a -> () #

NFData a => NFData (Digit a) 
Instance details

Defined in Data.Sequence.Internal

Methods

rnf :: Digit a -> () #

NFData a => NFData (Elem a) 
Instance details

Defined in Data.Sequence.Internal

Methods

rnf :: Elem a -> () #

NFData a => NFData (FingerTree a) 
Instance details

Defined in Data.Sequence.Internal

Methods

rnf :: FingerTree a -> () #

NFData a => NFData (Node a) 
Instance details

Defined in Data.Sequence.Internal

Methods

rnf :: Node a -> () #

NFData a => NFData (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

rnf :: Seq a -> () #

NFData a => NFData (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

rnf :: Set a -> () #

NFData a => NFData (Tree a) 
Instance details

Defined in Data.Tree

Methods

rnf :: Tree a -> () #

NFData (Context a) 
Instance details

Defined in Crypto.Hash.Types

Methods

rnf :: Context a -> () #

NFData (Digest a) 
Instance details

Defined in Crypto.Hash.Types

Methods

rnf :: Digest a -> () #

NFData (KMAC a) 
Instance details

Defined in Crypto.MAC.KMAC

Methods

rnf :: KMAC a -> () #

NFData (KeyedBlake2 a) 
Instance details

Defined in Crypto.MAC.KeyedBlake2

Methods

rnf :: KeyedBlake2 a -> () #

NFData (Scalar curve) => NFData (Signature curve) 
Instance details

Defined in Crypto.PubKey.ECDSA

Methods

rnf :: Signature curve -> () #

NFData (SecretKey curve) 
Instance details

Defined in Crypto.PubKey.EdDSA

Methods

rnf :: SecretKey curve -> () #

NFData1 f => NFData (Fix f) 
Instance details

Defined in Data.Fix

Methods

rnf :: Fix f -> () #

NFData a => NFData (DNonEmpty a) 
Instance details

Defined in Data.DList.DNonEmpty.Internal

Methods

rnf :: DNonEmpty a -> () #

NFData a => NFData (DList a) 
Instance details

Defined in Data.DList.Internal

Methods

rnf :: DList a -> () #

NFData a => NFData (SizedSeq a) 
Instance details

Defined in GHC.Data.SizedSeq

Methods

rnf :: SizedSeq a -> () #

NFData a => NFData (Hashed a) 
Instance details

Defined in Data.Hashable.Class

Methods

rnf :: Hashed a -> () #

NFData a => NFData (List a) 
Instance details

Defined in HiFileParser

Methods

rnf :: List a -> () #

NFData (ResolvedPath t) 
Instance details

Defined in Pantry.Types

Methods

rnf :: ResolvedPath t -> () #

NFData (SomeBase t) 
Instance details

Defined in Path.Posix

Methods

rnf :: SomeBase t -> () #

NFData (SomeBase t) 
Instance details

Defined in Path.Windows

Methods

rnf :: SomeBase t -> () #

NFData a => NFData (AnnotDetails a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

rnf :: AnnotDetails a -> () #

NFData a => NFData (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

rnf :: Doc a -> () #

NFData a => NFData (Array a) 
Instance details

Defined in Data.Primitive.Array

Methods

rnf :: Array a -> () #

NFData (PrimArray a) 
Instance details

Defined in Data.Primitive.PrimArray

Methods

rnf :: PrimArray a -> () #

NFData a => NFData (SmallArray a) 
Instance details

Defined in Data.Primitive.SmallArray

Methods

rnf :: SmallArray a -> () #

NFData g => NFData (StateGen g) 
Instance details

Defined in System.Random.Internal

Methods

rnf :: StateGen g -> () #

NFData g => NFData (AtomicGen g) 
Instance details

Defined in System.Random.Stateful

Methods

rnf :: AtomicGen g -> () #

NFData g => NFData (IOGen g) 
Instance details

Defined in System.Random.Stateful

Methods

rnf :: IOGen g -> () #

NFData g => NFData (STGen g) 
Instance details

Defined in System.Random.Stateful

Methods

rnf :: STGen g -> () #

NFData g => NFData (TGen g) 
Instance details

Defined in System.Random.Stateful

Methods

rnf :: TGen g -> () #

NFData (PrecompiledCache Abs) Source # 
Instance details

Defined in Stack.Types.Build

Methods

rnf :: PrecompiledCache Abs -> () #

NFData (PrecompiledCache Rel) Source # 
Instance details

Defined in Stack.Types.Build

Methods

rnf :: PrecompiledCache Rel -> () #

NFData a => NFData (Maybe a) 
Instance details

Defined in Data.Strict.Maybe

Methods

rnf :: Maybe a -> () #

NFData linkTarget => NFData (GenEntryContent linkTarget) 
Instance details

Defined in Codec.Archive.Tar.Types

Methods

rnf :: GenEntryContent linkTarget -> () #

NFData a => NFData (Array a) 
Instance details

Defined in Data.HashMap.Internal.Array

Methods

rnf :: Array a -> () #

NFData a => NFData (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Methods

rnf :: HashSet a -> () #

NFData a => NFData (Vector a) 
Instance details

Defined in Data.Vector

Methods

rnf :: Vector a -> () #

NFData (Vector a) 
Instance details

Defined in Data.Vector.Primitive

Methods

rnf :: Vector a -> () #

NFData (Vector a) 
Instance details

Defined in Data.Vector.Storable

Methods

rnf :: Vector a -> () #

NFData a => NFData (Vector a) 
Instance details

Defined in Data.Vector.Strict

Methods

rnf :: Vector a -> () #

NFData (Vector a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

rnf :: Vector a -> () #

NFData a => NFData (Maybe a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Maybe a -> () #

NFData a => NFData (Solo a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Solo a -> () #

NFData a => NFData [a] 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: [a] -> () #

NFData (SymbolicPath from to) 
Instance details

Defined in Distribution.Utils.Path

Methods

rnf :: SymbolicPath from to -> () #

(NFData i, NFData r) => NFData (IResult i r) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

rnf :: IResult i r -> () #

(NFData a, NFData b) => NFData (Either a b) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Either a b -> () #

NFData (Fixed a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Fixed a -> () #

NFData (Proxy a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Proxy a -> () #

(NFData a, NFData b) => NFData (Arg a b) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Arg a b -> () #

NFData (TypeRep a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: TypeRep a -> () #

(NFData a, NFData b) => NFData (Array a b) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Array a b -> () #

NFData (STRef s a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: STRef s a -> () #

(NFData k, NFData a) => NFData (Map k a) 
Instance details

Defined in Data.Map.Internal

Methods

rnf :: Map k a -> () #

NFData (PublicKey curve hash) 
Instance details

Defined in Crypto.PubKey.EdDSA

Methods

rnf :: PublicKey curve hash -> () #

NFData (Signature curve hash) 
Instance details

Defined in Crypto.PubKey.EdDSA

Methods

rnf :: Signature curve hash -> () #

NFData (Path b t) 
Instance details

Defined in Path.Internal.Posix

Methods

rnf :: Path b t -> () #

NFData (Path b t) 
Instance details

Defined in Path.Internal.Windows

Methods

rnf :: Path b t -> () #

NFData (MutablePrimArray s a) 
Instance details

Defined in Data.Primitive.PrimArray

Methods

rnf :: MutablePrimArray s a -> () #

(NFData a, NFData b) => NFData (Either a b) 
Instance details

Defined in Data.Strict.Either

Methods

rnf :: Either a b -> () #

(NFData a, NFData b) => NFData (These a b) 
Instance details

Defined in Data.Strict.These

Methods

rnf :: These a b -> () #

(NFData a, NFData b) => NFData (Pair a b) 
Instance details

Defined in Data.Strict.Tuple

Methods

rnf :: Pair a b -> () #

(NFData tarPath, NFData linkTarget) => NFData (GenEntry tarPath linkTarget) 
Instance details

Defined in Codec.Archive.Tar.Types

Methods

rnf :: GenEntry tarPath linkTarget -> () #

(NFData a, NFData b) => NFData (These a b) 
Instance details

Defined in Data.These

Methods

rnf :: These a b -> () #

(NFData k, NFData v) => NFData (HashMap k v) 
Instance details

Defined in Data.HashMap.Internal

Methods

rnf :: HashMap k v -> () #

(NFData k, NFData v) => NFData (Leaf k v) 
Instance details

Defined in Data.HashMap.Internal

Methods

rnf :: Leaf k v -> () #

NFData (MVector s a) 
Instance details

Defined in Data.Vector.Primitive.Mutable

Methods

rnf :: MVector s a -> () #

NFData (MVector s a) 
Instance details

Defined in Data.Vector.Storable.Mutable

Methods

rnf :: MVector s a -> () #

NFData (MVector s a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

rnf :: MVector s a -> () #

(NFData a, NFData b) => NFData (a, b) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a, b) -> () #

NFData (a -> b) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a -> b) -> () #

(NFData v, NFData c, NFData a) => NFData (CondBranch v c a) 
Instance details

Defined in Distribution.Types.CondTree

Methods

rnf :: CondBranch v c a -> () #

(NFData v, NFData c, NFData a) => NFData (CondTree v c a) 
Instance details

Defined in Distribution.Types.CondTree

Methods

rnf :: CondTree v c a -> () #

NFData a => NFData (Const a b) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Const a b -> () #

NFData (a :~: b) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a :~: b) -> () #

NFData b => NFData (Tagged s b) 
Instance details

Defined in Data.Tagged

Methods

rnf :: Tagged s b -> () #

(NFData tarPath, NFData linkTarget, NFData e) => NFData (GenEntries tarPath linkTarget e) 
Instance details

Defined in Codec.Archive.Tar.Types

Methods

rnf :: GenEntries tarPath linkTarget e -> () #

(NFData (f a), NFData (g a), NFData a) => NFData (These1 f g a) 
Instance details

Defined in Data.Functor.These

Methods

rnf :: These1 f g a -> () #

(NFData a1, NFData a2, NFData a3) => NFData (a1, a2, a3) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a1, a2, a3) -> () #

(NFData (f a), NFData (g a)) => NFData (Product f g a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Product f g a -> () #

(NFData (f a), NFData (g a)) => NFData (Sum f g a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Sum f g a -> () #

NFData (a :~~: b) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a :~~: b) -> () #

(NFData a1, NFData a2, NFData a3, NFData a4) => NFData (a1, a2, a3, a4) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a1, a2, a3, a4) -> () #

NFData (f (g a)) => NFData (Compose f g a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Compose f g a -> () #

(NFData a1, NFData a2, NFData a3, NFData a4, NFData a5) => NFData (a1, a2, a3, a4, a5) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a1, a2, a3, a4, a5) -> () #

(NFData a1, NFData a2, NFData a3, NFData a4, NFData a5, NFData a6) => NFData (a1, a2, a3, a4, a5, a6) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a1, a2, a3, a4, a5, a6) -> () #

(NFData a1, NFData a2, NFData a3, NFData a4, NFData a5, NFData a6, NFData a7) => NFData (a1, a2, a3, a4, a5, a6, a7) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a1, a2, a3, a4, a5, a6, a7) -> () #

(NFData a1, NFData a2, NFData a3, NFData a4, NFData a5, NFData a6, NFData a7, NFData a8) => NFData (a1, a2, a3, a4, a5, a6, a7, a8) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a1, a2, a3, a4, a5, a6, a7, a8) -> () #

(NFData a1, NFData a2, NFData a3, NFData a4, NFData a5, NFData a6, NFData a7, NFData a8, NFData a9) => NFData (a1, a2, a3, a4, a5, a6, a7, a8, a9) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a1, a2, a3, a4, a5, a6, a7, a8, a9) -> () #

set :: ASetter s t a b -> b -> s -> t #

to :: (s -> a) -> SimpleGetter s a #

type BDeque = Deque MVector #

data Deque (v :: Type -> Type -> Type) s a #

type SDeque = Deque MVector #

type UDeque = Deque MVector #

asBDeque :: BDeque s a -> BDeque s a #

asSDeque :: SDeque s a -> SDeque s a #

asUDeque :: UDeque s a -> UDeque s a #

dequeToList :: forall (v :: Type -> Type -> Type) a m. (MVector v a, PrimMonad m) => Deque v (PrimState m) a -> m [a] #

dequeToVector :: forall v' a (v :: Type -> Type -> Type) m. (Vector v' a, MVector v a, PrimMonad m) => Deque v (PrimState m) a -> m (v' a) #

foldlDeque :: forall (v :: Type -> Type -> Type) a m acc. (MVector v a, PrimMonad m) => (acc -> a -> m acc) -> acc -> Deque v (PrimState m) a -> m acc #

foldrDeque :: forall (v :: Type -> Type -> Type) a m acc. (MVector v a, PrimMonad m) => (a -> acc -> m acc) -> acc -> Deque v (PrimState m) a -> m acc #

freezeDeque :: (Vector v a, PrimMonad m) => Deque (Mutable v) (PrimState m) a -> m (v a) #

getDequeSize :: forall m (v :: Type -> Type -> Type) a. PrimMonad m => Deque v (PrimState m) a -> m Int #

newDeque :: forall (v :: Type -> Type -> Type) a m. (MVector v a, PrimMonad m) => m (Deque v (PrimState m) a) #

popBackDeque :: forall (v :: Type -> Type -> Type) a m. (MVector v a, PrimMonad m) => Deque v (PrimState m) a -> m (Maybe a) #

popFrontDeque :: forall (v :: Type -> Type -> Type) a m. (MVector v a, PrimMonad m) => Deque v (PrimState m) a -> m (Maybe a) #

pushBackDeque :: forall (v :: Type -> Type -> Type) a m. (MVector v a, PrimMonad m) => Deque v (PrimState m) a -> a -> m () #

pushFrontDeque :: forall (v :: Type -> Type -> Type) a m. (MVector v a, PrimMonad m) => Deque v (PrimState m) a -> a -> m () #

asIO :: IO a -> IO a #

forMaybeA :: Applicative f => [a] -> (a -> f (Maybe b)) -> f [b] #

forMaybeM :: Monad m => [a] -> (a -> m (Maybe b)) -> m [b] #

fromFirst :: a -> First a -> a #

mapLeft :: (a1 -> a2) -> Either a1 b -> Either a2 b #

mapMaybeA :: Applicative f => (a -> f (Maybe b)) -> [a] -> f [b] #

unlessM :: Monad m => m Bool -> m () -> m () #

whenM :: Monad m => m Bool -> m () -> m () #

hPutBuilder :: MonadIO m => Handle -> Builder -> m () #

withLazyFile :: MonadUnliftIO m => FilePath -> (ByteString -> m a) -> m a #

withLazyFileUtf8 :: MonadUnliftIO m => FilePath -> (Text -> m a) -> m a #

writeFileUtf8 :: MonadIO m => FilePath -> Text -> m () #

data GLogFunc msg #

Instances

Instances details
Contravariant GLogFunc 
Instance details

Defined in RIO.Prelude.Logger

Methods

contramap :: (a' -> a) -> GLogFunc a -> GLogFunc a'

(>$) :: b -> GLogFunc b -> GLogFunc a

Monoid (GLogFunc msg) 
Instance details

Defined in RIO.Prelude.Logger

Methods

mempty :: GLogFunc msg #

mappend :: GLogFunc msg -> GLogFunc msg -> GLogFunc msg #

mconcat :: [GLogFunc msg] -> GLogFunc msg #

Semigroup (GLogFunc msg) 
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

HasGLogFunc (GLogFunc msg) 
Instance details

Defined in RIO.Prelude.Logger

Associated Types

type GMsg (GLogFunc msg) 
Instance details

Defined in RIO.Prelude.Logger

type GMsg (GLogFunc msg) = msg

Methods

gLogFuncL :: Lens' (GLogFunc msg) (GLogFunc (GMsg (GLogFunc msg))) #

type GMsg (GLogFunc msg) 
Instance details

Defined in RIO.Prelude.Logger

type GMsg (GLogFunc msg) = msg

class HasGLogFunc env where #

Associated Types

type GMsg env #

Methods

gLogFuncL :: Lens' env (GLogFunc (GMsg env)) #

Instances

Instances details
HasGLogFunc (GLogFunc msg) 
Instance details

Defined in RIO.Prelude.Logger

Associated Types

type GMsg (GLogFunc msg) 
Instance details

Defined in RIO.Prelude.Logger

type GMsg (GLogFunc msg) = msg

Methods

gLogFuncL :: Lens' (GLogFunc msg) (GLogFunc (GMsg (GLogFunc msg))) #

type family GMsg env #

Instances

Instances details
type GMsg (GLogFunc msg) 
Instance details

Defined in RIO.Prelude.Logger

type GMsg (GLogFunc msg) = msg

class HasLogLevel msg where #

Methods

getLogLevel :: msg -> LogLevel #

class HasLogSource msg where #

Methods

getLogSource :: msg -> LogSource #

data LogLevel #

Instances

Instances details
Read LogLevel 
Instance details

Defined in RIO.Prelude.Logger

Methods

readsPrec :: Int -> ReadS LogLevel

readList :: ReadS [LogLevel]

readPrec :: ReadPrec LogLevel

readListPrec :: ReadPrec [LogLevel]

Show LogLevel 
Instance details

Defined in RIO.Prelude.Logger

Methods

showsPrec :: Int -> LogLevel -> ShowS

show :: LogLevel -> String #

showList :: [LogLevel] -> ShowS

Eq LogLevel 
Instance details

Defined in RIO.Prelude.Logger

Ord LogLevel 
Instance details

Defined in RIO.Prelude.Logger

data LogFunc #

Instances

Instances details
Monoid LogFunc 
Instance details

Defined in RIO.Prelude.Logger

Semigroup LogFunc 
Instance details

Defined in RIO.Prelude.Logger

HasLogFunc LogFunc 
Instance details

Defined in RIO.Prelude.Logger

contramapGLogFunc :: (a -> b) -> GLogFunc b -> GLogFunc a #

glog :: (MonadIO m, HasCallStack, HasGLogFunc env, MonadReader env m) => GMsg env -> m () #

mkGLogFunc :: (CallStack -> msg -> IO ()) -> GLogFunc msg #

newLogFunc :: (MonadIO n, MonadIO m) => LogOptions -> n (LogFunc, m ()) #

noLogging :: (HasLogFunc env, MonadReader env m) => m a -> m a #

withLogFunc :: MonadUnliftIO m => LogOptions -> (LogFunc -> m a) -> m a #

class HasStateRef s env | env -> s where #

Methods

stateRefL :: Lens' env (SomeRef s) #

Instances

Instances details
HasStateRef a (SomeRef a) 
Instance details

Defined in RIO.Prelude.RIO

Methods

stateRefL :: Lens' (SomeRef a) (SomeRef a) #

class HasWriteRef w env | env -> w where #

Methods

writeRefL :: Lens' env (SomeRef w) #

Instances

Instances details
HasWriteRef a (SomeRef a) 
Instance details

Defined in RIO.Prelude.RIO

Methods

writeRefL :: Lens' (SomeRef a) (SomeRef a) #

data SomeRef a #

Instances

Instances details
HasStateRef a (SomeRef a) 
Instance details

Defined in RIO.Prelude.RIO

Methods

stateRefL :: Lens' (SomeRef a) (SomeRef a) #

HasWriteRef a (SomeRef a) 
Instance details

Defined in RIO.Prelude.RIO

Methods

writeRefL :: Lens' (SomeRef a) (SomeRef a) #

liftRIO :: (MonadIO m, MonadReader env m) => RIO env a -> m a #

mapRIO :: (outer -> inner) -> RIO inner a -> RIO outer a #

modifySomeRef :: MonadIO m => SomeRef a -> (a -> a) -> m () #

newSomeRef :: MonadIO m => a -> m (SomeRef a) #

newUnboxedSomeRef :: (MonadIO m, Unbox a) => a -> m (SomeRef a) #

readSomeRef :: MonadIO m => SomeRef a -> m a #

runRIO :: MonadIO m => env -> RIO env a -> m a #

writeSomeRef :: MonadIO m => SomeRef a -> a -> m () #

type GVector = Vector #

type LText = Text #

type SVector = Vector #

type UVector = Vector #

sappend :: Semigroup s => s -> s -> s #

yieldThread :: MonadIO m => m () #

data SimpleApp #

Instances

Instances details
HasLogFunc SimpleApp 
Instance details

Defined in RIO.Prelude.Simple

HasProcessContext SimpleApp 
Instance details

Defined in RIO.Prelude.Simple

Methods

processContextL :: Lens' SimpleApp ProcessContext

mkSimpleApp :: MonadIO m => LogFunc -> Maybe ProcessContext -> m SimpleApp #

tshow :: Show a => a -> Text #

traceDisplay :: Display a => a -> b -> b #

traceDisplayEvent :: Display a => a -> b -> b #

traceDisplayEventIO :: (Display a, MonadIO m) => a -> m () #

traceDisplayIO :: (Display a, MonadIO m) => a -> m () #

traceDisplayId :: Display a => a -> a #

traceDisplayM :: (Display a, Applicative f) => a -> f () #

traceDisplayMarker :: Display a => a -> b -> b #

traceDisplayMarkerIO :: (Display a, MonadIO m) => a -> m () #

traceDisplayStack :: Display a => a -> b -> b #

traceShowEvent :: Show a => a -> b -> b #

traceShowEventIO :: (Show a, MonadIO m) => a -> m () #

traceShowIO :: (Show a, MonadIO m) => a -> m () #

traceShowMarker :: Show a => a -> b -> b #

traceShowMarkerIO :: (Show a, MonadIO m) => a -> m () #

traceShowStack :: Show a => a -> b -> b #

data URef s a #

modifyURef :: (PrimMonad m, Unbox a) => URef (PrimState m) a -> (a -> a) -> m () #

newURef :: (PrimMonad m, Unbox a) => a -> m (URef (PrimState m) a) #

readURef :: (PrimMonad m, Unbox a) => URef (PrimState m) a -> m a #

writeURef :: (PrimMonad m, Unbox a) => URef (PrimState m) a -> a -> m () #

waitAnySTM :: [Async a] -> STM (Async a, a) #

waitBothSTM :: Async a -> Async b -> STM (a, b) #

waitEitherSTM :: Async a -> Async b -> STM (Either a b) #

waitEitherSTM_ :: Async a -> Async b -> STM () #

waitSTM :: Async a -> STM a #

biList :: Bifoldable t => t a a -> [a] #

biall :: Bifoldable t => (a -> Bool) -> (b -> Bool) -> t a b -> Bool #

biany :: Bifoldable t => (a -> Bool) -> (b -> Bool) -> t a b -> Bool #

biasum :: (Bifoldable t, Alternative f) => t (f a) (f a) -> f a #

biconcat :: Bifoldable t => t [a] [a] -> [a] #

biconcatMap :: Bifoldable t => (a -> [c]) -> (b -> [c]) -> t a b -> [c] #

bielem :: (Bifoldable t, Eq a) => a -> t a a -> Bool #

bifind :: Bifoldable t => (a -> Bool) -> t a a -> Maybe a #

bifoldl' :: Bifoldable t => (a -> b -> a) -> (a -> c -> a) -> a -> t b c -> a #

bifoldl1 :: Bifoldable t => (a -> a -> a) -> t a a -> a #

bifoldlM :: (Bifoldable t, Monad m) => (a -> b -> m a) -> (a -> c -> m a) -> a -> t b c -> m a #

bifoldr' :: Bifoldable t => (a -> c -> c) -> (b -> c -> c) -> c -> t a b -> c #

bifoldr1 :: Bifoldable t => (a -> a -> a) -> t a a -> a #

bifoldrM :: (Bifoldable t, Monad m) => (a -> c -> m c) -> (b -> c -> m c) -> c -> t a b -> m c #

bifor_ :: (Bifoldable t, Applicative f) => t a b -> (a -> f c) -> (b -> f d) -> f () #

bilength :: Bifoldable t => t a b -> Int #

bimaximum :: (Bifoldable t, Ord a) => t a a -> a #

bimaximumBy :: Bifoldable t => (a -> a -> Ordering) -> t a a -> a #

biminimum :: (Bifoldable t, Ord a) => t a a -> a #

biminimumBy :: Bifoldable t => (a -> a -> Ordering) -> t a a -> a #

binotElem :: (Bifoldable t, Eq a) => a -> t a a -> Bool #

binull :: Bifoldable t => t a b -> Bool #

bior :: Bifoldable t => t Bool Bool -> Bool #

biproduct :: (Bifoldable t, Num a) => t a a -> a #

bisequence_ :: (Bifoldable t, Applicative f) => t (f a) (f b) -> f () #

bisum :: (Bifoldable t, Num a) => t a a -> a #

bitraverse_ :: (Bifoldable t, Applicative f) => (a -> f c) -> (b -> f d) -> t a b -> f () #

bifor :: (Bitraversable t, Applicative f) => t a b -> (a -> f c) -> (b -> f d) -> f (t c d) #

bimapAccumL :: Bitraversable t => (a -> b -> (a, c)) -> (a -> d -> (a, e)) -> a -> t b d -> (a, t c e) #

bimapAccumR :: Bitraversable t => (a -> b -> (a, c)) -> (a -> d -> (a, e)) -> a -> t b d -> (a, t c e) #

bisequence :: (Bitraversable t, Applicative f) => t (f a) (f b) -> f (t a b) #

($!!) :: NFData a => (a -> b) -> a -> b #

(%~) :: ASetter s t a b -> (a -> b) -> s -> t #

(.~) :: ASetter s t a b -> b -> s -> t #

(^.) :: s -> Getting a s a -> a #

(^..) :: s -> Getting (Endo [a]) s a -> [a] #

(^?) :: s -> Getting (First a) s a -> Maybe a #

lens :: (s -> a) -> (s -> b -> t) -> Lens s t a b #

over :: ASetter s t a b -> (a -> b) -> s -> t #

sets :: ((a -> b) -> s -> t) -> ASetter s t a b #

preview :: MonadReader s m => Getting (First a) s a -> m (Maybe a) #

view :: MonadReader s m => Getting a s a -> m a #

asks :: MonadReader r m => (r -> a) -> m a #

unGetTBQueue :: TBQueue a -> a -> STM () #

writeTBQueue :: TBQueue a -> a -> STM () #

cloneTChan :: TChan a -> STM (TChan a) #

dupTChan :: TChan a -> STM (TChan a) #

peekTChan :: TChan a -> STM a #

readTChan :: TChan a -> STM a #

unGetTChan :: TChan a -> a -> STM () #

writeTChan :: TChan a -> a -> STM () #

newTMVar :: a -> STM (TMVar a) #

putTMVar :: TMVar a -> a -> STM () #

readTMVar :: TMVar a -> STM a #

swapTMVar :: TMVar a -> a -> STM a #

takeTMVar :: TMVar a -> STM a #

tryPutTMVar :: TMVar a -> a -> STM Bool #

writeTMVar :: TMVar a -> a -> STM () #

unGetTQueue :: TQueue a -> a -> STM () #

writeTQueue :: TQueue a -> a -> STM () #

modifyTVar :: TVar a -> (a -> a) -> STM () #

modifyTVar' :: TVar a -> (a -> a) -> STM () #

stateTVar :: TVar s -> (s -> (a, s)) -> STM a #

swapTVar :: TVar a -> a -> STM a #

decodeUtf8With :: OnDecodeError -> ByteString -> Text #

lenientDecode :: OnDecodeError #

runReader :: Reader r a -> r -> a #

bracketOnError_ :: MonadUnliftIO m => m a -> m b -> m c -> m c #

catchAny :: MonadUnliftIO m => m a -> (SomeException -> m a) -> m a #

catchAnyDeep :: (NFData a, MonadUnliftIO m) => m a -> (SomeException -> m a) -> m a #

catchDeep :: (MonadUnliftIO m, Exception e, NFData a) => m a -> (e -> m a) -> m a #

catchSyncOrAsync :: (MonadUnliftIO m, Exception e) => m a -> (e -> m a) -> m a #

catchesDeep :: (MonadUnliftIO m, NFData a) => m a -> [Handler m a] -> m a #

evaluateDeep :: (MonadIO m, NFData a) => a -> m a #

fromEither :: (Exception e, MonadIO m) => Either e a -> m a #

fromEitherIO :: (Exception e, MonadIO m) => IO (Either e a) -> m a #

fromEitherM :: (Exception e, MonadIO m) => m (Either e a) -> m a #

handleAny :: MonadUnliftIO m => (SomeException -> m a) -> m a -> m a #

handleAnyDeep :: (MonadUnliftIO m, NFData a) => (SomeException -> m a) -> m a -> m a #

handleDeep :: (MonadUnliftIO m, Exception e, NFData a) => (e -> m a) -> m a -> m a #

handleIO :: MonadUnliftIO m => (IOException -> m a) -> m a -> m a #

handleSyncOrAsync :: (MonadUnliftIO m, Exception e) => (e -> m a) -> m a -> m a #

impureThrow :: Exception e => e -> a #

mapExceptionM :: (Exception e1, Exception e2, MonadUnliftIO m) => (e1 -> e2) -> m a -> m a #

tryDeep :: (MonadUnliftIO m, Exception e, NFData a) => m a -> m (Either e a) #

tryIO :: MonadUnliftIO m => m a -> m (Either IOException a) #

trySyncOrAsync :: (MonadUnliftIO m, Exception e) => m a -> m (Either e a) #

withException :: (MonadUnliftIO m, Exception e) => m a -> (e -> m b) -> m a #

asyncBound :: MonadUnliftIO m => m a -> m (Async a) #

asyncOn :: MonadUnliftIO m => Int -> m a -> m (Async a) #

asyncOnWithUnmask :: MonadUnliftIO m => Int -> ((forall b. m b -> m b) -> m a) -> m (Async a) #

asyncWithUnmask :: MonadUnliftIO m => ((forall b. m b -> m b) -> m a) -> m (Async a) #

cancel :: MonadIO m => Async a -> m () #

cancelWith :: (Exception e, MonadIO m) => Async a -> e -> m () #

conc :: m a -> Conc m a #

concurrently :: MonadUnliftIO m => m a -> m b -> m (a, b) #

concurrently_ :: MonadUnliftIO m => m a -> m b -> m () #

forConcurrently :: (MonadUnliftIO m, Traversable t) => t a -> (a -> m b) -> m (t b) #

forConcurrently_ :: (MonadUnliftIO m, Foldable f) => f a -> (a -> m b) -> m () #

link :: MonadIO m => Async a -> m () #

link2 :: MonadIO m => Async a -> Async b -> m () #

mapConcurrently :: (MonadUnliftIO m, Traversable t) => (a -> m b) -> t a -> m (t b) #

mapConcurrently_ :: (MonadUnliftIO m, Foldable f) => (a -> m b) -> f a -> m () #

pooledForConcurrently :: (MonadUnliftIO m, Traversable t) => t a -> (a -> m b) -> m (t b) #

pooledForConcurrentlyN :: (MonadUnliftIO m, Traversable t) => Int -> t a -> (a -> m b) -> m (t b) #

pooledForConcurrentlyN_ :: (MonadUnliftIO m, Foldable t) => Int -> t a -> (a -> m b) -> m () #

pooledForConcurrently_ :: (MonadUnliftIO m, Foldable f) => f a -> (a -> m b) -> m () #

pooledMapConcurrently :: (MonadUnliftIO m, Traversable t) => (a -> m b) -> t a -> m (t b) #

pooledMapConcurrentlyN :: (MonadUnliftIO m, Traversable t) => Int -> (a -> m b) -> t a -> m (t b) #

pooledMapConcurrentlyN_ :: (MonadUnliftIO m, Foldable f) => Int -> (a -> m b) -> f a -> m () #

pooledMapConcurrently_ :: (MonadUnliftIO m, Foldable f) => (a -> m b) -> f a -> m () #

race :: MonadUnliftIO m => m a -> m b -> m (Either a b) #

race_ :: MonadUnliftIO m => m a -> m b -> m () #

replicateConcurrently :: MonadUnliftIO f => Int -> f a -> f [a] #

runConc :: MonadUnliftIO m => Conc m a -> m a #

wait :: MonadIO m => Async a -> m a #

waitAny :: MonadIO m => [Async a] -> m (Async a, a) #

waitAnyCancel :: MonadIO m => [Async a] -> m (Async a, a) #

waitBoth :: MonadIO m => Async a -> Async b -> m (a, b) #

waitEither :: MonadIO m => Async a -> Async b -> m (Either a b) #

waitEitherCancel :: MonadIO m => Async a -> Async b -> m (Either a b) #

waitEither_ :: MonadIO m => Async a -> Async b -> m () #

withAsync :: MonadUnliftIO m => m a -> (Async a -> m b) -> m b #

withAsyncBound :: MonadUnliftIO m => m a -> (Async a -> m b) -> m b #

withAsyncOn :: MonadUnliftIO m => Int -> m a -> (Async a -> m b) -> m b #

withAsyncOnWithUnmask :: MonadUnliftIO m => Int -> ((forall c. m c -> m c) -> m a) -> (Async a -> m b) -> m b #

withAsyncWithUnmask :: MonadUnliftIO m => ((forall c. m c -> m c) -> m a) -> (Async a -> m b) -> m b #

memoizeMVar :: MonadUnliftIO m => m a -> m (Memoized a) #

memoizeRef :: MonadUnliftIO m => m a -> m (Memoized a) #

runMemoized :: MonadIO m => Memoized a -> m a #

withQSem :: MonadUnliftIO m => QSem -> m a -> m a #

withQSemN :: MonadUnliftIO m => QSemN -> Int -> m a -> m a #

checkSTM :: Bool -> STM () #

mkWeakTMVar :: MonadUnliftIO m => TMVar a -> m () -> m (Weak (TMVar a)) #

mkWeakTVar :: MonadUnliftIO m => TVar a -> m () -> m (Weak (TVar a)) #

newTChanIO :: MonadIO m => m (TChan a) #

newTMVarIO :: MonadIO m => a -> m (TMVar a) #

newTQueueIO :: MonadIO m => m (TQueue a) #

withSystemTempFile :: MonadUnliftIO m => String -> (FilePath -> Handle -> m a) -> m a #

askRunInIO :: MonadUnliftIO m => m (m a -> IO a) #

liftIOOp :: MonadUnliftIO m => (IO a -> IO b) -> m a -> m b #

toIO :: MonadUnliftIO m => m a -> m (IO a) #

withUnliftIO :: MonadUnliftIO m => (UnliftIO m -> IO a) -> m a #

wrappedWithRunInIO :: MonadUnliftIO n => (n b -> m b) -> (forall a. m a -> n a) -> ((forall a. m a -> IO a) -> IO b) -> m b #

data Async a #

Instances

Instances details
Functor Async 
Instance details

Defined in Control.Concurrent.Async.Internal

Methods

fmap :: (a -> b) -> Async a -> Async b #

(<$) :: a -> Async b -> Async a #

Eq (Async a) 
Instance details

Defined in Control.Concurrent.Async.Internal

Methods

(==) :: Async a -> Async a -> Bool #

(/=) :: Async a -> Async a -> Bool #

Ord (Async a) 
Instance details

Defined in Control.Concurrent.Async.Internal

Methods

compare :: Async a -> Async a -> Ordering #

(<) :: Async a -> Async a -> Bool #

(<=) :: Async a -> Async a -> Bool #

(>) :: Async a -> Async a -> Bool #

(>=) :: Async a -> Async a -> Bool #

max :: Async a -> Async a -> Async a #

min :: Async a -> Async a -> Async a #

Hashable (Async a) 
Instance details

Defined in Control.Concurrent.Async.Internal

Methods

hashWithSalt :: Int -> Async a -> Int

hash :: Async a -> Int

class Bifoldable (p :: Type -> Type -> Type) where #

Minimal complete definition

bifoldr | bifoldMap

Methods

bifold :: Monoid m => p m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> p a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> p a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> p a b -> c #

Instances

Instances details
Bifoldable TkArray 
Instance details

Defined in Data.Aeson.Decoding.Tokens

Methods

bifold :: Monoid m => TkArray m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> TkArray a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> TkArray a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> TkArray a b -> c #

Bifoldable TkRecord 
Instance details

Defined in Data.Aeson.Decoding.Tokens

Methods

bifold :: Monoid m => TkRecord m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> TkRecord a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> TkRecord a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> TkRecord a b -> c #

Bifoldable Tokens 
Instance details

Defined in Data.Aeson.Decoding.Tokens

Methods

bifold :: Monoid m => Tokens m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> Tokens a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> Tokens a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> Tokens a b -> c #

Bifoldable Either 
Instance details

Defined in Data.Bifoldable

Methods

bifold :: Monoid m => Either m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> Either a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> Either a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> Either a b -> c #

Bifoldable Arg 
Instance details

Defined in Data.Semigroup

Methods

bifold :: Monoid m => Arg m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> Arg a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> Arg a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> Arg a b -> c #

Bifoldable Map 
Instance details

Defined in Data.Map.Internal

Methods

bifold :: Monoid m => Map m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> Map a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> Map a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> Map a b -> c #

Bifoldable Product 
Instance details

Defined in Data.Aeson.Config.Types

Methods

bifold :: Monoid m => Product m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> Product a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> Product a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> Product a b -> c #

Bifoldable Either 
Instance details

Defined in Data.Strict.Either

Methods

bifold :: Monoid m => Either m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> Either a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> Either a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> Either a b -> c #

Bifoldable These 
Instance details

Defined in Data.Strict.These

Methods

bifold :: Monoid m => These m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> These a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> These a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> These a b -> c #

Bifoldable Pair 
Instance details

Defined in Data.Strict.Tuple

Methods

bifold :: Monoid m => Pair m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> Pair a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> Pair a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> Pair a b -> c #

Bifoldable These 
Instance details

Defined in Data.These

Methods

bifold :: Monoid m => These m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> These a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> These a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> These a b -> c #

Bifoldable HashMap 
Instance details

Defined in Data.HashMap.Internal

Methods

bifold :: Monoid m => HashMap m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> HashMap a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> HashMap a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> HashMap a b -> c #

Bifoldable (,) 
Instance details

Defined in Data.Bifoldable

Methods

bifold :: Monoid m => (m, m) -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> (a, b) -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> (a, b) -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> (a, b) -> c #

Bifoldable (Const :: Type -> Type -> Type) 
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 #

Bifoldable (Tagged :: Type -> Type -> Type) 
Instance details

Defined in Data.Tagged

Methods

bifold :: Monoid m => Tagged m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> Tagged a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> Tagged a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> Tagged a b -> c #

Bifoldable (Constant :: Type -> Type -> Type) 
Instance details

Defined in Data.Functor.Constant

Methods

bifold :: Monoid m => Constant m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> Constant a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> Constant a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> Constant a b -> c #

Bifoldable ((,,) x) 
Instance details

Defined in Data.Bifoldable

Methods

bifold :: Monoid m => (x, m, m) -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> (x, a, b) -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> (x, a, b) -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> (x, a, b) -> c #

Bifoldable (K1 i :: Type -> Type -> Type) 
Instance details

Defined in Data.Bifoldable

Methods

bifold :: Monoid m => K1 i m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> K1 i a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> K1 i a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> K1 i a b -> c #

Bifoldable ((,,,) x y) 
Instance details

Defined in Data.Bifoldable

Methods

bifold :: Monoid m => (x, y, m, m) -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> (x, y, a, b) -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> (x, y, a, b) -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> (x, y, a, b) -> c #

Bifoldable ((,,,,) x y z) 
Instance details

Defined in Data.Bifoldable

Methods

bifold :: Monoid m => (x, y, z, m, m) -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> (x, y, z, a, b) -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> (x, y, z, a, b) -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> (x, y, z, a, b) -> c #

Bifoldable ((,,,,,) x y z w) 
Instance details

Defined in Data.Bifoldable

Methods

bifold :: Monoid m => (x, y, z, w, m, m) -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> (x, y, z, w, a, b) -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> (x, y, z, w, a, b) -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> (x, y, z, w, a, b) -> c #

Bifoldable ((,,,,,,) x y z w v) 
Instance details

Defined in Data.Bifoldable

Methods

bifold :: Monoid m => (x, y, z, w, v, m, m) -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> (x, y, z, w, v, a, b) -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> (x, y, z, w, v, a, b) -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> (x, y, z, w, v, a, b) -> c #

class (Bifunctor t, Bifoldable t) => Bitraversable (t :: Type -> Type -> Type) where #

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> t a b -> f (t c d) #

Instances

Instances details
Bitraversable TkArray 
Instance details

Defined in Data.Aeson.Decoding.Tokens

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> TkArray a b -> f (TkArray c d) #

Bitraversable TkRecord 
Instance details

Defined in Data.Aeson.Decoding.Tokens

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> TkRecord a b -> f (TkRecord c d) #

Bitraversable Tokens 
Instance details

Defined in Data.Aeson.Decoding.Tokens

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> Tokens a b -> f (Tokens c d) #

Bitraversable Either 
Instance details

Defined in Data.Bitraversable

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> Either a b -> f (Either c d) #

Bitraversable Arg 
Instance details

Defined in Data.Semigroup

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> Arg a b -> f (Arg c d) #

Bitraversable Product 
Instance details

Defined in Data.Aeson.Config.Types

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> Product a b -> f (Product c d) #

Bitraversable Either 
Instance details

Defined in Data.Strict.Either

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> Either a b -> f (Either c d) #

Bitraversable These 
Instance details

Defined in Data.Strict.These

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> These a b -> f (These c d) #

Bitraversable Pair 
Instance details

Defined in Data.Strict.Tuple

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> Pair a b -> f (Pair c d) #

Bitraversable These 
Instance details

Defined in Data.These

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> These a b -> f (These c d) #

Bitraversable (,) 
Instance details

Defined in Data.Bitraversable

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> (a, b) -> f (c, d) #

Bitraversable (Const :: Type -> Type -> Type) 
Instance details

Defined in Data.Bitraversable

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> Const a b -> f (Const c d) #

Bitraversable (Tagged :: Type -> Type -> Type) 
Instance details

Defined in Data.Tagged

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> Tagged a b -> f (Tagged c d) #

Bitraversable (Constant :: Type -> Type -> Type) 
Instance details

Defined in Data.Functor.Constant

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> Constant a b -> f (Constant c d) #

Bitraversable ((,,) x) 
Instance details

Defined in Data.Bitraversable

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> (x, a, b) -> f (x, c, d) #

Bitraversable (K1 i :: Type -> Type -> Type) 
Instance details

Defined in Data.Bitraversable

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> K1 i a b -> f (K1 i c d) #

Bitraversable ((,,,) x y) 
Instance details

Defined in Data.Bitraversable

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> (x, y, a, b) -> f (x, y, c, d) #

Bitraversable ((,,,,) x y z) 
Instance details

Defined in Data.Bitraversable

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> (x, y, z, a, b) -> f (x, y, z, c, d) #

Bitraversable ((,,,,,) x y z w) 
Instance details

Defined in Data.Bitraversable

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> (x, y, z, w, a, b) -> f (x, y, z, w, c, d) #

Bitraversable ((,,,,,,) x y z w v) 
Instance details

Defined in Data.Bitraversable

Methods

bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> (x, y, z, w, v, a, b) -> f (x, y, z, w, v, c, d) #

data ShortByteString #

Instances

Instances details
Data ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ShortByteString -> c ShortByteString #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ShortByteString #

toConstr :: ShortByteString -> Constr #

dataTypeOf :: ShortByteString -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ShortByteString) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ShortByteString) #

gmapT :: (forall b. Data b => b -> b) -> ShortByteString -> ShortByteString #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ShortByteString -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ShortByteString -> r #

gmapQ :: (forall d. Data d => d -> u) -> ShortByteString -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ShortByteString -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ShortByteString -> m ShortByteString #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ShortByteString -> m ShortByteString #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ShortByteString -> m ShortByteString #

IsString ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Monoid ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Semigroup ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Generic ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Associated Types

type Rep ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

type Rep ShortByteString = D1 ('MetaData "ShortByteString" "Data.ByteString.Short.Internal" "bytestring-0.12.1.0-bb11" 'True) (C1 ('MetaCons "ShortByteString" 'PrefixI 'True) (S1 ('MetaSel ('Just "unShortByteString") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ByteArray)))
IsList ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Associated Types

type Item ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Read ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Show ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Binary ShortByteString 
Instance details

Defined in Data.Binary.Class

Methods

put :: ShortByteString -> Put

get :: Get ShortByteString

putList :: [ShortByteString] -> Put

NFData ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Methods

rnf :: ShortByteString -> () #

Eq ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Ord ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Hashable ShortByteString 
Instance details

Defined in Data.Hashable.Class

Lift ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Methods

lift :: Quote m => ShortByteString -> m Exp

liftTyped :: forall (m :: Type -> Type). Quote m => ShortByteString -> Code m ShortByteString

type Rep ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

type Rep ShortByteString = D1 ('MetaData "ShortByteString" "Data.ByteString.Short.Internal" "bytestring-0.12.1.0-bb11" 'True) (C1 ('MetaCons "ShortByteString" 'PrefixI 'True) (S1 ('MetaSel ('Just "unShortByteString") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ByteArray)))
type Item ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

data IntSet #

Instances

Instances details
Structured IntSet 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy IntSet -> Structure

structureHash' :: Tagged IntSet MD5

FromJSON IntSet 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON IntSet 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: IntSet -> Value

toEncoding :: IntSet -> Encoding

toJSONList :: [IntSet] -> Value

toEncodingList :: [IntSet] -> Encoding

omitField :: IntSet -> Bool

Data IntSet 
Instance details

Defined in Data.IntSet.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IntSet -> c IntSet #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IntSet #

toConstr :: IntSet -> Constr #

dataTypeOf :: IntSet -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IntSet) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IntSet) #

gmapT :: (forall b. Data b => b -> b) -> IntSet -> IntSet #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IntSet -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IntSet -> r #

gmapQ :: (forall d. Data d => d -> u) -> IntSet -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IntSet -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IntSet -> m IntSet #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IntSet -> m IntSet #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IntSet -> m IntSet #

Monoid IntSet 
Instance details

Defined in Data.IntSet.Internal

Semigroup IntSet 
Instance details

Defined in Data.IntSet.Internal

IsList IntSet 
Instance details

Defined in Data.IntSet.Internal

Associated Types

type Item IntSet 
Instance details

Defined in Data.IntSet.Internal

type Item IntSet = Key

Methods

fromList :: [Item IntSet] -> IntSet

fromListN :: Int -> [Item IntSet] -> IntSet

toList :: IntSet -> [Item IntSet]

Read IntSet 
Instance details

Defined in Data.IntSet.Internal

Methods

readsPrec :: Int -> ReadS IntSet

readList :: ReadS [IntSet]

readPrec :: ReadPrec IntSet

readListPrec :: ReadPrec [IntSet]

Show IntSet 
Instance details

Defined in Data.IntSet.Internal

Methods

showsPrec :: Int -> IntSet -> ShowS

show :: IntSet -> String #

showList :: [IntSet] -> ShowS

Binary IntSet 
Instance details

Defined in Data.Binary.Class

Methods

put :: IntSet -> Put

get :: Get IntSet

putList :: [IntSet] -> Put

NFData IntSet 
Instance details

Defined in Data.IntSet.Internal

Methods

rnf :: IntSet -> () #

Eq IntSet 
Instance details

Defined in Data.IntSet.Internal

Methods

(==) :: IntSet -> IntSet -> Bool #

(/=) :: IntSet -> IntSet -> Bool #

Ord IntSet 
Instance details

Defined in Data.IntSet.Internal

Hashable IntSet 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> IntSet -> Int

hash :: IntSet -> Int

GrowingAppend IntSet 
Instance details

Defined in Data.MonoTraversable

MonoFoldable IntSet 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element IntSet -> m) -> IntSet -> m

ofoldr :: (Element IntSet -> b -> b) -> b -> IntSet -> b

ofoldl' :: (a -> Element IntSet -> a) -> a -> IntSet -> a

otoList :: IntSet -> [Element IntSet]

oall :: (Element IntSet -> Bool) -> IntSet -> Bool

oany :: (Element IntSet -> Bool) -> IntSet -> Bool

onull :: IntSet -> Bool

olength :: IntSet -> Int

olength64 :: IntSet -> Int64

ocompareLength :: Integral i => IntSet -> i -> Ordering

otraverse_ :: Applicative f => (Element IntSet -> f b) -> IntSet -> f ()

ofor_ :: Applicative f => IntSet -> (Element IntSet -> f b) -> f ()

omapM_ :: Applicative m => (Element IntSet -> m ()) -> IntSet -> m ()

oforM_ :: Applicative m => IntSet -> (Element IntSet -> m ()) -> m ()

ofoldlM :: Monad m => (a -> Element IntSet -> m a) -> a -> IntSet -> m a

ofoldMap1Ex :: Semigroup m => (Element IntSet -> m) -> IntSet -> m

ofoldr1Ex :: (Element IntSet -> Element IntSet -> Element IntSet) -> IntSet -> Element IntSet

ofoldl1Ex' :: (Element IntSet -> Element IntSet -> Element IntSet) -> IntSet -> Element IntSet

headEx :: IntSet -> Element IntSet

lastEx :: IntSet -> Element IntSet

unsafeHead :: IntSet -> Element IntSet

unsafeLast :: IntSet -> Element IntSet

maximumByEx :: (Element IntSet -> Element IntSet -> Ordering) -> IntSet -> Element IntSet

minimumByEx :: (Element IntSet -> Element IntSet -> Ordering) -> IntSet -> Element IntSet

oelem :: Element IntSet -> IntSet -> Bool

onotElem :: Element IntSet -> IntSet -> Bool

MonoPointed IntSet 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element IntSet -> IntSet

Lift IntSet 
Instance details

Defined in Data.IntSet.Internal

Methods

lift :: Quote m => IntSet -> m Exp

liftTyped :: forall (m :: Type -> Type). Quote m => IntSet -> Code m IntSet

type Item IntSet 
Instance details

Defined in Data.IntSet.Internal

type Item IntSet = Key
type Element IntSet 
Instance details

Defined in Data.MonoTraversable

type Element IntSet = Int

type ASetter s t a b = (a -> Identity b) -> s -> Identity t #

type ASetter' s a = ASetter s s a a #

type Getting r s a = (a -> Const r a) -> s -> Const r s #

type Lens' s a = Lens s s a a #

type SimpleGetter s a = forall r. Getting r s a #

type family PrimState (m :: Type -> Type) #

Instances

Instances details
type PrimState IO 
Instance details

Defined in Control.Monad.Primitive

type PrimState IO = RealWorld
type PrimState (ST s) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ST s) = s
type PrimState (ST s) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ST s) = s
type PrimState (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

type PrimState (ResourceT m) = PrimState m
type PrimState (RIO env) 
Instance details

Defined in RIO.Prelude.RIO

type PrimState (RIO env) = PrimState IO
type PrimState (MaybeT m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (MaybeT m) = PrimState m
type PrimState (AccumT w m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (AccumT w m) = PrimState m
type PrimState (ExceptT e m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ExceptT e m) = PrimState m
type PrimState (IdentityT m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (IdentityT m) = PrimState m
type PrimState (ReaderT r m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ReaderT r m) = PrimState m
type PrimState (SelectT r m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (SelectT r m) = PrimState m
type PrimState (StateT s m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (StateT s m) = PrimState m
type PrimState (StateT s m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (StateT s m) = PrimState m
type PrimState (WriterT w m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (WriterT w m) = PrimState m
type PrimState (WriterT w m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (WriterT w m) = PrimState m
type PrimState (WriterT w m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (WriterT w m) = PrimState m
type PrimState (ConduitT i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

type PrimState (ConduitT i o m) = PrimState m
type PrimState (ContT r m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ContT r m) = PrimState m
type PrimState (RWST r w s m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (RWST r w s m) = PrimState m
type PrimState (RWST r w s m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (RWST r w s m) = PrimState m
type PrimState (RWST r w s m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (RWST r w s m) = PrimState m
type PrimState (Pipe l i o u m) 
Instance details

Defined in Data.Conduit.Internal.Pipe

type PrimState (Pipe l i o u m) = PrimState m

data TBQueue a #

Instances

Instances details
Eq (TBQueue a) 
Instance details

Defined in Control.Concurrent.STM.TBQueue

Methods

(==) :: TBQueue a -> TBQueue a -> Bool #

(/=) :: TBQueue a -> TBQueue a -> Bool #

data TChan a #

Instances

Instances details
Eq (TChan a) 
Instance details

Defined in Control.Concurrent.STM.TChan

Methods

(==) :: TChan a -> TChan a -> Bool #

(/=) :: TChan a -> TChan a -> Bool #

data TMVar a #

Instances

Instances details
Eq (TMVar a) 
Instance details

Defined in Control.Concurrent.STM.TMVar

Methods

(==) :: TMVar a -> TMVar a -> Bool #

(/=) :: TMVar a -> TMVar a -> Bool #

data TQueue a #

Instances

Instances details
Eq (TQueue a) 
Instance details

Defined in Control.Concurrent.STM.TQueue

Methods

(==) :: TQueue a -> TQueue a -> Bool #

(/=) :: TQueue a -> TQueue a -> Bool #

data ConcException #

Instances

Instances details
Exception ConcException 
Instance details

Defined in UnliftIO.Internals.Async

Generic ConcException 
Instance details

Defined in UnliftIO.Internals.Async

Associated Types

type Rep ConcException 
Instance details

Defined in UnliftIO.Internals.Async

type Rep ConcException = D1 ('MetaData "ConcException" "UnliftIO.Internals.Async" "unliftio-0.2.25.1-7gT8REVkY8rG0RkBgU6gjd" 'False) (C1 ('MetaCons "EmptyWithNoAlternative" 'PrefixI 'False) (U1 :: Type -> Type))
Show ConcException 
Instance details

Defined in UnliftIO.Internals.Async

Methods

showsPrec :: Int -> ConcException -> ShowS

show :: ConcException -> String #

showList :: [ConcException] -> ShowS

Eq ConcException 
Instance details

Defined in UnliftIO.Internals.Async

Ord ConcException 
Instance details

Defined in UnliftIO.Internals.Async

type Rep ConcException 
Instance details

Defined in UnliftIO.Internals.Async

type Rep ConcException = D1 ('MetaData "ConcException" "UnliftIO.Internals.Async" "unliftio-0.2.25.1-7gT8REVkY8rG0RkBgU6gjd" 'False) (C1 ('MetaCons "EmptyWithNoAlternative" 'PrefixI 'False) (U1 :: Type -> Type))

newtype Concurrently (m :: Type -> Type) a #

Constructors

Concurrently 

Fields

Instances

Instances details
MonadUnliftIO m => Alternative (Concurrently m) 
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] #

MonadUnliftIO m => Applicative (Concurrently m) 
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 #

Monad m => Functor (Concurrently m) 
Instance details

Defined in UnliftIO.Internals.Async

Methods

fmap :: (a -> b) -> Concurrently m a -> Concurrently m b #

(<$) :: a -> Concurrently m b -> Concurrently m a #

(Semigroup a, Monoid a, MonadUnliftIO m) => Monoid (Concurrently m a) 
Instance details

Defined in UnliftIO.Internals.Async

(MonadUnliftIO m, Semigroup a) => Semigroup (Concurrently m a) 
Instance details

Defined in UnliftIO.Internals.Async

data Memoized a #

Instances

Instances details
Applicative Memoized 
Instance details

Defined in UnliftIO.Memoize

Methods

pure :: a -> Memoized a #

(<*>) :: Memoized (a -> b) -> Memoized a -> Memoized b #

liftA2 :: (a -> b -> c) -> Memoized a -> Memoized b -> Memoized c #

(*>) :: Memoized a -> Memoized b -> Memoized b #

(<*) :: Memoized a -> Memoized b -> Memoized a #

Functor Memoized 
Instance details

Defined in UnliftIO.Memoize

Methods

fmap :: (a -> b) -> Memoized a -> Memoized b #

(<$) :: a -> Memoized b -> Memoized a #

Monad Memoized 
Instance details

Defined in UnliftIO.Memoize

Methods

(>>=) :: Memoized a -> (a -> Memoized b) -> Memoized b #

(>>) :: Memoized a -> Memoized b -> Memoized b #

return :: a -> Memoized a #

Show (Memoized a) 
Instance details

Defined in UnliftIO.Memoize

Methods

showsPrec :: Int -> Memoized a -> ShowS

show :: Memoized a -> String #

showList :: [Memoized a] -> ShowS

data HashMap k v #

Instances

Instances details
Bifoldable HashMap 
Instance details

Defined in Data.HashMap.Internal

Methods

bifold :: Monoid m => HashMap m m -> m #

bifoldMap :: Monoid m => (a -> m) -> (b -> m) -> HashMap a b -> m #

bifoldr :: (a -> c -> c) -> (b -> c -> c) -> c -> HashMap a b -> c #

bifoldl :: (c -> a -> c) -> (c -> b -> c) -> c -> HashMap a b -> c #

Eq2 HashMap 
Instance details

Defined in Data.HashMap.Internal

Methods

liftEq2 :: (a -> b -> Bool) -> (c -> d -> Bool) -> HashMap a c -> HashMap b d -> Bool

Ord2 HashMap 
Instance details

Defined in Data.HashMap.Internal

Methods

liftCompare2 :: (a -> b -> Ordering) -> (c -> d -> Ordering) -> HashMap a c -> HashMap b d -> Ordering

Show2 HashMap 
Instance details

Defined in Data.HashMap.Internal

Methods

liftShowsPrec2 :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> (Int -> b -> ShowS) -> ([b] -> ShowS) -> Int -> HashMap a b -> ShowS

liftShowList2 :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> (Int -> b -> ShowS) -> ([b] -> ShowS) -> [HashMap a b] -> ShowS

NFData2 HashMap 
Instance details

Defined in Data.HashMap.Internal

Methods

liftRnf2 :: (a -> ()) -> (b -> ()) -> HashMap a b -> ()

Hashable2 HashMap 
Instance details

Defined in Data.HashMap.Internal

Methods

liftHashWithSalt2 :: (Int -> a -> Int) -> (Int -> b -> Int) -> Int -> HashMap a b -> Int

(Lift k, Lift v) => Lift (HashMap k v :: Type) 
Instance details

Defined in Data.HashMap.Internal

Methods

lift :: Quote m => HashMap k v -> m Exp

liftTyped :: forall (m :: Type -> Type). Quote m => HashMap k v -> Code m (HashMap k v)

(FromJSONKey k, Eq k, Hashable k) => FromJSON1 (HashMap k) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: Maybe a -> (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (HashMap k a)

liftParseJSONList :: Maybe a -> (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [HashMap k a]

liftOmittedField :: Maybe a -> Maybe (HashMap k a)

ToJSONKey k => ToJSON1 (HashMap k) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> HashMap k a -> Value

liftToJSONList :: (a -> Bool) -> (a -> Value) -> ([a] -> Value) -> [HashMap k a] -> Value

liftToEncoding :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> HashMap k a -> Encoding

liftToEncodingList :: (a -> Bool) -> (a -> Encoding) -> ([a] -> Encoding) -> [HashMap k a] -> Encoding

liftOmitField :: (a -> Bool) -> HashMap k a -> Bool

Foldable (HashMap k) 
Instance details

Defined in Data.HashMap.Internal

Methods

fold :: Monoid m => HashMap k m -> m #

foldMap :: Monoid m => (a -> m) -> HashMap k a -> m #

foldMap' :: Monoid m => (a -> m) -> HashMap k a -> m

foldr :: (a -> b -> b) -> b -> HashMap k a -> b #

foldr' :: (a -> b -> b) -> b -> HashMap k a -> b #

foldl :: (b -> a -> b) -> b -> HashMap k a -> b

foldl' :: (b -> a -> b) -> b -> HashMap k a -> b #

foldr1 :: (a -> a -> a) -> HashMap k a -> a

foldl1 :: (a -> a -> a) -> HashMap k a -> a

toList :: HashMap k a -> [a] #

null :: HashMap k a -> Bool #

length :: HashMap k a -> Int #

elem :: Eq a => a -> HashMap k a -> Bool #

maximum :: Ord a => HashMap k a -> a

minimum :: Ord a => HashMap k a -> a

sum :: Num a => HashMap k a -> a #

product :: Num a => HashMap k a -> a #

Eq k => Eq1 (HashMap k) 
Instance details

Defined in Data.HashMap.Internal

Methods

liftEq :: (a -> b -> Bool) -> HashMap k a -> HashMap k b -> Bool

Ord k => Ord1 (HashMap k) 
Instance details

Defined in Data.HashMap.Internal

Methods

liftCompare :: (a -> b -> Ordering) -> HashMap k a -> HashMap k b -> Ordering

(Eq k, Hashable k, Read k) => Read1 (HashMap k) 
Instance details

Defined in Data.HashMap.Internal

Methods

liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (HashMap k a)

liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [HashMap k a]

liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (HashMap k a)

liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [HashMap k a]

Show k => Show1 (HashMap k) 
Instance details

Defined in Data.HashMap.Internal

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> HashMap k a -> ShowS

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [HashMap k a] -> ShowS

Traversable (HashMap k) 
Instance details

Defined in Data.HashMap.Internal

Methods

traverse :: Applicative f => (a -> f b) -> HashMap k a -> f (HashMap k b) #

sequenceA :: Applicative f => HashMap k (f a) -> f (HashMap k a) #

mapM :: Monad m => (a -> m b) -> HashMap k a -> m (HashMap k b) #

sequence :: Monad m => HashMap k (m a) -> m (HashMap k 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 #

NFData k => NFData1 (HashMap k) 
Instance details

Defined in Data.HashMap.Internal

Methods

liftRnf :: (a -> ()) -> HashMap k a -> ()

Hashable k => Hashable1 (HashMap k) 
Instance details

Defined in Data.HashMap.Internal

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> HashMap k a -> Int

(FromJSON v, FromJSONKey k, Eq k, Hashable k) => FromJSON (HashMap k v) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (HashMap k v)

parseJSONList :: Value -> Parser [HashMap k v]

omittedField :: Maybe (HashMap k v)

(ToJSON v, ToJSONKey k) => ToJSON (HashMap k v) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: HashMap k v -> Value

toEncoding :: HashMap k v -> Encoding

toJSONList :: [HashMap k v] -> Value

toEncodingList :: [HashMap k v] -> Encoding

omitField :: HashMap k v -> Bool

(Data k, Data v, Eq k, Hashable k) => Data (HashMap k v) 
Instance details

Defined in Data.HashMap.Internal

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> HashMap k v -> c (HashMap k v) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (HashMap k v) #

toConstr :: HashMap k v -> Constr #

dataTypeOf :: HashMap k v -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (HashMap k v)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (HashMap k v)) #

gmapT :: (forall b. Data b => b -> b) -> HashMap k v -> HashMap k v #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HashMap k v -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HashMap k v -> r #

gmapQ :: (forall d. Data d => d -> u) -> HashMap k v -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> HashMap k v -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> HashMap k v -> m (HashMap k v) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HashMap k v -> m (HashMap k v) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HashMap k v -> m (HashMap k v) #

(Eq k, Hashable k) => Monoid (HashMap k v) 
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 #

(Eq k, Hashable k) => Semigroup (HashMap k v) 
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

(Eq k, Hashable k) => IsList (HashMap k v) 
Instance details

Defined in Data.HashMap.Internal

Associated Types

type Item (HashMap k v) 
Instance details

Defined in Data.HashMap.Internal

type Item (HashMap k v) = (k, v)

Methods

fromList :: [Item (HashMap k v)] -> HashMap k v

fromListN :: Int -> [Item (HashMap k v)] -> HashMap k v

toList :: HashMap k v -> [Item (HashMap k v)]

(Eq k, Hashable k, Read k, Read e) => Read (HashMap k e) 
Instance details

Defined in Data.HashMap.Internal

Methods

readsPrec :: Int -> ReadS (HashMap k e)

readList :: ReadS [HashMap k e]

readPrec :: ReadPrec (HashMap k e)

readListPrec :: ReadPrec [HashMap k e]

(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

(NFData k, NFData v) => NFData (HashMap k v) 
Instance details

Defined in Data.HashMap.Internal

Methods

rnf :: HashMap k v -> () #

(Eq k, Eq v) => Eq (HashMap k v) 
Instance details

Defined in Data.HashMap.Internal

Methods

(==) :: HashMap k v -> HashMap k v -> Bool #

(/=) :: HashMap k v -> HashMap k v -> Bool #

(Ord k, Ord v) => Ord (HashMap k v) 
Instance details

Defined in Data.HashMap.Internal

Methods

compare :: HashMap k v -> HashMap k v -> Ordering #

(<) :: HashMap k v -> HashMap k v -> Bool #

(<=) :: HashMap k v -> HashMap k v -> Bool #

(>) :: HashMap k v -> HashMap k v -> Bool #

(>=) :: HashMap k v -> HashMap k v -> Bool #

max :: HashMap k v -> HashMap k v -> HashMap k v #

min :: HashMap k v -> HashMap k v -> HashMap k v #

(Hashable k, Hashable v) => Hashable (HashMap k v) 
Instance details

Defined in Data.HashMap.Internal

Methods

hashWithSalt :: Int -> HashMap k v -> Int

hash :: HashMap k v -> Int

(Eq k, Hashable k) => GrowingAppend (HashMap k v) 
Instance details

Defined in Data.MonoTraversable

MonoFoldable (HashMap k v) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (HashMap k v) -> m) -> HashMap k v -> m

ofoldr :: (Element (HashMap k v) -> b -> b) -> b -> HashMap k v -> b

ofoldl' :: (a -> Element (HashMap k v) -> a) -> a -> HashMap k v -> a

otoList :: HashMap k v -> [Element (HashMap k v)]

oall :: (Element (HashMap k v) -> Bool) -> HashMap k v -> Bool

oany :: (Element (HashMap k v) -> Bool) -> HashMap k v -> Bool

onull :: HashMap k v -> Bool

olength :: HashMap k v -> Int

olength64 :: HashMap k v -> Int64

ocompareLength :: Integral i => HashMap k v -> i -> Ordering

otraverse_ :: Applicative f => (Element (HashMap k v) -> f b) -> HashMap k v -> f ()

ofor_ :: Applicative f => HashMap k v -> (Element (HashMap k v) -> f b) -> f ()

omapM_ :: Applicative m => (Element (HashMap k v) -> m ()) -> HashMap k v -> m ()

oforM_ :: Applicative m => HashMap k v -> (Element (HashMap k v) -> m ()) -> m ()

ofoldlM :: Monad m => (a -> Element (HashMap k v) -> m a) -> a -> HashMap k v -> m a

ofoldMap1Ex :: Semigroup m => (Element (HashMap k v) -> m) -> HashMap k v -> m

ofoldr1Ex :: (Element (HashMap k v) -> Element (HashMap k v) -> Element (HashMap k v)) -> HashMap k v -> Element (HashMap k v)

ofoldl1Ex' :: (Element (HashMap k v) -> Element (HashMap k v) -> Element (HashMap k v)) -> HashMap k v -> Element (HashMap k v)

headEx :: HashMap k v -> Element (HashMap k v)

lastEx :: HashMap k v -> Element (HashMap k v)

unsafeHead :: HashMap k v -> Element (HashMap k v)

unsafeLast :: HashMap k v -> Element (HashMap k v)

maximumByEx :: (Element (HashMap k v) -> Element (HashMap k v) -> Ordering) -> HashMap k v -> Element (HashMap k v)

minimumByEx :: (Element (HashMap k v) -> Element (HashMap k v) -> Ordering) -> HashMap k v -> Element (HashMap k v)

oelem :: Element (HashMap k v) -> HashMap k v -> Bool

onotElem :: Element (HashMap k v) -> HashMap k v -> Bool

MonoFunctor (HashMap k v) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (HashMap k v) -> Element (HashMap k v)) -> HashMap k v -> HashMap k v

MonoTraversable (HashMap k v) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (HashMap k v) -> f (Element (HashMap k v))) -> HashMap k v -> f (HashMap k v)

omapM :: Applicative m => (Element (HashMap k v) -> m (Element (HashMap k v))) -> HashMap k v -> m (HashMap k v)

ToMustache ω => ToMustache (HashMap Text ω) 
Instance details

Defined in Text.Mustache.Internal.Types

ToMustache ω => ToMustache (HashMap Text ω) 
Instance details

Defined in Text.Mustache.Internal.Types

Methods

toMustache :: HashMap Text ω -> Value Source #

listToMustache :: [HashMap Text ω] -> Value

ToMustache ω => ToMustache (HashMap String ω) 
Instance details

Defined in Text.Mustache.Internal.Types

MonadReader (Context Value, TemplateCache) SubM 
Instance details

Defined in Text.Mustache.Internal.Types

type Item (HashMap k v) 
Instance details

Defined in Data.HashMap.Internal

type Item (HashMap k v) = (k, v)
type Element (HashMap k v) 
Instance details

Defined in Data.MonoTraversable

type Element (HashMap k v) = v

class (Vector Vector a, MVector MVector a) => Unbox a #

Instances

Instances details
Unbox All 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox Any 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox Int16 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox Int64 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox Int8 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox Word16 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox Word32 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox Word64 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox Word8 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox () 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox Bool 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox Char 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox Double 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox Float 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox Int 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox Word 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox a => Unbox (Complex a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox a => Unbox (Identity a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox a => Unbox (Down a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox a => Unbox (First a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox a => Unbox (Last a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox a => Unbox (Max a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox a => Unbox (Min a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox a => Unbox (WrappedMonoid a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox a => Unbox (Dual a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox a => Unbox (Product a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox a => Unbox (Sum a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox (DoNotUnboxLazy a) 
Instance details

Defined in Data.Vector.Unboxed.Base

NFData a => Unbox (DoNotUnboxNormalForm a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox (DoNotUnboxStrict a) 
Instance details

Defined in Data.Vector.Unboxed.Base

(Unbox a, Unbox b) => Unbox (Arg a b) 
Instance details

Defined in Data.Vector.Unboxed.Base

(Unbox a, Unbox b) => Unbox (a, b) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox a => Unbox (Const a b) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox (f a) => Unbox (Alt f a) 
Instance details

Defined in Data.Vector.Unboxed.Base

(Unbox a, Unbox b, Unbox c) => Unbox (a, b, c) 
Instance details

Defined in Data.Vector.Unboxed.Base

(Unbox a, Unbox b, Unbox c, Unbox d) => Unbox (a, b, c, d) 
Instance details

Defined in Data.Vector.Unboxed.Base

Unbox (f (g a)) => Unbox (Compose f g a) 
Instance details

Defined in Data.Vector.Unboxed.Base

(Unbox a, Unbox b, Unbox c, Unbox d, Unbox e) => Unbox (a, b, c, d, e) 
Instance details

Defined in Data.Vector.Unboxed.Base

(Unbox a, Unbox b, Unbox c, Unbox d, Unbox e, Unbox f) => Unbox (a, b, c, d, e, f) 
Instance details

Defined in Data.Vector.Unboxed.Base

Re-exports from the rio-pretty print package

class HasStylesUpdate env where #

Instances

Instances details
HasStylesUpdate PantryApp 
Instance details

Defined in Pantry

HasStylesUpdate SimplePrettyApp 
Instance details

Defined in RIO.PrettyPrint.Simple

Methods

stylesUpdateL :: Lens' SimplePrettyApp StylesUpdate #

HasStylesUpdate StylesUpdate 
Instance details

Defined in RIO.PrettyPrint.StylesUpdate

HasStylesUpdate EnvConfigPathInfo Source # 
Instance details

Defined in Stack.Path

HasStylesUpdate Ctx Source # 
Instance details

Defined in Stack.Types.Build.ConstructPlan

HasStylesUpdate BuildConfig Source # 
Instance details

Defined in Stack.Types.BuildConfig

HasStylesUpdate Config Source # 
Instance details

Defined in Stack.Types.Config

HasStylesUpdate DotConfig Source # 
Instance details

Defined in Stack.Types.DotConfig

HasStylesUpdate EnvConfig Source # 
Instance details

Defined in Stack.Types.EnvConfig

HasStylesUpdate GetPackageFileContext Source # 
Instance details

Defined in Stack.Types.PackageFile

HasStylesUpdate Runner Source # 
Instance details

Defined in Stack.Types.Runner

class (HasLogFunc env, HasStylesUpdate env) => HasTerm env where #

Methods

useColorL :: Lens' env Bool #

termWidthL :: Lens' env Int #

Instances

Instances details
HasTerm PantryApp 
Instance details

Defined in Pantry

HasTerm SimplePrettyApp 
Instance details

Defined in RIO.PrettyPrint.Simple

Methods

useColorL :: Lens' SimplePrettyApp Bool #

termWidthL :: Lens' SimplePrettyApp Int #

HasTerm EnvConfigPathInfo Source # 
Instance details

Defined in Stack.Path

HasTerm Ctx Source # 
Instance details

Defined in Stack.Types.Build.ConstructPlan

HasTerm BuildConfig Source # 
Instance details

Defined in Stack.Types.BuildConfig

HasTerm Config Source # 
Instance details

Defined in Stack.Types.Config

HasTerm DotConfig Source # 
Instance details

Defined in Stack.Types.DotConfig

HasTerm EnvConfig Source # 
Instance details

Defined in Stack.Types.EnvConfig

HasTerm GetPackageFileContext Source # 
Instance details

Defined in Stack.Types.PackageFile

HasTerm Runner Source # 
Instance details

Defined in Stack.Types.Runner

class Pretty a where #

Minimal complete definition

Nothing

Methods

pretty :: a -> StyleDoc #

Instances

Instances details
Pretty ModuleName 
Instance details

Defined in Text.PrettyPrint.Leijen.Extended

Pretty Arch 
Instance details

Defined in Text.PrettyPrint.Leijen.Extended

Methods

pretty :: Arch -> StyleDoc #

Pretty OS 
Instance details

Defined in Text.PrettyPrint.Leijen.Extended

Methods

pretty :: OS -> StyleDoc #

Pretty ArchiveLocation 
Instance details

Defined in Pantry.Types

Pretty GlobalHintsLocation 
Instance details

Defined in Pantry.Types

Pretty PantryException 
Instance details

Defined in Pantry.Types

Pretty RawPackageLocationImmutable 
Instance details

Defined in Pantry.Types

Pretty RawSnapshotLocation 
Instance details

Defined in Pantry.Types

Pretty PrettyException 
Instance details

Defined in RIO.PrettyPrint.PrettyException

Pretty StyleDoc 
Instance details

Defined in Text.PrettyPrint.Leijen.Extended

Methods

pretty :: StyleDoc -> StyleDoc #

Pretty GhciPrettyException Source # 
Instance details

Defined in Stack.Ghci

Pretty PrettyRawSnapshotLocation Source # 
Instance details

Defined in Stack.Prelude

Pretty BuildPrettyException Source # 
Instance details

Defined in Stack.Types.Build.Exception

Pretty ConfigPrettyException Source # 
Instance details

Defined in Stack.Types.Config.Exception

Pretty StoragePrettyException Source # 
Instance details

Defined in Stack.Types.Storage

Pretty (SomeBase Dir) 
Instance details

Defined in Text.PrettyPrint.Leijen.Extended

Methods

pretty :: SomeBase Dir -> StyleDoc #

Pretty (SomeBase File) 
Instance details

Defined in Text.PrettyPrint.Leijen.Extended

Methods

pretty :: SomeBase File -> StyleDoc #

Pretty (Path b Dir) 
Instance details

Defined in Text.PrettyPrint.Leijen.Extended

Methods

pretty :: Path b Dir -> StyleDoc #

Pretty (Path b File) 
Instance details

Defined in Text.PrettyPrint.Leijen.Extended

Methods

pretty :: Path b File -> StyleDoc #

data StyleDoc #

Instances

Instances details
IsString StyleDoc 
Instance details

Defined in Text.PrettyPrint.Leijen.Extended

Monoid StyleDoc 
Instance details

Defined in Text.PrettyPrint.Leijen.Extended

Semigroup StyleDoc 
Instance details

Defined in Text.PrettyPrint.Leijen.Extended

Show StyleDoc 
Instance details

Defined in Text.PrettyPrint.Leijen.Extended

Methods

showsPrec :: Int -> StyleDoc -> ShowS

show :: StyleDoc -> String #

showList :: [StyleDoc] -> ShowS

Pretty StyleDoc 
Instance details

Defined in Text.PrettyPrint.Leijen.Extended

Methods

pretty :: StyleDoc -> StyleDoc #

data Style #

Instances

Instances details
Semigroup Style 
Instance details

Defined in RIO.PrettyPrint.Types

Methods

(<>) :: Style -> Style -> Style #

sconcat :: NonEmpty Style -> Style

stimes :: Integral b => b -> Style -> Style

Bounded Style 
Instance details

Defined in RIO.PrettyPrint.Types

Enum Style 
Instance details

Defined in RIO.PrettyPrint.Types

Ix Style 
Instance details

Defined in RIO.PrettyPrint.Types

Show Style 
Instance details

Defined in RIO.PrettyPrint.Types

Methods

showsPrec :: Int -> Style -> ShowS

show :: Style -> String #

showList :: [Style] -> ShowS

Eq Style 
Instance details

Defined in RIO.PrettyPrint.Types

Methods

(==) :: Style -> Style -> Bool #

(/=) :: Style -> Style -> Bool #

Ord Style 
Instance details

Defined in RIO.PrettyPrint.Types

Methods

compare :: Style -> Style -> Ordering #

(<) :: Style -> Style -> Bool #

(<=) :: Style -> Style -> Bool #

(>) :: Style -> Style -> Bool #

(>=) :: Style -> Style -> Bool #

max :: Style -> Style -> Style #

min :: Style -> Style -> Style #

type StyleSpec = (Text, [SGR]) #

newtype StylesUpdate #

Constructors

StylesUpdate 

Fields

defaultStyles :: Styles #

foldr' :: Foldable t => (a -> b -> b) -> b -> t a -> b #

fromPackageId :: IsString a => PackageIdentifier -> a Source #

Convert a package identifier to a value of a string-like type.

fromPackageName :: IsString a => PackageName -> a Source #

Convert a package name to a value of a string-like type.

prettyDebugL :: (HasCallStack, HasTerm env, MonadReader env m, MonadIO m) => [StyleDoc] -> m () #

prettyErrorL :: (HasCallStack, HasTerm env, MonadReader env m, MonadIO m) => [StyleDoc] -> m () #

prettyGeneric :: (HasTerm env, HasCallStack, Pretty b, MonadReader env m, MonadIO m) => LogLevel -> b -> m () #

prettyInfoL :: (HasCallStack, HasTerm env, MonadReader env m, MonadIO m) => [StyleDoc] -> m () #

prettyInfoS :: (HasCallStack, HasTerm env, MonadReader env m, MonadIO m) => String -> m () #

prettyNoteL :: (HasCallStack, HasTerm env, MonadReader env m, MonadIO m) => [StyleDoc] -> m () #

prettyNoteS :: (HasCallStack, HasTerm env, MonadReader env m, MonadIO m) => String -> m () #

prettyWarnL :: (HasCallStack, HasTerm env, MonadReader env m, MonadIO m) => [StyleDoc] -> m () #

prettyWarnS :: (HasCallStack, HasTerm env, MonadReader env m, MonadIO m) => String -> m () #