IHP Api Reference
Copyright(c) digitally induced GmbH 2020
Safe HaskellNone

IHP.MailPrelude

Description

 
Synopsis

Documentation

module IHP.Mail

data Encoding #

Instances

Instances details
Generic Encoding 
Instance details

Defined in Network.Mail.Mime

Associated Types

type Rep Encoding 
Instance details

Defined in Network.Mail.Mime

type Rep Encoding = D1 ('MetaData "Encoding" "Network.Mail.Mime" "mime-mail-0.5.1-HD962eRosDk81Gma35cW31" 'False) ((C1 ('MetaCons "None" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Base64" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "QuotedPrintableText" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "QuotedPrintableBinary" 'PrefixI 'False) (U1 :: Type -> Type)))

Methods

from :: Encoding -> Rep Encoding x

to :: Rep Encoding x -> Encoding

Show Encoding 
Instance details

Defined in Network.Mail.Mime

Methods

showsPrec :: Int -> Encoding -> ShowS #

show :: Encoding -> String

showList :: [Encoding] -> ShowS #

Eq Encoding 
Instance details

Defined in Network.Mail.Mime

type Rep Encoding 
Instance details

Defined in Network.Mail.Mime

type Rep Encoding = D1 ('MetaData "Encoding" "Network.Mail.Mime" "mime-mail-0.5.1-HD962eRosDk81Gma35cW31" 'False) ((C1 ('MetaCons "None" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Base64" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "QuotedPrintableText" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "QuotedPrintableBinary" 'PrefixI 'False) (U1 :: Type -> Type)))

data Mail #

Instances

Instances details
Generic Mail 
Instance details

Defined in Network.Mail.Mime

Associated Types

type Rep Mail 
Instance details

Defined in Network.Mail.Mime

type Rep Mail = D1 ('MetaData "Mail" "Network.Mail.Mime" "mime-mail-0.5.1-HD962eRosDk81Gma35cW31" 'False) (C1 ('MetaCons "Mail" 'PrefixI 'True) ((S1 ('MetaSel ('Just "mailFrom") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Address) :*: (S1 ('MetaSel ('Just "mailTo") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Address]) :*: S1 ('MetaSel ('Just "mailCc") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Address]))) :*: (S1 ('MetaSel ('Just "mailBcc") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Address]) :*: (S1 ('MetaSel ('Just "mailHeaders") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Headers) :*: S1 ('MetaSel ('Just "mailParts") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Alternatives])))))

Methods

from :: Mail -> Rep Mail x

to :: Rep Mail x -> Mail

Show Mail 
Instance details

Defined in Network.Mail.Mime

Methods

showsPrec :: Int -> Mail -> ShowS #

show :: Mail -> String

showList :: [Mail] -> ShowS #

type Rep Mail 
Instance details

Defined in Network.Mail.Mime

type Rep Mail = D1 ('MetaData "Mail" "Network.Mail.Mime" "mime-mail-0.5.1-HD962eRosDk81Gma35cW31" 'False) (C1 ('MetaCons "Mail" 'PrefixI 'True) ((S1 ('MetaSel ('Just "mailFrom") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Address) :*: (S1 ('MetaSel ('Just "mailTo") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Address]) :*: S1 ('MetaSel ('Just "mailCc") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Address]))) :*: (S1 ('MetaSel ('Just "mailBcc") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Address]) :*: (S1 ('MetaSel ('Just "mailHeaders") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Headers) :*: S1 ('MetaSel ('Just "mailParts") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Alternatives])))))

randomString :: RandomGen d => Int -> d -> (String, d) #

simpleMailInMemory :: Address -> Address -> Text -> Text -> Text -> [(Text, Text, ByteString)] -> Mail #

data Address #

Constructors

Address 

Instances

Instances details
IsString Address 
Instance details

Defined in Network.Mail.Mime

Methods

fromString :: String -> Address #

Generic Address 
Instance details

Defined in Network.Mail.Mime

Associated Types

type Rep Address 
Instance details

Defined in Network.Mail.Mime

type Rep Address = D1 ('MetaData "Address" "Network.Mail.Mime" "mime-mail-0.5.1-HD962eRosDk81Gma35cW31" 'False) (C1 ('MetaCons "Address" 'PrefixI 'True) (S1 ('MetaSel ('Just "addressName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "addressEmail") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

Methods

from :: Address -> Rep Address x

to :: Rep Address x -> Address

Show Address 
Instance details

Defined in Network.Mail.Mime

Methods

showsPrec :: Int -> Address -> ShowS #

show :: Address -> String

showList :: [Address] -> ShowS #

Eq Address 
Instance details

Defined in Network.Mail.Mime

Methods

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

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

type Rep Address 
Instance details

Defined in Network.Mail.Mime

type Rep Address = D1 ('MetaData "Address" "Network.Mail.Mime" "mime-mail-0.5.1-HD962eRosDk81Gma35cW31" 'False) (C1 ('MetaCons "Address" 'PrefixI 'True) (S1 ('MetaSel ('Just "addressName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "addressEmail") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

renderMail' :: Mail -> IO ByteString #

sendmail :: ByteString -> IO () #

type Headers = [(ByteString, Text)] #

data Disposition #

Instances

Instances details
Generic Disposition 
Instance details

Defined in Network.Mail.Mime

Associated Types

type Rep Disposition 
Instance details

Defined in Network.Mail.Mime

type Rep Disposition = D1 ('MetaData "Disposition" "Network.Mail.Mime" "mime-mail-0.5.1-HD962eRosDk81Gma35cW31" 'False) (C1 ('MetaCons "AttachmentDisposition" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)) :+: (C1 ('MetaCons "InlineDisposition" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)) :+: C1 ('MetaCons "DefaultDisposition" 'PrefixI 'False) (U1 :: Type -> Type)))

Methods

from :: Disposition -> Rep Disposition x

to :: Rep Disposition x -> Disposition

Show Disposition 
Instance details

Defined in Network.Mail.Mime

Methods

showsPrec :: Int -> Disposition -> ShowS #

show :: Disposition -> String

showList :: [Disposition] -> ShowS #

Eq Disposition 
Instance details

Defined in Network.Mail.Mime

type Rep Disposition 
Instance details

Defined in Network.Mail.Mime

type Rep Disposition = D1 ('MetaData "Disposition" "Network.Mail.Mime" "mime-mail-0.5.1-HD962eRosDk81Gma35cW31" 'False) (C1 ('MetaCons "AttachmentDisposition" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)) :+: (C1 ('MetaCons "InlineDisposition" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)) :+: C1 ('MetaCons "DefaultDisposition" 'PrefixI 'False) (U1 :: Type -> Type)))

data PartContent #

Constructors

PartContent ByteString 
NestedParts [Part] 

Instances

Instances details
Generic PartContent 
Instance details

Defined in Network.Mail.Mime

Associated Types

type Rep PartContent 
Instance details

Defined in Network.Mail.Mime

type Rep PartContent = D1 ('MetaData "PartContent" "Network.Mail.Mime" "mime-mail-0.5.1-HD962eRosDk81Gma35cW31" 'False) (C1 ('MetaCons "PartContent" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ByteString)) :+: C1 ('MetaCons "NestedParts" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Part])))

Methods

from :: PartContent -> Rep PartContent x

to :: Rep PartContent x -> PartContent

Show PartContent 
Instance details

Defined in Network.Mail.Mime

Methods

showsPrec :: Int -> PartContent -> ShowS #

show :: PartContent -> String

showList :: [PartContent] -> ShowS #

Eq PartContent 
Instance details

Defined in Network.Mail.Mime

type Rep PartContent 
Instance details

Defined in Network.Mail.Mime

type Rep PartContent = D1 ('MetaData "PartContent" "Network.Mail.Mime" "mime-mail-0.5.1-HD962eRosDk81Gma35cW31" 'False) (C1 ('MetaCons "PartContent" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ByteString)) :+: C1 ('MetaCons "NestedParts" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Part])))

data Part #

Instances

Instances details
Generic Part 
Instance details

Defined in Network.Mail.Mime

Associated Types

type Rep Part 
Instance details

Defined in Network.Mail.Mime

type Rep Part = D1 ('MetaData "Part" "Network.Mail.Mime" "mime-mail-0.5.1-HD962eRosDk81Gma35cW31" 'False) (C1 ('MetaCons "Part" 'PrefixI 'True) ((S1 ('MetaSel ('Just "partType") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "partEncoding") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Encoding)) :*: (S1 ('MetaSel ('Just "partDisposition") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Disposition) :*: (S1 ('MetaSel ('Just "partHeaders") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Headers) :*: S1 ('MetaSel ('Just "partContent") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PartContent)))))

Methods

from :: Part -> Rep Part x

to :: Rep Part x -> Part

Show Part 
Instance details

Defined in Network.Mail.Mime

Methods

showsPrec :: Int -> Part -> ShowS #

show :: Part -> String

showList :: [Part] -> ShowS #

Eq Part 
Instance details

Defined in Network.Mail.Mime

Methods

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

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

type Rep Part 
Instance details

Defined in Network.Mail.Mime

type Rep Part = D1 ('MetaData "Part" "Network.Mail.Mime" "mime-mail-0.5.1-HD962eRosDk81Gma35cW31" 'False) (C1 ('MetaCons "Part" 'PrefixI 'True) ((S1 ('MetaSel ('Just "partType") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "partEncoding") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Encoding)) :*: (S1 ('MetaSel ('Just "partDisposition") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Disposition) :*: (S1 ('MetaSel ('Just "partHeaders") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Headers) :*: S1 ('MetaSel ('Just "partContent") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PartContent)))))

newtype Boundary #

Constructors

Boundary 

Fields

Instances

Instances details
Show Boundary 
Instance details

Defined in Network.Mail.Mime

Methods

showsPrec :: Int -> Boundary -> ShowS #

show :: Boundary -> String

showList :: [Boundary] -> ShowS #

Eq Boundary 
Instance details

Defined in Network.Mail.Mime

Random Boundary 
Instance details

Defined in Network.Mail.Mime

Methods

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

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

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

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

data ImageContent #

Constructors

ImageFilePath FilePath 
ImageByteString ByteString 

Instances

Instances details
Show ImageContent 
Instance details

Defined in Network.Mail.Mime

Methods

showsPrec :: Int -> ImageContent -> ShowS #

show :: ImageContent -> String

showList :: [ImageContent] -> ShowS #

data InlineImage #

Instances

Instances details
Show InlineImage 
Instance details

Defined in Network.Mail.Mime

Methods

showsPrec :: Int -> InlineImage -> ShowS #

show :: InlineImage -> String

showList :: [InlineImage] -> ShowS #

renderMail :: RandomGen g => g -> Mail -> (ByteString, g) #

addAttachmentBS :: Text -> Text -> ByteString -> Mail -> Mail #

addAttachmentsBS :: [(Text, Text, ByteString)] -> Mail -> Mail #

filePartBS :: Text -> Text -> ByteString -> Part #

htmlPart :: Text -> Part #

plainPart :: Text -> Part #

quotedPrintable :: Bool -> ByteString -> Builder #

sendmailCustom :: FilePath -> [String] -> ByteString -> IO () #

simpleMail :: Address -> Address -> Text -> Text -> Text -> [(Text, FilePath)] -> IO Mail #

simpleMail' :: Address -> Address -> Text -> Text -> Mail #

simpleMailWithImages :: [Address] -> Address -> Text -> Text -> Text -> [InlineImage] -> [(Text, FilePath)] -> IO Mail #

time :: UTCTime -> Html Source #

Display time like 16:47

Render's a <time> HTML-Element for displaying the time.

Requires the javascript helpers to be available. Then the time will displayed in the current browser timezone.

The js helper uses toLocaleDateString to display the date in the browsers locale format.

Example: Generated HTML

>>> <div>{time (project.createdAt)}</div>
<div><time class="time">16:47</time></div>

Example: HTML after javascript helpers have been applied

>>> <div>{time (project.createdAt)}</div>
<div><time class="time">16:47 Uhr</time></div>

async :: IO a -> IO (Async a) #

group :: Eq a => [a] -> [[a]] #

data SubmitButton Source #

Instances

Instances details
ToHtml SubmitButton 
Instance details

Defined in IHP.View.Form

Methods

toHtml :: SubmitButton -> Html #

modal :: (?context :: ControllerContext) => Html Source #

hsx :: QuasiQuoter #

(.) :: forall (b :: k) (c :: k) (a :: k). Category cat => cat b c -> cat a b -> cat a c #

id :: forall (a :: k). Category cat => cat a a #

data Modal Source #

Constructors

Modal 

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

Defined in Test.QuickCheck.Poly

Methods

(+) :: OrdA -> OrdA -> OrdA #

(-) :: OrdA -> OrdA -> OrdA #

(*) :: OrdA -> OrdA -> OrdA #

negate :: OrdA -> OrdA #

abs :: OrdA -> OrdA #

signum :: OrdA -> OrdA #

fromInteger :: Integer -> OrdA #

Num OrdB 
Instance details

Defined in Test.QuickCheck.Poly

Methods

(+) :: OrdB -> OrdB -> OrdB #

(-) :: OrdB -> OrdB -> OrdB #

(*) :: OrdB -> OrdB -> OrdB #

negate :: OrdB -> OrdB #

abs :: OrdB -> OrdB #

signum :: OrdB -> OrdB #

fromInteger :: Integer -> OrdB #

Num OrdC 
Instance details

Defined in Test.QuickCheck.Poly

Methods

(+) :: OrdC -> OrdC -> OrdC #

(-) :: OrdC -> OrdC -> OrdC #

(*) :: OrdC -> OrdC -> OrdC #

negate :: OrdC -> OrdC #

abs :: OrdC -> OrdC #

signum :: OrdC -> OrdC #

fromInteger :: Integer -> OrdC #

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

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

Methods

(+) :: Int16 -> Int16 -> Int16 #

(-) :: Int16 -> Int16 -> Int16 #

(*) :: Int16 -> Int16 -> Int16 #

negate :: Int16 -> Int16 #

abs :: Int16 -> Int16 #

signum :: Int16 -> Int16 #

fromInteger :: Integer -> Int16 #

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

Methods

(+) :: Word16 -> Word16 -> Word16 #

(-) :: Word16 -> Word16 -> Word16 #

(*) :: Word16 -> Word16 -> Word16 #

negate :: Word16 -> Word16 #

abs :: Word16 -> Word16 #

signum :: Word16 -> Word16 #

fromInteger :: Integer -> Word16 #

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

Defined in Basement.Types.Word128

Methods

(+) :: Word128 -> Word128 -> Word128 #

(-) :: Word128 -> Word128 -> Word128 #

(*) :: Word128 -> Word128 -> Word128 #

negate :: Word128 -> Word128 #

abs :: Word128 -> Word128 #

signum :: Word128 -> Word128 #

fromInteger :: Integer -> Word128 #

Num Word256 
Instance details

Defined in Basement.Types.Word256

Methods

(+) :: Word256 -> Word256 -> Word256 #

(-) :: Word256 -> Word256 -> Word256 #

(*) :: Word256 -> Word256 -> Word256 #

negate :: Word256 -> Word256 #

abs :: Word256 -> Word256 #

signum :: Word256 -> Word256 #

fromInteger :: Integer -> Word256 #

Num PrivateNumber 
Instance details

Defined in Crypto.Types.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.Types.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 SharedKey 
Instance details

Defined in Crypto.Types.PubKey.DH

Methods

(+) :: SharedKey -> SharedKey -> SharedKey #

(-) :: SharedKey -> SharedKey -> SharedKey #

(*) :: SharedKey -> SharedKey -> SharedKey #

negate :: SharedKey -> SharedKey #

abs :: SharedKey -> SharedKey #

signum :: SharedKey -> SharedKey #

fromInteger :: Integer -> SharedKey #

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

Defined in GHC.Types.Basic

Methods

(+) :: IntWithInf -> IntWithInf -> IntWithInf #

(-) :: IntWithInf -> IntWithInf -> IntWithInf #

(*) :: IntWithInf -> IntWithInf -> IntWithInf #

negate :: IntWithInf -> IntWithInf #

abs :: IntWithInf -> IntWithInf #

signum :: IntWithInf -> IntWithInf #

fromInteger :: Integer -> IntWithInf #

Num SaneDouble 
Instance details

Defined in GHC.Types.SaneDouble

Methods

(+) :: SaneDouble -> SaneDouble -> SaneDouble #

(-) :: SaneDouble -> SaneDouble -> SaneDouble #

(*) :: SaneDouble -> SaneDouble -> SaneDouble #

negate :: SaneDouble -> SaneDouble #

abs :: SaneDouble -> SaneDouble #

signum :: SaneDouble -> SaneDouble #

fromInteger :: Integer -> SaneDouble #

Num Elapsed 
Instance details

Defined in Time.Types

Methods

(+) :: Elapsed -> Elapsed -> Elapsed #

(-) :: Elapsed -> Elapsed -> Elapsed #

(*) :: Elapsed -> Elapsed -> Elapsed #

negate :: Elapsed -> Elapsed #

abs :: Elapsed -> Elapsed #

signum :: Elapsed -> Elapsed #

fromInteger :: Integer -> Elapsed #

Num ElapsedP 
Instance details

Defined in Time.Types

Methods

(+) :: ElapsedP -> ElapsedP -> ElapsedP #

(-) :: ElapsedP -> ElapsedP -> ElapsedP #

(*) :: ElapsedP -> ElapsedP -> ElapsedP #

negate :: ElapsedP -> ElapsedP #

abs :: ElapsedP -> ElapsedP #

signum :: ElapsedP -> ElapsedP #

fromInteger :: Integer -> ElapsedP #

Num Hours 
Instance details

Defined in Time.Types

Methods

(+) :: Hours -> Hours -> Hours #

(-) :: Hours -> Hours -> Hours #

(*) :: Hours -> Hours -> Hours #

negate :: Hours -> Hours #

abs :: Hours -> Hours #

signum :: Hours -> Hours #

fromInteger :: Integer -> Hours #

Num Minutes 
Instance details

Defined in Time.Types

Methods

(+) :: Minutes -> Minutes -> Minutes #

(-) :: Minutes -> Minutes -> Minutes #

(*) :: Minutes -> Minutes -> Minutes #

negate :: Minutes -> Minutes #

abs :: Minutes -> Minutes #

signum :: Minutes -> Minutes #

fromInteger :: Integer -> Minutes #

Num NanoSeconds 
Instance details

Defined in Time.Types

Methods

(+) :: NanoSeconds -> NanoSeconds -> NanoSeconds #

(-) :: NanoSeconds -> NanoSeconds -> NanoSeconds #

(*) :: NanoSeconds -> NanoSeconds -> NanoSeconds #

negate :: NanoSeconds -> NanoSeconds #

abs :: NanoSeconds -> NanoSeconds #

signum :: NanoSeconds -> NanoSeconds #

fromInteger :: Integer -> NanoSeconds #

Num Seconds 
Instance details

Defined in Time.Types

Methods

(+) :: Seconds -> Seconds -> Seconds #

(-) :: Seconds -> Seconds -> Seconds #

(*) :: Seconds -> Seconds -> Seconds #

negate :: Seconds -> Seconds #

abs :: Seconds -> Seconds #

signum :: Seconds -> Seconds #

fromInteger :: Integer -> Seconds #

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

Defined in Database.PostgreSQL.LibPQ

Methods

(+) :: Column -> Column -> Column #

(-) :: Column -> Column -> Column #

(*) :: Column -> Column -> Column #

negate :: Column -> Column #

abs :: Column -> Column #

signum :: Column -> Column #

fromInteger :: Integer -> Column #

Num Row 
Instance details

Defined in Database.PostgreSQL.LibPQ

Methods

(+) :: Row -> Row -> Row #

(-) :: Row -> Row -> Row #

(*) :: Row -> Row -> Row #

negate :: Row -> Row #

abs :: Row -> Row #

signum :: Row -> Row #

fromInteger :: Integer -> Row #

Num CompOption 
Instance details

Defined in Text.Regex.PCRE.Wrap

Methods

(+) :: CompOption -> CompOption -> CompOption #

(-) :: CompOption -> CompOption -> CompOption #

(*) :: CompOption -> CompOption -> CompOption #

negate :: CompOption -> CompOption #

abs :: CompOption -> CompOption #

signum :: CompOption -> CompOption #

fromInteger :: Integer -> CompOption #

Num ExecOption 
Instance details

Defined in Text.Regex.PCRE.Wrap

Methods

(+) :: ExecOption -> ExecOption -> ExecOption #

(-) :: ExecOption -> ExecOption -> ExecOption #

(*) :: ExecOption -> ExecOption -> ExecOption #

negate :: ExecOption -> ExecOption #

abs :: ExecOption -> ExecOption #

signum :: ExecOption -> ExecOption #

fromInteger :: Integer -> ExecOption #

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

Defined in Data.Streaming.Text

Methods

(+) :: CodePoint -> CodePoint -> CodePoint #

(-) :: CodePoint -> CodePoint -> CodePoint #

(*) :: CodePoint -> CodePoint -> CodePoint #

negate :: CodePoint -> CodePoint #

abs :: CodePoint -> CodePoint #

signum :: CodePoint -> CodePoint #

fromInteger :: Integer -> CodePoint #

Num DecoderState 
Instance details

Defined in Data.Streaming.Text

Methods

(+) :: DecoderState -> DecoderState -> DecoderState #

(-) :: DecoderState -> DecoderState -> DecoderState #

(*) :: DecoderState -> DecoderState -> DecoderState #

negate :: DecoderState -> DecoderState #

abs :: DecoderState -> DecoderState #

signum :: DecoderState -> DecoderState #

fromInteger :: Integer -> DecoderState #

Num I8 
Instance details

Defined in Data.Text.Foreign

Methods

(+) :: I8 -> I8 -> I8 #

(-) :: I8 -> I8 -> I8 #

(*) :: I8 -> I8 -> I8 #

negate :: I8 -> I8 #

abs :: I8 -> I8 #

signum :: I8 -> I8 #

fromInteger :: Integer -> I8 #

Num Size 
Instance details

Defined in Data.Text.Internal.Fusion.Size

Methods

(+) :: Size -> Size -> Size #

(-) :: Size -> Size -> Size #

(*) :: Size -> Size -> Size #

negate :: Size -> Size #

abs :: Size -> Size #

signum :: Size -> Size #

fromInteger :: Integer -> Size #

Num B 
Instance details

Defined in Data.Text.Short.Internal

Methods

(+) :: B -> B -> B #

(-) :: B -> B -> B #

(*) :: B -> B -> B #

negate :: B -> B #

abs :: B -> B #

signum :: B -> B #

fromInteger :: Integer -> B #

Num DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Num NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Num Attosecond 
Instance details

Defined in Data.Time.Units

Methods

(+) :: Attosecond -> Attosecond -> Attosecond #

(-) :: Attosecond -> Attosecond -> Attosecond #

(*) :: Attosecond -> Attosecond -> Attosecond #

negate :: Attosecond -> Attosecond #

abs :: Attosecond -> Attosecond #

signum :: Attosecond -> Attosecond #

fromInteger :: Integer -> Attosecond #

Num Day 
Instance details

Defined in Data.Time.Units

Methods

(+) :: Day -> Day -> Day #

(-) :: Day -> Day -> Day #

(*) :: Day -> Day -> Day #

negate :: Day -> Day #

abs :: Day -> Day #

signum :: Day -> Day #

fromInteger :: Integer -> Day #

Num Femtosecond 
Instance details

Defined in Data.Time.Units

Methods

(+) :: Femtosecond -> Femtosecond -> Femtosecond #

(-) :: Femtosecond -> Femtosecond -> Femtosecond #

(*) :: Femtosecond -> Femtosecond -> Femtosecond #

negate :: Femtosecond -> Femtosecond #

abs :: Femtosecond -> Femtosecond #

signum :: Femtosecond -> Femtosecond #

fromInteger :: Integer -> Femtosecond #

Num Fortnight 
Instance details

Defined in Data.Time.Units

Methods

(+) :: Fortnight -> Fortnight -> Fortnight #

(-) :: Fortnight -> Fortnight -> Fortnight #

(*) :: Fortnight -> Fortnight -> Fortnight #

negate :: Fortnight -> Fortnight #

abs :: Fortnight -> Fortnight #

signum :: Fortnight -> Fortnight #

fromInteger :: Integer -> Fortnight #

Num Hour 
Instance details

Defined in Data.Time.Units

Methods

(+) :: Hour -> Hour -> Hour #

(-) :: Hour -> Hour -> Hour #

(*) :: Hour -> Hour -> Hour #

negate :: Hour -> Hour #

abs :: Hour -> Hour #

signum :: Hour -> Hour #

fromInteger :: Integer -> Hour #

Num Microsecond 
Instance details

Defined in Data.Time.Units

Methods

(+) :: Microsecond -> Microsecond -> Microsecond #

(-) :: Microsecond -> Microsecond -> Microsecond #

(*) :: Microsecond -> Microsecond -> Microsecond #

negate :: Microsecond -> Microsecond #

abs :: Microsecond -> Microsecond #

signum :: Microsecond -> Microsecond #

fromInteger :: Integer -> Microsecond #

Num Millisecond 
Instance details

Defined in Data.Time.Units

Methods

(+) :: Millisecond -> Millisecond -> Millisecond #

(-) :: Millisecond -> Millisecond -> Millisecond #

(*) :: Millisecond -> Millisecond -> Millisecond #

negate :: Millisecond -> Millisecond #

abs :: Millisecond -> Millisecond #

signum :: Millisecond -> Millisecond #

fromInteger :: Integer -> Millisecond #

Num Minute 
Instance details

Defined in Data.Time.Units

Methods

(+) :: Minute -> Minute -> Minute #

(-) :: Minute -> Minute -> Minute #

(*) :: Minute -> Minute -> Minute #

negate :: Minute -> Minute #

abs :: Minute -> Minute #

signum :: Minute -> Minute #

fromInteger :: Integer -> Minute #

Num Nanosecond 
Instance details

Defined in Data.Time.Units

Methods

(+) :: Nanosecond -> Nanosecond -> Nanosecond #

(-) :: Nanosecond -> Nanosecond -> Nanosecond #

(*) :: Nanosecond -> Nanosecond -> Nanosecond #

negate :: Nanosecond -> Nanosecond #

abs :: Nanosecond -> Nanosecond #

signum :: Nanosecond -> Nanosecond #

fromInteger :: Integer -> Nanosecond #

Num Picosecond 
Instance details

Defined in Data.Time.Units

Methods

(+) :: Picosecond -> Picosecond -> Picosecond #

(-) :: Picosecond -> Picosecond -> Picosecond #

(*) :: Picosecond -> Picosecond -> Picosecond #

negate :: Picosecond -> Picosecond #

abs :: Picosecond -> Picosecond #

signum :: Picosecond -> Picosecond #

fromInteger :: Integer -> Picosecond #

Num Second 
Instance details

Defined in Data.Time.Units

Methods

(+) :: Second -> Second -> Second #

(-) :: Second -> Second -> Second #

(*) :: Second -> Second -> Second #

negate :: Second -> Second #

abs :: Second -> Second #

signum :: Second -> Second #

fromInteger :: Integer -> Second #

Num Week 
Instance details

Defined in Data.Time.Units

Methods

(+) :: Week -> Week -> Week #

(-) :: Week -> Week -> Week #

(*) :: Week -> Week -> Week #

negate :: Week -> Week #

abs :: Week -> Week #

signum :: Week -> Week #

fromInteger :: Integer -> Week #

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

Defined in Data.WideWord.Int128

Methods

(+) :: Int128 -> Int128 -> Int128 #

(-) :: Int128 -> Int128 -> Int128 #

(*) :: Int128 -> Int128 -> Int128 #

negate :: Int128 -> Int128 #

abs :: Int128 -> Int128 #

signum :: Int128 -> Int128 #

fromInteger :: Integer -> Int128 #

Num Word128 
Instance details

Defined in Data.WideWord.Word128

Methods

(+) :: Word128 -> Word128 -> Word128 #

(-) :: Word128 -> Word128 -> Word128 #

(*) :: Word128 -> Word128 -> Word128 #

negate :: Word128 -> Word128 #

abs :: Word128 -> Word128 #

signum :: Word128 -> Word128 #

fromInteger :: Integer -> Word128 #

Num Word256 
Instance details

Defined in Data.WideWord.Word256

Methods

(+) :: Word256 -> Word256 -> Word256 #

(-) :: Word256 -> Word256 -> Word256 #

(*) :: Word256 -> Word256 -> Word256 #

negate :: Word256 -> Word256 #

abs :: Word256 -> Word256 #

signum :: Word256 -> Word256 #

fromInteger :: Integer -> Word256 #

Num Integer 
Instance details

Defined in GHC.Num

Num Natural 
Instance details

Defined in GHC.Num

Methods

(+) :: Natural -> Natural -> Natural #

(-) :: Natural -> Natural -> Natural #

(*) :: Natural -> Natural -> Natural #

negate :: Natural -> Natural #

abs :: Natural -> Natural #

signum :: Natural -> Natural #

fromInteger :: Integer -> Natural #

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 #

Num a => Num (Blind a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(+) :: Blind a -> Blind a -> Blind a #

(-) :: Blind a -> Blind a -> Blind a #

(*) :: Blind a -> Blind a -> Blind a #

negate :: Blind a -> Blind a #

abs :: Blind a -> Blind a #

signum :: Blind a -> Blind a #

fromInteger :: Integer -> Blind a #

Num a => Num (Fixed a) 
Instance details

Defined in Test.QuickCheck.Modifiers

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 (Large a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(+) :: Large a -> Large a -> Large a #

(-) :: Large a -> Large a -> Large a #

(*) :: Large a -> Large a -> Large a #

negate :: Large a -> Large a #

abs :: Large a -> Large a #

signum :: Large a -> Large a #

fromInteger :: Integer -> Large a #

Num a => Num (Shrink2 a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(+) :: Shrink2 a -> Shrink2 a -> Shrink2 a #

(-) :: Shrink2 a -> Shrink2 a -> Shrink2 a #

(*) :: Shrink2 a -> Shrink2 a -> Shrink2 a #

negate :: Shrink2 a -> Shrink2 a #

abs :: Shrink2 a -> Shrink2 a #

signum :: Shrink2 a -> Shrink2 a #

fromInteger :: Integer -> Shrink2 a #

Num a => Num (Small a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(+) :: Small a -> Small a -> Small a #

(-) :: Small a -> Small a -> Small a #

(*) :: Small a -> Small a -> Small a #

negate :: Small a -> Small a #

abs :: Small a -> Small a #

signum :: Small a -> Small a #

fromInteger :: Integer -> Small a #

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 #

Num (ElapsedSince epoch) 
Instance details

Defined in Data.Hourglass.Epoch

Methods

(+) :: ElapsedSince epoch -> ElapsedSince epoch -> ElapsedSince epoch #

(-) :: ElapsedSince epoch -> ElapsedSince epoch -> ElapsedSince epoch #

(*) :: ElapsedSince epoch -> ElapsedSince epoch -> ElapsedSince epoch #

negate :: ElapsedSince epoch -> ElapsedSince epoch #

abs :: ElapsedSince epoch -> ElapsedSince epoch #

signum :: ElapsedSince epoch -> ElapsedSince epoch #

fromInteger :: Integer -> ElapsedSince epoch #

Num (ElapsedSinceP e) 
Instance details

Defined in Data.Hourglass.Epoch

Methods

(+) :: ElapsedSinceP e -> ElapsedSinceP e -> ElapsedSinceP e #

(-) :: ElapsedSinceP e -> ElapsedSinceP e -> ElapsedSinceP e #

(*) :: ElapsedSinceP e -> ElapsedSinceP e -> ElapsedSinceP e #

negate :: ElapsedSinceP e -> ElapsedSinceP e #

abs :: ElapsedSinceP e -> ElapsedSinceP e #

signum :: ElapsedSinceP e -> ElapsedSinceP e #

fromInteger :: Integer -> ElapsedSinceP e #

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 #

(Biapplicative bi, Num a, Num b) => Num (Biap bi a b) 
Instance details

Defined in Data.Bifunctor.Biap

Methods

(+) :: Biap bi a b -> Biap bi a b -> Biap bi a b #

(-) :: Biap bi a b -> Biap bi a b -> Biap bi a b #

(*) :: Biap bi a b -> Biap bi a b -> Biap bi a b #

negate :: Biap bi a b -> Biap bi a b #

abs :: Biap bi a b -> Biap bi a b #

signum :: Biap bi a b -> Biap bi a b #

fromInteger :: Integer -> Biap bi a b #

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 #

newtype ModalContainer Source #

Stores the current modal inside ?context

Constructors

ModalContainer Html 

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

Defined in Test.HUnit.Lang

Methods

toException :: HUnitFailure -> SomeException #

fromException :: SomeException -> Maybe HUnitFailure #

displayException :: HUnitFailure -> String #

Exception RSAError 
Instance details

Defined in Codec.Crypto.RSA.Pure

Methods

toException :: RSAError -> SomeException #

fromException :: SomeException -> Maybe RSAError #

displayException :: RSAError -> String #

Exception AesonException 
Instance details

Defined in Data.Aeson.Types.Internal

Exception ASN1Error 
Instance details

Defined in Data.ASN1.Error

Methods

toException :: ASN1Error -> SomeException #

fromException :: SomeException -> Maybe ASN1Error #

displayException :: ASN1Error -> String #

Exception BitArrayOutOfBound 
Instance details

Defined in Data.ASN1.BitArray

Methods

toException :: BitArrayOutOfBound -> SomeException #

fromException :: SomeException -> Maybe BitArrayOutOfBound #

displayException :: BitArrayOutOfBound -> String #

Exception AsyncCancelled 
Instance details

Defined in Control.Concurrent.Async.Internal

Exception ExceptionInLinkedThread 
Instance details

Defined in Control.Concurrent.Async.Internal

Exception OAuthException 
Instance details

Defined in Web.Authenticate.OAuth

Methods

toException :: OAuthException -> SomeException #

fromException :: SomeException -> Maybe OAuthException #

displayException :: OAuthException -> 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

Methods

toException :: ExitCode -> SomeException #

fromException :: SomeException -> Maybe ExitCode #

displayException :: ExitCode -> String #

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

Defined in Basement.Exception

Methods

toException :: InvalidRecast -> SomeException #

fromException :: SomeException -> Maybe InvalidRecast #

displayException :: InvalidRecast -> String #

Exception NonEmptyCollectionIsEmpty 
Instance details

Defined in Basement.Exception

Methods

toException :: NonEmptyCollectionIsEmpty -> SomeException #

fromException :: SomeException -> Maybe NonEmptyCollectionIsEmpty #

displayException :: NonEmptyCollectionIsEmpty -> String #

Exception OutOfBound 
Instance details

Defined in Basement.Exception

Methods

toException :: OutOfBound -> SomeException #

fromException :: SomeException -> Maybe OutOfBound #

displayException :: OutOfBound -> 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 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 CipherError 
Instance details

Defined in Crypto.Classes.Exceptions

Methods

toException :: CipherError -> SomeException #

fromException :: SomeException -> Maybe CipherError #

displayException :: CipherError -> String #

Exception GenError 
Instance details

Defined in Crypto.Random

Methods

toException :: GenError -> SomeException #

fromException :: SomeException -> Maybe GenError #

displayException :: GenError -> String #

Exception BlockCipherError 
Instance details

Defined in Crypto.Types

Methods

toException :: BlockCipherError -> SomeException #

fromException :: SomeException -> Maybe BlockCipherError #

displayException :: BlockCipherError -> 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 HostCannotConnect 
Instance details

Defined in Network.Connection

Methods

toException :: HostCannotConnect -> SomeException #

fromException :: SomeException -> Maybe HostCannotConnect #

displayException :: HostCannotConnect -> String #

Exception HostNotResolved 
Instance details

Defined in Network.Connection

Methods

toException :: HostNotResolved -> SomeException #

fromException :: SomeException -> Maybe HostNotResolved #

displayException :: HostNotResolved -> String #

Exception LineTooLong 
Instance details

Defined in Network.Connection

Methods

toException :: LineTooLong -> SomeException #

fromException :: SomeException -> Maybe LineTooLong #

displayException :: LineTooLong -> String #

Exception PEMError 
Instance details

Defined in Data.X509.File

Methods

toException :: PEMError -> SomeException #

fromException :: SomeException -> Maybe PEMError #

displayException :: PEMError -> 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 ChaChaException 
Instance details

Defined in Crypto.Cipher.ChaChaPoly1305.Conduit

Methods

toException :: ChaChaException -> SomeException #

fromException :: SomeException -> Maybe ChaChaException #

displayException :: ChaChaException -> String #

Exception GHCiQException 
Instance details

Defined in GHCi.TH

Methods

toException :: GHCiQException -> SomeException #

fromException :: SomeException -> Maybe GHCiQException #

displayException :: GHCiQException -> String #

Exception ResultStatus 
Instance details

Defined in Test.Hspec.Core.Example

Methods

toException :: ResultStatus -> SomeException #

fromException :: SomeException -> Maybe ResultStatus #

displayException :: ResultStatus -> 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

Methods

toException :: HttpException -> SomeException #

fromException :: SomeException -> Maybe HttpException #

displayException :: HttpException -> String #

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

Defined in Text.Inflections.Types

Methods

toException :: InflectionException -> SomeException #

fromException :: SomeException -> Maybe InflectionException #

displayException :: InflectionException -> String #

Exception HandlingException 
Instance details

Defined in Control.Lens.Internal.Exception

Methods

toException :: HandlingException -> SomeException #

fromException :: SomeException -> Maybe HandlingException #

displayException :: HandlingException -> String #

Exception ParamException Source # 
Instance details

Defined in IHP.Controller.Param

Exception ResponseException Source # 
Instance details

Defined in IHP.Controller.Response

Exception ExceptionWithCallStack Source # 
Instance details

Defined in IHP.FrameworkConfig

Exception EnhancedSqlError Source # 
Instance details

Defined in IHP.ModelSupport

Exception RecordNotFoundException Source # 
Instance details

Defined in IHP.ModelSupport

Exception TypedAutoRouteError Source # 
Instance details

Defined in IHP.Router.Types

Exception UnexpectedMethodException Source # 
Instance details

Defined in IHP.Router.Types

Exception InvalidPosException 
Instance details

Defined in Text.Megaparsec.Pos

Methods

toException :: InvalidPosException -> SomeException #

fromException :: SomeException -> Maybe InvalidPosException #

displayException :: InvalidPosException -> String #

Exception SESException 
Instance details

Defined in Network.Mail.Mime.SES

Methods

toException :: SESException -> SomeException #

fromException :: SomeException -> Maybe SESException #

displayException :: SESException -> String #

Exception MErrV 
Instance details

Defined in Network.Minio.Errors

Exception MinioErr 
Instance details

Defined in Network.Minio.Errors

Methods

toException :: MinioErr -> SomeException #

fromException :: SomeException -> Maybe MinioErr #

displayException :: MinioErr -> String #

Exception ServiceErr 
Instance details

Defined in Network.Minio.Errors

Methods

toException :: ServiceErr -> SomeException #

fromException :: SomeException -> Maybe ServiceErr #

displayException :: ServiceErr -> String #

Exception NullError 
Instance details

Defined in Data.NonNull

Methods

toException :: NullError -> SomeException #

fromException :: SomeException -> Maybe NullError #

displayException :: NullError -> String #

Exception BufferOverrun 
Instance details

Defined in Network.ByteOrder

Methods

toException :: BufferOverrun -> SomeException #

fromException :: SomeException -> Maybe BufferOverrun #

displayException :: BufferOverrun -> String #

Exception EncodingException 
Instance details

Defined in System.OsString.Encoding.Internal

Methods

toException :: EncodingException -> SomeException #

fromException :: SomeException -> Maybe EncodingException #

displayException :: EncodingException -> String #

Exception ParseError 
Instance details

Defined in Text.Parsec.Error

Methods

toException :: ParseError -> SomeException #

fromException :: SomeException -> Maybe ParseError #

displayException :: ParseError -> String #

Exception ConstraintViolation 
Instance details

Defined in Database.PostgreSQL.Simple.Errors

Methods

toException :: ConstraintViolation -> SomeException #

fromException :: SomeException -> Maybe ConstraintViolation #

displayException :: ConstraintViolation -> String #

Exception ResultError 
Instance details

Defined in Database.PostgreSQL.Simple.FromField

Methods

toException :: ResultError -> SomeException #

fromException :: SomeException -> Maybe ResultError #

displayException :: ResultError -> String #

Exception FormatError 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Methods

toException :: FormatError -> SomeException #

fromException :: SomeException -> Maybe FormatError #

displayException :: FormatError -> String #

Exception QueryError 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Methods

toException :: QueryError -> SomeException #

fromException :: SomeException -> Maybe QueryError #

displayException :: QueryError -> String #

Exception SomePostgreSqlException 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Methods

toException :: SomePostgreSqlException -> SomeException #

fromException :: SomeException -> Maybe SomePostgreSqlException #

displayException :: SomePostgreSqlException -> String #

Exception SqlError 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Methods

toException :: SqlError -> SomeException #

fromException :: SomeException -> Maybe SqlError #

displayException :: SqlError -> String #

Exception ManyErrors 
Instance details

Defined in Database.PostgreSQL.Simple.Ok

Methods

toException :: ManyErrors -> SomeException #

fromException :: SomeException -> Maybe ManyErrors #

displayException :: ManyErrors -> String #

Exception Bug 
Instance details

Defined in Relude.Exception

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

Defined in Network.Socks5.Types

Methods

toException :: SocksError -> SomeException #

fromException :: SomeException -> Maybe SocksError #

displayException :: SocksError -> String #

Exception SocksVersionNotSupported 
Instance details

Defined in Network.Socks5.Types

Methods

toException :: SocksVersionNotSupported -> SomeException #

fromException :: SomeException -> Maybe SocksVersionNotSupported #

displayException :: SocksVersionNotSupported -> String #

Exception ProcessExitedUnsuccessfully 
Instance details

Defined in Data.Streaming.Process

Methods

toException :: ProcessExitedUnsuccessfully -> SomeException #

fromException :: SomeException -> Maybe ProcessExitedUnsuccessfully #

displayException :: ProcessExitedUnsuccessfully -> String #

Exception ZlibException 
Instance details

Defined in Data.Streaming.Zlib

Methods

toException :: ZlibException -> SomeException #

fromException :: SomeException -> Maybe ZlibException #

displayException :: ZlibException -> String #

Exception SetupTermError 
Instance details

Defined in System.Console.Terminfo.Base

Methods

toException :: SetupTermError -> SomeException #

fromException :: SomeException -> Maybe SetupTermError #

displayException :: SetupTermError -> String #

Exception UnicodeException 
Instance details

Defined in Data.Text.Encoding.Error

Methods

toException :: UnicodeException -> SomeException #

fromException :: SomeException -> Maybe UnicodeException #

displayException :: UnicodeException -> String #

Exception TimeoutThread 
Instance details

Defined in System.TimeManager

Methods

toException :: TimeoutThread -> SomeException #

fromException :: SomeException -> Maybe TimeoutThread #

displayException :: TimeoutThread -> String #

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

Defined in Network.Wai.Middleware.Approot

Methods

toException :: ApprootMiddlewareNotSetup -> SomeException #

fromException :: SomeException -> Maybe ApprootMiddlewareNotSetup #

displayException :: ApprootMiddlewareNotSetup -> String #

Exception RequestParseException 
Instance details

Defined in Network.Wai.Parse

Methods

toException :: RequestParseException -> SomeException #

fromException :: SomeException -> Maybe RequestParseException #

displayException :: RequestParseException -> String #

Exception RequestSizeException 
Instance details

Defined in Network.Wai.Request

Methods

toException :: RequestSizeException -> SomeException #

fromException :: SomeException -> Maybe RequestSizeException #

displayException :: RequestSizeException -> String #

Exception ExceptionInsideResponseBody 
Instance details

Defined in Network.Wai.Handler.Warp.Types

Methods

toException :: ExceptionInsideResponseBody -> SomeException #

fromException :: SomeException -> Maybe ExceptionInsideResponseBody #

displayException :: ExceptionInsideResponseBody -> String #

Exception InvalidRequest 
Instance details

Defined in Network.Wai.Handler.Warp.Types

Methods

toException :: InvalidRequest -> SomeException #

fromException :: SomeException -> Maybe InvalidRequest #

displayException :: InvalidRequest -> String #

Exception PongTimeout 
Instance details

Defined in Network.WebSockets.Connection.PingPong

Methods

toException :: PongTimeout -> SomeException #

fromException :: SomeException -> Maybe PongTimeout #

displayException :: PongTimeout -> String #

Exception HandshakeException 
Instance details

Defined in Network.WebSockets.Http

Methods

toException :: HandshakeException -> SomeException #

fromException :: SomeException -> Maybe HandshakeException #

displayException :: HandshakeException -> String #

Exception ConnectionException 
Instance details

Defined in Network.WebSockets.Types

Methods

toException :: ConnectionException -> SomeException #

fromException :: SomeException -> Maybe ConnectionException #

displayException :: ConnectionException -> String #

Exception UnresolvedEntityException 
Instance details

Defined in Text.XML

Methods

toException :: UnresolvedEntityException -> SomeException #

fromException :: SomeException -> Maybe UnresolvedEntityException #

displayException :: UnresolvedEntityException -> String #

Exception XMLException 
Instance details

Defined in Text.XML

Methods

toException :: XMLException -> SomeException #

fromException :: SomeException -> Maybe XMLException #

displayException :: XMLException -> String #

Exception XmlException 
Instance details

Defined in Text.XML.Stream.Parse

Methods

toException :: XmlException -> SomeException #

fromException :: SomeException -> Maybe XmlException #

displayException :: XmlException -> String #

Exception InvalidEventStream 
Instance details

Defined in Text.XML.Unresolved

Methods

toException :: InvalidEventStream -> SomeException #

fromException :: SomeException -> Maybe InvalidEventStream #

displayException :: InvalidEventStream -> String #

Exception DecompressError 
Instance details

Defined in Codec.Compression.Zlib.Internal

Methods

toException :: DecompressError -> SomeException #

fromException :: SomeException -> Maybe DecompressError #

displayException :: DecompressError -> String #

Typeable a => Exception (FieldException a) 
Instance details

Defined in Data.Data.Lens

Methods

toException :: FieldException a -> SomeException #

fromException :: SomeException -> Maybe (FieldException a) #

displayException :: FieldException a -> String #

(Show s, Show (Token s), Show e, ShowErrorComponent e, VisualStream s, Typeable s, Typeable e) => Exception (ParseError s e) 
Instance details

Defined in Text.Megaparsec.Error

Methods

toException :: ParseError s e -> SomeException #

fromException :: SomeException -> Maybe (ParseError s e) #

displayException :: ParseError s e -> String #

(Show s, Show (Token s), Show e, ShowErrorComponent e, VisualStream s, TraversableStream s, Typeable s, Typeable e) => Exception (ParseErrorBundle s e) 
Instance details

Defined in Text.Megaparsec.Error

Methods

toException :: ParseErrorBundle s e -> SomeException #

fromException :: SomeException -> Maybe (ParseErrorBundle s e) #

displayException :: ParseErrorBundle s e -> String #

(Reifies s (SomeException -> Maybe a), Typeable a, Typeable s, Typeable m) => Exception (Handling a s m) 
Instance details

Defined in Control.Lens.Internal.Exception

Methods

toException :: Handling a s m -> SomeException #

fromException :: SomeException -> Maybe (Handling a s m) #

displayException :: Handling a s m -> 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

ToJSON Text 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Text 
Instance details

Defined in Data.Aeson.Types.ToJSON

Chunk Text 
Instance details

Defined in Data.Attoparsec.Internal.Types

Associated Types

type ChunkElem Text 
Instance details

Defined in Data.Attoparsec.Internal.Types

type ChunkElem Text = Char

Methods

nullChunk :: Text -> Bool

pappendChunk :: State Text -> Text -> State Text

atBufferEnd :: Text -> State Text -> Pos

bufferElemAt :: Text -> Pos -> State Text -> Maybe (ChunkElem Text, Int)

chunkElemToChar :: Text -> ChunkElem Text -> Char

ToMarkup Text 
Instance details

Defined in Text.Blaze

Methods

toMarkup :: Text -> Markup

preEscapedToMarkup :: Text -> Markup

ToValue Text 
Instance details

Defined in Text.Blaze

Methods

toValue :: Text -> AttributeValue

preEscapedToValue :: Text -> AttributeValue

FoldCase Text 
Instance details

Defined in Data.CaseInsensitive.Internal

Methods

foldCase :: Text -> Text

foldCaseList :: [Text] -> [Text]

IOData Text 
Instance details

Defined in Data.IOData

Methods

readFile :: MonadIO m => FilePath -> m Text

writeFile :: MonadIO m => FilePath -> Text -> m ()

getLine :: MonadIO m => m Text

hGetContents :: MonadIO m => Handle -> m Text

hGetLine :: MonadIO m => Handle -> m Text

hPut :: MonadIO m => Handle -> Text -> m ()

hPutStrLn :: MonadIO m => Handle -> Text -> m ()

hGetChunk :: MonadIO m => Handle -> m 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

Default Text Source # 
Instance details

Defined in IHP.ModelSupport

Methods

def :: Text #

ToLogStr Text 
Instance details

Defined in System.Log.FastLogger.LogStr

Methods

toLogStr :: Text -> LogStr #

Hashable Text 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Text -> Int #

hash :: Text -> Int #

QueryKeyLike Text 
Instance details

Defined in Network.HTTP.Types.QueryLike

QueryValueLike Text 
Instance details

Defined in Network.HTTP.Types.QueryLike

ToHtml Text 
Instance details

Defined in IHP.HSX.ToHtml

Methods

toHtml :: Text -> Html #

Ixed Text 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index Text -> Traversal' Text (IxValue Text)

AsEmpty Text 
Instance details

Defined in Control.Lens.Empty

Methods

_Empty :: Prism' Text ()

Reversing Text 
Instance details

Defined in Control.Lens.Internal.Iso

Methods

reversing :: Text -> Text

Prefixed Text 
Instance details

Defined in Control.Lens.Prism

Methods

prefixed :: Text -> Prism' Text Text

Suffixed Text 
Instance details

Defined in Control.Lens.Prism

Methods

suffixed :: Text -> Prism' Text Text

IsText Text 
Instance details

Defined in Data.Text.Lens

Methods

packed :: Iso' String Text

builder :: Iso' Text Builder

text :: IndexedTraversal' Int Text Char

AsJSON Text 
Instance details

Defined in Data.Aeson.Lens

Methods

_JSON :: (FromJSON a, ToJSON b) => Prism Text Text a b

AsNumber Text 
Instance details

Defined in Data.Aeson.Lens

Methods

_Number :: Prism' Text Scientific

_Double :: Prism' Text Double

_Integer :: Prism' Text Integer

AsValue Text 
Instance details

Defined in Data.Aeson.Lens

Methods

_Value :: Prism' Text Value

_String :: Prism' Text Text

_Bool :: Prism' Text Bool

_Null :: Prism' Text ()

_Object :: Prism' Text (KeyMap Value)

_Array :: Prism' Text (Vector Value)

IsKey Text 
Instance details

Defined in Data.Aeson.Lens

Methods

_Key :: Iso' Text Key

VerifiyPassword Text Source # 
Instance details

Defined in IHP.AuthSupport.Authentication

ParamReader Text Source # 
Instance details

Defined in IHP.Controller.Param

EnvVarReader Text Source # 
Instance details

Defined in IHP.EnvVar

IsEmpty Text Source # 
Instance details

Defined in IHP.HaskellSupport

Methods

isEmpty :: Text -> Bool Source #

InputValue Text Source # 
Instance details

Defined in IHP.ModelSupport

Methods

inputValue :: Text -> Text Source #

ParsePrimaryKey Text Source # 
Instance details

Defined in IHP.ModelSupport

Stream Text 
Instance details

Defined in Text.Megaparsec.Stream

Associated Types

type Token Text 
Instance details

Defined in Text.Megaparsec.Stream

type Token Text = Token (ShareInput Text)
type Tokens Text 
Instance details

Defined in Text.Megaparsec.Stream

type Tokens Text = Tokens (ShareInput Text)

Methods

tokenToChunk :: Proxy Text -> Token Text -> Tokens Text

tokensToChunk :: Proxy Text -> [Token Text] -> Tokens Text

chunkToTokens :: Proxy Text -> Tokens Text -> [Token Text]

chunkLength :: Proxy Text -> Tokens Text -> Int

chunkEmpty :: Proxy Text -> Tokens Text -> Bool

take1_ :: Text -> Maybe (Token Text, Text)

takeN_ :: Int -> Text -> Maybe (Tokens Text, Text)

takeWhile_ :: (Token Text -> Bool) -> Text -> (Tokens Text, Text)

TraversableStream Text 
Instance details

Defined in Text.Megaparsec.Stream

Methods

reachOffset :: Int -> PosState Text -> (Maybe String, PosState Text)

reachOffsetNoLine :: Int -> PosState Text -> PosState Text

VisualStream Text 
Instance details

Defined in Text.Megaparsec.Stream

Methods

showTokens :: Proxy Text -> NonEmpty (Token Text) -> String

tokensLength :: Proxy Text -> NonEmpty (Token Text) -> Int

MonoZip Text 
Instance details

Defined in Data.Containers

GrowingAppend Text 
Instance details

Defined in Data.MonoTraversable

MonoFoldable Text 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element Text -> m) -> Text -> m #

ofoldr :: (Element Text -> b -> b) -> b -> Text -> b #

ofoldl' :: (a -> Element Text -> a) -> a -> Text -> a #

otoList :: Text -> [Element Text] #

oall :: (Element Text -> Bool) -> Text -> Bool #

oany :: (Element Text -> Bool) -> Text -> Bool #

onull :: Text -> Bool #

olength :: Text -> Int #

olength64 :: Text -> Int64 #

ocompareLength :: Integral i => Text -> i -> Ordering #

otraverse_ :: Applicative f => (Element Text -> f b) -> Text -> f () #

ofor_ :: Applicative f => Text -> (Element Text -> f b) -> f () #

omapM_ :: Applicative m => (Element Text -> m ()) -> Text -> m () #

oforM_ :: Applicative m => Text -> (Element Text -> m ()) -> m () #

ofoldlM :: Monad m => (a -> Element Text -> m a) -> a -> Text -> m a #

ofoldMap1Ex :: Semigroup m => (Element Text -> m) -> Text -> m #

ofoldr1Ex :: (Element Text -> Element Text -> Element Text) -> Text -> Element Text #

ofoldl1Ex' :: (Element Text -> Element Text -> Element Text) -> Text -> Element Text #

headEx :: Text -> Element Text #

lastEx :: Text -> Element Text #

unsafeHead :: Text -> Element Text #

unsafeLast :: Text -> Element Text #

maximumByEx :: (Element Text -> Element Text -> Ordering) -> Text -> Element Text #

minimumByEx :: (Element Text -> Element Text -> Ordering) -> Text -> Element Text #

oelem :: Element Text -> Text -> Bool #

onotElem :: Element Text -> Text -> Bool #

MonoFunctor Text 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element Text -> Element Text) -> Text -> Text #

MonoPointed Text 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element Text -> Text #

MonoTraversable Text 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element Text -> f (Element Text)) -> Text -> f Text #

omapM :: Applicative m => (Element Text -> m (Element Text)) -> Text -> m Text #

IsSequence Text 
Instance details

Defined in Data.Sequences

Methods

fromList :: [Element Text] -> Text #

lengthIndex :: Text -> Index Text #

break :: (Element Text -> Bool) -> Text -> (Text, Text) #

span :: (Element Text -> Bool) -> Text -> (Text, Text) #

dropWhile :: (Element Text -> Bool) -> Text -> Text #

takeWhile :: (Element Text -> Bool) -> Text -> Text

splitAt :: Index Text -> Text -> (Text, Text) #

unsafeSplitAt :: Index Text -> Text -> (Text, Text) #

take :: Index Text -> Text -> Text

unsafeTake :: Index Text -> Text -> Text #

drop :: Index Text -> Text -> Text #

unsafeDrop :: Index Text -> Text -> Text #

dropEnd :: Index Text -> Text -> Text #

partition :: (Element Text -> Bool) -> Text -> (Text, Text) #

uncons :: Text -> Maybe (Element Text, Text) #

unsnoc :: Text -> Maybe (Text, Element Text) #

filter :: (Element Text -> Bool) -> Text -> Text #

filterM :: Monad m => (Element Text -> m Bool) -> Text -> m Text #

replicate :: Index Text -> Element Text -> Text #

replicateM :: Monad m => Index Text -> m (Element Text) -> m Text #

groupBy :: (Element Text -> Element Text -> Bool) -> Text -> [Text] #

groupAllOn :: Eq b => (Element Text -> b) -> Text -> [Text] #

subsequences :: Text -> [Text] #

permutations :: Text -> [Text] #

tailEx :: Text -> Text #

tailMay :: Text -> Maybe Text #

initEx :: Text -> Text #

initMay :: Text -> Maybe Text #

unsafeTail :: Text -> Text #

unsafeInit :: Text -> Text #

index :: Text -> Index Text -> Maybe (Element Text)

indexEx :: Text -> Index Text -> Element Text #

unsafeIndex :: Text -> Index Text -> Element Text #

splitWhen :: (Element Text -> Bool) -> Text -> [Text] #

tails :: Text -> [Text] #

inits :: Text -> [Text] #

initTails :: Text -> [(Text, Text)] #

SemiSequence Text 
Instance details

Defined in Data.Sequences

Associated Types

type Index Text 
Instance details

Defined in Data.Sequences

type Index Text = Int
Textual Text 
Instance details

Defined in Data.Sequences

Methods

words :: Text -> [Text] #

unwords :: (Element seq ~ Text, MonoFoldable seq) => seq -> Text #

lines :: Text -> [Text] #

unlines :: (Element seq ~ Text, MonoFoldable seq) => seq -> Text #

toLower :: Text -> Text #

toUpper :: Text -> Text #

toCaseFold :: Text -> Text #

breakWord :: Text -> (Text, Text) #

breakLine :: Text -> (Text, Text) #

FromField Text 
Instance details

Defined in Database.PostgreSQL.Simple.FromField

Methods

fromField :: FieldParser Text

ToField Text 
Instance details

Defined in Database.PostgreSQL.Simple.ToField

Methods

toField :: Text -> Action

Pretty Text 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Text -> Doc ann

prettyList :: [Text] -> Doc ann

Extract Text 
Instance details

Defined in Text.Regex.Base.RegexLike

Methods

before :: Int -> Text -> Text

after :: Int -> Text -> Text

empty :: Text

extract :: (Int, Int) -> Text -> Text

Uncons Text 
Instance details

Defined in Text.Regex.TDFA.NewDFA.Uncons

Methods

uncons :: Text -> Maybe (Char, Text)

One Text 
Instance details

Defined in Relude.Container.One

Associated Types

type OneItem Text 
Instance details

Defined in Relude.Container.One

type OneItem Text = Char

Methods

one :: OneItem Text -> Text

ToLText Text 
Instance details

Defined in Relude.String.Conversion

Methods

toLText :: Text -> LText

ToString Text 
Instance details

Defined in Relude.String.Conversion

Methods

toString :: Text -> String

ToText Text 
Instance details

Defined in Relude.String.Conversion

Methods

toText :: Text -> Text

WebSocketsData Text 
Instance details

Defined in Network.WebSockets.Types

Methods

fromDataMessage :: DataMessage -> Text

fromLazyByteString :: ByteString -> Text

toLazyByteString :: Text -> ByteString

ToBuilder Text Builder 
Instance details

Defined in Data.Builder

Methods

toBuilder :: Text -> Builder #

ToBuilder Text Builder 
Instance details

Defined in Data.Builder

Methods

toBuilder :: Text -> Builder #

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

ConvertUtf8 Text ByteString 
Instance details

Defined in Relude.String.Conversion

ConvertUtf8 Text ShortByteString 
Instance details

Defined in Relude.String.Conversion

Methods

encodeUtf8 :: Text -> ShortByteString

decodeUtf8 :: ShortByteString -> Text

decodeUtf8Strict :: ShortByteString -> Either UnicodeException Text

ConvertUtf8 Text LByteString 
Instance details

Defined in Relude.String.Conversion

Methods

encodeUtf8 :: Text -> LByteString

decodeUtf8 :: LByteString -> Text

decodeUtf8Strict :: LByteString -> Either UnicodeException Text

LazyStrict LText Text 
Instance details

Defined in Relude.String.Conversion

Methods

toLazy :: Text -> LText

toStrict :: LText -> Text

Strict Text Text 
Instance details

Defined in Data.Strict.Classes

Methods

toStrict :: Text -> Text

toLazy :: Text -> Text

ConvertibleStrings LazyByteString StrictText 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: LazyByteString -> StrictText #

ConvertibleStrings LazyText StrictText 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: LazyText -> StrictText #

ConvertibleStrings StrictByteString StrictText 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: StrictByteString -> StrictText #

ConvertibleStrings StrictText LazyByteString 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: StrictText -> LazyByteString #

ConvertibleStrings StrictText LazyText 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: StrictText -> LazyText #

ConvertibleStrings StrictText StrictByteString 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: StrictText -> StrictByteString #

ConvertibleStrings StrictText StrictText 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: StrictText -> StrictText #

ConvertibleStrings StrictText String 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: StrictText -> String #

ConvertibleStrings Text Key Source # 
Instance details

Defined in IHP.HaskellSupport

Methods

convertString :: Text -> Key #

ConvertibleStrings String StrictText 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: String -> StrictText #

Monad m => Stream Text m Char 
Instance details

Defined in Text.Parsec.Prim

Methods

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

Cons Text Text Char Char 
Instance details

Defined in Control.Lens.Cons

Methods

_Cons :: Prism Text Text (Char, Text) (Char, Text)

Snoc Text Text Char Char 
Instance details

Defined in Control.Lens.Cons

Methods

_Snoc :: Prism Text Text (Text, Char) (Text, Char)

(a ~ Char, b ~ Char) => Each Text Text a b 
Instance details

Defined in Control.Lens.Each

Methods

each :: Traversal Text Text a b

SetField "annotations" MetaBag [(Text, Violation)] Source # 
Instance details

Defined in IHP.ModelSupport

SetField "touchedFields" MetaBag [Text] Source # 
Instance details

Defined in IHP.ModelSupport

Methods

setField :: [Text] -> MetaBag -> MetaBag Source #

SetField "formAction" (FormContext record) Text Source # 
Instance details

Defined in IHP.View.Types

Methods

setField :: Text -> FormContext record -> FormContext record Source #

SetField "formClass" (FormContext record) Text Source # 
Instance details

Defined in IHP.View.Types

Methods

setField :: Text -> FormContext record -> FormContext record Source #

SetField "formId" (FormContext record) Text Source # 
Instance details

Defined in IHP.View.Types

Methods

setField :: Text -> FormContext record -> FormContext record Source #

SetField "formMethod" (FormContext record) Text Source # 
Instance details

Defined in IHP.View.Types

Methods

setField :: Text -> FormContext record -> FormContext record Source #

SetField "customFormAttributes" (FormContext record) [(Text, Text)] Source # 
Instance details

Defined in IHP.View.Types

Methods

setField :: [(Text, Text)] -> FormContext record -> FormContext record Source #

VerifiyPassword (Maybe Text) Source # 
Instance details

Defined in IHP.AuthSupport.Authentication

Stream (NoShareInput Text) 
Instance details

Defined in Text.Megaparsec.Stream

Associated Types

type Token (NoShareInput Text) 
Instance details

Defined in Text.Megaparsec.Stream

type Token (NoShareInput Text) = Char
type Tokens (NoShareInput Text) 
Instance details

Defined in Text.Megaparsec.Stream

type Tokens (NoShareInput Text) = Text

Methods

tokenToChunk :: Proxy (NoShareInput Text) -> Token (NoShareInput Text) -> Tokens (NoShareInput Text)

tokensToChunk :: Proxy (NoShareInput Text) -> [Token (NoShareInput Text)] -> Tokens (NoShareInput Text)

chunkToTokens :: Proxy (NoShareInput Text) -> Tokens (NoShareInput Text) -> [Token (NoShareInput Text)]

chunkLength :: Proxy (NoShareInput Text) -> Tokens (NoShareInput Text) -> Int

chunkEmpty :: Proxy (NoShareInput Text) -> Tokens (NoShareInput Text) -> Bool

take1_ :: NoShareInput Text -> Maybe (Token (NoShareInput Text), NoShareInput Text)

takeN_ :: Int -> NoShareInput Text -> Maybe (Tokens (NoShareInput Text), NoShareInput Text)

takeWhile_ :: (Token (NoShareInput Text) -> Bool) -> NoShareInput Text -> (Tokens (NoShareInput Text), NoShareInput Text)

Stream (ShareInput Text) 
Instance details

Defined in Text.Megaparsec.Stream

Associated Types

type Token (ShareInput Text) 
Instance details

Defined in Text.Megaparsec.Stream

type Token (ShareInput Text) = Char
type Tokens (ShareInput Text) 
Instance details

Defined in Text.Megaparsec.Stream

type Tokens (ShareInput Text) = Text

Methods

tokenToChunk :: Proxy (ShareInput Text) -> Token (ShareInput Text) -> Tokens (ShareInput Text)

tokensToChunk :: Proxy (ShareInput Text) -> [Token (ShareInput Text)] -> Tokens (ShareInput Text)

chunkToTokens :: Proxy (ShareInput Text) -> Tokens (ShareInput Text) -> [Token (ShareInput Text)]

chunkLength :: Proxy (ShareInput Text) -> Tokens (ShareInput Text) -> Int

chunkEmpty :: Proxy (ShareInput Text) -> Tokens (ShareInput Text) -> Bool

take1_ :: ShareInput Text -> Maybe (Token (ShareInput Text), ShareInput Text)

takeN_ :: Int -> ShareInput Text -> Maybe (Tokens (ShareInput Text), ShareInput Text)

takeWhile_ :: (Token (ShareInput Text) -> Bool) -> ShareInput Text -> (Tokens (ShareInput Text), ShareInput Text)

FromField (CI Text) 
Instance details

Defined in Database.PostgreSQL.Simple.FromField

Methods

fromField :: FieldParser (CI Text)

ToField (CI Text) 
Instance details

Defined in Database.PostgreSQL.Simple.ToField

Methods

toField :: CI Text -> Action

IsString (Text, Bool) Source #

Allows `("my-class", True)` to be written as `"my-class"`

Useful together with classes

Instance details

Defined in IHP.View.Classes

Methods

fromString :: String -> (Text, Bool) #

type ChunkElem Text 
Instance details

Defined in Data.Attoparsec.Internal.Types

type ChunkElem Text = Char
type State Text 
Instance details

Defined in Data.Attoparsec.Internal.Types

type State Text = Buffer
type Item Text 
Instance details

Defined in Data.Text

type Item Text = Char
type Index Text 
Instance details

Defined in Control.Lens.At

type Index Text = Int
type IxValue Text 
Instance details

Defined in Control.Lens.At

type IxValue Text = Char
type Token Text 
Instance details

Defined in Text.Megaparsec.Stream

type Token Text = Token (ShareInput Text)
type Tokens Text 
Instance details

Defined in Text.Megaparsec.Stream

type Tokens Text = Tokens (ShareInput Text)
type Element Text 
Instance details

Defined in Data.MonoTraversable

type Index Text 
Instance details

Defined in Data.Sequences

type Index Text = Int
type OneItem Text 
Instance details

Defined in Relude.Container.One

type OneItem Text = Char
type Token (NoShareInput Text) 
Instance details

Defined in Text.Megaparsec.Stream

type Token (NoShareInput Text) = Char
type Token (ShareInput Text) 
Instance details

Defined in Text.Megaparsec.Stream

type Token (ShareInput Text) = Char
type Tokens (NoShareInput Text) 
Instance details

Defined in Text.Megaparsec.Stream

type Tokens (NoShareInput Text) = Text
type Tokens (ShareInput Text) 
Instance details

Defined in Text.Megaparsec.Stream

type Tokens (ShareInput Text) = Text

data ByteString #

Instances

Instances details
Structured ByteString 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy ByteString -> Structure

structureHash' :: Tagged ByteString MD5

FromJSON ByteString Source # 
Instance details

Defined in IHP.DataSync.DynamicQuery

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

Defined in GHC.Unit.Database

Methods

put :: DbUnitInfo -> Put

get :: Get DbUnitInfo

putList :: [DbUnitInfo] -> Put

Byteable ByteString 
Instance details

Defined in Data.Byteable

FoldCase ByteString 
Instance details

Defined in Data.CaseInsensitive.Internal

Serialize ByteString 
Instance details

Defined in Data.Serialize

Methods

put :: Putter ByteString

get :: Get ByteString

IOData ByteString 
Instance details

Defined in Data.IOData

AttoparsecInput ByteString 
Instance details

Defined in Data.Conduit.Attoparsec

NFData ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

Methods

rnf :: ByteString -> () #

Adler32 ByteString 
Instance details

Defined in Data.Digest.Adler32

CRC32 ByteString 
Instance details

Defined in Data.Digest.CRC32

CRC32C ByteString 
Instance details

Defined in Data.Digest.CRC32C

ToLogStr ByteString 
Instance details

Defined in System.Log.FastLogger.LogStr

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

Accept ByteString 
Instance details

Defined in Network.HTTP.Media.Accept

RenderHeader ByteString 
Instance details

Defined in Network.HTTP.Media.RenderHeader

QueryKeyLike ByteString 
Instance details

Defined in Network.HTTP.Types.QueryLike

QueryValueLike ByteString 
Instance details

Defined in Network.HTTP.Types.QueryLike

ToHtml ByteString 
Instance details

Defined in IHP.HSX.ToHtml

Methods

toHtml :: ByteString -> Html #

Ixed ByteString 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index ByteString -> Traversal' ByteString (IxValue ByteString)

AsEmpty ByteString 
Instance details

Defined in Control.Lens.Empty

Methods

_Empty :: Prism' ByteString ()

Reversing ByteString 
Instance details

Defined in Control.Lens.Internal.Iso

Prefixed ByteString 
Instance details

Defined in Control.Lens.Prism

Suffixed ByteString 
Instance details

Defined in Control.Lens.Prism

IsByteString ByteString 
Instance details

Defined in Data.ByteString.Lens

Methods

packedBytes :: Iso' [Word8] ByteString

packedChars :: Iso' String ByteString

bytes :: IndexedTraversal' Int ByteString Word8

chars :: IndexedTraversal' Int ByteString Char

AsJSON ByteString 
Instance details

Defined in Data.Aeson.Lens

Methods

_JSON :: (FromJSON a, ToJSON b) => Prism ByteString ByteString a b

AsNumber ByteString 
Instance details

Defined in Data.Aeson.Lens

Methods

_Number :: Prism' ByteString Scientific

_Double :: Prism' ByteString Double

_Integer :: Prism' ByteString Integer

AsValue ByteString 
Instance details

Defined in Data.Aeson.Lens

Methods

_Value :: Prism' ByteString Value

_String :: Prism' ByteString Text

_Bool :: Prism' ByteString Bool

_Null :: Prism' ByteString ()

_Object :: Prism' ByteString (KeyMap Value)

_Array :: Prism' ByteString (Vector Value)

IsKey ByteString 
Instance details

Defined in Data.Aeson.Lens

Methods

_Key :: Iso' ByteString Key

ParamReader ByteString Source # 
Instance details

Defined in IHP.Controller.Param

EnvVarReader ByteString Source # 
Instance details

Defined in IHP.EnvVar

BinaryChunk ByteString 
Instance details

Defined in Text.Megaparsec.Byte.Binary

Methods

convertChunkBE :: (Bits a, Num a) => ByteString -> a

convertChunkLE :: (Bits a, Num a) => ByteString -> a

Stream ByteString 
Instance details

Defined in Text.Megaparsec.Stream

Associated Types

type Token ByteString 
Instance details

Defined in Text.Megaparsec.Stream

type Token ByteString = Token (ShareInput ByteString)
type Tokens ByteString 
Instance details

Defined in Text.Megaparsec.Stream

type Tokens ByteString = Tokens (ShareInput ByteString)
TraversableStream ByteString 
Instance details

Defined in Text.Megaparsec.Stream

Methods

reachOffset :: Int -> PosState ByteString -> (Maybe String, PosState ByteString)

reachOffsetNoLine :: Int -> PosState ByteString -> PosState ByteString

VisualStream ByteString 
Instance details

Defined in Text.Megaparsec.Stream

Methods

showTokens :: Proxy ByteString -> NonEmpty (Token ByteString) -> String

tokensLength :: Proxy ByteString -> NonEmpty (Token ByteString) -> Int

MonoZip ByteString 
Instance details

Defined in Data.Containers

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

MonoPointed ByteString 
Instance details

Defined in Data.MonoTraversable

MonoTraversable ByteString 
Instance details

Defined in Data.MonoTraversable

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

FromField ByteString 
Instance details

Defined in Database.PostgreSQL.Simple.FromField

Methods

fromField :: FieldParser ByteString

ToField ByteString 
Instance details

Defined in Database.PostgreSQL.Simple.ToField

Methods

toField :: ByteString -> Action

Extract ByteString 
Instance details

Defined in Text.Regex.Base.RegexLike

Uncons ByteString 
Instance details

Defined in Text.Regex.TDFA.NewDFA.Uncons

One ByteString 
Instance details

Defined in Relude.Container.One

Associated Types

type OneItem ByteString 
Instance details

Defined in Relude.Container.One

type OneItem ByteString = Word8

Methods

one :: OneItem ByteString -> ByteString

EncodingError ToLText "ByteString" "LText" => ToLText ByteString 
Instance details

Defined in Relude.String.Conversion

Methods

toLText :: ByteString -> LText

EncodingError ToString "ByteString" "String" => ToString ByteString 
Instance details

Defined in Relude.String.Conversion

EncodingError ToText "ByteString" "Text" => ToText ByteString 
Instance details

Defined in Relude.String.Conversion

Methods

toText :: ByteString -> Text

Lexicographic ByteString 
Instance details

Defined in Data.Vector.Algorithms.AmericanFlag

IsByteString ByteString 
Instance details

Defined in Network.Wai.Util

Methods

bytestringToBuilder :: ByteString -> Builder

WebSocketsData ByteString 
Instance details

Defined in Network.WebSockets.Types

Methods

fromDataMessage :: DataMessage -> ByteString

fromLazyByteString :: ByteString -> ByteString

toLazyByteString :: ByteString -> ByteString

ToBuilder ByteString Builder 
Instance details

Defined in Data.Builder

Methods

toBuilder :: ByteString -> Builder #

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

ConvertUtf8 LText ByteString 
Instance details

Defined in Relude.String.Conversion

Methods

encodeUtf8 :: LText -> ByteString

decodeUtf8 :: ByteString -> LText

decodeUtf8Strict :: ByteString -> Either UnicodeException LText

ConvertUtf8 Text ByteString 
Instance details

Defined in Relude.String.Conversion

ConvertUtf8 String ByteString 
Instance details

Defined in Relude.String.Conversion

LazyStrict LByteString ByteString 
Instance details

Defined in Relude.String.Conversion

Methods

toLazy :: ByteString -> LByteString

toStrict :: LByteString -> ByteString

Strict ByteString ByteString 
Instance details

Defined in Data.Strict.Classes

Methods

toStrict :: ByteString -> ByteString

toLazy :: ByteString -> ByteString

ConvertibleStrings ByteString Key Source # 
Instance details

Defined in IHP.HaskellSupport

ConvertibleStrings LazyByteString StrictByteString 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: LazyByteString -> StrictByteString #

ConvertibleStrings LazyText StrictByteString 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: LazyText -> StrictByteString #

ConvertibleStrings StrictByteString LazyByteString 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: StrictByteString -> LazyByteString #

ConvertibleStrings StrictByteString LazyText 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: StrictByteString -> LazyText #

ConvertibleStrings StrictByteString StrictByteString 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: StrictByteString -> StrictByteString #

ConvertibleStrings StrictByteString StrictText 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: StrictByteString -> StrictText #

ConvertibleStrings StrictByteString String 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: StrictByteString -> String #

ConvertibleStrings StrictText StrictByteString 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: StrictText -> StrictByteString #

ConvertibleStrings String StrictByteString 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: String -> StrictByteString #

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

UTF8Bytes ByteString Int 
Instance details

Defined in Codec.Binary.UTF8.Generic

SetField "selectFrom" SQLQuery ByteString Source # 
Instance details

Defined in IHP.QueryBuilder

Monad m => Stream ByteString m Char 
Instance details

Defined in Text.Parsec.Prim

Methods

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

Cons ByteString ByteString Word8 Word8 
Instance details

Defined in Control.Lens.Cons

Snoc ByteString ByteString Word8 Word8 
Instance details

Defined in Control.Lens.Cons

(a ~ Word8, b ~ Word8) => Each ByteString ByteString a b 
Instance details

Defined in Control.Lens.Each

Methods

each :: Traversal ByteString ByteString a b

SetField "distinctClause" SQLQuery (Maybe ByteString) Source # 
Instance details

Defined in IHP.QueryBuilder

SetField "distinctOnClause" SQLQuery (Maybe ByteString) Source # 
Instance details

Defined in IHP.QueryBuilder

SetField "limitClause" SQLQuery (Maybe ByteString) Source # 
Instance details

Defined in IHP.QueryBuilder

SetField "offsetClause" SQLQuery (Maybe ByteString) Source # 
Instance details

Defined in IHP.QueryBuilder

SetField "queryIndex" SQLQuery (Maybe ByteString) Source # 
Instance details

Defined in IHP.QueryBuilder

Default (Binary ByteString) Source # 
Instance details

Defined in IHP.ModelSupport

Methods

def :: Binary ByteString #

Stream (NoShareInput ByteString) 
Instance details

Defined in Text.Megaparsec.Stream

Associated Types

type Token (NoShareInput ByteString) 
Instance details

Defined in Text.Megaparsec.Stream

type Token (NoShareInput ByteString) = Word8
type Tokens (NoShareInput ByteString) 
Instance details

Defined in Text.Megaparsec.Stream

type Tokens (NoShareInput ByteString) = ByteString

Methods

tokenToChunk :: Proxy (NoShareInput ByteString) -> Token (NoShareInput ByteString) -> Tokens (NoShareInput ByteString)

tokensToChunk :: Proxy (NoShareInput ByteString) -> [Token (NoShareInput ByteString)] -> Tokens (NoShareInput ByteString)

chunkToTokens :: Proxy (NoShareInput ByteString) -> Tokens (NoShareInput ByteString) -> [Token (NoShareInput ByteString)]

chunkLength :: Proxy (NoShareInput ByteString) -> Tokens (NoShareInput ByteString) -> Int

chunkEmpty :: Proxy (NoShareInput ByteString) -> Tokens (NoShareInput ByteString) -> Bool

take1_ :: NoShareInput ByteString -> Maybe (Token (NoShareInput ByteString), NoShareInput ByteString)

takeN_ :: Int -> NoShareInput ByteString -> Maybe (Tokens (NoShareInput ByteString), NoShareInput ByteString)

takeWhile_ :: (Token (NoShareInput ByteString) -> Bool) -> NoShareInput ByteString -> (Tokens (NoShareInput ByteString), NoShareInput ByteString)

Stream (ShareInput ByteString) 
Instance details

Defined in Text.Megaparsec.Stream

Associated Types

type Token (ShareInput ByteString) 
Instance details

Defined in Text.Megaparsec.Stream

type Token (ShareInput ByteString) = Word8
type Tokens (ShareInput ByteString) 
Instance details

Defined in Text.Megaparsec.Stream

type Tokens (ShareInput ByteString) = ByteString

Methods

tokenToChunk :: Proxy (ShareInput ByteString) -> Token (ShareInput ByteString) -> Tokens (ShareInput ByteString)

tokensToChunk :: Proxy (ShareInput ByteString) -> [Token (ShareInput ByteString)] -> Tokens (ShareInput ByteString)

chunkToTokens :: Proxy (ShareInput ByteString) -> Tokens (ShareInput ByteString) -> [Token (ShareInput ByteString)]

chunkLength :: Proxy (ShareInput ByteString) -> Tokens (ShareInput ByteString) -> Int

chunkEmpty :: Proxy (ShareInput ByteString) -> Tokens (ShareInput ByteString) -> Bool

take1_ :: ShareInput ByteString -> Maybe (Token (ShareInput ByteString), ShareInput ByteString)

takeN_ :: Int -> ShareInput ByteString -> Maybe (Tokens (ShareInput ByteString), ShareInput ByteString)

takeWhile_ :: (Token (ShareInput ByteString) -> Bool) -> ShareInput ByteString -> (Tokens (ShareInput ByteString), ShareInput ByteString)

FromField (Binary ByteString) 
Instance details

Defined in Database.PostgreSQL.Simple.FromField

Methods

fromField :: FieldParser (Binary ByteString)

ToField (Binary ByteString) 
Instance details

Defined in Database.PostgreSQL.Simple.ToField

Methods

toField :: Binary ByteString -> Action

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

Defined in Control.Lens.At

type Index ByteString = Int
type IxValue ByteString 
Instance details

Defined in Control.Lens.At

type IxValue ByteString = Word8
type Token ByteString 
Instance details

Defined in Text.Megaparsec.Stream

type Token ByteString = Token (ShareInput ByteString)
type Tokens ByteString 
Instance details

Defined in Text.Megaparsec.Stream

type Tokens ByteString = Tokens (ShareInput ByteString)
type Element ByteString 
Instance details

Defined in Data.MonoTraversable

type Index ByteString 
Instance details

Defined in Data.Sequences

type OneItem ByteString 
Instance details

Defined in Relude.Container.One

type OneItem ByteString = Word8
type Token (NoShareInput ByteString) 
Instance details

Defined in Text.Megaparsec.Stream

type Token (NoShareInput ByteString) = Word8
type Token (ShareInput ByteString) 
Instance details

Defined in Text.Megaparsec.Stream

type Token (ShareInput ByteString) = Word8
type Tokens (NoShareInput ByteString) 
Instance details

Defined in Text.Megaparsec.Stream

type Tokens (NoShareInput ByteString) = ByteString
type Tokens (ShareInput ByteString) 
Instance details

Defined in Text.Megaparsec.Stream

type Tokens (ShareInput ByteString) = ByteString

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

Defined in Web.Authenticate.OAuth

Methods

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

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

toConstr :: Credential -> Constr #

dataTypeOf :: Credential -> DataType #

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

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

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

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

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

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

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

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

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

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

Data OAuth 
Instance details

Defined in Web.Authenticate.OAuth

Methods

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

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

toConstr :: OAuth -> Constr #

dataTypeOf :: OAuth -> DataType #

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

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

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

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

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

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

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

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

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

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

Data OAuthException 
Instance details

Defined in Web.Authenticate.OAuth

Methods

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

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

toConstr :: OAuthException -> Constr #

dataTypeOf :: OAuthException -> DataType #

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

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

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

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

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

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

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

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

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

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

Data OAuthVersion 
Instance details

Defined in Web.Authenticate.OAuth

Methods

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

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

toConstr :: OAuthVersion -> Constr #

dataTypeOf :: OAuthVersion -> DataType #

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

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

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

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

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

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

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

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

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

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

Data SignMethod 
Instance details

Defined in Web.Authenticate.OAuth

Methods

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

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

toConstr :: SignMethod -> Constr #

dataTypeOf :: SignMethod -> DataType #

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

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

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

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

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

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

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

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

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

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

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

Defined in Crypto.Classes.Exceptions

Methods

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

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

toConstr :: CipherError -> Constr #

dataTypeOf :: CipherError -> DataType #

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

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

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

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

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

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

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

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

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

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

Data GenError 
Instance details

Defined in Crypto.Random

Methods

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

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

toConstr :: GenError -> Constr #

dataTypeOf :: GenError -> DataType #

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

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

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

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

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

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

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

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

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

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

Data ReseedInfo 
Instance details

Defined in Crypto.Random

Methods

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

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

toConstr :: ReseedInfo -> Constr #

dataTypeOf :: ReseedInfo -> DataType #

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

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

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

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

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

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

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

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

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

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

Data BlockCipherError 
Instance details

Defined in Crypto.Types

Methods

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

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

toConstr :: BlockCipherError -> Constr #

dataTypeOf :: BlockCipherError -> DataType #

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

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

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

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

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

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

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

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

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

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

Data Params 
Instance details

Defined in Crypto.Types.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.Types.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.Types.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.Types.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.Types.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.Types.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 Curve 
Instance details

Defined in Crypto.Types.PubKey.ECC

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.Types.PubKey.ECC

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.Types.PubKey.ECC

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.Types.PubKey.ECC

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.Types.PubKey.ECC

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.Types.PubKey.ECC

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.Types.PubKey.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.Types.PubKey.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.Types.PubKey.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.Types.PubKey.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 KeyPair 
Instance details

Defined in Crypto.Types.PubKey.RSA

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.Types.PubKey.RSA

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.Types.PubKey.RSA

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

Defined in GHC.Core

Methods

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

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

toConstr :: AltCon -> Constr #

dataTypeOf :: AltCon -> DataType #

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

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

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

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

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

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

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

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

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

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

Data IsOrphan 
Instance details

Defined in GHC.Core

Methods

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

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

toConstr :: IsOrphan -> Constr #

dataTypeOf :: IsOrphan -> DataType #

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

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

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

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

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

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

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

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

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

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

Data Class 
Instance details

Defined in GHC.Core.Class

Methods

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

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

toConstr :: Class -> Constr #

dataTypeOf :: Class -> DataType #

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

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

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

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

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

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

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

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

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

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

Data CoAxBranch 
Instance details

Defined in GHC.Core.Coercion.Axiom

Methods

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

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

toConstr :: CoAxBranch -> Constr #

dataTypeOf :: CoAxBranch -> DataType #

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

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

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

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

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

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

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

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

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

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

Data CoAxiomRule 
Instance details

Defined in GHC.Core.Coercion.Axiom

Methods

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

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

toConstr :: CoAxiomRule -> Constr #

dataTypeOf :: CoAxiomRule -> DataType #

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

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

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

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

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

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

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

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

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

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

Data ConLike 
Instance details

Defined in GHC.Core.ConLike

Methods

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

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

toConstr :: ConLike -> Constr #

dataTypeOf :: ConLike -> DataType #

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

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

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

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

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

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

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

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

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

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

Data DataCon 
Instance details

Defined in GHC.Core.DataCon

Methods

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

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

toConstr :: DataCon -> Constr #

dataTypeOf :: DataCon -> DataType #

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

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

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

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

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

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

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

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

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

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

Data HsImplBang 
Instance details

Defined in GHC.Core.DataCon

Methods

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

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

toConstr :: HsImplBang -> Constr #

dataTypeOf :: HsImplBang -> DataType #

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

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

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

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

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

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

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

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

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

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

Data HsSrcBang 
Instance details

Defined in GHC.Core.DataCon

Methods

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

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

toConstr :: HsSrcBang -> Constr #

dataTypeOf :: HsSrcBang -> DataType #

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

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

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

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

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

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

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

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

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

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

Data ClsInst 
Instance details

Defined in GHC.Core.InstEnv

Methods

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

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

toConstr :: ClsInst -> Constr #

dataTypeOf :: ClsInst -> DataType #

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

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

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

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

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

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

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

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

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

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

Data CoSel 
Instance details

Defined in GHC.Core.TyCo.Rep

Methods

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

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

toConstr :: CoSel -> Constr #

dataTypeOf :: CoSel -> DataType #

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

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

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

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

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

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

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

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

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

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

Data Coercion 
Instance details

Defined in GHC.Core.TyCo.Rep

Methods

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

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

toConstr :: Coercion -> Constr #

dataTypeOf :: Coercion -> DataType #

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

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

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

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

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

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

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

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

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

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

Data CoercionHole 
Instance details

Defined in GHC.Core.TyCo.Rep

Methods

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

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

toConstr :: CoercionHole -> Constr #

dataTypeOf :: CoercionHole -> DataType #

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

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

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

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

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

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

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

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

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

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

Data FunSel 
Instance details

Defined in GHC.Core.TyCo.Rep

Methods

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

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

toConstr :: FunSel -> Constr #

dataTypeOf :: FunSel -> DataType #

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

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

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

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

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

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

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

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

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

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

Data MCoercion 
Instance details

Defined in GHC.Core.TyCo.Rep

Methods

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

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

toConstr :: MCoercion -> Constr #

dataTypeOf :: MCoercion -> DataType #

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

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

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

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

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

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

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

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

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

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

Data TyLit 
Instance details

Defined in GHC.Core.TyCo.Rep

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

Defined in GHC.Core.TyCo.Rep

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

Defined in GHC.Core.TyCo.Rep

Methods

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

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

toConstr :: UnivCoProvenance -> Constr #

dataTypeOf :: UnivCoProvenance -> DataType #

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

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

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

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

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

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

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

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

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

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

Data PrimElemRep 
Instance details

Defined in GHC.Core.TyCon

Methods

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

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

toConstr :: PrimElemRep -> Constr #

dataTypeOf :: PrimElemRep -> DataType #

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

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

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

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

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

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

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

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

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

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

Data PrimRep 
Instance details

Defined in GHC.Core.TyCon

Methods

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

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

toConstr :: PrimRep -> Constr #

dataTypeOf :: PrimRep -> DataType #

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

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

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

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

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

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

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

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

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

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

Data TyCon 
Instance details

Defined in GHC.Core.TyCon

Methods

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

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

toConstr :: TyCon -> Constr #

dataTypeOf :: TyCon -> DataType #

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

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

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

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

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

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

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

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

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

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

Data FastString 
Instance details

Defined in GHC.Data.FastString

Methods

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

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

toConstr :: FastString -> Constr #

dataTypeOf :: FastString -> DataType #

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

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

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

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

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

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

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

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

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

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

Data LexicalFastString 
Instance details

Defined in GHC.Data.FastString

Methods

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

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

toConstr :: LexicalFastString -> Constr #

dataTypeOf :: LexicalFastString -> DataType #

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

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

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

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

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

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

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

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

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

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

Data NonDetFastString 
Instance details

Defined in GHC.Data.FastString

Methods

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

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

toConstr :: NonDetFastString -> Constr #

dataTypeOf :: NonDetFastString -> DataType #

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

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

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

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

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

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

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

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

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

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

Data AnnsModule 
Instance details

Defined in GHC.Hs

Methods

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

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

toConstr :: AnnsModule -> Constr #

dataTypeOf :: AnnsModule -> DataType #

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

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

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

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

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

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

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

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

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

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

Data XModulePs 
Instance details

Defined in GHC.Hs

Methods

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

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

toConstr :: XModulePs -> Constr #

dataTypeOf :: XModulePs -> DataType #

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

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

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

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

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

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

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

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

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

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

Data AnnSig 
Instance details

Defined in GHC.Hs.Binds

Methods

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

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

toConstr :: AnnSig -> Constr #

dataTypeOf :: AnnSig -> DataType #

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

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

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

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

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

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

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

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

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

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

Data IdSig 
Instance details

Defined in GHC.Hs.Binds

Methods

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

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

toConstr :: IdSig -> Constr #

dataTypeOf :: IdSig -> DataType #

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

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

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

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

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

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

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

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

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

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

Data TcSpecPrag 
Instance details

Defined in GHC.Hs.Binds

Methods

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

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

toConstr :: TcSpecPrag -> Constr #

dataTypeOf :: TcSpecPrag -> DataType #

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

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

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

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

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

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

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

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

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

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

Data TcSpecPrags 
Instance details

Defined in GHC.Hs.Binds

Methods

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

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

toConstr :: TcSpecPrags -> Constr #

dataTypeOf :: TcSpecPrags -> DataType #

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

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

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

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

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

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

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

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

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

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

Data DataDeclRn 
Instance details

Defined in GHC.Hs.Decls

Methods

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

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

toConstr :: DataDeclRn -> Constr #

dataTypeOf :: DataDeclRn -> DataType #

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

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

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

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

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

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

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

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

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

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

Data HsRuleAnn 
Instance details

Defined in GHC.Hs.Decls

Methods

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

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

toConstr :: HsRuleAnn -> Constr #

dataTypeOf :: HsRuleAnn -> DataType #

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

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

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

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

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

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

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

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

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

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

Data HsRuleRn 
Instance details

Defined in GHC.Hs.Decls

Methods

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

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

toConstr :: HsRuleRn -> Constr #

dataTypeOf :: HsRuleRn -> DataType #

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

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

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

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

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

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

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

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

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

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

Data AnnExplicitSum 
Instance details

Defined in GHC.Hs.Expr

Methods

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

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

toConstr :: AnnExplicitSum -> Constr #

dataTypeOf :: AnnExplicitSum -> DataType #

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

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

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

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

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

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

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

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

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

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

Data AnnFieldLabel 
Instance details

Defined in GHC.Hs.Expr

Methods

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

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

toConstr :: AnnFieldLabel -> Constr #

dataTypeOf :: AnnFieldLabel -> DataType #

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

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

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

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

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

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

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

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

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

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

Data AnnProjection 
Instance details

Defined in GHC.Hs.Expr

Methods

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

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

toConstr :: AnnProjection -> Constr #

dataTypeOf :: AnnProjection -> DataType #

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

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

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

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

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

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

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

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

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

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

Data AnnsIf 
Instance details

Defined in GHC.Hs.Expr

Methods

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

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

toConstr :: AnnsIf -> Constr #

dataTypeOf :: AnnsIf -> DataType #

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

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

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

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

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

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

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

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

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

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

Data DelayedSplice 
Instance details

Defined in GHC.Hs.Expr

Methods

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

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

toConstr :: DelayedSplice -> Constr #

dataTypeOf :: DelayedSplice -> DataType #

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

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

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

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

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

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

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

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

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

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

Data EpAnnHsCase 
Instance details

Defined in GHC.Hs.Expr

Methods

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

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

toConstr :: EpAnnHsCase -> Constr #

dataTypeOf :: EpAnnHsCase -> DataType #

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

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

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

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

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

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

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

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

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

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

Data EpAnnUnboundVar 
Instance details

Defined in GHC.Hs.Expr

Methods

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

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

toConstr :: EpAnnUnboundVar -> Constr #

dataTypeOf :: EpAnnUnboundVar -> DataType #

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

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

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

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

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

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

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

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

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

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

Data GrhsAnn 
Instance details

Defined in GHC.Hs.Expr

Methods

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

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

toConstr :: GrhsAnn -> Constr #

dataTypeOf :: GrhsAnn -> DataType #

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

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

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

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

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

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

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

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

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

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

Data MatchGroupTc 
Instance details

Defined in GHC.Hs.Expr

Methods

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

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

toConstr :: MatchGroupTc -> Constr #

dataTypeOf :: MatchGroupTc -> DataType #

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

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

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

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

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

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

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

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

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

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

Data ThModFinalizers 
Instance details

Defined in GHC.Hs.Expr

Methods

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

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

toConstr :: ThModFinalizers -> Constr #

dataTypeOf :: ThModFinalizers -> DataType #

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

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

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

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

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

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

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

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

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

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

Data UntypedSpliceFlavour 
Instance details

Defined in GHC.Hs.Expr

Methods

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

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

toConstr :: UntypedSpliceFlavour -> Constr #

dataTypeOf :: UntypedSpliceFlavour -> DataType #

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

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

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

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

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

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

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

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

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

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

Data Pass 
Instance details

Defined in GHC.Hs.Extension

Methods

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

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

toConstr :: Pass -> Constr #

dataTypeOf :: Pass -> DataType #

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

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

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

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

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

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

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

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

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

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

Data EpAnnImportDecl 
Instance details

Defined in GHC.Hs.ImpExp

Methods

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

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

toConstr :: EpAnnImportDecl -> Constr #

dataTypeOf :: EpAnnImportDecl -> DataType #

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

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

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

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

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

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

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

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

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

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

Data XImportDeclPass 
Instance details

Defined in GHC.Hs.ImpExp

Methods

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

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

toConstr :: XImportDeclPass -> Constr #

dataTypeOf :: XImportDeclPass -> DataType #

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

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

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

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

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

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

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

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

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

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

Data EpAnnSumPat 
Instance details

Defined in GHC.Hs.Pat

Methods

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

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

toConstr :: EpAnnSumPat -> Constr #

dataTypeOf :: EpAnnSumPat -> DataType #

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

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

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

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

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

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

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

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

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

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

Data HsPSRn 
Instance details

Defined in GHC.Hs.Type

Methods

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

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

toConstr :: HsPSRn -> Constr #

dataTypeOf :: HsPSRn -> DataType #

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

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

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

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

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

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

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

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

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

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

Data AOp 
Instance details

Defined in GHC.JS.Syntax

Methods

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

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

toConstr :: AOp -> Constr #

dataTypeOf :: AOp -> DataType #

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

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

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

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

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

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

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

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

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

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

Data Op 
Instance details

Defined in GHC.JS.Syntax

Methods

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

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

toConstr :: Op -> Constr #

dataTypeOf :: Op -> DataType #

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

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

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

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

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

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

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

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

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

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

Data UOp 
Instance details

Defined in GHC.JS.Syntax

Methods

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

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

toConstr :: UOp -> Constr #

dataTypeOf :: UOp -> DataType #

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

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

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

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

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

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

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

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

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

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

Data JOp 
Instance details

Defined in GHC.JS.Unsat.Syntax

Methods

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

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

toConstr :: JOp -> Constr #

dataTypeOf :: JOp -> DataType #

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

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

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

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

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

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

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

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

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

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

Data JUOp 
Instance details

Defined in GHC.JS.Unsat.Syntax

Methods

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

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

toConstr :: JUOp -> Constr #

dataTypeOf :: JUOp -> DataType #

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

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

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

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

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

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

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

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

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

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

Data AddEpAnn 
Instance details

Defined in GHC.Parser.Annotation

Methods

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

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

toConstr :: AddEpAnn -> Constr #

dataTypeOf :: AddEpAnn -> DataType #

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

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

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

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

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

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

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

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

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

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

Data Anchor 
Instance details

Defined in GHC.Parser.Annotation

Methods

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

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

toConstr :: Anchor -> Constr #

dataTypeOf :: Anchor -> DataType #

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

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

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

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

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

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

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

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

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

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

Data AnchorOperation 
Instance details

Defined in GHC.Parser.Annotation

Methods

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

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

toConstr :: AnchorOperation -> Constr #

dataTypeOf :: AnchorOperation -> DataType #

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

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

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

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

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

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

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

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

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

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

Data AnnContext 
Instance details

Defined in GHC.Parser.Annotation

Methods

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

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

toConstr :: AnnContext -> Constr #

dataTypeOf :: AnnContext -> DataType #

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

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

gmapT :: (forall b. Data b => b -> b) -> AnnContext -> AnnContext #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AnnContext -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AnnContext -> r #

gmapQ :: (forall d. Data d => d -> u) -> AnnContext -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AnnContext -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AnnContext -> m AnnContext #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnContext -> m AnnContext #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnContext -> m AnnContext #

Data AnnKeywordId 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AnnKeywordId -> c AnnKeywordId #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AnnKeywordId #

toConstr :: AnnKeywordId -> Constr #

dataTypeOf :: AnnKeywordId -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AnnKeywordId) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AnnKeywordId) #

gmapT :: (forall b. Data b => b -> b) -> AnnKeywordId -> AnnKeywordId #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AnnKeywordId -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AnnKeywordId -> r #

gmapQ :: (forall d. Data d => d -> u) -> AnnKeywordId -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AnnKeywordId -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AnnKeywordId -> m AnnKeywordId #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnKeywordId -> m AnnKeywordId #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnKeywordId -> m AnnKeywordId #

Data AnnList 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AnnList -> c AnnList #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AnnList #

toConstr :: AnnList -> Constr #

dataTypeOf :: AnnList -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AnnList) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AnnList) #

gmapT :: (forall b. Data b => b -> b) -> AnnList -> AnnList #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AnnList -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AnnList -> r #

gmapQ :: (forall d. Data d => d -> u) -> AnnList -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AnnList -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AnnList -> m AnnList #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnList -> m AnnList #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnList -> m AnnList #

Data AnnListItem 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AnnListItem -> c AnnListItem #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AnnListItem #

toConstr :: AnnListItem -> Constr #

dataTypeOf :: AnnListItem -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AnnListItem) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AnnListItem) #

gmapT :: (forall b. Data b => b -> b) -> AnnListItem -> AnnListItem #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AnnListItem -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AnnListItem -> r #

gmapQ :: (forall d. Data d => d -> u) -> AnnListItem -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AnnListItem -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AnnListItem -> m AnnListItem #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnListItem -> m AnnListItem #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnListItem -> m AnnListItem #

Data AnnParen 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AnnParen -> c AnnParen #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AnnParen #

toConstr :: AnnParen -> Constr #

dataTypeOf :: AnnParen -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AnnParen) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AnnParen) #

gmapT :: (forall b. Data b => b -> b) -> AnnParen -> AnnParen #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AnnParen -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AnnParen -> r #

gmapQ :: (forall d. Data d => d -> u) -> AnnParen -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AnnParen -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AnnParen -> m AnnParen #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnParen -> m AnnParen #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnParen -> m AnnParen #

Data AnnPragma 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AnnPragma -> c AnnPragma #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AnnPragma #

toConstr :: AnnPragma -> Constr #

dataTypeOf :: AnnPragma -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AnnPragma) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AnnPragma) #

gmapT :: (forall b. Data b => b -> b) -> AnnPragma -> AnnPragma #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AnnPragma -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AnnPragma -> r #

gmapQ :: (forall d. Data d => d -> u) -> AnnPragma -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AnnPragma -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AnnPragma -> m AnnPragma #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnPragma -> m AnnPragma #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnPragma -> m AnnPragma #

Data AnnSortKey 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AnnSortKey -> c AnnSortKey #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AnnSortKey #

toConstr :: AnnSortKey -> Constr #

dataTypeOf :: AnnSortKey -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AnnSortKey) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AnnSortKey) #

gmapT :: (forall b. Data b => b -> b) -> AnnSortKey -> AnnSortKey #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AnnSortKey -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AnnSortKey -> r #

gmapQ :: (forall d. Data d => d -> u) -> AnnSortKey -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AnnSortKey -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AnnSortKey -> m AnnSortKey #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnSortKey -> m AnnSortKey #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnSortKey -> m AnnSortKey #

Data DeltaPos 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DeltaPos -> c DeltaPos #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DeltaPos #

toConstr :: DeltaPos -> Constr #

dataTypeOf :: DeltaPos -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DeltaPos) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DeltaPos) #

gmapT :: (forall b. Data b => b -> b) -> DeltaPos -> DeltaPos #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DeltaPos -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DeltaPos -> r #

gmapQ :: (forall d. Data d => d -> u) -> DeltaPos -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DeltaPos -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DeltaPos -> m DeltaPos #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DeltaPos -> m DeltaPos #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DeltaPos -> m DeltaPos #

Data EpAnnComments 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> EpAnnComments -> c EpAnnComments #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c EpAnnComments #

toConstr :: EpAnnComments -> Constr #

dataTypeOf :: EpAnnComments -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c EpAnnComments) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c EpAnnComments) #

gmapT :: (forall b. Data b => b -> b) -> EpAnnComments -> EpAnnComments #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> EpAnnComments -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> EpAnnComments -> r #

gmapQ :: (forall d. Data d => d -> u) -> EpAnnComments -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> EpAnnComments -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> EpAnnComments -> m EpAnnComments #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> EpAnnComments -> m EpAnnComments #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> EpAnnComments -> m EpAnnComments #

Data EpaComment 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> EpaComment -> c EpaComment #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c EpaComment #

toConstr :: EpaComment -> Constr #

dataTypeOf :: EpaComment -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c EpaComment) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c EpaComment) #

gmapT :: (forall b. Data b => b -> b) -> EpaComment -> EpaComment #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> EpaComment -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> EpaComment -> r #

gmapQ :: (forall d. Data d => d -> u) -> EpaComment -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> EpaComment -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> EpaComment -> m EpaComment #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> EpaComment -> m EpaComment #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> EpaComment -> m EpaComment #

Data EpaCommentTok 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> EpaCommentTok -> c EpaCommentTok #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c EpaCommentTok #

toConstr :: EpaCommentTok -> Constr #

dataTypeOf :: EpaCommentTok -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c EpaCommentTok) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c EpaCommentTok) #

gmapT :: (forall b. Data b => b -> b) -> EpaCommentTok -> EpaCommentTok #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> EpaCommentTok -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> EpaCommentTok -> r #

gmapQ :: (forall d. Data d => d -> u) -> EpaCommentTok -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> EpaCommentTok -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> EpaCommentTok -> m EpaCommentTok #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> EpaCommentTok -> m EpaCommentTok #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> EpaCommentTok -> m EpaCommentTok #

Data EpaLocation 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> EpaLocation -> c EpaLocation #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c EpaLocation #

toConstr :: EpaLocation -> Constr #

dataTypeOf :: EpaLocation -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c EpaLocation) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c EpaLocation) #

gmapT :: (forall b. Data b => b -> b) -> EpaLocation -> EpaLocation #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> EpaLocation -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> EpaLocation -> r #

gmapQ :: (forall d. Data d => d -> u) -> EpaLocation -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> EpaLocation -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> EpaLocation -> m EpaLocation #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> EpaLocation -> m EpaLocation #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> EpaLocation -> m EpaLocation #

Data HasE 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> HasE -> c HasE #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c HasE #

toConstr :: HasE -> Constr #

dataTypeOf :: HasE -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c HasE) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c HasE) #

gmapT :: (forall b. Data b => b -> b) -> HasE -> HasE #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HasE -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HasE -> r #

gmapQ :: (forall d. Data d => d -> u) -> HasE -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> HasE -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> HasE -> m HasE #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HasE -> m HasE #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HasE -> m HasE #

Data IsUnicodeSyntax 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IsUnicodeSyntax -> c IsUnicodeSyntax #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IsUnicodeSyntax #

toConstr :: IsUnicodeSyntax -> Constr #

dataTypeOf :: IsUnicodeSyntax -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IsUnicodeSyntax) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IsUnicodeSyntax) #

gmapT :: (forall b. Data b => b -> b) -> IsUnicodeSyntax -> IsUnicodeSyntax #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IsUnicodeSyntax -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IsUnicodeSyntax -> r #

gmapQ :: (forall d. Data d => d -> u) -> IsUnicodeSyntax -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IsUnicodeSyntax -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IsUnicodeSyntax -> m IsUnicodeSyntax #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IsUnicodeSyntax -> m IsUnicodeSyntax #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IsUnicodeSyntax -> m IsUnicodeSyntax #

Data NameAdornment 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NameAdornment -> c NameAdornment #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NameAdornment #

toConstr :: NameAdornment -> Constr #

dataTypeOf :: NameAdornment -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NameAdornment) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NameAdornment) #

gmapT :: (forall b. Data b => b -> b) -> NameAdornment -> NameAdornment #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NameAdornment -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NameAdornment -> r #

gmapQ :: (forall d. Data d => d -> u) -> NameAdornment -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> NameAdornment -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NameAdornment -> m NameAdornment #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NameAdornment -> m NameAdornment #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NameAdornment -> m NameAdornment #

Data NameAnn 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NameAnn -> c NameAnn #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NameAnn #

toConstr :: NameAnn -> Constr #

dataTypeOf :: NameAnn -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NameAnn) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NameAnn) #

gmapT :: (forall b. Data b => b -> b) -> NameAnn -> NameAnn #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NameAnn -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NameAnn -> r #

gmapQ :: (forall d. Data d => d -> u) -> NameAnn -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> NameAnn -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NameAnn -> m NameAnn #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NameAnn -> m NameAnn #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NameAnn -> m NameAnn #

Data NoEpAnns 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NoEpAnns -> c NoEpAnns #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NoEpAnns #

toConstr :: NoEpAnns -> Constr #

dataTypeOf :: NoEpAnns -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NoEpAnns) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NoEpAnns) #

gmapT :: (forall b. Data b => b -> b) -> NoEpAnns -> NoEpAnns #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NoEpAnns -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NoEpAnns -> r #

gmapQ :: (forall d. Data d => d -> u) -> NoEpAnns -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> NoEpAnns -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NoEpAnns -> m NoEpAnns #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NoEpAnns -> m NoEpAnns #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NoEpAnns -> m NoEpAnns #

Data ParenType 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ParenType -> c ParenType #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ParenType #

toConstr :: ParenType -> Constr #

dataTypeOf :: ParenType -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ParenType) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ParenType) #

gmapT :: (forall b. Data b => b -> b) -> ParenType -> ParenType #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ParenType -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ParenType -> r #

gmapQ :: (forall d. Data d => d -> u) -> ParenType -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ParenType -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ParenType -> m ParenType #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ParenType -> m ParenType #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ParenType -> m ParenType #

Data TokenLocation 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TokenLocation -> c TokenLocation #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TokenLocation #

toConstr :: TokenLocation -> Constr #

dataTypeOf :: TokenLocation -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TokenLocation) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TokenLocation) #

gmapT :: (forall b. Data b => b -> b) -> TokenLocation -> TokenLocation #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TokenLocation -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TokenLocation -> r #

gmapQ :: (forall d. Data d => d -> u) -> TokenLocation -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TokenLocation -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TokenLocation -> m TokenLocation #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TokenLocation -> m TokenLocation #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TokenLocation -> m TokenLocation #

Data TrailingAnn 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TrailingAnn -> c TrailingAnn #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TrailingAnn #

toConstr :: TrailingAnn -> Constr #

dataTypeOf :: TrailingAnn -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TrailingAnn) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TrailingAnn) #

gmapT :: (forall b. Data b => b -> b) -> TrailingAnn -> TrailingAnn #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TrailingAnn -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TrailingAnn -> r #

gmapQ :: (forall d. Data d => d -> u) -> TrailingAnn -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TrailingAnn -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TrailingAnn -> m TrailingAnn #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TrailingAnn -> m TrailingAnn #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TrailingAnn -> m TrailingAnn #

Data NoExtFieldSilent 
Instance details

Defined in GHC.Stg.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NoExtFieldSilent -> c NoExtFieldSilent #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NoExtFieldSilent #

toConstr :: NoExtFieldSilent -> Constr #

dataTypeOf :: NoExtFieldSilent -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NoExtFieldSilent) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NoExtFieldSilent) #

gmapT :: (forall b. Data b => b -> b) -> NoExtFieldSilent -> NoExtFieldSilent #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NoExtFieldSilent -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NoExtFieldSilent -> r #

gmapQ :: (forall d. Data d => d -> u) -> NoExtFieldSilent -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> NoExtFieldSilent -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NoExtFieldSilent -> m NoExtFieldSilent #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NoExtFieldSilent -> m NoExtFieldSilent #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NoExtFieldSilent -> m NoExtFieldSilent #

Data AvailInfo 
Instance details

Defined in GHC.Types.Avail

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AvailInfo -> c AvailInfo #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AvailInfo #

toConstr :: AvailInfo -> Constr #

dataTypeOf :: AvailInfo -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AvailInfo) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AvailInfo) #

gmapT :: (forall b. Data b => b -> b) -> AvailInfo -> AvailInfo #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AvailInfo -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AvailInfo -> r #

gmapQ :: (forall d. Data d => d -> u) -> AvailInfo -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AvailInfo -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AvailInfo -> m AvailInfo #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AvailInfo -> m AvailInfo #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AvailInfo -> m AvailInfo #

Data Activation 
Instance details

Defined in GHC.Types.Basic

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Activation -> c Activation #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Activation #

toConstr :: Activation -> Constr #

dataTypeOf :: Activation -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Activation) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Activation) #

gmapT :: (forall b. Data b => b -> b) -> Activation -> Activation #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Activation -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Activation -> r #

gmapQ :: (forall d. Data d => d -> u) -> Activation -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Activation -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Activation -> m Activation #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Activation -> m Activation #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Activation -> m Activation #

Data DoPmc 
Instance details

Defined in GHC.Types.Basic

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DoPmc -> c DoPmc #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DoPmc #

toConstr :: DoPmc -> Constr #

dataTypeOf :: DoPmc -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DoPmc) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DoPmc) #

gmapT :: (forall b. Data b => b -> b) -> DoPmc -> DoPmc #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DoPmc -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DoPmc -> r #

gmapQ :: (forall d. Data d => d -> u) -> DoPmc -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DoPmc -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DoPmc -> m DoPmc #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DoPmc -> m DoPmc #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DoPmc -> m DoPmc #

Data FunctionOrData 
Instance details

Defined in GHC.Types.Basic

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FunctionOrData -> c FunctionOrData #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FunctionOrData #

toConstr :: FunctionOrData -> Constr #

dataTypeOf :: FunctionOrData -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c FunctionOrData) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FunctionOrData) #

gmapT :: (forall b. Data b => b -> b) -> FunctionOrData -> FunctionOrData #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FunctionOrData -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FunctionOrData -> r #

gmapQ :: (forall d. Data d => d -> u) -> FunctionOrData -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FunctionOrData -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FunctionOrData -> m FunctionOrData #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FunctionOrData -> m FunctionOrData #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FunctionOrData -> m FunctionOrData #

Data InlinePragma 
Instance details

Defined in GHC.Types.Basic

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> InlinePragma -> c InlinePragma #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c InlinePragma #

toConstr :: InlinePragma -> Constr #

dataTypeOf :: InlinePragma -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c InlinePragma) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c InlinePragma) #

gmapT :: (forall b. Data b => b -> b) -> InlinePragma -> InlinePragma #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> InlinePragma -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> InlinePragma -> r #

gmapQ :: (forall d. Data d => d -> u) -> InlinePragma -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> InlinePragma -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> InlinePragma -> m InlinePragma #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> InlinePragma -> m InlinePragma #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> InlinePragma -> m InlinePragma #

Data InlineSpec 
Instance details

Defined in GHC.Types.Basic

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> InlineSpec -> c InlineSpec #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c InlineSpec #

toConstr :: InlineSpec -> Constr #

dataTypeOf :: InlineSpec -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c InlineSpec) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c InlineSpec) #

gmapT :: (forall b. Data b => b -> b) -> InlineSpec -> InlineSpec #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> InlineSpec -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> InlineSpec -> r #

gmapQ :: (forall d. Data d => d -> u) -> InlineSpec -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> InlineSpec -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> InlineSpec -> m InlineSpec #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> InlineSpec -> m InlineSpec #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> InlineSpec -> m InlineSpec #

Data LeftOrRight 
Instance details

Defined in GHC.Types.Basic

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LeftOrRight -> c LeftOrRight #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c LeftOrRight #

toConstr :: LeftOrRight -> Constr #

dataTypeOf :: LeftOrRight -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LeftOrRight) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c LeftOrRight) #

gmapT :: (forall b. Data b => b -> b) -> LeftOrRight -> LeftOrRight #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LeftOrRight -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LeftOrRight -> r #

gmapQ :: (forall d. Data d => d -> u) -> LeftOrRight -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> LeftOrRight -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> LeftOrRight -> m LeftOrRight #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LeftOrRight -> m LeftOrRight #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LeftOrRight -> m LeftOrRight #

Data Levity 
Instance details

Defined in GHC.Types.Basic

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Levity -> c Levity #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Levity #

toConstr :: Levity -> Constr #

dataTypeOf :: Levity -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Levity) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Levity) #

gmapT :: (forall b. Data b => b -> b) -> Levity -> Levity #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Levity -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Levity -> r #

gmapQ :: (forall d. Data d => d -> u) -> Levity -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Levity -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Levity -> m Levity #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Levity -> m Levity #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Levity -> m Levity #

Data Origin 
Instance details

Defined in GHC.Types.Basic

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Origin -> c Origin #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Origin #

toConstr :: Origin -> Constr #

dataTypeOf :: Origin -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Origin) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Origin) #

gmapT :: (forall b. Data b => b -> b) -> Origin -> Origin #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Origin -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Origin -> r #

gmapQ :: (forall d. Data d => d -> u) -> Origin -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Origin -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Origin -> m Origin #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Origin -> m Origin #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Origin -> m Origin #

Data OverlapFlag 
Instance details

Defined in GHC.Types.Basic

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OverlapFlag -> c OverlapFlag #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OverlapFlag #

toConstr :: OverlapFlag -> Constr #

dataTypeOf :: OverlapFlag -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OverlapFlag) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OverlapFlag) #

gmapT :: (forall b. Data b => b -> b) -> OverlapFlag -> OverlapFlag #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OverlapFlag -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OverlapFlag -> r #

gmapQ :: (forall d. Data d => d -> u) -> OverlapFlag -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OverlapFlag -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OverlapFlag -> m OverlapFlag #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OverlapFlag -> m OverlapFlag #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OverlapFlag -> m OverlapFlag #

Data OverlapMode 
Instance details

Defined in GHC.Types.Basic

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OverlapMode -> c OverlapMode #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OverlapMode #

toConstr :: OverlapMode -> Constr #

dataTypeOf :: OverlapMode -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OverlapMode) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OverlapMode) #

gmapT :: (forall b. Data b => b -> b) -> OverlapMode -> OverlapMode #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OverlapMode -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OverlapMode -> r #

gmapQ :: (forall d. Data d => d -> u) -> OverlapMode -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OverlapMode -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OverlapMode -> m OverlapMode #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OverlapMode -> m OverlapMode #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OverlapMode -> m OverlapMode #

Data RecFlag 
Instance details

Defined in GHC.Types.Basic

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RecFlag -> c RecFlag #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RecFlag #

toConstr :: RecFlag -> Constr #

dataTypeOf :: RecFlag -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RecFlag) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RecFlag) #

gmapT :: (forall b. Data b => b -> b) -> RecFlag -> RecFlag #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RecFlag -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RecFlag -> r #

gmapQ :: (forall d. Data d => d -> u) -> RecFlag -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> RecFlag -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RecFlag -> m RecFlag #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RecFlag -> m RecFlag #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RecFlag -> m RecFlag #

Data RuleMatchInfo 
Instance details

Defined in GHC.Types.Basic

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RuleMatchInfo -> c RuleMatchInfo #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RuleMatchInfo #

toConstr :: RuleMatchInfo -> Constr #

dataTypeOf :: RuleMatchInfo -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RuleMatchInfo) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RuleMatchInfo) #

gmapT :: (forall b. Data b => b -> b) -> RuleMatchInfo -> RuleMatchInfo #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RuleMatchInfo -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RuleMatchInfo -> r #

gmapQ :: (forall d. Data d => d -> u) -> RuleMatchInfo -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> RuleMatchInfo -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RuleMatchInfo -> m RuleMatchInfo #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RuleMatchInfo -> m RuleMatchInfo #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RuleMatchInfo -> m RuleMatchInfo #

Data TopLevelFlag 
Instance details

Defined in GHC.Types.Basic

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TopLevelFlag -> c TopLevelFlag #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TopLevelFlag #

toConstr :: TopLevelFlag -> Constr #

dataTypeOf :: TopLevelFlag -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TopLevelFlag) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TopLevelFlag) #

gmapT :: (forall b. Data b => b -> b) -> TopLevelFlag -> TopLevelFlag #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TopLevelFlag -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TopLevelFlag -> r #

gmapQ :: (forall d. Data d => d -> u) -> TopLevelFlag -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TopLevelFlag -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TopLevelFlag -> m TopLevelFlag #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TopLevelFlag -> m TopLevelFlag #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TopLevelFlag -> m TopLevelFlag #

Data TupleSort 
Instance details

Defined in GHC.Types.Basic

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TupleSort -> c TupleSort #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TupleSort #

toConstr :: TupleSort -> Constr #

dataTypeOf :: TupleSort -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TupleSort) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TupleSort) #

gmapT :: (forall b. Data b => b -> b) -> TupleSort -> TupleSort #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TupleSort -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TupleSort -> r #

gmapQ :: (forall d. Data d => d -> u) -> TupleSort -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TupleSort -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TupleSort -> m TupleSort #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TupleSort -> m TupleSort #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TupleSort -> m TupleSort #

Data TypeOrConstraint 
Instance details

Defined in GHC.Types.Basic

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TypeOrConstraint -> c TypeOrConstraint #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TypeOrConstraint #

toConstr :: TypeOrConstraint -> Constr #

dataTypeOf :: TypeOrConstraint -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TypeOrConstraint) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TypeOrConstraint) #

gmapT :: (forall b. Data b => b -> b) -> TypeOrConstraint -> TypeOrConstraint #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TypeOrConstraint -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TypeOrConstraint -> r #

gmapQ :: (forall d. Data d => d -> u) -> TypeOrConstraint -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TypeOrConstraint -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TypeOrConstraint -> m TypeOrConstraint #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TypeOrConstraint -> m TypeOrConstraint #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TypeOrConstraint -> m TypeOrConstraint #

Data TypeOrData 
Instance details

Defined in GHC.Types.Basic

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TypeOrData -> c TypeOrData #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TypeOrData #

toConstr :: TypeOrData -> Constr #

dataTypeOf :: TypeOrData -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TypeOrData) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TypeOrData) #

gmapT :: (forall b. Data b => b -> b) -> TypeOrData -> TypeOrData #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TypeOrData -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TypeOrData -> r #

gmapQ :: (forall d. Data d => d -> u) -> TypeOrData -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TypeOrData -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TypeOrData -> m TypeOrData #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TypeOrData -> m TypeOrData #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TypeOrData -> m TypeOrData #

Data DuplicateRecordFields 
Instance details

Defined in GHC.Types.FieldLabel

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DuplicateRecordFields -> c DuplicateRecordFields #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DuplicateRecordFields #

toConstr :: DuplicateRecordFields -> Constr #

dataTypeOf :: DuplicateRecordFields -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DuplicateRecordFields) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DuplicateRecordFields) #

gmapT :: (forall b. Data b => b -> b) -> DuplicateRecordFields -> DuplicateRecordFields #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DuplicateRecordFields -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DuplicateRecordFields -> r #

gmapQ :: (forall d. Data d => d -> u) -> DuplicateRecordFields -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DuplicateRecordFields -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DuplicateRecordFields -> m DuplicateRecordFields #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DuplicateRecordFields -> m DuplicateRecordFields #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DuplicateRecordFields -> m DuplicateRecordFields #

Data FieldLabel 
Instance details

Defined in GHC.Types.FieldLabel

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FieldLabel -> c FieldLabel #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FieldLabel #

toConstr :: FieldLabel -> Constr #

dataTypeOf :: FieldLabel -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c FieldLabel) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FieldLabel) #

gmapT :: (forall b. Data b => b -> b) -> FieldLabel -> FieldLabel #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FieldLabel -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FieldLabel -> r #

gmapQ :: (forall d. Data d => d -> u) -> FieldLabel -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FieldLabel -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FieldLabel -> m FieldLabel #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FieldLabel -> m FieldLabel #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FieldLabel -> m FieldLabel #

Data FieldSelectors 
Instance details

Defined in GHC.Types.FieldLabel

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FieldSelectors -> c FieldSelectors #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FieldSelectors #

toConstr :: FieldSelectors -> Constr #

dataTypeOf :: FieldSelectors -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c FieldSelectors) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FieldSelectors) #

gmapT :: (forall b. Data b => b -> b) -> FieldSelectors -> FieldSelectors #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FieldSelectors -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FieldSelectors -> r #

gmapQ :: (forall d. Data d => d -> u) -> FieldSelectors -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FieldSelectors -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FieldSelectors -> m FieldSelectors #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FieldSelectors -> m FieldSelectors #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FieldSelectors -> m FieldSelectors #

Data Fixity 
Instance details

Defined in GHC.Types.Fixity

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 GHC.Types.Fixity

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 LexicalFixity 
Instance details

Defined in GHC.Types.Fixity

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LexicalFixity -> c LexicalFixity #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c LexicalFixity #

toConstr :: LexicalFixity -> Constr #

dataTypeOf :: LexicalFixity -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LexicalFixity) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c LexicalFixity) #

gmapT :: (forall b. Data b => b -> b) -> LexicalFixity -> LexicalFixity #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LexicalFixity -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LexicalFixity -> r #

gmapQ :: (forall d. Data d => d -> u) -> LexicalFixity -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> LexicalFixity -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> LexicalFixity -> m LexicalFixity #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LexicalFixity -> m LexicalFixity #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LexicalFixity -> m LexicalFixity #

Data CCallConv 
Instance details

Defined in GHC.Types.ForeignCall

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CCallConv -> c CCallConv #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CCallConv #

toConstr :: CCallConv -> Constr #

dataTypeOf :: CCallConv -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CCallConv) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CCallConv) #

gmapT :: (forall b. Data b => b -> b) -> CCallConv -> CCallConv #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CCallConv -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CCallConv -> r #

gmapQ :: (forall d. Data d => d -> u) -> CCallConv -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CCallConv -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CCallConv -> m CCallConv #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CCallConv -> m CCallConv #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CCallConv -> m CCallConv #

Data CCallTarget 
Instance details

Defined in GHC.Types.ForeignCall

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CCallTarget -> c CCallTarget #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CCallTarget #

toConstr :: CCallTarget -> Constr #

dataTypeOf :: CCallTarget -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CCallTarget) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CCallTarget) #

gmapT :: (forall b. Data b => b -> b) -> CCallTarget -> CCallTarget #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CCallTarget -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CCallTarget -> r #

gmapQ :: (forall d. Data d => d -> u) -> CCallTarget -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CCallTarget -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CCallTarget -> m CCallTarget #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CCallTarget -> m CCallTarget #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CCallTarget -> m CCallTarget #

Data CExportSpec 
Instance details

Defined in GHC.Types.ForeignCall

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CExportSpec -> c CExportSpec #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CExportSpec #

toConstr :: CExportSpec -> Constr #

dataTypeOf :: CExportSpec -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CExportSpec) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CExportSpec) #

gmapT :: (forall b. Data b => b -> b) -> CExportSpec -> CExportSpec #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CExportSpec -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CExportSpec -> r #

gmapQ :: (forall d. Data d => d -> u) -> CExportSpec -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CExportSpec -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CExportSpec -> m CExportSpec #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CExportSpec -> m CExportSpec #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CExportSpec -> m CExportSpec #

Data CType 
Instance details

Defined in GHC.Types.ForeignCall

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CType -> c CType #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CType #

toConstr :: CType -> Constr #

dataTypeOf :: CType -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CType) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CType) #

gmapT :: (forall b. Data b => b -> b) -> CType -> CType #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CType -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CType -> r #

gmapQ :: (forall d. Data d => d -> u) -> CType -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CType -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CType -> m CType #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CType -> m CType #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CType -> m CType #

Data Header 
Instance details

Defined in GHC.Types.ForeignCall

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Header -> c Header #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Header #

toConstr :: Header -> Constr #

dataTypeOf :: Header -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Header) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Header) #

gmapT :: (forall b. Data b => b -> b) -> Header -> Header #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Header -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Header -> r #

gmapQ :: (forall d. Data d => d -> u) -> Header -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Header -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Header -> m Header #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Header -> m Header #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Header -> m Header #

Data Safety 
Instance details

Defined in GHC.Types.ForeignCall

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 RecSelParent 
Instance details

Defined in GHC.Types.Id.Info

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RecSelParent -> c RecSelParent #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RecSelParent #

toConstr :: RecSelParent -> Constr #

dataTypeOf :: RecSelParent -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RecSelParent) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RecSelParent) #

gmapT :: (forall b. Data b => b -> b) -> RecSelParent -> RecSelParent #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RecSelParent -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RecSelParent -> r #

gmapQ :: (forall d. Data d => d -> u) -> RecSelParent -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> RecSelParent -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RecSelParent -> m RecSelParent #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RecSelParent -> m RecSelParent #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RecSelParent -> m RecSelParent #

Data Name 
Instance details

Defined in GHC.Types.Name

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 OccName 
Instance details

Defined in GHC.Types.Name.Occurrence

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 ImpDeclSpec 
Instance details

Defined in GHC.Types.Name.Reader

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ImpDeclSpec -> c ImpDeclSpec #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ImpDeclSpec #

toConstr :: ImpDeclSpec -> Constr #

dataTypeOf :: ImpDeclSpec -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ImpDeclSpec) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ImpDeclSpec) #

gmapT :: (forall b. Data b => b -> b) -> ImpDeclSpec -> ImpDeclSpec #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ImpDeclSpec -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ImpDeclSpec -> r #

gmapQ :: (forall d. Data d => d -> u) -> ImpDeclSpec -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ImpDeclSpec -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ImpDeclSpec -> m ImpDeclSpec #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ImpDeclSpec -> m ImpDeclSpec #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ImpDeclSpec -> m ImpDeclSpec #

Data ImpItemSpec 
Instance details

Defined in GHC.Types.Name.Reader

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ImpItemSpec -> c ImpItemSpec #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ImpItemSpec #

toConstr :: ImpItemSpec -> Constr #

dataTypeOf :: ImpItemSpec -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ImpItemSpec) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ImpItemSpec) #

gmapT :: (forall b. Data b => b -> b) -> ImpItemSpec -> ImpItemSpec #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ImpItemSpec -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ImpItemSpec -> r #

gmapQ :: (forall d. Data d => d -> u) -> ImpItemSpec -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ImpItemSpec -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ImpItemSpec -> m ImpItemSpec #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ImpItemSpec -> m ImpItemSpec #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ImpItemSpec -> m ImpItemSpec #

Data ImportSpec 
Instance details

Defined in GHC.Types.Name.Reader

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ImportSpec -> c ImportSpec #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ImportSpec #

toConstr :: ImportSpec -> Constr #

dataTypeOf :: ImportSpec -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ImportSpec) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ImportSpec) #

gmapT :: (forall b. Data b => b -> b) -> ImportSpec -> ImportSpec #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ImportSpec -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ImportSpec -> r #

gmapQ :: (forall d. Data d => d -> u) -> ImportSpec -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ImportSpec -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ImportSpec -> m ImportSpec #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ImportSpec -> m ImportSpec #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ImportSpec -> m ImportSpec #

Data Parent 
Instance details

Defined in GHC.Types.Name.Reader

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Parent -> c Parent #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Parent #

toConstr :: Parent -> Constr #

dataTypeOf :: Parent -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Parent) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Parent) #

gmapT :: (forall b. Data b => b -> b) -> Parent -> Parent #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Parent -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Parent -> r #

gmapQ :: (forall d. Data d => d -> u) -> Parent -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Parent -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Parent -> m Parent #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Parent -> m Parent #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Parent -> m Parent #

Data RdrName 
Instance details

Defined in GHC.Types.Name.Reader

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RdrName -> c RdrName #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RdrName #

toConstr :: RdrName -> Constr #

dataTypeOf :: RdrName -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RdrName) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RdrName) #

gmapT :: (forall b. Data b => b -> b) -> RdrName -> RdrName #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RdrName -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RdrName -> r #

gmapQ :: (forall d. Data d => d -> u) -> RdrName -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> RdrName -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RdrName -> m RdrName #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RdrName -> m RdrName #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RdrName -> m RdrName #

Data FractionalExponentBase 
Instance details

Defined in GHC.Types.SourceText

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FractionalExponentBase -> c FractionalExponentBase #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FractionalExponentBase #

toConstr :: FractionalExponentBase -> Constr #

dataTypeOf :: FractionalExponentBase -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c FractionalExponentBase) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FractionalExponentBase) #

gmapT :: (forall b. Data b => b -> b) -> FractionalExponentBase -> FractionalExponentBase #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FractionalExponentBase -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FractionalExponentBase -> r #

gmapQ :: (forall d. Data d => d -> u) -> FractionalExponentBase -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FractionalExponentBase -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FractionalExponentBase -> m FractionalExponentBase #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FractionalExponentBase -> m FractionalExponentBase #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FractionalExponentBase -> m FractionalExponentBase #

Data FractionalLit 
Instance details

Defined in GHC.Types.SourceText

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FractionalLit -> c FractionalLit #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FractionalLit #

toConstr :: FractionalLit -> Constr #

dataTypeOf :: FractionalLit -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c FractionalLit) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FractionalLit) #

gmapT :: (forall b. Data b => b -> b) -> FractionalLit -> FractionalLit #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FractionalLit -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FractionalLit -> r #

gmapQ :: (forall d. Data d => d -> u) -> FractionalLit -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FractionalLit -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FractionalLit -> m FractionalLit #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FractionalLit -> m FractionalLit #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FractionalLit -> m FractionalLit #

Data IntegralLit 
Instance details

Defined in GHC.Types.SourceText

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IntegralLit -> c IntegralLit #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IntegralLit #

toConstr :: IntegralLit -> Constr #

dataTypeOf :: IntegralLit -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IntegralLit) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IntegralLit) #

gmapT :: (forall b. Data b => b -> b) -> IntegralLit -> IntegralLit #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IntegralLit -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IntegralLit -> r #

gmapQ :: (forall d. Data d => d -> u) -> IntegralLit -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IntegralLit -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IntegralLit -> m IntegralLit #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IntegralLit -> m IntegralLit #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IntegralLit -> m IntegralLit #

Data SourceText 
Instance details

Defined in GHC.Types.SourceText

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SourceText -> c SourceText #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SourceText #

toConstr :: SourceText -> Constr #

dataTypeOf :: SourceText -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SourceText) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SourceText) #

gmapT :: (forall b. Data b => b -> b) -> SourceText -> SourceText #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SourceText -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SourceText -> r #

gmapQ :: (forall d. Data d => d -> u) -> SourceText -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SourceText -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SourceText -> m SourceText #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SourceText -> m SourceText #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SourceText -> m SourceText #

Data StringLiteral 
Instance details

Defined in GHC.Types.SourceText

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> StringLiteral -> c StringLiteral #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c StringLiteral #

toConstr :: StringLiteral -> Constr #

dataTypeOf :: StringLiteral -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c StringLiteral) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c StringLiteral) #

gmapT :: (forall b. Data b => b -> b) -> StringLiteral -> StringLiteral #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> StringLiteral -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> StringLiteral -> r #

gmapQ :: (forall d. Data d => d -> u) -> StringLiteral -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> StringLiteral -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> StringLiteral -> m StringLiteral #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> StringLiteral -> m StringLiteral #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> StringLiteral -> m StringLiteral #

Data BufPos 
Instance details

Defined in GHC.Types.SrcLoc

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BufPos -> c BufPos #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BufPos #

toConstr :: BufPos -> Constr #

dataTypeOf :: BufPos -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BufPos) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BufPos) #

gmapT :: (forall b. Data b => b -> b) -> BufPos -> BufPos #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BufPos -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BufPos -> r #

gmapQ :: (forall d. Data d => d -> u) -> BufPos -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BufPos -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BufPos -> m BufPos #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BufPos -> m BufPos #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BufPos -> m BufPos #

Data BufSpan 
Instance details

Defined in GHC.Types.SrcLoc

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BufSpan -> c BufSpan #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BufSpan #

toConstr :: BufSpan -> Constr #

dataTypeOf :: BufSpan -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BufSpan) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BufSpan) #

gmapT :: (forall b. Data b => b -> b) -> BufSpan -> BufSpan #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BufSpan -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BufSpan -> r #

gmapQ :: (forall d. Data d => d -> u) -> BufSpan -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BufSpan -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BufSpan -> m BufSpan #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BufSpan -> m BufSpan #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BufSpan -> m BufSpan #

Data PsSpan 
Instance details

Defined in GHC.Types.SrcLoc

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PsSpan -> c PsSpan #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PsSpan #

toConstr :: PsSpan -> Constr #

dataTypeOf :: PsSpan -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PsSpan) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PsSpan) #

gmapT :: (forall b. Data b => b -> b) -> PsSpan -> PsSpan #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PsSpan -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PsSpan -> r #

gmapQ :: (forall d. Data d => d -> u) -> PsSpan -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PsSpan -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PsSpan -> m PsSpan #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PsSpan -> m PsSpan #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PsSpan -> m PsSpan #

Data RealSrcSpan 
Instance details

Defined in GHC.Types.SrcLoc

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RealSrcSpan -> c RealSrcSpan #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RealSrcSpan #

toConstr :: RealSrcSpan -> Constr #

dataTypeOf :: RealSrcSpan -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RealSrcSpan) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RealSrcSpan) #

gmapT :: (forall b. Data b => b -> b) -> RealSrcSpan -> RealSrcSpan #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RealSrcSpan -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RealSrcSpan -> r #

gmapQ :: (forall d. Data d => d -> u) -> RealSrcSpan -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> RealSrcSpan -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RealSrcSpan -> m RealSrcSpan #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RealSrcSpan -> m RealSrcSpan #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RealSrcSpan -> m RealSrcSpan #

Data SrcSpan 
Instance details

Defined in GHC.Types.SrcLoc

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SrcSpan -> c SrcSpan #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SrcSpan #

toConstr :: SrcSpan -> Constr #

dataTypeOf :: SrcSpan -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SrcSpan) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SrcSpan) #

gmapT :: (forall b. Data b => b -> b) -> SrcSpan -> SrcSpan #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SrcSpan -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SrcSpan -> r #

gmapQ :: (forall d. Data d => d -> u) -> SrcSpan -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SrcSpan -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SrcSpan -> m SrcSpan #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SrcSpan -> m SrcSpan #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SrcSpan -> m SrcSpan #

Data ForAllTyFlag 
Instance details

Defined in GHC.Types.Var

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ForAllTyFlag -> c ForAllTyFlag #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ForAllTyFlag #

toConstr :: ForAllTyFlag -> Constr #

dataTypeOf :: ForAllTyFlag -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ForAllTyFlag) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ForAllTyFlag) #

gmapT :: (forall b. Data b => b -> b) -> ForAllTyFlag -> ForAllTyFlag #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ForAllTyFlag -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ForAllTyFlag -> r #

gmapQ :: (forall d. Data d => d -> u) -> ForAllTyFlag -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ForAllTyFlag -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ForAllTyFlag -> m ForAllTyFlag #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ForAllTyFlag -> m ForAllTyFlag #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ForAllTyFlag -> m ForAllTyFlag #

Data FunTyFlag 
Instance details

Defined in GHC.Types.Var

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FunTyFlag -> c FunTyFlag #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FunTyFlag #

toConstr :: FunTyFlag -> Constr #

dataTypeOf :: FunTyFlag -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c FunTyFlag) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FunTyFlag) #

gmapT :: (forall b. Data b => b -> b) -> FunTyFlag -> FunTyFlag #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FunTyFlag -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FunTyFlag -> r #

gmapQ :: (forall d. Data d => d -> u) -> FunTyFlag -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FunTyFlag -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FunTyFlag -> m FunTyFlag #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FunTyFlag -> m FunTyFlag #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FunTyFlag -> m FunTyFlag #

Data PiTyBinder 
Instance details

Defined in GHC.Types.Var

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PiTyBinder -> c PiTyBinder #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PiTyBinder #

toConstr :: PiTyBinder -> Constr #

dataTypeOf :: PiTyBinder -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PiTyBinder) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PiTyBinder) #

gmapT :: (forall b. Data b => b -> b) -> PiTyBinder -> PiTyBinder #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PiTyBinder -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PiTyBinder -> r #

gmapQ :: (forall d. Data d => d -> u) -> PiTyBinder -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PiTyBinder -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PiTyBinder -> m PiTyBinder #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PiTyBinder -> m PiTyBinder #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PiTyBinder -> m PiTyBinder #

Data Specificity 
Instance details

Defined in GHC.Types.Var

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 Var 
Instance details

Defined in GHC.Types.Var

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Var -> c Var #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Var #

toConstr :: Var -> Constr #

dataTypeOf :: Var -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Var) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Var) #

gmapT :: (forall b. Data b => b -> b) -> Var -> Var #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Var -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Var -> r #

gmapQ :: (forall d. Data d => d -> u) -> Var -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Var -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Var -> m Var #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Var -> m Var #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Var -> m Var #

Data InWarningCategory 
Instance details

Defined in GHC.Unit.Module.Warnings

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> InWarningCategory -> c InWarningCategory #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c InWarningCategory #

toConstr :: InWarningCategory -> Constr #

dataTypeOf :: InWarningCategory -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c InWarningCategory) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c InWarningCategory) #

gmapT :: (forall b. Data b => b -> b) -> InWarningCategory -> InWarningCategory #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> InWarningCategory -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> InWarningCategory -> r #

gmapQ :: (forall d. Data d => d -> u) -> InWarningCategory -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> InWarningCategory -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> InWarningCategory -> m InWarningCategory #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> InWarningCategory -> m InWarningCategory #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> InWarningCategory -> m InWarningCategory #

Data WarningCategory 
Instance details

Defined in GHC.Unit.Module.Warnings

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> WarningCategory -> c WarningCategory #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c WarningCategory #

toConstr :: WarningCategory -> Constr #

dataTypeOf :: WarningCategory -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c WarningCategory) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c WarningCategory) #

gmapT :: (forall b. Data b => b -> b) -> WarningCategory -> WarningCategory #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WarningCategory -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WarningCategory -> r #

gmapQ :: (forall d. Data d => d -> u) -> WarningCategory -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> WarningCategory -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> WarningCategory -> m WarningCategory #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> WarningCategory -> m WarningCategory #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> WarningCategory -> m WarningCategory #

Data Unit 
Instance details

Defined in GHC.Unit.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Unit -> c Unit #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Unit #

toConstr :: Unit -> Constr #

dataTypeOf :: Unit -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Unit) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Unit) #

gmapT :: (forall b. Data b => b -> b) -> Unit -> Unit #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Unit -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Unit -> r #

gmapQ :: (forall d. Data d => d -> u) -> Unit -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Unit -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Unit -> m Unit #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Unit -> m Unit #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Unit -> m Unit #

Data UnitId 
Instance details

Defined in GHC.Unit.Types

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 Boxity 
Instance details

Defined in Language.Haskell.Syntax.Basic

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Boxity -> c Boxity #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Boxity #

toConstr :: Boxity -> Constr #

dataTypeOf :: Boxity -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Boxity) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Boxity) #

gmapT :: (forall b. Data b => b -> b) -> Boxity -> Boxity #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Boxity -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Boxity -> r #

gmapQ :: (forall d. Data d => d -> u) -> Boxity -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Boxity -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Boxity -> m Boxity #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Boxity -> m Boxity #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Boxity -> m Boxity #

Data FieldLabelString 
Instance details

Defined in Language.Haskell.Syntax.Basic

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FieldLabelString -> c FieldLabelString #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FieldLabelString #

toConstr :: FieldLabelString -> Constr #

dataTypeOf :: FieldLabelString -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c FieldLabelString) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FieldLabelString) #

gmapT :: (forall b. Data b => b -> b) -> FieldLabelString -> FieldLabelString #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FieldLabelString -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FieldLabelString -> r #

gmapQ :: (forall d. Data d => d -> u) -> FieldLabelString -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FieldLabelString -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FieldLabelString -> m FieldLabelString #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FieldLabelString -> m FieldLabelString #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FieldLabelString -> m FieldLabelString #

Data Role 
Instance details

Defined in Language.Haskell.Syntax.Basic

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 SrcStrictness 
Instance details

Defined in Language.Haskell.Syntax.Basic

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SrcStrictness -> c SrcStrictness #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SrcStrictness #

toConstr :: SrcStrictness -> Constr #

dataTypeOf :: SrcStrictness -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SrcStrictness) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SrcStrictness) #

gmapT :: (forall b. Data b => b -> b) -> SrcStrictness -> SrcStrictness #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SrcStrictness -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SrcStrictness -> r #

gmapQ :: (forall d. Data d => d -> u) -> SrcStrictness -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SrcStrictness -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SrcStrictness -> m SrcStrictness #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SrcStrictness -> m SrcStrictness #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SrcStrictness -> m SrcStrictness #

Data SrcUnpackedness 
Instance details

Defined in Language.Haskell.Syntax.Basic

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SrcUnpackedness -> c SrcUnpackedness #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SrcUnpackedness #

toConstr :: SrcUnpackedness -> Constr #

dataTypeOf :: SrcUnpackedness -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SrcUnpackedness) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SrcUnpackedness) #

gmapT :: (forall b. Data b => b -> b) -> SrcUnpackedness -> SrcUnpackedness #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SrcUnpackedness -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SrcUnpackedness -> r #

gmapQ :: (forall d. Data d => d -> u) -> SrcUnpackedness -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SrcUnpackedness -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SrcUnpackedness -> m SrcUnpackedness #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SrcUnpackedness -> m SrcUnpackedness #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SrcUnpackedness -> m SrcUnpackedness #

Data CImportSpec 
Instance details

Defined in Language.Haskell.Syntax.Decls

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CImportSpec -> c CImportSpec #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CImportSpec #

toConstr :: CImportSpec -> Constr #

dataTypeOf :: CImportSpec -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CImportSpec) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CImportSpec) #

gmapT :: (forall b. Data b => b -> b) -> CImportSpec -> CImportSpec #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CImportSpec -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CImportSpec -> r #

gmapQ :: (forall d. Data d => d -> u) -> CImportSpec -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CImportSpec -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CImportSpec -> m CImportSpec #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CImportSpec -> m CImportSpec #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CImportSpec -> m CImportSpec #

Data NewOrData 
Instance details

Defined in Language.Haskell.Syntax.Decls

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NewOrData -> c NewOrData #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NewOrData #

toConstr :: NewOrData -> Constr #

dataTypeOf :: NewOrData -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NewOrData) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NewOrData) #

gmapT :: (forall b. Data b => b -> b) -> NewOrData -> NewOrData #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NewOrData -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NewOrData -> r #

gmapQ :: (forall d. Data d => d -> u) -> NewOrData -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> NewOrData -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NewOrData -> m NewOrData #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NewOrData -> m NewOrData #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NewOrData -> m NewOrData #

Data SpliceDecoration 
Instance details

Defined in Language.Haskell.Syntax.Decls

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SpliceDecoration -> c SpliceDecoration #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SpliceDecoration #

toConstr :: SpliceDecoration -> Constr #

dataTypeOf :: SpliceDecoration -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SpliceDecoration) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SpliceDecoration) #

gmapT :: (forall b. Data b => b -> b) -> SpliceDecoration -> SpliceDecoration #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SpliceDecoration -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SpliceDecoration -> r #

gmapQ :: (forall d. Data d => d -> u) -> SpliceDecoration -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SpliceDecoration -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SpliceDecoration -> m SpliceDecoration #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SpliceDecoration -> m SpliceDecoration #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SpliceDecoration -> m SpliceDecoration #

Data HsArrAppType 
Instance details

Defined in Language.Haskell.Syntax.Expr

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> HsArrAppType -> c HsArrAppType #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c HsArrAppType #

toConstr :: HsArrAppType -> Constr #

dataTypeOf :: HsArrAppType -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c HsArrAppType) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c HsArrAppType) #

gmapT :: (forall b. Data b => b -> b) -> HsArrAppType -> HsArrAppType #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HsArrAppType -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HsArrAppType -> r #

gmapQ :: (forall d. Data d => d -> u) -> HsArrAppType -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> HsArrAppType -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> HsArrAppType -> m HsArrAppType #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HsArrAppType -> m HsArrAppType #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HsArrAppType -> m HsArrAppType #

Data LamCaseVariant 
Instance details

Defined in Language.Haskell.Syntax.Expr

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LamCaseVariant -> c LamCaseVariant #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c LamCaseVariant #

toConstr :: LamCaseVariant -> Constr #

dataTypeOf :: LamCaseVariant -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LamCaseVariant) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c LamCaseVariant) #

gmapT :: (forall b. Data b => b -> b) -> LamCaseVariant -> LamCaseVariant #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LamCaseVariant -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LamCaseVariant -> r #

gmapQ :: (forall d. Data d => d -> u) -> LamCaseVariant -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> LamCaseVariant -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> LamCaseVariant -> m LamCaseVariant #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LamCaseVariant -> m LamCaseVariant #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LamCaseVariant -> m LamCaseVariant #

Data TransForm 
Instance details

Defined in Language.Haskell.Syntax.Expr

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TransForm -> c TransForm #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TransForm #

toConstr :: TransForm -> Constr #

dataTypeOf :: TransForm -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TransForm) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TransForm) #

gmapT :: (forall b. Data b => b -> b) -> TransForm -> TransForm #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TransForm -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TransForm -> r #

gmapQ :: (forall d. Data d => d -> u) -> TransForm -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TransForm -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TransForm -> m TransForm #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TransForm -> m TransForm #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TransForm -> m TransForm #

Data DataConCantHappen 
Instance details

Defined in Language.Haskell.Syntax.Extension

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DataConCantHappen -> c DataConCantHappen #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DataConCantHappen #

toConstr :: DataConCantHappen -> Constr #

dataTypeOf :: DataConCantHappen -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DataConCantHappen) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DataConCantHappen) #

gmapT :: (forall b. Data b => b -> b) -> DataConCantHappen -> DataConCantHappen #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DataConCantHappen -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DataConCantHappen -> r #

gmapQ :: (forall d. Data d => d -> u) -> DataConCantHappen -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DataConCantHappen -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DataConCantHappen -> m DataConCantHappen #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DataConCantHappen -> m DataConCantHappen #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DataConCantHappen -> m DataConCantHappen #

Data NoExtField 
Instance details

Defined in Language.Haskell.Syntax.Extension

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NoExtField -> c NoExtField #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NoExtField #

toConstr :: NoExtField -> Constr #

dataTypeOf :: NoExtField -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NoExtField) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NoExtField) #

gmapT :: (forall b. Data b => b -> b) -> NoExtField -> NoExtField #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NoExtField -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NoExtField -> r #

gmapQ :: (forall d. Data d => d -> u) -> NoExtField -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> NoExtField -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NoExtField -> m NoExtField #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NoExtField -> m NoExtField #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NoExtField -> m NoExtField #

Data IEWildcard 
Instance details

Defined in Language.Haskell.Syntax.ImpExp

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IEWildcard -> c IEWildcard #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IEWildcard #

toConstr :: IEWildcard -> Constr #

dataTypeOf :: IEWildcard -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IEWildcard) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IEWildcard) #

gmapT :: (forall b. Data b => b -> b) -> IEWildcard -> IEWildcard #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IEWildcard -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IEWildcard -> r #

gmapQ :: (forall d. Data d => d -> u) -> IEWildcard -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IEWildcard -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IEWildcard -> m IEWildcard #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IEWildcard -> m IEWildcard #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IEWildcard -> m IEWildcard #

Data ImportDeclQualifiedStyle 
Instance details

Defined in Language.Haskell.Syntax.ImpExp

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ImportDeclQualifiedStyle -> c ImportDeclQualifiedStyle #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ImportDeclQualifiedStyle #

toConstr :: ImportDeclQualifiedStyle -> Constr #

dataTypeOf :: ImportDeclQualifiedStyle -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ImportDeclQualifiedStyle) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ImportDeclQualifiedStyle) #

gmapT :: (forall b. Data b => b -> b) -> ImportDeclQualifiedStyle -> ImportDeclQualifiedStyle #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ImportDeclQualifiedStyle -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ImportDeclQualifiedStyle -> r #

gmapQ :: (forall d. Data d => d -> u) -> ImportDeclQualifiedStyle -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ImportDeclQualifiedStyle -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ImportDeclQualifiedStyle -> m ImportDeclQualifiedStyle #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ImportDeclQualifiedStyle -> m ImportDeclQualifiedStyle #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ImportDeclQualifiedStyle -> m ImportDeclQualifiedStyle #

Data ImportListInterpretation 
Instance details

Defined in Language.Haskell.Syntax.ImpExp

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ImportListInterpretation -> c ImportListInterpretation #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ImportListInterpretation #

toConstr :: ImportListInterpretation -> Constr #

dataTypeOf :: ImportListInterpretation -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ImportListInterpretation) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ImportListInterpretation) #

gmapT :: (forall b. Data b => b -> b) -> ImportListInterpretation -> ImportListInterpretation #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ImportListInterpretation -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ImportListInterpretation -> r #

gmapQ :: (forall d. Data d => d -> u) -> ImportListInterpretation -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ImportListInterpretation -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ImportListInterpretation -> m ImportListInterpretation #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ImportListInterpretation -> m ImportListInterpretation #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ImportListInterpretation -> m ImportListInterpretation #

Data IsBootInterface 
Instance details

Defined in Language.Haskell.Syntax.ImpExp

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IsBootInterface -> c IsBootInterface #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IsBootInterface #

toConstr :: IsBootInterface -> Constr #

dataTypeOf :: IsBootInterface -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IsBootInterface) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IsBootInterface) #

gmapT :: (forall b. Data b => b -> b) -> IsBootInterface -> IsBootInterface #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IsBootInterface -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IsBootInterface -> r #

gmapQ :: (forall d. Data d => d -> u) -> IsBootInterface -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IsBootInterface -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IsBootInterface -> m IsBootInterface #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IsBootInterface -> m IsBootInterface #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IsBootInterface -> m IsBootInterface #

Data OverLitVal 
Instance details

Defined in Language.Haskell.Syntax.Lit

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OverLitVal -> c OverLitVal #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OverLitVal #

toConstr :: OverLitVal -> Constr #

dataTypeOf :: OverLitVal -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OverLitVal) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OverLitVal) #

gmapT :: (forall b. Data b => b -> b) -> OverLitVal -> OverLitVal #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OverLitVal -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OverLitVal -> r #

gmapQ :: (forall d. Data d => d -> u) -> OverLitVal -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OverLitVal -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OverLitVal -> m OverLitVal #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OverLitVal -> m OverLitVal #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OverLitVal -> m OverLitVal #

Data ModuleName 
Instance details

Defined in Language.Haskell.Syntax.Module.Name

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 RecFieldsDotDot 
Instance details

Defined in Language.Haskell.Syntax.Pat

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RecFieldsDotDot -> c RecFieldsDotDot #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RecFieldsDotDot #

toConstr :: RecFieldsDotDot -> Constr #

dataTypeOf :: RecFieldsDotDot -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RecFieldsDotDot) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RecFieldsDotDot) #

gmapT :: (forall b. Data b => b -> b) -> RecFieldsDotDot -> RecFieldsDotDot #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RecFieldsDotDot -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RecFieldsDotDot -> r #

gmapQ :: (forall d. Data d => d -> u) -> RecFieldsDotDot -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> RecFieldsDotDot -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RecFieldsDotDot -> m RecFieldsDotDot #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RecFieldsDotDot -> m RecFieldsDotDot #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RecFieldsDotDot -> m RecFieldsDotDot #

Data HsIPName 
Instance details

Defined in Language.Haskell.Syntax.Type

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> HsIPName -> c HsIPName #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c HsIPName #

toConstr :: HsIPName -> Constr #

dataTypeOf :: HsIPName -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c HsIPName) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c HsIPName) #

gmapT :: (forall b. Data b => b -> b) -> HsIPName -> HsIPName #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HsIPName -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HsIPName -> r #

gmapQ :: (forall d. Data d => d -> u) -> HsIPName -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> HsIPName -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> HsIPName -> m HsIPName #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HsIPName -> m HsIPName #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HsIPName -> m HsIPName #

Data HsTupleSort 
Instance details

Defined in Language.Haskell.Syntax.Type

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> HsTupleSort -> c HsTupleSort #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c HsTupleSort #

toConstr :: HsTupleSort -> Constr #

dataTypeOf :: HsTupleSort -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c HsTupleSort) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c HsTupleSort) #

gmapT :: (forall b. Data b => b -> b) -> HsTupleSort -> HsTupleSort #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HsTupleSort -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HsTupleSort -> r #

gmapQ :: (forall d. Data d => d -> u) -> HsTupleSort -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> HsTupleSort -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> HsTupleSort -> m HsTupleSort #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HsTupleSort -> m HsTupleSort #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HsTupleSort -> m HsTupleSort #

Data PromotionFlag 
Instance details

Defined in Language.Haskell.Syntax.Type

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PromotionFlag -> c PromotionFlag #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PromotionFlag #

toConstr :: PromotionFlag -> Constr #

dataTypeOf :: PromotionFlag -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PromotionFlag) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PromotionFlag) #

gmapT :: (forall b. Data b => b -> b) -> PromotionFlag -> PromotionFlag #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PromotionFlag -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PromotionFlag -> r #

gmapQ :: (forall d. Data d => d -> u) -> PromotionFlag -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PromotionFlag -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PromotionFlag -> m PromotionFlag #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PromotionFlag -> m PromotionFlag #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PromotionFlag -> m PromotionFlag #

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 Comment 
Instance details

Defined in Language.Haskell.Exts.Comments

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Comment -> c Comment #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Comment #

toConstr :: Comment -> Constr #

dataTypeOf :: Comment -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Comment) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Comment) #

gmapT :: (forall b. Data b => b -> b) -> Comment -> Comment #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Comment -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Comment -> r #

gmapQ :: (forall d. Data d => d -> u) -> Comment -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Comment -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Comment -> m Comment #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Comment -> m Comment #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Comment -> m Comment #

Data UnknownPragma 
Instance details

Defined in Language.Haskell.Exts.Comments

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UnknownPragma -> c UnknownPragma #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UnknownPragma #

toConstr :: UnknownPragma -> Constr #

dataTypeOf :: UnknownPragma -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UnknownPragma) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UnknownPragma) #

gmapT :: (forall b. Data b => b -> b) -> UnknownPragma -> UnknownPragma #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UnknownPragma -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UnknownPragma -> r #

gmapQ :: (forall d. Data d => d -> u) -> UnknownPragma -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UnknownPragma -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UnknownPragma -> m UnknownPragma #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UnknownPragma -> m UnknownPragma #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UnknownPragma -> m UnknownPragma #

Data KnownExtension 
Instance details

Defined in Language.Haskell.Exts.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.Exts.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 Fixity 
Instance details

Defined in Language.Haskell.Exts.Fixity

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 SrcLoc 
Instance details

Defined in Language.Haskell.Exts.SrcLoc

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SrcLoc -> c SrcLoc #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SrcLoc #

toConstr :: SrcLoc -> Constr #

dataTypeOf :: SrcLoc -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SrcLoc) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SrcLoc) #

gmapT :: (forall b. Data b => b -> b) -> SrcLoc -> SrcLoc #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SrcLoc -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SrcLoc -> r #

gmapQ :: (forall d. Data d => d -> u) -> SrcLoc -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SrcLoc -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SrcLoc -> m SrcLoc #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SrcLoc -> m SrcLoc #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SrcLoc -> m SrcLoc #

Data SrcSpan 
Instance details

Defined in Language.Haskell.Exts.SrcLoc

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SrcSpan -> c SrcSpan #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SrcSpan #

toConstr :: SrcSpan -> Constr #

dataTypeOf :: SrcSpan -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SrcSpan) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SrcSpan) #

gmapT :: (forall b. Data b => b -> b) -> SrcSpan -> SrcSpan #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SrcSpan -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SrcSpan -> r #

gmapQ :: (forall d. Data d => d -> u) -> SrcSpan -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SrcSpan -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SrcSpan -> m SrcSpan #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SrcSpan -> m SrcSpan #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SrcSpan -> m SrcSpan #

Data SrcSpanInfo 
Instance details

Defined in Language.Haskell.Exts.SrcLoc

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SrcSpanInfo -> c SrcSpanInfo #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SrcSpanInfo #

toConstr :: SrcSpanInfo -> Constr #

dataTypeOf :: SrcSpanInfo -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SrcSpanInfo) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SrcSpanInfo) #

gmapT :: (forall b. Data b => b -> b) -> SrcSpanInfo -> SrcSpanInfo #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SrcSpanInfo -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SrcSpanInfo -> r #

gmapQ :: (forall d. Data d => d -> u) -> SrcSpanInfo -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SrcSpanInfo -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SrcSpanInfo -> m SrcSpanInfo #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SrcSpanInfo -> m SrcSpanInfo #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SrcSpanInfo -> m SrcSpanInfo #

Data Boxed 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Boxed -> c Boxed #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Boxed #

toConstr :: Boxed -> Constr #

dataTypeOf :: Boxed -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Boxed) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Boxed) #

gmapT :: (forall b. Data b => b -> b) -> Boxed -> Boxed #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Boxed -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Boxed -> r #

gmapQ :: (forall d. Data d => d -> u) -> Boxed -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Boxed -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Boxed -> m Boxed #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Boxed -> m Boxed #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Boxed -> m Boxed #

Data Tool 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Tool -> c Tool #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Tool #

toConstr :: Tool -> Constr #

dataTypeOf :: Tool -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Tool) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Tool) #

gmapT :: (forall b. Data b => b -> b) -> Tool -> Tool #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Tool -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Tool -> r #

gmapQ :: (forall d. Data d => d -> u) -> Tool -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Tool -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Tool -> m Tool #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Tool -> m Tool #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Tool -> m Tool #

Data Date 
Instance details

Defined in Time.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Date -> c Date #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Date #

toConstr :: Date -> Constr #

dataTypeOf :: Date -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Date) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Date) #

gmapT :: (forall b. Data b => b -> b) -> Date -> Date #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Date -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Date -> r #

gmapQ :: (forall d. Data d => d -> u) -> Date -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Date -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Date -> m Date #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Date -> m Date #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Date -> m Date #

Data DateTime 
Instance details

Defined in Time.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DateTime -> c DateTime #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DateTime #

toConstr :: DateTime -> Constr #

dataTypeOf :: DateTime -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DateTime) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DateTime) #

gmapT :: (forall b. Data b => b -> b) -> DateTime -> DateTime #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DateTime -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DateTime -> r #

gmapQ :: (forall d. Data d => d -> u) -> DateTime -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DateTime -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DateTime -> m DateTime #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DateTime -> m DateTime #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DateTime -> m DateTime #

Data Elapsed 
Instance details

Defined in Time.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Elapsed -> c Elapsed #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Elapsed #

toConstr :: Elapsed -> Constr #

dataTypeOf :: Elapsed -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Elapsed) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Elapsed) #

gmapT :: (forall b. Data b => b -> b) -> Elapsed -> Elapsed #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Elapsed -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Elapsed -> r #

gmapQ :: (forall d. Data d => d -> u) -> Elapsed -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Elapsed -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Elapsed -> m Elapsed #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Elapsed -> m Elapsed #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Elapsed -> m Elapsed #

Data ElapsedP 
Instance details

Defined in Time.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ElapsedP -> c ElapsedP #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ElapsedP #

toConstr :: ElapsedP -> Constr #

dataTypeOf :: ElapsedP -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ElapsedP) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ElapsedP) #

gmapT :: (forall b. Data b => b -> b) -> ElapsedP -> ElapsedP #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ElapsedP -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ElapsedP -> r #

gmapQ :: (forall d. Data d => d -> u) -> ElapsedP -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ElapsedP -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ElapsedP -> m ElapsedP #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ElapsedP -> m ElapsedP #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ElapsedP -> m ElapsedP #

Data Hours 
Instance details

Defined in Time.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Hours -> c Hours #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Hours #

toConstr :: Hours -> Constr #

dataTypeOf :: Hours -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Hours) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Hours) #

gmapT :: (forall b. Data b => b -> b) -> Hours -> Hours #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Hours -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Hours -> r #

gmapQ :: (forall d. Data d => d -> u) -> Hours -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Hours -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Hours -> m Hours #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Hours -> m Hours #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Hours -> m Hours #

Data Minutes 
Instance details

Defined in Time.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Minutes -> c Minutes #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Minutes #

toConstr :: Minutes -> Constr #

dataTypeOf :: Minutes -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Minutes) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Minutes) #

gmapT :: (forall b. Data b => b -> b) -> Minutes -> Minutes #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Minutes -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Minutes -> r #

gmapQ :: (forall d. Data d => d -> u) -> Minutes -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Minutes -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Minutes -> m Minutes #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Minutes -> m Minutes #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Minutes -> m Minutes #

Data Month 
Instance details

Defined in Time.Types

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 NanoSeconds 
Instance details

Defined in Time.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NanoSeconds -> c NanoSeconds #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NanoSeconds #

toConstr :: NanoSeconds -> Constr #

dataTypeOf :: NanoSeconds -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NanoSeconds) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NanoSeconds) #

gmapT :: (forall b. Data b => b -> b) -> NanoSeconds -> NanoSeconds #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NanoSeconds -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NanoSeconds -> r #

gmapQ :: (forall d. Data d => d -> u) -> NanoSeconds -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> NanoSeconds -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NanoSeconds -> m NanoSeconds #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NanoSeconds -> m NanoSeconds #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NanoSeconds -> m NanoSeconds #

Data Seconds 
Instance details

Defined in Time.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Seconds -> c Seconds #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Seconds #

toConstr :: Seconds -> Constr #

dataTypeOf :: Seconds -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Seconds) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Seconds) #

gmapT :: (forall b. Data b => b -> b) -> Seconds -> Seconds #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Seconds -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Seconds -> r #

gmapQ :: (forall d. Data d => d -> u) -> Seconds -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Seconds -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Seconds -> m Seconds #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Seconds -> m Seconds #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Seconds -> m Seconds #

Data TimeOfDay 
Instance details

Defined in Time.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TimeOfDay -> c TimeOfDay #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TimeOfDay #

toConstr :: TimeOfDay -> Constr #

dataTypeOf :: TimeOfDay -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TimeOfDay) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TimeOfDay) #

gmapT :: (forall b. Data b => b -> b) -> TimeOfDay -> TimeOfDay #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TimeOfDay -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TimeOfDay -> r #

gmapQ :: (forall d. Data d => d -> u) -> TimeOfDay -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TimeOfDay -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TimeOfDay -> m TimeOfDay #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TimeOfDay -> m TimeOfDay #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TimeOfDay -> m TimeOfDay #

Data TimezoneOffset 
Instance details

Defined in Time.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TimezoneOffset -> c TimezoneOffset #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TimezoneOffset #

toConstr :: TimezoneOffset -> Constr #

dataTypeOf :: TimezoneOffset -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TimezoneOffset) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TimezoneOffset) #

gmapT :: (forall b. Data b => b -> b) -> TimezoneOffset -> TimezoneOffset #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TimezoneOffset -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TimezoneOffset -> r #

gmapQ :: (forall d. Data d => d -> u) -> TimezoneOffset -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TimezoneOffset -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TimezoneOffset -> m TimezoneOffset #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TimezoneOffset -> m TimezoneOffset #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TimezoneOffset -> m TimezoneOffset #

Data WeekDay 
Instance details

Defined in Time.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> WeekDay -> c WeekDay #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c WeekDay #

toConstr :: WeekDay -> Constr #

dataTypeOf :: WeekDay -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c WeekDay) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c WeekDay) #

gmapT :: (forall b. Data b => b -> b) -> WeekDay -> WeekDay #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WeekDay -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WeekDay -> r #

gmapQ :: (forall d. Data d => d -> u) -> WeekDay -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> WeekDay -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> WeekDay -> m WeekDay #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> WeekDay -> m WeekDay #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> WeekDay -> m WeekDay #

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 InflectionException 
Instance details

Defined in Text.Inflections.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> InflectionException -> c InflectionException #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c InflectionException #

toConstr :: InflectionException -> Constr #

dataTypeOf :: InflectionException -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c InflectionException) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c InflectionException) #

gmapT :: (forall b. Data b => b -> b) -> InflectionException -> InflectionException #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> InflectionException -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> InflectionException -> r #

gmapQ :: (forall d. Data d => d -> u) -> InflectionException -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> InflectionException -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> InflectionException -> m InflectionException #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> InflectionException -> m InflectionException #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> InflectionException -> m InflectionException #

Data IP 
Instance details

Defined in Net.IP

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 Net.IPv4

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 IPv4Range 
Instance details

Defined in Net.IPv4

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IPv4Range -> c IPv4Range #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IPv4Range #

toConstr :: IPv4Range -> Constr #

dataTypeOf :: IPv4Range -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IPv4Range) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IPv4Range) #

gmapT :: (forall b. Data b => b -> b) -> IPv4Range -> IPv4Range #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IPv4Range -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IPv4Range -> r #

gmapQ :: (forall d. Data d => d -> u) -> IPv4Range -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IPv4Range -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IPv4Range -> m IPv4Range #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IPv4Range -> m IPv4Range #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IPv4Range -> m IPv4Range #

Data IPv6 
Instance details

Defined in Net.IPv6

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 IPv6Range 
Instance details

Defined in Net.IPv6

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IPv6Range -> c IPv6Range #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IPv6Range #

toConstr :: IPv6Range -> Constr #

dataTypeOf :: IPv6Range -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IPv6Range) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IPv6Range) #

gmapT :: (forall b. Data b => b -> b) -> IPv6Range -> IPv6Range #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IPv6Range -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IPv6Range -> r #

gmapQ :: (forall d. Data d => d -> u) -> IPv6Range -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IPv6Range -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IPv6Range -> m IPv6Range #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IPv6Range -> m IPv6Range #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IPv6Range -> m IPv6Range #

Data Mac 
Instance details

Defined in Net.Mac

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Mac -> c Mac #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Mac #

toConstr :: Mac -> Constr #

dataTypeOf :: Mac -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Mac) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Mac) #

gmapT :: (forall b. Data b => b -> b) -> Mac -> Mac #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Mac -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Mac -> r #

gmapQ :: (forall d. Data d => d -> u) -> Mac -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Mac -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Mac -> m Mac #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Mac -> m Mac #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Mac -> m Mac #

Data MacCodec 
Instance details

Defined in Net.Mac

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> MacCodec -> c MacCodec #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c MacCodec #

toConstr :: MacCodec -> Constr #

dataTypeOf :: MacCodec -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c MacCodec) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c MacCodec) #

gmapT :: (forall b. Data b => b -> b) -> MacCodec -> MacCodec #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> MacCodec -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> MacCodec -> r #

gmapQ :: (forall d. Data d => d -> u) -> MacCodec -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> MacCodec -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> MacCodec -> m MacCodec #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> MacCodec -> m MacCodec #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> MacCodec -> m MacCodec #

Data MacGrouping 
Instance details

Defined in Net.Mac

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> MacGrouping -> c MacGrouping #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c MacGrouping #

toConstr :: MacGrouping -> Constr #

dataTypeOf :: MacGrouping -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c MacGrouping) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c MacGrouping) #

gmapT :: (forall b. Data b => b -> b) -> MacGrouping -> MacGrouping #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> MacGrouping -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> MacGrouping -> r #

gmapQ :: (forall d. Data d => d -> u) -> MacGrouping -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> MacGrouping -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> MacGrouping -> m MacGrouping #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> MacGrouping -> m MacGrouping #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> MacGrouping -> m MacGrouping #

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 ApiController Source # 
Instance details

Defined in IHP.DataSync.REST.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ApiController -> c ApiController #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ApiController #

toConstr :: ApiController -> Constr #

dataTypeOf :: ApiController -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ApiController) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ApiController) #

gmapT :: (forall b. Data b => b -> b) -> ApiController -> ApiController #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ApiController -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ApiController -> r #

gmapQ :: (forall d. Data d => d -> u) -> ApiController -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ApiController -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ApiController -> m ApiController #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ApiController -> m ApiController #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ApiController -> m ApiController #

Data Sitemap Source # 
Instance details

Defined in IHP.SEO.Sitemap.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Sitemap -> c Sitemap #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Sitemap #

toConstr :: Sitemap -> Constr #

dataTypeOf :: Sitemap -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Sitemap) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Sitemap) #

gmapT :: (forall b. Data b => b -> b) -> Sitemap -> Sitemap #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Sitemap -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Sitemap -> r #

gmapQ :: (forall d. Data d => d -> u) -> Sitemap -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Sitemap -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Sitemap -> m Sitemap #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Sitemap -> m Sitemap #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Sitemap -> m Sitemap #

Data SitemapChangeFrequency Source # 
Instance details

Defined in IHP.SEO.Sitemap.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SitemapChangeFrequency -> c SitemapChangeFrequency #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SitemapChangeFrequency #

toConstr :: SitemapChangeFrequency -> Constr #

dataTypeOf :: SitemapChangeFrequency -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SitemapChangeFrequency) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SitemapChangeFrequency) #

gmapT :: (forall b. Data b => b -> b) -> SitemapChangeFrequency -> SitemapChangeFrequency #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SitemapChangeFrequency -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SitemapChangeFrequency -> r #

gmapQ :: (forall d. Data d => d -> u) -> SitemapChangeFrequency -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SitemapChangeFrequency -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SitemapChangeFrequency -> m SitemapChangeFrequency #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SitemapChangeFrequency -> m SitemapChangeFrequency #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SitemapChangeFrequency -> m SitemapChangeFrequency #

Data SitemapController Source # 
Instance details

Defined in IHP.SEO.Sitemap.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SitemapController -> c SitemapController #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SitemapController #

toConstr :: SitemapController -> Constr #

dataTypeOf :: SitemapController -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SitemapController) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SitemapController) #

gmapT :: (forall b. Data b => b -> b) -> SitemapController -> SitemapController #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SitemapController -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SitemapController -> r #

gmapQ :: (forall d. Data d => d -> u) -> SitemapController -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SitemapController -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SitemapController -> m SitemapController #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SitemapController -> m SitemapController #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SitemapController -> m SitemapController #

Data SitemapLink Source # 
Instance details

Defined in IHP.SEO.Sitemap.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SitemapLink -> c SitemapLink #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SitemapLink #

toConstr :: SitemapLink -> Constr #

dataTypeOf :: SitemapLink -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SitemapLink) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SitemapLink) #

gmapT :: (forall b. Data b => b -> b) -> SitemapLink -> SitemapLink #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SitemapLink -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SitemapLink -> r #

gmapQ :: (forall d. Data d => d -> u) -> SitemapLink -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SitemapLink -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SitemapLink -> m SitemapLink #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SitemapLink -> m SitemapLink #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SitemapLink -> m SitemapLink #

Data WelcomeController Source # 
Instance details

Defined in IHP.Welcome.Controller

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> WelcomeController -> c WelcomeController #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c WelcomeController #

toConstr :: WelcomeController -> Constr #

dataTypeOf :: WelcomeController -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c WelcomeController) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c WelcomeController) #

gmapT :: (forall b. Data b => b -> b) -> WelcomeController -> WelcomeController #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WelcomeController -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WelcomeController -> r #

gmapQ :: (forall d. Data d => d -> u) -> WelcomeController -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> WelcomeController -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> WelcomeController -> m WelcomeController #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> WelcomeController -> m WelcomeController #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> WelcomeController -> m WelcomeController #

Data InvalidPosException 
Instance details

Defined in Text.Megaparsec.Pos

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> InvalidPosException -> c InvalidPosException #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c InvalidPosException #

toConstr :: InvalidPosException -> Constr #

dataTypeOf :: InvalidPosException -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c InvalidPosException) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c InvalidPosException) #

gmapT :: (forall b. Data b => b -> b) -> InvalidPosException -> InvalidPosException #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> InvalidPosException -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> InvalidPosException -> r #

gmapQ :: (forall d. Data d => d -> u) -> InvalidPosException -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> InvalidPosException -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> InvalidPosException -> m InvalidPosException #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> InvalidPosException -> m InvalidPosException #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> InvalidPosException -> m InvalidPosException #

Data Pos 
Instance details

Defined in Text.Megaparsec.Pos

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Pos -> c Pos #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Pos #

toConstr :: Pos -> Constr #

dataTypeOf :: Pos -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Pos) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Pos) #

gmapT :: (forall b. Data b => b -> b) -> Pos -> Pos #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Pos -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Pos -> r #

gmapQ :: (forall d. Data d => d -> u) -> Pos -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Pos -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Pos -> m Pos #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Pos -> m Pos #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Pos -> m Pos #

Data SourcePos 
Instance details

Defined in Text.Megaparsec.Pos

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SourcePos -> c SourcePos #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SourcePos #

toConstr :: SourcePos -> Constr #

dataTypeOf :: SourcePos -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SourcePos) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SourcePos) #

gmapT :: (forall b. Data b => b -> b) -> SourcePos -> SourcePos #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SourcePos -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SourcePos -> r #

gmapQ :: (forall d. Data d => d -> u) -> SourcePos -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SourcePos -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SourcePos -> m SourcePos #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SourcePos -> m SourcePos #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SourcePos -> m SourcePos #

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 SourcePos 
Instance details

Defined in Text.Parsec.Pos

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SourcePos -> c SourcePos #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SourcePos #

toConstr :: SourcePos -> Constr #

dataTypeOf :: SourcePos -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SourcePos) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SourcePos) #

gmapT :: (forall b. Data b => b -> b) -> SourcePos -> SourcePos #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SourcePos -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SourcePos -> r #

gmapQ :: (forall d. Data d => d -> u) -> SourcePos -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SourcePos -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SourcePos -> m SourcePos #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SourcePos -> m SourcePos #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SourcePos -> m SourcePos #

Data Undefined 
Instance details

Defined in Relude.Debug

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Undefined -> c Undefined #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Undefined #

toConstr :: Undefined -> Constr #

dataTypeOf :: Undefined -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Undefined) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Undefined) #

gmapT :: (forall b. Data b => b -> b) -> Undefined -> Undefined #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Undefined -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Undefined -> r #

gmapQ :: (forall d. Data d => d -> u) -> Undefined -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Undefined -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Undefined -> m Undefined #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Undefined -> m Undefined #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Undefined -> m Undefined #

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 SocksError 
Instance details

Defined in Network.Socks5.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SocksError -> c SocksError #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SocksError #

toConstr :: SocksError -> Constr #

dataTypeOf :: SocksError -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SocksError) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SocksError) #

gmapT :: (forall b. Data b => b -> b) -> SocksError -> SocksError #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SocksError -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SocksError -> r #

gmapQ :: (forall d. Data d => d -> u) -> SocksError -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SocksError -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SocksError -> m SocksError #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SocksError -> m SocksError #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SocksError -> m SocksError #

Data SocksReply 
Instance details

Defined in Network.Socks5.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SocksReply -> c SocksReply #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SocksReply #

toConstr :: SocksReply -> Constr #

dataTypeOf :: SocksReply -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SocksReply) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SocksReply) #

gmapT :: (forall b. Data b => b -> b) -> SocksReply -> SocksReply #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SocksReply -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SocksReply -> r #

gmapQ :: (forall d. Data d => d -> u) -> SocksReply -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SocksReply -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SocksReply -> m SocksReply #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SocksReply -> m SocksReply #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SocksReply -> m SocksReply #

Data SocksVersionNotSupported 
Instance details

Defined in Network.Socks5.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SocksVersionNotSupported -> c SocksVersionNotSupported #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SocksVersionNotSupported #

toConstr :: SocksVersionNotSupported -> Constr #

dataTypeOf :: SocksVersionNotSupported -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SocksVersionNotSupported) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SocksVersionNotSupported) #

gmapT :: (forall b. Data b => b -> b) -> SocksVersionNotSupported -> SocksVersionNotSupported #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SocksVersionNotSupported -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SocksVersionNotSupported -> r #

gmapQ :: (forall d. Data d => d -> u) -> SocksVersionNotSupported -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SocksVersionNotSupported -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SocksVersionNotSupported -> m SocksVersionNotSupported #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SocksVersionNotSupported -> m SocksVersionNotSupported #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SocksVersionNotSupported -> m SocksVersionNotSupported #

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 CalendarDiffDays 
Instance details

Defined in Data.Time.Calendar.CalendarDiffDays

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CalendarDiffDays -> c CalendarDiffDays #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CalendarDiffDays #

toConstr :: CalendarDiffDays -> Constr #

dataTypeOf :: CalendarDiffDays -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CalendarDiffDays) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CalendarDiffDays) #

gmapT :: (forall b. Data b => b -> b) -> CalendarDiffDays -> CalendarDiffDays #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CalendarDiffDays -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CalendarDiffDays -> r #

gmapQ :: (forall d. Data d => d -> u) -> CalendarDiffDays -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CalendarDiffDays -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CalendarDiffDays -> m CalendarDiffDays #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CalendarDiffDays -> m CalendarDiffDays #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CalendarDiffDays -> m CalendarDiffDays #

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 DayOfWeek 
Instance details

Defined in Data.Time.Calendar.Week

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DayOfWeek -> c DayOfWeek #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DayOfWeek #

toConstr :: DayOfWeek -> Constr #

dataTypeOf :: DayOfWeek -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DayOfWeek) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DayOfWeek) #

gmapT :: (forall b. Data b => b -> b) -> DayOfWeek -> DayOfWeek #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DayOfWeek -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DayOfWeek -> r #

gmapQ :: (forall d. Data d => d -> u) -> DayOfWeek -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DayOfWeek -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DayOfWeek -> m DayOfWeek #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DayOfWeek -> m DayOfWeek #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DayOfWeek -> m DayOfWeek #

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 SystemTime 
Instance details

Defined in Data.Time.Clock.Internal.SystemTime

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SystemTime -> c SystemTime #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SystemTime #

toConstr :: SystemTime -> Constr #

dataTypeOf :: SystemTime -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SystemTime) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SystemTime) #

gmapT :: (forall b. Data b => b -> b) -> SystemTime -> SystemTime #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SystemTime -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SystemTime -> r #

gmapQ :: (forall d. Data d => d -> u) -> SystemTime -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SystemTime -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SystemTime -> m SystemTime #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SystemTime -> m SystemTime #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SystemTime -> m SystemTime #

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 UniversalTime 
Instance details

Defined in Data.Time.Clock.Internal.UniversalTime

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UniversalTime -> c UniversalTime #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UniversalTime #

toConstr :: UniversalTime -> Constr #

dataTypeOf :: UniversalTime -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UniversalTime) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UniversalTime) #

gmapT :: (forall b. Data b => b -> b) -> UniversalTime -> UniversalTime #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UniversalTime -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UniversalTime -> r #

gmapQ :: (forall d. Data d => d -> u) -> UniversalTime -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UniversalTime -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UniversalTime -> m UniversalTime #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UniversalTime -> m UniversalTime #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UniversalTime -> m UniversalTime #

Data CalendarDiffTime 
Instance details

Defined in Data.Time.LocalTime.Internal.CalendarDiffTime

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CalendarDiffTime -> c CalendarDiffTime #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CalendarDiffTime #

toConstr :: CalendarDiffTime -> Constr #

dataTypeOf :: CalendarDiffTime -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CalendarDiffTime) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CalendarDiffTime) #

gmapT :: (forall b. Data b => b -> b) -> CalendarDiffTime -> CalendarDiffTime #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CalendarDiffTime -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CalendarDiffTime -> r #

gmapQ :: (forall d. Data d => d -> u) -> CalendarDiffTime -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CalendarDiffTime -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CalendarDiffTime -> m CalendarDiffTime #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CalendarDiffTime -> m CalendarDiffTime #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CalendarDiffTime -> m CalendarDiffTime #

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 TimeOfDay 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeOfDay

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TimeOfDay -> c TimeOfDay #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TimeOfDay #

toConstr :: TimeOfDay -> Constr #

dataTypeOf :: TimeOfDay -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TimeOfDay) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TimeOfDay) #

gmapT :: (forall b. Data b => b -> b) -> TimeOfDay -> TimeOfDay #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TimeOfDay -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TimeOfDay -> r #

gmapQ :: (forall d. Data d => d -> u) -> TimeOfDay -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TimeOfDay -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TimeOfDay -> m TimeOfDay #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TimeOfDay -> m TimeOfDay #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TimeOfDay -> m TimeOfDay #

Data TimeZone 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeZone

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TimeZone -> c TimeZone #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TimeZone #

toConstr :: TimeZone -> Constr #

dataTypeOf :: TimeZone -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TimeZone) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TimeZone) #

gmapT :: (forall b. Data b => b -> b) -> TimeZone -> TimeZone #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TimeZone -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TimeZone -> r #

gmapQ :: (forall d. Data d => d -> u) -> TimeZone -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TimeZone -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TimeZone -> m TimeZone #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TimeZone -> m TimeZone #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TimeZone -> m TimeZone #

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 Attosecond 
Instance details

Defined in Data.Time.Units

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Attosecond -> c Attosecond #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Attosecond #

toConstr :: Attosecond -> Constr #

dataTypeOf :: Attosecond -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Attosecond) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Attosecond) #

gmapT :: (forall b. Data b => b -> b) -> Attosecond -> Attosecond #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Attosecond -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Attosecond -> r #

gmapQ :: (forall d. Data d => d -> u) -> Attosecond -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Attosecond -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Attosecond -> m Attosecond #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Attosecond -> m Attosecond #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Attosecond -> m Attosecond #

Data Day 
Instance details

Defined in Data.Time.Units

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 Femtosecond 
Instance details

Defined in Data.Time.Units

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Femtosecond -> c Femtosecond #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Femtosecond #

toConstr :: Femtosecond -> Constr #

dataTypeOf :: Femtosecond -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Femtosecond) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Femtosecond) #

gmapT :: (forall b. Data b => b -> b) -> Femtosecond -> Femtosecond #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Femtosecond -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Femtosecond -> r #

gmapQ :: (forall d. Data d => d -> u) -> Femtosecond -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Femtosecond -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Femtosecond -> m Femtosecond #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Femtosecond -> m Femtosecond #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Femtosecond -> m Femtosecond #

Data Fortnight 
Instance details

Defined in Data.Time.Units

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Fortnight -> c Fortnight #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Fortnight #

toConstr :: Fortnight -> Constr #

dataTypeOf :: Fortnight -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Fortnight) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Fortnight) #

gmapT :: (forall b. Data b => b -> b) -> Fortnight -> Fortnight #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Fortnight -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Fortnight -> r #

gmapQ :: (forall d. Data d => d -> u) -> Fortnight -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Fortnight -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Fortnight -> m Fortnight #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Fortnight -> m Fortnight #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Fortnight -> m Fortnight #

Data Hour 
Instance details

Defined in Data.Time.Units

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Hour -> c Hour #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Hour #

toConstr :: Hour -> Constr #

dataTypeOf :: Hour -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Hour) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Hour) #

gmapT :: (forall b. Data b => b -> b) -> Hour -> Hour #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Hour -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Hour -> r #

gmapQ :: (forall d. Data d => d -> u) -> Hour -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Hour -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Hour -> m Hour #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Hour -> m Hour #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Hour -> m Hour #

Data Microsecond 
Instance details

Defined in Data.Time.Units

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Microsecond -> c Microsecond #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Microsecond #

toConstr :: Microsecond -> Constr #

dataTypeOf :: Microsecond -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Microsecond) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Microsecond) #

gmapT :: (forall b. Data b => b -> b) -> Microsecond -> Microsecond #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Microsecond -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Microsecond -> r #

gmapQ :: (forall d. Data d => d -> u) -> Microsecond -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Microsecond -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Microsecond -> m Microsecond #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Microsecond -> m Microsecond #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Microsecond -> m Microsecond #

Data Millisecond 
Instance details

Defined in Data.Time.Units

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Millisecond -> c Millisecond #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Millisecond #

toConstr :: Millisecond -> Constr #

dataTypeOf :: Millisecond -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Millisecond) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Millisecond) #

gmapT :: (forall b. Data b => b -> b) -> Millisecond -> Millisecond #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Millisecond -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Millisecond -> r #

gmapQ :: (forall d. Data d => d -> u) -> Millisecond -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Millisecond -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Millisecond -> m Millisecond #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Millisecond -> m Millisecond #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Millisecond -> m Millisecond #

Data Minute 
Instance details

Defined in Data.Time.Units

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Minute -> c Minute #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Minute #

toConstr :: Minute -> Constr #

dataTypeOf :: Minute -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Minute) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Minute) #

gmapT :: (forall b. Data b => b -> b) -> Minute -> Minute #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Minute -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Minute -> r #

gmapQ :: (forall d. Data d => d -> u) -> Minute -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Minute -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Minute -> m Minute #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Minute -> m Minute #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Minute -> m Minute #

Data Nanosecond 
Instance details

Defined in Data.Time.Units

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Nanosecond -> c Nanosecond #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Nanosecond #

toConstr :: Nanosecond -> Constr #

dataTypeOf :: Nanosecond -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Nanosecond) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Nanosecond) #

gmapT :: (forall b. Data b => b -> b) -> Nanosecond -> Nanosecond #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Nanosecond -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Nanosecond -> r #

gmapQ :: (forall d. Data d => d -> u) -> Nanosecond -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Nanosecond -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Nanosecond -> m Nanosecond #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Nanosecond -> m Nanosecond #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Nanosecond -> m Nanosecond #

Data Picosecond 
Instance details

Defined in Data.Time.Units

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Picosecond -> c Picosecond #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Picosecond #

toConstr :: Picosecond -> Constr #

dataTypeOf :: Picosecond -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Picosecond) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Picosecond) #

gmapT :: (forall b. Data b => b -> b) -> Picosecond -> Picosecond #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Picosecond -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Picosecond -> r #

gmapQ :: (forall d. Data d => d -> u) -> Picosecond -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Picosecond -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Picosecond -> m Picosecond #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Picosecond -> m Picosecond #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Picosecond -> m Picosecond #

Data Second 
Instance details

Defined in Data.Time.Units

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Second -> c Second #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Second #

toConstr :: Second -> Constr #

dataTypeOf :: Second -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Second) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Second) #

gmapT :: (forall b. Data b => b -> b) -> Second -> Second #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Second -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Second -> r #

gmapQ :: (forall d. Data d => d -> u) -> Second -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Second -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Second -> m Second #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Second -> m Second #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Second -> m Second #

Data Week 
Instance details

Defined in Data.Time.Units

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Week -> c Week #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Week #

toConstr :: Week -> Constr #

dataTypeOf :: Week -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Week) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Week) #

gmapT :: (forall b. Data b => b -> b) -> Week -> Week #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Week -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Week -> r #

gmapQ :: (forall d. Data d => d -> u) -> Week -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Week -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Week -> m Week #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Week -> m Week #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Week -> m Week #

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 Int128 
Instance details

Defined in Data.WideWord.Int128

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Int128 -> c Int128 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Int128 #

toConstr :: Int128 -> Constr #

dataTypeOf :: Int128 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Int128) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Int128) #

gmapT :: (forall b. Data b => b -> b) -> Int128 -> Int128 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Int128 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Int128 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Int128 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Int128 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Int128 -> m Int128 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Int128 -> m Int128 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Int128 -> m Int128 #

Data Word128 
Instance details

Defined in Data.WideWord.Word128

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Word128 -> c Word128 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Word128 #

toConstr :: Word128 -> Constr #

dataTypeOf :: Word128 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Word128) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Word128) #

gmapT :: (forall b. Data b => b -> b) -> Word128 -> Word128 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Word128 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Word128 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Word128 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Word128 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Word128 -> m Word128 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Word128 -> m Word128 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Word128 -> m Word128 #

Data Word256 
Instance details

Defined in Data.WideWord.Word256

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Word256 -> c Word256 #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Word256 #

toConstr :: Word256 -> Constr #

dataTypeOf :: Word256 -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Word256) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Word256) #

gmapT :: (forall b. Data b => b -> b) -> Word256 -> Word256 #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Word256 -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Word256 -> r #

gmapQ :: (forall d. Data d => d -> u) -> Word256 -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Word256 -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Word256 -> m Word256 #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Word256 -> m Word256 #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Word256 -> m Word256 #

Data Document 
Instance details

Defined in Text.XML

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Document -> c Document #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Document #

toConstr :: Document -> Constr #

dataTypeOf :: Document -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Document) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Document) #

gmapT :: (forall b. Data b => b -> b) -> Document -> Document #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Document -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Document -> r #

gmapQ :: (forall d. Data d => d -> u) -> Document -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Document -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Document -> m Document #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Document -> m Document #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Document -> m Document #

Data Element 
Instance details

Defined in Text.XML

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Element -> c Element #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Element #

toConstr :: Element -> Constr #

dataTypeOf :: Element -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Element) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Element) #

gmapT :: (forall b. Data b => b -> b) -> Element -> Element #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Element -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Element -> r #

gmapQ :: (forall d. Data d => d -> u) -> Element -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Element -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Element -> m Element #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Element -> m Element #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Element -> m Element #

Data Node 
Instance details

Defined in Text.XML

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Node -> c Node #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Node #

toConstr :: Node -> Constr #

dataTypeOf :: Node -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Node) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Node) #

gmapT :: (forall b. Data b => b -> b) -> Node -> Node #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Node -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Node -> r #

gmapQ :: (forall d. Data d => d -> u) -> Node -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Node -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Node -> m Node #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Node -> m Node #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Node -> m Node #

Data Content 
Instance details

Defined in Data.XML.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Content -> c Content #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Content #

toConstr :: Content -> Constr #

dataTypeOf :: Content -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Content) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Content) #

gmapT :: (forall b. Data b => b -> b) -> Content -> Content #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Content -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Content -> r #

gmapQ :: (forall d. Data d => d -> u) -> Content -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Content -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Content -> m Content #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Content -> m Content #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Content -> m Content #

Data Doctype 
Instance details

Defined in Data.XML.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Doctype -> c Doctype #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Doctype #

toConstr :: Doctype -> Constr #

dataTypeOf :: Doctype -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Doctype) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Doctype) #

gmapT :: (forall b. Data b => b -> b) -> Doctype -> Doctype #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Doctype -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Doctype -> r #

gmapQ :: (forall d. Data d => d -> u) -> Doctype -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Doctype -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Doctype -> m Doctype #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Doctype -> m Doctype #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Doctype -> m Doctype #

Data Document 
Instance details

Defined in Data.XML.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Document -> c Document #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Document #

toConstr :: Document -> Constr #

dataTypeOf :: Document -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Document) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Document) #

gmapT :: (forall b. Data b => b -> b) -> Document -> Document #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Document -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Document -> r #

gmapQ :: (forall d. Data d => d -> u) -> Document -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Document -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Document -> m Document #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Document -> m Document #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Document -> m Document #

Data Element 
Instance details

Defined in Data.XML.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Element -> c Element #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Element #

toConstr :: Element -> Constr #

dataTypeOf :: Element -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Element) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Element) #

gmapT :: (forall b. Data b => b -> b) -> Element -> Element #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Element -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Element -> r #

gmapQ :: (forall d. Data d => d -> u) -> Element -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Element -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Element -> m Element #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Element -> m Element #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Element -> m Element #

Data Event 
Instance details

Defined in Data.XML.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Event -> c Event #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Event #

toConstr :: Event -> Constr #

dataTypeOf :: Event -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Event) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Event) #

gmapT :: (forall b. Data b => b -> b) -> Event -> Event #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Event -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Event -> r #

gmapQ :: (forall d. Data d => d -> u) -> Event -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Event -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Event -> m Event #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Event -> m Event #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Event -> m Event #

Data ExternalID 
Instance details

Defined in Data.XML.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ExternalID -> c ExternalID #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ExternalID #

toConstr :: ExternalID -> Constr #

dataTypeOf :: ExternalID -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ExternalID) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ExternalID) #

gmapT :: (forall b. Data b => b -> b) -> ExternalID -> ExternalID #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ExternalID -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ExternalID -> r #

gmapQ :: (forall d. Data d => d -> u) -> ExternalID -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ExternalID -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ExternalID -> m ExternalID #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ExternalID -> m ExternalID #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ExternalID -> m ExternalID #

Data Instruction 
Instance details

Defined in Data.XML.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Instruction -> c Instruction #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Instruction #

toConstr :: Instruction -> Constr #

dataTypeOf :: Instruction -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Instruction) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Instruction) #

gmapT :: (forall b. Data b => b -> b) -> Instruction -> Instruction #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Instruction -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Instruction -> r #

gmapQ :: (forall d. Data d => d -> u) -> Instruction -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Instruction -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Instruction -> m Instruction #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Instruction -> m Instruction #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Instruction -> m Instruction #

Data Miscellaneous 
Instance details

Defined in Data.XML.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Miscellaneous -> c Miscellaneous #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Miscellaneous #

toConstr :: Miscellaneous -> Constr #

dataTypeOf :: Miscellaneous -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Miscellaneous) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Miscellaneous) #

gmapT :: (forall b. Data b => b -> b) -> Miscellaneous -> Miscellaneous #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Miscellaneous -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Miscellaneous -> r #

gmapQ :: (forall d. Data d => d -> u) -> Miscellaneous -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Miscellaneous -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Miscellaneous -> m Miscellaneous #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Miscellaneous -> m Miscellaneous #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Miscellaneous -> m Miscellaneous #

Data Name 
Instance details

Defined in Data.XML.Types

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 Node 
Instance details

Defined in Data.XML.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Node -> c Node #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Node #

toConstr :: Node -> Constr #

dataTypeOf :: Node -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Node) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Node) #

gmapT :: (forall b. Data b => b -> b) -> Node -> Node #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Node -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Node -> r #

gmapQ :: (forall d. Data d => d -> u) -> Node -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Node -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Node -> m Node #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Node -> m Node #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Node -> m Node #

Data Prologue 
Instance details

Defined in Data.XML.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Prologue -> c Prologue #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Prologue #

toConstr :: Prologue -> Constr #

dataTypeOf :: Prologue -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Prologue) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Prologue) #

gmapT :: (forall b. Data b => b -> b) -> Prologue -> Prologue #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Prologue -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Prologue -> r #

gmapQ :: (forall d. Data d => d -> u) -> Prologue -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Prologue -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Prologue -> m Prologue #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Prologue -> m Prologue #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Prologue -> m Prologue #

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 a => Data (Only a) 
Instance details

Defined in Data.Tuple.Only

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Only a -> c (Only a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Only a) #

toConstr :: Only a -> Constr #

dataTypeOf :: Only a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Only a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Only a)) #

gmapT :: (forall b. Data b => b -> b) -> Only a -> Only a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Only a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Only a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Only a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Only a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Only a -> m (Only a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Only a -> m (Only a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Only a -> m (Only 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 (Array ty) 
Instance details

Defined in Basement.BoxedArray

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Array ty -> c (Array ty) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Array ty) #

toConstr :: Array ty -> Constr #

dataTypeOf :: Array ty -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Array ty)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Array ty)) #

gmapT :: (forall b. Data b => b -> b) -> Array ty -> Array ty #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Array ty -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Array ty -> r #

gmapQ :: (forall d. Data d => d -> u) -> Array ty -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Array ty -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Array ty -> m (Array ty) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Array ty -> m (Array ty) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Array ty -> m (Array 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) #

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 b => Data (Alt b) 
Instance details

Defined in GHC.Core

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> Alt b -> c (Alt b) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Alt b) #

toConstr :: Alt b -> Constr #

dataTypeOf :: Alt b -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Alt b)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Alt b)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> Alt b -> Alt b #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Alt b -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Alt b -> r #

gmapQ :: (forall d. Data d => d -> u) -> Alt b -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Alt b -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Alt b -> m (Alt b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Alt b -> m (Alt b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Alt b -> m (Alt b) #

Data b => Data (Bind b) 
Instance details

Defined in GHC.Core

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> Bind b -> c (Bind b) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Bind b) #

toConstr :: Bind b -> Constr #

dataTypeOf :: Bind b -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Bind b)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Bind b)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> Bind b -> Bind b #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Bind b -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Bind b -> r #

gmapQ :: (forall d. Data d => d -> u) -> Bind b -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Bind b -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Bind b -> m (Bind b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Bind b -> m (Bind b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Bind b -> m (Bind b) #

Data b => Data (Expr b) 
Instance details

Defined in GHC.Core

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> Expr b -> c (Expr b) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Expr b) #

toConstr :: Expr b -> Constr #

dataTypeOf :: Expr b -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Expr b)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Expr b)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> Expr b -> Expr b #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Expr b -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Expr b -> r #

gmapQ :: (forall d. Data d => d -> u) -> Expr b -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Expr b -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Expr b -> m (Expr b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Expr b -> m (Expr b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Expr b -> m (Expr b) #

Typeable br => Data (CoAxiom br) 
Instance details

Defined in GHC.Core.Coercion.Axiom

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CoAxiom br -> c (CoAxiom br) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (CoAxiom br) #

toConstr :: CoAxiom br -> Constr #

dataTypeOf :: CoAxiom br -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (CoAxiom br)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (CoAxiom br)) #

gmapT :: (forall b. Data b => b -> b) -> CoAxiom br -> CoAxiom br #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CoAxiom br -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CoAxiom br -> r #

gmapQ :: (forall d. Data d => d -> u) -> CoAxiom br -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CoAxiom br -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CoAxiom br -> m (CoAxiom br) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CoAxiom br -> m (CoAxiom br) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CoAxiom br -> m (CoAxiom br) #

Data a => Data (Scaled a) 
Instance details

Defined in GHC.Core.TyCo.Rep

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Scaled a -> c (Scaled a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Scaled a) #

toConstr :: Scaled a -> Constr #

dataTypeOf :: Scaled a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Scaled a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Scaled a)) #

gmapT :: (forall b. Data b => b -> b) -> Scaled a -> Scaled a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Scaled a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Scaled a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Scaled a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Scaled a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Scaled a -> m (Scaled a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Scaled a -> m (Scaled a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Scaled a -> m (Scaled a) #

Data a => Data (Bag a) 
Instance details

Defined in GHC.Data.Bag

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Bag a -> c (Bag a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Bag a) #

toConstr :: Bag a -> Constr #

dataTypeOf :: Bag a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Bag a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Bag a)) #

gmapT :: (forall b. Data b => b -> b) -> Bag a -> Bag a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Bag a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Bag a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Bag a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Bag a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Bag a -> m (Bag a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Bag a -> m (Bag a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Bag a -> m (Bag a) #

(Data (hs_syn GhcTc), Typeable hs_syn) => Data (HsWrap hs_syn) 
Instance details

Defined in GHC.Hs.Expr

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> HsWrap hs_syn -> c (HsWrap hs_syn) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (HsWrap hs_syn) #

toConstr :: HsWrap hs_syn -> Constr #

dataTypeOf :: HsWrap hs_syn -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (HsWrap hs_syn)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (HsWrap hs_syn)) #

gmapT :: (forall b. Data b => b -> b) -> HsWrap hs_syn -> HsWrap hs_syn #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HsWrap hs_syn -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HsWrap hs_syn -> r #

gmapQ :: (forall d. Data d => d -> u) -> HsWrap hs_syn -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> HsWrap hs_syn -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> HsWrap hs_syn -> m (HsWrap hs_syn) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HsWrap hs_syn -> m (HsWrap hs_syn) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HsWrap hs_syn -> m (HsWrap hs_syn) #

Typeable p => Data (GhcPass p) 
Instance details

Defined in GHC.Hs.Extension

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GhcPass p -> c (GhcPass p) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (GhcPass p) #

toConstr :: GhcPass p -> Constr #

dataTypeOf :: GhcPass p -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (GhcPass p)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (GhcPass p)) #

gmapT :: (forall b. Data b => b -> b) -> GhcPass p -> GhcPass p #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GhcPass p -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GhcPass p -> r #

gmapQ :: (forall d. Data d => d -> u) -> GhcPass p -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GhcPass p -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GhcPass p -> m (GhcPass p) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GhcPass p -> m (GhcPass p) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GhcPass p -> m (GhcPass p) #

Data ann => Data (EpAnn ann) 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> EpAnn ann -> c (EpAnn ann) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (EpAnn ann) #

toConstr :: EpAnn ann -> Constr #

dataTypeOf :: EpAnn ann -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (EpAnn ann)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (EpAnn ann)) #

gmapT :: (forall b. Data b => b -> b) -> EpAnn ann -> EpAnn ann #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> EpAnn ann -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> EpAnn ann -> r #

gmapQ :: (forall d. Data d => d -> u) -> EpAnn ann -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> EpAnn ann -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> EpAnn ann -> m (EpAnn ann) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> EpAnn ann -> m (EpAnn ann) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> EpAnn ann -> m (EpAnn ann) #

Data a => Data (SrcSpanAnn' a) 
Instance details

Defined in GHC.Parser.Annotation

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SrcSpanAnn' a -> c (SrcSpanAnn' a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (SrcSpanAnn' a) #

toConstr :: SrcSpanAnn' a -> Constr #

dataTypeOf :: SrcSpanAnn' a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (SrcSpanAnn' a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (SrcSpanAnn' a)) #

gmapT :: (forall b. Data b => b -> b) -> SrcSpanAnn' a -> SrcSpanAnn' a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SrcSpanAnn' a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SrcSpanAnn' a -> r #

gmapQ :: (forall d. Data d => d -> u) -> SrcSpanAnn' a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SrcSpanAnn' a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SrcSpanAnn' a -> m (SrcSpanAnn' a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SrcSpanAnn' a -> m (SrcSpanAnn' a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SrcSpanAnn' a -> m (SrcSpanAnn' a) #

Data tc => Data (TyConFlavour tc) 
Instance details

Defined in GHC.Types.Basic

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TyConFlavour tc -> c (TyConFlavour tc) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (TyConFlavour tc) #

toConstr :: TyConFlavour tc -> Constr #

dataTypeOf :: TyConFlavour tc -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (TyConFlavour tc)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (TyConFlavour tc)) #

gmapT :: (forall b. Data b => b -> b) -> TyConFlavour tc -> TyConFlavour tc #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TyConFlavour tc -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TyConFlavour tc -> r #

gmapQ :: (forall d. Data d => d -> u) -> TyConFlavour tc -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TyConFlavour tc -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TyConFlavour tc -> m (TyConFlavour tc) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TyConFlavour tc -> m (TyConFlavour tc) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TyConFlavour tc -> m (TyConFlavour tc) #

Data info => Data (GlobalRdrEltX info) 
Instance details

Defined in GHC.Types.Name.Reader

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GlobalRdrEltX info -> c (GlobalRdrEltX info) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (GlobalRdrEltX info) #

toConstr :: GlobalRdrEltX info -> Constr #

dataTypeOf :: GlobalRdrEltX info -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (GlobalRdrEltX info)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (GlobalRdrEltX info)) #

gmapT :: (forall b. Data b => b -> b) -> GlobalRdrEltX info -> GlobalRdrEltX info #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GlobalRdrEltX info -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GlobalRdrEltX info -> r #

gmapQ :: (forall d. Data d => d -> u) -> GlobalRdrEltX info -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GlobalRdrEltX info -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GlobalRdrEltX info -> m (GlobalRdrEltX info) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GlobalRdrEltX info -> m (GlobalRdrEltX info) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GlobalRdrEltX info -> m (GlobalRdrEltX info) #

Data (GenTickish 'TickishPassCmm) 
Instance details

Defined in GHC.Types.Tickish

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GenTickish 'TickishPassCmm -> c (GenTickish 'TickishPassCmm) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (GenTickish 'TickishPassCmm) #

toConstr :: GenTickish 'TickishPassCmm -> Constr #

dataTypeOf :: GenTickish 'TickishPassCmm -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (GenTickish 'TickishPassCmm)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (GenTickish 'TickishPassCmm)) #

gmapT :: (forall b. Data b => b -> b) -> GenTickish 'TickishPassCmm -> GenTickish 'TickishPassCmm #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GenTickish 'TickishPassCmm -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GenTickish 'TickishPassCmm -> r #

gmapQ :: (forall d. Data d => d -> u) -> GenTickish 'TickishPassCmm -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GenTickish 'TickishPassCmm -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GenTickish 'TickishPassCmm -> m (GenTickish 'TickishPassCmm) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GenTickish 'TickishPassCmm -> m (GenTickish 'TickishPassCmm) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GenTickish 'TickishPassCmm -> m (GenTickish 'TickishPassCmm) #

Data (GenTickish 'TickishPassCore) 
Instance details

Defined in GHC.Types.Tickish

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GenTickish 'TickishPassCore -> c (GenTickish 'TickishPassCore) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (GenTickish 'TickishPassCore) #

toConstr :: GenTickish 'TickishPassCore -> Constr #

dataTypeOf :: GenTickish 'TickishPassCore -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (GenTickish 'TickishPassCore)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (GenTickish 'TickishPassCore)) #

gmapT :: (forall b. Data b => b -> b) -> GenTickish 'TickishPassCore -> GenTickish 'TickishPassCore #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GenTickish 'TickishPassCore -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GenTickish 'TickishPassCore -> r #

gmapQ :: (forall d. Data d => d -> u) -> GenTickish 'TickishPassCore -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GenTickish 'TickishPassCore -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GenTickish 'TickishPassCore -> m (GenTickish 'TickishPassCore) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GenTickish 'TickishPassCore -> m (GenTickish 'TickishPassCore) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GenTickish 'TickishPassCore -> m (GenTickish 'TickishPassCore) #

Data (GenTickish 'TickishPassStg) 
Instance details

Defined in GHC.Types.Tickish

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GenTickish 'TickishPassStg -> c (GenTickish 'TickishPassStg) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (GenTickish 'TickishPassStg) #

toConstr :: GenTickish 'TickishPassStg -> Constr #

dataTypeOf :: GenTickish 'TickishPassStg -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (GenTickish 'TickishPassStg)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (GenTickish 'TickishPassStg)) #

gmapT :: (forall b. Data b => b -> b) -> GenTickish 'TickishPassStg -> GenTickish 'TickishPassStg #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GenTickish 'TickishPassStg -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GenTickish 'TickishPassStg -> r #

gmapQ :: (forall d. Data d => d -> u) -> GenTickish 'TickishPassStg -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GenTickish 'TickishPassStg -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GenTickish 'TickishPassStg -> m (GenTickish 'TickishPassStg) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GenTickish 'TickishPassStg -> m (GenTickish 'TickishPassStg) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GenTickish 'TickishPassStg -> m (GenTickish 'TickishPassStg) #

(Data pass, Data (IdP pass)) => Data (WarningTxt pass) 
Instance details

Defined in GHC.Unit.Module.Warnings

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> WarningTxt pass -> c (WarningTxt pass) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (WarningTxt pass) #

toConstr :: WarningTxt pass -> Constr #

dataTypeOf :: WarningTxt pass -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (WarningTxt pass)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (WarningTxt pass)) #

gmapT :: (forall b. Data b => b -> b) -> WarningTxt pass -> WarningTxt pass #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WarningTxt pass -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WarningTxt pass -> r #

gmapQ :: (forall d. Data d => d -> u) -> WarningTxt pass -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> WarningTxt pass -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> WarningTxt pass -> m (WarningTxt pass) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> WarningTxt pass -> m (WarningTxt pass) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> WarningTxt pass -> m (WarningTxt pass) #

Data unit => Data (GenModule unit) 
Instance details

Defined in GHC.Unit.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GenModule unit -> c (GenModule unit) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (GenModule unit) #

toConstr :: GenModule unit -> Constr #

dataTypeOf :: GenModule unit -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (GenModule unit)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (GenModule unit)) #

gmapT :: (forall b. Data b => b -> b) -> GenModule unit -> GenModule unit #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GenModule unit -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GenModule unit -> r #

gmapQ :: (forall d. Data d => d -> u) -> GenModule unit -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GenModule unit -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GenModule unit -> m (GenModule unit) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GenModule unit -> m (GenModule unit) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GenModule unit -> m (GenModule unit) #

Typeable p => Data (LayoutInfo (GhcPass p)) 
Instance details

Defined in GHC.Hs.Extension

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LayoutInfo (GhcPass p) -> c (LayoutInfo (GhcPass p)) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (LayoutInfo (GhcPass p)) #

toConstr :: LayoutInfo (GhcPass p) -> Constr #

dataTypeOf :: LayoutInfo (GhcPass p) -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (LayoutInfo (GhcPass p))) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (LayoutInfo (GhcPass p))) #

gmapT :: (forall b. Data b => b -> b) -> LayoutInfo (GhcPass p) -> LayoutInfo (GhcPass p) #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LayoutInfo (GhcPass p) -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LayoutInfo (GhcPass p) -> r #

gmapQ :: (forall d. Data d => d -> u) -> LayoutInfo (GhcPass p) -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> LayoutInfo (GhcPass p) -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> LayoutInfo (GhcPass p) -> m (LayoutInfo (GhcPass p)) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LayoutInfo (GhcPass p) -> m (LayoutInfo (GhcPass p)) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LayoutInfo (GhcPass p) -> m (LayoutInfo (GhcPass p)) #

Data a => Data (DataDefnCons a) 
Instance details

Defined in Language.Haskell.Syntax.Decls

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DataDefnCons a -> c (DataDefnCons a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (DataDefnCons a) #

toConstr :: DataDefnCons a -> Constr #

dataTypeOf :: DataDefnCons a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (DataDefnCons a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (DataDefnCons a)) #

gmapT :: (forall b. Data b => b -> b) -> DataDefnCons a -> DataDefnCons a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DataDefnCons a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DataDefnCons a -> r #

gmapQ :: (forall d. Data d => d -> u) -> DataDefnCons a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DataDefnCons a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DataDefnCons a -> m (DataDefnCons a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DataDefnCons a -> m (DataDefnCons a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DataDefnCons a -> m (DataDefnCons a) #

(Data pass, Data (IdP pass)) => Data (DocDecl pass) 
Instance details

Defined in Language.Haskell.Syntax.Decls

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DocDecl pass -> c (DocDecl pass) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (DocDecl pass) #

toConstr :: DocDecl pass -> Constr #

dataTypeOf :: DocDecl pass -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (DocDecl pass)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (DocDecl pass)) #

gmapT :: (forall b. Data b => b -> b) -> DocDecl pass -> DocDecl pass #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DocDecl pass -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DocDecl pass -> r #

gmapQ :: (forall d. Data d => d -> u) -> DocDecl pass -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DocDecl pass -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DocDecl pass -> m (DocDecl pass) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DocDecl pass -> m (DocDecl pass) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DocDecl pass -> m (DocDecl pass) #

Data a => Data (ListOf a) 
Instance details

Defined in Language.Haskell.Exts.Parser

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ListOf a -> c (ListOf a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ListOf a) #

toConstr :: ListOf a -> Constr #

dataTypeOf :: ListOf a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (ListOf a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ListOf a)) #

gmapT :: (forall b. Data b => b -> b) -> ListOf a -> ListOf a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ListOf a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ListOf a -> r #

gmapQ :: (forall d. Data d => d -> u) -> ListOf a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ListOf a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ListOf a -> m (ListOf a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ListOf a -> m (ListOf a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ListOf a -> m (ListOf a) #

Data l => Data (ModuleHeadAndImports l) 
Instance details

Defined in Language.Haskell.Exts.Parser

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ModuleHeadAndImports l -> c (ModuleHeadAndImports l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ModuleHeadAndImports l) #

toConstr :: ModuleHeadAndImports l -> Constr #

dataTypeOf :: ModuleHeadAndImports l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (ModuleHeadAndImports l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ModuleHeadAndImports l)) #

gmapT :: (forall b. Data b => b -> b) -> ModuleHeadAndImports l -> ModuleHeadAndImports l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ModuleHeadAndImports l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ModuleHeadAndImports l -> r #

gmapQ :: (forall d. Data d => d -> u) -> ModuleHeadAndImports l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ModuleHeadAndImports l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ModuleHeadAndImports l -> m (ModuleHeadAndImports l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ModuleHeadAndImports l -> m (ModuleHeadAndImports l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ModuleHeadAndImports l -> m (ModuleHeadAndImports l) #

Data a => Data (NonGreedy a) 
Instance details

Defined in Language.Haskell.Exts.Parser

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NonGreedy a -> c (NonGreedy a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (NonGreedy a) #

toConstr :: NonGreedy a -> Constr #

dataTypeOf :: NonGreedy a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (NonGreedy a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (NonGreedy a)) #

gmapT :: (forall b. Data b => b -> b) -> NonGreedy a -> NonGreedy a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NonGreedy a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NonGreedy a -> r #

gmapQ :: (forall d. Data d => d -> u) -> NonGreedy a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> NonGreedy a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NonGreedy a -> m (NonGreedy a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NonGreedy a -> m (NonGreedy a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NonGreedy a -> m (NonGreedy a) #

Data l => Data (PragmasAndModuleHead l) 
Instance details

Defined in Language.Haskell.Exts.Parser

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PragmasAndModuleHead l -> c (PragmasAndModuleHead l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (PragmasAndModuleHead l) #

toConstr :: PragmasAndModuleHead l -> Constr #

dataTypeOf :: PragmasAndModuleHead l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (PragmasAndModuleHead l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (PragmasAndModuleHead l)) #

gmapT :: (forall b. Data b => b -> b) -> PragmasAndModuleHead l -> PragmasAndModuleHead l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PragmasAndModuleHead l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PragmasAndModuleHead l -> r #

gmapQ :: (forall d. Data d => d -> u) -> PragmasAndModuleHead l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PragmasAndModuleHead l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PragmasAndModuleHead l -> m (PragmasAndModuleHead l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PragmasAndModuleHead l -> m (PragmasAndModuleHead l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PragmasAndModuleHead l -> m (PragmasAndModuleHead l) #

Data l => Data (PragmasAndModuleName l) 
Instance details

Defined in Language.Haskell.Exts.Parser

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PragmasAndModuleName l -> c (PragmasAndModuleName l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (PragmasAndModuleName l) #

toConstr :: PragmasAndModuleName l -> Constr #

dataTypeOf :: PragmasAndModuleName l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (PragmasAndModuleName l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (PragmasAndModuleName l)) #

gmapT :: (forall b. Data b => b -> b) -> PragmasAndModuleName l -> PragmasAndModuleName l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PragmasAndModuleName l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PragmasAndModuleName l -> r #

gmapQ :: (forall d. Data d => d -> u) -> PragmasAndModuleName l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PragmasAndModuleName l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PragmasAndModuleName l -> m (PragmasAndModuleName l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PragmasAndModuleName l -> m (PragmasAndModuleName l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PragmasAndModuleName l -> m (PragmasAndModuleName l) #

Data l => Data (Activation l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Activation l -> c (Activation l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Activation l) #

toConstr :: Activation l -> Constr #

dataTypeOf :: Activation l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Activation l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Activation l)) #

gmapT :: (forall b. Data b => b -> b) -> Activation l -> Activation l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Activation l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Activation l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Activation l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Activation l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Activation l -> m (Activation l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Activation l -> m (Activation l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Activation l -> m (Activation l) #

Data l => Data (Alt l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Alt l -> c (Alt l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Alt l) #

toConstr :: Alt l -> Constr #

dataTypeOf :: Alt l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Alt l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Alt l)) #

gmapT :: (forall b. Data b => b -> b) -> Alt l -> Alt l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Alt l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Alt l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Alt l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Alt l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Alt l -> m (Alt l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Alt l -> m (Alt l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Alt l -> m (Alt l) #

Data l => Data (Annotation l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Annotation l -> c (Annotation l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Annotation l) #

toConstr :: Annotation l -> Constr #

dataTypeOf :: Annotation l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Annotation l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Annotation l)) #

gmapT :: (forall b. Data b => b -> b) -> Annotation l -> Annotation l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Annotation l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Annotation l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Annotation l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Annotation l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Annotation l -> m (Annotation l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Annotation l -> m (Annotation l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Annotation l -> m (Annotation l) #

Data l => Data (Assoc l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Assoc l -> c (Assoc l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Assoc l) #

toConstr :: Assoc l -> Constr #

dataTypeOf :: Assoc l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Assoc l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Assoc l)) #

gmapT :: (forall b. Data b => b -> b) -> Assoc l -> Assoc l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Assoc l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Assoc l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Assoc l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Assoc l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Assoc l -> m (Assoc l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Assoc l -> m (Assoc l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Assoc l -> m (Assoc l) #

Data l => Data (Asst l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Asst l -> c (Asst l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Asst l) #

toConstr :: Asst l -> Constr #

dataTypeOf :: Asst l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Asst l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Asst l)) #

gmapT :: (forall b. Data b => b -> b) -> Asst l -> Asst l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Asst l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Asst l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Asst l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Asst l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Asst l -> m (Asst l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Asst l -> m (Asst l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Asst l -> m (Asst l) #

Data l => Data (BangType l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BangType l -> c (BangType l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (BangType l) #

toConstr :: BangType l -> Constr #

dataTypeOf :: BangType l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (BangType l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (BangType l)) #

gmapT :: (forall b. Data b => b -> b) -> BangType l -> BangType l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BangType l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BangType l -> r #

gmapQ :: (forall d. Data d => d -> u) -> BangType l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BangType l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BangType l -> m (BangType l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BangType l -> m (BangType l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BangType l -> m (BangType l) #

Data l => Data (Binds l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Binds l -> c (Binds l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Binds l) #

toConstr :: Binds l -> Constr #

dataTypeOf :: Binds l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Binds l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Binds l)) #

gmapT :: (forall b. Data b => b -> b) -> Binds l -> Binds l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Binds l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Binds l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Binds l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Binds l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Binds l -> m (Binds l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Binds l -> m (Binds l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Binds l -> m (Binds l) #

Data l => Data (BooleanFormula l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BooleanFormula l -> c (BooleanFormula l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (BooleanFormula l) #

toConstr :: BooleanFormula l -> Constr #

dataTypeOf :: BooleanFormula l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (BooleanFormula l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (BooleanFormula l)) #

gmapT :: (forall b. Data b => b -> b) -> BooleanFormula l -> BooleanFormula l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BooleanFormula l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BooleanFormula l -> r #

gmapQ :: (forall d. Data d => d -> u) -> BooleanFormula l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BooleanFormula l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BooleanFormula l -> m (BooleanFormula l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BooleanFormula l -> m (BooleanFormula l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BooleanFormula l -> m (BooleanFormula l) #

Data l => Data (Bracket l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Bracket l -> c (Bracket l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Bracket l) #

toConstr :: Bracket l -> Constr #

dataTypeOf :: Bracket l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Bracket l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Bracket l)) #

gmapT :: (forall b. Data b => b -> b) -> Bracket l -> Bracket l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Bracket l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Bracket l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Bracket l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Bracket l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Bracket l -> m (Bracket l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Bracket l -> m (Bracket l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Bracket l -> m (Bracket l) #

Data l => Data (CName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CName l -> c (CName l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (CName l) #

toConstr :: CName l -> Constr #

dataTypeOf :: CName l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (CName l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (CName l)) #

gmapT :: (forall b. Data b => b -> b) -> CName l -> CName l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CName l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CName l -> r #

gmapQ :: (forall d. Data d => d -> u) -> CName l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CName l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CName l -> m (CName l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CName l -> m (CName l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CName l -> m (CName l) #

Data l => Data (CallConv l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CallConv l -> c (CallConv l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (CallConv l) #

toConstr :: CallConv l -> Constr #

dataTypeOf :: CallConv l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (CallConv l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (CallConv l)) #

gmapT :: (forall b. Data b => b -> b) -> CallConv l -> CallConv l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CallConv l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CallConv l -> r #

gmapQ :: (forall d. Data d => d -> u) -> CallConv l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CallConv l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CallConv l -> m (CallConv l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CallConv l -> m (CallConv l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CallConv l -> m (CallConv l) #

Data l => Data (ClassDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ClassDecl l -> c (ClassDecl l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ClassDecl l) #

toConstr :: ClassDecl l -> Constr #

dataTypeOf :: ClassDecl l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (ClassDecl l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ClassDecl l)) #

gmapT :: (forall b. Data b => b -> b) -> ClassDecl l -> ClassDecl l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ClassDecl l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ClassDecl l -> r #

gmapQ :: (forall d. Data d => d -> u) -> ClassDecl l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ClassDecl l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ClassDecl l -> m (ClassDecl l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ClassDecl l -> m (ClassDecl l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ClassDecl l -> m (ClassDecl l) #

Data l => Data (ConDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ConDecl l -> c (ConDecl l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ConDecl l) #

toConstr :: ConDecl l -> Constr #

dataTypeOf :: ConDecl l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (ConDecl l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ConDecl l)) #

gmapT :: (forall b. Data b => b -> b) -> ConDecl l -> ConDecl l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ConDecl l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ConDecl l -> r #

gmapQ :: (forall d. Data d => d -> u) -> ConDecl l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ConDecl l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ConDecl l -> m (ConDecl l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ConDecl l -> m (ConDecl l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ConDecl l -> m (ConDecl l) #

Data l => Data (Context l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Context l -> c (Context l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Context l) #

toConstr :: Context l -> Constr #

dataTypeOf :: Context l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Context l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Context l)) #

gmapT :: (forall b. Data b => b -> b) -> Context l -> Context l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Context l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Context l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Context l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Context l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Context l -> m (Context l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Context l -> m (Context l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Context l -> m (Context l) #

Data l => Data (DataOrNew l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DataOrNew l -> c (DataOrNew l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (DataOrNew l) #

toConstr :: DataOrNew l -> Constr #

dataTypeOf :: DataOrNew l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (DataOrNew l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (DataOrNew l)) #

gmapT :: (forall b. Data b => b -> b) -> DataOrNew l -> DataOrNew l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DataOrNew l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DataOrNew l -> r #

gmapQ :: (forall d. Data d => d -> u) -> DataOrNew l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DataOrNew l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DataOrNew l -> m (DataOrNew l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DataOrNew l -> m (DataOrNew l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DataOrNew l -> m (DataOrNew l) #

Data l => Data (Decl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Decl l -> c (Decl l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Decl l) #

toConstr :: Decl l -> Constr #

dataTypeOf :: Decl l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Decl l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Decl l)) #

gmapT :: (forall b. Data b => b -> b) -> Decl l -> Decl l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Decl l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Decl l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Decl l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Decl l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Decl l -> m (Decl l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Decl l -> m (Decl l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Decl l -> m (Decl l) #

Data l => Data (DeclHead l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DeclHead l -> c (DeclHead l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (DeclHead l) #

toConstr :: DeclHead l -> Constr #

dataTypeOf :: DeclHead l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (DeclHead l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (DeclHead l)) #

gmapT :: (forall b. Data b => b -> b) -> DeclHead l -> DeclHead l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DeclHead l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DeclHead l -> r #

gmapQ :: (forall d. Data d => d -> u) -> DeclHead l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DeclHead l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DeclHead l -> m (DeclHead l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DeclHead l -> m (DeclHead l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DeclHead l -> m (DeclHead l) #

Data l => Data (DerivStrategy l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DerivStrategy l -> c (DerivStrategy l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (DerivStrategy l) #

toConstr :: DerivStrategy l -> Constr #

dataTypeOf :: DerivStrategy l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (DerivStrategy l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (DerivStrategy l)) #

gmapT :: (forall b. Data b => b -> b) -> DerivStrategy l -> DerivStrategy l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DerivStrategy l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DerivStrategy l -> r #

gmapQ :: (forall d. Data d => d -> u) -> DerivStrategy l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DerivStrategy l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DerivStrategy l -> m (DerivStrategy l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DerivStrategy l -> m (DerivStrategy l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DerivStrategy l -> m (DerivStrategy l) #

Data l => Data (Deriving l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Deriving l -> c (Deriving l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Deriving l) #

toConstr :: Deriving l -> Constr #

dataTypeOf :: Deriving l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Deriving l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Deriving l)) #

gmapT :: (forall b. Data b => b -> b) -> Deriving l -> Deriving l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Deriving l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Deriving l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Deriving l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Deriving l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Deriving l -> m (Deriving l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Deriving l -> m (Deriving l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Deriving l -> m (Deriving l) #

Data l => Data (EWildcard l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> EWildcard l -> c (EWildcard l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (EWildcard l) #

toConstr :: EWildcard l -> Constr #

dataTypeOf :: EWildcard l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (EWildcard l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (EWildcard l)) #

gmapT :: (forall b. Data b => b -> b) -> EWildcard l -> EWildcard l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> EWildcard l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> EWildcard l -> r #

gmapQ :: (forall d. Data d => d -> u) -> EWildcard l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> EWildcard l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> EWildcard l -> m (EWildcard l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> EWildcard l -> m (EWildcard l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> EWildcard l -> m (EWildcard l) #

Data l => Data (Exp l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Exp l -> c (Exp l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Exp l) #

toConstr :: Exp l -> Constr #

dataTypeOf :: Exp l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Exp l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Exp l)) #

gmapT :: (forall b. Data b => b -> b) -> Exp l -> Exp l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Exp l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Exp l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Exp l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Exp l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Exp l -> m (Exp l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Exp l -> m (Exp l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Exp l -> m (Exp l) #

Data l => Data (ExportSpec l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ExportSpec l -> c (ExportSpec l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ExportSpec l) #

toConstr :: ExportSpec l -> Constr #

dataTypeOf :: ExportSpec l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (ExportSpec l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ExportSpec l)) #

gmapT :: (forall b. Data b => b -> b) -> ExportSpec l -> ExportSpec l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ExportSpec l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ExportSpec l -> r #

gmapQ :: (forall d. Data d => d -> u) -> ExportSpec l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ExportSpec l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ExportSpec l -> m (ExportSpec l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ExportSpec l -> m (ExportSpec l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ExportSpec l -> m (ExportSpec l) #

Data l => Data (ExportSpecList l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ExportSpecList l -> c (ExportSpecList l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ExportSpecList l) #

toConstr :: ExportSpecList l -> Constr #

dataTypeOf :: ExportSpecList l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (ExportSpecList l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ExportSpecList l)) #

gmapT :: (forall b. Data b => b -> b) -> ExportSpecList l -> ExportSpecList l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ExportSpecList l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ExportSpecList l -> r #

gmapQ :: (forall d. Data d => d -> u) -> ExportSpecList l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ExportSpecList l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ExportSpecList l -> m (ExportSpecList l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ExportSpecList l -> m (ExportSpecList l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ExportSpecList l -> m (ExportSpecList l) #

Data l => Data (FieldDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FieldDecl l -> c (FieldDecl l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (FieldDecl l) #

toConstr :: FieldDecl l -> Constr #

dataTypeOf :: FieldDecl l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (FieldDecl l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (FieldDecl l)) #

gmapT :: (forall b. Data b => b -> b) -> FieldDecl l -> FieldDecl l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FieldDecl l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FieldDecl l -> r #

gmapQ :: (forall d. Data d => d -> u) -> FieldDecl l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FieldDecl l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FieldDecl l -> m (FieldDecl l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FieldDecl l -> m (FieldDecl l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FieldDecl l -> m (FieldDecl l) #

Data l => Data (FieldUpdate l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FieldUpdate l -> c (FieldUpdate l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (FieldUpdate l) #

toConstr :: FieldUpdate l -> Constr #

dataTypeOf :: FieldUpdate l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (FieldUpdate l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (FieldUpdate l)) #

gmapT :: (forall b. Data b => b -> b) -> FieldUpdate l -> FieldUpdate l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FieldUpdate l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FieldUpdate l -> r #

gmapQ :: (forall d. Data d => d -> u) -> FieldUpdate l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FieldUpdate l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FieldUpdate l -> m (FieldUpdate l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FieldUpdate l -> m (FieldUpdate l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FieldUpdate l -> m (FieldUpdate l) #

Data l => Data (FunDep l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FunDep l -> c (FunDep l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (FunDep l) #

toConstr :: FunDep l -> Constr #

dataTypeOf :: FunDep l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (FunDep l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (FunDep l)) #

gmapT :: (forall b. Data b => b -> b) -> FunDep l -> FunDep l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FunDep l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FunDep l -> r #

gmapQ :: (forall d. Data d => d -> u) -> FunDep l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FunDep l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FunDep l -> m (FunDep l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FunDep l -> m (FunDep l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FunDep l -> m (FunDep l) #

Data l => Data (GadtDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GadtDecl l -> c (GadtDecl l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (GadtDecl l) #

toConstr :: GadtDecl l -> Constr #

dataTypeOf :: GadtDecl l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (GadtDecl l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (GadtDecl l)) #

gmapT :: (forall b. Data b => b -> b) -> GadtDecl l -> GadtDecl l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GadtDecl l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GadtDecl l -> r #

gmapQ :: (forall d. Data d => d -> u) -> GadtDecl l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GadtDecl l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GadtDecl l -> m (GadtDecl l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GadtDecl l -> m (GadtDecl l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GadtDecl l -> m (GadtDecl l) #

Data l => Data (GuardedRhs l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GuardedRhs l -> c (GuardedRhs l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (GuardedRhs l) #

toConstr :: GuardedRhs l -> Constr #

dataTypeOf :: GuardedRhs l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (GuardedRhs l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (GuardedRhs l)) #

gmapT :: (forall b. Data b => b -> b) -> GuardedRhs l -> GuardedRhs l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GuardedRhs l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GuardedRhs l -> r #

gmapQ :: (forall d. Data d => d -> u) -> GuardedRhs l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GuardedRhs l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GuardedRhs l -> m (GuardedRhs l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GuardedRhs l -> m (GuardedRhs l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GuardedRhs l -> m (GuardedRhs l) #

Data l => Data (IPBind l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IPBind l -> c (IPBind l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (IPBind l) #

toConstr :: IPBind l -> Constr #

dataTypeOf :: IPBind l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (IPBind l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (IPBind l)) #

gmapT :: (forall b. Data b => b -> b) -> IPBind l -> IPBind l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IPBind l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IPBind l -> r #

gmapQ :: (forall d. Data d => d -> u) -> IPBind l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IPBind l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IPBind l -> m (IPBind l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IPBind l -> m (IPBind l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IPBind l -> m (IPBind l) #

Data l => Data (IPName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IPName l -> c (IPName l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (IPName l) #

toConstr :: IPName l -> Constr #

dataTypeOf :: IPName l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (IPName l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (IPName l)) #

gmapT :: (forall b. Data b => b -> b) -> IPName l -> IPName l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IPName l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IPName l -> r #

gmapQ :: (forall d. Data d => d -> u) -> IPName l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IPName l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IPName l -> m (IPName l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IPName l -> m (IPName l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IPName l -> m (IPName l) #

Data l => Data (ImportDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ImportDecl l -> c (ImportDecl l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ImportDecl l) #

toConstr :: ImportDecl l -> Constr #

dataTypeOf :: ImportDecl l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (ImportDecl l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ImportDecl l)) #

gmapT :: (forall b. Data b => b -> b) -> ImportDecl l -> ImportDecl l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ImportDecl l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ImportDecl l -> r #

gmapQ :: (forall d. Data d => d -> u) -> ImportDecl l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ImportDecl l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ImportDecl l -> m (ImportDecl l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ImportDecl l -> m (ImportDecl l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ImportDecl l -> m (ImportDecl l) #

Data l => Data (ImportSpec l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ImportSpec l -> c (ImportSpec l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ImportSpec l) #

toConstr :: ImportSpec l -> Constr #

dataTypeOf :: ImportSpec l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (ImportSpec l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ImportSpec l)) #

gmapT :: (forall b. Data b => b -> b) -> ImportSpec l -> ImportSpec l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ImportSpec l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ImportSpec l -> r #

gmapQ :: (forall d. Data d => d -> u) -> ImportSpec l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ImportSpec l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ImportSpec l -> m (ImportSpec l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ImportSpec l -> m (ImportSpec l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ImportSpec l -> m (ImportSpec l) #

Data l => Data (ImportSpecList l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ImportSpecList l -> c (ImportSpecList l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ImportSpecList l) #

toConstr :: ImportSpecList l -> Constr #

dataTypeOf :: ImportSpecList l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (ImportSpecList l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ImportSpecList l)) #

gmapT :: (forall b. Data b => b -> b) -> ImportSpecList l -> ImportSpecList l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ImportSpecList l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ImportSpecList l -> r #

gmapQ :: (forall d. Data d => d -> u) -> ImportSpecList l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ImportSpecList l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ImportSpecList l -> m (ImportSpecList l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ImportSpecList l -> m (ImportSpecList l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ImportSpecList l -> m (ImportSpecList l) #

Data l => Data (InjectivityInfo l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> InjectivityInfo l -> c (InjectivityInfo l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (InjectivityInfo l) #

toConstr :: InjectivityInfo l -> Constr #

dataTypeOf :: InjectivityInfo l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (InjectivityInfo l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (InjectivityInfo l)) #

gmapT :: (forall b. Data b => b -> b) -> InjectivityInfo l -> InjectivityInfo l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> InjectivityInfo l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> InjectivityInfo l -> r #

gmapQ :: (forall d. Data d => d -> u) -> InjectivityInfo l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> InjectivityInfo l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> InjectivityInfo l -> m (InjectivityInfo l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> InjectivityInfo l -> m (InjectivityInfo l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> InjectivityInfo l -> m (InjectivityInfo l) #

Data l => Data (InstDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> InstDecl l -> c (InstDecl l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (InstDecl l) #

toConstr :: InstDecl l -> Constr #

dataTypeOf :: InstDecl l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (InstDecl l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (InstDecl l)) #

gmapT :: (forall b. Data b => b -> b) -> InstDecl l -> InstDecl l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> InstDecl l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> InstDecl l -> r #

gmapQ :: (forall d. Data d => d -> u) -> InstDecl l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> InstDecl l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> InstDecl l -> m (InstDecl l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> InstDecl l -> m (InstDecl l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> InstDecl l -> m (InstDecl l) #

Data l => Data (InstHead l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> InstHead l -> c (InstHead l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (InstHead l) #

toConstr :: InstHead l -> Constr #

dataTypeOf :: InstHead l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (InstHead l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (InstHead l)) #

gmapT :: (forall b. Data b => b -> b) -> InstHead l -> InstHead l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> InstHead l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> InstHead l -> r #

gmapQ :: (forall d. Data d => d -> u) -> InstHead l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> InstHead l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> InstHead l -> m (InstHead l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> InstHead l -> m (InstHead l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> InstHead l -> m (InstHead l) #

Data l => Data (InstRule l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> InstRule l -> c (InstRule l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (InstRule l) #

toConstr :: InstRule l -> Constr #

dataTypeOf :: InstRule l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (InstRule l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (InstRule l)) #

gmapT :: (forall b. Data b => b -> b) -> InstRule l -> InstRule l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> InstRule l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> InstRule l -> r #

gmapQ :: (forall d. Data d => d -> u) -> InstRule l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> InstRule l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> InstRule l -> m (InstRule l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> InstRule l -> m (InstRule l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> InstRule l -> m (InstRule l) #

Data l => Data (Literal l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Literal l -> c (Literal l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Literal l) #

toConstr :: Literal l -> Constr #

dataTypeOf :: Literal l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Literal l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Literal l)) #

gmapT :: (forall b. Data b => b -> b) -> Literal l -> Literal l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Literal l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Literal l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Literal l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Literal l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Literal l -> m (Literal l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Literal l -> m (Literal l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Literal l -> m (Literal l) #

Data l => Data (Match l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Match l -> c (Match l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Match l) #

toConstr :: Match l -> Constr #

dataTypeOf :: Match l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Match l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Match l)) #

gmapT :: (forall b. Data b => b -> b) -> Match l -> Match l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Match l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Match l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Match l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Match l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Match l -> m (Match l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Match l -> m (Match l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Match l -> m (Match l) #

Data l => Data (MaybePromotedName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> MaybePromotedName l -> c (MaybePromotedName l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (MaybePromotedName l) #

toConstr :: MaybePromotedName l -> Constr #

dataTypeOf :: MaybePromotedName l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (MaybePromotedName l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (MaybePromotedName l)) #

gmapT :: (forall b. Data b => b -> b) -> MaybePromotedName l -> MaybePromotedName l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> MaybePromotedName l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> MaybePromotedName l -> r #

gmapQ :: (forall d. Data d => d -> u) -> MaybePromotedName l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> MaybePromotedName l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> MaybePromotedName l -> m (MaybePromotedName l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> MaybePromotedName l -> m (MaybePromotedName l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> MaybePromotedName l -> m (MaybePromotedName l) #

Data l => Data (Module l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Module l -> c (Module l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Module l) #

toConstr :: Module l -> Constr #

dataTypeOf :: Module l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Module l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Module l)) #

gmapT :: (forall b. Data b => b -> b) -> Module l -> Module l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Module l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Module l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Module l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Module l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Module l -> m (Module l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Module l -> m (Module l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Module l -> m (Module l) #

Data l => Data (ModuleHead l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ModuleHead l -> c (ModuleHead l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ModuleHead l) #

toConstr :: ModuleHead l -> Constr #

dataTypeOf :: ModuleHead l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (ModuleHead l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ModuleHead l)) #

gmapT :: (forall b. Data b => b -> b) -> ModuleHead l -> ModuleHead l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ModuleHead l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ModuleHead l -> r #

gmapQ :: (forall d. Data d => d -> u) -> ModuleHead l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ModuleHead l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ModuleHead l -> m (ModuleHead l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ModuleHead l -> m (ModuleHead l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ModuleHead l -> m (ModuleHead l) #

Data l => Data (ModuleName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ModuleName l -> c (ModuleName l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ModuleName l) #

toConstr :: ModuleName l -> Constr #

dataTypeOf :: ModuleName l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (ModuleName l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ModuleName l)) #

gmapT :: (forall b. Data b => b -> b) -> ModuleName l -> ModuleName l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ModuleName l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ModuleName l -> r #

gmapQ :: (forall d. Data d => d -> u) -> ModuleName l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ModuleName l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ModuleName l -> m (ModuleName l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ModuleName l -> m (ModuleName l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ModuleName l -> m (ModuleName l) #

Data l => Data (ModulePragma l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ModulePragma l -> c (ModulePragma l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ModulePragma l) #

toConstr :: ModulePragma l -> Constr #

dataTypeOf :: ModulePragma l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (ModulePragma l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ModulePragma l)) #

gmapT :: (forall b. Data b => b -> b) -> ModulePragma l -> ModulePragma l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ModulePragma l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ModulePragma l -> r #

gmapQ :: (forall d. Data d => d -> u) -> ModulePragma l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ModulePragma l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ModulePragma l -> m (ModulePragma l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ModulePragma l -> m (ModulePragma l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ModulePragma l -> m (ModulePragma l) #

Data l => Data (Name l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Name l -> c (Name l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Name l) #

toConstr :: Name l -> Constr #

dataTypeOf :: Name l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Name l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Name l)) #

gmapT :: (forall b. Data b => b -> b) -> Name l -> Name l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Name l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Name l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Name l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Name l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Name l -> m (Name l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Name l -> m (Name l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Name l -> m (Name l) #

Data l => Data (Namespace l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Namespace l -> c (Namespace l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Namespace l) #

toConstr :: Namespace l -> Constr #

dataTypeOf :: Namespace l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Namespace l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Namespace l)) #

gmapT :: (forall b. Data b => b -> b) -> Namespace l -> Namespace l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Namespace l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Namespace l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Namespace l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Namespace l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Namespace l -> m (Namespace l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Namespace l -> m (Namespace l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Namespace l -> m (Namespace l) #

Data l => Data (Op l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Op l -> c (Op l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Op l) #

toConstr :: Op l -> Constr #

dataTypeOf :: Op l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Op l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Op l)) #

gmapT :: (forall b. Data b => b -> b) -> Op l -> Op l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Op l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Op l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Op l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Op l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Op l -> m (Op l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Op l -> m (Op l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Op l -> m (Op l) #

Data l => Data (Overlap l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Overlap l -> c (Overlap l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Overlap l) #

toConstr :: Overlap l -> Constr #

dataTypeOf :: Overlap l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Overlap l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Overlap l)) #

gmapT :: (forall b. Data b => b -> b) -> Overlap l -> Overlap l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Overlap l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Overlap l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Overlap l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Overlap l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Overlap l -> m (Overlap l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Overlap l -> m (Overlap l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Overlap l -> m (Overlap l) #

Data l => Data (PXAttr l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PXAttr l -> c (PXAttr l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (PXAttr l) #

toConstr :: PXAttr l -> Constr #

dataTypeOf :: PXAttr l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (PXAttr l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (PXAttr l)) #

gmapT :: (forall b. Data b => b -> b) -> PXAttr l -> PXAttr l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PXAttr l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PXAttr l -> r #

gmapQ :: (forall d. Data d => d -> u) -> PXAttr l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PXAttr l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PXAttr l -> m (PXAttr l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PXAttr l -> m (PXAttr l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PXAttr l -> m (PXAttr l) #

Data l => Data (Pat l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Pat l -> c (Pat l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Pat l) #

toConstr :: Pat l -> Constr #

dataTypeOf :: Pat l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Pat l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Pat l)) #

gmapT :: (forall b. Data b => b -> b) -> Pat l -> Pat l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Pat l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Pat l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Pat l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Pat l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Pat l -> m (Pat l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Pat l -> m (Pat l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Pat l -> m (Pat l) #

Data l => Data (PatField l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PatField l -> c (PatField l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (PatField l) #

toConstr :: PatField l -> Constr #

dataTypeOf :: PatField l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (PatField l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (PatField l)) #

gmapT :: (forall b. Data b => b -> b) -> PatField l -> PatField l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PatField l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PatField l -> r #

gmapQ :: (forall d. Data d => d -> u) -> PatField l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PatField l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PatField l -> m (PatField l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PatField l -> m (PatField l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PatField l -> m (PatField l) #

Data l => Data (PatternSynDirection l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PatternSynDirection l -> c (PatternSynDirection l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (PatternSynDirection l) #

toConstr :: PatternSynDirection l -> Constr #

dataTypeOf :: PatternSynDirection l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (PatternSynDirection l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (PatternSynDirection l)) #

gmapT :: (forall b. Data b => b -> b) -> PatternSynDirection l -> PatternSynDirection l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PatternSynDirection l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PatternSynDirection l -> r #

gmapQ :: (forall d. Data d => d -> u) -> PatternSynDirection l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PatternSynDirection l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PatternSynDirection l -> m (PatternSynDirection l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PatternSynDirection l -> m (PatternSynDirection l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PatternSynDirection l -> m (PatternSynDirection l) #

Data l => Data (Promoted l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Promoted l -> c (Promoted l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Promoted l) #

toConstr :: Promoted l -> Constr #

dataTypeOf :: Promoted l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Promoted l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Promoted l)) #

gmapT :: (forall b. Data b => b -> b) -> Promoted l -> Promoted l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Promoted l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Promoted l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Promoted l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Promoted l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Promoted l -> m (Promoted l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Promoted l -> m (Promoted l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Promoted l -> m (Promoted l) #

Data l => Data (QName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> QName l -> c (QName l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (QName l) #

toConstr :: QName l -> Constr #

dataTypeOf :: QName l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (QName l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (QName l)) #

gmapT :: (forall b. Data b => b -> b) -> QName l -> QName l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> QName l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> QName l -> r #

gmapQ :: (forall d. Data d => d -> u) -> QName l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> QName l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> QName l -> m (QName l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> QName l -> m (QName l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> QName l -> m (QName l) #

Data l => Data (QOp l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> QOp l -> c (QOp l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (QOp l) #

toConstr :: QOp l -> Constr #

dataTypeOf :: QOp l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (QOp l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (QOp l)) #

gmapT :: (forall b. Data b => b -> b) -> QOp l -> QOp l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> QOp l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> QOp l -> r #

gmapQ :: (forall d. Data d => d -> u) -> QOp l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> QOp l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> QOp l -> m (QOp l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> QOp l -> m (QOp l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> QOp l -> m (QOp l) #

Data l => Data (QualConDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> QualConDecl l -> c (QualConDecl l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (QualConDecl l) #

toConstr :: QualConDecl l -> Constr #

dataTypeOf :: QualConDecl l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (QualConDecl l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (QualConDecl l)) #

gmapT :: (forall b. Data b => b -> b) -> QualConDecl l -> QualConDecl l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> QualConDecl l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> QualConDecl l -> r #

gmapQ :: (forall d. Data d => d -> u) -> QualConDecl l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> QualConDecl l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> QualConDecl l -> m (QualConDecl l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> QualConDecl l -> m (QualConDecl l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> QualConDecl l -> m (QualConDecl l) #

Data l => Data (QualStmt l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> QualStmt l -> c (QualStmt l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (QualStmt l) #

toConstr :: QualStmt l -> Constr #

dataTypeOf :: QualStmt l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (QualStmt l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (QualStmt l)) #

gmapT :: (forall b. Data b => b -> b) -> QualStmt l -> QualStmt l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> QualStmt l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> QualStmt l -> r #

gmapQ :: (forall d. Data d => d -> u) -> QualStmt l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> QualStmt l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> QualStmt l -> m (QualStmt l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> QualStmt l -> m (QualStmt l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> QualStmt l -> m (QualStmt l) #

Data l => Data (RPat l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RPat l -> c (RPat l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (RPat l) #

toConstr :: RPat l -> Constr #

dataTypeOf :: RPat l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (RPat l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (RPat l)) #

gmapT :: (forall b. Data b => b -> b) -> RPat l -> RPat l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RPat l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RPat l -> r #

gmapQ :: (forall d. Data d => d -> u) -> RPat l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> RPat l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RPat l -> m (RPat l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RPat l -> m (RPat l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RPat l -> m (RPat l) #

Data l => Data (RPatOp l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RPatOp l -> c (RPatOp l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (RPatOp l) #

toConstr :: RPatOp l -> Constr #

dataTypeOf :: RPatOp l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (RPatOp l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (RPatOp l)) #

gmapT :: (forall b. Data b => b -> b) -> RPatOp l -> RPatOp l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RPatOp l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RPatOp l -> r #

gmapQ :: (forall d. Data d => d -> u) -> RPatOp l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> RPatOp l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RPatOp l -> m (RPatOp l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RPatOp l -> m (RPatOp l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RPatOp l -> m (RPatOp l) #

Data l => Data (ResultSig l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ResultSig l -> c (ResultSig l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ResultSig l) #

toConstr :: ResultSig l -> Constr #

dataTypeOf :: ResultSig l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (ResultSig l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ResultSig l)) #

gmapT :: (forall b. Data b => b -> b) -> ResultSig l -> ResultSig l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ResultSig l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ResultSig l -> r #

gmapQ :: (forall d. Data d => d -> u) -> ResultSig l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ResultSig l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ResultSig l -> m (ResultSig l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ResultSig l -> m (ResultSig l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ResultSig l -> m (ResultSig l) #

Data l => Data (Rhs l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Rhs l -> c (Rhs l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Rhs l) #

toConstr :: Rhs l -> Constr #

dataTypeOf :: Rhs l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Rhs l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Rhs l)) #

gmapT :: (forall b. Data b => b -> b) -> Rhs l -> Rhs l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Rhs l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Rhs l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Rhs l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Rhs l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Rhs l -> m (Rhs l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Rhs l -> m (Rhs l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Rhs l -> m (Rhs l) #

Data l => Data (Role l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Role l -> c (Role l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Role l) #

toConstr :: Role l -> Constr #

dataTypeOf :: Role l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Role l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Role l)) #

gmapT :: (forall b. Data b => b -> b) -> Role l -> Role l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Role l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Role l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Role l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Role l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Role l -> m (Role l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Role l -> m (Role l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Role l -> m (Role l) #

Data l => Data (Rule l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Rule l -> c (Rule l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Rule l) #

toConstr :: Rule l -> Constr #

dataTypeOf :: Rule l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Rule l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Rule l)) #

gmapT :: (forall b. Data b => b -> b) -> Rule l -> Rule l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Rule l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Rule l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Rule l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Rule l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Rule l -> m (Rule l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Rule l -> m (Rule l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Rule l -> m (Rule l) #

Data l => Data (RuleVar l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RuleVar l -> c (RuleVar l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (RuleVar l) #

toConstr :: RuleVar l -> Constr #

dataTypeOf :: RuleVar l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (RuleVar l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (RuleVar l)) #

gmapT :: (forall b. Data b => b -> b) -> RuleVar l -> RuleVar l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RuleVar l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RuleVar l -> r #

gmapQ :: (forall d. Data d => d -> u) -> RuleVar l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> RuleVar l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RuleVar l -> m (RuleVar l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RuleVar l -> m (RuleVar l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RuleVar l -> m (RuleVar l) #

Data l => Data (Safety l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Safety l -> c (Safety l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Safety l) #

toConstr :: Safety l -> Constr #

dataTypeOf :: Safety l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Safety l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Safety l)) #

gmapT :: (forall b. Data b => b -> b) -> Safety l -> Safety l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Safety l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Safety l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Safety l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Safety l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Safety l -> m (Safety l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Safety l -> m (Safety l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Safety l -> m (Safety l) #

Data l => Data (Sign l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Sign l -> c (Sign l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Sign l) #

toConstr :: Sign l -> Constr #

dataTypeOf :: Sign l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Sign l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Sign l)) #

gmapT :: (forall b. Data b => b -> b) -> Sign l -> Sign l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Sign l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Sign l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Sign l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Sign l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Sign l -> m (Sign l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Sign l -> m (Sign l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Sign l -> m (Sign l) #

Data l => Data (SpecialCon l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SpecialCon l -> c (SpecialCon l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (SpecialCon l) #

toConstr :: SpecialCon l -> Constr #

dataTypeOf :: SpecialCon l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (SpecialCon l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (SpecialCon l)) #

gmapT :: (forall b. Data b => b -> b) -> SpecialCon l -> SpecialCon l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SpecialCon l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SpecialCon l -> r #

gmapQ :: (forall d. Data d => d -> u) -> SpecialCon l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SpecialCon l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SpecialCon l -> m (SpecialCon l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SpecialCon l -> m (SpecialCon l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SpecialCon l -> m (SpecialCon l) #

Data l => Data (Splice l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Splice l -> c (Splice l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Splice l) #

toConstr :: Splice l -> Constr #

dataTypeOf :: Splice l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Splice l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Splice l)) #

gmapT :: (forall b. Data b => b -> b) -> Splice l -> Splice l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Splice l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Splice l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Splice l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Splice l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Splice l -> m (Splice l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Splice l -> m (Splice l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Splice l -> m (Splice l) #

Data l => Data (Stmt l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Stmt l -> c (Stmt l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Stmt l) #

toConstr :: Stmt l -> Constr #

dataTypeOf :: Stmt l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Stmt l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Stmt l)) #

gmapT :: (forall b. Data b => b -> b) -> Stmt l -> Stmt l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Stmt l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Stmt l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Stmt l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Stmt l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Stmt l -> m (Stmt l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Stmt l -> m (Stmt l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Stmt l -> m (Stmt l) #

Data l => Data (TyVarBind l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TyVarBind l -> c (TyVarBind l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (TyVarBind l) #

toConstr :: TyVarBind l -> Constr #

dataTypeOf :: TyVarBind l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (TyVarBind l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (TyVarBind l)) #

gmapT :: (forall b. Data b => b -> b) -> TyVarBind l -> TyVarBind l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TyVarBind l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TyVarBind l -> r #

gmapQ :: (forall d. Data d => d -> u) -> TyVarBind l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TyVarBind l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TyVarBind l -> m (TyVarBind l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TyVarBind l -> m (TyVarBind l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TyVarBind l -> m (TyVarBind l) #

Data l => Data (Type l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Type l -> c (Type l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Type l) #

toConstr :: Type l -> Constr #

dataTypeOf :: Type l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Type l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Type l)) #

gmapT :: (forall b. Data b => b -> b) -> Type l -> Type l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Type l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Type l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Type l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Type l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Type l -> m (Type l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Type l -> m (Type l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Type l -> m (Type l) #

Data l => Data (TypeEqn l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TypeEqn l -> c (TypeEqn l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (TypeEqn l) #

toConstr :: TypeEqn l -> Constr #

dataTypeOf :: TypeEqn l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (TypeEqn l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (TypeEqn l)) #

gmapT :: (forall b. Data b => b -> b) -> TypeEqn l -> TypeEqn l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TypeEqn l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TypeEqn l -> r #

gmapQ :: (forall d. Data d => d -> u) -> TypeEqn l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TypeEqn l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TypeEqn l -> m (TypeEqn l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TypeEqn l -> m (TypeEqn l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TypeEqn l -> m (TypeEqn l) #

Data l => Data (Unpackedness l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Unpackedness l -> c (Unpackedness l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Unpackedness l) #

toConstr :: Unpackedness l -> Constr #

dataTypeOf :: Unpackedness l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Unpackedness l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Unpackedness l)) #

gmapT :: (forall b. Data b => b -> b) -> Unpackedness l -> Unpackedness l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Unpackedness l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Unpackedness l -> r #

gmapQ :: (forall d. Data d => d -> u) -> Unpackedness l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Unpackedness l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Unpackedness l -> m (Unpackedness l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Unpackedness l -> m (Unpackedness l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Unpackedness l -> m (Unpackedness l) #

Data l => Data (WarningText l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> WarningText l -> c (WarningText l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (WarningText l) #

toConstr :: WarningText l -> Constr #

dataTypeOf :: WarningText l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (WarningText l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (WarningText l)) #

gmapT :: (forall b. Data b => b -> b) -> WarningText l -> WarningText l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WarningText l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WarningText l -> r #

gmapQ :: (forall d. Data d => d -> u) -> WarningText l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> WarningText l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> WarningText l -> m (WarningText l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> WarningText l -> m (WarningText l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> WarningText l -> m (WarningText l) #

Data l => Data (XAttr l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> XAttr l -> c (XAttr l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (XAttr l) #

toConstr :: XAttr l -> Constr #

dataTypeOf :: XAttr l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (XAttr l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (XAttr l)) #

gmapT :: (forall b. Data b => b -> b) -> XAttr l -> XAttr l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> XAttr l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> XAttr l -> r #

gmapQ :: (forall d. Data d => d -> u) -> XAttr l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> XAttr l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> XAttr l -> m (XAttr l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> XAttr l -> m (XAttr l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> XAttr l -> m (XAttr l) #

Data l => Data (XName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> XName l -> c (XName l) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (XName l) #

toConstr :: XName l -> Constr #

dataTypeOf :: XName l -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (XName l)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (XName l)) #

gmapT :: (forall b. Data b => b -> b) -> XName l -> XName l #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> XName l -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> XName l -> r #

gmapQ :: (forall d. Data d => d -> u) -> XName l -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> XName l -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> XName l -> m (XName l) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> XName l -> m (XName l) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> XName l -> m (XName l) #

Data epoch => Data (ElapsedSince epoch) 
Instance details

Defined in Data.Hourglass.Epoch

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ElapsedSince epoch -> c (ElapsedSince epoch) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ElapsedSince epoch) #

toConstr :: ElapsedSince epoch -> Constr #

dataTypeOf :: ElapsedSince epoch -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (ElapsedSince epoch)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ElapsedSince epoch)) #

gmapT :: (forall b. Data b => b -> b) -> ElapsedSince epoch -> ElapsedSince epoch #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ElapsedSince epoch -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ElapsedSince epoch -> r #

gmapQ :: (forall d. Data d => d -> u) -> ElapsedSince epoch -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ElapsedSince epoch -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ElapsedSince epoch -> m (ElapsedSince epoch) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ElapsedSince epoch -> m (ElapsedSince epoch) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ElapsedSince epoch -> m (ElapsedSince epoch) #

Data epoch => Data (ElapsedSinceP epoch) 
Instance details

Defined in Data.Hourglass.Epoch

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ElapsedSinceP epoch -> c (ElapsedSinceP epoch) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ElapsedSinceP epoch) #

toConstr :: ElapsedSinceP epoch -> Constr #

dataTypeOf :: ElapsedSinceP epoch -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (ElapsedSinceP epoch)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ElapsedSinceP epoch)) #

gmapT :: (forall b. Data b => b -> b) -> ElapsedSinceP epoch -> ElapsedSinceP epoch #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ElapsedSinceP epoch -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ElapsedSinceP epoch -> r #

gmapQ :: (forall d. Data d => d -> u) -> ElapsedSinceP epoch -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ElapsedSinceP epoch -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ElapsedSinceP epoch -> m (ElapsedSinceP epoch) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ElapsedSinceP epoch -> m (ElapsedSinceP epoch) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ElapsedSinceP epoch -> m (ElapsedSinceP epoch) #

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) #

(KnownSymbol table, Data (PrimaryKey table)) => Data (Id' table) Source # 
Instance details

Defined in IHP.ModelSupport

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Id' table -> c (Id' table) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Id' table) #

toConstr :: Id' table -> Constr #

dataTypeOf :: Id' table -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Id' table)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Id' table)) #

gmapT :: (forall b. Data b => b -> b) -> Id' table -> Id' table #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Id' table -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Id' table -> r #

gmapQ :: (forall d. Data d => d -> u) -> Id' table -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Id' table -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Id' table -> m (Id' table) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Id' table -> m (Id' table) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Id' table -> m (Id' table) #

Data e => Data (ErrorFancy e) 
Instance details

Defined in Text.Megaparsec.Error

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ErrorFancy e -> c (ErrorFancy e) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ErrorFancy e) #

toConstr :: ErrorFancy e -> Constr #

dataTypeOf :: ErrorFancy e -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (ErrorFancy e)) #

dataCast2 :: Typeable t => (forall d e0. (Data d, Data e0) => c (t d e0)) -> Maybe (c (ErrorFancy e)) #

gmapT :: (forall b. Data b => b -> b) -> ErrorFancy e -> ErrorFancy e #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ErrorFancy e -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ErrorFancy e -> r #

gmapQ :: (forall d. Data d => d -> u) -> ErrorFancy e -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ErrorFancy e -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ErrorFancy e -> m (ErrorFancy e) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ErrorFancy e -> m (ErrorFancy e) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ErrorFancy e -> m (ErrorFancy e) #

Data t => Data (ErrorItem t) 
Instance details

Defined in Text.Megaparsec.Error

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ErrorItem t -> c (ErrorItem t) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ErrorItem t) #

toConstr :: ErrorItem t -> Constr #

dataTypeOf :: ErrorItem t -> DataType #

dataCast1 :: Typeable t0 => (forall d. Data d => c (t0 d)) -> Maybe (c (ErrorItem t)) #

dataCast2 :: Typeable t0 => (forall d e. (Data d, Data e) => c (t0 d e)) -> Maybe (c (ErrorItem t)) #

gmapT :: (forall b. Data b => b -> b) -> ErrorItem t -> ErrorItem t #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ErrorItem t -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ErrorItem t -> r #

gmapQ :: (forall d. Data d => d -> u) -> ErrorItem t -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ErrorItem t -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ErrorItem t -> m (ErrorItem t) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ErrorItem t -> m (ErrorItem t) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ErrorItem t -> m (ErrorItem t) #

(Data e, Ord e) => Data (EF e) 
Instance details

Defined in Text.Megaparsec.Error.Builder

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> EF e -> c (EF e) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (EF e) #

toConstr :: EF e -> Constr #

dataTypeOf :: EF e -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (EF e)) #

dataCast2 :: Typeable t => (forall d e0. (Data d, Data e0) => c (t d e0)) -> Maybe (c (EF e)) #

gmapT :: (forall b. Data b => b -> b) -> EF e -> EF e #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> EF e -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> EF e -> r #

gmapQ :: (forall d. Data d => d -> u) -> EF e -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> EF e -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> EF e -> m (EF e) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> EF e -> m (EF e) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> EF e -> m (EF e) #

(Data s, Data (Token s), Ord (Token s)) => Data (ET s) 
Instance details

Defined in Text.Megaparsec.Error.Builder

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ET s -> c (ET s) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ET s) #

toConstr :: ET s -> Constr #

dataTypeOf :: ET s -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (ET s)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ET s)) #

gmapT :: (forall b. Data b => b -> b) -> ET s -> ET s #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ET s -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ET s -> r #

gmapQ :: (forall d. Data d => d -> u) -> ET s -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ET s -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ET s -> m (ET s) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ET s -> m (ET s) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ET s -> m (ET s) #

Data s => Data (PosState s) 
Instance details

Defined in Text.Megaparsec.State

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PosState s -> c (PosState s) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (PosState s) #

toConstr :: PosState s -> Constr #

dataTypeOf :: PosState s -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (PosState s)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (PosState s)) #

gmapT :: (forall b. Data b => b -> b) -> PosState s -> PosState s #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PosState s -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PosState s -> r #

gmapQ :: (forall d. Data d => d -> u) -> PosState s -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PosState s -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PosState s -> m (PosState s) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PosState s -> m (PosState s) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PosState s -> m (PosState s) #

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, 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) #

(KnownNat n, Data a) => Data (BlockN n a) 
Instance details

Defined in Basement.Sized.Block

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BlockN n a -> c (BlockN n a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (BlockN n a) #

toConstr :: BlockN n a -> Constr #

dataTypeOf :: BlockN n a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (BlockN n a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (BlockN n a)) #

gmapT :: (forall b. Data b => b -> b) -> BlockN n a -> BlockN n a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BlockN n a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BlockN n a -> r #

gmapQ :: (forall d. Data d => d -> u) -> BlockN n a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BlockN n a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BlockN n a -> m (BlockN n a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BlockN n a -> m (BlockN n a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BlockN n a -> m (BlockN n a) #

(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) #

(Typeable f, Data (f (Cofree f a)), Data a) => Data (Cofree f a) 
Instance details

Defined in Control.Comonad.Cofree

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Cofree f a -> c (Cofree f a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Cofree f a) #

toConstr :: Cofree f a -> Constr #

dataTypeOf :: Cofree f a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Cofree f a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Cofree f a)) #

gmapT :: (forall b. Data b => b -> b) -> Cofree f a -> Cofree f a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Cofree f a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Cofree f a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Cofree f a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Cofree f a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Cofree f a -> m (Cofree f a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Cofree f a -> m (Cofree f a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Cofree f a -> m (Cofree f a) #

(Typeable w, Data (w (a, CoiterT w a)), Data a) => Data (CoiterT w a) 
Instance details

Defined in Control.Comonad.Trans.Coiter

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CoiterT w a -> c (CoiterT w a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (CoiterT w a) #

toConstr :: CoiterT w a -> Constr #

dataTypeOf :: CoiterT w a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (CoiterT w a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (CoiterT w a)) #

gmapT :: (forall b. Data b => b -> b) -> CoiterT w a -> CoiterT w a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CoiterT w a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CoiterT w a -> r #

gmapQ :: (forall d. Data d => d -> u) -> CoiterT w a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CoiterT w a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CoiterT w a -> m (CoiterT w a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CoiterT w a -> m (CoiterT w a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CoiterT w a -> m (CoiterT w a) #

(Typeable f, Data (f (Free f a)), Data a) => Data (Free f a) 
Instance details

Defined in Control.Monad.Free

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Free f a -> c (Free f a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Free f a) #

toConstr :: Free f a -> Constr #

dataTypeOf :: Free f a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Free f a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Free f a)) #

gmapT :: (forall b. Data b => b -> b) -> Free f a -> Free f a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Free f a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Free f a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Free f a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Free f a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Free f a -> m (Free f a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Free f a -> m (Free f a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Free f a -> m (Free f a) #

(Typeable f, Data a, Data (f (Free f a))) => Data (Free f a) 
Instance details

Defined in Control.Monad.Free.Ap

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Free f a -> c (Free f a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Free f a) #

toConstr :: Free f a -> Constr #

dataTypeOf :: Free f a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Free f a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Free f a)) #

gmapT :: (forall b. Data b => b -> b) -> Free f a -> Free f a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Free f a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Free f a -> r #

gmapQ :: (forall d. Data d => d -> u) -> Free f a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Free f a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Free f a -> m (Free f a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Free f a -> m (Free f a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Free f a -> m (Free f a) #

(Typeable m, Data (m (Either a (IterT m a))), Data a) => Data (IterT m a) 
Instance details

Defined in Control.Monad.Trans.Iter

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IterT m a -> c (IterT m a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (IterT m a) #

toConstr :: IterT m a -> Constr #

dataTypeOf :: IterT m a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (IterT m a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (IterT m a)) #

gmapT :: (forall b. Data b => b -> b) -> IterT m a -> IterT m a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IterT m a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IterT m a -> r #

gmapQ :: (forall d. Data d => d -> u) -> IterT m a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IterT m a -> u #

gmapM :: Monad m0 => (forall d. Data d => d -> m0 d) -> IterT m a -> m0 (IterT m a) #

gmapMp :: MonadPlus m0 => (forall d. Data d => d -> m0 d) -> IterT m a -> m0 (IterT m a) #

gmapMo :: MonadPlus m0 => (forall d. Data d => d -> m0 d) -> IterT m a -> m0 (IterT m a) #

(Data pass, Data (IdP pass), Data a) => Data (WithHsDocIdentifiers a pass) 
Instance details

Defined in GHC.Hs.Doc

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> WithHsDocIdentifiers a pass -> c (WithHsDocIdentifiers a pass) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (WithHsDocIdentifiers a pass) #

toConstr :: WithHsDocIdentifiers a pass -> Constr #

dataTypeOf :: WithHsDocIdentifiers a pass -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (WithHsDocIdentifiers a pass)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (WithHsDocIdentifiers a pass)) #

gmapT :: (forall b. Data b => b -> b) -> WithHsDocIdentifiers a pass -> WithHsDocIdentifiers a pass #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WithHsDocIdentifiers a pass -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WithHsDocIdentifiers a pass -> r #

gmapQ :: (forall d. Data d => d -> u) -> WithHsDocIdentifiers a pass -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> WithHsDocIdentifiers a pass -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> WithHsDocIdentifiers a pass -> m (WithHsDocIdentifiers a pass) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> WithHsDocIdentifiers a pass -> m (WithHsDocIdentifiers a pass) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> WithHsDocIdentifiers a pass -> m (WithHsDocIdentifiers a pass) #

(Data orig, Data expanded) => Data (HsExpansion orig expanded) 
Instance details

Defined in GHC.Hs.Expr

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> HsExpansion orig expanded -> c (HsExpansion orig expanded) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (HsExpansion orig expanded) #

toConstr :: HsExpansion orig expanded -> Constr #

dataTypeOf :: HsExpansion orig expanded -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (HsExpansion orig expanded)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (HsExpansion orig expanded)) #

gmapT :: (forall b. Data b => b -> b) -> HsExpansion orig expanded -> HsExpansion orig expanded #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HsExpansion orig expanded -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HsExpansion orig expanded -> r #

gmapQ :: (forall d. Data d => d -> u) -> HsExpansion orig expanded -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> HsExpansion orig expanded -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> HsExpansion orig expanded -> m (HsExpansion orig expanded) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HsExpansion orig expanded -> m (HsExpansion orig expanded) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HsExpansion orig expanded -> m (HsExpansion orig expanded) #

(Data a, Data b) => Data (HsPatExpansion a b) 
Instance details

Defined in GHC.Hs.Pat

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> HsPatExpansion a b -> c (HsPatExpansion a b) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (HsPatExpansion a b) #

toConstr :: HsPatExpansion a b -> Constr #

dataTypeOf :: HsPatExpansion a b -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (HsPatExpansion a b)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (HsPatExpansion a b)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> HsPatExpansion a b -> HsPatExpansion a b #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HsPatExpansion a b -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HsPatExpansion a b -> r #

gmapQ :: (forall d. Data d => d -> u) -> HsPatExpansion a b -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> HsPatExpansion a b -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> HsPatExpansion a b -> m (HsPatExpansion a b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HsPatExpansion a b -> m (HsPatExpansion a b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HsPatExpansion a b -> m (HsPatExpansion a b) #

(Data l, Data e) => Data (GenLocated l e) 
Instance details

Defined in GHC.Types.SrcLoc

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GenLocated l e -> c (GenLocated l e) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (GenLocated l e) #

toConstr :: GenLocated l e -> Constr #

dataTypeOf :: GenLocated l e -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (GenLocated l e)) #

dataCast2 :: Typeable t => (forall d e0. (Data d, Data e0) => c (t d e0)) -> Maybe (c (GenLocated l e)) #

gmapT :: (forall b. Data b => b -> b) -> GenLocated l e -> GenLocated l e #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GenLocated l e -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GenLocated l e -> r #

gmapQ :: (forall d. Data d => d -> u) -> GenLocated l e -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GenLocated l e -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GenLocated l e -> m (GenLocated l e) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GenLocated l e -> m (GenLocated l e) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GenLocated l e -> m (GenLocated l e) #

(Data k, Data a) => Data (UniqMap k a) 
Instance details

Defined in GHC.Types.Unique.Map

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UniqMap k a -> c (UniqMap k a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (UniqMap k a) #

toConstr :: UniqMap k a -> Constr #

dataTypeOf :: UniqMap k a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (UniqMap k a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (UniqMap k a)) #

gmapT :: (forall b. Data b => b -> b) -> UniqMap k a -> UniqMap k a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UniqMap k a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UniqMap k a -> r #

gmapQ :: (forall d. Data d => d -> u) -> UniqMap k a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UniqMap k a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UniqMap k a -> m (UniqMap k a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UniqMap k a -> m (UniqMap k a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UniqMap k a -> m (UniqMap k a) #

(Data var, Data argf) => Data (VarBndr var argf) 
Instance details

Defined in GHC.Types.Var

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> VarBndr var argf -> c (VarBndr var argf) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (VarBndr var argf) #

toConstr :: VarBndr var argf -> Constr #

dataTypeOf :: VarBndr var argf -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (VarBndr var argf)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (VarBndr var argf)) #

gmapT :: (forall b. Data b => b -> b) -> VarBndr var argf -> VarBndr var argf #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> VarBndr var argf -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> VarBndr var argf -> r #

gmapQ :: (forall d. Data d => d -> u) -> VarBndr var argf -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> VarBndr var argf -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> VarBndr var argf -> m (VarBndr var argf) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> VarBndr var argf -> m (VarBndr var argf) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> VarBndr var argf -> m (VarBndr var argf) #

(Data s, Data (Token s), Ord (Token s), Data e, Ord e) => Data (ParseError s e) 
Instance details

Defined in Text.Megaparsec.Error

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ParseError s e -> c (ParseError s e) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ParseError s e) #

toConstr :: ParseError s e -> Constr #

dataTypeOf :: ParseError s e -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (ParseError s e)) #

dataCast2 :: Typeable t => (forall d e0. (Data d, Data e0) => c (t d e0)) -> Maybe (c (ParseError s e)) #

gmapT :: (forall b. Data b => b -> b) -> ParseError s e -> ParseError s e #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ParseError s e -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ParseError s e -> r #

gmapQ :: (forall d. Data d => d -> u) -> ParseError s e -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ParseError s e -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ParseError s e -> m (ParseError s e) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ParseError s e -> m (ParseError s e) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ParseError s e -> m (ParseError s e) #

(Data s, Data (Token s), Ord (Token s), Data e, Ord e) => Data (ParseErrorBundle s e) 
Instance details

Defined in Text.Megaparsec.Error

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ParseErrorBundle s e -> c (ParseErrorBundle s e) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ParseErrorBundle s e) #

toConstr :: ParseErrorBundle s e -> Constr #

dataTypeOf :: ParseErrorBundle s e -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (ParseErrorBundle s e)) #

dataCast2 :: Typeable t => (forall d e0. (Data d, Data e0) => c (t d e0)) -> Maybe (c (ParseErrorBundle s e)) #

gmapT :: (forall b. Data b => b -> b) -> ParseErrorBundle s e -> ParseErrorBundle s e #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ParseErrorBundle s e -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ParseErrorBundle s e -> r #

gmapQ :: (forall d. Data d => d -> u) -> ParseErrorBundle s e -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ParseErrorBundle s e -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ParseErrorBundle s e -> m (ParseErrorBundle s e) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ParseErrorBundle s e -> m (ParseErrorBundle s e) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ParseErrorBundle s e -> m (ParseErrorBundle s e) #

(Data e, Data (ParseError s e), Data s) => Data (State s e) 
Instance details

Defined in Text.Megaparsec.State

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> State s e -> c (State s e) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (State s e) #

toConstr :: State s e -> Constr #

dataTypeOf :: State s e -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (State s e)) #

dataCast2 :: Typeable t => (forall d e0. (Data d, Data e0) => c (t d e0)) -> Maybe (c (State s e)) #

gmapT :: (forall b. Data b => b -> b) -> State s e -> State s e #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> State s e -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> State s e -> r #

gmapQ :: (forall d. Data d => d -> u) -> State s e -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> State s e -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> State s e -> m (State s e) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> State s e -> m (State s e) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> State s e -> m (State s e) #

(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 e, Typeable w, Data (w a), Data a) => Data (EnvT e w a) 
Instance details

Defined in Control.Comonad.Trans.Env

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> EnvT e w a -> c (EnvT e w a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (EnvT e w a) #

toConstr :: EnvT e w a -> Constr #

dataTypeOf :: EnvT e w a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (EnvT e w a)) #

dataCast2 :: Typeable t => (forall d e0. (Data d, Data e0) => c (t d e0)) -> Maybe (c (EnvT e w a)) #

gmapT :: (forall b. Data b => b -> b) -> EnvT e w a -> EnvT e w a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> EnvT e w a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> EnvT e w a -> r #

gmapQ :: (forall d. Data d => d -> u) -> EnvT e w a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> EnvT e w a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> EnvT e w a -> m (EnvT e w a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> EnvT e w a -> m (EnvT e w a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> EnvT e w a -> m (EnvT e w a) #

(Typeable f, Data a, Data (f b), Data b) => Data (CofreeF f a b) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> CofreeF f a b -> c (CofreeF f a b) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (CofreeF f a b) #

toConstr :: CofreeF f a b -> Constr #

dataTypeOf :: CofreeF f a b -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (CofreeF f a b)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (CofreeF f a b)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> CofreeF f a b -> CofreeF f a b #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CofreeF f a b -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CofreeF f a b -> r #

gmapQ :: (forall d. Data d => d -> u) -> CofreeF f a b -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CofreeF f a b -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CofreeF f a b -> m (CofreeF f a b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CofreeF f a b -> m (CofreeF f a b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CofreeF f a b -> m (CofreeF f a b) #

(Typeable f, Typeable w, Data (w (CofreeF f a (CofreeT f w a))), Data a) => Data (CofreeT f w a) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CofreeT f w a -> c (CofreeT f w a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (CofreeT f w a) #

toConstr :: CofreeT f w a -> Constr #

dataTypeOf :: CofreeT f w a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (CofreeT f w a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (CofreeT f w a)) #

gmapT :: (forall b. Data b => b -> b) -> CofreeT f w a -> CofreeT f w a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CofreeT f w a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CofreeT f w a -> r #

gmapQ :: (forall d. Data d => d -> u) -> CofreeT f w a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CofreeT f w a -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CofreeT f w a -> m (CofreeT f w a) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CofreeT f w a -> m (CofreeT f w a) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CofreeT f w a -> m (CofreeT f w a) #

(Typeable f, Typeable b, Data a, Data (f b)) => Data (FreeF f a b) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> FreeF f a b -> c (FreeF f a b) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (FreeF f a b) #

toConstr :: FreeF f a b -> Constr #

dataTypeOf :: FreeF f a b -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (FreeF f a b)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (FreeF f a b)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> FreeF f a b -> FreeF f a b #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FreeF f a b -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FreeF f a b -> r #

gmapQ :: (forall d. Data d => d -> u) -> FreeF f a b -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FreeF f a b -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FreeF f a b -> m (FreeF f a b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FreeF f a b -> m (FreeF f a b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FreeF f a b -> m (FreeF f a b) #

(Typeable f, Typeable b, Data a, Data (f b)) => Data (FreeF f a b) 
Instance details

Defined in Control.Monad.Trans.Free.Ap

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> FreeF f a b -> c (FreeF f a b) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (FreeF f a b) #

toConstr :: FreeF f a b -> Constr #

dataTypeOf :: FreeF f a b -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (FreeF f a b)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (FreeF f a b)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> FreeF f a b -> FreeF f a b #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FreeF f a b -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FreeF f a b -> r #

gmapQ :: (forall d. Data d => d -> u) -> FreeF f a b -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FreeF f a b -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FreeF f a b -> m (FreeF f a b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FreeF f a b -> m (FreeF f a b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FreeF f a b -> m (FreeF f a b) #

(Typeable f, Typeable m, Data (m (FreeF f a (FreeT f m a))), Data a) => Data (FreeT f m a) 
Instance details

Defined in Control.Monad.Trans.Free.Ap

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FreeT f m a -> c (FreeT f m a) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (FreeT f m a) #

toConstr :: FreeT f m a -> Constr #

dataTypeOf :: FreeT f m a -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (FreeT f m a)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (FreeT f m a)) #

gmapT :: (forall b. Data b => b -> b) -> FreeT f m a -> FreeT f m a #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FreeT f m a -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FreeT f m a -> r #

gmapQ :: (forall d. Data d => d -> u) -> FreeT f m a -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FreeT f m a -> u #

gmapM :: Monad m0 => (forall d. Data d => d -> m0 d) -> FreeT f m a -> m0 (FreeT f m a) #

gmapMp :: MonadPlus m0 => (forall d. Data d => d -> m0 d) -> FreeT f m a -> m0 (FreeT f m a) #

gmapMo :: MonadPlus m0 => (forall d. Data d => d -> m0 d) -> FreeT f m a -> m0 (FreeT f m a) #

(Data tyarg, Data rec, Data arg) => Data (HsConDetails tyarg arg rec) 
Instance details

Defined in Language.Haskell.Syntax.Type

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> HsConDetails tyarg arg rec -> c (HsConDetails tyarg arg rec) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (HsConDetails tyarg arg rec) #

toConstr :: HsConDetails tyarg arg rec -> Constr #

dataTypeOf :: HsConDetails tyarg arg rec -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (HsConDetails tyarg arg rec)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (HsConDetails tyarg arg rec)) #

gmapT :: (forall b. Data b => b -> b) -> HsConDetails tyarg arg rec -> HsConDetails tyarg arg rec #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HsConDetails tyarg arg rec -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HsConDetails tyarg arg rec -> r #

gmapQ :: (forall d. Data d => d -> u) -> HsConDetails tyarg arg rec -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> HsConDetails tyarg arg rec -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> HsConDetails tyarg arg rec -> m (HsConDetails tyarg arg rec) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HsConDetails tyarg arg rec -> m (HsConDetails tyarg arg rec) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HsConDetails tyarg arg rec -> m (HsConDetails tyarg arg rec) #

(Typeable authType, Typeable k, Typeable jobs) => Data (JobsDashboardController authType jobs) Source # 
Instance details

Defined in IHP.Job.Dashboard.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> JobsDashboardController authType jobs -> c (JobsDashboardController authType jobs) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (JobsDashboardController authType jobs) #

toConstr :: JobsDashboardController authType jobs -> Constr #

dataTypeOf :: JobsDashboardController authType jobs -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (JobsDashboardController authType jobs)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (JobsDashboardController authType jobs)) #

gmapT :: (forall b. Data b => b -> b) -> JobsDashboardController authType jobs -> JobsDashboardController authType jobs #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> JobsDashboardController authType jobs -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> JobsDashboardController authType jobs -> r #

gmapQ :: (forall d. Data d => d -> u) -> JobsDashboardController authType jobs -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> JobsDashboardController authType jobs -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> JobsDashboardController authType jobs -> m (JobsDashboardController authType jobs) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> JobsDashboardController authType jobs -> m (JobsDashboardController authType jobs) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> JobsDashboardController authType jobs -> m (JobsDashboardController authType jobs) #

(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 FrameworkConfig Source #

Constructors

FrameworkConfig 

Fields

  • appHostname :: !Text
     
  • environment :: !Environment
     
  • appPort :: !Int
     
  • baseUrl :: !Text
     
  • requestLoggerMiddleware :: !Middleware

    Provides IHP with a middleware to log requests and responses.

    By default this uses the RequestLogger middleware from wai-extra. Take a look at the wai-extra documentation when you want to customize the request logging.

    See https://hackage.haskell.org/package/wai-extra-3.0.29.2/docs/Network-Wai-Middleware-RequestLogger.html

    Set requestLoggerMiddleware = application -> application to disable request logging.

  • sessionCookie :: !SetCookie

    Provides the default settings for the session cookie.

    • Max Age: 30 days
    • Same Site Policy: Lax
    • HttpOnly (no access through JS)
    • secure, when baseUrl is a https url

    Override this to set e.g. a custom max age or change the default same site policy.

    Example: Set max age to 90 days > sessionCookie = defaultIHPSessionCookie { Cookie.setCookieMaxAge = Just (fromIntegral (60 * 60 * 24 * 90)) }

  • mailServer :: !MailServer
     
  • databaseUrl :: !ByteString
     
  • dbPoolIdleTime :: !NominalDiffTime

    How long db connection are kept alive inside the connecton pool when they're idle

  • dbPoolMaxConnections :: !Int

    Max number of db connections the connection pool can open to the database

  • cssFramework :: !CSSFramework

    Bootstrap 4 by default

    Override this if you use a CSS framework that is not bootstrap

  • logger :: !Logger
     
  • exceptionTracker :: !ExceptionTracker
     
  • appConfig :: !TMap

    Custom options from Config.hs are stored here

    To access a custom option here, first set it up inside Config.hs. This example reads a string from a env variable on app startup and makes it available to the app by saving it into the application context:

    -- Config.hs:
    
    newtype RedisUrl = RedisUrl String
    
    config :: ConfigBuilder
    config = do
        option Development
        option (AppHostname "localhost")
    
        redisUrl <- env "REDIS_URL"
        option (RedisUrl redisUrl)

    This redis url can be access from all IHP entrypoints using the ?applicationContext that is in scope:

    import qualified Data.TMap as TMap
    import Config -- For accessing the RedisUrl data type
    
    action MyAction = do
        let appConfig = ?context.frameworkConfig.appConfig
        let (RedisUrl redisUrl) = appConfig
                   |> TMap.lookup @RedisUrl
                   |> fromMaybe (error "Could not find RedisUrl in config")
    
  • corsResourcePolicy :: !(Maybe CorsResourcePolicy)

    Configures CORS headers for the application. By default this is set to Nothing, and the server will not respond with any CORS headers

    You can provide a custom CORS policy in Config.hs:

    -- Config.hs
    import qualified Network.Wai.Middleware.Cors as Cors
    
    config :: ConfigBuilder
    config = do
        option Development
        option (AppHostname "localhost")
    
        option Cors.simpleCorsResourcePolicy
    

    Take a look at the documentation of wai-cors https://hackage.haskell.org/package/wai-cors-0.2.7/docs/Network-Wai-Middleware-Cors.html for understanding what simpleCorsResourcePolicy is doing

    You can specify CORS origins like this:

    -- Config.hs
    import qualified Network.Wai.Middleware.Cors as Cors
    
    config :: ConfigBuilder
    config = do
        option Development
        option (AppHostname "localhost")
    
        -- The boolean True specifies if credentials are allowed for the request. You still need to set withCredentials on your XmlHttpRequest
        option Cors.simpleCorsResourcePolicy { Cors.corsOrigins = Just (["localhost"], True) }
    
  • parseRequestBodyOptions :: !ParseRequestBodyOptions

    Configures the limits for request parameters, uploaded files, maximum number of headers etc.

    IHP is using parseRequestBodyEx for parsing the HTTP request. By default it applies certain limits to avoid a single request overloading the server.

    You can find the default limits here: https://hackage.haskell.org/package/wai-extra-3.1.6/docs/Network-Wai-Parse.html#v:defaultParseRequestBodyOptions

    You can override the default limits like this:

    -- Config.hs
    import qualified Network.Wai.Parse as WaiParse
    
    config :: ConfigBuilder
    config = do
        option Development
        option (AppHostname "localhost")
    
        -- We extend the default options here
        option $ WaiParse.defaultParseRequestBodyOptions
                |> WaiParse.setMaxRequestNumFiles 20 -- Increase count of allowed files per request
    
  • ideBaseUrl :: Text

    Used by the dev server. This field cannot be strict.

  • rlsAuthenticatedRole :: !Text

    See IHP.DataSync.Role

  • assetVersion :: !Text

    The asset version is used for cache busting

    If you deploy IHP on your own, you should provide the IHP_ASSET_VERSION env variable with e.g. the git commit hash of the production build.

    If IHP cannot figure out an asset version, it will fallback to the static string "dev".

  • assetBaseUrl :: !(Maybe Text)

    Base URL used by the assetPath helper. Useful to move your static files to a CDN

  • customMiddleware :: !CustomMiddleware

    User provided WAI middleware that is run after IHP's middleware stack.

  • initializers :: ![Initializer]
     

Instances

Instances details
HasField "frameworkConfig" ControllerContext FrameworkConfig Source # 
Instance details

Defined in IHP.Controller.Context

HasField "frameworkConfig" FrameworkConfig FrameworkConfig Source # 
Instance details

Defined in IHP.FrameworkConfig

data UTCTime #

Constructors

UTCTime 

Instances

Instances details
Structured UTCTime 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy UTCTime -> Structure

structureHash' :: Tagged UTCTime MD5

FromJSON UTCTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey UTCTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON UTCTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey UTCTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

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 #

Default UTCTime Source # 
Instance details

Defined in IHP.ModelSupport

Methods

def :: UTCTime #

NFData UTCTime 
Instance details

Defined in Data.Time.Clock.Internal.UTCTime

Methods

rnf :: UTCTime -> () #

Outputable UTCTime 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: UTCTime -> SDoc

Eq UTCTime 
Instance details

Defined in Data.Time.Clock.Internal.UTCTime

Methods

(==) :: UTCTime -> UTCTime -> Bool #

(/=) :: UTCTime -> UTCTime -> Bool #

Ord UTCTime 
Instance details

Defined in Data.Time.Clock.Internal.UTCTime

ParamReader UTCTime Source #

Accepts values such as 2020-11-08T12:03:35Z or 2020-11-08

Instance details

Defined in IHP.Controller.Param

InputValue UTCTime Source # 
Instance details

Defined in IHP.ModelSupport

FromField UTCTimestamp 
Instance details

Defined in Database.PostgreSQL.Simple.FromField

Methods

fromField :: FieldParser UTCTimestamp

FromField UTCTime 
Instance details

Defined in Database.PostgreSQL.Simple.FromField

Methods

fromField :: FieldParser UTCTime

ToField UTCTimestamp 
Instance details

Defined in Database.PostgreSQL.Simple.ToField

Methods

toField :: UTCTimestamp -> Action

ToField UTCTime 
Instance details

Defined in Database.PostgreSQL.Simple.ToField

Methods

toField :: UTCTime -> Action

ISO8601 UTCTime 
Instance details

Defined in Data.Time.Format.ISO8601

Methods

iso8601Format :: Format UTCTime

ToField (PGRange UTCTimestamp) 
Instance details

Defined in Database.PostgreSQL.Simple.Range

Methods

toField :: PGRange UTCTimestamp -> Action

ToField (PGRange UTCTime) 
Instance details

Defined in Database.PostgreSQL.Simple.Range

Methods

toField :: PGRange UTCTime -> Action

find :: Foldable t => (a -> Bool) -> t a -> Maybe a #

newtype Day #

Instances

Instances details
Structured Day 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy Day -> Structure

structureHash' :: Tagged Day MD5

FromJSON Day 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Day #

parseJSONList :: Value -> Parser [Day] #

omittedField :: Maybe Day #

FromJSONKey Day 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Day 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Day 
Instance details

Defined in Data.Aeson.Types.ToJSON

Data Day 
Instance details

Defined in Data.Time.Calendar.Days

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Day -> c Day #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Day #

toConstr :: Day -> Constr #

dataTypeOf :: Day -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Day) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Day) #

gmapT :: (forall b. Data b => b -> b) -> Day -> Day #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Day -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Day -> r #

gmapQ :: (forall d. Data d => d -> u) -> Day -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Day -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Day -> m Day #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Day -> m Day #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Day -> m Day #

Enum Day 
Instance details

Defined in Data.Time.Calendar.Days

Methods

succ :: Day -> Day #

pred :: Day -> Day #

toEnum :: Int -> Day #

fromEnum :: Day -> Int #

enumFrom :: Day -> [Day] #

enumFromThen :: Day -> Day -> [Day] #

enumFromTo :: Day -> Day -> [Day] #

enumFromThenTo :: Day -> Day -> Day -> [Day] #

Ix Day 
Instance details

Defined in Data.Time.Calendar.Days

Methods

range :: (Day, Day) -> [Day]

index :: (Day, Day) -> Day -> Int

unsafeIndex :: (Day, Day) -> Day -> Int

inRange :: (Day, Day) -> Day -> Bool

rangeSize :: (Day, Day) -> Int

unsafeRangeSize :: (Day, Day) -> Int

Default Day Source # 
Instance details

Defined in IHP.ModelSupport

Methods

def :: Day #

NFData Day 
Instance details

Defined in Data.Time.Calendar.Days

Methods

rnf :: Day -> () #

Eq Day 
Instance details

Defined in Data.Time.Calendar.Days

Methods

(==) :: Day -> Day -> Bool #

(/=) :: Day -> Day -> Bool #

Ord Day 
Instance details

Defined in Data.Time.Calendar.Days

Methods

compare :: Day -> Day -> Ordering #

(<) :: Day -> Day -> Bool #

(<=) :: Day -> Day -> Bool #

(>) :: Day -> Day -> Bool #

(>=) :: Day -> Day -> Bool #

max :: Day -> Day -> Day #

min :: Day -> Day -> Day #

ParamReader Day Source #

Accepts values such as 2020-11-08

Instance details

Defined in IHP.Controller.Param

InputValue Day Source # 
Instance details

Defined in IHP.ModelSupport

Methods

inputValue :: Day -> Text Source #

FromField Date 
Instance details

Defined in Database.PostgreSQL.Simple.FromField

Methods

fromField :: FieldParser Date

FromField Day 
Instance details

Defined in Database.PostgreSQL.Simple.FromField

Methods

fromField :: FieldParser Day

ToField Date 
Instance details

Defined in Database.PostgreSQL.Simple.ToField

Methods

toField :: Date -> Action

ToField Day 
Instance details

Defined in Database.PostgreSQL.Simple.ToField

Methods

toField :: Day -> Action

DayPeriod Day 
Instance details

Defined in Data.Time.Calendar.Days

ISO8601 Day 
Instance details

Defined in Data.Time.Format.ISO8601

Methods

iso8601Format :: Format Day

ToField (PGRange Date) 
Instance details

Defined in Database.PostgreSQL.Simple.Range

Methods

toField :: PGRange Date -> Action

ToField (PGRange Day) 
Instance details

Defined in Database.PostgreSQL.Simple.Range

Methods

toField :: PGRange Day -> Action

cs :: ConvertibleStrings a b => a -> b #

class ConvertibleStrings a b where #

Methods

convertString :: a -> b #

Instances

Instances details
ConvertibleStrings ByteString Key Source # 
Instance details

Defined in IHP.HaskellSupport

ConvertibleStrings LazyByteString LazyByteString 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: LazyByteString -> LazyByteString #

ConvertibleStrings LazyByteString LazyText 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: LazyByteString -> LazyText #

ConvertibleStrings LazyByteString StrictByteString 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: LazyByteString -> StrictByteString #

ConvertibleStrings LazyByteString StrictText 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: LazyByteString -> StrictText #

ConvertibleStrings LazyByteString String 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: LazyByteString -> String #

ConvertibleStrings LazyText LazyByteString 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: LazyText -> LazyByteString #

ConvertibleStrings LazyText LazyText 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: LazyText -> LazyText #

ConvertibleStrings LazyText StrictByteString 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: LazyText -> StrictByteString #

ConvertibleStrings LazyText StrictText 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: LazyText -> StrictText #

ConvertibleStrings LazyText String 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: LazyText -> String #

ConvertibleStrings StrictByteString LazyByteString 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: StrictByteString -> LazyByteString #

ConvertibleStrings StrictByteString LazyText 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: StrictByteString -> LazyText #

ConvertibleStrings StrictByteString StrictByteString 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: StrictByteString -> StrictByteString #

ConvertibleStrings StrictByteString StrictText 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: StrictByteString -> StrictText #

ConvertibleStrings StrictByteString String 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: StrictByteString -> String #

ConvertibleStrings StrictText LazyByteString 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: StrictText -> LazyByteString #

ConvertibleStrings StrictText LazyText 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: StrictText -> LazyText #

ConvertibleStrings StrictText StrictByteString 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: StrictText -> StrictByteString #

ConvertibleStrings StrictText StrictText 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: StrictText -> StrictText #

ConvertibleStrings StrictText String 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: StrictText -> String #

ConvertibleStrings Text Key Source # 
Instance details

Defined in IHP.HaskellSupport

Methods

convertString :: Text -> Key #

ConvertibleStrings String LazyByteString 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: String -> LazyByteString #

ConvertibleStrings String LazyText 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: String -> LazyText #

ConvertibleStrings String StrictByteString 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: String -> StrictByteString #

ConvertibleStrings String StrictText 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: String -> StrictText #

ConvertibleStrings String String 
Instance details

Defined in Data.String.Conversions

HasPath action => ConvertibleStrings action AttributeValue Source #

This instances makes it possible to write href={MyAction}/ in HSX

Instance details

Defined in IHP.RouterSupport

Methods

convertString :: action -> AttributeValue #

class ToJSON a where #

Minimal complete definition

Nothing

Methods

toJSON :: a -> Value #

toEncoding :: a -> Encoding #

toJSONList :: [a] -> Value #

toEncodingList :: [a] -> Encoding #

omitField :: a -> Bool #

Instances

Instances details
ToJSON Key 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON DotNetTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Value 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Version 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Version -> Value #

toEncoding :: Version -> Encoding #

toJSONList :: [Version] -> Value #

toEncodingList :: [Version] -> Encoding #

omitField :: Version -> Bool #

ToJSON CTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: CTime -> Value #

toEncoding :: CTime -> Encoding #

toJSONList :: [CTime] -> Value #

toEncodingList :: [CTime] -> Encoding #

omitField :: CTime -> Bool #

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 #

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 #

ToJSON Int32 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Int64 
Instance details

Defined in Data.Aeson.Types.ToJSON

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 #

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 #

ToJSON Word32 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Word64 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Word8 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON IntSet 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Ordering 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Point 
Instance details

Defined in IHP.Postgres.Point

ToJSON IP 
Instance details

Defined in Net.IP

Methods

toJSON :: IP -> Value #

toEncoding :: IP -> Encoding #

toJSONList :: [IP] -> Value #

toEncodingList :: [IP] -> Encoding #

omitField :: IP -> Bool #

ToJSON IPv4 
Instance details

Defined in Net.IPv4

Methods

toJSON :: IPv4 -> Value #

toEncoding :: IPv4 -> Encoding #

toJSONList :: [IPv4] -> Value #

toEncodingList :: [IPv4] -> Encoding #

omitField :: IPv4 -> Bool #

ToJSON IPv4Range 
Instance details

Defined in Net.IPv4

Methods

toJSON :: IPv4Range -> Value #

toEncoding :: IPv4Range -> Encoding #

toJSONList :: [IPv4Range] -> Value #

toEncodingList :: [IPv4Range] -> Encoding #

omitField :: IPv4Range -> Bool #

ToJSON IPv6 
Instance details

Defined in Net.IPv6

Methods

toJSON :: IPv6 -> Value #

toEncoding :: IPv6 -> Encoding #

toJSONList :: [IPv6] -> Value #

toEncodingList :: [IPv6] -> Encoding #

omitField :: IPv6 -> Bool #

ToJSON IPv6Range 
Instance details

Defined in Net.IPv6

Methods

toJSON :: IPv6Range -> Value #

toEncoding :: IPv6Range -> Encoding #

toJSONList :: [IPv6Range] -> Value #

toEncodingList :: [IPv6Range] -> Encoding #

omitField :: IPv6Range -> Bool #

ToJSON Mac 
Instance details

Defined in Net.Mac

Methods

toJSON :: Mac -> Value #

toEncoding :: Mac -> Encoding #

toJSONList :: [Mac] -> Value #

toEncodingList :: [Mac] -> Encoding #

omitField :: Mac -> Bool #

ToJSON Change Source # 
Instance details

Defined in IHP.DataSync.ChangeNotifications

ToJSON ChangeNotification Source # 
Instance details

Defined in IHP.DataSync.ChangeNotifications

ToJSON ChangeSet Source # 
Instance details

Defined in IHP.DataSync.ChangeNotifications

ToJSON DynamicValue Source # 
Instance details

Defined in IHP.DataSync.DynamicQuery

ToJSON UndecodedJSON Source # 
Instance details

Defined in IHP.DataSync.REST.Controller

ToJSON DataSyncResponse Source # 
Instance details

Defined in IHP.DataSync.ControllerImpl

ToJSON GraphQLResult Source # 
Instance details

Defined in IHP.DataSync.REST.Controller

ToJSON EnhancedSqlError Source # 
Instance details

Defined in IHP.DataSync.REST.Controller

ToJSON HealOpts 
Instance details

Defined in Network.Minio.AdminAPI

Methods

toJSON :: HealOpts -> Value #

toEncoding :: HealOpts -> Encoding #

toJSONList :: [HealOpts] -> Value #

toEncodingList :: [HealOpts] -> Encoding #

omitField :: HealOpts -> Bool #

ToJSON ServiceAction 
Instance details

Defined in Network.Minio.AdminAPI

Methods

toJSON :: ServiceAction -> Value #

toEncoding :: ServiceAction -> Encoding #

toJSONList :: [ServiceAction] -> Value #

toEncodingList :: [ServiceAction] -> Encoding #

omitField :: ServiceAction -> Bool #

ToJSON PostPolicy 
Instance details

Defined in Network.Minio.PresignedOperations

Methods

toJSON :: PostPolicy -> Value #

toEncoding :: PostPolicy -> Encoding #

toJSONList :: [PostPolicy] -> Value #

toEncodingList :: [PostPolicy] -> Encoding #

omitField :: PostPolicy -> Bool #

ToJSON PostPolicyCondition 
Instance details

Defined in Network.Minio.PresignedOperations

Methods

toJSON :: PostPolicyCondition -> Value #

toEncoding :: PostPolicyCondition -> Encoding #

toJSONList :: [PostPolicyCondition] -> Value #

toEncodingList :: [PostPolicyCondition] -> Encoding #

omitField :: PostPolicyCondition -> Bool #

ToJSON URI 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: URI -> Value #

toEncoding :: URI -> Encoding #

toJSONList :: [URI] -> Value #

toEncodingList :: [URI] -> Encoding #

omitField :: URI -> Bool #

ToJSON SqlError Source # 
Instance details

Defined in IHP.DataSync.REST.Controller

Methods

toJSON :: SqlError -> Value #

toEncoding :: SqlError -> Encoding #

toJSONList :: [SqlError] -> Value #

toEncodingList :: [SqlError] -> Encoding #

omitField :: SqlError -> Bool #

ToJSON Scientific 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Scientific -> Value #

toEncoding :: Scientific -> Encoding #

toJSONList :: [Scientific] -> Value #

toEncodingList :: [Scientific] -> Encoding #

omitField :: Scientific -> Bool #

ToJSON Text 
Instance details

Defined in Data.Aeson.Types.ToJSON

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 #

ToJSON ShortText 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: ShortText -> Value #

toEncoding :: ShortText -> Encoding #

toJSONList :: [ShortText] -> Value #

toEncodingList :: [ShortText] -> Encoding #

omitField :: ShortText -> Bool #

ToJSON CalendarDiffDays 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Day 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Month 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Month -> Value #

toEncoding :: Month -> Encoding #

toJSONList :: [Month] -> Value #

toEncodingList :: [Month] -> Encoding #

omitField :: Month -> Bool #

ToJSON Quarter 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Quarter -> Value #

toEncoding :: Quarter -> Encoding #

toJSONList :: [Quarter] -> Value #

toEncodingList :: [Quarter] -> Encoding #

omitField :: Quarter -> Bool #

ToJSON QuarterOfYear 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: QuarterOfYear -> Value #

toEncoding :: QuarterOfYear -> Encoding #

toJSONList :: [QuarterOfYear] -> Value #

toEncodingList :: [QuarterOfYear] -> Encoding #

omitField :: QuarterOfYear -> Bool #

ToJSON DayOfWeek 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON DiffTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON NominalDiffTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON SystemTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: SystemTime -> Value #

toEncoding :: SystemTime -> Encoding #

toJSONList :: [SystemTime] -> Value #

toEncodingList :: [SystemTime] -> Encoding #

omitField :: SystemTime -> Bool #

ToJSON UTCTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON CalendarDiffTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON LocalTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON TimeOfDay 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON ZonedTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON UUID 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Integer 
Instance details

Defined in Data.Aeson.Types.ToJSON

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 #

ToJSON () 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: () -> Value #

toEncoding :: () -> Encoding #

toJSONList :: [()] -> Value #

toEncodingList :: [()] -> Encoding #

omitField :: () -> Bool #

ToJSON Bool 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Char 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Double 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Float 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Int 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON Word 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON v => ToJSON (KeyMap v) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: KeyMap v -> Value #

toEncoding :: KeyMap v -> Encoding #

toJSONList :: [KeyMap v] -> Value #

toEncodingList :: [KeyMap v] -> Encoding #

omitField :: KeyMap v -> Bool #

ToJSON a => ToJSON (Identity a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

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 #

ToJSON a => ToJSON (Last a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Last a -> Value #

toEncoding :: Last a -> Encoding #

toJSONList :: [Last a] -> Value #

toEncodingList :: [Last a] -> Encoding #

omitField :: Last a -> Bool #

ToJSON a => ToJSON (Down a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

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 #

ToJSON a => ToJSON (Last a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Last a -> Value #

toEncoding :: Last a -> Encoding #

toJSONList :: [Last a] -> Value #

toEncodingList :: [Last a] -> Encoding #

omitField :: Last a -> Bool #

ToJSON a => ToJSON (Max a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Max a -> Value #

toEncoding :: Max a -> Encoding #

toJSONList :: [Max a] -> Value #

toEncodingList :: [Max a] -> Encoding #

omitField :: Max a -> Bool #

ToJSON a => ToJSON (Min a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Min a -> Value #

toEncoding :: Min a -> Encoding #

toJSONList :: [Min a] -> Value #

toEncodingList :: [Min a] -> Encoding #

omitField :: Min a -> Bool #

ToJSON a => ToJSON (WrappedMonoid a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a => ToJSON (Dual a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Dual a -> Value #

toEncoding :: Dual a -> Encoding #

toJSONList :: [Dual a] -> Value #

toEncodingList :: [Dual a] -> Encoding #

omitField :: Dual a -> Bool #

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 #

(Generic a, GToJSON' Value Zero (Rep a), GToJSON' Encoding Zero (Rep a)) => ToJSON (Generically a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Generically a -> Value #

toEncoding :: Generically a -> Encoding #

toJSONList :: [Generically a] -> Value #

toEncodingList :: [Generically a] -> Encoding #

omitField :: Generically a -> Bool #

(ToJSON a, Integral a) => ToJSON (Ratio a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Ratio a -> Value #

toEncoding :: Ratio a -> Encoding #

toJSONList :: [Ratio a] -> Value #

toEncodingList :: [Ratio a] -> Encoding #

omitField :: Ratio a -> Bool #

ToJSON a => ToJSON (IntMap a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

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 #

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 #

ToJSON v => ToJSON (Tree v) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Tree v -> Value #

toEncoding :: Tree v -> Encoding #

toJSONList :: [Tree v] -> Value #

toEncodingList :: [Tree v] -> Encoding #

omitField :: Tree v -> Bool #

ToJSON1 f => ToJSON (Fix f) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Fix f -> Value #

toEncoding :: Fix f -> Encoding #

toJSONList :: [Fix f] -> Value #

toEncodingList :: [Fix f] -> Encoding #

omitField :: Fix f -> Bool #

(ToJSON1 f, Functor f) => ToJSON (Mu f) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Mu f -> Value #

toEncoding :: Mu f -> Encoding #

toJSONList :: [Mu f] -> Value #

toEncodingList :: [Mu f] -> Encoding #

omitField :: Mu f -> Bool #

(ToJSON1 f, Functor f) => ToJSON (Nu f) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Nu f -> Value #

toEncoding :: Nu f -> Encoding #

toJSONList :: [Nu f] -> Value #

toEncodingList :: [Nu f] -> Encoding #

omitField :: Nu f -> Bool #

ToJSON a => ToJSON (DNonEmpty a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: DNonEmpty a -> Value #

toEncoding :: DNonEmpty a -> Encoding #

toJSONList :: [DNonEmpty a] -> Value #

toEncodingList :: [DNonEmpty a] -> Encoding #

omitField :: DNonEmpty a -> Bool #

ToJSON a => ToJSON (DList a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON (PrimaryKey a) => ToJSON (Id' a) Source # 
Instance details

Defined in IHP.ModelSupport

Methods

toJSON :: Id' a -> Value #

toEncoding :: Id' a -> Encoding #

toJSONList :: [Id' a] -> Value #

toEncodingList :: [Id' a] -> Encoding #

omitField :: Id' a -> Bool #

ToJSON a => ToJSON (Array a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Array a -> Value #

toEncoding :: Array a -> Encoding #

toJSONList :: [Array a] -> Value #

toEncodingList :: [Array a] -> Encoding #

omitField :: Array a -> Bool #

(Prim a, ToJSON a) => ToJSON (PrimArray a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: PrimArray a -> Value #

toEncoding :: PrimArray a -> Encoding #

toJSONList :: [PrimArray a] -> Value #

toEncodingList :: [PrimArray a] -> Encoding #

omitField :: PrimArray a -> Bool #

ToJSON a => ToJSON (SmallArray a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: SmallArray a -> Value #

toEncoding :: SmallArray a -> Encoding #

toJSONList :: [SmallArray a] -> Value #

toEncodingList :: [SmallArray a] -> Encoding #

omitField :: SmallArray a -> Bool #

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 #

ToJSON a => ToJSON (HashSet a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a => ToJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

(Prim 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 #

(Storable 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 #

(Vector 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 #

ToJSON a => ToJSON (Maybe a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSON a => ToJSON (Solo a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Solo a -> Value #

toEncoding :: Solo a -> Encoding #

toJSONList :: [Solo a] -> Value #

toEncodingList :: [Solo a] -> Encoding #

omitField :: Solo a -> Bool #

ToJSON [Field] Source # 
Instance details

Defined in IHP.DataSync.DynamicQuery

ToJSON a => ToJSON [a] 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: [a] -> Value #

toEncoding :: [a] -> Encoding #

toJSONList :: [[a]] -> Value #

toEncodingList :: [[a]] -> Encoding #

omitField :: [a] -> Bool #

(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 #

HasResolution a => ToJSON (Fixed a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Fixed a -> Value #

toEncoding :: Fixed a -> Encoding #

toJSONList :: [Fixed a] -> Value #

toEncodingList :: [Fixed a] -> Encoding #

omitField :: Fixed a -> Bool #

ToJSON (Proxy a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

(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 #

(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 #

(ToJSON a, ToJSON b) => ToJSON (These a b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: These a b -> Value #

toEncoding :: These a b -> Encoding #

toJSONList :: [These a b] -> Value #

toEncodingList :: [These a b] -> Encoding #

omitField :: These a b -> Bool #

(ToJSON a, ToJSON b) => ToJSON (Pair a b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Pair a b -> Value #

toEncoding :: Pair a b -> Encoding #

toJSONList :: [Pair a b] -> Value #

toEncodingList :: [Pair a b] -> Encoding #

omitField :: Pair a b -> Bool #

(ToJSON a, ToJSON b) => ToJSON (These a b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: These a b -> Value #

toEncoding :: These a b -> Encoding #

toJSONList :: [These a b] -> Value #

toEncodingList :: [These a b] -> Encoding #

omitField :: These a b -> Bool #

(ToJSON v, ToJSONKey k) => ToJSON (HashMap k v) 
Instance details

Defined in Data.Aeson.Types.ToJSON

(ToJSON a, ToJSON b) => ToJSON (a, b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: (a, b) -> Value #

toEncoding :: (a, b) -> Encoding #

toJSONList :: [(a, b)] -> Value #

toEncodingList :: [(a, b)] -> Encoding #

omitField :: (a, b) -> Bool #

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 b => ToJSON (Tagged a b) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Tagged a b -> Value #

toEncoding :: Tagged a b -> Encoding #

toJSONList :: [Tagged a b] -> Value #

toEncodingList :: [Tagged a b] -> Encoding #

omitField :: Tagged a b -> Bool #

(ToJSON1 f, ToJSON1 g, ToJSON a) => ToJSON (These1 f g a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: These1 f g a -> Value #

toEncoding :: These1 f g a -> Encoding #

toJSONList :: [These1 f g a] -> Value #

toEncodingList :: [These1 f g a] -> Encoding #

omitField :: These1 f g a -> Bool #

(ToJSON a, ToJSON b, ToJSON c) => ToJSON (a, b, c) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: (a, b, c) -> Value #

toEncoding :: (a, b, c) -> Encoding #

toJSONList :: [(a, b, c)] -> Value #

toEncodingList :: [(a, b, c)] -> Encoding #

omitField :: (a, b, c) -> Bool #

(ToJSON1 f, ToJSON1 g, ToJSON a) => ToJSON (Product f g a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Product f g a -> Value #

toEncoding :: Product f g a -> Encoding #

toJSONList :: [Product f g a] -> Value #

toEncodingList :: [Product f g a] -> Encoding #

omitField :: Product f g a -> Bool #

(ToJSON1 f, ToJSON1 g, ToJSON a) => ToJSON (Sum f g a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Sum f g a -> Value #

toEncoding :: Sum f g a -> Encoding #

toJSONList :: [Sum f g a] -> Value #

toEncodingList :: [Sum f g a] -> Encoding #

omitField :: Sum f g a -> Bool #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d) => ToJSON (a, b, c, d) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: (a, b, c, d) -> Value #

toEncoding :: (a, b, c, d) -> Encoding #

toJSONList :: [(a, b, c, d)] -> Value #

toEncodingList :: [(a, b, c, d)] -> Encoding #

omitField :: (a, b, c, d) -> Bool #

(ToJSON1 f, ToJSON1 g, ToJSON a) => ToJSON (Compose f g a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: Compose f g a -> Value #

toEncoding :: Compose f g a -> Encoding #

toJSONList :: [Compose f g a] -> Value #

toEncodingList :: [Compose f g a] -> Encoding #

omitField :: Compose f g a -> Bool #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e) => ToJSON (a, b, c, d, e) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: (a, b, c, d, e) -> Value #

toEncoding :: (a, b, c, d, e) -> Encoding #

toJSONList :: [(a, b, c, d, e)] -> Value #

toEncodingList :: [(a, b, c, d, e)] -> Encoding #

omitField :: (a, b, c, d, e) -> Bool #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f) => ToJSON (a, b, c, d, e, f) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: (a, b, c, d, e, f) -> Value #

toEncoding :: (a, b, c, d, e, f) -> Encoding #

toJSONList :: [(a, b, c, d, e, f)] -> Value #

toEncodingList :: [(a, b, c, d, e, f)] -> Encoding #

omitField :: (a, b, c, d, e, f) -> Bool #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g) => ToJSON (a, b, c, d, e, f, g) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: (a, b, c, d, e, f, g) -> Value #

toEncoding :: (a, b, c, d, e, f, g) -> Encoding #

toJSONList :: [(a, b, c, d, e, f, g)] -> Value #

toEncodingList :: [(a, b, c, d, e, f, g)] -> Encoding #

omitField :: (a, b, c, d, e, f, g) -> Bool #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h) => ToJSON (a, b, c, d, e, f, g, h) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: (a, b, c, d, e, f, g, h) -> Value #

toEncoding :: (a, b, c, d, e, f, g, h) -> Encoding #

toJSONList :: [(a, b, c, d, e, f, g, h)] -> Value #

toEncodingList :: [(a, b, c, d, e, f, g, h)] -> Encoding #

omitField :: (a, b, c, d, e, f, g, h) -> Bool #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h, ToJSON i) => ToJSON (a, b, c, d, e, f, g, h, i) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: (a, b, c, d, e, f, g, h, i) -> Value #

toEncoding :: (a, b, c, d, e, f, g, h, i) -> Encoding #

toJSONList :: [(a, b, c, d, e, f, g, h, i)] -> Value #

toEncodingList :: [(a, b, c, d, e, f, g, h, i)] -> Encoding #

omitField :: (a, b, c, d, e, f, g, h, i) -> Bool #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h, ToJSON i, ToJSON j) => ToJSON (a, b, c, d, e, f, g, h, i, j) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: (a, b, c, d, e, f, g, h, i, j) -> Value #

toEncoding :: (a, b, c, d, e, f, g, h, i, j) -> Encoding #

toJSONList :: [(a, b, c, d, e, f, g, h, i, j)] -> Value #

toEncodingList :: [(a, b, c, d, e, f, g, h, i, j)] -> Encoding #

omitField :: (a, b, c, d, e, f, g, h, i, j) -> Bool #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h, ToJSON i, ToJSON j, ToJSON k) => ToJSON (a, b, c, d, e, f, g, h, i, j, k) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: (a, b, c, d, e, f, g, h, i, j, k) -> Value #

toEncoding :: (a, b, c, d, e, f, g, h, i, j, k) -> Encoding #

toJSONList :: [(a, b, c, d, e, f, g, h, i, j, k)] -> Value #

toEncodingList :: [(a, b, c, d, e, f, g, h, i, j, k)] -> Encoding #

omitField :: (a, b, c, d, e, f, g, h, i, j, k) -> Bool #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h, ToJSON i, ToJSON j, ToJSON k, ToJSON l) => ToJSON (a, b, c, d, e, f, g, h, i, j, k, l) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: (a, b, c, d, e, f, g, h, i, j, k, l) -> Value #

toEncoding :: (a, b, c, d, e, f, g, h, i, j, k, l) -> Encoding #

toJSONList :: [(a, b, c, d, e, f, g, h, i, j, k, l)] -> Value #

toEncodingList :: [(a, b, c, d, e, f, g, h, i, j, k, l)] -> Encoding #

omitField :: (a, b, c, d, e, f, g, h, i, j, k, l) -> Bool #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h, ToJSON i, ToJSON j, ToJSON k, ToJSON l, ToJSON m) => ToJSON (a, b, c, d, e, f, g, h, i, j, k, l, m) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Value #

toEncoding :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Encoding #

toJSONList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m)] -> Value #

toEncodingList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m)] -> Encoding #

omitField :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Bool #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h, ToJSON i, ToJSON j, ToJSON k, ToJSON l, ToJSON m, ToJSON n) => ToJSON (a, b, c, d, e, f, g, h, i, j, k, l, m, n) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Value #

toEncoding :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Encoding #

toJSONList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m, n)] -> Value #

toEncodingList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m, n)] -> Encoding #

omitField :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Bool #

(ToJSON a, ToJSON b, ToJSON c, ToJSON d, ToJSON e, ToJSON f, ToJSON g, ToJSON h, ToJSON i, ToJSON j, ToJSON k, ToJSON l, ToJSON m, ToJSON n, ToJSON o) => ToJSON (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

toJSON :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Value #

toEncoding :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Encoding #

toJSONList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)] -> Value #

toEncodingList :: [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)] -> Encoding #

omitField :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Bool #

data Point #

Constructors

Point 

Fields

Instances

Instances details
FromJSON Point 
Instance details

Defined in IHP.Postgres.Point

Methods

parseJSON :: Value -> Parser Point #

parseJSONList :: Value -> Parser [Point] #

omittedField :: Maybe Point #

ToJSON Point 
Instance details

Defined in IHP.Postgres.Point

Show Point 
Instance details

Defined in IHP.Postgres.Point

Methods

showsPrec :: Int -> Point -> ShowS #

show :: Point -> String

showList :: [Point] -> ShowS #

Default Point Source # 
Instance details

Defined in IHP.ModelSupport

Methods

def :: Point #

Eq Point 
Instance details

Defined in IHP.Postgres.Point

Methods

(==) :: Point -> Point -> Bool #

(/=) :: Point -> Point -> Bool #

Ord Point 
Instance details

Defined in IHP.Postgres.Point

Methods

compare :: Point -> Point -> Ordering #

(<) :: Point -> Point -> Bool #

(<=) :: Point -> Point -> Bool #

(>) :: Point -> Point -> Bool #

(>=) :: Point -> Point -> Bool #

max :: Point -> Point -> Point #

min :: Point -> Point -> Point #

ParamReader Point Source # 
Instance details

Defined in IHP.Controller.Param

FromField Point 
Instance details

Defined in IHP.Postgres.Point

Methods

fromField :: FieldParser Point

ToField Point 
Instance details

Defined in IHP.Postgres.Point

Methods

toField :: Point -> Action

data Polygon #

Constructors

Polygon 

Fields

Instances

Instances details
Show Polygon 
Instance details

Defined in IHP.Postgres.Polygon

Methods

showsPrec :: Int -> Polygon -> ShowS #

show :: Polygon -> String

showList :: [Polygon] -> ShowS #

Default Polygon Source # 
Instance details

Defined in IHP.ModelSupport

Methods

def :: Polygon #

Eq Polygon 
Instance details

Defined in IHP.Postgres.Polygon

Methods

(==) :: Polygon -> Polygon -> Bool #

(/=) :: Polygon -> Polygon -> Bool #

Ord Polygon 
Instance details

Defined in IHP.Postgres.Polygon

ParamReader Polygon Source # 
Instance details

Defined in IHP.Controller.Param

FromField Polygon 
Instance details

Defined in IHP.Postgres.Polygon

Methods

fromField :: FieldParser Polygon

ToField Polygon 
Instance details

Defined in IHP.Postgres.Polygon

Methods

toField :: Polygon -> Action

data TSVector #

Constructors

TSVector [Lexeme] 

Instances

Instances details
Show TSVector 
Instance details

Defined in IHP.Postgres.TSVector

Methods

showsPrec :: Int -> TSVector -> ShowS #

show :: TSVector -> String

showList :: [TSVector] -> ShowS #

Default TSVector Source # 
Instance details

Defined in IHP.ModelSupport

Methods

def :: TSVector #

Eq TSVector 
Instance details

Defined in IHP.Postgres.TSVector

Ord TSVector 
Instance details

Defined in IHP.Postgres.TSVector

FromField TSVector 
Instance details

Defined in IHP.Postgres.TSVector

Methods

fromField :: FieldParser TSVector

ToField TSVector 
Instance details

Defined in IHP.Postgres.TSVector

Methods

toField :: TSVector -> Action

class Default a where #

Minimal complete definition

Nothing

Methods

def :: a #

Instances

Instances details
Default Value Source # 
Instance details

Defined in IHP.ModelSupport

Methods

def :: Value #

Default OAuth 
Instance details

Defined in Web.Authenticate.OAuth

Methods

def :: OAuth #

Default All 
Instance details

Defined in Data.Default.Class

Methods

def :: All #

Default Any 
Instance details

Defined in Data.Default.Class

Methods

def :: Any #

Default CClock 
Instance details

Defined in Data.Default.Class

Methods

def :: CClock #

Default CDouble 
Instance details

Defined in Data.Default.Class

Methods

def :: CDouble #

Default CFloat 
Instance details

Defined in Data.Default.Class

Methods

def :: CFloat #

Default CInt 
Instance details

Defined in Data.Default.Class

Methods

def :: CInt #

Default CIntMax 
Instance details

Defined in Data.Default.Class

Methods

def :: CIntMax #

Default CIntPtr 
Instance details

Defined in Data.Default.Class

Methods

def :: CIntPtr #

Default CLLong 
Instance details

Defined in Data.Default.Class

Methods

def :: CLLong #

Default CLong 
Instance details

Defined in Data.Default.Class

Methods

def :: CLong #

Default CPtrdiff 
Instance details

Defined in Data.Default.Class

Methods

def :: CPtrdiff #

Default CSUSeconds 
Instance details

Defined in Data.Default.Class

Methods

def :: CSUSeconds #

Default CShort 
Instance details

Defined in Data.Default.Class

Methods

def :: CShort #

Default CSigAtomic 
Instance details

Defined in Data.Default.Class

Methods

def :: CSigAtomic #

Default CSize 
Instance details

Defined in Data.Default.Class

Methods

def :: CSize #

Default CTime 
Instance details

Defined in Data.Default.Class

Methods

def :: CTime #

Default CUInt 
Instance details

Defined in Data.Default.Class

Methods

def :: CUInt #

Default CUIntMax 
Instance details

Defined in Data.Default.Class

Methods

def :: CUIntMax #

Default CUIntPtr 
Instance details

Defined in Data.Default.Class

Methods

def :: CUIntPtr #

Default CULLong 
Instance details

Defined in Data.Default.Class

Methods

def :: CULLong #

Default CULong 
Instance details

Defined in Data.Default.Class

Methods

def :: CULong #

Default CUSeconds 
Instance details

Defined in Data.Default.Class

Methods

def :: CUSeconds #

Default CUShort 
Instance details

Defined in Data.Default.Class

Methods

def :: CUShort #

Default Int16 
Instance details

Defined in Data.Default.Class

Methods

def :: Int16 #

Default Int32 
Instance details

Defined in Data.Default.Class

Methods

def :: Int32 #

Default Int64 
Instance details

Defined in Data.Default.Class

Methods

def :: Int64 #

Default Int8 
Instance details

Defined in Data.Default.Class

Methods

def :: Int8 #

Default Word16 
Instance details

Defined in Data.Default.Class

Methods

def :: Word16 #

Default Word32 
Instance details

Defined in Data.Default.Class

Methods

def :: Word32 #

Default Word64 
Instance details

Defined in Data.Default.Class

Methods

def :: Word64 #

Default Word8 
Instance details

Defined in Data.Default.Class

Methods

def :: Word8 #

Default SetCookie 
Instance details

Defined in Web.Cookie

Methods

def :: SetCookie #

Default ValidationChecks 
Instance details

Defined in Data.X509.Validation

Methods

def :: ValidationChecks #

Default ValidationHooks 
Instance details

Defined in Data.X509.Validation

Methods

def :: ValidationHooks #

Default Ordering 
Instance details

Defined in Data.Default.Class

Methods

def :: Ordering #

Default Point Source # 
Instance details

Defined in IHP.ModelSupport

Methods

def :: Point #

Default Polygon Source # 
Instance details

Defined in IHP.ModelSupport

Methods

def :: Polygon #

Default TSVector Source # 
Instance details

Defined in IHP.ModelSupport

Methods

def :: TSVector #

Default PGInterval Source # 
Instance details

Defined in IHP.ModelSupport

Methods

def :: PGInterval #

Default StoreFileOptions Source # 
Instance details

Defined in IHP.FileStorage.Types

Default JobStatus Source # 
Instance details

Defined in IHP.Job.Queue

Methods

def :: JobStatus #

Default LoggerSettings Source # 
Instance details

Defined in IHP.Log.Types

Methods

def :: LoggerSettings #

Default MetaBag Source # 
Instance details

Defined in IHP.ModelSupport

Methods

def :: MetaBag #

Default CSSFramework Source #

Provides an unstyled CSSFramework

This way we can later add more properties to the CSSFramework without having to update all the CSS Frameworks manually

Instance details

Defined in IHP.View.CSSFramework

Methods

def :: CSSFramework #

Default Scientific Source # 
Instance details

Defined in IHP.ModelSupport

Methods

def :: Scientific #

Default Text Source # 
Instance details

Defined in IHP.ModelSupport

Methods

def :: Text #

Default Day Source # 
Instance details

Defined in IHP.ModelSupport

Methods

def :: Day #

Default NominalDiffTime Source # 
Instance details

Defined in IHP.ModelSupport

Default UTCTime Source # 
Instance details

Defined in IHP.ModelSupport

Methods

def :: UTCTime #

Default LocalTime Source # 
Instance details

Defined in IHP.ModelSupport

Methods

def :: LocalTime #

Default TimeOfDay Source # 
Instance details

Defined in IHP.ModelSupport

Methods

def :: TimeOfDay #

Default UUID Source # 
Instance details

Defined in IHP.HaskellSupport

Methods

def :: UUID #

Default GzipSettings 
Instance details

Defined in Network.Wai.Middleware.Gzip

Methods

def :: GzipSettings #

Default DetailedSettings 
Instance details

Defined in Network.Wai.Middleware.RequestLogger

Methods

def :: DetailedSettings #

Default RequestLoggerSettings 
Instance details

Defined in Network.Wai.Middleware.RequestLogger

Methods

def :: RequestLoggerSettings #

Default ParseSettings 
Instance details

Defined in Text.XML.Stream.Parse

Methods

def :: ParseSettings #

Default RenderSettings 
Instance details

Defined in Text.XML.Stream.Render

Methods

def :: RenderSettings #

Default Integer 
Instance details

Defined in Data.Default.Class

Methods

def :: Integer #

Default () 
Instance details

Defined in Data.Default.Class

Methods

def :: () #

Default Bool Source # 
Instance details

Defined in IHP.ModelSupport

Methods

def :: Bool #

Default Double 
Instance details

Defined in Data.Default.Class

Methods

def :: Double #

Default Float 
Instance details

Defined in Data.Default.Class

Methods

def :: Float #

Default Int 
Instance details

Defined in Data.Default.Class

Methods

def :: Int #

Default Word 
Instance details

Defined in Data.Default.Class

Methods

def :: Word #

(Default a, RealFloat a) => Default (Complex a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Complex a #

Default (First a) 
Instance details

Defined in Data.Default.Class

Methods

def :: First a #

Default (Last a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Last a #

Default a => Default (Dual a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Dual a #

Default (Endo a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Endo a #

Num a => Default (Product a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Product a #

Num a => Default (Sum a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Sum a #

Integral a => Default (Ratio a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Ratio a #

Default a => Default (IO a) 
Instance details

Defined in Data.Default.Class

Methods

def :: IO a #

Table (GetModelByTableName table) => Default (QueryBuilder table) Source # 
Instance details

Defined in IHP.QueryBuilder

Methods

def :: QueryBuilder table #

Default (Binary ByteString) Source # 
Instance details

Defined in IHP.ModelSupport

Methods

def :: Binary ByteString #

Default (Maybe a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Maybe a #

Default [a] 
Instance details

Defined in Data.Default.Class

Methods

def :: [a] #

(Default a, Default b) => Default (a, b) 
Instance details

Defined in Data.Default.Class

Methods

def :: (a, b) #

Default r => Default (e -> r) 
Instance details

Defined in Data.Default.Class

Methods

def :: e -> r #

(Default a, Default b, Default c) => Default (a, b, c) 
Instance details

Defined in Data.Default.Class

Methods

def :: (a, b, c) #

(Default a, Default b, Default c, Default d) => Default (a, b, c, d) 
Instance details

Defined in Data.Default.Class

Methods

def :: (a, b, c, d) #

(Default a, Default b, Default c, Default d, Default e) => Default (a, b, c, d, e) 
Instance details

Defined in Data.Default.Class

Methods

def :: (a, b, c, d, e) #

(Default a, Default b, Default c, Default d, Default e, Default f) => Default (a, b, c, d, e, f) 
Instance details

Defined in Data.Default.Class

Methods

def :: (a, b, c, d, e, f) #

(Default a, Default b, Default c, Default d, Default e, Default f, Default g) => Default (a, b, c, d, e, f, g) 
Instance details

Defined in Data.Default.Class

Methods

def :: (a, b, c, d, e, f, g) #

data FieldWithDefault valueType Source #

Represents fields that have a default value in an SQL schema

The Default constructor represents the default value from the schema, while the NonDefault constructor holds some other value for the field

Constructors

Default 
NonDefault valueType 

Instances

Instances details
Show valueType => Show (FieldWithDefault valueType) Source # 
Instance details

Defined in IHP.ModelSupport

Methods

showsPrec :: Int -> FieldWithDefault valueType -> ShowS #

show :: FieldWithDefault valueType -> String

showList :: [FieldWithDefault valueType] -> ShowS #

Eq valueType => Eq (FieldWithDefault valueType) Source # 
Instance details

Defined in IHP.ModelSupport

Methods

(==) :: FieldWithDefault valueType -> FieldWithDefault valueType -> Bool #

(/=) :: FieldWithDefault valueType -> FieldWithDefault valueType -> Bool #

ToField valueType => ToField (FieldWithDefault valueType) Source # 
Instance details

Defined in IHP.ModelSupport

Methods

toField :: FieldWithDefault valueType -> Action

data LocalTime #

Constructors

LocalTime 

Instances

Instances details
Structured LocalTime 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy LocalTime -> Structure

structureHash' :: Tagged LocalTime MD5

FromJSON LocalTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey LocalTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON LocalTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey LocalTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

Data LocalTime 
Instance details

Defined in Data.Time.LocalTime.Internal.LocalTime

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LocalTime -> c LocalTime #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c LocalTime #

toConstr :: LocalTime -> Constr #

dataTypeOf :: LocalTime -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LocalTime) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c LocalTime) #

gmapT :: (forall b. Data b => b -> b) -> LocalTime -> LocalTime #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LocalTime -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LocalTime -> r #

gmapQ :: (forall d. Data d => d -> u) -> LocalTime -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> LocalTime -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> LocalTime -> m LocalTime #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LocalTime -> m LocalTime #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LocalTime -> m LocalTime #

Show LocalTime 
Instance details

Defined in Data.Time.LocalTime.Internal.LocalTime

Methods

showsPrec :: Int -> LocalTime -> ShowS #

show :: LocalTime -> String

showList :: [LocalTime] -> ShowS #

Default LocalTime Source # 
Instance details

Defined in IHP.ModelSupport

Methods

def :: LocalTime #

NFData LocalTime 
Instance details

Defined in Data.Time.LocalTime.Internal.LocalTime

Methods

rnf :: LocalTime -> () #

Eq LocalTime 
Instance details

Defined in Data.Time.LocalTime.Internal.LocalTime

Ord LocalTime 
Instance details

Defined in Data.Time.LocalTime.Internal.LocalTime

ParamReader LocalTime Source #

Accepts values such as 2020-11-08T12:03:35Z or 2020-11-08

Instance details

Defined in IHP.Controller.Param

InputValue LocalTime Source # 
Instance details

Defined in IHP.ModelSupport

FromField LocalTimestamp 
Instance details

Defined in Database.PostgreSQL.Simple.FromField

Methods

fromField :: FieldParser LocalTimestamp

FromField LocalTime 
Instance details

Defined in Database.PostgreSQL.Simple.FromField

Methods

fromField :: FieldParser LocalTime

ToField LocalTimestamp 
Instance details

Defined in Database.PostgreSQL.Simple.ToField

Methods

toField :: LocalTimestamp -> Action

ToField LocalTime 
Instance details

Defined in Database.PostgreSQL.Simple.ToField

Methods

toField :: LocalTime -> Action

ISO8601 LocalTime 
Instance details

Defined in Data.Time.Format.ISO8601

Methods

iso8601Format :: Format LocalTime

ToField (PGRange LocalTimestamp) 
Instance details

Defined in Database.PostgreSQL.Simple.Range

Methods

toField :: PGRange LocalTimestamp -> Action

ToField (PGRange LocalTime) 
Instance details

Defined in Database.PostgreSQL.Simple.Range

Methods

toField :: PGRange LocalTime -> Action

data UUID #

Instances

Instances details
FromJSON UUID 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser UUID #

parseJSONList :: Value -> Parser [UUID] #

omittedField :: Maybe UUID #

FromJSONKey UUID 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON UUID 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey UUID 
Instance details

Defined in Data.Aeson.Types.ToJSON

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 #

IsString UUID Source # 
Instance details

Defined in IHP.HaskellSupport

Methods

fromString :: String -> UUID #

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 ()

Read UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

readsPrec :: Int -> ReadS UUID

readList :: ReadS [UUID]

readPrec :: ReadPrec UUID

readListPrec :: ReadPrec [UUID]

Show UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

showsPrec :: Int -> UUID -> ShowS #

show :: UUID -> String

showList :: [UUID] -> ShowS #

Binary UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

put :: UUID -> Put

get :: Get UUID

putList :: [UUID] -> Put

Default UUID Source # 
Instance details

Defined in IHP.HaskellSupport

Methods

def :: UUID #

NFData UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

rnf :: UUID -> () #

Eq UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

(==) :: UUID -> UUID -> Bool #

(/=) :: UUID -> UUID -> Bool #

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 #

Hashable UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

hashWithSalt :: Int -> UUID -> Int #

hash :: UUID -> Int #

ParamReader UUID Source # 
Instance details

Defined in IHP.Controller.Param

IsEmpty UUID Source # 
Instance details

Defined in IHP.HaskellSupport

Methods

isEmpty :: UUID -> Bool Source #

InputValue UUID Source # 
Instance details

Defined in IHP.ModelSupport

Methods

inputValue :: UUID -> Text Source #

ParsePrimaryKey UUID Source # 
Instance details

Defined in IHP.ModelSupport

FromField UUID 
Instance details

Defined in Database.PostgreSQL.Simple.FromField

Methods

fromField :: FieldParser UUID

ToField UUID 
Instance details

Defined in Database.PostgreSQL.Simple.ToField

Methods

toField :: UUID -> Action

Random UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

randomR :: RandomGen g => (UUID, UUID) -> g -> (UUID, g)

random :: RandomGen g => g -> (UUID, g)

randomRs :: RandomGen g => (UUID, UUID) -> g -> [UUID]

randoms :: RandomGen g => g -> [UUID]

Uniform UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

uniformM :: StatefulGen g m => g -> m UUID

WebSocketsData UUID 
Instance details

Defined in IHP.WebSocket

Methods

fromDataMessage :: DataMessage -> UUID

fromLazyByteString :: ByteString -> UUID

toLazyByteString :: UUID -> ByteString

Lift UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

lift :: Quote m => UUID -> m Exp

liftTyped :: forall (m :: Type -> Type). Quote m => UUID -> Code m UUID

SetField "subscriptions" DataSyncController (HashMap UUID (MVar ())) Source # 
Instance details

Defined in IHP.DataSync.ControllerImpl

SetField "transactions" DataSyncController (HashMap UUID DataSyncTransaction) Source # 
Instance details

Defined in IHP.DataSync.ControllerImpl

class FromRow a #

Instances

Instances details
FromRow BaseJob Source # 
Instance details

Defined in IHP.Job.Dashboard.Types

Methods

fromRow :: RowParser BaseJob

FromField a => FromRow (Only a) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Only a)

FromField a => FromRow (Vector a) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Vector a)

FromField a => FromRow (Maybe (Only a)) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe (Only a))

FromField a => FromRow (Maybe (Vector a)) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe (Vector a))

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f, FromField g, FromField h, FromField i, FromField j) => FromRow (Maybe (a, b, c, d, e, f, g, h, i, j)) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe (a, b, c, d, e, f, g, h, i, j))

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f, FromField g, FromField h, FromField i, FromField j, FromField k) => FromRow (Maybe (a, b, c, d, e, f, g, h, i, j, k)) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe (a, b, c, d, e, f, g, h, i, j, k))

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f, FromField g, FromField h, FromField i, FromField j, FromField k, FromField l) => FromRow (Maybe (a, b, c, d, e, f, g, h, i, j, k, l)) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe (a, b, c, d, e, f, g, h, i, j, k, l))

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f, FromField g, FromField h, FromField i, FromField j, FromField k, FromField l, FromField m) => FromRow (Maybe (a, b, c, d, e, f, g, h, i, j, k, l, m)) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe (a, b, c, d, e, f, g, h, i, j, k, l, m))

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f, FromField g, FromField h, FromField i, FromField j, FromField k, FromField l, FromField m, FromField n) => FromRow (Maybe (a, b, c, d, e, f, g, h, i, j, k, l, m, n)) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe (a, b, c, d, e, f, g, h, i, j, k, l, m, n))

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f, FromField g, FromField h, FromField i, FromField j, FromField k, FromField l, FromField m, FromField n, FromField o) => FromRow (Maybe (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o))

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f, FromField g, FromField h, FromField i, FromField j, FromField k, FromField l, FromField m, FromField n, FromField o, FromField p) => FromRow (Maybe (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p)) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p))

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f, FromField g, FromField h, FromField i, FromField j, FromField k, FromField l, FromField m, FromField n, FromField o, FromField p, FromField q) => FromRow (Maybe (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q)) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q))

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f, FromField g, FromField h, FromField i, FromField j, FromField k, FromField l, FromField m, FromField n, FromField o, FromField p, FromField q, FromField r) => FromRow (Maybe (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r)) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r))

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f, FromField g, FromField h, FromField i, FromField j, FromField k, FromField l, FromField m, FromField n, FromField o, FromField p, FromField q, FromField r, FromField s) => FromRow (Maybe (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s)) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s))

(FromField a, FromField b) => FromRow (Maybe (a, b)) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe (a, b))

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f, FromField g, FromField h, FromField i, FromField j, FromField k, FromField l, FromField m, FromField n, FromField o, FromField p, FromField q, FromField r, FromField s, FromField t) => FromRow (Maybe (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t)) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t))

(FromField a, FromField b, FromField c) => FromRow (Maybe (a, b, c)) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe (a, b, c))

(FromField a, FromField b, FromField c, FromField d) => FromRow (Maybe (a, b, c, d)) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe (a, b, c, d))

(FromField a, FromField b, FromField c, FromField d, FromField e) => FromRow (Maybe (a, b, c, d, e)) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe (a, b, c, d, e))

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f) => FromRow (Maybe (a, b, c, d, e, f)) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe (a, b, c, d, e, f))

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f, FromField g) => FromRow (Maybe (a, b, c, d, e, f, g)) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe (a, b, c, d, e, f, g))

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f, FromField g, FromField h) => FromRow (Maybe (a, b, c, d, e, f, g, h)) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe (a, b, c, d, e, f, g, h))

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f, FromField g, FromField h, FromField i) => FromRow (Maybe (a, b, c, d, e, f, g, h, i)) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe (a, b, c, d, e, f, g, h, i))

FromField a => FromRow (Maybe [a]) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe [a])

FromField a => FromRow [a] 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser [a]

(FromField label, FromRow a) => FromRow (LabeledData label a) Source # 
Instance details

Defined in IHP.ModelSupport

Methods

fromRow :: RowParser (LabeledData label a)

(FromRow a, FromRow b) => FromRow (a :. b) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (a :. b)

(FromField a, FromField b) => FromRow (a, b) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (a, b)

(FromField a, FromField b, FromField c) => FromRow (a, b, c) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (a, b, c)

(FromField a, FromField b, FromField c, FromField d) => FromRow (a, b, c, d) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (a, b, c, d)

(FromField a, FromField b, FromField c, FromField d, FromField e) => FromRow (a, b, c, d, e) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (a, b, c, d, e)

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f) => FromRow (a, b, c, d, e, f) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (a, b, c, d, e, f)

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f, FromField g) => FromRow (a, b, c, d, e, f, g) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (a, b, c, d, e, f, g)

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f, FromField g, FromField h) => FromRow (a, b, c, d, e, f, g, h) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (a, b, c, d, e, f, g, h)

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f, FromField g, FromField h, FromField i) => FromRow (a, b, c, d, e, f, g, h, i) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (a, b, c, d, e, f, g, h, i)

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f, FromField g, FromField h, FromField i, FromField j) => FromRow (a, b, c, d, e, f, g, h, i, j) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (a, b, c, d, e, f, g, h, i, j)

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f, FromField g, FromField h, FromField i, FromField j, FromField k) => FromRow (a, b, c, d, e, f, g, h, i, j, k) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (a, b, c, d, e, f, g, h, i, j, k)

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f, FromField g, FromField h, FromField i, FromField j, FromField k, FromField l) => FromRow (a, b, c, d, e, f, g, h, i, j, k, l) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (a, b, c, d, e, f, g, h, i, j, k, l)

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f, FromField g, FromField h, FromField i, FromField j, FromField k, FromField l, FromField m) => FromRow (a, b, c, d, e, f, g, h, i, j, k, l, m) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (a, b, c, d, e, f, g, h, i, j, k, l, m)

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f, FromField g, FromField h, FromField i, FromField j, FromField k, FromField l, FromField m, FromField n) => FromRow (a, b, c, d, e, f, g, h, i, j, k, l, m, n) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (a, b, c, d, e, f, g, h, i, j, k, l, m, n)

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f, FromField g, FromField h, FromField i, FromField j, FromField k, FromField l, FromField m, FromField n, FromField o) => FromRow (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f, FromField g, FromField h, FromField i, FromField j, FromField k, FromField l, FromField m, FromField n, FromField o, FromField p) => FromRow (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p)

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f, FromField g, FromField h, FromField i, FromField j, FromField k, FromField l, FromField m, FromField n, FromField o, FromField p, FromField q) => FromRow (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q)

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f, FromField g, FromField h, FromField i, FromField j, FromField k, FromField l, FromField m, FromField n, FromField o, FromField p, FromField q, FromField r) => FromRow (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r)

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f, FromField g, FromField h, FromField i, FromField j, FromField k, FromField l, FromField m, FromField n, FromField o, FromField p, FromField q, FromField r, FromField s) => FromRow (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s)

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f, FromField g, FromField h, FromField i, FromField j, FromField k, FromField l, FromField m, FromField n, FromField o, FromField p, FromField q, FromField r, FromField s, FromField t) => FromRow (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t)

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

FilterableWithIndex Void (Proxy :: Type -> Type) 
Instance details

Defined in Witherable

Methods

imapMaybe :: (Void -> a -> Maybe b) -> Proxy a -> Proxy b

ifilter :: (Void -> a -> Bool) -> Proxy a -> Proxy a

WitherableWithIndex Void (Proxy :: Type -> Type) 
Instance details

Defined in Witherable

Methods

iwither :: Applicative f => (Void -> a -> f (Maybe b)) -> Proxy a -> f (Proxy b)

iwitherM :: Monad m => (Void -> a -> m (Maybe b)) -> Proxy a -> m (Proxy b)

ifilterA :: Applicative f => (Void -> a -> f Bool) -> Proxy a -> f (Proxy a)

(KnownSymbol name, name' ~ name) => IsLabel name (Proxy name') Source # 
Instance details

Defined in IHP.HaskellSupport

Methods

fromLabel :: Proxy name' #

Representable (Proxy :: Type -> Type) 
Instance details

Defined in Data.Functor.Contravariant.Rep

Associated Types

type Rep (Proxy :: Type -> Type) 
Instance details

Defined in Data.Functor.Contravariant.Rep

type Rep (Proxy :: Type -> Type) = ()

Methods

tabulate :: (a -> Rep (Proxy :: Type -> Type)) -> Proxy a

index :: Proxy a -> a -> Rep (Proxy :: Type -> Type)

contramapWithRep :: (b -> Either a (Rep (Proxy :: Type -> Type))) -> Proxy a -> Proxy b

Representable (Proxy :: Type -> Type) 
Instance details

Defined in Data.Functor.Rep

Associated Types

type Rep (Proxy :: Type -> Type) 
Instance details

Defined in Data.Functor.Rep

type Rep (Proxy :: Type -> Type) = Void

Methods

tabulate :: (Rep (Proxy :: Type -> Type) -> a) -> Proxy a

index :: Proxy a -> Rep (Proxy :: Type -> Type) -> 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 #

Decidable (Proxy :: Type -> Type) 
Instance details

Defined in Data.Functor.Contravariant.Divisible

Methods

lose :: (a -> Void) -> Proxy a

choose :: (a -> Either b c) -> Proxy b -> Proxy c -> Proxy a

Divisible (Proxy :: Type -> Type) 
Instance details

Defined in Data.Functor.Contravariant.Divisible

Methods

divide :: (a -> (b, c)) -> Proxy b -> Proxy c -> Proxy a

conquer :: Proxy a

NFData1 (Proxy :: Type -> Type) 
Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> Proxy a -> ()

Distributive (Proxy :: Type -> Type) 
Instance details

Defined in Data.Distributive

Methods

distribute :: Functor f => f (Proxy a) -> Proxy (f a)

collect :: Functor f => (a -> Proxy b) -> f a -> Proxy (f b)

distributeM :: Monad m => m (Proxy a) -> Proxy (m a)

collectM :: Monad m => (a -> Proxy b) -> m a -> Proxy (m b)

Hashable1 (Proxy :: Type -> Type) 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> Proxy a -> Int

Invariant (Proxy :: Type -> Type) 
Instance details

Defined in Data.Functor.Invariant

Methods

invmap :: (a -> b) -> (b -> a) -> Proxy a -> Proxy b

Adjustable (Proxy :: Type -> Type) 
Instance details

Defined in Data.Key

Methods

adjust :: (a -> a) -> Key (Proxy :: Type -> Type) -> Proxy a -> Proxy a

replace :: Key (Proxy :: Type -> Type) -> a -> Proxy a -> Proxy a

FoldableWithKey (Proxy :: Type -> Type) 
Instance details

Defined in Data.Key

Methods

toKeyedList :: Proxy a -> [(Key (Proxy :: Type -> Type), a)]

foldMapWithKey :: Monoid m => (Key (Proxy :: Type -> Type) -> a -> m) -> Proxy a -> m

foldrWithKey :: (Key (Proxy :: Type -> Type) -> a -> b -> b) -> b -> Proxy a -> b

foldlWithKey :: (b -> Key (Proxy :: Type -> Type) -> a -> b) -> b -> Proxy a -> b

Indexable (Proxy :: Type -> Type) 
Instance details

Defined in Data.Key

Methods

index :: Proxy a -> Key (Proxy :: Type -> Type) -> a

Keyed (Proxy :: Type -> Type) 
Instance details

Defined in Data.Key

Methods

mapWithKey :: (Key (Proxy :: Type -> Type) -> a -> b) -> Proxy a -> Proxy b

Lookup (Proxy :: Type -> Type) 
Instance details

Defined in Data.Key

Methods

lookup :: Key (Proxy :: Type -> Type) -> Proxy a -> Maybe a

TraversableWithKey (Proxy :: Type -> Type) 
Instance details

Defined in Data.Key

Methods

traverseWithKey :: Applicative f => (Key (Proxy :: Type -> Type) -> a -> f b) -> Proxy a -> f (Proxy b)

mapWithKeyM :: Monad m => (Key (Proxy :: Type -> Type) -> a -> m b) -> Proxy a -> m (Proxy b)

Zip (Proxy :: Type -> Type) 
Instance details

Defined in Data.Key

Methods

zipWith :: (a -> b -> c) -> Proxy a -> Proxy b -> Proxy c

zip :: Proxy a -> Proxy b -> Proxy (a, b)

zap :: Proxy (a -> b) -> Proxy a -> Proxy b

ZipWithKey (Proxy :: Type -> Type) 
Instance details

Defined in Data.Key

Methods

zipWithKey :: (Key (Proxy :: Type -> Type) -> a -> b -> c) -> Proxy a -> Proxy b -> Proxy c

zapWithKey :: Proxy (Key (Proxy :: Type -> Type) -> a -> b) -> Proxy a -> Proxy b

Pointed (Proxy :: Type -> Type) 
Instance details

Defined in Data.Pointed

Methods

point :: a -> Proxy a

Alt (Proxy :: Type -> Type) 
Instance details

Defined in Data.Functor.Alt

Methods

(<!>) :: Proxy a -> Proxy a -> Proxy a

some :: Applicative (Proxy :: Type -> Type) => Proxy a -> Proxy [a]

many :: Applicative (Proxy :: Type -> Type) => Proxy a -> Proxy [a]

Apply (Proxy :: Type -> Type) 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(<.>) :: Proxy (a -> b) -> Proxy a -> Proxy b

(.>) :: Proxy a -> Proxy b -> Proxy b

(<.) :: Proxy a -> Proxy b -> Proxy a

liftF2 :: (a -> b -> c) -> Proxy a -> Proxy b -> Proxy c

Bind (Proxy :: Type -> Type) 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(>>-) :: Proxy a -> (a -> Proxy b) -> Proxy b

join :: Proxy (Proxy a) -> Proxy a

Conclude (Proxy :: Type -> Type) 
Instance details

Defined in Data.Functor.Contravariant.Conclude

Methods

conclude :: (a -> Void) -> Proxy a

Decide (Proxy :: Type -> Type) 
Instance details

Defined in Data.Functor.Contravariant.Decide

Methods

decide :: (a -> Either b c) -> Proxy b -> Proxy c -> Proxy a

Divise (Proxy :: Type -> Type) 
Instance details

Defined in Data.Functor.Contravariant.Divise

Methods

divise :: (a -> (b, c)) -> Proxy b -> Proxy c -> Proxy a

Extend (Proxy :: Type -> Type) 
Instance details

Defined in Data.Functor.Extend

Methods

duplicated :: Proxy a -> Proxy (Proxy a)

extended :: (Proxy a -> b) -> Proxy a -> Proxy b

Plus (Proxy :: Type -> Type) 
Instance details

Defined in Data.Functor.Plus

Methods

zero :: Proxy a

Filterable (Proxy :: Type -> Type) 
Instance details

Defined in Witherable

Methods

mapMaybe :: (a -> Maybe b) -> Proxy a -> Proxy b

catMaybes :: Proxy (Maybe a) -> Proxy a

filter :: (a -> Bool) -> Proxy a -> Proxy a

Witherable (Proxy :: Type -> Type) 
Instance details

Defined in Witherable

Methods

wither :: Applicative f => (a -> f (Maybe b)) -> Proxy a -> f (Proxy b)

witherM :: Monad m => (a -> m (Maybe b)) -> Proxy a -> m (Proxy b)

filterA :: Applicative f => (a -> f Bool) -> Proxy a -> f (Proxy a)

witherMap :: Applicative m => (Proxy b -> r) -> (a -> m (Maybe b)) -> Proxy a -> m r

Cosieve (Tagged :: Type -> Type -> Type) (Proxy :: Type -> Type) 
Instance details

Defined in Data.Profunctor.Sieve

Methods

cosieve :: Tagged a b -> Proxy a -> b

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

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 -> () #

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 :: Type -> Type) 
Instance details

Defined in Data.Functor.Contravariant.Rep

type Rep (Proxy :: Type -> Type) = ()
type Rep (Proxy :: Type -> Type) 
Instance details

Defined in Data.Functor.Rep

type Rep (Proxy :: Type -> Type) = Void
type Key (Proxy :: Type -> Type) 
Instance details

Defined in Data.Key

type Key (Proxy :: Type -> Type) = Void
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

class FromJSON a where #

Minimal complete definition

Nothing

Methods

parseJSON :: Value -> Parser a #

parseJSONList :: Value -> Parser [a] #

omittedField :: Maybe a #

Instances

Instances details
FromJSON Key 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Key #

parseJSONList :: Value -> Parser [Key] #

omittedField :: Maybe Key #

FromJSON DotNetTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Value 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Value #

parseJSONList :: Value -> Parser [Value] #

omittedField :: Maybe Value #

FromJSON Version 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Version #

parseJSONList :: Value -> Parser [Version] #

omittedField :: Maybe Version #

FromJSON CTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser CTime #

parseJSONList :: Value -> Parser [CTime] #

omittedField :: Maybe CTime #

FromJSON Void 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Void #

parseJSONList :: Value -> Parser [Void] #

omittedField :: Maybe Void #

FromJSON Int16 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Int16 #

parseJSONList :: Value -> Parser [Int16] #

omittedField :: Maybe Int16 #

FromJSON Int32 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Int32 #

parseJSONList :: Value -> Parser [Int32] #

omittedField :: Maybe Int32 #

FromJSON Int64 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Int64 #

parseJSONList :: Value -> Parser [Int64] #

omittedField :: Maybe Int64 #

FromJSON Int8 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Int8 #

parseJSONList :: Value -> Parser [Int8] #

omittedField :: Maybe Int8 #

FromJSON Word16 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Word16 #

parseJSONList :: Value -> Parser [Word16] #

omittedField :: Maybe Word16 #

FromJSON Word32 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Word32 #

parseJSONList :: Value -> Parser [Word32] #

omittedField :: Maybe Word32 #

FromJSON Word64 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Word64 #

parseJSONList :: Value -> Parser [Word64] #

omittedField :: Maybe Word64 #

FromJSON Word8 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Word8 #

parseJSONList :: Value -> Parser [Word8] #

omittedField :: Maybe Word8 #

FromJSON ByteString Source # 
Instance details

Defined in IHP.DataSync.DynamicQuery

FromJSON IntSet 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser IntSet #

parseJSONList :: Value -> Parser [IntSet] #

omittedField :: Maybe IntSet #

FromJSON Ordering 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Point 
Instance details

Defined in IHP.Postgres.Point

Methods

parseJSON :: Value -> Parser Point #

parseJSONList :: Value -> Parser [Point] #

omittedField :: Maybe Point #

FromJSON IP 
Instance details

Defined in Net.IP

Methods

parseJSON :: Value -> Parser IP #

parseJSONList :: Value -> Parser [IP] #

omittedField :: Maybe IP #

FromJSON IPv4 
Instance details

Defined in Net.IPv4

Methods

parseJSON :: Value -> Parser IPv4 #

parseJSONList :: Value -> Parser [IPv4] #

omittedField :: Maybe IPv4 #

FromJSON IPv4Range 
Instance details

Defined in Net.IPv4

Methods

parseJSON :: Value -> Parser IPv4Range #

parseJSONList :: Value -> Parser [IPv4Range] #

omittedField :: Maybe IPv4Range #

FromJSON IPv6 
Instance details

Defined in Net.IPv6

Methods

parseJSON :: Value -> Parser IPv6 #

parseJSONList :: Value -> Parser [IPv6] #

omittedField :: Maybe IPv6 #

FromJSON IPv6Range 
Instance details

Defined in Net.IPv6

Methods

parseJSON :: Value -> Parser IPv6Range #

parseJSONList :: Value -> Parser [IPv6Range] #

omittedField :: Maybe IPv6Range #

FromJSON Mac 
Instance details

Defined in Net.Mac

Methods

parseJSON :: Value -> Parser Mac #

parseJSONList :: Value -> Parser [Mac] #

omittedField :: Maybe Mac #

FromJSON Change Source # 
Instance details

Defined in IHP.DataSync.ChangeNotifications

Methods

parseJSON :: Value -> Parser Change #

parseJSONList :: Value -> Parser [Change] #

omittedField :: Maybe Change #

FromJSON ChangeNotification Source # 
Instance details

Defined in IHP.DataSync.ChangeNotifications

FromJSON ChangeSet Source # 
Instance details

Defined in IHP.DataSync.ChangeNotifications

FromJSON ConditionExpression Source # 
Instance details

Defined in IHP.DataSync.DynamicQuery

FromJSON ConditionOperator Source # 
Instance details

Defined in IHP.DataSync.DynamicQuery

FromJSON DynamicSQLQuery Source # 
Instance details

Defined in IHP.DataSync.DynamicQuery

FromJSON DynamicValue Source # 
Instance details

Defined in IHP.DataSync.DynamicQuery

FromJSON FunctionCall Source # 
Instance details

Defined in IHP.DataSync.DynamicQuery

FromJSON OrderByClause Source # 
Instance details

Defined in IHP.DataSync.DynamicQuery

FromJSON SelectedColumns Source # 
Instance details

Defined in IHP.DataSync.DynamicQuery

FromJSON DataSyncMessage Source # 
Instance details

Defined in IHP.DataSync.ControllerImpl

FromJSON Condition Source # 
Instance details

Defined in IHP.DataSync.DynamicQuery

FromJSON Join Source # 
Instance details

Defined in IHP.DataSync.DynamicQuery

Methods

parseJSON :: Value -> Parser Join #

parseJSONList :: Value -> Parser [Join] #

omittedField :: Maybe Join #

FromJSON OrderByClause Source # 
Instance details

Defined in IHP.DataSync.DynamicQuery

FromJSON OrderByDirection Source # 
Instance details

Defined in IHP.DataSync.DynamicQuery

FromJSON Backend 
Instance details

Defined in Network.Minio.AdminAPI

Methods

parseJSON :: Value -> Parser Backend #

parseJSONList :: Value -> Parser [Backend] #

omittedField :: Maybe Backend #

FromJSON ConnStats 
Instance details

Defined in Network.Minio.AdminAPI

Methods

parseJSON :: Value -> Parser ConnStats #

parseJSONList :: Value -> Parser [ConnStats] #

omittedField :: Maybe ConnStats #

FromJSON CountNAvgTime 
Instance details

Defined in Network.Minio.AdminAPI

Methods

parseJSON :: Value -> Parser CountNAvgTime #

parseJSONList :: Value -> Parser [CountNAvgTime] #

omittedField :: Maybe CountNAvgTime #

FromJSON DriveInfo 
Instance details

Defined in Network.Minio.AdminAPI

Methods

parseJSON :: Value -> Parser DriveInfo #

parseJSONList :: Value -> Parser [DriveInfo] #

omittedField :: Maybe DriveInfo #

FromJSON ErasureInfo 
Instance details

Defined in Network.Minio.AdminAPI

Methods

parseJSON :: Value -> Parser ErasureInfo #

parseJSONList :: Value -> Parser [ErasureInfo] #

omittedField :: Maybe ErasureInfo #

FromJSON HealItemType 
Instance details

Defined in Network.Minio.AdminAPI

Methods

parseJSON :: Value -> Parser HealItemType #

parseJSONList :: Value -> Parser [HealItemType] #

omittedField :: Maybe HealItemType #

FromJSON HealOpts 
Instance details

Defined in Network.Minio.AdminAPI

Methods

parseJSON :: Value -> Parser HealOpts #

parseJSONList :: Value -> Parser [HealOpts] #

omittedField :: Maybe HealOpts #

FromJSON HealResultItem 
Instance details

Defined in Network.Minio.AdminAPI

Methods

parseJSON :: Value -> Parser HealResultItem #

parseJSONList :: Value -> Parser [HealResultItem] #

omittedField :: Maybe HealResultItem #

FromJSON HealStartResp 
Instance details

Defined in Network.Minio.AdminAPI

Methods

parseJSON :: Value -> Parser HealStartResp #

parseJSONList :: Value -> Parser [HealStartResp] #

omittedField :: Maybe HealStartResp #

FromJSON HealStatus 
Instance details

Defined in Network.Minio.AdminAPI

Methods

parseJSON :: Value -> Parser HealStatus #

parseJSONList :: Value -> Parser [HealStatus] #

omittedField :: Maybe HealStatus #

FromJSON HttpStats 
Instance details

Defined in Network.Minio.AdminAPI

Methods

parseJSON :: Value -> Parser HttpStats #

parseJSONList :: Value -> Parser [HttpStats] #

omittedField :: Maybe HttpStats #

FromJSON NodeSummary 
Instance details

Defined in Network.Minio.AdminAPI

Methods

parseJSON :: Value -> Parser NodeSummary #

parseJSONList :: Value -> Parser [NodeSummary] #

omittedField :: Maybe NodeSummary #

FromJSON SIData 
Instance details

Defined in Network.Minio.AdminAPI

Methods

parseJSON :: Value -> Parser SIData #

parseJSONList :: Value -> Parser [SIData] #

omittedField :: Maybe SIData #

FromJSON ServerInfo 
Instance details

Defined in Network.Minio.AdminAPI

Methods

parseJSON :: Value -> Parser ServerInfo #

parseJSONList :: Value -> Parser [ServerInfo] #

omittedField :: Maybe ServerInfo #

FromJSON ServerProps 
Instance details

Defined in Network.Minio.AdminAPI

Methods

parseJSON :: Value -> Parser ServerProps #

parseJSONList :: Value -> Parser [ServerProps] #

omittedField :: Maybe ServerProps #

FromJSON ServerVersion 
Instance details

Defined in Network.Minio.AdminAPI

Methods

parseJSON :: Value -> Parser ServerVersion #

parseJSONList :: Value -> Parser [ServerVersion] #

omittedField :: Maybe ServerVersion #

FromJSON ServiceStatus 
Instance details

Defined in Network.Minio.AdminAPI

Methods

parseJSON :: Value -> Parser ServiceStatus #

parseJSONList :: Value -> Parser [ServiceStatus] #

omittedField :: Maybe ServiceStatus #

FromJSON SetConfigResult 
Instance details

Defined in Network.Minio.AdminAPI

Methods

parseJSON :: Value -> Parser SetConfigResult #

parseJSONList :: Value -> Parser [SetConfigResult] #

omittedField :: Maybe SetConfigResult #

FromJSON StorageInfo 
Instance details

Defined in Network.Minio.AdminAPI

Methods

parseJSON :: Value -> Parser StorageInfo #

parseJSONList :: Value -> Parser [StorageInfo] #

omittedField :: Maybe StorageInfo #

FromJSON URI 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser URI #

parseJSONList :: Value -> Parser [URI] #

omittedField :: Maybe URI #

FromJSON Action Source # 
Instance details

Defined in IHP.DataSync.DynamicQuery

Methods

parseJSON :: Value -> Parser Action #

parseJSONList :: Value -> Parser [Action] #

omittedField :: Maybe Action #

FromJSON Scientific 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Scientific #

parseJSONList :: Value -> Parser [Scientific] #

omittedField :: Maybe Scientific #

FromJSON Text 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Text #

parseJSONList :: Value -> Parser [Text] #

omittedField :: Maybe Text #

FromJSON Text 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Text #

parseJSONList :: Value -> Parser [Text] #

omittedField :: Maybe Text #

FromJSON ShortText 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser ShortText #

parseJSONList :: Value -> Parser [ShortText] #

omittedField :: Maybe ShortText #

FromJSON CalendarDiffDays 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Day 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Day #

parseJSONList :: Value -> Parser [Day] #

omittedField :: Maybe Day #

FromJSON Month 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Month #

parseJSONList :: Value -> Parser [Month] #

omittedField :: Maybe Month #

FromJSON Quarter 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Quarter #

parseJSONList :: Value -> Parser [Quarter] #

omittedField :: Maybe Quarter #

FromJSON QuarterOfYear 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser QuarterOfYear #

parseJSONList :: Value -> Parser [QuarterOfYear] #

omittedField :: Maybe QuarterOfYear #

FromJSON DayOfWeek 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON DiffTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON NominalDiffTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON SystemTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser SystemTime #

parseJSONList :: Value -> Parser [SystemTime] #

omittedField :: Maybe SystemTime #

FromJSON UTCTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON CalendarDiffTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON LocalTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON TimeOfDay 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON ZonedTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON UUID 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser UUID #

parseJSONList :: Value -> Parser [UUID] #

omittedField :: Maybe UUID #

FromJSON Integer 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON Natural 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Natural #

parseJSONList :: Value -> Parser [Natural] #

omittedField :: Maybe Natural #

FromJSON () 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser () #

parseJSONList :: Value -> Parser [()] #

omittedField :: Maybe () #

FromJSON Bool 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Bool #

parseJSONList :: Value -> Parser [Bool] #

omittedField :: Maybe Bool #

FromJSON Char 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Char #

parseJSONList :: Value -> Parser [Char] #

omittedField :: Maybe Char #

FromJSON Double 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Double #

parseJSONList :: Value -> Parser [Double] #

omittedField :: Maybe Double #

FromJSON Float 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Float #

parseJSONList :: Value -> Parser [Float] #

omittedField :: Maybe Float #

FromJSON Int 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Int #

parseJSONList :: Value -> Parser [Int] #

omittedField :: Maybe Int #

FromJSON Word 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Word #

parseJSONList :: Value -> Parser [Word] #

omittedField :: Maybe Word #

FromJSON v => FromJSON (KeyMap v) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (KeyMap v) #

parseJSONList :: Value -> Parser [KeyMap v] #

omittedField :: Maybe (KeyMap v) #

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) #

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) #

FromJSON a => FromJSON (Last a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Last a) #

parseJSONList :: Value -> Parser [Last a] #

omittedField :: Maybe (Last 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) #

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) #

FromJSON a => FromJSON (Last a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Last a) #

parseJSONList :: Value -> Parser [Last a] #

omittedField :: Maybe (Last a) #

FromJSON a => FromJSON (Max a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Max a) #

parseJSONList :: Value -> Parser [Max a] #

omittedField :: Maybe (Max a) #

FromJSON a => FromJSON (Min a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Min a) #

parseJSONList :: Value -> Parser [Min a] #

omittedField :: Maybe (Min a) #

FromJSON a => FromJSON (WrappedMonoid a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSON a => FromJSON (Dual a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Dual a) #

parseJSONList :: Value -> Parser [Dual a] #

omittedField :: Maybe (Dual a) #

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) #

(Generic a, GFromJSON Zero (Rep a)) => FromJSON (Generically a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Generically a) #

parseJSONList :: Value -> Parser [Generically a] #

omittedField :: Maybe (Generically a) #

(FromJSON a, Integral a) => FromJSON (Ratio a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Ratio a) #

parseJSONList :: Value -> Parser [Ratio a] #

omittedField :: Maybe (Ratio a) #

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) #

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) #

(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) #

FromJSON v => FromJSON (Tree v) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Tree v) #

parseJSONList :: Value -> Parser [Tree v] #

omittedField :: Maybe (Tree v) #

FromJSON1 f => FromJSON (Fix f) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Fix f) #

parseJSONList :: Value -> Parser [Fix f] #

omittedField :: Maybe (Fix f) #

(FromJSON1 f, Functor f) => FromJSON (Mu f) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Mu f) #

parseJSONList :: Value -> Parser [Mu f] #

omittedField :: Maybe (Mu f) #

(FromJSON1 f, Functor f) => FromJSON (Nu f) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Nu f) #

parseJSONList :: Value -> Parser [Nu f] #

omittedField :: Maybe (Nu f) #

FromJSON a => FromJSON (DNonEmpty a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (DNonEmpty a) #

parseJSONList :: Value -> Parser [DNonEmpty a] #

omittedField :: Maybe (DNonEmpty a) #

FromJSON a => FromJSON (DList a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (DList a) #

parseJSONList :: Value -> Parser [DList a] #

omittedField :: Maybe (DList a) #

FromJSON (PrimaryKey a) => FromJSON (Id' a) Source # 
Instance details

Defined in IHP.ModelSupport

Methods

parseJSON :: Value -> Parser (Id' a) #

parseJSONList :: Value -> Parser [Id' a] #

omittedField :: Maybe (Id' a) #

FromJSON a => FromJSON (Array a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Array a) #

parseJSONList :: Value -> Parser [Array a] #

omittedField :: Maybe (Array a) #

(Prim a, FromJSON a) => FromJSON (PrimArray a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (PrimArray a) #

parseJSONList :: Value -> Parser [PrimArray a] #

omittedField :: Maybe (PrimArray a) #

FromJSON a => FromJSON (SmallArray a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (SmallArray a) #

parseJSONList :: Value -> Parser [SmallArray a] #

omittedField :: Maybe (SmallArray a) #

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) #

(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) #

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) #

(Prim a, 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) #

(Storable a, 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) #

(Vector Vector a, 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) #

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) #

FromJSON a => FromJSON (Solo a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Solo a) #

parseJSONList :: Value -> Parser [Solo a] #

omittedField :: Maybe (Solo a) #

FromJSON a => FromJSON [a] 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser [a] #

parseJSONList :: Value -> Parser [[a]] #

omittedField :: Maybe [a] #

(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) #

HasResolution a => FromJSON (Fixed a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Fixed a) #

parseJSONList :: Value -> Parser [Fixed a] #

omittedField :: Maybe (Fixed a) #

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) #

(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) #

(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) #

(FromJSON a, FromJSON b) => FromJSON (These a b) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (These a b) #

parseJSONList :: Value -> Parser [These a b] #

omittedField :: Maybe (These a b) #

(FromJSON a, FromJSON b) => FromJSON (Pair a b) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Pair a b) #

parseJSONList :: Value -> Parser [Pair a b] #

omittedField :: Maybe (Pair a b) #

(FromJSON a, FromJSON b) => FromJSON (These a b) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (These a b) #

parseJSONList :: Value -> Parser [These a b] #

omittedField :: Maybe (These a b) #

(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) #

(FromJSON a, FromJSON b) => FromJSON (a, b) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (a, b) #

parseJSONList :: Value -> Parser [(a, b)] #

omittedField :: Maybe (a, b) #

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 b => FromJSON (Tagged a b) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Tagged a b) #

parseJSONList :: Value -> Parser [Tagged a b] #

omittedField :: Maybe (Tagged a b) #

(FromJSON1 f, FromJSON1 g, FromJSON a) => FromJSON (These1 f g a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (These1 f g a) #

parseJSONList :: Value -> Parser [These1 f g a] #

omittedField :: Maybe (These1 f g a) #

(FromJSON a, FromJSON b, FromJSON c) => FromJSON (a, b, c) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (a, b, c) #

parseJSONList :: Value -> Parser [(a, b, c)] #

omittedField :: Maybe (a, b, c) #

(FromJSON1 f, FromJSON1 g, FromJSON a) => FromJSON (Product f g a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Product f g a) #

parseJSONList :: Value -> Parser [Product f g a] #

omittedField :: Maybe (Product f g a) #

(FromJSON1 f, FromJSON1 g, FromJSON a) => FromJSON (Sum f g a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Sum f g a) #

parseJSONList :: Value -> Parser [Sum f g a] #

omittedField :: Maybe (Sum f g a) #

(FromJSON a, FromJSON b, FromJSON c, FromJSON d) => FromJSON (a, b, c, d) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (a, b, c, d) #

parseJSONList :: Value -> Parser [(a, b, c, d)] #

omittedField :: Maybe (a, b, c, d) #

(FromJSON1 f, FromJSON1 g, FromJSON a) => FromJSON (Compose f g a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Compose f g a) #

parseJSONList :: Value -> Parser [Compose f g a] #

omittedField :: Maybe (Compose f g a) #

(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e) => FromJSON (a, b, c, d, e) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (a, b, c, d, e) #

parseJSONList :: Value -> Parser [(a, b, c, d, e)] #

omittedField :: Maybe (a, b, c, d, e) #

(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f) => FromJSON (a, b, c, d, e, f) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (a, b, c, d, e, f) #

parseJSONList :: Value -> Parser [(a, b, c, d, e, f)] #

omittedField :: Maybe (a, b, c, d, e, f) #

(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g) => FromJSON (a, b, c, d, e, f, g) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (a, b, c, d, e, f, g) #

parseJSONList :: Value -> Parser [(a, b, c, d, e, f, g)] #

omittedField :: Maybe (a, b, c, d, e, f, g) #

(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g, FromJSON h) => FromJSON (a, b, c, d, e, f, g, h) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (a, b, c, d, e, f, g, h) #

parseJSONList :: Value -> Parser [(a, b, c, d, e, f, g, h)] #

omittedField :: Maybe (a, b, c, d, e, f, g, h) #

(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g, FromJSON h, FromJSON i) => FromJSON (a, b, c, d, e, f, g, h, i) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (a, b, c, d, e, f, g, h, i) #

parseJSONList :: Value -> Parser [(a, b, c, d, e, f, g, h, i)] #

omittedField :: Maybe (a, b, c, d, e, f, g, h, i) #

(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g, FromJSON h, FromJSON i, FromJSON j) => FromJSON (a, b, c, d, e, f, g, h, i, j) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (a, b, c, d, e, f, g, h, i, j) #

parseJSONList :: Value -> Parser [(a, b, c, d, e, f, g, h, i, j)] #

omittedField :: Maybe (a, b, c, d, e, f, g, h, i, j) #

(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g, FromJSON h, FromJSON i, FromJSON j, FromJSON k) => FromJSON (a, b, c, d, e, f, g, h, i, j, k) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (a, b, c, d, e, f, g, h, i, j, k) #

parseJSONList :: Value -> Parser [(a, b, c, d, e, f, g, h, i, j, k)] #

omittedField :: Maybe (a, b, c, d, e, f, g, h, i, j, k) #

(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g, FromJSON h, FromJSON i, FromJSON j, FromJSON k, FromJSON l) => FromJSON (a, b, c, d, e, f, g, h, i, j, k, l) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (a, b, c, d, e, f, g, h, i, j, k, l) #

parseJSONList :: Value -> Parser [(a, b, c, d, e, f, g, h, i, j, k, l)] #

omittedField :: Maybe (a, b, c, d, e, f, g, h, i, j, k, l) #

(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g, FromJSON h, FromJSON i, FromJSON j, FromJSON k, FromJSON l, FromJSON m) => FromJSON (a, b, c, d, e, f, g, h, i, j, k, l, m) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (a, b, c, d, e, f, g, h, i, j, k, l, m) #

parseJSONList :: Value -> Parser [(a, b, c, d, e, f, g, h, i, j, k, l, m)] #

omittedField :: Maybe (a, b, c, d, e, f, g, h, i, j, k, l, m) #

(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g, FromJSON h, FromJSON i, FromJSON j, FromJSON k, FromJSON l, FromJSON m, FromJSON n) => FromJSON (a, b, c, d, e, f, g, h, i, j, k, l, m, n) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (a, b, c, d, e, f, g, h, i, j, k, l, m, n) #

parseJSONList :: Value -> Parser [(a, b, c, d, e, f, g, h, i, j, k, l, m, n)] #

omittedField :: Maybe (a, b, c, d, e, f, g, h, i, j, k, l, m, n) #

(FromJSON a, FromJSON b, FromJSON c, FromJSON d, FromJSON e, FromJSON f, FromJSON g, FromJSON h, FromJSON i, FromJSON j, FromJSON k, FromJSON l, FromJSON m, FromJSON n, FromJSON o) => FromJSON (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) #

parseJSONList :: Value -> Parser [(a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)] #

omittedField :: Maybe (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) #

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

Pointed Set 
Instance details

Defined in Data.Pointed

Methods

point :: a -> Set a

OutputableP env a => OutputableP env (Set a) 
Instance details

Defined in GHC.Utils.Outputable

Methods

pdoc :: env -> Set a -> SDoc

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, Arbitrary a) => Arbitrary (Set a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (Set a)

shrink :: Set a -> [Set a]

CoArbitrary a => CoArbitrary (Set a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Set a -> Gen b -> Gen b

(Ord a, Function a) => Function (Set a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Set a -> b) -> Set a :-> b

(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 #

(Ord a, Serialize a) => Serialize (Set a) 
Instance details

Defined in Data.Serialize

Methods

put :: Putter (Set a)

get :: Get (Set a)

NFData a => NFData (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

rnf :: Set a -> () #

Outputable a => Outputable (Set a) 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Set a -> SDoc

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 k => At (Set k) 
Instance details

Defined in Control.Lens.At

Methods

at :: Index (Set k) -> Lens' (Set k) (Maybe (IxValue (Set k)))

Ord a => Contains (Set a) 
Instance details

Defined in Control.Lens.At

Methods

contains :: Index (Set a) -> Lens' (Set a) Bool

Ord k => Ixed (Set k) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (Set k) -> Traversal' (Set k) (IxValue (Set k))

AsEmpty (Set a) 
Instance details

Defined in Control.Lens.Empty

Methods

_Empty :: Prism' (Set a) ()

Ord a => Wrapped (Set a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Set a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (Set a) = [a]

Methods

_Wrapped' :: Iso' (Set a) (Unwrapped (Set a))

Ord element => IsSet (Set element) 
Instance details

Defined in Data.Containers

Methods

insertSet :: Element (Set element) -> Set element -> Set element #

deleteSet :: Element (Set element) -> Set element -> Set element #

singletonSet :: Element (Set element) -> Set element #

setFromList :: [Element (Set element)] -> Set element #

setToList :: Set element -> [Element (Set element)] #

filterSet :: (Element (Set element) -> Bool) -> Set element -> Set element #

Ord element => SetContainer (Set element) 
Instance details

Defined in Data.Containers

Associated Types

type ContainerKey (Set element) 
Instance details

Defined in Data.Containers

type ContainerKey (Set element) = element

Methods

member :: ContainerKey (Set element) -> Set element -> Bool #

notMember :: ContainerKey (Set element) -> Set element -> Bool #

union :: Set element -> Set element -> Set element #

unions :: (MonoFoldable mono, Element mono ~ Set element) => mono -> Set element #

difference :: Set element -> Set element -> Set element #

intersection :: Set element -> Set element -> Set element #

keys :: Set element -> [ContainerKey (Set element)] #

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 #

One (Set a) 
Instance details

Defined in Relude.Container.One

Associated Types

type OneItem (Set a) 
Instance details

Defined in Relude.Container.One

type OneItem (Set a) = a

Methods

one :: OneItem (Set a) -> Set a

Ord a => StaticMap (Set a) 
Instance details

Defined in Relude.Extra.Map

Associated Types

type Key (Set a) 
Instance details

Defined in Relude.Extra.Map

type Key (Set a) = a
type Val (Set a) 
Instance details

Defined in Relude.Extra.Map

type Val (Set a) = a

Methods

size :: Set a -> Int

lookup :: Key (Set a) -> Set a -> Maybe (Val (Set a))

member :: Key (Set a) -> Set a -> Bool

(t ~ Set a', Ord a) => Rewrapped (Set a) t 
Instance details

Defined in Control.Lens.Wrapped

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 Index (Set a) 
Instance details

Defined in Control.Lens.At

type Index (Set a) = a
type IxValue (Set k) 
Instance details

Defined in Control.Lens.At

type IxValue (Set k) = ()
type Unwrapped (Set a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (Set a) = [a]
type ContainerKey (Set element) 
Instance details

Defined in Data.Containers

type ContainerKey (Set element) = element
type Element (Set e) 
Instance details

Defined in Data.MonoTraversable

type Element (Set e) = e
type OneItem (Set a) 
Instance details

Defined in Relude.Container.One

type OneItem (Set a) = a
type Key (Set a) 
Instance details

Defined in Relude.Extra.Map

type Key (Set a) = a
type Val (Set a) 
Instance details

Defined in Relude.Extra.Map

type Val (Set a) = 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

Methods

readsPrec :: Int -> ReadS MungedPackageId

readList :: ReadS [MungedPackageId]

readPrec :: ReadPrec MungedPackageId

readListPrec :: ReadPrec [MungedPackageId]

Read MungedPackageName 
Instance details

Defined in Distribution.Types.MungedPackageName

Methods

readsPrec :: Int -> ReadS MungedPackageName

readList :: ReadS [MungedPackageName]

readPrec :: ReadPrec MungedPackageName

readListPrec :: ReadPrec [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

Methods

readsPrec :: Int -> ReadS PackageIdentifier

readList :: ReadS [PackageIdentifier]

readPrec :: ReadPrec PackageIdentifier

readListPrec :: ReadPrec [PackageIdentifier]

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 Counts 
Instance details

Defined in Test.HUnit.Base

Methods

readsPrec :: Int -> ReadS Counts

readList :: ReadS [Counts]

readPrec :: ReadPrec Counts

readListPrec :: ReadPrec [Counts]

Read Node 
Instance details

Defined in Test.HUnit.Base

Methods

readsPrec :: Int -> ReadS Node

readList :: ReadS [Node]

readPrec :: ReadPrec Node

readListPrec :: ReadPrec [Node]

Read State 
Instance details

Defined in Test.HUnit.Base

Methods

readsPrec :: Int -> ReadS State

readList :: ReadS [State]

readPrec :: ReadPrec State

readListPrec :: ReadPrec [State]

Read ASCIIString 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

readsPrec :: Int -> ReadS ASCIIString

readList :: ReadS [ASCIIString]

readPrec :: ReadPrec ASCIIString

readListPrec :: ReadPrec [ASCIIString]

Read PrintableString 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

readsPrec :: Int -> ReadS PrintableString

readList :: ReadS [PrintableString]

readPrec :: ReadPrec PrintableString

readListPrec :: ReadPrec [PrintableString]

Read UnicodeString 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

readsPrec :: Int -> ReadS UnicodeString

readList :: ReadS [UnicodeString]

readPrec :: ReadPrec UnicodeString

readListPrec :: ReadPrec [UnicodeString]

Read QCGen 
Instance details

Defined in Test.QuickCheck.Random

Methods

readsPrec :: Int -> ReadS QCGen

readList :: ReadS [QCGen]

readPrec :: ReadPrec QCGen

readListPrec :: ReadPrec [QCGen]

Read Args 
Instance details

Defined in Test.QuickCheck.Test

Methods

readsPrec :: Int -> ReadS Args

readList :: ReadS [Args]

readPrec :: ReadPrec Args

readListPrec :: ReadPrec [Args]

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 Credential 
Instance details

Defined in Web.Authenticate.OAuth

Methods

readsPrec :: Int -> ReadS Credential

readList :: ReadS [Credential]

readPrec :: ReadPrec Credential

readListPrec :: ReadPrec [Credential]

Read OAuth 
Instance details

Defined in Web.Authenticate.OAuth

Methods

readsPrec :: Int -> ReadS OAuth

readList :: ReadS [OAuth]

readPrec :: ReadPrec OAuth

readListPrec :: ReadPrec [OAuth]

Read OAuthVersion 
Instance details

Defined in Web.Authenticate.OAuth

Methods

readsPrec :: Int -> ReadS OAuthVersion

readList :: ReadS [OAuthVersion]

readPrec :: ReadPrec OAuthVersion

readListPrec :: ReadPrec [OAuthVersion]

Read SignMethod 
Instance details

Defined in Web.Authenticate.OAuth

Methods

readsPrec :: Int -> ReadS SignMethod

readList :: ReadS [SignMethod]

readPrec :: ReadPrec SignMethod

readListPrec :: ReadPrec [SignMethod]

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 Options 
Instance details

Defined in Data.Bifunctor.TH

Methods

readsPrec :: Int -> ReadS Options

readList :: ReadS [Options]

readPrec :: ReadPrec Options

readListPrec :: ReadPrec [Options]

Read ByteOrder 
Instance details

Defined in System.ByteOrder

Methods

readsPrec :: Int -> ReadS ByteOrder

readList :: ReadS [ByteOrder]

readPrec :: ReadPrec ByteOrder

readListPrec :: ReadPrec [ByteOrder]

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

Methods

readsPrec :: Int -> ReadS ShortByteString

readList :: ReadS [ShortByteString]

readPrec :: ReadPrec ShortByteString

readListPrec :: ReadPrec [ShortByteString]

Read IntSet 
Instance details

Defined in Data.IntSet.Internal

Methods

readsPrec :: Int -> ReadS IntSet

readList :: ReadS [IntSet]

readPrec :: ReadPrec IntSet

readListPrec :: ReadPrec [IntSet]

Read CipherError 
Instance details

Defined in Crypto.Classes.Exceptions

Methods

readsPrec :: Int -> ReadS CipherError

readList :: ReadS [CipherError]

readPrec :: ReadPrec CipherError

readListPrec :: ReadPrec [CipherError]

Read GenError 
Instance details

Defined in Crypto.Random

Methods

readsPrec :: Int -> ReadS GenError

readList :: ReadS [GenError]

readPrec :: ReadPrec GenError

readListPrec :: ReadPrec [GenError]

Read ReseedInfo 
Instance details

Defined in Crypto.Random

Methods

readsPrec :: Int -> ReadS ReseedInfo

readList :: ReadS [ReseedInfo]

readPrec :: ReadPrec ReseedInfo

readListPrec :: ReadPrec [ReseedInfo]

Read BlockCipherError 
Instance details

Defined in Crypto.Types

Methods

readsPrec :: Int -> ReadS BlockCipherError

readList :: ReadS [BlockCipherError]

readPrec :: ReadPrec BlockCipherError

readListPrec :: ReadPrec [BlockCipherError]

Read Params 
Instance details

Defined in Crypto.Types.PubKey.DH

Methods

readsPrec :: Int -> ReadS Params

readList :: ReadS [Params]

readPrec :: ReadPrec Params

readListPrec :: ReadPrec [Params]

Read PrivateNumber 
Instance details

Defined in Crypto.Types.PubKey.DH

Methods

readsPrec :: Int -> ReadS PrivateNumber

readList :: ReadS [PrivateNumber]

readPrec :: ReadPrec PrivateNumber

readListPrec :: ReadPrec [PrivateNumber]

Read PublicNumber 
Instance details

Defined in Crypto.Types.PubKey.DH

Methods

readsPrec :: Int -> ReadS PublicNumber

readList :: ReadS [PublicNumber]

readPrec :: ReadPrec PublicNumber

readListPrec :: ReadPrec [PublicNumber]

Read SharedKey 
Instance details

Defined in Crypto.Types.PubKey.DH

Methods

readsPrec :: Int -> ReadS SharedKey

readList :: ReadS [SharedKey]

readPrec :: ReadPrec SharedKey

readListPrec :: ReadPrec [SharedKey]

Read KeyPair 
Instance details

Defined in Crypto.Types.PubKey.DSA

Methods

readsPrec :: Int -> ReadS KeyPair

readList :: ReadS [KeyPair]

readPrec :: ReadPrec KeyPair

readListPrec :: ReadPrec [KeyPair]

Read Params 
Instance details

Defined in Crypto.Types.PubKey.DSA

Methods

readsPrec :: Int -> ReadS Params

readList :: ReadS [Params]

readPrec :: ReadPrec Params

readListPrec :: ReadPrec [Params]

Read PrivateKey 
Instance details

Defined in Crypto.Types.PubKey.DSA

Methods

readsPrec :: Int -> ReadS PrivateKey

readList :: ReadS [PrivateKey]

readPrec :: ReadPrec PrivateKey

readListPrec :: ReadPrec [PrivateKey]

Read PublicKey 
Instance details

Defined in Crypto.Types.PubKey.DSA

Methods

readsPrec :: Int -> ReadS PublicKey

readList :: ReadS [PublicKey]

readPrec :: ReadPrec PublicKey

readListPrec :: ReadPrec [PublicKey]

Read Signature 
Instance details

Defined in Crypto.Types.PubKey.DSA

Methods

readsPrec :: Int -> ReadS Signature

readList :: ReadS [Signature]

readPrec :: ReadPrec Signature

readListPrec :: ReadPrec [Signature]

Read Curve 
Instance details

Defined in Crypto.Types.PubKey.ECC

Methods

readsPrec :: Int -> ReadS Curve

readList :: ReadS [Curve]

readPrec :: ReadPrec Curve

readListPrec :: ReadPrec [Curve]

Read CurveBinary 
Instance details

Defined in Crypto.Types.PubKey.ECC

Methods

readsPrec :: Int -> ReadS CurveBinary

readList :: ReadS [CurveBinary]

readPrec :: ReadPrec CurveBinary

readListPrec :: ReadPrec [CurveBinary]

Read CurveCommon 
Instance details

Defined in Crypto.Types.PubKey.ECC

Methods

readsPrec :: Int -> ReadS CurveCommon

readList :: ReadS [CurveCommon]

readPrec :: ReadPrec CurveCommon

readListPrec :: ReadPrec [CurveCommon]

Read CurveName 
Instance details

Defined in Crypto.Types.PubKey.ECC

Methods

readsPrec :: Int -> ReadS CurveName

readList :: ReadS [CurveName]

readPrec :: ReadPrec CurveName

readListPrec :: ReadPrec [CurveName]

Read CurvePrime 
Instance details

Defined in Crypto.Types.PubKey.ECC

Methods

readsPrec :: Int -> ReadS CurvePrime

readList :: ReadS [CurvePrime]

readPrec :: ReadPrec CurvePrime

readListPrec :: ReadPrec [CurvePrime]

Read Point 
Instance details

Defined in Crypto.Types.PubKey.ECC

Methods

readsPrec :: Int -> ReadS Point

readList :: ReadS [Point]

readPrec :: ReadPrec Point

readListPrec :: ReadPrec [Point]

Read KeyPair 
Instance details

Defined in Crypto.Types.PubKey.ECDSA

Methods

readsPrec :: Int -> ReadS KeyPair

readList :: ReadS [KeyPair]

readPrec :: ReadPrec KeyPair

readListPrec :: ReadPrec [KeyPair]

Read PrivateKey 
Instance details

Defined in Crypto.Types.PubKey.ECDSA

Methods

readsPrec :: Int -> ReadS PrivateKey

readList :: ReadS [PrivateKey]

readPrec :: ReadPrec PrivateKey

readListPrec :: ReadPrec [PrivateKey]

Read PublicKey 
Instance details

Defined in Crypto.Types.PubKey.ECDSA

Methods

readsPrec :: Int -> ReadS PublicKey

readList :: ReadS [PublicKey]

readPrec :: ReadPrec PublicKey

readListPrec :: ReadPrec [PublicKey]

Read Signature 
Instance details

Defined in Crypto.Types.PubKey.ECDSA

Methods

readsPrec :: Int -> ReadS Signature

readList :: ReadS [Signature]

readPrec :: ReadPrec Signature

readListPrec :: ReadPrec [Signature]

Read KeyPair 
Instance details

Defined in Crypto.Types.PubKey.RSA

Methods

readsPrec :: Int -> ReadS KeyPair

readList :: ReadS [KeyPair]

readPrec :: ReadPrec KeyPair

readListPrec :: ReadPrec [KeyPair]

Read PrivateKey 
Instance details

Defined in Crypto.Types.PubKey.RSA

Methods

readsPrec :: Int -> ReadS PrivateKey

readList :: ReadS [PrivateKey]

readPrec :: ReadPrec PrivateKey

readListPrec :: ReadPrec [PrivateKey]

Read PublicKey 
Instance details

Defined in Crypto.Types.PubKey.RSA

Methods

readsPrec :: Int -> ReadS PublicKey

readList :: ReadS [PublicKey]

readPrec :: ReadPrec PublicKey

readListPrec :: ReadPrec [PublicKey]

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 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 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 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 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 Extension 
Instance details

Defined in Language.Haskell.Exts.Extension

Methods

readsPrec :: Int -> ReadS Extension

readList :: ReadS [Extension]

readPrec :: ReadPrec Extension

readListPrec :: ReadPrec [Extension]

Read KnownExtension 
Instance details

Defined in Language.Haskell.Exts.Extension

Methods

readsPrec :: Int -> ReadS KnownExtension

readList :: ReadS [KnownExtension]

readPrec :: ReadPrec KnownExtension

readListPrec :: ReadPrec [KnownExtension]

Read Language 
Instance details

Defined in Language.Haskell.Exts.Extension

Methods

readsPrec :: Int -> ReadS Language

readList :: ReadS [Language]

readPrec :: ReadPrec Language

readListPrec :: ReadPrec [Language]

Read Date 
Instance details

Defined in Time.Types

Methods

readsPrec :: Int -> ReadS Date

readList :: ReadS [Date]

readPrec :: ReadPrec Date

readListPrec :: ReadPrec [Date]

Read DateTime 
Instance details

Defined in Time.Types

Methods

readsPrec :: Int -> ReadS DateTime

readList :: ReadS [DateTime]

readPrec :: ReadPrec DateTime

readListPrec :: ReadPrec [DateTime]

Read Elapsed 
Instance details

Defined in Time.Types

Methods

readsPrec :: Int -> ReadS Elapsed

readList :: ReadS [Elapsed]

readPrec :: ReadPrec Elapsed

readListPrec :: ReadPrec [Elapsed]

Read ElapsedP 
Instance details

Defined in Time.Types

Methods

readsPrec :: Int -> ReadS ElapsedP

readList :: ReadS [ElapsedP]

readPrec :: ReadPrec ElapsedP

readListPrec :: ReadPrec [ElapsedP]

Read Hours 
Instance details

Defined in Time.Types

Methods

readsPrec :: Int -> ReadS Hours

readList :: ReadS [Hours]

readPrec :: ReadPrec Hours

readListPrec :: ReadPrec [Hours]

Read Minutes 
Instance details

Defined in Time.Types

Methods

readsPrec :: Int -> ReadS Minutes

readList :: ReadS [Minutes]

readPrec :: ReadPrec Minutes

readListPrec :: ReadPrec [Minutes]

Read Month 
Instance details

Defined in Time.Types

Methods

readsPrec :: Int -> ReadS Month

readList :: ReadS [Month]

readPrec :: ReadPrec Month

readListPrec :: ReadPrec [Month]

Read NanoSeconds 
Instance details

Defined in Time.Types

Methods

readsPrec :: Int -> ReadS NanoSeconds

readList :: ReadS [NanoSeconds]

readPrec :: ReadPrec NanoSeconds

readListPrec :: ReadPrec [NanoSeconds]

Read Seconds 
Instance details

Defined in Time.Types

Methods

readsPrec :: Int -> ReadS Seconds

readList :: ReadS [Seconds]

readPrec :: ReadPrec Seconds

readListPrec :: ReadPrec [Seconds]

Read TimeOfDay 
Instance details

Defined in Time.Types

Methods

readsPrec :: Int -> ReadS TimeOfDay

readList :: ReadS [TimeOfDay]

readPrec :: ReadPrec TimeOfDay

readListPrec :: ReadPrec [TimeOfDay]

Read WeekDay 
Instance details

Defined in Time.Types

Methods

readsPrec :: Int -> ReadS WeekDay

readList :: ReadS [WeekDay]

readPrec :: ReadPrec WeekDay

readListPrec :: ReadPrec [WeekDay]

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 Options 
Instance details

Defined in Data.Functor.Invariant.TH

Methods

readsPrec :: Int -> ReadS Options

readList :: ReadS [Options]

readPrec :: ReadPrec Options

readListPrec :: ReadPrec [Options]

Read IP 
Instance details

Defined in Net.IP

Methods

readsPrec :: Int -> ReadS IP

readList :: ReadS [IP]

readPrec :: ReadPrec IP

readListPrec :: ReadPrec [IP]

Read IPv4 
Instance details

Defined in Net.IPv4

Methods

readsPrec :: Int -> ReadS IPv4

readList :: ReadS [IPv4]

readPrec :: ReadPrec IPv4

readListPrec :: ReadPrec [IPv4]

Read IPv4Range 
Instance details

Defined in Net.IPv4

Methods

readsPrec :: Int -> ReadS IPv4Range

readList :: ReadS [IPv4Range]

readPrec :: ReadPrec IPv4Range

readListPrec :: ReadPrec [IPv4Range]

Read IPv6 
Instance details

Defined in Net.IPv6

Methods

readsPrec :: Int -> ReadS IPv6

readList :: ReadS [IPv6]

readPrec :: ReadPrec IPv6

readListPrec :: ReadPrec [IPv6]

Read IPv6Range 
Instance details

Defined in Net.IPv6

Methods

readsPrec :: Int -> ReadS IPv6Range

readList :: ReadS [IPv6Range]

readPrec :: ReadPrec IPv6Range

readListPrec :: ReadPrec [IPv6Range]

Read Mac 
Instance details

Defined in Net.Mac

Methods

readsPrec :: Int -> ReadS Mac

readList :: ReadS [Mac]

readPrec :: ReadPrec Mac

readListPrec :: ReadPrec [Mac]

Read MacCodec 
Instance details

Defined in Net.Mac

Methods

readsPrec :: Int -> ReadS MacCodec

readList :: ReadS [MacCodec]

readPrec :: ReadPrec MacCodec

readListPrec :: ReadPrec [MacCodec]

Read MacGrouping 
Instance details

Defined in Net.Mac

Methods

readsPrec :: Int -> ReadS MacGrouping

readList :: ReadS [MacGrouping]

readPrec :: ReadPrec MacGrouping

readListPrec :: ReadPrec [MacGrouping]

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 JobStatus Source # 
Instance details

Defined in IHP.Job.Types

Methods

readsPrec :: Int -> ReadS JobStatus

readList :: ReadS [JobStatus]

readPrec :: ReadPrec JobStatus

readListPrec :: ReadPrec [JobStatus]

Read Pos 
Instance details

Defined in Text.Megaparsec.Pos

Methods

readsPrec :: Int -> ReadS Pos

readList :: ReadS [Pos]

readPrec :: ReadPrec Pos

readListPrec :: ReadPrec [Pos]

Read SourcePos 
Instance details

Defined in Text.Megaparsec.Pos

Methods

readsPrec :: Int -> ReadS SourcePos

readList :: ReadS [SourcePos]

readPrec :: ReadPrec SourcePos

readListPrec :: ReadPrec [SourcePos]

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 HostEntry 
Instance details

Defined in Network.BSD

Methods

readsPrec :: Int -> ReadS HostEntry

readList :: ReadS [HostEntry]

readPrec :: ReadPrec HostEntry

readListPrec :: ReadPrec [HostEntry]

Read NetworkEntry 
Instance details

Defined in Network.BSD

Methods

readsPrec :: Int -> ReadS NetworkEntry

readList :: ReadS [NetworkEntry]

readPrec :: ReadPrec NetworkEntry

readListPrec :: ReadPrec [NetworkEntry]

Read ProtocolEntry 
Instance details

Defined in Network.BSD

Methods

readsPrec :: Int -> ReadS ProtocolEntry

readList :: ReadS [ProtocolEntry]

readPrec :: ReadPrec ProtocolEntry

readListPrec :: ReadPrec [ProtocolEntry]

Read CalendarTime 
Instance details

Defined in System.Time

Methods

readsPrec :: Int -> ReadS CalendarTime

readList :: ReadS [CalendarTime]

readPrec :: ReadPrec CalendarTime

readListPrec :: ReadPrec [CalendarTime]

Read Day 
Instance details

Defined in System.Time

Methods

readsPrec :: Int -> ReadS Day

readList :: ReadS [Day]

readPrec :: ReadPrec Day

readListPrec :: ReadPrec [Day]

Read Month 
Instance details

Defined in System.Time

Methods

readsPrec :: Int -> ReadS Month

readList :: ReadS [Month]

readPrec :: ReadPrec Month

readListPrec :: ReadPrec [Month]

Read TimeDiff 
Instance details

Defined in System.Time

Methods

readsPrec :: Int -> ReadS TimeDiff

readList :: ReadS [TimeDiff]

readPrec :: ReadPrec TimeDiff

readListPrec :: ReadPrec [TimeDiff]

Read Oid 
Instance details

Defined in Database.PostgreSQL.LibPQ.Oid

Methods

readsPrec :: Int -> ReadS Oid

readList :: ReadS [Oid]

readPrec :: ReadPrec Oid

readListPrec :: ReadPrec [Oid]

Read ConnectInfo 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Methods

readsPrec :: Int -> ReadS ConnectInfo

readList :: ReadS [ConnectInfo]

readPrec :: ReadPrec ConnectInfo

readListPrec :: ReadPrec [ConnectInfo]

Read Default 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

readsPrec :: Int -> ReadS Default

readList :: ReadS [Default]

readPrec :: ReadPrec Default

readListPrec :: ReadPrec [Default]

Read Identifier 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

readsPrec :: Int -> ReadS Identifier

readList :: ReadS [Identifier]

readPrec :: ReadPrec Identifier

readListPrec :: ReadPrec [Identifier]

Read Null 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

readsPrec :: Int -> ReadS Null

readList :: ReadS [Null]

readPrec :: ReadPrec Null

readListPrec :: ReadPrec [Null]

Read QualifiedIdentifier 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

readsPrec :: Int -> ReadS QualifiedIdentifier

readList :: ReadS [QualifiedIdentifier]

readPrec :: ReadPrec QualifiedIdentifier

readListPrec :: ReadPrec [QualifiedIdentifier]

Read Query 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

readsPrec :: Int -> ReadS Query

readList :: ReadS [Query]

readPrec :: ReadPrec Query

readListPrec :: ReadPrec [Query]

Read Savepoint 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

readsPrec :: Int -> ReadS Savepoint

readList :: ReadS [Savepoint]

readPrec :: ReadPrec Savepoint

readListPrec :: ReadPrec [Savepoint]

Read CompOption 
Instance details

Defined in Text.Regex.TDFA.Common

Methods

readsPrec :: Int -> ReadS CompOption

readList :: ReadS [CompOption]

readPrec :: ReadPrec CompOption

readListPrec :: ReadPrec [CompOption]

Read ExecOption 
Instance details

Defined in Text.Regex.TDFA.Common

Methods

readsPrec :: Int -> ReadS ExecOption

readList :: ReadS [ExecOption]

readPrec :: ReadPrec ExecOption

readListPrec :: ReadPrec [ExecOption]

Read Undefined 
Instance details

Defined in Relude.Debug

Methods

readsPrec :: Int -> ReadS Undefined

readList :: ReadS [Undefined]

readPrec :: ReadPrec Undefined

readListPrec :: ReadPrec [Undefined]

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 Scientific 
Instance details

Defined in Data.Scientific

Methods

readsPrec :: Int -> ReadS Scientific

readList :: ReadS [Scientific]

readPrec :: ReadPrec Scientific

readListPrec :: ReadPrec [Scientific]

Read SMGen 
Instance details

Defined in System.Random.SplitMix

Methods

readsPrec :: Int -> ReadS SMGen

readList :: ReadS [SMGen]

readPrec :: ReadPrec SMGen

readListPrec :: ReadPrec [SMGen]

Read SMGen 
Instance details

Defined in System.Random.SplitMix32

Methods

readsPrec :: Int -> ReadS SMGen

readList :: ReadS [SMGen]

readPrec :: ReadPrec SMGen

readListPrec :: ReadPrec [SMGen]

Read FileType 
Instance details

Defined in Data.Streaming.Filesystem

Methods

readsPrec :: Int -> ReadS FileType

readList :: ReadS [FileType]

readPrec :: ReadPrec FileType

readListPrec :: ReadPrec [FileType]

Read HostPreference 
Instance details

Defined in Data.Streaming.Network.Internal

Methods

readsPrec :: Int -> ReadS HostPreference

readList :: ReadS [HostPreference]

readPrec :: ReadPrec HostPreference

readListPrec :: ReadPrec [HostPreference]

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 Hex 
Instance details

Defined in System.Random.TF.Gen

Methods

readsPrec :: Int -> ReadS Hex

readList :: ReadS [Hex]

readPrec :: ReadPrec Hex

readListPrec :: ReadPrec [Hex]

Read TFGen 
Instance details

Defined in System.Random.TF.Gen

Methods

readsPrec :: Int -> ReadS TFGen

readList :: ReadS [TFGen]

readPrec :: ReadPrec TFGen

readListPrec :: ReadPrec [TFGen]

Read TFGenR 
Instance details

Defined in System.Random.TF.Gen

Methods

readsPrec :: Int -> ReadS TFGenR

readList :: ReadS [TFGenR]

readPrec :: ReadPrec TFGenR

readListPrec :: ReadPrec [TFGenR]

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 DayOfWeek 
Instance details

Defined in Data.Time.Calendar.Week

Methods

readsPrec :: Int -> ReadS DayOfWeek

readList :: ReadS [DayOfWeek]

readPrec :: ReadPrec DayOfWeek

readListPrec :: ReadPrec [DayOfWeek]

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

Read Attosecond 
Instance details

Defined in Data.Time.Units

Methods

readsPrec :: Int -> ReadS Attosecond

readList :: ReadS [Attosecond]

readPrec :: ReadPrec Attosecond

readListPrec :: ReadPrec [Attosecond]

Read Day 
Instance details

Defined in Data.Time.Units

Methods

readsPrec :: Int -> ReadS Day

readList :: ReadS [Day]

readPrec :: ReadPrec Day

readListPrec :: ReadPrec [Day]

Read Femtosecond 
Instance details

Defined in Data.Time.Units

Methods

readsPrec :: Int -> ReadS Femtosecond

readList :: ReadS [Femtosecond]

readPrec :: ReadPrec Femtosecond

readListPrec :: ReadPrec [Femtosecond]

Read Fortnight 
Instance details

Defined in Data.Time.Units

Methods

readsPrec :: Int -> ReadS Fortnight

readList :: ReadS [Fortnight]

readPrec :: ReadPrec Fortnight

readListPrec :: ReadPrec [Fortnight]

Read Hour 
Instance details

Defined in Data.Time.Units

Methods

readsPrec :: Int -> ReadS Hour

readList :: ReadS [Hour]

readPrec :: ReadPrec Hour

readListPrec :: ReadPrec [Hour]

Read Microsecond 
Instance details

Defined in Data.Time.Units

Methods

readsPrec :: Int -> ReadS Microsecond

readList :: ReadS [Microsecond]

readPrec :: ReadPrec Microsecond

readListPrec :: ReadPrec [Microsecond]

Read Millisecond 
Instance details

Defined in Data.Time.Units

Methods

readsPrec :: Int -> ReadS Millisecond

readList :: ReadS [Millisecond]

readPrec :: ReadPrec Millisecond

readListPrec :: ReadPrec [Millisecond]

Read Minute 
Instance details

Defined in Data.Time.Units

Methods

readsPrec :: Int -> ReadS Minute

readList :: ReadS [Minute]

readPrec :: ReadPrec Minute

readListPrec :: ReadPrec [Minute]

Read Nanosecond 
Instance details

Defined in Data.Time.Units

Methods

readsPrec :: Int -> ReadS Nanosecond

readList :: ReadS [Nanosecond]

readPrec :: ReadPrec Nanosecond

readListPrec :: ReadPrec [Nanosecond]

Read Picosecond 
Instance details

Defined in Data.Time.Units

Methods

readsPrec :: Int -> ReadS Picosecond

readList :: ReadS [Picosecond]

readPrec :: ReadPrec Picosecond

readListPrec :: ReadPrec [Picosecond]

Read Second 
Instance details

Defined in Data.Time.Units

Methods

readsPrec :: Int -> ReadS Second

readList :: ReadS [Second]

readPrec :: ReadPrec Second

readListPrec :: ReadPrec [Second]

Read Week 
Instance details

Defined in Data.Time.Units

Methods

readsPrec :: Int -> ReadS Week

readList :: ReadS [Week]

readPrec :: ReadPrec Week

readListPrec :: ReadPrec [Week]

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 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 CorsResourcePolicy 
Instance details

Defined in Network.Wai.Middleware.Cors

Methods

readsPrec :: Int -> ReadS CorsResourcePolicy

readList :: ReadS [CorsResourcePolicy]

readPrec :: ReadPrec CorsResourcePolicy

readListPrec :: ReadPrec [CorsResourcePolicy]

Read GzipFiles 
Instance details

Defined in Network.Wai.Middleware.Gzip

Methods

readsPrec :: Int -> ReadS GzipFiles

readList :: ReadS [GzipFiles]

readPrec :: ReadPrec GzipFiles

readListPrec :: ReadPrec [GzipFiles]

Read Int128 
Instance details

Defined in Data.WideWord.Int128

Methods

readsPrec :: Int -> ReadS Int128

readList :: ReadS [Int128]

readPrec :: ReadPrec Int128

readListPrec :: ReadPrec [Int128]

Read Word128 
Instance details

Defined in Data.WideWord.Word128

Methods

readsPrec :: Int -> ReadS Word128

readList :: ReadS [Word128]

readPrec :: ReadPrec Word128

readListPrec :: ReadPrec [Word128]

Read Word256 
Instance details

Defined in Data.WideWord.Word256

Methods

readsPrec :: Int -> ReadS Word256

readList :: ReadS [Word256]

readPrec :: ReadPrec Word256

readListPrec :: ReadPrec [Word256]

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 a => Read (Only a) 
Instance details

Defined in Data.Tuple.Only

Methods

readsPrec :: Int -> ReadS (Only a)

readList :: ReadS [Only a]

readPrec :: ReadPrec (Only a)

readListPrec :: ReadPrec [Only a]

Read a => Read (Fixed a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

readsPrec :: Int -> ReadS (Fixed a)

readList :: ReadS [Fixed a]

readPrec :: ReadPrec (Fixed a)

readListPrec :: ReadPrec [Fixed a]

Read a => Read (Large a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

readsPrec :: Int -> ReadS (Large a)

readList :: ReadS [Large a]

readPrec :: ReadPrec (Large a)

readListPrec :: ReadPrec [Large a]

Read a => Read (Negative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

readsPrec :: Int -> ReadS (Negative a)

readList :: ReadS [Negative a]

readPrec :: ReadPrec (Negative a)

readListPrec :: ReadPrec [Negative a]

Read a => Read (NonEmptyList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

readsPrec :: Int -> ReadS (NonEmptyList a)

readList :: ReadS [NonEmptyList a]

readPrec :: ReadPrec (NonEmptyList a)

readListPrec :: ReadPrec [NonEmptyList a]

Read a => Read (NonNegative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

readsPrec :: Int -> ReadS (NonNegative a)

readList :: ReadS [NonNegative a]

readPrec :: ReadPrec (NonNegative a)

readListPrec :: ReadPrec [NonNegative a]

Read a => Read (NonPositive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

readsPrec :: Int -> ReadS (NonPositive a)

readList :: ReadS [NonPositive a]

readPrec :: ReadPrec (NonPositive a)

readListPrec :: ReadPrec [NonPositive a]

Read a => Read (NonZero a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

readsPrec :: Int -> ReadS (NonZero a)

readList :: ReadS [NonZero a]

readPrec :: ReadPrec (NonZero a)

readListPrec :: ReadPrec [NonZero a]

Read a => Read (OrderedList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

readsPrec :: Int -> ReadS (OrderedList a)

readList :: ReadS [OrderedList a]

readPrec :: ReadPrec (OrderedList a)

readListPrec :: ReadPrec [OrderedList a]

Read a => Read (Positive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

readsPrec :: Int -> ReadS (Positive a)

readList :: ReadS [Positive a]

readPrec :: ReadPrec (Positive a)

readListPrec :: ReadPrec [Positive a]

Read a => Read (Shrink2 a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

readsPrec :: Int -> ReadS (Shrink2 a)

readList :: ReadS [Shrink2 a]

readPrec :: ReadPrec (Shrink2 a)

readListPrec :: ReadPrec [Shrink2 a]

Read a => Read (Small a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

readsPrec :: Int -> ReadS (Small a)

readList :: ReadS [Small a]

readPrec :: ReadPrec (Small a)

readListPrec :: ReadPrec [Small a]

Read a => Read (SortedList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

readsPrec :: Int -> ReadS (SortedList a)

readList :: ReadS [SortedList a]

readPrec :: ReadPrec (SortedList a)

readListPrec :: ReadPrec [SortedList 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]

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 (FromListCounting a) 
Instance details

Defined in GHC.Data.Graph.Inductive.PatriciaTree

Methods

readsPrec :: Int -> ReadS (FromListCounting a)

readList :: ReadS [FromListCounting a]

readPrec :: ReadPrec (FromListCounting a)

readListPrec :: ReadPrec [FromListCounting a]

Read (ElapsedSince epoch) 
Instance details

Defined in Data.Hourglass.Epoch

Methods

readsPrec :: Int -> ReadS (ElapsedSince epoch)

readList :: ReadS [ElapsedSince epoch]

readPrec :: ReadPrec (ElapsedSince epoch)

readListPrec :: ReadPrec [ElapsedSince epoch]

Read (ElapsedSinceP epoch) 
Instance details

Defined in Data.Hourglass.Epoch

Methods

readsPrec :: Int -> ReadS (ElapsedSinceP epoch)

readList :: ReadS [ElapsedSinceP epoch]

readPrec :: ReadPrec (ElapsedSinceP epoch)

readListPrec :: ReadPrec [ElapsedSinceP epoch]

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 e => Read (ErrorFancy e) 
Instance details

Defined in Text.Megaparsec.Error

Methods

readsPrec :: Int -> ReadS (ErrorFancy e)

readList :: ReadS [ErrorFancy e]

readPrec :: ReadPrec (ErrorFancy e)

readListPrec :: ReadPrec [ErrorFancy e]

Read t => Read (ErrorItem t) 
Instance details

Defined in Text.Megaparsec.Error

Methods

readsPrec :: Int -> ReadS (ErrorItem t)

readList :: ReadS [ErrorItem t]

readPrec :: ReadPrec (ErrorItem t)

readListPrec :: ReadPrec [ErrorItem t]

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 a => Read (Aeson a) 
Instance details

Defined in Database.PostgreSQL.Simple.Newtypes

Methods

readsPrec :: Int -> ReadS (Aeson a)

readList :: ReadS [Aeson a]

readPrec :: ReadPrec (Aeson a)

readListPrec :: ReadPrec [Aeson a]

Read a => Read (Binary a) 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

readsPrec :: Int -> ReadS (Binary a)

readList :: ReadS [Binary a]

readPrec :: ReadPrec (Binary a)

readListPrec :: ReadPrec [Binary a]

Read a => Read (In a) 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

readsPrec :: Int -> ReadS (In a)

readList :: ReadS [In a]

readPrec :: ReadPrec (In a)

readListPrec :: ReadPrec [In a]

Read a => Read (PGArray a) 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

readsPrec :: Int -> ReadS (PGArray a)

readList :: ReadS [PGArray a]

readPrec :: ReadPrec (PGArray a)

readListPrec :: ReadPrec [PGArray a]

Read a => Read (Values a) 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

readsPrec :: Int -> ReadS (Values a)

readList :: ReadS [Values a]

readPrec :: ReadPrec (Values a)

readListPrec :: ReadPrec [Values a]

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 (CharMap a) 
Instance details

Defined in Data.IntMap.CharMap2

Methods

readsPrec :: Int -> ReadS (CharMap a)

readList :: ReadS [CharMap a]

readPrec :: ReadPrec (CharMap a)

readListPrec :: ReadPrec [CharMap a]

Read (EnumSet e) 
Instance details

Defined in Data.IntSet.EnumSet2

Methods

readsPrec :: Int -> ReadS (EnumSet e)

readList :: ReadS [EnumSet e]

readPrec :: ReadPrec (EnumSet e)

readListPrec :: ReadPrec [EnumSet e]

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 (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]

(Read1 f, Read a) => Read (Cofree f a) 
Instance details

Defined in Control.Comonad.Cofree

Methods

readsPrec :: Int -> ReadS (Cofree f a)

readList :: ReadS [Cofree f a]

readPrec :: ReadPrec (Cofree f a)

readListPrec :: ReadPrec [Cofree f a]

(Read1 w, Read a) => Read (CoiterT w a) 
Instance details

Defined in Control.Comonad.Trans.Coiter

Methods

readsPrec :: Int -> ReadS (CoiterT w a)

readList :: ReadS [CoiterT w a]

readPrec :: ReadPrec (CoiterT w a)

readListPrec :: ReadPrec [CoiterT w a]

(Read1 f, Read a) => Read (Free f a) 
Instance details

Defined in Control.Monad.Free

Methods

readsPrec :: Int -> ReadS (Free f a)

readList :: ReadS [Free f a]

readPrec :: ReadPrec (Free f a)

readListPrec :: ReadPrec [Free f a]

(Read1 f, Read a) => Read (Free f a) 
Instance details

Defined in Control.Monad.Free.Ap

Methods

readsPrec :: Int -> ReadS (Free f a)

readList :: ReadS [Free f a]

readPrec :: ReadPrec (Free f a)

readListPrec :: ReadPrec [Free f a]

(Read1 m, Read a) => Read (IterT m a) 
Instance details

Defined in Control.Monad.Trans.Iter

Methods

readsPrec :: Int -> ReadS (IterT m a)

readList :: ReadS [IterT m a]

readPrec :: ReadPrec (IterT m a)

readListPrec :: ReadPrec [IterT m a]

(Read a, Read b) => Read (Gr a b) 
Instance details

Defined in GHC.Data.Graph.Inductive.PatriciaTree

Methods

readsPrec :: Int -> ReadS (Gr a b)

readList :: ReadS [Gr a b]

readPrec :: ReadPrec (Gr a b)

readListPrec :: ReadPrec [Gr a b]

Read (f a) => Read (Coyoneda f a) 
Instance details

Defined in Data.Functor.Coyoneda

Methods

readsPrec :: Int -> ReadS (Coyoneda f a)

readList :: ReadS [Coyoneda f a]

readPrec :: ReadPrec (Coyoneda f a)

readListPrec :: ReadPrec [Coyoneda f a]

(Functor f, Read (f a)) => Read (Yoneda f a) 
Instance details

Defined in Data.Functor.Yoneda

Methods

readsPrec :: Int -> ReadS (Yoneda f a)

readList :: ReadS [Yoneda f a]

readPrec :: ReadPrec (Yoneda f a)

readListPrec :: ReadPrec [Yoneda f a]

(Read i, Read a) => Read (Level i a) 
Instance details

Defined in Control.Lens.Internal.Level

Methods

readsPrec :: Int -> ReadS (Level i a)

readList :: ReadS [Level i a]

readPrec :: ReadPrec (Level i a)

readListPrec :: ReadPrec [Level i a]

(Read h, Read t) => Read (h :. t) 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

readsPrec :: Int -> ReadS (h :. t)

readList :: ReadS [h :. t]

readPrec :: ReadPrec (h :. t)

readListPrec :: ReadPrec [h :. t]

Read a => Read (EnumMap k a) 
Instance details

Defined in Data.IntMap.EnumMap2

Methods

readsPrec :: Int -> ReadS (EnumMap k a)

readList :: ReadS [EnumMap k a]

readPrec :: ReadPrec (EnumMap k a)

readListPrec :: ReadPrec [EnumMap k a]

Read (f a) => Read (Zippy f a) 
Instance details

Defined in Data.Zip

Methods

readsPrec :: Int -> ReadS (Zippy f a)

readList :: ReadS [Zippy f a]

readPrec :: ReadPrec (Zippy f a)

readListPrec :: ReadPrec [Zippy f 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]

(GRead (Rep1 f a), Generic1 f) => Read (FunctorClassesDefault f a) 
Instance details

Defined in Data.Functor.Classes.Generic.Internal

Methods

readsPrec :: Int -> ReadS (FunctorClassesDefault f a)

readList :: ReadS [FunctorClassesDefault f a]

readPrec :: ReadPrec (FunctorClassesDefault f a)

readListPrec :: ReadPrec [FunctorClassesDefault f 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 (bi a b) => Read (Biap bi a b) 
Instance details

Defined in Data.Bifunctor.Biap

Methods

readsPrec :: Int -> ReadS (Biap bi a b)

readList :: ReadS [Biap bi a b]

readPrec :: ReadPrec (Biap bi a b)

readListPrec :: ReadPrec [Biap bi a b]

Read (p (Fix p a) a) => Read (Fix p a) 
Instance details

Defined in Data.Bifunctor.Fix

Methods

readsPrec :: Int -> ReadS (Fix p a)

readList :: ReadS [Fix p a]

readPrec :: ReadPrec (Fix p a)

readListPrec :: ReadPrec [Fix p a]

Read (p a a) => Read (Join p a) 
Instance details

Defined in Data.Bifunctor.Join

Methods

readsPrec :: Int -> ReadS (Join p a)

readList :: ReadS [Join p a]

readPrec :: ReadPrec (Join p a)

readListPrec :: ReadPrec [Join p a]

(Read a, Read (f b)) => Read (CofreeF f a b) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

readsPrec :: Int -> ReadS (CofreeF f a b)

readList :: ReadS [CofreeF f a b]

readPrec :: ReadPrec (CofreeF f a b)

readListPrec :: ReadPrec [CofreeF f a b]

Read (w (CofreeF f a (CofreeT f w a))) => Read (CofreeT f w a) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

readsPrec :: Int -> ReadS (CofreeT f w a)

readList :: ReadS [CofreeT f w a]

readPrec :: ReadPrec (CofreeT f w a)

readListPrec :: ReadPrec [CofreeT f w a]

(Read a, Read (f b)) => Read (FreeF f a b) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

readsPrec :: Int -> ReadS (FreeF f a b)

readList :: ReadS [FreeF f a b]

readPrec :: ReadPrec (FreeF f a b)

readListPrec :: ReadPrec [FreeF f a b]

(Read1 f, Read1 m, Read a) => Read (FreeT f m a) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

readsPrec :: Int -> ReadS (FreeT f m a)

readList :: ReadS [FreeT f m a]

readPrec :: ReadPrec (FreeT f m a)

readListPrec :: ReadPrec [FreeT f m a]

(Read a, Read (f b)) => Read (FreeF f a b) 
Instance details

Defined in Control.Monad.Trans.Free.Ap

Methods

readsPrec :: Int -> ReadS (FreeF f a b)

readList :: ReadS [FreeF f a b]

readPrec :: ReadPrec (FreeF f a b)

readListPrec :: ReadPrec [FreeF f a b]

(Read1 f, Read1 m, Read a) => Read (FreeT f m a) 
Instance details

Defined in Control.Monad.Trans.Free.Ap

Methods

readsPrec :: Int -> ReadS (FreeT f m a)

readList :: ReadS [FreeT f m a]

readPrec :: ReadPrec (FreeT f m a)

readListPrec :: ReadPrec [FreeT f m a]

Read (f a) => Read (WrappedContravariant f a) 
Instance details

Defined in Data.Functor.Invariant

Methods

readsPrec :: Int -> ReadS (WrappedContravariant f a)

readList :: ReadS [WrappedContravariant f a]

readPrec :: ReadPrec (WrappedContravariant f a)

readListPrec :: ReadPrec [WrappedContravariant f a]

Read (f a) => Read (WrappedFunctor f a) 
Instance details

Defined in Data.Functor.Invariant

Methods

readsPrec :: Int -> ReadS (WrappedFunctor f a)

readList :: ReadS [WrappedFunctor f a]

readPrec :: ReadPrec (WrappedFunctor f a)

readListPrec :: ReadPrec [WrappedFunctor f a]

Read (f (a, b)) => Read (AlongsideLeft f b a) 
Instance details

Defined in Control.Lens.Internal.Getter

Methods

readsPrec :: Int -> ReadS (AlongsideLeft f b a)

readList :: ReadS [AlongsideLeft f b a]

readPrec :: ReadPrec (AlongsideLeft f b a)

readListPrec :: ReadPrec [AlongsideLeft f b a]

Read (f (a, b)) => Read (AlongsideRight f a b) 
Instance details

Defined in Control.Lens.Internal.Getter

Methods

readsPrec :: Int -> ReadS (AlongsideRight f a b)

readList :: ReadS [AlongsideRight f a b]

readPrec :: ReadPrec (AlongsideRight f a b)

readListPrec :: ReadPrec [AlongsideRight f a b]

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 (f a) => Read (Clown f a b) 
Instance details

Defined in Data.Bifunctor.Clown

Methods

readsPrec :: Int -> ReadS (Clown f a b)

readList :: ReadS [Clown f a b]

readPrec :: ReadPrec (Clown f a b)

readListPrec :: ReadPrec [Clown f a b]

Read (p b a) => Read (Flip p a b) 
Instance details

Defined in Data.Bifunctor.Flip

Methods

readsPrec :: Int -> ReadS (Flip p a b)

readList :: ReadS [Flip p a b]

readPrec :: ReadPrec (Flip p a b)

readListPrec :: ReadPrec [Flip p a b]

Read (g b) => Read (Joker g a b) 
Instance details

Defined in Data.Bifunctor.Joker

Methods

readsPrec :: Int -> ReadS (Joker g a b)

readList :: ReadS [Joker g a b]

readPrec :: ReadPrec (Joker g a b)

readListPrec :: ReadPrec [Joker g a b]

Read (p a b) => Read (WrappedBifunctor p a b) 
Instance details

Defined in Data.Bifunctor.Wrapped

Methods

readsPrec :: Int -> ReadS (WrappedBifunctor p a b)

readList :: ReadS [WrappedBifunctor p a b]

readPrec :: ReadPrec (WrappedBifunctor p a b)

readListPrec :: ReadPrec [WrappedBifunctor p a b]

Read (p a b) => Read (WrappedProfunctor p a b) 
Instance details

Defined in Data.Functor.Invariant

Methods

readsPrec :: Int -> ReadS (WrappedProfunctor p a b)

readList :: ReadS [WrappedProfunctor p a b]

readPrec :: ReadPrec (WrappedProfunctor p a b)

readListPrec :: ReadPrec [WrappedProfunctor p a b]

(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 (f a b), Read (g a b)) => Read (Product f g a b) 
Instance details

Defined in Data.Bifunctor.Product

Methods

readsPrec :: Int -> ReadS (Product f g a b)

readList :: ReadS [Product f g a b]

readPrec :: ReadPrec (Product f g a b)

readListPrec :: ReadPrec [Product f g a b]

(Read (p a b), Read (q a b)) => Read (Sum p q a b) 
Instance details

Defined in Data.Bifunctor.Sum

Methods

readsPrec :: Int -> ReadS (Sum p q a b)

readList :: ReadS [Sum p q a b]

readPrec :: ReadPrec (Sum p q a b)

readListPrec :: ReadPrec [Sum p q a b]

(Read a, Read b, Read c, Read d, Read e, Read f) => Read (a, b, c, d, e, f) 
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 (f (p a b)) => Read (Tannen f p a b) 
Instance details

Defined in Data.Bifunctor.Tannen

Methods

readsPrec :: Int -> ReadS (Tannen f p a b)

readList :: ReadS [Tannen f p a b]

readPrec :: ReadPrec (Tannen f p a b)

readListPrec :: ReadPrec [Tannen f p a b]

(Read a, Read b, Read c, Read d, Read e, Read f, Read g) => Read (a, b, c, d, e, f, g) 
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 (p (f a) (g b)) => Read (Biff p f g a b) 
Instance details

Defined in Data.Bifunctor.Biff

Methods

readsPrec :: Int -> ReadS (Biff p f g a b)

readList :: ReadS [Biff p f g a b]

readPrec :: ReadPrec (Biff p f g a b)

readListPrec :: ReadPrec [Biff p f g a b]

(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i) => Read (a, b, c, d, e, f, g, h, i) 
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)]

renderPagination :: (?context :: ControllerContext) => Pagination -> Html Source #

Render a navigation for your pagination. This is to be used in your view whenever to allow users to change pages, including Next and Previous. If there is only one page, this will not render anything.

renderFilter Source #

Arguments

:: (?context :: ControllerContext) 
=> Text

Placeholder text for the text box

-> Html 

Render a filtering box in your view. Allows the user to type in a query and filter results according to what they type.

Below is an example of how this might be used in your index. Replace the existing h1 with: class="container" class="row justify-content-between" class="col-7" h1Usershref={pathTo NewUserAction} class="btn btn-primary ml-4"+ New/a/h1 /div class="col-5" {renderFilter Username} /div /div /div

theRequest :: (?context :: ControllerContext) => Request Source #

Returns the current request

data CSSFramework Source #

Render functions to render with Bootstrap, Tailwind CSS etc. We call this functions with the cssFramework passed to have late binding (like from OOP languages). Here's an explanation breaking it down, step by step

renderedHtml = styledPagination theCSSFramework theCSSFramework paginationView

Can also be written using get:

renderedHtml = (theCSSFramework.styledPagination) theCSSFramework paginationView

That's important to understand here. We get a styledPagination function using 'theCSSFramework.styledPagination'. Next, we apply theCSSFramework to that function. We do that so because the styledPagination function internally might want to call other functions of the CSSFramework type. But we might want to override some functions of the CSSFramework.

Here's an example of how it would look if we don't pass this a second time, and it's shortcomings. Let's assume styledPagination is calling a styledButton:

data CSSFramework = CSSFramework { styledPagination :: Html, styledButton :: Html }

bootstrapCSS = CSSFramework { styledPagination, styledButton }
   where
       styledPagination = [hsx|<div>{styledButton}</div>|]
       styledButton = [hsx|<button style="color: red">button</button>|]]

myPage = [hsx|{styledPagination bootstrapCSS}|]

So far all seems fine. But now let's say we would like to override the button styling, and change the button to green instead of red:

customCSS = bootstrapCSS { styledButton = [hsx|<button style="color: green">button</button>|]]  }

myPage = [hsx|{styledPagination customCSS}|]

Now, when we render the myPage we will get 'divstyle="color: red"button/button/div' (a red button, while our customCSS specified it should be green).

Our way to fix this is to "late-bind" the calls, by manually passing around a CSSFramework. Here we added that second CSSFramework to all functions. Notice how styledPagination is getting the correct styledButton by calling 'cssFramework.styledButton':

data CSSFramework = CSSFramework { styledPagination :: CSSFramework -> Html, styledButton :: CSSFramework -> Html }

bootstrapCSS = CSSFramework { styledPagination, styledButton }
   where
       styledPagination cssFramework = [hsx|<div>{cssFramework.styledButton}</div>|]
       styledButton cssFramework = [hsx|<button style="color: red">button</button>|]]

myPage = [hsx|{styledPagination bootstrapCSS bootstrapCSS}|]

Now, with this second CSSFramework in place we can customize it again:

customCSS = bootstrapCSS { styledButton = \cssFramework -> [hsx|<button style="color: green">button</button>|]]  }

myPage = [hsx|{styledPagination customCSS customCSS}|]

Constructors

CSSFramework 

Fields

Instances

Instances details
Default CSSFramework Source #

Provides an unstyled CSSFramework

This way we can later add more properties to the CSSFramework without having to update all the CSS Frameworks manually

Instance details

Defined in IHP.View.CSSFramework

Methods

def :: CSSFramework #

SetField "cssFramework" (FormContext record) CSSFramework Source # 
Instance details

Defined in IHP.View.Types

Methods

setField :: CSSFramework -> FormContext record -> FormContext record Source #

data Pagination Source #

Constructors

Pagination 

Instances

Instances details
Show Pagination Source # 
Instance details

Defined in IHP.Pagination.Types

Methods

showsPrec :: Int -> Pagination -> ShowS #

show :: Pagination -> String

showList :: [Pagination] -> ShowS #

data Options Source #

Options for customizing a pagination, to be used with paginateOptions.

Constructors

Options 

Fields

  • maxItems :: Int

    The maximum items per page. Default 50.

  • windowSize :: Int

    The size of the window in the page selector. Default 5.

Instances

Instances details
SetField "maxItems" Options Int Source # 
Instance details

Defined in IHP.Pagination.Types

SetField "windowSize" Options Int Source # 
Instance details

Defined in IHP.Pagination.Types

type family GetModelByTableName (tableName :: Symbol) Source #

sqlQuery :: (?modelContext :: ModelContext, ToRow q, FromRow r) => Query -> q -> IO [r] Source #

Runs a raw sql query

Example:

users <- sqlQuery "SELECT id, firstname, lastname FROM users" ()

Take a look at IHP.QueryBuilder for a typesafe approach on building simple queries.

  • AutoRefresh:* When using sqlQuery with AutoRefresh, you need to use trackTableRead to let AutoRefresh know that you have accessed a certain table. Otherwise AutoRefresh will not watch table of your custom sql query.

Use sqlQuerySingleRow if you expect only a single row to be returned.

sqlQueryScalar :: (?modelContext :: ModelContext, ToRow q, FromField value) => Query -> q -> IO value Source #

Runs a raw sql query which results in a single scalar value such as an integer or string

Example:

usersCount <- sqlQueryScalar "SELECT COUNT(*) FROM users"

Take a look at IHP.QueryBuilder for a typesafe approach on building simple queries.

class KnownSymbol (GetTableName record) => Table record where Source #

Access meta data for a database table

Methods

tableName :: Text Source #

Returns the table name of a given model.

Example:

>>> tableName @User
"users"

tableNameByteString :: ByteString Source #

Returns the table name of a given model as a bytestring.

Example:

>>> tableNameByteString @User
"users"

columnNames :: [ByteString] Source #

Returns the list of column names for a given model

Example:

>>> columnNames @User
["id", "email", "created_at"]

primaryKeyColumnNames :: [ByteString] Source #

Returns the list of column names, that are contained in the primary key for a given model

Example:

>>> primaryKeyColumnNames @User
["id"]
>>> primaryKeyColumnNames @PostTagging
["post_id", "tag_id"]

primaryKeyConditionForId :: Id record -> Action Source #

Returns the parameters for a WHERE conditions to match an entity by it's primary key, given the entities id

For tables with a simple primary key this simply the id:

>>> primaryKeyConditionForId project.id
Plain "d619f3cf-f355-4614-8a4c-e9ea4f301e39"

If the table has a composite primary key, this returns multiple elements:

>>> primaryKeyConditionForId postTag.id
Many [Plain "(", Plain "0ace9270-568f-4188-b237-3789aa520588", Plain ",", Plain "0b58fdf5-4bbb-4e57-a5b7-aa1c57148e1c", Plain ")"]

The order of the elements for a composite primary key must match the order of the columns returned by primaryKeyColumnNames

class KnownSymbol (n :: Symbol) #

Minimal complete definition

symbolSing

(!!) :: HasCallStack => [a] -> Int -> a #

data Violation Source #

The error message of a validator can be either a plain text value or a HTML formatted value

Constructors

TextViolation

Plain text validation error, like "cannot be empty"

Fields

HtmlViolation

HTML formatted, already pre-escaped validation error, like "Invalid, please href="http://example.com"check the documentation/a"

Fields

Instances

Instances details
Show Violation Source # 
Instance details

Defined in IHP.ModelSupport

Methods

showsPrec :: Int -> Violation -> ShowS #

show :: Violation -> String

showList :: [Violation] -> ShowS #

Eq Violation Source # 
Instance details

Defined in IHP.ModelSupport

SetField "annotations" MetaBag [(Text, Violation)] Source # 
Instance details

Defined in IHP.ModelSupport

validateIsUnique :: forall (field :: Symbol) model savedModel fieldValue modelId savedModelId. (savedModel ~ NormalizeModel model, ?modelContext :: ModelContext, FromRow savedModel, KnownSymbol field, HasField field model fieldValue, HasField field savedModel fieldValue, KnownSymbol (GetTableName savedModel), ToField fieldValue, EqOrIsOperator fieldValue, HasField "meta" model MetaBag, SetField "meta" model MetaBag, HasField "id" savedModel savedModelId, HasField "id" model modelId, savedModelId ~ modelId, Eq modelId, GetModelByTableName (GetTableName savedModel) ~ savedModel, Table savedModel) => Proxy field -> model -> IO model Source #

Validates that e.g. an email (or another field) is unique across all users before inserting.

This validator reads the given field name (e.g. email) from the record, and runs a database query to check that there is no other record using the same field value (e.g. email value).

Example: Validate that an email is unique

action CreateUserAction = do
    let user = newRecord @User
    user
        |> fill @'["email"]
        |> validateIsUnique #email
        >>= ifValid \case
            Left user -> render NewView { .. }
            Right user -> do
                createRecord user
                redirectTo UsersAction

validateIsUniqueCaseInsensitive :: forall (field :: Symbol) model savedModel fieldValue modelId savedModelId. (savedModel ~ NormalizeModel model, ?modelContext :: ModelContext, FromRow savedModel, KnownSymbol field, HasField field model fieldValue, HasField field savedModel fieldValue, KnownSymbol (GetTableName savedModel), ToField fieldValue, EqOrIsOperator fieldValue, HasField "meta" model MetaBag, SetField "meta" model MetaBag, HasField "id" savedModel savedModelId, HasField "id" model modelId, savedModelId ~ modelId, Eq modelId, GetModelByTableName (GetTableName savedModel) ~ savedModel, Table savedModel) => Proxy field -> model -> IO model Source #

Case insensitive version of validateIsUnique.

Uses a comparison like LOWER(field) = LOWER(value) internally, so it's best to have an index for LOWER(field) in your Schema.sql

>>> CREATE UNIQUE INDEX users_email_index ON users ((LOWER(email)));

Example: Validate that an email is unique, ignoring case

action CreateUserAction = do
    let user = newRecord @User
    user
        |> fill @'["email"]
        |> validateIsUniqueCaseInsensitive #email
        >>= ifValid \case
            Left user -> render NewView { .. }
            Right user -> do
                createRecord user
                redirectTo UsersAction

withCustomErrorMessageIO :: forall (field :: Symbol) model savedModel fieldValue modelId savedModelId. (savedModel ~ NormalizeModel model, ?modelContext :: ModelContext, FromRow savedModel, KnownSymbol field, HasField field model fieldValue, HasField field savedModel fieldValue, KnownSymbol (GetTableName savedModel), ToField fieldValue, EqOrIsOperator fieldValue, HasField "meta" model MetaBag, SetField "meta" model MetaBag, HasField "id" savedModel savedModelId, HasField "id" model modelId, savedModelId ~ modelId, Eq modelId, GetModelByTableName (GetTableName savedModel) ~ savedModel) => Text -> (Proxy field -> model -> IO model) -> Proxy field -> model -> IO model Source #

Overrides the error message of a given IO validator function.

Example: Validate that an email is unique with a custom error message

action CreateUserAction = do
    let user = newRecord @User
    user
        |> fill @'["email"]
        |> withCustomErrorMessageIO "Email Has Already Been Used" validateIsUnique #email
        >>= ifValid \case
            Left user -> render NewView { .. }
            Right user -> do
                createRecord user
                redirectTo UsersAction

type ConfigBuilder = StateT TMap IO () Source #

newtype Id' (table :: Symbol) Source #

Constructors

Id (PrimaryKey table) 

Instances

Instances details
FromJSON (PrimaryKey a) => FromJSON (Id' a) Source # 
Instance details

Defined in IHP.ModelSupport

Methods

parseJSON :: Value -> Parser (Id' a) #

parseJSONList :: Value -> Parser [Id' a] #

omittedField :: Maybe (Id' a) #

ToJSON (PrimaryKey a) => ToJSON (Id' a) Source # 
Instance details

Defined in IHP.ModelSupport

Methods

toJSON :: Id' a -> Value #

toEncoding :: Id' a -> Encoding #

toJSONList :: [Id' a] -> Value #

toEncodingList :: [Id' a] -> Encoding #

omitField :: Id' a -> Bool #

(KnownSymbol table, Data (PrimaryKey table)) => Data (Id' table) Source # 
Instance details

Defined in IHP.ModelSupport

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Id' table -> c (Id' table) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Id' table) #

toConstr :: Id' table -> Constr #

dataTypeOf :: Id' table -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Id' table)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Id' table)) #

gmapT :: (forall b. Data b => b -> b) -> Id' table -> Id' table #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Id' table -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Id' table -> r #

gmapQ :: (forall d. Data d => d -> u) -> Id' table -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Id' table -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Id' table -> m (Id' table) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Id' table -> m (Id' table) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Id' table -> m (Id' table) #

(Read (PrimaryKey model), ParsePrimaryKey (PrimaryKey model)) => IsString (Id' model) Source #

Sometimes you have a hardcoded UUID value which represents some record id. This instance allows you to write the Id like a string:

let projectId = "ca63aace-af4b-4e6c-bcfa-76ca061dbdc6" :: Id Project
Instance details

Defined in IHP.ModelSupport

Methods

fromString :: String -> Id' model #

Show (PrimaryKey model) => Show (Id' model) Source # 
Instance details

Defined in IHP.ModelSupport

Methods

showsPrec :: Int -> Id' model -> ShowS #

show :: Id' model -> String

showList :: [Id' model] -> ShowS #

PrimaryKey table ~ UUID => Serialize (Id' table) 
Instance details

Defined in IHP.Controller.Session

Methods

put :: Putter (Id' table)

get :: Get (Id' table)

(KnownSymbol table, NFData (PrimaryKey table)) => NFData (Id' table) Source # 
Instance details

Defined in IHP.ModelSupport

Methods

rnf :: Id' table -> () #

Eq (PrimaryKey table) => Eq (Id' table) Source # 
Instance details

Defined in IHP.ModelSupport

Methods

(==) :: Id' table -> Id' table -> Bool #

(/=) :: Id' table -> Id' table -> Bool #

Ord (PrimaryKey table) => Ord (Id' table) Source # 
Instance details

Defined in IHP.ModelSupport

Methods

compare :: Id' table -> Id' table -> Ordering #

(<) :: Id' table -> Id' table -> Bool #

(<=) :: Id' table -> Id' table -> Bool #

(>) :: Id' table -> Id' table -> Bool #

(>=) :: Id' table -> Id' table -> Bool #

max :: Id' table -> Id' table -> Id' table #

min :: Id' table -> Id' table -> Id' table #

Hashable (PrimaryKey table) => Hashable (Id' table) Source # 
Instance details

Defined in IHP.ModelSupport

Methods

hashWithSalt :: Int -> Id' table -> Int #

hash :: Id' table -> Int #

InputValue (PrimaryKey table) => ApplyAttribute (Id' table) 
Instance details

Defined in IHP.ViewSupport

Methods

applyAttribute :: Text -> Text -> Id' table -> Html -> Html

ParamReader (PrimaryKey model') => ParamReader (Id' model') Source # 
Instance details

Defined in IHP.Controller.Param

IsEmpty (PrimaryKey table) => IsEmpty (Id' table) Source # 
Instance details

Defined in IHP.ModelSupport

Methods

isEmpty :: Id' table -> Bool Source #

InputValue (PrimaryKey model') => InputValue (Id' model') Source # 
Instance details

Defined in IHP.ModelSupport

Methods

inputValue :: Id' model' -> Text Source #

FromField (PrimaryKey model) => FromField (Id' model) Source # 
Instance details

Defined in IHP.ModelSupport

Methods

fromField :: FieldParser (Id' model)

ToField (PrimaryKey model) => ToField (Id' model) Source # 
Instance details

Defined in IHP.ModelSupport

Methods

toField :: Id' model -> Action

(model ~ GetModelById (Id' table), GetTableName model ~ table, FilterPrimaryKey table) => Fetchable (Id' table) model Source # 
Instance details

Defined in IHP.Fetch

Associated Types

type FetchResult (Id' table) model 
Instance details

Defined in IHP.Fetch

type FetchResult (Id' table) model = model

Methods

fetch :: Id' table -> IO (FetchResult (Id' table) model) Source #

fetchOneOrNothing :: Id' table -> IO (Maybe model) Source #

fetchOne :: Id' table -> IO model Source #

(model ~ GetModelById (Id' table), GetTableName model ~ table, FilterPrimaryKey table) => Fetchable (Maybe (Id' table)) model Source # 
Instance details

Defined in IHP.Fetch

Associated Types

type FetchResult (Maybe (Id' table)) model 
Instance details

Defined in IHP.Fetch

type FetchResult (Maybe (Id' table)) model = [model]

Methods

fetch :: Maybe (Id' table) -> IO (FetchResult (Maybe (Id' table)) model) Source #

fetchOneOrNothing :: Maybe (Id' table) -> IO (Maybe model) Source #

fetchOne :: Maybe (Id' table) -> IO model Source #

(model ~ GetModelById (Id' table), GetModelByTableName table ~ model, GetTableName model ~ table) => Fetchable [Id' table] model Source # 
Instance details

Defined in IHP.Fetch

Associated Types

type FetchResult [Id' table] model 
Instance details

Defined in IHP.Fetch

type FetchResult [Id' table] model = [model]

Methods

fetch :: [Id' table] -> IO (FetchResult [Id' table] model) Source #

fetchOneOrNothing :: [Id' table] -> IO (Maybe model) Source #

fetchOne :: [Id' table] -> IO model Source #

(TypeError (('Text "Looks like you forgot to pass a " ':<>: 'ShowType (GetModelByTableName record)) ':<>: 'Text " id to this data constructor.") :: Constraint) => Eq (Id' record -> controller) Source # 
Instance details

Defined in IHP.ViewSupport

Methods

(==) :: (Id' record -> controller) -> (Id' record -> controller) -> Bool #

(/=) :: (Id' record -> controller) -> (Id' record -> controller) -> Bool #

type FetchResult (Id' table) model Source # 
Instance details

Defined in IHP.Fetch

type FetchResult (Id' table) model = model
type FetchResult (Maybe (Id' table)) model Source # 
Instance details

Defined in IHP.Fetch

type FetchResult (Maybe (Id' table)) model = [model]
type FetchResult [Id' table] model Source # 
Instance details

Defined in IHP.Fetch

type FetchResult [Id' table] model = [model]

class View theView where Source #

Minimal complete definition

html

Methods

beforeRender :: theView -> IO () Source #

Hook which is called before the render is called

json :: theView -> Value Source #

Renders the view to a JSON

Instances

Instances details
View EmptyView Source # 
Instance details

Defined in IHP.Job.Dashboard.View

View HtmlView Source # 
Instance details

Defined in IHP.Job.Dashboard.View

View SomeView Source #

Since the only constructor for SomeView requires that it is passed a View, we can use that to implement a View instance for SomeView

Instance details

Defined in IHP.Job.Dashboard.View

View a => View [a] Source #

Define how to render a list of views as a view. Just concatenate them together!

Instance details

Defined in IHP.Job.Dashboard.View

Methods

beforeRender :: [a] -> IO () Source #

html :: [a] -> Html Source #

json :: [a] -> Value Source #

class Job job where Source #

Minimal complete definition

perform

Methods

perform :: job -> IO () Source #

maxAttempts :: Int Source #

timeoutInMicroseconds :: Maybe Int Source #

queuePollInterval :: Int Source #

While jobs are typically fetch using pg_notiy, we have to poll the queue table periodically to catch jobs with a run_at in the future

By default we only poll every minute

maxConcurrency :: Int Source #

How many jobs of this type can be executed at the same time

This limit only applies to the running haskell process. If you run N multiple independent processes of the job runner, the limit will be N * maxConcurrency

backoffStrategy :: BackoffStrategy Source #

data JobStatus Source #

Mapping for JOB_STATUS. The DDL statement for this can be found in IHPSchema.sql:

CREATE TYPE JOB_STATUS AS ENUM ('job_status_not_started', 'job_status_running', 'job_status_failed', 'job_status_succeeded', 'job_status_retry');

Instances

Instances details
Enum JobStatus Source # 
Instance details

Defined in IHP.Job.Types

Read JobStatus Source # 
Instance details

Defined in IHP.Job.Types

Methods

readsPrec :: Int -> ReadS JobStatus

readList :: ReadS [JobStatus]

readPrec :: ReadPrec JobStatus

readListPrec :: ReadPrec [JobStatus]

Show JobStatus Source # 
Instance details

Defined in IHP.Job.Types

Methods

showsPrec :: Int -> JobStatus -> ShowS #

show :: JobStatus -> String

showList :: [JobStatus] -> ShowS #

Default JobStatus Source # 
Instance details

Defined in IHP.Job.Queue

Methods

def :: JobStatus #

Eq JobStatus Source # 
Instance details

Defined in IHP.Job.Types

ParamReader JobStatus Source # 
Instance details

Defined in IHP.Job.Queue

InputValue JobStatus Source # 
Instance details

Defined in IHP.Job.Queue

FromField JobStatus

Mapping for JOB_STATUS:

CREATE TYPE JOB_STATUS AS ENUM ('job_status_not_started', 'job_status_running', 'job_status_failed', 'job_status_succeeded', 'job_status_retry');
Instance details

Defined in IHP.Job.Queue

Methods

fromField :: FieldParser JobStatus

ToField JobStatus

Mapping for JOB_STATUS:

CREATE TYPE JOB_STATUS AS ENUM ('job_status_not_started', 'job_status_running', 'job_status_failed', 'job_status_succeeded', 'job_status_retry');
Instance details

Defined in IHP.Job.Queue

Methods

toField :: JobStatus -> Action

class Worker application where Source #

Methods

workers :: application -> [JobWorker] Source #

data BackoffStrategy Source #

Instances

Instances details
Show BackoffStrategy Source # 
Instance details

Defined in IHP.Job.Types

Eq BackoffStrategy Source # 
Instance details

Defined in IHP.Job.Types

get :: forall model (name :: Symbol) value. (KnownSymbol name, HasField name model value) => Proxy name -> model -> value Source #

Returns the field value for a field name

Example:

data Project = Project { name :: Text, isPublic :: Bool }

let project = Project { name = "Hello World", isPublic = False }
>>> project.name
"Hello World"
>>> project.isPublic
False

tshow :: Show a => a -> Text Source #

error :: Text -> a Source #

map :: (a -> b) -> [a] -> [b] #

putStrLn :: Text -> IO () #

class Foldable (t :: Type -> Type) where #

Minimal complete definition

foldMap | foldr

Methods

foldr :: (a -> b -> b) -> b -> t a -> b #

foldl :: (b -> a -> b) -> b -> t a -> b #

foldl' :: (b -> a -> b) -> b -> t a -> b #

foldr1 :: (a -> a -> a) -> t a -> a #

foldl1 :: (a -> a -> a) -> t a -> a #

length :: t a -> Int #

elem :: Eq a => a -> t a -> Bool #

maximum :: Ord a => t a -> a #

minimum :: Ord a => t a -> a #

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 UniqueMap 
Instance details

Defined in GHC.Cmm.Dataflow.Collections

Methods

fold :: Monoid m => UniqueMap m -> m

foldMap :: Monoid m => (a -> m) -> UniqueMap a -> m

foldMap' :: Monoid m => (a -> m) -> UniqueMap a -> m

foldr :: (a -> b -> b) -> b -> UniqueMap a -> b #

foldr' :: (a -> b -> b) -> b -> UniqueMap a -> b

foldl :: (b -> a -> b) -> b -> UniqueMap a -> b #

foldl' :: (b -> a -> b) -> b -> UniqueMap a -> b #

foldr1 :: (a -> a -> a) -> UniqueMap a -> a #

foldl1 :: (a -> a -> a) -> UniqueMap a -> a #

toList :: UniqueMap a -> [a]

null :: UniqueMap a -> Bool

length :: UniqueMap a -> Int #

elem :: Eq a => a -> UniqueMap a -> Bool #

maximum :: Ord a => UniqueMap a -> a #

minimum :: Ord a => UniqueMap a -> a #

sum :: Num a => UniqueMap a -> a #

product :: Num a => UniqueMap a -> a #

Foldable LabelMap 
Instance details

Defined in GHC.Cmm.Dataflow.Label

Methods

fold :: Monoid m => LabelMap m -> m

foldMap :: Monoid m => (a -> m) -> LabelMap a -> m

foldMap' :: Monoid m => (a -> m) -> LabelMap a -> m

foldr :: (a -> b -> b) -> b -> LabelMap a -> b #

foldr' :: (a -> b -> b) -> b -> LabelMap a -> b

foldl :: (b -> a -> b) -> b -> LabelMap a -> b #

foldl' :: (b -> a -> b) -> b -> LabelMap a -> b #

foldr1 :: (a -> a -> a) -> LabelMap a -> a #

foldl1 :: (a -> a -> a) -> LabelMap a -> a #

toList :: LabelMap a -> [a]

null :: LabelMap a -> Bool

length :: LabelMap a -> Int #

elem :: Eq a => a -> LabelMap a -> Bool #

maximum :: Ord a => LabelMap a -> a #

minimum :: Ord a => LabelMap a -> a #

sum :: Num a => LabelMap a -> a #

product :: Num a => LabelMap a -> a #

Foldable Bag 
Instance details

Defined in GHC.Data.Bag

Methods

fold :: Monoid m => Bag m -> m

foldMap :: Monoid m => (a -> m) -> Bag a -> m

foldMap' :: Monoid m => (a -> m) -> Bag a -> m

foldr :: (a -> b -> b) -> b -> Bag a -> b #

foldr' :: (a -> b -> b) -> b -> Bag a -> b

foldl :: (b -> a -> b) -> b -> Bag a -> b #

foldl' :: (b -> a -> b) -> b -> Bag a -> b #

foldr1 :: (a -> a -> a) -> Bag a -> a #

foldl1 :: (a -> a -> a) -> Bag a -> a #

toList :: Bag a -> [a]

null :: Bag a -> Bool

length :: Bag a -> Int #

elem :: Eq a => a -> Bag a -> Bool #

maximum :: Ord a => Bag a -> a #

minimum :: Ord a => Bag a -> a #

sum :: Num a => Bag a -> a #

product :: Num a => Bag a -> a #

Foldable PV_Result 
Instance details

Defined in GHC.Parser.PostProcess

Methods

fold :: Monoid m => PV_Result m -> m

foldMap :: Monoid m => (a -> m) -> PV_Result a -> m

foldMap' :: Monoid m => (a -> m) -> PV_Result a -> m

foldr :: (a -> b -> b) -> b -> PV_Result a -> b #

foldr' :: (a -> b -> b) -> b -> PV_Result a -> b

foldl :: (b -> a -> b) -> b -> PV_Result a -> b #

foldl' :: (b -> a -> b) -> b -> PV_Result a -> b #

foldr1 :: (a -> a -> a) -> PV_Result a -> a #

foldl1 :: (a -> a -> a) -> PV_Result a -> a #

toList :: PV_Result a -> [a]

null :: PV_Result a -> Bool

length :: PV_Result a -> Int #

elem :: Eq a => a -> PV_Result a -> Bool #

maximum :: Ord a => PV_Result a -> a #

minimum :: Ord a => PV_Result a -> a #

sum :: Num a => PV_Result a -> a #

product :: Num a => PV_Result a -> a #

Foldable Messages 
Instance details

Defined in GHC.Types.Error

Methods

fold :: Monoid m => Messages m -> m

foldMap :: Monoid m => (a -> m) -> Messages a -> m

foldMap' :: Monoid m => (a -> m) -> Messages a -> m

foldr :: (a -> b -> b) -> b -> Messages a -> b #

foldr' :: (a -> b -> b) -> b -> Messages a -> b

foldl :: (b -> a -> b) -> b -> Messages a -> b #

foldl' :: (b -> a -> b) -> b -> Messages a -> b #

foldr1 :: (a -> a -> a) -> Messages a -> a #

foldl1 :: (a -> a -> a) -> Messages a -> a #

toList :: Messages a -> [a]

null :: Messages a -> Bool

length :: Messages a -> Int #

elem :: Eq a => a -> Messages a -> Bool #

maximum :: Ord a => Messages a -> a #

minimum :: Ord a => Messages a -> a #

sum :: Num a => Messages a -> a #

product :: Num a => Messages a -> a #

Foldable MsgEnvelope 
Instance details

Defined in GHC.Types.Error

Methods

fold :: Monoid m => MsgEnvelope m -> m

foldMap :: Monoid m => (a -> m) -> MsgEnvelope a -> m

foldMap' :: Monoid m => (a -> m) -> MsgEnvelope a -> m

foldr :: (a -> b -> b) -> b -> MsgEnvelope a -> b #

foldr' :: (a -> b -> b) -> b -> MsgEnvelope a -> b

foldl :: (b -> a -> b) -> b -> MsgEnvelope a -> b #

foldl' :: (b -> a -> b) -> b -> MsgEnvelope a -> b #

foldr1 :: (a -> a -> a) -> MsgEnvelope a -> a #

foldl1 :: (a -> a -> a) -> MsgEnvelope a -> a #

toList :: MsgEnvelope a -> [a]

null :: MsgEnvelope a -> Bool

length :: MsgEnvelope a -> Int #

elem :: Eq a => a -> MsgEnvelope a -> Bool #

maximum :: Ord a => MsgEnvelope a -> a #

minimum :: Ord a => MsgEnvelope a -> a #

sum :: Num a => MsgEnvelope a -> a #

product :: Num a => MsgEnvelope a -> a #

Foldable GenWithIsBoot 
Instance details

Defined in GHC.Unit.Types

Methods

fold :: Monoid m => GenWithIsBoot m -> m

foldMap :: Monoid m => (a -> m) -> GenWithIsBoot a -> m

foldMap' :: Monoid m => (a -> m) -> GenWithIsBoot a -> m

foldr :: (a -> b -> b) -> b -> GenWithIsBoot a -> b #

foldr' :: (a -> b -> b) -> b -> GenWithIsBoot a -> b

foldl :: (b -> a -> b) -> b -> GenWithIsBoot a -> b #

foldl' :: (b -> a -> b) -> b -> GenWithIsBoot a -> b #

foldr1 :: (a -> a -> a) -> GenWithIsBoot a -> a #

foldl1 :: (a -> a -> a) -> GenWithIsBoot a -> a #

toList :: GenWithIsBoot a -> [a]

null :: GenWithIsBoot a -> Bool

length :: GenWithIsBoot a -> Int #

elem :: Eq a => a -> GenWithIsBoot a -> Bool #

maximum :: Ord a => GenWithIsBoot a -> a #

minimum :: Ord a => GenWithIsBoot a -> a #

sum :: Num a => GenWithIsBoot a -> a #

product :: Num a => GenWithIsBoot a -> a #

Foldable DataDefnCons 
Instance details

Defined in Language.Haskell.Syntax.Decls

Methods

fold :: Monoid m => DataDefnCons m -> m

foldMap :: Monoid m => (a -> m) -> DataDefnCons a -> m

foldMap' :: Monoid m => (a -> m) -> DataDefnCons a -> m

foldr :: (a -> b -> b) -> b -> DataDefnCons a -> b #

foldr' :: (a -> b -> b) -> b -> DataDefnCons a -> b

foldl :: (b -> a -> b) -> b -> DataDefnCons a -> b #

foldl' :: (b -> a -> b) -> b -> DataDefnCons a -> b #

foldr1 :: (a -> a -> a) -> DataDefnCons a -> a #

foldl1 :: (a -> a -> a) -> DataDefnCons a -> a #

toList :: DataDefnCons a -> [a]

null :: DataDefnCons a -> Bool

length :: DataDefnCons a -> Int #

elem :: Eq a => a -> DataDefnCons a -> Bool #

maximum :: Ord a => DataDefnCons a -> a #

minimum :: Ord a => DataDefnCons a -> a #

sum :: Num a => DataDefnCons a -> a #

product :: Num a => DataDefnCons 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 GenClosure 
Instance details

Defined in GHC.Exts.Heap.Closures

Methods

fold :: Monoid m => GenClosure m -> m

foldMap :: Monoid m => (a -> m) -> GenClosure a -> m

foldMap' :: Monoid m => (a -> m) -> GenClosure a -> m

foldr :: (a -> b -> b) -> b -> GenClosure a -> b #

foldr' :: (a -> b -> b) -> b -> GenClosure a -> b

foldl :: (b -> a -> b) -> b -> GenClosure a -> b #

foldl' :: (b -> a -> b) -> b -> GenClosure a -> b #

foldr1 :: (a -> a -> a) -> GenClosure a -> a #

foldl1 :: (a -> a -> a) -> GenClosure a -> a #

toList :: GenClosure a -> [a]

null :: GenClosure a -> Bool

length :: GenClosure a -> Int #

elem :: Eq a => a -> GenClosure a -> Bool #

maximum :: Ord a => GenClosure a -> a #

minimum :: Ord a => GenClosure a -> a #

sum :: Num a => GenClosure a -> a #

product :: Num a => GenClosure 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 Activation 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Activation m -> m

foldMap :: Monoid m => (a -> m) -> Activation a -> m

foldMap' :: Monoid m => (a -> m) -> Activation a -> m

foldr :: (a -> b -> b) -> b -> Activation a -> b #

foldr' :: (a -> b -> b) -> b -> Activation a -> b

foldl :: (b -> a -> b) -> b -> Activation a -> b #

foldl' :: (b -> a -> b) -> b -> Activation a -> b #

foldr1 :: (a -> a -> a) -> Activation a -> a #

foldl1 :: (a -> a -> a) -> Activation a -> a #

toList :: Activation a -> [a]

null :: Activation a -> Bool

length :: Activation a -> Int #

elem :: Eq a => a -> Activation a -> Bool #

maximum :: Ord a => Activation a -> a #

minimum :: Ord a => Activation a -> a #

sum :: Num a => Activation a -> a #

product :: Num a => Activation a -> a #

Foldable Alt 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Alt m -> m

foldMap :: Monoid m => (a -> m) -> Alt a -> m

foldMap' :: Monoid m => (a -> m) -> Alt a -> m

foldr :: (a -> b -> b) -> b -> Alt a -> b #

foldr' :: (a -> b -> b) -> b -> Alt a -> b

foldl :: (b -> a -> b) -> b -> Alt a -> b #

foldl' :: (b -> a -> b) -> b -> Alt a -> b #

foldr1 :: (a -> a -> a) -> Alt a -> a #

foldl1 :: (a -> a -> a) -> Alt a -> a #

toList :: Alt a -> [a]

null :: Alt a -> Bool

length :: Alt a -> Int #

elem :: Eq a => a -> Alt a -> Bool #

maximum :: Ord a => Alt a -> a #

minimum :: Ord a => Alt a -> a #

sum :: Num a => Alt a -> a #

product :: Num a => Alt a -> a #

Foldable Annotation 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Annotation m -> m

foldMap :: Monoid m => (a -> m) -> Annotation a -> m

foldMap' :: Monoid m => (a -> m) -> Annotation a -> m

foldr :: (a -> b -> b) -> b -> Annotation a -> b #

foldr' :: (a -> b -> b) -> b -> Annotation a -> b

foldl :: (b -> a -> b) -> b -> Annotation a -> b #

foldl' :: (b -> a -> b) -> b -> Annotation a -> b #

foldr1 :: (a -> a -> a) -> Annotation a -> a #

foldl1 :: (a -> a -> a) -> Annotation a -> a #

toList :: Annotation a -> [a]

null :: Annotation a -> Bool

length :: Annotation a -> Int #

elem :: Eq a => a -> Annotation a -> Bool #

maximum :: Ord a => Annotation a -> a #

minimum :: Ord a => Annotation a -> a #

sum :: Num a => Annotation a -> a #

product :: Num a => Annotation a -> a #

Foldable Assoc 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Assoc m -> m

foldMap :: Monoid m => (a -> m) -> Assoc a -> m

foldMap' :: Monoid m => (a -> m) -> Assoc a -> m

foldr :: (a -> b -> b) -> b -> Assoc a -> b #

foldr' :: (a -> b -> b) -> b -> Assoc a -> b

foldl :: (b -> a -> b) -> b -> Assoc a -> b #

foldl' :: (b -> a -> b) -> b -> Assoc a -> b #

foldr1 :: (a -> a -> a) -> Assoc a -> a #

foldl1 :: (a -> a -> a) -> Assoc a -> a #

toList :: Assoc a -> [a]

null :: Assoc a -> Bool

length :: Assoc a -> Int #

elem :: Eq a => a -> Assoc a -> Bool #

maximum :: Ord a => Assoc a -> a #

minimum :: Ord a => Assoc a -> a #

sum :: Num a => Assoc a -> a #

product :: Num a => Assoc a -> a #

Foldable Asst 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Asst m -> m

foldMap :: Monoid m => (a -> m) -> Asst a -> m

foldMap' :: Monoid m => (a -> m) -> Asst a -> m

foldr :: (a -> b -> b) -> b -> Asst a -> b #

foldr' :: (a -> b -> b) -> b -> Asst a -> b

foldl :: (b -> a -> b) -> b -> Asst a -> b #

foldl' :: (b -> a -> b) -> b -> Asst a -> b #

foldr1 :: (a -> a -> a) -> Asst a -> a #

foldl1 :: (a -> a -> a) -> Asst a -> a #

toList :: Asst a -> [a]

null :: Asst a -> Bool

length :: Asst a -> Int #

elem :: Eq a => a -> Asst a -> Bool #

maximum :: Ord a => Asst a -> a #

minimum :: Ord a => Asst a -> a #

sum :: Num a => Asst a -> a #

product :: Num a => Asst a -> a #

Foldable BangType 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => BangType m -> m

foldMap :: Monoid m => (a -> m) -> BangType a -> m

foldMap' :: Monoid m => (a -> m) -> BangType a -> m

foldr :: (a -> b -> b) -> b -> BangType a -> b #

foldr' :: (a -> b -> b) -> b -> BangType a -> b

foldl :: (b -> a -> b) -> b -> BangType a -> b #

foldl' :: (b -> a -> b) -> b -> BangType a -> b #

foldr1 :: (a -> a -> a) -> BangType a -> a #

foldl1 :: (a -> a -> a) -> BangType a -> a #

toList :: BangType a -> [a]

null :: BangType a -> Bool

length :: BangType a -> Int #

elem :: Eq a => a -> BangType a -> Bool #

maximum :: Ord a => BangType a -> a #

minimum :: Ord a => BangType a -> a #

sum :: Num a => BangType a -> a #

product :: Num a => BangType a -> a #

Foldable Binds 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Binds m -> m

foldMap :: Monoid m => (a -> m) -> Binds a -> m

foldMap' :: Monoid m => (a -> m) -> Binds a -> m

foldr :: (a -> b -> b) -> b -> Binds a -> b #

foldr' :: (a -> b -> b) -> b -> Binds a -> b

foldl :: (b -> a -> b) -> b -> Binds a -> b #

foldl' :: (b -> a -> b) -> b -> Binds a -> b #

foldr1 :: (a -> a -> a) -> Binds a -> a #

foldl1 :: (a -> a -> a) -> Binds a -> a #

toList :: Binds a -> [a]

null :: Binds a -> Bool

length :: Binds a -> Int #

elem :: Eq a => a -> Binds a -> Bool #

maximum :: Ord a => Binds a -> a #

minimum :: Ord a => Binds a -> a #

sum :: Num a => Binds a -> a #

product :: Num a => Binds a -> a #

Foldable BooleanFormula 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => BooleanFormula m -> m

foldMap :: Monoid m => (a -> m) -> BooleanFormula a -> m

foldMap' :: Monoid m => (a -> m) -> BooleanFormula a -> m

foldr :: (a -> b -> b) -> b -> BooleanFormula a -> b #

foldr' :: (a -> b -> b) -> b -> BooleanFormula a -> b

foldl :: (b -> a -> b) -> b -> BooleanFormula a -> b #

foldl' :: (b -> a -> b) -> b -> BooleanFormula a -> b #

foldr1 :: (a -> a -> a) -> BooleanFormula a -> a #

foldl1 :: (a -> a -> a) -> BooleanFormula a -> a #

toList :: BooleanFormula a -> [a]

null :: BooleanFormula a -> Bool

length :: BooleanFormula a -> Int #

elem :: Eq a => a -> BooleanFormula a -> Bool #

maximum :: Ord a => BooleanFormula a -> a #

minimum :: Ord a => BooleanFormula a -> a #

sum :: Num a => BooleanFormula a -> a #

product :: Num a => BooleanFormula a -> a #

Foldable Bracket 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Bracket m -> m

foldMap :: Monoid m => (a -> m) -> Bracket a -> m

foldMap' :: Monoid m => (a -> m) -> Bracket a -> m

foldr :: (a -> b -> b) -> b -> Bracket a -> b #

foldr' :: (a -> b -> b) -> b -> Bracket a -> b

foldl :: (b -> a -> b) -> b -> Bracket a -> b #

foldl' :: (b -> a -> b) -> b -> Bracket a -> b #

foldr1 :: (a -> a -> a) -> Bracket a -> a #

foldl1 :: (a -> a -> a) -> Bracket a -> a #

toList :: Bracket a -> [a]

null :: Bracket a -> Bool

length :: Bracket a -> Int #

elem :: Eq a => a -> Bracket a -> Bool #

maximum :: Ord a => Bracket a -> a #

minimum :: Ord a => Bracket a -> a #

sum :: Num a => Bracket a -> a #

product :: Num a => Bracket a -> a #

Foldable CName 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => CName m -> m

foldMap :: Monoid m => (a -> m) -> CName a -> m

foldMap' :: Monoid m => (a -> m) -> CName a -> m

foldr :: (a -> b -> b) -> b -> CName a -> b #

foldr' :: (a -> b -> b) -> b -> CName a -> b

foldl :: (b -> a -> b) -> b -> CName a -> b #

foldl' :: (b -> a -> b) -> b -> CName a -> b #

foldr1 :: (a -> a -> a) -> CName a -> a #

foldl1 :: (a -> a -> a) -> CName a -> a #

toList :: CName a -> [a]

null :: CName a -> Bool

length :: CName a -> Int #

elem :: Eq a => a -> CName a -> Bool #

maximum :: Ord a => CName a -> a #

minimum :: Ord a => CName a -> a #

sum :: Num a => CName a -> a #

product :: Num a => CName a -> a #

Foldable CallConv 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => CallConv m -> m

foldMap :: Monoid m => (a -> m) -> CallConv a -> m

foldMap' :: Monoid m => (a -> m) -> CallConv a -> m

foldr :: (a -> b -> b) -> b -> CallConv a -> b #

foldr' :: (a -> b -> b) -> b -> CallConv a -> b

foldl :: (b -> a -> b) -> b -> CallConv a -> b #

foldl' :: (b -> a -> b) -> b -> CallConv a -> b #

foldr1 :: (a -> a -> a) -> CallConv a -> a #

foldl1 :: (a -> a -> a) -> CallConv a -> a #

toList :: CallConv a -> [a]

null :: CallConv a -> Bool

length :: CallConv a -> Int #

elem :: Eq a => a -> CallConv a -> Bool #

maximum :: Ord a => CallConv a -> a #

minimum :: Ord a => CallConv a -> a #

sum :: Num a => CallConv a -> a #

product :: Num a => CallConv a -> a #

Foldable ClassDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => ClassDecl m -> m

foldMap :: Monoid m => (a -> m) -> ClassDecl a -> m

foldMap' :: Monoid m => (a -> m) -> ClassDecl a -> m

foldr :: (a -> b -> b) -> b -> ClassDecl a -> b #

foldr' :: (a -> b -> b) -> b -> ClassDecl a -> b

foldl :: (b -> a -> b) -> b -> ClassDecl a -> b #

foldl' :: (b -> a -> b) -> b -> ClassDecl a -> b #

foldr1 :: (a -> a -> a) -> ClassDecl a -> a #

foldl1 :: (a -> a -> a) -> ClassDecl a -> a #

toList :: ClassDecl a -> [a]

null :: ClassDecl a -> Bool

length :: ClassDecl a -> Int #

elem :: Eq a => a -> ClassDecl a -> Bool #

maximum :: Ord a => ClassDecl a -> a #

minimum :: Ord a => ClassDecl a -> a #

sum :: Num a => ClassDecl a -> a #

product :: Num a => ClassDecl a -> a #

Foldable ConDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => ConDecl m -> m

foldMap :: Monoid m => (a -> m) -> ConDecl a -> m

foldMap' :: Monoid m => (a -> m) -> ConDecl a -> m

foldr :: (a -> b -> b) -> b -> ConDecl a -> b #

foldr' :: (a -> b -> b) -> b -> ConDecl a -> b

foldl :: (b -> a -> b) -> b -> ConDecl a -> b #

foldl' :: (b -> a -> b) -> b -> ConDecl a -> b #

foldr1 :: (a -> a -> a) -> ConDecl a -> a #

foldl1 :: (a -> a -> a) -> ConDecl a -> a #

toList :: ConDecl a -> [a]

null :: ConDecl a -> Bool

length :: ConDecl a -> Int #

elem :: Eq a => a -> ConDecl a -> Bool #

maximum :: Ord a => ConDecl a -> a #

minimum :: Ord a => ConDecl a -> a #

sum :: Num a => ConDecl a -> a #

product :: Num a => ConDecl a -> a #

Foldable Context 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Context m -> m

foldMap :: Monoid m => (a -> m) -> Context a -> m

foldMap' :: Monoid m => (a -> m) -> Context a -> m

foldr :: (a -> b -> b) -> b -> Context a -> b #

foldr' :: (a -> b -> b) -> b -> Context a -> b

foldl :: (b -> a -> b) -> b -> Context a -> b #

foldl' :: (b -> a -> b) -> b -> Context a -> b #

foldr1 :: (a -> a -> a) -> Context a -> a #

foldl1 :: (a -> a -> a) -> Context a -> a #

toList :: Context a -> [a]

null :: Context a -> Bool

length :: Context a -> Int #

elem :: Eq a => a -> Context a -> Bool #

maximum :: Ord a => Context a -> a #

minimum :: Ord a => Context a -> a #

sum :: Num a => Context a -> a #

product :: Num a => Context a -> a #

Foldable DataOrNew 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => DataOrNew m -> m

foldMap :: Monoid m => (a -> m) -> DataOrNew a -> m

foldMap' :: Monoid m => (a -> m) -> DataOrNew a -> m

foldr :: (a -> b -> b) -> b -> DataOrNew a -> b #

foldr' :: (a -> b -> b) -> b -> DataOrNew a -> b

foldl :: (b -> a -> b) -> b -> DataOrNew a -> b #

foldl' :: (b -> a -> b) -> b -> DataOrNew a -> b #

foldr1 :: (a -> a -> a) -> DataOrNew a -> a #

foldl1 :: (a -> a -> a) -> DataOrNew a -> a #

toList :: DataOrNew a -> [a]

null :: DataOrNew a -> Bool

length :: DataOrNew a -> Int #

elem :: Eq a => a -> DataOrNew a -> Bool #

maximum :: Ord a => DataOrNew a -> a #

minimum :: Ord a => DataOrNew a -> a #

sum :: Num a => DataOrNew a -> a #

product :: Num a => DataOrNew a -> a #

Foldable Decl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Decl m -> m

foldMap :: Monoid m => (a -> m) -> Decl a -> m

foldMap' :: Monoid m => (a -> m) -> Decl a -> m

foldr :: (a -> b -> b) -> b -> Decl a -> b #

foldr' :: (a -> b -> b) -> b -> Decl a -> b

foldl :: (b -> a -> b) -> b -> Decl a -> b #

foldl' :: (b -> a -> b) -> b -> Decl a -> b #

foldr1 :: (a -> a -> a) -> Decl a -> a #

foldl1 :: (a -> a -> a) -> Decl a -> a #

toList :: Decl a -> [a]

null :: Decl a -> Bool

length :: Decl a -> Int #

elem :: Eq a => a -> Decl a -> Bool #

maximum :: Ord a => Decl a -> a #

minimum :: Ord a => Decl a -> a #

sum :: Num a => Decl a -> a #

product :: Num a => Decl a -> a #

Foldable DeclHead 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => DeclHead m -> m

foldMap :: Monoid m => (a -> m) -> DeclHead a -> m

foldMap' :: Monoid m => (a -> m) -> DeclHead a -> m

foldr :: (a -> b -> b) -> b -> DeclHead a -> b #

foldr' :: (a -> b -> b) -> b -> DeclHead a -> b

foldl :: (b -> a -> b) -> b -> DeclHead a -> b #

foldl' :: (b -> a -> b) -> b -> DeclHead a -> b #

foldr1 :: (a -> a -> a) -> DeclHead a -> a #

foldl1 :: (a -> a -> a) -> DeclHead a -> a #

toList :: DeclHead a -> [a]

null :: DeclHead a -> Bool

length :: DeclHead a -> Int #

elem :: Eq a => a -> DeclHead a -> Bool #

maximum :: Ord a => DeclHead a -> a #

minimum :: Ord a => DeclHead a -> a #

sum :: Num a => DeclHead a -> a #

product :: Num a => DeclHead a -> a #

Foldable DerivStrategy 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => DerivStrategy m -> m

foldMap :: Monoid m => (a -> m) -> DerivStrategy a -> m

foldMap' :: Monoid m => (a -> m) -> DerivStrategy a -> m

foldr :: (a -> b -> b) -> b -> DerivStrategy a -> b #

foldr' :: (a -> b -> b) -> b -> DerivStrategy a -> b

foldl :: (b -> a -> b) -> b -> DerivStrategy a -> b #

foldl' :: (b -> a -> b) -> b -> DerivStrategy a -> b #

foldr1 :: (a -> a -> a) -> DerivStrategy a -> a #

foldl1 :: (a -> a -> a) -> DerivStrategy a -> a #

toList :: DerivStrategy a -> [a]

null :: DerivStrategy a -> Bool

length :: DerivStrategy a -> Int #

elem :: Eq a => a -> DerivStrategy a -> Bool #

maximum :: Ord a => DerivStrategy a -> a #

minimum :: Ord a => DerivStrategy a -> a #

sum :: Num a => DerivStrategy a -> a #

product :: Num a => DerivStrategy a -> a #

Foldable Deriving 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Deriving m -> m

foldMap :: Monoid m => (a -> m) -> Deriving a -> m

foldMap' :: Monoid m => (a -> m) -> Deriving a -> m

foldr :: (a -> b -> b) -> b -> Deriving a -> b #

foldr' :: (a -> b -> b) -> b -> Deriving a -> b

foldl :: (b -> a -> b) -> b -> Deriving a -> b #

foldl' :: (b -> a -> b) -> b -> Deriving a -> b #

foldr1 :: (a -> a -> a) -> Deriving a -> a #

foldl1 :: (a -> a -> a) -> Deriving a -> a #

toList :: Deriving a -> [a]

null :: Deriving a -> Bool

length :: Deriving a -> Int #

elem :: Eq a => a -> Deriving a -> Bool #

maximum :: Ord a => Deriving a -> a #

minimum :: Ord a => Deriving a -> a #

sum :: Num a => Deriving a -> a #

product :: Num a => Deriving a -> a #

Foldable EWildcard 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => EWildcard m -> m

foldMap :: Monoid m => (a -> m) -> EWildcard a -> m

foldMap' :: Monoid m => (a -> m) -> EWildcard a -> m

foldr :: (a -> b -> b) -> b -> EWildcard a -> b #

foldr' :: (a -> b -> b) -> b -> EWildcard a -> b

foldl :: (b -> a -> b) -> b -> EWildcard a -> b #

foldl' :: (b -> a -> b) -> b -> EWildcard a -> b #

foldr1 :: (a -> a -> a) -> EWildcard a -> a #

foldl1 :: (a -> a -> a) -> EWildcard a -> a #

toList :: EWildcard a -> [a]

null :: EWildcard a -> Bool

length :: EWildcard a -> Int #

elem :: Eq a => a -> EWildcard a -> Bool #

maximum :: Ord a => EWildcard a -> a #

minimum :: Ord a => EWildcard a -> a #

sum :: Num a => EWildcard a -> a #

product :: Num a => EWildcard a -> a #

Foldable Exp 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Exp m -> m

foldMap :: Monoid m => (a -> m) -> Exp a -> m

foldMap' :: Monoid m => (a -> m) -> Exp a -> m

foldr :: (a -> b -> b) -> b -> Exp a -> b #

foldr' :: (a -> b -> b) -> b -> Exp a -> b

foldl :: (b -> a -> b) -> b -> Exp a -> b #

foldl' :: (b -> a -> b) -> b -> Exp a -> b #

foldr1 :: (a -> a -> a) -> Exp a -> a #

foldl1 :: (a -> a -> a) -> Exp a -> a #

toList :: Exp a -> [a]

null :: Exp a -> Bool

length :: Exp a -> Int #

elem :: Eq a => a -> Exp a -> Bool #

maximum :: Ord a => Exp a -> a #

minimum :: Ord a => Exp a -> a #

sum :: Num a => Exp a -> a #

product :: Num a => Exp a -> a #

Foldable ExportSpec 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => ExportSpec m -> m

foldMap :: Monoid m => (a -> m) -> ExportSpec a -> m

foldMap' :: Monoid m => (a -> m) -> ExportSpec a -> m

foldr :: (a -> b -> b) -> b -> ExportSpec a -> b #

foldr' :: (a -> b -> b) -> b -> ExportSpec a -> b

foldl :: (b -> a -> b) -> b -> ExportSpec a -> b #

foldl' :: (b -> a -> b) -> b -> ExportSpec a -> b #

foldr1 :: (a -> a -> a) -> ExportSpec a -> a #

foldl1 :: (a -> a -> a) -> ExportSpec a -> a #

toList :: ExportSpec a -> [a]

null :: ExportSpec a -> Bool

length :: ExportSpec a -> Int #

elem :: Eq a => a -> ExportSpec a -> Bool #

maximum :: Ord a => ExportSpec a -> a #

minimum :: Ord a => ExportSpec a -> a #

sum :: Num a => ExportSpec a -> a #

product :: Num a => ExportSpec a -> a #

Foldable ExportSpecList 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => ExportSpecList m -> m

foldMap :: Monoid m => (a -> m) -> ExportSpecList a -> m

foldMap' :: Monoid m => (a -> m) -> ExportSpecList a -> m

foldr :: (a -> b -> b) -> b -> ExportSpecList a -> b #

foldr' :: (a -> b -> b) -> b -> ExportSpecList a -> b

foldl :: (b -> a -> b) -> b -> ExportSpecList a -> b #

foldl' :: (b -> a -> b) -> b -> ExportSpecList a -> b #

foldr1 :: (a -> a -> a) -> ExportSpecList a -> a #

foldl1 :: (a -> a -> a) -> ExportSpecList a -> a #

toList :: ExportSpecList a -> [a]

null :: ExportSpecList a -> Bool

length :: ExportSpecList a -> Int #

elem :: Eq a => a -> ExportSpecList a -> Bool #

maximum :: Ord a => ExportSpecList a -> a #

minimum :: Ord a => ExportSpecList a -> a #

sum :: Num a => ExportSpecList a -> a #

product :: Num a => ExportSpecList a -> a #

Foldable FieldDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => FieldDecl m -> m

foldMap :: Monoid m => (a -> m) -> FieldDecl a -> m

foldMap' :: Monoid m => (a -> m) -> FieldDecl a -> m

foldr :: (a -> b -> b) -> b -> FieldDecl a -> b #

foldr' :: (a -> b -> b) -> b -> FieldDecl a -> b

foldl :: (b -> a -> b) -> b -> FieldDecl a -> b #

foldl' :: (b -> a -> b) -> b -> FieldDecl a -> b #

foldr1 :: (a -> a -> a) -> FieldDecl a -> a #

foldl1 :: (a -> a -> a) -> FieldDecl a -> a #

toList :: FieldDecl a -> [a]

null :: FieldDecl a -> Bool

length :: FieldDecl a -> Int #

elem :: Eq a => a -> FieldDecl a -> Bool #

maximum :: Ord a => FieldDecl a -> a #

minimum :: Ord a => FieldDecl a -> a #

sum :: Num a => FieldDecl a -> a #

product :: Num a => FieldDecl a -> a #

Foldable FieldUpdate 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => FieldUpdate m -> m

foldMap :: Monoid m => (a -> m) -> FieldUpdate a -> m

foldMap' :: Monoid m => (a -> m) -> FieldUpdate a -> m

foldr :: (a -> b -> b) -> b -> FieldUpdate a -> b #

foldr' :: (a -> b -> b) -> b -> FieldUpdate a -> b

foldl :: (b -> a -> b) -> b -> FieldUpdate a -> b #

foldl' :: (b -> a -> b) -> b -> FieldUpdate a -> b #

foldr1 :: (a -> a -> a) -> FieldUpdate a -> a #

foldl1 :: (a -> a -> a) -> FieldUpdate a -> a #

toList :: FieldUpdate a -> [a]

null :: FieldUpdate a -> Bool

length :: FieldUpdate a -> Int #

elem :: Eq a => a -> FieldUpdate a -> Bool #

maximum :: Ord a => FieldUpdate a -> a #

minimum :: Ord a => FieldUpdate a -> a #

sum :: Num a => FieldUpdate a -> a #

product :: Num a => FieldUpdate a -> a #

Foldable FunDep 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => FunDep m -> m

foldMap :: Monoid m => (a -> m) -> FunDep a -> m

foldMap' :: Monoid m => (a -> m) -> FunDep a -> m

foldr :: (a -> b -> b) -> b -> FunDep a -> b #

foldr' :: (a -> b -> b) -> b -> FunDep a -> b

foldl :: (b -> a -> b) -> b -> FunDep a -> b #

foldl' :: (b -> a -> b) -> b -> FunDep a -> b #

foldr1 :: (a -> a -> a) -> FunDep a -> a #

foldl1 :: (a -> a -> a) -> FunDep a -> a #

toList :: FunDep a -> [a]

null :: FunDep a -> Bool

length :: FunDep a -> Int #

elem :: Eq a => a -> FunDep a -> Bool #

maximum :: Ord a => FunDep a -> a #

minimum :: Ord a => FunDep a -> a #

sum :: Num a => FunDep a -> a #

product :: Num a => FunDep a -> a #

Foldable GadtDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => GadtDecl m -> m

foldMap :: Monoid m => (a -> m) -> GadtDecl a -> m

foldMap' :: Monoid m => (a -> m) -> GadtDecl a -> m

foldr :: (a -> b -> b) -> b -> GadtDecl a -> b #

foldr' :: (a -> b -> b) -> b -> GadtDecl a -> b

foldl :: (b -> a -> b) -> b -> GadtDecl a -> b #

foldl' :: (b -> a -> b) -> b -> GadtDecl a -> b #

foldr1 :: (a -> a -> a) -> GadtDecl a -> a #

foldl1 :: (a -> a -> a) -> GadtDecl a -> a #

toList :: GadtDecl a -> [a]

null :: GadtDecl a -> Bool

length :: GadtDecl a -> Int #

elem :: Eq a => a -> GadtDecl a -> Bool #

maximum :: Ord a => GadtDecl a -> a #

minimum :: Ord a => GadtDecl a -> a #

sum :: Num a => GadtDecl a -> a #

product :: Num a => GadtDecl a -> a #

Foldable GuardedRhs 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => GuardedRhs m -> m

foldMap :: Monoid m => (a -> m) -> GuardedRhs a -> m

foldMap' :: Monoid m => (a -> m) -> GuardedRhs a -> m

foldr :: (a -> b -> b) -> b -> GuardedRhs a -> b #

foldr' :: (a -> b -> b) -> b -> GuardedRhs a -> b

foldl :: (b -> a -> b) -> b -> GuardedRhs a -> b #

foldl' :: (b -> a -> b) -> b -> GuardedRhs a -> b #

foldr1 :: (a -> a -> a) -> GuardedRhs a -> a #

foldl1 :: (a -> a -> a) -> GuardedRhs a -> a #

toList :: GuardedRhs a -> [a]

null :: GuardedRhs a -> Bool

length :: GuardedRhs a -> Int #

elem :: Eq a => a -> GuardedRhs a -> Bool #

maximum :: Ord a => GuardedRhs a -> a #

minimum :: Ord a => GuardedRhs a -> a #

sum :: Num a => GuardedRhs a -> a #

product :: Num a => GuardedRhs a -> a #

Foldable IPBind 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => IPBind m -> m

foldMap :: Monoid m => (a -> m) -> IPBind a -> m

foldMap' :: Monoid m => (a -> m) -> IPBind a -> m

foldr :: (a -> b -> b) -> b -> IPBind a -> b #

foldr' :: (a -> b -> b) -> b -> IPBind a -> b

foldl :: (b -> a -> b) -> b -> IPBind a -> b #

foldl' :: (b -> a -> b) -> b -> IPBind a -> b #

foldr1 :: (a -> a -> a) -> IPBind a -> a #

foldl1 :: (a -> a -> a) -> IPBind a -> a #

toList :: IPBind a -> [a]

null :: IPBind a -> Bool

length :: IPBind a -> Int #

elem :: Eq a => a -> IPBind a -> Bool #

maximum :: Ord a => IPBind a -> a #

minimum :: Ord a => IPBind a -> a #

sum :: Num a => IPBind a -> a #

product :: Num a => IPBind a -> a #

Foldable IPName 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => IPName m -> m

foldMap :: Monoid m => (a -> m) -> IPName a -> m

foldMap' :: Monoid m => (a -> m) -> IPName a -> m

foldr :: (a -> b -> b) -> b -> IPName a -> b #

foldr' :: (a -> b -> b) -> b -> IPName a -> b

foldl :: (b -> a -> b) -> b -> IPName a -> b #

foldl' :: (b -> a -> b) -> b -> IPName a -> b #

foldr1 :: (a -> a -> a) -> IPName a -> a #

foldl1 :: (a -> a -> a) -> IPName a -> a #

toList :: IPName a -> [a]

null :: IPName a -> Bool

length :: IPName a -> Int #

elem :: Eq a => a -> IPName a -> Bool #

maximum :: Ord a => IPName a -> a #

minimum :: Ord a => IPName a -> a #

sum :: Num a => IPName a -> a #

product :: Num a => IPName a -> a #

Foldable ImportDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => ImportDecl m -> m

foldMap :: Monoid m => (a -> m) -> ImportDecl a -> m

foldMap' :: Monoid m => (a -> m) -> ImportDecl a -> m

foldr :: (a -> b -> b) -> b -> ImportDecl a -> b #

foldr' :: (a -> b -> b) -> b -> ImportDecl a -> b

foldl :: (b -> a -> b) -> b -> ImportDecl a -> b #

foldl' :: (b -> a -> b) -> b -> ImportDecl a -> b #

foldr1 :: (a -> a -> a) -> ImportDecl a -> a #

foldl1 :: (a -> a -> a) -> ImportDecl a -> a #

toList :: ImportDecl a -> [a]

null :: ImportDecl a -> Bool

length :: ImportDecl a -> Int #

elem :: Eq a => a -> ImportDecl a -> Bool #

maximum :: Ord a => ImportDecl a -> a #

minimum :: Ord a => ImportDecl a -> a #

sum :: Num a => ImportDecl a -> a #

product :: Num a => ImportDecl a -> a #

Foldable ImportSpec 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => ImportSpec m -> m

foldMap :: Monoid m => (a -> m) -> ImportSpec a -> m

foldMap' :: Monoid m => (a -> m) -> ImportSpec a -> m

foldr :: (a -> b -> b) -> b -> ImportSpec a -> b #

foldr' :: (a -> b -> b) -> b -> ImportSpec a -> b

foldl :: (b -> a -> b) -> b -> ImportSpec a -> b #

foldl' :: (b -> a -> b) -> b -> ImportSpec a -> b #

foldr1 :: (a -> a -> a) -> ImportSpec a -> a #

foldl1 :: (a -> a -> a) -> ImportSpec a -> a #

toList :: ImportSpec a -> [a]

null :: ImportSpec a -> Bool

length :: ImportSpec a -> Int #

elem :: Eq a => a -> ImportSpec a -> Bool #

maximum :: Ord a => ImportSpec a -> a #

minimum :: Ord a => ImportSpec a -> a #

sum :: Num a => ImportSpec a -> a #

product :: Num a => ImportSpec a -> a #

Foldable ImportSpecList 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => ImportSpecList m -> m

foldMap :: Monoid m => (a -> m) -> ImportSpecList a -> m

foldMap' :: Monoid m => (a -> m) -> ImportSpecList a -> m

foldr :: (a -> b -> b) -> b -> ImportSpecList a -> b #

foldr' :: (a -> b -> b) -> b -> ImportSpecList a -> b

foldl :: (b -> a -> b) -> b -> ImportSpecList a -> b #

foldl' :: (b -> a -> b) -> b -> ImportSpecList a -> b #

foldr1 :: (a -> a -> a) -> ImportSpecList a -> a #

foldl1 :: (a -> a -> a) -> ImportSpecList a -> a #

toList :: ImportSpecList a -> [a]

null :: ImportSpecList a -> Bool

length :: ImportSpecList a -> Int #

elem :: Eq a => a -> ImportSpecList a -> Bool #

maximum :: Ord a => ImportSpecList a -> a #

minimum :: Ord a => ImportSpecList a -> a #

sum :: Num a => ImportSpecList a -> a #

product :: Num a => ImportSpecList a -> a #

Foldable InjectivityInfo 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => InjectivityInfo m -> m

foldMap :: Monoid m => (a -> m) -> InjectivityInfo a -> m

foldMap' :: Monoid m => (a -> m) -> InjectivityInfo a -> m

foldr :: (a -> b -> b) -> b -> InjectivityInfo a -> b #

foldr' :: (a -> b -> b) -> b -> InjectivityInfo a -> b

foldl :: (b -> a -> b) -> b -> InjectivityInfo a -> b #

foldl' :: (b -> a -> b) -> b -> InjectivityInfo a -> b #

foldr1 :: (a -> a -> a) -> InjectivityInfo a -> a #

foldl1 :: (a -> a -> a) -> InjectivityInfo a -> a #

toList :: InjectivityInfo a -> [a]

null :: InjectivityInfo a -> Bool

length :: InjectivityInfo a -> Int #

elem :: Eq a => a -> InjectivityInfo a -> Bool #

maximum :: Ord a => InjectivityInfo a -> a #

minimum :: Ord a => InjectivityInfo a -> a #

sum :: Num a => InjectivityInfo a -> a #

product :: Num a => InjectivityInfo a -> a #

Foldable InstDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => InstDecl m -> m

foldMap :: Monoid m => (a -> m) -> InstDecl a -> m

foldMap' :: Monoid m => (a -> m) -> InstDecl a -> m

foldr :: (a -> b -> b) -> b -> InstDecl a -> b #

foldr' :: (a -> b -> b) -> b -> InstDecl a -> b

foldl :: (b -> a -> b) -> b -> InstDecl a -> b #

foldl' :: (b -> a -> b) -> b -> InstDecl a -> b #

foldr1 :: (a -> a -> a) -> InstDecl a -> a #

foldl1 :: (a -> a -> a) -> InstDecl a -> a #

toList :: InstDecl a -> [a]

null :: InstDecl a -> Bool

length :: InstDecl a -> Int #

elem :: Eq a => a -> InstDecl a -> Bool #

maximum :: Ord a => InstDecl a -> a #

minimum :: Ord a => InstDecl a -> a #

sum :: Num a => InstDecl a -> a #

product :: Num a => InstDecl a -> a #

Foldable InstHead 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => InstHead m -> m

foldMap :: Monoid m => (a -> m) -> InstHead a -> m

foldMap' :: Monoid m => (a -> m) -> InstHead a -> m

foldr :: (a -> b -> b) -> b -> InstHead a -> b #

foldr' :: (a -> b -> b) -> b -> InstHead a -> b

foldl :: (b -> a -> b) -> b -> InstHead a -> b #

foldl' :: (b -> a -> b) -> b -> InstHead a -> b #

foldr1 :: (a -> a -> a) -> InstHead a -> a #

foldl1 :: (a -> a -> a) -> InstHead a -> a #

toList :: InstHead a -> [a]

null :: InstHead a -> Bool

length :: InstHead a -> Int #

elem :: Eq a => a -> InstHead a -> Bool #

maximum :: Ord a => InstHead a -> a #

minimum :: Ord a => InstHead a -> a #

sum :: Num a => InstHead a -> a #

product :: Num a => InstHead a -> a #

Foldable InstRule 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => InstRule m -> m

foldMap :: Monoid m => (a -> m) -> InstRule a -> m

foldMap' :: Monoid m => (a -> m) -> InstRule a -> m

foldr :: (a -> b -> b) -> b -> InstRule a -> b #

foldr' :: (a -> b -> b) -> b -> InstRule a -> b

foldl :: (b -> a -> b) -> b -> InstRule a -> b #

foldl' :: (b -> a -> b) -> b -> InstRule a -> b #

foldr1 :: (a -> a -> a) -> InstRule a -> a #

foldl1 :: (a -> a -> a) -> InstRule a -> a #

toList :: InstRule a -> [a]

null :: InstRule a -> Bool

length :: InstRule a -> Int #

elem :: Eq a => a -> InstRule a -> Bool #

maximum :: Ord a => InstRule a -> a #

minimum :: Ord a => InstRule a -> a #

sum :: Num a => InstRule a -> a #

product :: Num a => InstRule a -> a #

Foldable Literal 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Literal m -> m

foldMap :: Monoid m => (a -> m) -> Literal a -> m

foldMap' :: Monoid m => (a -> m) -> Literal a -> m

foldr :: (a -> b -> b) -> b -> Literal a -> b #

foldr' :: (a -> b -> b) -> b -> Literal a -> b

foldl :: (b -> a -> b) -> b -> Literal a -> b #

foldl' :: (b -> a -> b) -> b -> Literal a -> b #

foldr1 :: (a -> a -> a) -> Literal a -> a #

foldl1 :: (a -> a -> a) -> Literal a -> a #

toList :: Literal a -> [a]

null :: Literal a -> Bool

length :: Literal a -> Int #

elem :: Eq a => a -> Literal a -> Bool #

maximum :: Ord a => Literal a -> a #

minimum :: Ord a => Literal a -> a #

sum :: Num a => Literal a -> a #

product :: Num a => Literal a -> a #

Foldable Match 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Match m -> m

foldMap :: Monoid m => (a -> m) -> Match a -> m

foldMap' :: Monoid m => (a -> m) -> Match a -> m

foldr :: (a -> b -> b) -> b -> Match a -> b #

foldr' :: (a -> b -> b) -> b -> Match a -> b

foldl :: (b -> a -> b) -> b -> Match a -> b #

foldl' :: (b -> a -> b) -> b -> Match a -> b #

foldr1 :: (a -> a -> a) -> Match a -> a #

foldl1 :: (a -> a -> a) -> Match a -> a #

toList :: Match a -> [a]

null :: Match a -> Bool

length :: Match a -> Int #

elem :: Eq a => a -> Match a -> Bool #

maximum :: Ord a => Match a -> a #

minimum :: Ord a => Match a -> a #

sum :: Num a => Match a -> a #

product :: Num a => Match a -> a #

Foldable MaybePromotedName 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => MaybePromotedName m -> m

foldMap :: Monoid m => (a -> m) -> MaybePromotedName a -> m

foldMap' :: Monoid m => (a -> m) -> MaybePromotedName a -> m

foldr :: (a -> b -> b) -> b -> MaybePromotedName a -> b #

foldr' :: (a -> b -> b) -> b -> MaybePromotedName a -> b

foldl :: (b -> a -> b) -> b -> MaybePromotedName a -> b #

foldl' :: (b -> a -> b) -> b -> MaybePromotedName a -> b #

foldr1 :: (a -> a -> a) -> MaybePromotedName a -> a #

foldl1 :: (a -> a -> a) -> MaybePromotedName a -> a #

toList :: MaybePromotedName a -> [a]

null :: MaybePromotedName a -> Bool

length :: MaybePromotedName a -> Int #

elem :: Eq a => a -> MaybePromotedName a -> Bool #

maximum :: Ord a => MaybePromotedName a -> a #

minimum :: Ord a => MaybePromotedName a -> a #

sum :: Num a => MaybePromotedName a -> a #

product :: Num a => MaybePromotedName a -> a #

Foldable Module 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Module m -> m

foldMap :: Monoid m => (a -> m) -> Module a -> m

foldMap' :: Monoid m => (a -> m) -> Module a -> m

foldr :: (a -> b -> b) -> b -> Module a -> b #

foldr' :: (a -> b -> b) -> b -> Module a -> b

foldl :: (b -> a -> b) -> b -> Module a -> b #

foldl' :: (b -> a -> b) -> b -> Module a -> b #

foldr1 :: (a -> a -> a) -> Module a -> a #

foldl1 :: (a -> a -> a) -> Module a -> a #

toList :: Module a -> [a]

null :: Module a -> Bool

length :: Module a -> Int #

elem :: Eq a => a -> Module a -> Bool #

maximum :: Ord a => Module a -> a #

minimum :: Ord a => Module a -> a #

sum :: Num a => Module a -> a #

product :: Num a => Module a -> a #

Foldable ModuleHead 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => ModuleHead m -> m

foldMap :: Monoid m => (a -> m) -> ModuleHead a -> m

foldMap' :: Monoid m => (a -> m) -> ModuleHead a -> m

foldr :: (a -> b -> b) -> b -> ModuleHead a -> b #

foldr' :: (a -> b -> b) -> b -> ModuleHead a -> b

foldl :: (b -> a -> b) -> b -> ModuleHead a -> b #

foldl' :: (b -> a -> b) -> b -> ModuleHead a -> b #

foldr1 :: (a -> a -> a) -> ModuleHead a -> a #

foldl1 :: (a -> a -> a) -> ModuleHead a -> a #

toList :: ModuleHead a -> [a]

null :: ModuleHead a -> Bool

length :: ModuleHead a -> Int #

elem :: Eq a => a -> ModuleHead a -> Bool #

maximum :: Ord a => ModuleHead a -> a #

minimum :: Ord a => ModuleHead a -> a #

sum :: Num a => ModuleHead a -> a #

product :: Num a => ModuleHead a -> a #

Foldable ModuleName 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => ModuleName m -> m

foldMap :: Monoid m => (a -> m) -> ModuleName a -> m

foldMap' :: Monoid m => (a -> m) -> ModuleName a -> m

foldr :: (a -> b -> b) -> b -> ModuleName a -> b #

foldr' :: (a -> b -> b) -> b -> ModuleName a -> b

foldl :: (b -> a -> b) -> b -> ModuleName a -> b #

foldl' :: (b -> a -> b) -> b -> ModuleName a -> b #

foldr1 :: (a -> a -> a) -> ModuleName a -> a #

foldl1 :: (a -> a -> a) -> ModuleName a -> a #

toList :: ModuleName a -> [a]

null :: ModuleName a -> Bool

length :: ModuleName a -> Int #

elem :: Eq a => a -> ModuleName a -> Bool #

maximum :: Ord a => ModuleName a -> a #

minimum :: Ord a => ModuleName a -> a #

sum :: Num a => ModuleName a -> a #

product :: Num a => ModuleName a -> a #

Foldable ModulePragma 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => ModulePragma m -> m

foldMap :: Monoid m => (a -> m) -> ModulePragma a -> m

foldMap' :: Monoid m => (a -> m) -> ModulePragma a -> m

foldr :: (a -> b -> b) -> b -> ModulePragma a -> b #

foldr' :: (a -> b -> b) -> b -> ModulePragma a -> b

foldl :: (b -> a -> b) -> b -> ModulePragma a -> b #

foldl' :: (b -> a -> b) -> b -> ModulePragma a -> b #

foldr1 :: (a -> a -> a) -> ModulePragma a -> a #

foldl1 :: (a -> a -> a) -> ModulePragma a -> a #

toList :: ModulePragma a -> [a]

null :: ModulePragma a -> Bool

length :: ModulePragma a -> Int #

elem :: Eq a => a -> ModulePragma a -> Bool #

maximum :: Ord a => ModulePragma a -> a #

minimum :: Ord a => ModulePragma a -> a #

sum :: Num a => ModulePragma a -> a #

product :: Num a => ModulePragma a -> a #

Foldable Name 
Instance details

Defined in Language.Haskell.Exts.Syntax

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 Namespace 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Namespace m -> m

foldMap :: Monoid m => (a -> m) -> Namespace a -> m

foldMap' :: Monoid m => (a -> m) -> Namespace a -> m

foldr :: (a -> b -> b) -> b -> Namespace a -> b #

foldr' :: (a -> b -> b) -> b -> Namespace a -> b

foldl :: (b -> a -> b) -> b -> Namespace a -> b #

foldl' :: (b -> a -> b) -> b -> Namespace a -> b #

foldr1 :: (a -> a -> a) -> Namespace a -> a #

foldl1 :: (a -> a -> a) -> Namespace a -> a #

toList :: Namespace a -> [a]

null :: Namespace a -> Bool

length :: Namespace a -> Int #

elem :: Eq a => a -> Namespace a -> Bool #

maximum :: Ord a => Namespace a -> a #

minimum :: Ord a => Namespace a -> a #

sum :: Num a => Namespace a -> a #

product :: Num a => Namespace a -> a #

Foldable Op 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Op m -> m

foldMap :: Monoid m => (a -> m) -> Op a -> m

foldMap' :: Monoid m => (a -> m) -> Op a -> m

foldr :: (a -> b -> b) -> b -> Op a -> b #

foldr' :: (a -> b -> b) -> b -> Op a -> b

foldl :: (b -> a -> b) -> b -> Op a -> b #

foldl' :: (b -> a -> b) -> b -> Op a -> b #

foldr1 :: (a -> a -> a) -> Op a -> a #

foldl1 :: (a -> a -> a) -> Op a -> a #

toList :: Op a -> [a]

null :: Op a -> Bool

length :: Op a -> Int #

elem :: Eq a => a -> Op a -> Bool #

maximum :: Ord a => Op a -> a #

minimum :: Ord a => Op a -> a #

sum :: Num a => Op a -> a #

product :: Num a => Op a -> a #

Foldable Overlap 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Overlap m -> m

foldMap :: Monoid m => (a -> m) -> Overlap a -> m

foldMap' :: Monoid m => (a -> m) -> Overlap a -> m

foldr :: (a -> b -> b) -> b -> Overlap a -> b #

foldr' :: (a -> b -> b) -> b -> Overlap a -> b

foldl :: (b -> a -> b) -> b -> Overlap a -> b #

foldl' :: (b -> a -> b) -> b -> Overlap a -> b #

foldr1 :: (a -> a -> a) -> Overlap a -> a #

foldl1 :: (a -> a -> a) -> Overlap a -> a #

toList :: Overlap a -> [a]

null :: Overlap a -> Bool

length :: Overlap a -> Int #

elem :: Eq a => a -> Overlap a -> Bool #

maximum :: Ord a => Overlap a -> a #

minimum :: Ord a => Overlap a -> a #

sum :: Num a => Overlap a -> a #

product :: Num a => Overlap a -> a #

Foldable PXAttr 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => PXAttr m -> m

foldMap :: Monoid m => (a -> m) -> PXAttr a -> m

foldMap' :: Monoid m => (a -> m) -> PXAttr a -> m

foldr :: (a -> b -> b) -> b -> PXAttr a -> b #

foldr' :: (a -> b -> b) -> b -> PXAttr a -> b

foldl :: (b -> a -> b) -> b -> PXAttr a -> b #

foldl' :: (b -> a -> b) -> b -> PXAttr a -> b #

foldr1 :: (a -> a -> a) -> PXAttr a -> a #

foldl1 :: (a -> a -> a) -> PXAttr a -> a #

toList :: PXAttr a -> [a]

null :: PXAttr a -> Bool

length :: PXAttr a -> Int #

elem :: Eq a => a -> PXAttr a -> Bool #

maximum :: Ord a => PXAttr a -> a #

minimum :: Ord a => PXAttr a -> a #

sum :: Num a => PXAttr a -> a #

product :: Num a => PXAttr a -> a #

Foldable Pat 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Pat m -> m

foldMap :: Monoid m => (a -> m) -> Pat a -> m

foldMap' :: Monoid m => (a -> m) -> Pat a -> m

foldr :: (a -> b -> b) -> b -> Pat a -> b #

foldr' :: (a -> b -> b) -> b -> Pat a -> b

foldl :: (b -> a -> b) -> b -> Pat a -> b #

foldl' :: (b -> a -> b) -> b -> Pat a -> b #

foldr1 :: (a -> a -> a) -> Pat a -> a #

foldl1 :: (a -> a -> a) -> Pat a -> a #

toList :: Pat a -> [a]

null :: Pat a -> Bool

length :: Pat a -> Int #

elem :: Eq a => a -> Pat a -> Bool #

maximum :: Ord a => Pat a -> a #

minimum :: Ord a => Pat a -> a #

sum :: Num a => Pat a -> a #

product :: Num a => Pat a -> a #

Foldable PatField 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => PatField m -> m

foldMap :: Monoid m => (a -> m) -> PatField a -> m

foldMap' :: Monoid m => (a -> m) -> PatField a -> m

foldr :: (a -> b -> b) -> b -> PatField a -> b #

foldr' :: (a -> b -> b) -> b -> PatField a -> b

foldl :: (b -> a -> b) -> b -> PatField a -> b #

foldl' :: (b -> a -> b) -> b -> PatField a -> b #

foldr1 :: (a -> a -> a) -> PatField a -> a #

foldl1 :: (a -> a -> a) -> PatField a -> a #

toList :: PatField a -> [a]

null :: PatField a -> Bool

length :: PatField a -> Int #

elem :: Eq a => a -> PatField a -> Bool #

maximum :: Ord a => PatField a -> a #

minimum :: Ord a => PatField a -> a #

sum :: Num a => PatField a -> a #

product :: Num a => PatField a -> a #

Foldable PatternSynDirection 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => PatternSynDirection m -> m

foldMap :: Monoid m => (a -> m) -> PatternSynDirection a -> m

foldMap' :: Monoid m => (a -> m) -> PatternSynDirection a -> m

foldr :: (a -> b -> b) -> b -> PatternSynDirection a -> b #

foldr' :: (a -> b -> b) -> b -> PatternSynDirection a -> b

foldl :: (b -> a -> b) -> b -> PatternSynDirection a -> b #

foldl' :: (b -> a -> b) -> b -> PatternSynDirection a -> b #

foldr1 :: (a -> a -> a) -> PatternSynDirection a -> a #

foldl1 :: (a -> a -> a) -> PatternSynDirection a -> a #

toList :: PatternSynDirection a -> [a]

null :: PatternSynDirection a -> Bool

length :: PatternSynDirection a -> Int #

elem :: Eq a => a -> PatternSynDirection a -> Bool #

maximum :: Ord a => PatternSynDirection a -> a #

minimum :: Ord a => PatternSynDirection a -> a #

sum :: Num a => PatternSynDirection a -> a #

product :: Num a => PatternSynDirection a -> a #

Foldable Promoted 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Promoted m -> m

foldMap :: Monoid m => (a -> m) -> Promoted a -> m

foldMap' :: Monoid m => (a -> m) -> Promoted a -> m

foldr :: (a -> b -> b) -> b -> Promoted a -> b #

foldr' :: (a -> b -> b) -> b -> Promoted a -> b

foldl :: (b -> a -> b) -> b -> Promoted a -> b #

foldl' :: (b -> a -> b) -> b -> Promoted a -> b #

foldr1 :: (a -> a -> a) -> Promoted a -> a #

foldl1 :: (a -> a -> a) -> Promoted a -> a #

toList :: Promoted a -> [a]

null :: Promoted a -> Bool

length :: Promoted a -> Int #

elem :: Eq a => a -> Promoted a -> Bool #

maximum :: Ord a => Promoted a -> a #

minimum :: Ord a => Promoted a -> a #

sum :: Num a => Promoted a -> a #

product :: Num a => Promoted a -> a #

Foldable QName 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => QName m -> m

foldMap :: Monoid m => (a -> m) -> QName a -> m

foldMap' :: Monoid m => (a -> m) -> QName a -> m

foldr :: (a -> b -> b) -> b -> QName a -> b #

foldr' :: (a -> b -> b) -> b -> QName a -> b

foldl :: (b -> a -> b) -> b -> QName a -> b #

foldl' :: (b -> a -> b) -> b -> QName a -> b #

foldr1 :: (a -> a -> a) -> QName a -> a #

foldl1 :: (a -> a -> a) -> QName a -> a #

toList :: QName a -> [a]

null :: QName a -> Bool

length :: QName a -> Int #

elem :: Eq a => a -> QName a -> Bool #

maximum :: Ord a => QName a -> a #

minimum :: Ord a => QName a -> a #

sum :: Num a => QName a -> a #

product :: Num a => QName a -> a #

Foldable QOp 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => QOp m -> m

foldMap :: Monoid m => (a -> m) -> QOp a -> m

foldMap' :: Monoid m => (a -> m) -> QOp a -> m

foldr :: (a -> b -> b) -> b -> QOp a -> b #

foldr' :: (a -> b -> b) -> b -> QOp a -> b

foldl :: (b -> a -> b) -> b -> QOp a -> b #

foldl' :: (b -> a -> b) -> b -> QOp a -> b #

foldr1 :: (a -> a -> a) -> QOp a -> a #

foldl1 :: (a -> a -> a) -> QOp a -> a #

toList :: QOp a -> [a]

null :: QOp a -> Bool

length :: QOp a -> Int #

elem :: Eq a => a -> QOp a -> Bool #

maximum :: Ord a => QOp a -> a #

minimum :: Ord a => QOp a -> a #

sum :: Num a => QOp a -> a #

product :: Num a => QOp a -> a #

Foldable QualConDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => QualConDecl m -> m

foldMap :: Monoid m => (a -> m) -> QualConDecl a -> m

foldMap' :: Monoid m => (a -> m) -> QualConDecl a -> m

foldr :: (a -> b -> b) -> b -> QualConDecl a -> b #

foldr' :: (a -> b -> b) -> b -> QualConDecl a -> b

foldl :: (b -> a -> b) -> b -> QualConDecl a -> b #

foldl' :: (b -> a -> b) -> b -> QualConDecl a -> b #

foldr1 :: (a -> a -> a) -> QualConDecl a -> a #

foldl1 :: (a -> a -> a) -> QualConDecl a -> a #

toList :: QualConDecl a -> [a]

null :: QualConDecl a -> Bool

length :: QualConDecl a -> Int #

elem :: Eq a => a -> QualConDecl a -> Bool #

maximum :: Ord a => QualConDecl a -> a #

minimum :: Ord a => QualConDecl a -> a #

sum :: Num a => QualConDecl a -> a #

product :: Num a => QualConDecl a -> a #

Foldable QualStmt 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => QualStmt m -> m

foldMap :: Monoid m => (a -> m) -> QualStmt a -> m

foldMap' :: Monoid m => (a -> m) -> QualStmt a -> m

foldr :: (a -> b -> b) -> b -> QualStmt a -> b #

foldr' :: (a -> b -> b) -> b -> QualStmt a -> b

foldl :: (b -> a -> b) -> b -> QualStmt a -> b #

foldl' :: (b -> a -> b) -> b -> QualStmt a -> b #

foldr1 :: (a -> a -> a) -> QualStmt a -> a #

foldl1 :: (a -> a -> a) -> QualStmt a -> a #

toList :: QualStmt a -> [a]

null :: QualStmt a -> Bool

length :: QualStmt a -> Int #

elem :: Eq a => a -> QualStmt a -> Bool #

maximum :: Ord a => QualStmt a -> a #

minimum :: Ord a => QualStmt a -> a #

sum :: Num a => QualStmt a -> a #

product :: Num a => QualStmt a -> a #

Foldable RPat 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => RPat m -> m

foldMap :: Monoid m => (a -> m) -> RPat a -> m

foldMap' :: Monoid m => (a -> m) -> RPat a -> m

foldr :: (a -> b -> b) -> b -> RPat a -> b #

foldr' :: (a -> b -> b) -> b -> RPat a -> b

foldl :: (b -> a -> b) -> b -> RPat a -> b #

foldl' :: (b -> a -> b) -> b -> RPat a -> b #

foldr1 :: (a -> a -> a) -> RPat a -> a #

foldl1 :: (a -> a -> a) -> RPat a -> a #

toList :: RPat a -> [a]

null :: RPat a -> Bool

length :: RPat a -> Int #

elem :: Eq a => a -> RPat a -> Bool #

maximum :: Ord a => RPat a -> a #

minimum :: Ord a => RPat a -> a #

sum :: Num a => RPat a -> a #

product :: Num a => RPat a -> a #

Foldable RPatOp 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => RPatOp m -> m

foldMap :: Monoid m => (a -> m) -> RPatOp a -> m

foldMap' :: Monoid m => (a -> m) -> RPatOp a -> m

foldr :: (a -> b -> b) -> b -> RPatOp a -> b #

foldr' :: (a -> b -> b) -> b -> RPatOp a -> b

foldl :: (b -> a -> b) -> b -> RPatOp a -> b #

foldl' :: (b -> a -> b) -> b -> RPatOp a -> b #

foldr1 :: (a -> a -> a) -> RPatOp a -> a #

foldl1 :: (a -> a -> a) -> RPatOp a -> a #

toList :: RPatOp a -> [a]

null :: RPatOp a -> Bool

length :: RPatOp a -> Int #

elem :: Eq a => a -> RPatOp a -> Bool #

maximum :: Ord a => RPatOp a -> a #

minimum :: Ord a => RPatOp a -> a #

sum :: Num a => RPatOp a -> a #

product :: Num a => RPatOp a -> a #

Foldable ResultSig 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => ResultSig m -> m

foldMap :: Monoid m => (a -> m) -> ResultSig a -> m

foldMap' :: Monoid m => (a -> m) -> ResultSig a -> m

foldr :: (a -> b -> b) -> b -> ResultSig a -> b #

foldr' :: (a -> b -> b) -> b -> ResultSig a -> b

foldl :: (b -> a -> b) -> b -> ResultSig a -> b #

foldl' :: (b -> a -> b) -> b -> ResultSig a -> b #

foldr1 :: (a -> a -> a) -> ResultSig a -> a #

foldl1 :: (a -> a -> a) -> ResultSig a -> a #

toList :: ResultSig a -> [a]

null :: ResultSig a -> Bool

length :: ResultSig a -> Int #

elem :: Eq a => a -> ResultSig a -> Bool #

maximum :: Ord a => ResultSig a -> a #

minimum :: Ord a => ResultSig a -> a #

sum :: Num a => ResultSig a -> a #

product :: Num a => ResultSig a -> a #

Foldable Rhs 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Rhs m -> m

foldMap :: Monoid m => (a -> m) -> Rhs a -> m

foldMap' :: Monoid m => (a -> m) -> Rhs a -> m

foldr :: (a -> b -> b) -> b -> Rhs a -> b #

foldr' :: (a -> b -> b) -> b -> Rhs a -> b

foldl :: (b -> a -> b) -> b -> Rhs a -> b #

foldl' :: (b -> a -> b) -> b -> Rhs a -> b #

foldr1 :: (a -> a -> a) -> Rhs a -> a #

foldl1 :: (a -> a -> a) -> Rhs a -> a #

toList :: Rhs a -> [a]

null :: Rhs a -> Bool

length :: Rhs a -> Int #

elem :: Eq a => a -> Rhs a -> Bool #

maximum :: Ord a => Rhs a -> a #

minimum :: Ord a => Rhs a -> a #

sum :: Num a => Rhs a -> a #

product :: Num a => Rhs a -> a #

Foldable Role 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Role m -> m

foldMap :: Monoid m => (a -> m) -> Role a -> m

foldMap' :: Monoid m => (a -> m) -> Role a -> m

foldr :: (a -> b -> b) -> b -> Role a -> b #

foldr' :: (a -> b -> b) -> b -> Role a -> b

foldl :: (b -> a -> b) -> b -> Role a -> b #

foldl' :: (b -> a -> b) -> b -> Role a -> b #

foldr1 :: (a -> a -> a) -> Role a -> a #

foldl1 :: (a -> a -> a) -> Role a -> a #

toList :: Role a -> [a]

null :: Role a -> Bool

length :: Role a -> Int #

elem :: Eq a => a -> Role a -> Bool #

maximum :: Ord a => Role a -> a #

minimum :: Ord a => Role a -> a #

sum :: Num a => Role a -> a #

product :: Num a => Role a -> a #

Foldable Rule 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Rule m -> m

foldMap :: Monoid m => (a -> m) -> Rule a -> m

foldMap' :: Monoid m => (a -> m) -> Rule a -> m

foldr :: (a -> b -> b) -> b -> Rule a -> b #

foldr' :: (a -> b -> b) -> b -> Rule a -> b

foldl :: (b -> a -> b) -> b -> Rule a -> b #

foldl' :: (b -> a -> b) -> b -> Rule a -> b #

foldr1 :: (a -> a -> a) -> Rule a -> a #

foldl1 :: (a -> a -> a) -> Rule a -> a #

toList :: Rule a -> [a]

null :: Rule a -> Bool

length :: Rule a -> Int #

elem :: Eq a => a -> Rule a -> Bool #

maximum :: Ord a => Rule a -> a #

minimum :: Ord a => Rule a -> a #

sum :: Num a => Rule a -> a #

product :: Num a => Rule a -> a #

Foldable RuleVar 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => RuleVar m -> m

foldMap :: Monoid m => (a -> m) -> RuleVar a -> m

foldMap' :: Monoid m => (a -> m) -> RuleVar a -> m

foldr :: (a -> b -> b) -> b -> RuleVar a -> b #

foldr' :: (a -> b -> b) -> b -> RuleVar a -> b

foldl :: (b -> a -> b) -> b -> RuleVar a -> b #

foldl' :: (b -> a -> b) -> b -> RuleVar a -> b #

foldr1 :: (a -> a -> a) -> RuleVar a -> a #

foldl1 :: (a -> a -> a) -> RuleVar a -> a #

toList :: RuleVar a -> [a]

null :: RuleVar a -> Bool

length :: RuleVar a -> Int #

elem :: Eq a => a -> RuleVar a -> Bool #

maximum :: Ord a => RuleVar a -> a #

minimum :: Ord a => RuleVar a -> a #

sum :: Num a => RuleVar a -> a #

product :: Num a => RuleVar a -> a #

Foldable Safety 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Safety m -> m

foldMap :: Monoid m => (a -> m) -> Safety a -> m

foldMap' :: Monoid m => (a -> m) -> Safety a -> m

foldr :: (a -> b -> b) -> b -> Safety a -> b #

foldr' :: (a -> b -> b) -> b -> Safety a -> b

foldl :: (b -> a -> b) -> b -> Safety a -> b #

foldl' :: (b -> a -> b) -> b -> Safety a -> b #

foldr1 :: (a -> a -> a) -> Safety a -> a #

foldl1 :: (a -> a -> a) -> Safety a -> a #

toList :: Safety a -> [a]

null :: Safety a -> Bool

length :: Safety a -> Int #

elem :: Eq a => a -> Safety a -> Bool #

maximum :: Ord a => Safety a -> a #

minimum :: Ord a => Safety a -> a #

sum :: Num a => Safety a -> a #

product :: Num a => Safety a -> a #

Foldable Sign 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Sign m -> m

foldMap :: Monoid m => (a -> m) -> Sign a -> m

foldMap' :: Monoid m => (a -> m) -> Sign a -> m

foldr :: (a -> b -> b) -> b -> Sign a -> b #

foldr' :: (a -> b -> b) -> b -> Sign a -> b

foldl :: (b -> a -> b) -> b -> Sign a -> b #

foldl' :: (b -> a -> b) -> b -> Sign a -> b #

foldr1 :: (a -> a -> a) -> Sign a -> a #

foldl1 :: (a -> a -> a) -> Sign a -> a #

toList :: Sign a -> [a]

null :: Sign a -> Bool

length :: Sign a -> Int #

elem :: Eq a => a -> Sign a -> Bool #

maximum :: Ord a => Sign a -> a #

minimum :: Ord a => Sign a -> a #

sum :: Num a => Sign a -> a #

product :: Num a => Sign a -> a #

Foldable SpecialCon 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => SpecialCon m -> m

foldMap :: Monoid m => (a -> m) -> SpecialCon a -> m

foldMap' :: Monoid m => (a -> m) -> SpecialCon a -> m

foldr :: (a -> b -> b) -> b -> SpecialCon a -> b #

foldr' :: (a -> b -> b) -> b -> SpecialCon a -> b

foldl :: (b -> a -> b) -> b -> SpecialCon a -> b #

foldl' :: (b -> a -> b) -> b -> SpecialCon a -> b #

foldr1 :: (a -> a -> a) -> SpecialCon a -> a #

foldl1 :: (a -> a -> a) -> SpecialCon a -> a #

toList :: SpecialCon a -> [a]

null :: SpecialCon a -> Bool

length :: SpecialCon a -> Int #

elem :: Eq a => a -> SpecialCon a -> Bool #

maximum :: Ord a => SpecialCon a -> a #

minimum :: Ord a => SpecialCon a -> a #

sum :: Num a => SpecialCon a -> a #

product :: Num a => SpecialCon a -> a #

Foldable Splice 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Splice m -> m

foldMap :: Monoid m => (a -> m) -> Splice a -> m

foldMap' :: Monoid m => (a -> m) -> Splice a -> m

foldr :: (a -> b -> b) -> b -> Splice a -> b #

foldr' :: (a -> b -> b) -> b -> Splice a -> b

foldl :: (b -> a -> b) -> b -> Splice a -> b #

foldl' :: (b -> a -> b) -> b -> Splice a -> b #

foldr1 :: (a -> a -> a) -> Splice a -> a #

foldl1 :: (a -> a -> a) -> Splice a -> a #

toList :: Splice a -> [a]

null :: Splice a -> Bool

length :: Splice a -> Int #

elem :: Eq a => a -> Splice a -> Bool #

maximum :: Ord a => Splice a -> a #

minimum :: Ord a => Splice a -> a #

sum :: Num a => Splice a -> a #

product :: Num a => Splice a -> a #

Foldable Stmt 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Stmt m -> m

foldMap :: Monoid m => (a -> m) -> Stmt a -> m

foldMap' :: Monoid m => (a -> m) -> Stmt a -> m

foldr :: (a -> b -> b) -> b -> Stmt a -> b #

foldr' :: (a -> b -> b) -> b -> Stmt a -> b

foldl :: (b -> a -> b) -> b -> Stmt a -> b #

foldl' :: (b -> a -> b) -> b -> Stmt a -> b #

foldr1 :: (a -> a -> a) -> Stmt a -> a #

foldl1 :: (a -> a -> a) -> Stmt a -> a #

toList :: Stmt a -> [a]

null :: Stmt a -> Bool

length :: Stmt a -> Int #

elem :: Eq a => a -> Stmt a -> Bool #

maximum :: Ord a => Stmt a -> a #

minimum :: Ord a => Stmt a -> a #

sum :: Num a => Stmt a -> a #

product :: Num a => Stmt a -> a #

Foldable TyVarBind 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => TyVarBind m -> m

foldMap :: Monoid m => (a -> m) -> TyVarBind a -> m

foldMap' :: Monoid m => (a -> m) -> TyVarBind a -> m

foldr :: (a -> b -> b) -> b -> TyVarBind a -> b #

foldr' :: (a -> b -> b) -> b -> TyVarBind a -> b

foldl :: (b -> a -> b) -> b -> TyVarBind a -> b #

foldl' :: (b -> a -> b) -> b -> TyVarBind a -> b #

foldr1 :: (a -> a -> a) -> TyVarBind a -> a #

foldl1 :: (a -> a -> a) -> TyVarBind a -> a #

toList :: TyVarBind a -> [a]

null :: TyVarBind a -> Bool

length :: TyVarBind a -> Int #

elem :: Eq a => a -> TyVarBind a -> Bool #

maximum :: Ord a => TyVarBind a -> a #

minimum :: Ord a => TyVarBind a -> a #

sum :: Num a => TyVarBind a -> a #

product :: Num a => TyVarBind a -> a #

Foldable Type 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Type m -> m

foldMap :: Monoid m => (a -> m) -> Type a -> m

foldMap' :: Monoid m => (a -> m) -> Type a -> m

foldr :: (a -> b -> b) -> b -> Type a -> b #

foldr' :: (a -> b -> b) -> b -> Type a -> b

foldl :: (b -> a -> b) -> b -> Type a -> b #

foldl' :: (b -> a -> b) -> b -> Type a -> b #

foldr1 :: (a -> a -> a) -> Type a -> a #

foldl1 :: (a -> a -> a) -> Type a -> a #

toList :: Type a -> [a]

null :: Type a -> Bool

length :: Type a -> Int #

elem :: Eq a => a -> Type a -> Bool #

maximum :: Ord a => Type a -> a #

minimum :: Ord a => Type a -> a #

sum :: Num a => Type a -> a #

product :: Num a => Type a -> a #

Foldable TypeEqn 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => TypeEqn m -> m

foldMap :: Monoid m => (a -> m) -> TypeEqn a -> m

foldMap' :: Monoid m => (a -> m) -> TypeEqn a -> m

foldr :: (a -> b -> b) -> b -> TypeEqn a -> b #

foldr' :: (a -> b -> b) -> b -> TypeEqn a -> b

foldl :: (b -> a -> b) -> b -> TypeEqn a -> b #

foldl' :: (b -> a -> b) -> b -> TypeEqn a -> b #

foldr1 :: (a -> a -> a) -> TypeEqn a -> a #

foldl1 :: (a -> a -> a) -> TypeEqn a -> a #

toList :: TypeEqn a -> [a]

null :: TypeEqn a -> Bool

length :: TypeEqn a -> Int #

elem :: Eq a => a -> TypeEqn a -> Bool #

maximum :: Ord a => TypeEqn a -> a #

minimum :: Ord a => TypeEqn a -> a #

sum :: Num a => TypeEqn a -> a #

product :: Num a => TypeEqn a -> a #

Foldable Unpackedness 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => Unpackedness m -> m

foldMap :: Monoid m => (a -> m) -> Unpackedness a -> m

foldMap' :: Monoid m => (a -> m) -> Unpackedness a -> m

foldr :: (a -> b -> b) -> b -> Unpackedness a -> b #

foldr' :: (a -> b -> b) -> b -> Unpackedness a -> b

foldl :: (b -> a -> b) -> b -> Unpackedness a -> b #

foldl' :: (b -> a -> b) -> b -> Unpackedness a -> b #

foldr1 :: (a -> a -> a) -> Unpackedness a -> a #

foldl1 :: (a -> a -> a) -> Unpackedness a -> a #

toList :: Unpackedness a -> [a]

null :: Unpackedness a -> Bool

length :: Unpackedness a -> Int #

elem :: Eq a => a -> Unpackedness a -> Bool #

maximum :: Ord a => Unpackedness a -> a #

minimum :: Ord a => Unpackedness a -> a #

sum :: Num a => Unpackedness a -> a #

product :: Num a => Unpackedness a -> a #

Foldable WarningText 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => WarningText m -> m

foldMap :: Monoid m => (a -> m) -> WarningText a -> m

foldMap' :: Monoid m => (a -> m) -> WarningText a -> m

foldr :: (a -> b -> b) -> b -> WarningText a -> b #

foldr' :: (a -> b -> b) -> b -> WarningText a -> b

foldl :: (b -> a -> b) -> b -> WarningText a -> b #

foldl' :: (b -> a -> b) -> b -> WarningText a -> b #

foldr1 :: (a -> a -> a) -> WarningText a -> a #

foldl1 :: (a -> a -> a) -> WarningText a -> a #

toList :: WarningText a -> [a]

null :: WarningText a -> Bool

length :: WarningText a -> Int #

elem :: Eq a => a -> WarningText a -> Bool #

maximum :: Ord a => WarningText a -> a #

minimum :: Ord a => WarningText a -> a #

sum :: Num a => WarningText a -> a #

product :: Num a => WarningText a -> a #

Foldable XAttr 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => XAttr m -> m

foldMap :: Monoid m => (a -> m) -> XAttr a -> m

foldMap' :: Monoid m => (a -> m) -> XAttr a -> m

foldr :: (a -> b -> b) -> b -> XAttr a -> b #

foldr' :: (a -> b -> b) -> b -> XAttr a -> b

foldl :: (b -> a -> b) -> b -> XAttr a -> b #

foldl' :: (b -> a -> b) -> b -> XAttr a -> b #

foldr1 :: (a -> a -> a) -> XAttr a -> a #

foldl1 :: (a -> a -> a) -> XAttr a -> a #

toList :: XAttr a -> [a]

null :: XAttr a -> Bool

length :: XAttr a -> Int #

elem :: Eq a => a -> XAttr a -> Bool #

maximum :: Ord a => XAttr a -> a #

minimum :: Ord a => XAttr a -> a #

sum :: Num a => XAttr a -> a #

product :: Num a => XAttr a -> a #

Foldable XName 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fold :: Monoid m => XName m -> m

foldMap :: Monoid m => (a -> m) -> XName a -> m

foldMap' :: Monoid m => (a -> m) -> XName a -> m

foldr :: (a -> b -> b) -> b -> XName a -> b #

foldr' :: (a -> b -> b) -> b -> XName a -> b

foldl :: (b -> a -> b) -> b -> XName a -> b #

foldl' :: (b -> a -> b) -> b -> XName a -> b #

foldr1 :: (a -> a -> a) -> XName a -> a #

foldl1 :: (a -> a -> a) -> XName a -> a #

toList :: XName a -> [a]

null :: XName a -> Bool

length :: XName a -> Int #

elem :: Eq a => a -> XName a -> Bool #

maximum :: Ord a => XName a -> a #

minimum :: Ord a => XName a -> a #

sum :: Num a => XName a -> a #

product :: Num a => XName 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 Deque 
Instance details

Defined in Control.Lens.Internal.Deque

Methods

fold :: Monoid m => Deque m -> m

foldMap :: Monoid m => (a -> m) -> Deque a -> m

foldMap' :: Monoid m => (a -> m) -> Deque a -> m

foldr :: (a -> b -> b) -> b -> Deque a -> b #

foldr' :: (a -> b -> b) -> b -> Deque a -> b

foldl :: (b -> a -> b) -> b -> Deque a -> b #

foldl' :: (b -> a -> b) -> b -> Deque a -> b #

foldr1 :: (a -> a -> a) -> Deque a -> a #

foldl1 :: (a -> a -> a) -> Deque a -> a #

toList :: Deque a -> [a]

null :: Deque a -> Bool

length :: Deque a -> Int #

elem :: Eq a => a -> Deque a -> Bool #

maximum :: Ord a => Deque a -> a #

minimum :: Ord a => Deque a -> a #

sum :: Num a => Deque a -> a #

product :: Num a => Deque 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 SimpleDocTree 
Instance details

Defined in Prettyprinter.Render.Util.SimpleDocTree

Methods

fold :: Monoid m => SimpleDocTree m -> m

foldMap :: Monoid m => (a -> m) -> SimpleDocTree a -> m

foldMap' :: Monoid m => (a -> m) -> SimpleDocTree a -> m

foldr :: (a -> b -> b) -> b -> SimpleDocTree a -> b #

foldr' :: (a -> b -> b) -> b -> SimpleDocTree a -> b

foldl :: (b -> a -> b) -> b -> SimpleDocTree a -> b #

foldl' :: (b -> a -> b) -> b -> SimpleDocTree a -> b #

foldr1 :: (a -> a -> a) -> SimpleDocTree a -> a #

foldl1 :: (a -> a -> a) -> SimpleDocTree a -> a #

toList :: SimpleDocTree a -> [a]

null :: SimpleDocTree a -> Bool

length :: SimpleDocTree a -> Int #

elem :: Eq a => a -> SimpleDocTree a -> Bool #

maximum :: Ord a => SimpleDocTree a -> a #

minimum :: Ord a => SimpleDocTree a -> a #

sum :: Num a => SimpleDocTree a -> a #

product :: Num a => SimpleDocTree 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 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 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 f => Foldable (Ap f) 
Instance details

Defined in Control.Applicative.Free

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 (Cofree f) 
Instance details

Defined in Control.Comonad.Cofree

Methods

fold :: Monoid m => Cofree f m -> m

foldMap :: Monoid m => (a -> m) -> Cofree f a -> m

foldMap' :: Monoid m => (a -> m) -> Cofree f a -> m

foldr :: (a -> b -> b) -> b -> Cofree f a -> b #

foldr' :: (a -> b -> b) -> b -> Cofree f a -> b

foldl :: (b -> a -> b) -> b -> Cofree f a -> b #

foldl' :: (b -> a -> b) -> b -> Cofree f a -> b #

foldr1 :: (a -> a -> a) -> Cofree f a -> a #

foldl1 :: (a -> a -> a) -> Cofree f a -> a #

toList :: Cofree f a -> [a]

null :: Cofree f a -> Bool

length :: Cofree f a -> Int #

elem :: Eq a => a -> Cofree f a -> Bool #

maximum :: Ord a => Cofree f a -> a #

minimum :: Ord a => Cofree f a -> a #

sum :: Num a => Cofree f a -> a #

product :: Num a => Cofree f a -> a #

Foldable w => Foldable (CoiterT w) 
Instance details

Defined in Control.Comonad.Trans.Coiter

Methods

fold :: Monoid m => CoiterT w m -> m

foldMap :: Monoid m => (a -> m) -> CoiterT w a -> m

foldMap' :: Monoid m => (a -> m) -> CoiterT w a -> m

foldr :: (a -> b -> b) -> b -> CoiterT w a -> b #

foldr' :: (a -> b -> b) -> b -> CoiterT w a -> b

foldl :: (b -> a -> b) -> b -> CoiterT w a -> b #

foldl' :: (b -> a -> b) -> b -> CoiterT w a -> b #

foldr1 :: (a -> a -> a) -> CoiterT w a -> a #

foldl1 :: (a -> a -> a) -> CoiterT w a -> a #

toList :: CoiterT w a -> [a]

null :: CoiterT w a -> Bool

length :: CoiterT w a -> Int #

elem :: Eq a => a -> CoiterT w a -> Bool #

maximum :: Ord a => CoiterT w a -> a #

minimum :: Ord a => CoiterT w a -> a #

sum :: Num a => CoiterT w a -> a #

product :: Num a => CoiterT w a -> a #

Foldable f => Foldable (Free f) 
Instance details

Defined in Control.Monad.Free

Methods

fold :: Monoid m => Free f m -> m

foldMap :: Monoid m => (a -> m) -> Free f a -> m

foldMap' :: Monoid m => (a -> m) -> Free f a -> m

foldr :: (a -> b -> b) -> b -> Free f a -> b #

foldr' :: (a -> b -> b) -> b -> Free f a -> b

foldl :: (b -> a -> b) -> b -> Free f a -> b #

foldl' :: (b -> a -> b) -> b -> Free f a -> b #

foldr1 :: (a -> a -> a) -> Free f a -> a #

foldl1 :: (a -> a -> a) -> Free f a -> a #

toList :: Free f a -> [a]

null :: Free f a -> Bool

length :: Free f a -> Int #

elem :: Eq a => a -> Free f a -> Bool #

maximum :: Ord a => Free f a -> a #

minimum :: Ord a => Free f a -> a #

sum :: Num a => Free f a -> a #

product :: Num a => Free f a -> a #

Foldable f => Foldable (Free f) 
Instance details

Defined in Control.Monad.Free.Ap

Methods

fold :: Monoid m => Free f m -> m

foldMap :: Monoid m => (a -> m) -> Free f a -> m

foldMap' :: Monoid m => (a -> m) -> Free f a -> m

foldr :: (a -> b -> b) -> b -> Free f a -> b #

foldr' :: (a -> b -> b) -> b -> Free f a -> b

foldl :: (b -> a -> b) -> b -> Free f a -> b #

foldl' :: (b -> a -> b) -> b -> Free f a -> b #

foldr1 :: (a -> a -> a) -> Free f a -> a #

foldl1 :: (a -> a -> a) -> Free f a -> a #

toList :: Free f a -> [a]

null :: Free f a -> Bool

length :: Free f a -> Int #

elem :: Eq a => a -> Free f a -> Bool #

maximum :: Ord a => Free f a -> a #

minimum :: Ord a => Free f a -> a #

sum :: Num a => Free f a -> a #

product :: Num a => Free f a -> a #

Foldable f => Foldable (F f) 
Instance details

Defined in Control.Monad.Free.Church

Methods

fold :: Monoid m => F f m -> m

foldMap :: Monoid m => (a -> m) -> F f a -> m

foldMap' :: Monoid m => (a -> m) -> F f a -> m

foldr :: (a -> b -> b) -> b -> F f a -> b #

foldr' :: (a -> b -> b) -> b -> F f a -> b

foldl :: (b -> a -> b) -> b -> F f a -> b #

foldl' :: (b -> a -> b) -> b -> F f a -> b #

foldr1 :: (a -> a -> a) -> F f a -> a #

foldl1 :: (a -> a -> a) -> F f a -> a #

toList :: F f a -> [a]

null :: F f a -> Bool

length :: F f a -> Int #

elem :: Eq a => a -> F f a -> Bool #

maximum :: Ord a => F f a -> a #

minimum :: Ord a => F f a -> a #

sum :: Num a => F f a -> a #

product :: Num a => F f a -> a #

Foldable m => Foldable (IterT m) 
Instance details

Defined in Control.Monad.Trans.Iter

Methods

fold :: Monoid m0 => IterT m m0 -> m0

foldMap :: Monoid m0 => (a -> m0) -> IterT m a -> m0

foldMap' :: Monoid m0 => (a -> m0) -> IterT m a -> m0

foldr :: (a -> b -> b) -> b -> IterT m a -> b #

foldr' :: (a -> b -> b) -> b -> IterT m a -> b

foldl :: (b -> a -> b) -> b -> IterT m a -> b #

foldl' :: (b -> a -> b) -> b -> IterT m a -> b #

foldr1 :: (a -> a -> a) -> IterT m a -> a #

foldl1 :: (a -> a -> a) -> IterT m a -> a #

toList :: IterT m a -> [a]

null :: IterT m a -> Bool

length :: IterT m a -> Int #

elem :: Eq a => a -> IterT m a -> Bool #

maximum :: Ord a => IterT m a -> a #

minimum :: Ord a => IterT m a -> a #

sum :: Num a => IterT m a -> a #

product :: Num a => IterT m a -> a #

(Eq (Key m), TrieMap m) => Foldable (GenMap m) 
Instance details

Defined in GHC.Data.TrieMap

Methods

fold :: Monoid m0 => GenMap m m0 -> m0

foldMap :: Monoid m0 => (a -> m0) -> GenMap m a -> m0

foldMap' :: Monoid m0 => (a -> m0) -> GenMap m a -> m0

foldr :: (a -> b -> b) -> b -> GenMap m a -> b #

foldr' :: (a -> b -> b) -> b -> GenMap m a -> b

foldl :: (b -> a -> b) -> b -> GenMap m a -> b #

foldl' :: (b -> a -> b) -> b -> GenMap m a -> b #

foldr1 :: (a -> a -> a) -> GenMap m a -> a #

foldl1 :: (a -> a -> a) -> GenMap m a -> a #

toList :: GenMap m a -> [a]

null :: GenMap m a -> Bool

length :: GenMap m a -> Int #

elem :: Eq a => a -> GenMap m a -> Bool #

maximum :: Ord a => GenMap m a -> a #

minimum :: Ord a => GenMap m a -> a #

sum :: Num a => GenMap m a -> a #

product :: Num a => GenMap m a -> a #

TrieMap m => Foldable (ListMap m) 
Instance details

Defined in GHC.Data.TrieMap

Methods

fold :: Monoid m0 => ListMap m m0 -> m0

foldMap :: Monoid m0 => (a -> m0) -> ListMap m a -> m0

foldMap' :: Monoid m0 => (a -> m0) -> ListMap m a -> m0

foldr :: (a -> b -> b) -> b -> ListMap m a -> b #

foldr' :: (a -> b -> b) -> b -> ListMap m a -> b

foldl :: (b -> a -> b) -> b -> ListMap m a -> b #

foldl' :: (b -> a -> b) -> b -> ListMap m a -> b #

foldr1 :: (a -> a -> a) -> ListMap m a -> a #

foldl1 :: (a -> a -> a) -> ListMap m a -> a #

toList :: ListMap m a -> [a]

null :: ListMap m a -> Bool

length :: ListMap m a -> Int #

elem :: Eq a => a -> ListMap m a -> Bool #

maximum :: Ord a => ListMap m a -> a #

minimum :: Ord a => ListMap m a -> a #

sum :: Num a => ListMap m a -> a #

product :: Num a => ListMap m a -> a #

TrieMap m => Foldable (MaybeMap m) 
Instance details

Defined in GHC.Data.TrieMap

Methods

fold :: Monoid m0 => MaybeMap m m0 -> m0

foldMap :: Monoid m0 => (a -> m0) -> MaybeMap m a -> m0

foldMap' :: Monoid m0 => (a -> m0) -> MaybeMap m a -> m0

foldr :: (a -> b -> b) -> b -> MaybeMap m a -> b #

foldr' :: (a -> b -> b) -> b -> MaybeMap m a -> b

foldl :: (b -> a -> b) -> b -> MaybeMap m a -> b #

foldl' :: (b -> a -> b) -> b -> MaybeMap m a -> b #

foldr1 :: (a -> a -> a) -> MaybeMap m a -> a #

foldl1 :: (a -> a -> a) -> MaybeMap m a -> a #

toList :: MaybeMap m a -> [a]

null :: MaybeMap m a -> Bool

length :: MaybeMap m a -> Int #

elem :: Eq a => a -> MaybeMap m a -> Bool #

maximum :: Ord a => MaybeMap m a -> a #

minimum :: Ord a => MaybeMap m a -> a #

sum :: Num a => MaybeMap m a -> a #

product :: Num a => MaybeMap m a -> a #

Foldable (GenLocated l) 
Instance details

Defined in GHC.Types.SrcLoc

Methods

fold :: Monoid m => GenLocated l m -> m

foldMap :: Monoid m => (a -> m) -> GenLocated l a -> m

foldMap' :: Monoid m => (a -> m) -> GenLocated l a -> m

foldr :: (a -> b -> b) -> b -> GenLocated l a -> b #

foldr' :: (a -> b -> b) -> b -> GenLocated l a -> b

foldl :: (b -> a -> b) -> b -> GenLocated l a -> b #

foldl' :: (b -> a -> b) -> b -> GenLocated l a -> b #

foldr1 :: (a -> a -> a) -> GenLocated l a -> a #

foldl1 :: (a -> a -> a) -> GenLocated l a -> a #

toList :: GenLocated l a -> [a]

null :: GenLocated l a -> Bool

length :: GenLocated l a -> Int #

elem :: Eq a => a -> GenLocated l a -> Bool #

maximum :: Ord a => GenLocated l a -> a #

minimum :: Ord a => GenLocated l a -> a #

sum :: Num a => GenLocated l a -> a #

product :: Num a => GenLocated l a -> a #

Foldable (HsFieldBind lhs) 
Instance details

Defined in Language.Haskell.Syntax.Pat

Methods

fold :: Monoid m => HsFieldBind lhs m -> m

foldMap :: Monoid m => (a -> m) -> HsFieldBind lhs a -> m

foldMap' :: Monoid m => (a -> m) -> HsFieldBind lhs a -> m

foldr :: (a -> b -> b) -> b -> HsFieldBind lhs a -> b #

foldr' :: (a -> b -> b) -> b -> HsFieldBind lhs a -> b

foldl :: (b -> a -> b) -> b -> HsFieldBind lhs a -> b #

foldl' :: (b -> a -> b) -> b -> HsFieldBind lhs a -> b #

foldr1 :: (a -> a -> a) -> HsFieldBind lhs a -> a #

foldl1 :: (a -> a -> a) -> HsFieldBind lhs a -> a #

toList :: HsFieldBind lhs a -> [a]

null :: HsFieldBind lhs a -> Bool

length :: HsFieldBind lhs a -> Int #

elem :: Eq a => a -> HsFieldBind lhs a -> Bool #

maximum :: Ord a => HsFieldBind lhs a -> a #

minimum :: Ord a => HsFieldBind lhs a -> a #

sum :: Num a => HsFieldBind lhs a -> a #

product :: Num a => HsFieldBind lhs 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 (IPRTable k) 
Instance details

Defined in Data.IP.RouteTable.Internal

Methods

fold :: Monoid m => IPRTable k m -> m

foldMap :: Monoid m => (a -> m) -> IPRTable k a -> m

foldMap' :: Monoid m => (a -> m) -> IPRTable k a -> m

foldr :: (a -> b -> b) -> b -> IPRTable k a -> b #

foldr' :: (a -> b -> b) -> b -> IPRTable k a -> b

foldl :: (b -> a -> b) -> b -> IPRTable k a -> b #

foldl' :: (b -> a -> b) -> b -> IPRTable k a -> b #

foldr1 :: (a -> a -> a) -> IPRTable k a -> a #

foldl1 :: (a -> a -> a) -> IPRTable k a -> a #

toList :: IPRTable k a -> [a]

null :: IPRTable k a -> Bool

length :: IPRTable k a -> Int #

elem :: Eq a => a -> IPRTable k a -> Bool #

maximum :: Ord a => IPRTable k a -> a #

minimum :: Ord a => IPRTable k a -> a #

sum :: Num a => IPRTable k a -> a #

product :: Num a => IPRTable k a -> a #

Foldable f => Foldable (Coyoneda f) 
Instance details

Defined in Data.Functor.Coyoneda

Methods

fold :: Monoid m => Coyoneda f m -> m

foldMap :: Monoid m => (a -> m) -> Coyoneda f a -> m

foldMap' :: Monoid m => (a -> m) -> Coyoneda f a -> m

foldr :: (a -> b -> b) -> b -> Coyoneda f a -> b #

foldr' :: (a -> b -> b) -> b -> Coyoneda f a -> b

foldl :: (b -> a -> b) -> b -> Coyoneda f a -> b #

foldl' :: (b -> a -> b) -> b -> Coyoneda f a -> b #

foldr1 :: (a -> a -> a) -> Coyoneda f a -> a #

foldl1 :: (a -> a -> a) -> Coyoneda f a -> a #

toList :: Coyoneda f a -> [a]

null :: Coyoneda f a -> Bool

length :: Coyoneda f a -> Int #

elem :: Eq a => a -> Coyoneda f a -> Bool #

maximum :: Ord a => Coyoneda f a -> a #

minimum :: Ord a => Coyoneda f a -> a #

sum :: Num a => Coyoneda f a -> a #

product :: Num a => Coyoneda f a -> a #

Foldable f => Foldable (Yoneda f) 
Instance details

Defined in Data.Functor.Yoneda

Methods

fold :: Monoid m => Yoneda f m -> m

foldMap :: Monoid m => (a -> m) -> Yoneda f a -> m

foldMap' :: Monoid m => (a -> m) -> Yoneda f a -> m

foldr :: (a -> b -> b) -> b -> Yoneda f a -> b #

foldr' :: (a -> b -> b) -> b -> Yoneda f a -> b

foldl :: (b -> a -> b) -> b -> Yoneda f a -> b #

foldl' :: (b -> a -> b) -> b -> Yoneda f a -> b #

foldr1 :: (a -> a -> a) -> Yoneda f a -> a #

foldl1 :: (a -> a -> a) -> Yoneda f a -> a #

toList :: Yoneda f a -> [a]

null :: Yoneda f a -> Bool

length :: Yoneda f a -> Int #

elem :: Eq a => a -> Yoneda f a -> Bool #

maximum :: Ord a => Yoneda f a -> a #

minimum :: Ord a => Yoneda f a -> a #

sum :: Num a => Yoneda f a -> a #

product :: Num a => Yoneda f a -> a #

Foldable (Level i) 
Instance details

Defined in Control.Lens.Internal.Level

Methods

fold :: Monoid m => Level i m -> m

foldMap :: Monoid m => (a -> m) -> Level i a -> m

foldMap' :: Monoid m => (a -> m) -> Level i a -> m

foldr :: (a -> b -> b) -> b -> Level i a -> b #

foldr' :: (a -> b -> b) -> b -> Level i a -> b

foldl :: (b -> a -> b) -> b -> Level i a -> b #

foldl' :: (b -> a -> b) -> b -> Level i a -> b #

foldr1 :: (a -> a -> a) -> Level i a -> a #

foldl1 :: (a -> a -> a) -> Level i a -> a #

toList :: Level i a -> [a]

null :: Level i a -> Bool

length :: Level i a -> Int #

elem :: Eq a => a -> Level i a -> Bool #

maximum :: Ord a => Level i a -> a #

minimum :: Ord a => Level i a -> a #

sum :: Num a => Level i a -> a #

product :: Num a => Level i a -> a #

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 #

Ord k => Foldable (EnumMap k) 
Instance details

Defined in Data.IntMap.EnumMap2

Methods

fold :: Monoid m => EnumMap k m -> m

foldMap :: Monoid m => (a -> m) -> EnumMap k a -> m

foldMap' :: Monoid m => (a -> m) -> EnumMap k a -> m

foldr :: (a -> b -> b) -> b -> EnumMap k a -> b #

foldr' :: (a -> b -> b) -> b -> EnumMap k a -> b

foldl :: (b -> a -> b) -> b -> EnumMap k a -> b #

foldl' :: (b -> a -> b) -> b -> EnumMap k a -> b #

foldr1 :: (a -> a -> a) -> EnumMap k a -> a #

foldl1 :: (a -> a -> a) -> EnumMap k a -> a #

toList :: EnumMap k a -> [a]

null :: EnumMap k a -> Bool

length :: EnumMap k a -> Int #

elem :: Eq a => a -> EnumMap k a -> Bool #

maximum :: Ord a => EnumMap k a -> a #

minimum :: Ord a => EnumMap k a -> a #

sum :: Num a => EnumMap k a -> a #

product :: Num a => EnumMap k 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 f => Foldable (WrappedFoldable f) 
Instance details

Defined in Witherable

Methods

fold :: Monoid m => WrappedFoldable f m -> m

foldMap :: Monoid m => (a -> m) -> WrappedFoldable f a -> m

foldMap' :: Monoid m => (a -> m) -> WrappedFoldable f a -> m

foldr :: (a -> b -> b) -> b -> WrappedFoldable f a -> b #

foldr' :: (a -> b -> b) -> b -> WrappedFoldable f a -> b

foldl :: (b -> a -> b) -> b -> WrappedFoldable f a -> b #

foldl' :: (b -> a -> b) -> b -> WrappedFoldable f a -> b #

foldr1 :: (a -> a -> a) -> WrappedFoldable f a -> a #

foldl1 :: (a -> a -> a) -> WrappedFoldable f a -> a #

toList :: WrappedFoldable f a -> [a]

null :: WrappedFoldable f a -> Bool

length :: WrappedFoldable f a -> Int #

elem :: Eq a => a -> WrappedFoldable f a -> Bool #

maximum :: Ord a => WrappedFoldable f a -> a #

minimum :: Ord a => WrappedFoldable f a -> a #

sum :: Num a => WrappedFoldable f a -> a #

product :: Num a => WrappedFoldable f 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 f, Foldable m) => Foldable (ReaderT f m) 
Instance details

Defined in Control.Monad.Representable.Reader

Methods

fold :: Monoid m0 => ReaderT f m m0 -> m0

foldMap :: Monoid m0 => (a -> m0) -> ReaderT f m a -> m0

foldMap' :: Monoid m0 => (a -> m0) -> ReaderT f m a -> m0

foldr :: (a -> b -> b) -> b -> ReaderT f m a -> b #

foldr' :: (a -> b -> b) -> b -> ReaderT f m a -> b

foldl :: (b -> a -> b) -> b -> ReaderT f m a -> b #

foldl' :: (b -> a -> b) -> b -> ReaderT f m a -> b #

foldr1 :: (a -> a -> a) -> ReaderT f m a -> a #

foldl1 :: (a -> a -> a) -> ReaderT f m a -> a #

toList :: ReaderT f m a -> [a]

null :: ReaderT f m a -> Bool

length :: ReaderT f m a -> Int #

elem :: Eq a => a -> ReaderT f m a -> Bool #

maximum :: Ord a => ReaderT f m a -> a #

minimum :: Ord a => ReaderT f m a -> a #

sum :: Num a => ReaderT f m a -> a #

product :: Num a => ReaderT f m 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 (bi a) => Foldable (Biap bi a) 
Instance details

Defined in Data.Bifunctor.Biap

Methods

fold :: Monoid m => Biap bi a m -> m

foldMap :: Monoid m => (a0 -> m) -> Biap bi a a0 -> m

foldMap' :: Monoid m => (a0 -> m) -> Biap bi a a0 -> m

foldr :: (a0 -> b -> b) -> b -> Biap bi a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Biap bi a a0 -> b

foldl :: (b -> a0 -> b) -> b -> Biap bi a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> Biap bi a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Biap bi a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> Biap bi a a0 -> a0 #

toList :: Biap bi a a0 -> [a0]

null :: Biap bi a a0 -> Bool

length :: Biap bi a a0 -> Int #

elem :: Eq a0 => a0 -> Biap bi a a0 -> Bool #

maximum :: Ord a0 => Biap bi a a0 -> a0 #

minimum :: Ord a0 => Biap bi a a0 -> a0 #

sum :: Num a0 => Biap bi a a0 -> a0 #

product :: Num a0 => Biap bi a a0 -> a0 #

Bifoldable p => Foldable (Fix p) 
Instance details

Defined in Data.Bifunctor.Fix

Methods

fold :: Monoid m => Fix p m -> m

foldMap :: Monoid m => (a -> m) -> Fix p a -> m

foldMap' :: Monoid m => (a -> m) -> Fix p a -> m

foldr :: (a -> b -> b) -> b -> Fix p a -> b #

foldr' :: (a -> b -> b) -> b -> Fix p a -> b

foldl :: (b -> a -> b) -> b -> Fix p a -> b #

foldl' :: (b -> a -> b) -> b -> Fix p a -> b #

foldr1 :: (a -> a -> a) -> Fix p a -> a #

foldl1 :: (a -> a -> a) -> Fix p a -> a #

toList :: Fix p a -> [a]

null :: Fix p a -> Bool

length :: Fix p a -> Int #

elem :: Eq a => a -> Fix p a -> Bool #

maximum :: Ord a => Fix p a -> a #

minimum :: Ord a => Fix p a -> a #

sum :: Num a => Fix p a -> a #

product :: Num a => Fix p a -> a #

Bifoldable p => Foldable (Join p) 
Instance details

Defined in Data.Bifunctor.Join

Methods

fold :: Monoid m => Join p m -> m

foldMap :: Monoid m => (a -> m) -> Join p a -> m

foldMap' :: Monoid m => (a -> m) -> Join p a -> m

foldr :: (a -> b -> b) -> b -> Join p a -> b #

foldr' :: (a -> b -> b) -> b -> Join p a -> b

foldl :: (b -> a -> b) -> b -> Join p a -> b #

foldl' :: (b -> a -> b) -> b -> Join p a -> b #

foldr1 :: (a -> a -> a) -> Join p a -> a #

foldl1 :: (a -> a -> a) -> Join p a -> a #

toList :: Join p a -> [a]

null :: Join p a -> Bool

length :: Join p a -> Int #

elem :: Eq a => a -> Join p a -> Bool #

maximum :: Ord a => Join p a -> a #

minimum :: Ord a => Join p a -> a #

sum :: Num a => Join p a -> a #

product :: Num a => Join p a -> a #

Foldable w => Foldable (EnvT e w) 
Instance details

Defined in Control.Comonad.Trans.Env

Methods

fold :: Monoid m => EnvT e w m -> m

foldMap :: Monoid m => (a -> m) -> EnvT e w a -> m

foldMap' :: Monoid m => (a -> m) -> EnvT e w a -> m

foldr :: (a -> b -> b) -> b -> EnvT e w a -> b #

foldr' :: (a -> b -> b) -> b -> EnvT e w a -> b

foldl :: (b -> a -> b) -> b -> EnvT e w a -> b #

foldl' :: (b -> a -> b) -> b -> EnvT e w a -> b #

foldr1 :: (a -> a -> a) -> EnvT e w a -> a #

foldl1 :: (a -> a -> a) -> EnvT e w a -> a #

toList :: EnvT e w a -> [a]

null :: EnvT e w a -> Bool

length :: EnvT e w a -> Int #

elem :: Eq a => a -> EnvT e w a -> Bool #

maximum :: Ord a => EnvT e w a -> a #

minimum :: Ord a => EnvT e w a -> a #

sum :: Num a => EnvT e w a -> a #

product :: Num a => EnvT e w a -> a #

Foldable f => Foldable (CofreeF f a) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

fold :: Monoid m => CofreeF f a m -> m

foldMap :: Monoid m => (a0 -> m) -> CofreeF f a a0 -> m

foldMap' :: Monoid m => (a0 -> m) -> CofreeF f a a0 -> m

foldr :: (a0 -> b -> b) -> b -> CofreeF f a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> CofreeF f a a0 -> b

foldl :: (b -> a0 -> b) -> b -> CofreeF f a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> CofreeF f a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> CofreeF f a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> CofreeF f a a0 -> a0 #

toList :: CofreeF f a a0 -> [a0]

null :: CofreeF f a a0 -> Bool

length :: CofreeF f a a0 -> Int #

elem :: Eq a0 => a0 -> CofreeF f a a0 -> Bool #

maximum :: Ord a0 => CofreeF f a a0 -> a0 #

minimum :: Ord a0 => CofreeF f a a0 -> a0 #

sum :: Num a0 => CofreeF f a a0 -> a0 #

product :: Num a0 => CofreeF f a a0 -> a0 #

(Foldable f, Foldable w) => Foldable (CofreeT f w) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

fold :: Monoid m => CofreeT f w m -> m

foldMap :: Monoid m => (a -> m) -> CofreeT f w a -> m

foldMap' :: Monoid m => (a -> m) -> CofreeT f w a -> m

foldr :: (a -> b -> b) -> b -> CofreeT f w a -> b #

foldr' :: (a -> b -> b) -> b -> CofreeT f w a -> b

foldl :: (b -> a -> b) -> b -> CofreeT f w a -> b #

foldl' :: (b -> a -> b) -> b -> CofreeT f w a -> b #

foldr1 :: (a -> a -> a) -> CofreeT f w a -> a #

foldl1 :: (a -> a -> a) -> CofreeT f w a -> a #

toList :: CofreeT f w a -> [a]

null :: CofreeT f w a -> Bool

length :: CofreeT f w a -> Int #

elem :: Eq a => a -> CofreeT f w a -> Bool #

maximum :: Ord a => CofreeT f w a -> a #

minimum :: Ord a => CofreeT f w a -> a #

sum :: Num a => CofreeT f w a -> a #

product :: Num a => CofreeT f w a -> a #

Foldable f => Foldable (FreeF f a) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

fold :: Monoid m => FreeF f a m -> m

foldMap :: Monoid m => (a0 -> m) -> FreeF f a a0 -> m

foldMap' :: Monoid m => (a0 -> m) -> FreeF f a a0 -> m

foldr :: (a0 -> b -> b) -> b -> FreeF f a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> FreeF f a a0 -> b

foldl :: (b -> a0 -> b) -> b -> FreeF f a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> FreeF f a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> FreeF f a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> FreeF f a a0 -> a0 #

toList :: FreeF f a a0 -> [a0]

null :: FreeF f a a0 -> Bool

length :: FreeF f a a0 -> Int #

elem :: Eq a0 => a0 -> FreeF f a a0 -> Bool #

maximum :: Ord a0 => FreeF f a a0 -> a0 #

minimum :: Ord a0 => FreeF f a a0 -> a0 #

sum :: Num a0 => FreeF f a a0 -> a0 #

product :: Num a0 => FreeF f a a0 -> a0 #

(Foldable m, Foldable f) => Foldable (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

fold :: Monoid m0 => FreeT f m m0 -> m0

foldMap :: Monoid m0 => (a -> m0) -> FreeT f m a -> m0

foldMap' :: Monoid m0 => (a -> m0) -> FreeT f m a -> m0

foldr :: (a -> b -> b) -> b -> FreeT f m a -> b #

foldr' :: (a -> b -> b) -> b -> FreeT f m a -> b

foldl :: (b -> a -> b) -> b -> FreeT f m a -> b #

foldl' :: (b -> a -> b) -> b -> FreeT f m a -> b #

foldr1 :: (a -> a -> a) -> FreeT f m a -> a #

foldl1 :: (a -> a -> a) -> FreeT f m a -> a #

toList :: FreeT f m a -> [a]

null :: FreeT f m a -> Bool

length :: FreeT f m a -> Int #

elem :: Eq a => a -> FreeT f m a -> Bool #

maximum :: Ord a => FreeT f m a -> a #

minimum :: Ord a => FreeT f m a -> a #

sum :: Num a => FreeT f m a -> a #

product :: Num a => FreeT f m a -> a #

Foldable f => Foldable (FreeF f a) 
Instance details

Defined in Control.Monad.Trans.Free.Ap

Methods

fold :: Monoid m => FreeF f a m -> m

foldMap :: Monoid m => (a0 -> m) -> FreeF f a a0 -> m

foldMap' :: Monoid m => (a0 -> m) -> FreeF f a a0 -> m

foldr :: (a0 -> b -> b) -> b -> FreeF f a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> FreeF f a a0 -> b

foldl :: (b -> a0 -> b) -> b -> FreeF f a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> FreeF f a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> FreeF f a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> FreeF f a a0 -> a0 #

toList :: FreeF f a a0 -> [a0]

null :: FreeF f a a0 -> Bool

length :: FreeF f a a0 -> Int #

elem :: Eq a0 => a0 -> FreeF f a a0 -> Bool #

maximum :: Ord a0 => FreeF f a a0 -> a0 #

minimum :: Ord a0 => FreeF f a a0 -> a0 #

sum :: Num a0 => FreeF f a a0 -> a0 #

product :: Num a0 => FreeF f a a0 -> a0 #

(Foldable m, Foldable f) => Foldable (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free.Ap

Methods

fold :: Monoid m0 => FreeT f m m0 -> m0

foldMap :: Monoid m0 => (a -> m0) -> FreeT f m a -> m0

foldMap' :: Monoid m0 => (a -> m0) -> FreeT f m a -> m0

foldr :: (a -> b -> b) -> b -> FreeT f m a -> b #

foldr' :: (a -> b -> b) -> b -> FreeT f m a -> b

foldl :: (b -> a -> b) -> b -> FreeT f m a -> b #

foldl' :: (b -> a -> b) -> b -> FreeT f m a -> b #

foldr1 :: (a -> a -> a) -> FreeT f m a -> a #

foldl1 :: (a -> a -> a) -> FreeT f m a -> a #

toList :: FreeT f m a -> [a]

null :: FreeT f m a -> Bool

length :: FreeT f m a -> Int #

elem :: Eq a => a -> FreeT f m a -> Bool #

maximum :: Ord a => FreeT f m a -> a #

minimum :: Ord a => FreeT f m a -> a #

sum :: Num a => FreeT f m a -> a #

product :: Num a => FreeT f m a -> a #

(Foldable f, Foldable m, Monad m) => Foldable (FT f m) 
Instance details

Defined in Control.Monad.Trans.Free.Church

Methods

fold :: Monoid m0 => FT f m m0 -> m0

foldMap :: Monoid m0 => (a -> m0) -> FT f m a -> m0

foldMap' :: Monoid m0 => (a -> m0) -> FT f m a -> m0

foldr :: (a -> b -> b) -> b -> FT f m a -> b #

foldr' :: (a -> b -> b) -> b -> FT f m a -> b

foldl :: (b -> a -> b) -> b -> FT f m a -> b #

foldl' :: (b -> a -> b) -> b -> FT f m a -> b #

foldr1 :: (a -> a -> a) -> FT f m a -> a #

foldl1 :: (a -> a -> a) -> FT f m a -> a #

toList :: FT f m a -> [a]

null :: FT f m a -> Bool

length :: FT f m a -> Int #

elem :: Eq a => a -> FT f m a -> Bool #

maximum :: Ord a => FT f m a -> a #

minimum :: Ord a => FT f m a -> a #

sum :: Num a => FT f m a -> a #

product :: Num a => FT f m a -> a #

Foldable f => Foldable (WrappedFunctor f) 
Instance details

Defined in Data.Functor.Invariant

Methods

fold :: Monoid m => WrappedFunctor f m -> m

foldMap :: Monoid m => (a -> m) -> WrappedFunctor f a -> m

foldMap' :: Monoid m => (a -> m) -> WrappedFunctor f a -> m

foldr :: (a -> b -> b) -> b -> WrappedFunctor f a -> b #

foldr' :: (a -> b -> b) -> b -> WrappedFunctor f a -> b

foldl :: (b -> a -> b) -> b -> WrappedFunctor f a -> b #

foldl' :: (b -> a -> b) -> b -> WrappedFunctor f a -> b #

foldr1 :: (a -> a -> a) -> WrappedFunctor f a -> a #

foldl1 :: (a -> a -> a) -> WrappedFunctor f a -> a #

toList :: WrappedFunctor f a -> [a]

null :: WrappedFunctor f a -> Bool

length :: WrappedFunctor f a -> Int #

elem :: Eq a => a -> WrappedFunctor f a -> Bool #

maximum :: Ord a => WrappedFunctor f a -> a #

minimum :: Ord a => WrappedFunctor f a -> a #

sum :: Num a => WrappedFunctor f a -> a #

product :: Num a => WrappedFunctor f a -> a #

Foldable f => Foldable (AlongsideLeft f b) 
Instance details

Defined in Control.Lens.Internal.Getter

Methods

fold :: Monoid m => AlongsideLeft f b m -> m

foldMap :: Monoid m => (a -> m) -> AlongsideLeft f b a -> m

foldMap' :: Monoid m => (a -> m) -> AlongsideLeft f b a -> m

foldr :: (a -> b0 -> b0) -> b0 -> AlongsideLeft f b a -> b0 #

foldr' :: (a -> b0 -> b0) -> b0 -> AlongsideLeft f b a -> b0

foldl :: (b0 -> a -> b0) -> b0 -> AlongsideLeft f b a -> b0 #

foldl' :: (b0 -> a -> b0) -> b0 -> AlongsideLeft f b a -> b0 #

foldr1 :: (a -> a -> a) -> AlongsideLeft f b a -> a #

foldl1 :: (a -> a -> a) -> AlongsideLeft f b a -> a #

toList :: AlongsideLeft f b a -> [a]

null :: AlongsideLeft f b a -> Bool

length :: AlongsideLeft f b a -> Int #

elem :: Eq a => a -> AlongsideLeft f b a -> Bool #

maximum :: Ord a => AlongsideLeft f b a -> a #

minimum :: Ord a => AlongsideLeft f b a -> a #

sum :: Num a => AlongsideLeft f b a -> a #

product :: Num a => AlongsideLeft f b a -> a #

Foldable f => Foldable (AlongsideRight f a) 
Instance details

Defined in Control.Lens.Internal.Getter

Methods

fold :: Monoid m => AlongsideRight f a m -> m

foldMap :: Monoid m => (a0 -> m) -> AlongsideRight f a a0 -> m

foldMap' :: Monoid m => (a0 -> m) -> AlongsideRight f a a0 -> m

foldr :: (a0 -> b -> b) -> b -> AlongsideRight f a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> AlongsideRight f a a0 -> b

foldl :: (b -> a0 -> b) -> b -> AlongsideRight f a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> AlongsideRight f a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> AlongsideRight f a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> AlongsideRight f a a0 -> a0 #

toList :: AlongsideRight f a a0 -> [a0]

null :: AlongsideRight f a a0 -> Bool

length :: AlongsideRight f a a0 -> Int #

elem :: Eq a0 => a0 -> AlongsideRight f a a0 -> Bool #

maximum :: Ord a0 => AlongsideRight f a a0 -> a0 #

minimum :: Ord a0 => AlongsideRight f a a0 -> a0 #

sum :: Num a0 => AlongsideRight f a a0 -> a0 #

product :: Num a0 => AlongsideRight f a a0 -> a0 #

Foldable (Baz t b) 
Instance details

Defined in Data.Profunctor.Traversing

Methods

fold :: Monoid m => Baz t b m -> m

foldMap :: Monoid m => (a -> m) -> Baz t b a -> m

foldMap' :: Monoid m => (a -> m) -> Baz t b a -> m

foldr :: (a -> b0 -> b0) -> b0 -> Baz t b a -> b0 #

foldr' :: (a -> b0 -> b0) -> b0 -> Baz t b a -> b0

foldl :: (b0 -> a -> b0) -> b0 -> Baz t b a -> b0 #

foldl' :: (b0 -> a -> b0) -> b0 -> Baz t b a -> b0 #

foldr1 :: (a -> a -> a) -> Baz t b a -> a #

foldl1 :: (a -> a -> a) -> Baz t b a -> a #

toList :: Baz t b a -> [a]

null :: Baz t b a -> Bool

length :: Baz t b a -> Int #

elem :: Eq a => a -> Baz t b a -> Bool #

maximum :: Ord a => Baz t b a -> a #

minimum :: Ord a => Baz t b a -> a #

sum :: Num a => Baz t b a -> a #

product :: Num a => Baz t b 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 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 (Magma i t b) 
Instance details

Defined in Control.Lens.Internal.Magma

Methods

fold :: Monoid m => Magma i t b m -> m

foldMap :: Monoid m => (a -> m) -> Magma i t b a -> m

foldMap' :: Monoid m => (a -> m) -> Magma i t b a -> m

foldr :: (a -> b0 -> b0) -> b0 -> Magma i t b a -> b0 #

foldr' :: (a -> b0 -> b0) -> b0 -> Magma i t b a -> b0

foldl :: (b0 -> a -> b0) -> b0 -> Magma i t b a -> b0 #

foldl' :: (b0 -> a -> b0) -> b0 -> Magma i t b a -> b0 #

foldr1 :: (a -> a -> a) -> Magma i t b a -> a #

foldl1 :: (a -> a -> a) -> Magma i t b a -> a #

toList :: Magma i t b a -> [a]

null :: Magma i t b a -> Bool

length :: Magma i t b a -> Int #

elem :: Eq a => a -> Magma i t b a -> Bool #

maximum :: Ord a => Magma i t b a -> a #

minimum :: Ord a => Magma i t b a -> a #

sum :: Num a => Magma i t b a -> a #

product :: Num a => Magma i t b a -> a #

Foldable (Forget r a :: Type -> Type) 
Instance details

Defined in Data.Profunctor.Types

Methods

fold :: Monoid m => Forget r a m -> m

foldMap :: Monoid m => (a0 -> m) -> Forget r a a0 -> m

foldMap' :: Monoid m => (a0 -> m) -> Forget r a a0 -> m

foldr :: (a0 -> b -> b) -> b -> Forget r a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Forget r a a0 -> b

foldl :: (b -> a0 -> b) -> b -> Forget r a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> Forget r a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Forget r a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> Forget r a a0 -> a0 #

toList :: Forget r a a0 -> [a0]

null :: Forget r a a0 -> Bool

length :: Forget r a a0 -> Int #

elem :: Eq a0 => a0 -> Forget r a a0 -> Bool #

maximum :: Ord a0 => Forget r a a0 -> a0 #

minimum :: Ord a0 => Forget r a a0 -> a0 #

sum :: Num a0 => Forget r a a0 -> a0 #

product :: Num a0 => Forget r a a0 -> a0 #

(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 #

Foldable (Clown f a :: Type -> Type) 
Instance details

Defined in Data.Bifunctor.Clown

Methods

fold :: Monoid m => Clown f a m -> m

foldMap :: Monoid m => (a0 -> m) -> Clown f a a0 -> m

foldMap' :: Monoid m => (a0 -> m) -> Clown f a a0 -> m

foldr :: (a0 -> b -> b) -> b -> Clown f a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Clown f a a0 -> b

foldl :: (b -> a0 -> b) -> b -> Clown f a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> Clown f a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Clown f a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> Clown f a a0 -> a0 #

toList :: Clown f a a0 -> [a0]

null :: Clown f a a0 -> Bool

length :: Clown f a a0 -> Int #

elem :: Eq a0 => a0 -> Clown f a a0 -> Bool #

maximum :: Ord a0 => Clown f a a0 -> a0 #

minimum :: Ord a0 => Clown f a a0 -> a0 #

sum :: Num a0 => Clown f a a0 -> a0 #

product :: Num a0 => Clown f a a0 -> a0 #

Bifoldable p => Foldable (Flip p a) 
Instance details

Defined in Data.Bifunctor.Flip

Methods

fold :: Monoid m => Flip p a m -> m

foldMap :: Monoid m => (a0 -> m) -> Flip p a a0 -> m

foldMap' :: Monoid m => (a0 -> m) -> Flip p a a0 -> m

foldr :: (a0 -> b -> b) -> b -> Flip p a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Flip p a a0 -> b

foldl :: (b -> a0 -> b) -> b -> Flip p a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> Flip p a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Flip p a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> Flip p a a0 -> a0 #

toList :: Flip p a a0 -> [a0]

null :: Flip p a a0 -> Bool

length :: Flip p a a0 -> Int #

elem :: Eq a0 => a0 -> Flip p a a0 -> Bool #

maximum :: Ord a0 => Flip p a a0 -> a0 #

minimum :: Ord a0 => Flip p a a0 -> a0 #

sum :: Num a0 => Flip p a a0 -> a0 #

product :: Num a0 => Flip p a a0 -> a0 #

Foldable g => Foldable (Joker g a) 
Instance details

Defined in Data.Bifunctor.Joker

Methods

fold :: Monoid m => Joker g a m -> m

foldMap :: Monoid m => (a0 -> m) -> Joker g a a0 -> m

foldMap' :: Monoid m => (a0 -> m) -> Joker g a a0 -> m

foldr :: (a0 -> b -> b) -> b -> Joker g a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Joker g a a0 -> b

foldl :: (b -> a0 -> b) -> b -> Joker g a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> Joker g a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Joker g a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> Joker g a a0 -> a0 #

toList :: Joker g a a0 -> [a0]

null :: Joker g a a0 -> Bool

length :: Joker g a a0 -> Int #

elem :: Eq a0 => a0 -> Joker g a a0 -> Bool #

maximum :: Ord a0 => Joker g a a0 -> a0 #

minimum :: Ord a0 => Joker g a a0 -> a0 #

sum :: Num a0 => Joker g a a0 -> a0 #

product :: Num a0 => Joker g a a0 -> a0 #

Bifoldable p => Foldable (WrappedBifunctor p a) 
Instance details

Defined in Data.Bifunctor.Wrapped

Methods

fold :: Monoid m => WrappedBifunctor p a m -> m

foldMap :: Monoid m => (a0 -> m) -> WrappedBifunctor p a a0 -> m

foldMap' :: Monoid m => (a0 -> m) -> WrappedBifunctor p a a0 -> m

foldr :: (a0 -> b -> b) -> b -> WrappedBifunctor p a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> WrappedBifunctor p a a0 -> b

foldl :: (b -> a0 -> b) -> b -> WrappedBifunctor p a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> WrappedBifunctor p a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> WrappedBifunctor p a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> WrappedBifunctor p a a0 -> a0 #

toList :: WrappedBifunctor p a a0 -> [a0]

null :: WrappedBifunctor p a a0 -> Bool

length :: WrappedBifunctor p a a0 -> Int #

elem :: Eq a0 => a0 -> WrappedBifunctor p a a0 -> Bool #

maximum :: Ord a0 => WrappedBifunctor p a a0 -> a0 #

minimum :: Ord a0 => WrappedBifunctor p a a0 -> a0 #

sum :: Num a0 => WrappedBifunctor p a a0 -> a0 #

product :: Num a0 => WrappedBifunctor p a a0 -> a0 #

(Foldable (f a), Foldable (g a)) => Foldable (Product f g a) 
Instance details

Defined in Data.Bifunctor.Product

Methods

fold :: Monoid m => Product f g a m -> m

foldMap :: Monoid m => (a0 -> m) -> Product f g a a0 -> m

foldMap' :: Monoid m => (a0 -> m) -> Product f g a a0 -> m

foldr :: (a0 -> b -> b) -> b -> Product f g a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Product f g a a0 -> b

foldl :: (b -> a0 -> b) -> b -> Product f g a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> Product f g a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Product f g a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> Product f g a a0 -> a0 #

toList :: Product f g a a0 -> [a0]

null :: Product f g a a0 -> Bool

length :: Product f g a a0 -> Int #

elem :: Eq a0 => a0 -> Product f g a a0 -> Bool #

maximum :: Ord a0 => Product f g a a0 -> a0 #

minimum :: Ord a0 => Product f g a a0 -> a0 #

sum :: Num a0 => Product f g a a0 -> a0 #

product :: Num a0 => Product f g a a0 -> a0 #

(Foldable (f a), Foldable (g a)) => Foldable (Sum f g a) 
Instance details

Defined in Data.Bifunctor.Sum

Methods

fold :: Monoid m => Sum f g a m -> m

foldMap :: Monoid m => (a0 -> m) -> Sum f g a a0 -> m

foldMap' :: Monoid m => (a0 -> m) -> Sum f g a a0 -> m

foldr :: (a0 -> b -> b) -> b -> Sum f g a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Sum f g a a0 -> b

foldl :: (b -> a0 -> b) -> b -> Sum f g a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> Sum f g a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Sum f g a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> Sum f g a a0 -> a0 #

toList :: Sum f g a a0 -> [a0]

null :: Sum f g a a0 -> Bool

length :: Sum f g a a0 -> Int #

elem :: Eq a0 => a0 -> Sum f g a a0 -> Bool #

maximum :: Ord a0 => Sum f g a a0 -> a0 #

minimum :: Ord a0 => Sum f g a a0 -> a0 #

sum :: Num a0 => Sum f g a a0 -> a0 #

product :: Num a0 => Sum f g a a0 -> a0 #

(Foldable f, Bifoldable p) => Foldable (Tannen f p a) 
Instance details

Defined in Data.Bifunctor.Tannen

Methods

fold :: Monoid m => Tannen f p a m -> m

foldMap :: Monoid m => (a0 -> m) -> Tannen f p a a0 -> m

foldMap' :: Monoid m => (a0 -> m) -> Tannen f p a a0 -> m

foldr :: (a0 -> b -> b) -> b -> Tannen f p a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Tannen f p a a0 -> b

foldl :: (b -> a0 -> b) -> b -> Tannen f p a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> Tannen f p a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Tannen f p a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> Tannen f p a a0 -> a0 #

toList :: Tannen f p a a0 -> [a0]

null :: Tannen f p a a0 -> Bool

length :: Tannen f p a a0 -> Int #

elem :: Eq a0 => a0 -> Tannen f p a a0 -> Bool #

maximum :: Ord a0 => Tannen f p a a0 -> a0 #

minimum :: Ord a0 => Tannen f p a a0 -> a0 #

sum :: Num a0 => Tannen f p a a0 -> a0 #

product :: Num a0 => Tannen f p a a0 -> a0 #

(Bifoldable p, Foldable g) => Foldable (Biff p f g a) 
Instance details

Defined in Data.Bifunctor.Biff

Methods

fold :: Monoid m => Biff p f g a m -> m

foldMap :: Monoid m => (a0 -> m) -> Biff p f g a a0 -> m

foldMap' :: Monoid m => (a0 -> m) -> Biff p f g a a0 -> m

foldr :: (a0 -> b -> b) -> b -> Biff p f g a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Biff p f g a a0 -> b

foldl :: (b -> a0 -> b) -> b -> Biff p f g a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> Biff p f g a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Biff p f g a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> Biff p f g a a0 -> a0 #

toList :: Biff p f g a a0 -> [a0]

null :: Biff p f g a a0 -> Bool

length :: Biff p f g a a0 -> Int #

elem :: Eq a0 => a0 -> Biff p f g a a0 -> Bool #

maximum :: Ord a0 => Biff p f g a a0 -> a0 #

minimum :: Ord a0 => Biff p f g a a0 -> a0 #

sum :: Num a0 => Biff p f g a a0 -> a0 #

product :: Num a0 => Biff p f g a a0 -> a0 #

data ControllerContext Source #

A container storing useful data along the request lifecycle, such as the request, the current user, set current view layout, flash messages, ...

The controller context is usually accessed via the ?context variable. It's availble inside the action and the view. Think of it as a key-value-map where the key is the type of the value.

You can store information inside the context using putContext:

>>> newtype CurrentLayout = CurrentLayout Html
>>> 
>>> ?context <- newControllerContext
>>> putContext (CurrentLayout layout)

Inside an action you can access the values using fromContext:

>>> (CurrentLayout layout) <- fromContext

You can freeze the context and then access values without being inside an IO context (like inside views which are pure):

Call freeze inside an IO part:

>>> ?context <- freeze ?context

(freeze is automatically called by IHP before rendering a view, so usually you don't need to call it manually)

Then use the frozen context from your pure code like this:

>>> let (CurrentLayout layout) = fromFrozenContext in ...

The context is initially created before a action is going to be executed. Its life cycle looks like this:

  • newControllerContext: The new controller context is created
  • The runActionWithNewContext fills in a few default values: The current ?application and also the Flash Messages to be rendered in the to-be-generated response.
  • initContext: The initContext function of the InitControllerContext WebApplication (inside your FrontController.hs) is called. There application-specific context can be provided. Usually this is the current user and the default layout.
  • beforeAction: Here the context could also be modified. E.g. the layout could be overriden here for the whole controller.
  • action ..: The action itself.
  • Freezing: Before rendering the response, the container is frozen. Frozen means that all previously mutable fields become immutable.
  • View Rendering: The frozen container is now used inside the view and layout to display information such as the current user or flash messages

Instances

Instances details
HasField "frameworkConfig" ControllerContext FrameworkConfig Source # 
Instance details

Defined in IHP.Controller.Context

HasField "logger" ControllerContext Logger Source # 
Instance details

Defined in IHP.Controller.Context

timeAgo :: UTCTime -> Html Source #

Display time like 5 minutes ago

Render's a <time> HTML-Element. Will be displayed like 5 minutes ago, 1 day ago, etc..

Requires the javascript helpers to be available. Then the time will displayed in the current browser timezone.

When the js helper is not available, the time will be displayed with the format: DD.MM.YYYY, HH:MM

Example: Generated HTML

>>> <div>{timeAgo (project.createdAt)}</div>
<div><time class="time-ago">31.08.2007, 16:47</time></div>

Example: HTML after javascript helpers have been applied

>>> <div>{timeAgo (project.createdAt)}</div>
<div><time class="time-ago">a while ago</time></div>

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 #

SetField "asyncs" DataSyncController [Async ()] Source # 
Instance details

Defined in IHP.DataSync.ControllerImpl

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 #

putStr :: Text -> IO () #

show :: Show a => a -> Text Source #

(|>) :: t1 -> (t1 -> t2) -> t2 infixl 8 Source #

class Typeable (a :: k) #

Minimal complete definition

typeRep#

type ConfigProvider context = HasField "frameworkConfig" context FrameworkConfig Source #

type TMap = TypeRepMap Identity #

data FormContext model Source #

Constructors

FormContext 

Fields

Instances

Instances details
SetField "cssFramework" (FormContext record) CSSFramework Source # 
Instance details

Defined in IHP.View.Types

Methods

setField :: CSSFramework -> FormContext record -> FormContext record Source #

SetField "disableJavascriptSubmission" (FormContext record) Bool Source # 
Instance details

Defined in IHP.View.Types

Methods

setField :: Bool -> FormContext record -> FormContext record Source #

SetField "formAction" (FormContext record) Text Source # 
Instance details

Defined in IHP.View.Types

Methods

setField :: Text -> FormContext record -> FormContext record Source #

SetField "formClass" (FormContext record) Text Source # 
Instance details

Defined in IHP.View.Types

Methods

setField :: Text -> FormContext record -> FormContext record Source #

SetField "formId" (FormContext record) Text Source # 
Instance details

Defined in IHP.View.Types

Methods

setField :: Text -> FormContext record -> FormContext record Source #

SetField "formMethod" (FormContext record) Text Source # 
Instance details

Defined in IHP.View.Types

Methods

setField :: Text -> FormContext record -> FormContext record Source #

SetField "model" (FormContext record) record Source # 
Instance details

Defined in IHP.View.Types

Methods

setField :: record -> FormContext record -> FormContext record Source #

SetField "customFormAttributes" (FormContext record) [(Text, Text)] Source # 
Instance details

Defined in IHP.View.Types

Methods

setField :: [(Text, Text)] -> FormContext record -> FormContext record Source #

data BreadcrumbsView Source #

Constructors

BreadcrumbsView 

Fields

type HtmlWithContext context = (?context :: context) => Html Source #

type Layout = Html -> Html Source #

A layout is just a function taking a view and returning a new view.

Example: A very basic html layout.

myLayout :: Layout
myLayout view = [hsx|
    <html>
        <body>
            {view}
        </body>
    </html>
|]

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

Methods

quot :: Int16 -> Int16 -> Int16 #

rem :: Int16 -> Int16 -> Int16 #

div :: Int16 -> Int16 -> Int16 #

mod :: Int16 -> Int16 -> Int16 #

quotRem :: Int16 -> Int16 -> (Int16, Int16) #

divMod :: Int16 -> Int16 -> (Int16, Int16) #

toInteger :: Int16 -> Integer #

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

Methods

quot :: Word16 -> Word16 -> Word16 #

rem :: Word16 -> Word16 -> Word16 #

div :: Word16 -> Word16 -> Word16 #

mod :: Word16 -> Word16 -> Word16 #

quotRem :: Word16 -> Word16 -> (Word16, Word16) #

divMod :: Word16 -> Word16 -> (Word16, Word16) #

toInteger :: Word16 -> Integer #

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 Hours 
Instance details

Defined in Time.Types

Methods

quot :: Hours -> Hours -> Hours #

rem :: Hours -> Hours -> Hours #

div :: Hours -> Hours -> Hours #

mod :: Hours -> Hours -> Hours #

quotRem :: Hours -> Hours -> (Hours, Hours) #

divMod :: Hours -> Hours -> (Hours, Hours) #

toInteger :: Hours -> Integer #

Integral Minutes 
Instance details

Defined in Time.Types

Methods

quot :: Minutes -> Minutes -> Minutes #

rem :: Minutes -> Minutes -> Minutes #

div :: Minutes -> Minutes -> Minutes #

mod :: Minutes -> Minutes -> Minutes #

quotRem :: Minutes -> Minutes -> (Minutes, Minutes) #

divMod :: Minutes -> Minutes -> (Minutes, Minutes) #

toInteger :: Minutes -> Integer #

Integral Seconds 
Instance details

Defined in Time.Types

Methods

quot :: Seconds -> Seconds -> Seconds #

rem :: Seconds -> Seconds -> Seconds #

div :: Seconds -> Seconds -> Seconds #

mod :: Seconds -> Seconds -> Seconds #

quotRem :: Seconds -> Seconds -> (Seconds, Seconds) #

divMod :: Seconds -> Seconds -> (Seconds, Seconds) #

toInteger :: Seconds -> 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 Attosecond 
Instance details

Defined in Data.Time.Units

Methods

quot :: Attosecond -> Attosecond -> Attosecond #

rem :: Attosecond -> Attosecond -> Attosecond #

div :: Attosecond -> Attosecond -> Attosecond #

mod :: Attosecond -> Attosecond -> Attosecond #

quotRem :: Attosecond -> Attosecond -> (Attosecond, Attosecond) #

divMod :: Attosecond -> Attosecond -> (Attosecond, Attosecond) #

toInteger :: Attosecond -> Integer #

Integral Day 
Instance details

Defined in Data.Time.Units

Methods

quot :: Day -> Day -> Day #

rem :: Day -> Day -> Day #

div :: Day -> Day -> Day #

mod :: Day -> Day -> Day #

quotRem :: Day -> Day -> (Day, Day) #

divMod :: Day -> Day -> (Day, Day) #

toInteger :: Day -> Integer #

Integral Femtosecond 
Instance details

Defined in Data.Time.Units

Methods

quot :: Femtosecond -> Femtosecond -> Femtosecond #

rem :: Femtosecond -> Femtosecond -> Femtosecond #

div :: Femtosecond -> Femtosecond -> Femtosecond #

mod :: Femtosecond -> Femtosecond -> Femtosecond #

quotRem :: Femtosecond -> Femtosecond -> (Femtosecond, Femtosecond) #

divMod :: Femtosecond -> Femtosecond -> (Femtosecond, Femtosecond) #

toInteger :: Femtosecond -> Integer #

Integral Fortnight 
Instance details

Defined in Data.Time.Units

Methods

quot :: Fortnight -> Fortnight -> Fortnight #

rem :: Fortnight -> Fortnight -> Fortnight #

div :: Fortnight -> Fortnight -> Fortnight #

mod :: Fortnight -> Fortnight -> Fortnight #

quotRem :: Fortnight -> Fortnight -> (Fortnight, Fortnight) #

divMod :: Fortnight -> Fortnight -> (Fortnight, Fortnight) #

toInteger :: Fortnight -> Integer #

Integral Hour 
Instance details

Defined in Data.Time.Units

Methods

quot :: Hour -> Hour -> Hour #

rem :: Hour -> Hour -> Hour #

div :: Hour -> Hour -> Hour #

mod :: Hour -> Hour -> Hour #

quotRem :: Hour -> Hour -> (Hour, Hour) #

divMod :: Hour -> Hour -> (Hour, Hour) #

toInteger :: Hour -> Integer #

Integral Microsecond 
Instance details

Defined in Data.Time.Units

Methods

quot :: Microsecond -> Microsecond -> Microsecond #

rem :: Microsecond -> Microsecond -> Microsecond #

div :: Microsecond -> Microsecond -> Microsecond #

mod :: Microsecond -> Microsecond -> Microsecond #

quotRem :: Microsecond -> Microsecond -> (Microsecond, Microsecond) #

divMod :: Microsecond -> Microsecond -> (Microsecond, Microsecond) #

toInteger :: Microsecond -> Integer #

Integral Millisecond 
Instance details

Defined in Data.Time.Units

Methods

quot :: Millisecond -> Millisecond -> Millisecond #

rem :: Millisecond -> Millisecond -> Millisecond #

div :: Millisecond -> Millisecond -> Millisecond #

mod :: Millisecond -> Millisecond -> Millisecond #

quotRem :: Millisecond -> Millisecond -> (Millisecond, Millisecond) #

divMod :: Millisecond -> Millisecond -> (Millisecond, Millisecond) #

toInteger :: Millisecond -> Integer #

Integral Minute 
Instance details

Defined in Data.Time.Units

Methods

quot :: Minute -> Minute -> Minute #

rem :: Minute -> Minute -> Minute #

div :: Minute -> Minute -> Minute #

mod :: Minute -> Minute -> Minute #

quotRem :: Minute -> Minute -> (Minute, Minute) #

divMod :: Minute -> Minute -> (Minute, Minute) #

toInteger :: Minute -> Integer #

Integral Nanosecond 
Instance details

Defined in Data.Time.Units

Methods

quot :: Nanosecond -> Nanosecond -> Nanosecond #

rem :: Nanosecond -> Nanosecond -> Nanosecond #

div :: Nanosecond -> Nanosecond -> Nanosecond #

mod :: Nanosecond -> Nanosecond -> Nanosecond #

quotRem :: Nanosecond -> Nanosecond -> (Nanosecond, Nanosecond) #

divMod :: Nanosecond -> Nanosecond -> (Nanosecond, Nanosecond) #

toInteger :: Nanosecond -> Integer #

Integral Picosecond 
Instance details

Defined in Data.Time.Units

Methods

quot :: Picosecond -> Picosecond -> Picosecond #

rem :: Picosecond -> Picosecond -> Picosecond #

div :: Picosecond -> Picosecond -> Picosecond #

mod :: Picosecond -> Picosecond -> Picosecond #

quotRem :: Picosecond -> Picosecond -> (Picosecond, Picosecond) #

divMod :: Picosecond -> Picosecond -> (Picosecond, Picosecond) #

toInteger :: Picosecond -> Integer #

Integral Second 
Instance details

Defined in Data.Time.Units

Methods

quot :: Second -> Second -> Second #

rem :: Second -> Second -> Second #

div :: Second -> Second -> Second #

mod :: Second -> Second -> Second #

quotRem :: Second -> Second -> (Second, Second) #

divMod :: Second -> Second -> (Second, Second) #

toInteger :: Second -> Integer #

Integral Week 
Instance details

Defined in Data.Time.Units

Methods

quot :: Week -> Week -> Week #

rem :: Week -> Week -> Week #

div :: Week -> Week -> Week #

mod :: Week -> Week -> Week #

quotRem :: Week -> Week -> (Week, Week) #

divMod :: Week -> Week -> (Week, Week) #

toInteger :: Week -> Integer #

Integral Int128 
Instance details

Defined in Data.WideWord.Int128

Methods

quot :: Int128 -> Int128 -> Int128 #

rem :: Int128 -> Int128 -> Int128 #

div :: Int128 -> Int128 -> Int128 #

mod :: Int128 -> Int128 -> Int128 #

quotRem :: Int128 -> Int128 -> (Int128, Int128) #

divMod :: Int128 -> Int128 -> (Int128, Int128) #

toInteger :: Int128 -> Integer #

Integral Word128 
Instance details

Defined in Data.WideWord.Word128

Methods

quot :: Word128 -> Word128 -> Word128 #

rem :: Word128 -> Word128 -> Word128 #

div :: Word128 -> Word128 -> Word128 #

mod :: Word128 -> Word128 -> Word128 #

quotRem :: Word128 -> Word128 -> (Word128, Word128) #

divMod :: Word128 -> Word128 -> (Word128, Word128) #

toInteger :: Word128 -> Integer #

Integral Word256 
Instance details

Defined in Data.WideWord.Word256

Methods

quot :: Word256 -> Word256 -> Word256 #

rem :: Word256 -> Word256 -> Word256 #

div :: Word256 -> Word256 -> Word256 #

mod :: Word256 -> Word256 -> Word256 #

quotRem :: Word256 -> Word256 -> (Word256, Word256) #

divMod :: Word256 -> Word256 -> (Word256, Word256) #

toInteger :: Word256 -> Integer #

Integral Integer 
Instance details

Defined in GHC.Real

Integral Natural 
Instance details

Defined in GHC.Real

Methods

quot :: Natural -> Natural -> Natural #

rem :: Natural -> Natural -> Natural #

div :: Natural -> Natural -> Natural #

mod :: Natural -> Natural -> Natural #

quotRem :: Natural -> Natural -> (Natural, Natural) #

divMod :: Natural -> Natural -> (Natural, Natural) #

toInteger :: Natural -> Integer #

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 (Blind a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

quot :: Blind a -> Blind a -> Blind a #

rem :: Blind a -> Blind a -> Blind a #

div :: Blind a -> Blind a -> Blind a #

mod :: Blind a -> Blind a -> Blind a #

quotRem :: Blind a -> Blind a -> (Blind a, Blind a) #

divMod :: Blind a -> Blind a -> (Blind a, Blind a) #

toInteger :: Blind a -> Integer #

Integral a => Integral (Fixed a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

quot :: Fixed a -> Fixed a -> Fixed a #

rem :: Fixed a -> Fixed a -> Fixed a #

div :: Fixed a -> Fixed a -> Fixed a #

mod :: Fixed a -> Fixed a -> Fixed a #

quotRem :: Fixed a -> Fixed a -> (Fixed a, Fixed a) #

divMod :: Fixed a -> Fixed a -> (Fixed a, Fixed a) #

toInteger :: Fixed a -> Integer #

Integral a => Integral (Large a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

quot :: Large a -> Large a -> Large a #

rem :: Large a -> Large a -> Large a #

div :: Large a -> Large a -> Large a #

mod :: Large a -> Large a -> Large a #

quotRem :: Large a -> Large a -> (Large a, Large a) #

divMod :: Large a -> Large a -> (Large a, Large a) #

toInteger :: Large a -> Integer #

Integral a => Integral (Shrink2 a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

quot :: Shrink2 a -> Shrink2 a -> Shrink2 a #

rem :: Shrink2 a -> Shrink2 a -> Shrink2 a #

div :: Shrink2 a -> Shrink2 a -> Shrink2 a #

mod :: Shrink2 a -> Shrink2 a -> Shrink2 a #

quotRem :: Shrink2 a -> Shrink2 a -> (Shrink2 a, Shrink2 a) #

divMod :: Shrink2 a -> Shrink2 a -> (Shrink2 a, Shrink2 a) #

toInteger :: Shrink2 a -> Integer #

Integral a => Integral (Small a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

quot :: Small a -> Small a -> Small a #

rem :: Small a -> Small a -> Small a #

div :: Small a -> Small a -> Small a #

mod :: Small a -> Small a -> Small a #

quotRem :: Small a -> Small a -> (Small a, Small a) #

divMod :: Small a -> Small a -> (Small a, Small a) #

toInteger :: Small a -> Integer #

Integral a => Integral (Identity a) 
Instance details

Defined in Data.Functor.Identity

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 #

classes :: [(Text, Bool)] -> Text Source #

Helper for dynamically generating the class=".." attribute.

Given a list like

[("a", True), ("b", False), ("c", True)]

builds a class name string for all parts where the second value is True.

E.g.

>>> classes [("a", True), ("b", False), ("c", True)]
"a c"

When setting b to True:

>>> classes [("a", True), ("b", True), ("c", True)]
"a b c"

Example:

>>> <div class={classes [("is-active", False)]}>
<div class="">
>>> <div class={classes [("is-active", True)]}>
<div class="is-active">
>>> forEach projects \project -> [hsx|
>>> <div class={classes [("project", True), ("active", project.active)]}>
>>> {project}
>>> </div>
>>> |]
If project is active:                        <div class="project active">{project}</div>
Otherwise:                                   <div class="project">{project}</div>

dateTime :: UTCTime -> Html Source #

Display time like 31.08.2007, 16:47

Render's a <time> HTML-Element for displaying time and date.

Requires the javascript helpers to be available. Then the date and time will displayed in the current browser timezone.

The js helper uses toLocaleDateString to display the date in the browsers locale format.

Example: Generated HTML

>>> <div>{dateTime (project.createdAt)}</div>
<div><time class="date-time">31.08.2007, 16:47</time></div>

Example: HTML after javascript helpers have been applied

>>> <div>{dateTime (project.createdAt)}</div>
<div><time class="date-time">31.08.2007, 16:47 Uhr</time></div>

date :: UTCTime -> Html Source #

Display date like 31.08.2007

Render's a <time> HTML-Element for displaying the date.

Requires the javascript helpers to be available. Then the date will displayed in the current browser locale format and timezone.

The js helper uses toLocaleDateString to display the date in the browsers locale format.

Example: Generated HTML

>>> <div>{date (project.createdAt)}</div>
<div><time class="date">31.08.2007, 16:47</time></div>

Example: HTML after javascript helpers have been applied

>>> <div>{date (project.createdAt)}</div>
<div><time class="date">31.08.2007</time></div>

(!) :: Attributable h => h -> Attribute -> h #

getModelName :: KnownSymbol (GetModelName model) => Text Source #

Returns the model name of a given model as Text

Example:

>>> modelName @User
"User"
>>> modelName @Project
"Project"

class InputValue a where Source #

Methods

inputValue :: a -> Text Source #

Instances

Instances details
InputValue Value Source # 
Instance details

Defined in IHP.ModelSupport

InputValue PGInterval Source # 
Instance details

Defined in IHP.ModelSupport

InputValue JobStatus Source # 
Instance details

Defined in IHP.Job.Queue

InputValue Scientific Source # 
Instance details

Defined in IHP.ModelSupport

Methods

inputValue :: Scientific -> Text Source #

InputValue Text Source # 
Instance details

Defined in IHP.ModelSupport

Methods

inputValue :: Text -> Text Source #

InputValue Day Source # 
Instance details

Defined in IHP.ModelSupport

Methods

inputValue :: Day -> Text Source #

InputValue UTCTime Source # 
Instance details

Defined in IHP.ModelSupport

InputValue LocalTime Source # 
Instance details

Defined in IHP.ModelSupport

InputValue TimeOfDay Source # 
Instance details

Defined in IHP.ModelSupport

InputValue UUID Source # 
Instance details

Defined in IHP.ModelSupport

Methods

inputValue :: UUID -> Text Source #

InputValue Integer Source # 
Instance details

Defined in IHP.ModelSupport

InputValue () Source # 
Instance details

Defined in IHP.ModelSupport

Methods

inputValue :: () -> Text Source #

InputValue Bool Source # 
Instance details

Defined in IHP.ModelSupport

Methods

inputValue :: Bool -> Text Source #

InputValue Double Source # 
Instance details

Defined in IHP.ModelSupport

InputValue Float Source # 
Instance details

Defined in IHP.ModelSupport

InputValue Int Source # 
Instance details

Defined in IHP.ModelSupport

Methods

inputValue :: Int -> Text Source #

InputValue (PrimaryKey model') => InputValue (Id' model') Source # 
Instance details

Defined in IHP.ModelSupport

Methods

inputValue :: Id' model' -> Text Source #

InputValue fieldType => InputValue (Maybe fieldType) Source # 
Instance details

Defined in IHP.ModelSupport

Methods

inputValue :: Maybe fieldType -> Text Source #

InputValue value => InputValue [value] Source # 
Instance details

Defined in IHP.ModelSupport

Methods

inputValue :: [value] -> Text Source #

isNew :: HasField "meta" model MetaBag => model -> Bool Source #

Returns True when the record has not been saved to the database yet. Returns False otherwise.

Example: Returns True when a record has not been inserted yet.

>>> let project = newRecord @Project
>>> isNew project
True

Example: Returns False after inserting a record.

>>> project <- createRecord project
>>> isNew project
False

Example: Returns False for records which have been fetched from the database.

>>> book <- query @Book |> fetchOne
>>> isNew book
False

didTouchField :: forall (fieldName :: Symbol) fieldValue record. (KnownSymbol fieldName, HasField fieldName record fieldValue, HasField "meta" record MetaBag, Eq fieldValue, Typeable record) => Proxy fieldName -> record -> Bool Source #

Returns True if set was called on that field

Example: Returns False for freshly fetched records

>>> let projectId = "227fbba3-0578-4eb8-807d-b9b692c3644f" :: Id Project
>>> project <- fetch projectId
>>> didTouchField #name project
False

Example: Returns True after setting a field

>>> let projectId = "227fbba3-0578-4eb8-807d-b9b692c3644f" :: Id Project
>>> project <- fetch projectId
>>> project |> set #name project.name |> didTouchField #name
True

formFor :: (?context :: ControllerContext, ModelFormAction record, HasField "meta" record MetaBag) => record -> ((?context :: ControllerContext, ?formContext :: FormContext record) => Html) -> Html Source #

Forms usually begin with a formFor expression.

This is how a simple form can look like:

renderForm :: Post -> Html
renderForm post = formFor post [hsx|
    {textField #title}
    {textareaField #body}
    {submitButton}
|]

Calling this form from inside your HSX code will lead to the following HTML being generated:

<form method="POST" action="/CreatePost" id="" class="new-form">
    <div class="form-group" id="form-group-post_title">
        <label for="post_title">Title</label>
        <input type="text" name="title" id="post_title" class="form-control" />
    </div>

    <div class="form-group" id="form-group-post_body">
        <label for="post_body">Body</label>
        <textarea name="body" id="post_body" class="form-control"></textarea>
    </div>

    <button class="btn btn-primary">Create Post</button>
</form>

You can see that the form is submitted via POST. The form action has also been set by default to /CreatePost.

All inputs have auto-generated class names and ids for styling. Also, all name attributes are set as expected.

Field Values:

A form control is always filled with the value of the given field when rendering. For example, given a post

let post = Post { ..., title = "Hello World" }

Rendering this, the input value will be set like:

>>> {textField #title}
<input ... value="Hello World" />

Validation:

When rendering a record that has failed validation, the validation error message will be rendered automatically.

Given a post like this:

let post = Post { ..., title = "" }
    |> validateField #title nonEmpty

Rendering {textField #title}, the input will have the css class is-invalid and an element with the error message will be rendered below the input:

<div class="form-group" id="form-group-post_title">
    <label for="post_title">Title</label>
    <input
        type="text"
        name="title"
        placeholder=""
        id="post_title"
        class="form-control is-invalid "
    />
    <div class="invalid-feedback">This field cannot be empty</div>
</div>

newtype AppHostname Source #

Constructors

AppHostname Text 

stringValue :: String -> AttributeValue #

toHtml :: ToHtml a => a -> Html #

preEscapedToHtml :: ToMarkup a => a -> Html #

preEscapedTextValue :: Text -> AttributeValue #

pathTo :: HasPath controller => controller -> Text Source #

Returns the path to a given action

>>> pathTo UsersAction
"/Users"
>>> pathTo ShowUserAction { userId = "a32913dd-ef80-4f3e-9a91-7879e17b2ece" }
"/ShowUser?userId=a32913dd-ef80-4f3e-9a91-7879e17b2ece"

urlTo :: (?context :: context, ConfigProvider context, HasPath action) => action -> Text Source #

Returns the url to a given action.

Uses the baseUrl configured in Config/Config.hs. When no baseUrl is configured in development mode, it will automatically detect the correct baseUrl value.

>>> urlTo UsersAction
"http://localhost:8000/Users"
>>> urlTo ShowUserAction { userId = "a32913dd-ef80-4f3e-9a91-7879e17b2ece" }
"http://localhost:8000/ShowUser?userId=a32913dd-ef80-4f3e-9a91-7879e17b2ece"

class KeyValue e kv | kv -> e where #

Methods

(.=) :: ToJSON v => Key -> v -> kv #

explicitToField :: (v -> e) -> Key -> v -> kv #

Instances

Instances details
KeyValue Encoding Series 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

(.=) :: ToJSON v => Key -> v -> Series #

explicitToField :: (v -> Encoding) -> Key -> v -> Series #

value ~ Value => KeyValue Value (KeyMap value) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

(.=) :: ToJSON v => Key -> v -> KeyMap value #

explicitToField :: (v -> Value) -> Key -> v -> KeyMap value #

(key ~ Key, value ~ Value) => KeyValue Value (key, value) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

(.=) :: ToJSON v => Key -> v -> (key, value) #

explicitToField :: (v -> Value) -> Key -> v -> (key, value) #

init :: [a] -> Maybe [a] Source #

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

BiPolyMap HashMap 
Instance details

Defined in Data.Containers

Associated Types

type BPMKeyConstraint HashMap key 
Instance details

Defined in Data.Containers

type BPMKeyConstraint HashMap key = (Hashable key, Eq key)

Methods

mapKeysWith :: (BPMKeyConstraint HashMap k1, BPMKeyConstraint HashMap k2) => (v -> v -> v) -> (k1 -> k2) -> HashMap k1 v -> HashMap k2 v #

SetField "subscriptions" DataSyncController (HashMap UUID (MVar ())) Source # 
Instance details

Defined in IHP.DataSync.ControllerImpl

SetField "transactions" DataSyncController (HashMap UUID DataSyncTransaction) Source # 
Instance details

Defined in IHP.DataSync.ControllerImpl

(Eq k, Hashable k) => FilterableWithIndex k (HashMap k) 
Instance details

Defined in Witherable

Methods

imapMaybe :: (k -> a -> Maybe b) -> HashMap k a -> HashMap k b

ifilter :: (k -> a -> Bool) -> HashMap k a -> HashMap k a

(Eq k, Hashable k) => WitherableWithIndex k (HashMap k) 
Instance details

Defined in Witherable

Methods

iwither :: Applicative f => (k -> a -> f (Maybe b)) -> HashMap k a -> f (HashMap k b)

iwitherM :: Monad m => (k -> a -> m (Maybe b)) -> HashMap k a -> m (HashMap k b)

ifilterA :: Applicative f => (k -> a -> f Bool) -> HashMap k a -> f (HashMap k a)

(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

Invariant (HashMap k) 
Instance details

Defined in Data.Functor.Invariant

Methods

invmap :: (a -> b) -> (b -> a) -> HashMap k a -> HashMap k b

FoldableWithKey (HashMap k) 
Instance details

Defined in Data.Key

Methods

toKeyedList :: HashMap k a -> [(Key (HashMap k), a)]

foldMapWithKey :: Monoid m => (Key (HashMap k) -> a -> m) -> HashMap k a -> m

foldrWithKey :: (Key (HashMap k) -> a -> b -> b) -> b -> HashMap k a -> b

foldlWithKey :: (b -> Key (HashMap k) -> a -> b) -> b -> HashMap k a -> b

(Eq k, Hashable k) => Indexable (HashMap k) 
Instance details

Defined in Data.Key

Methods

index :: HashMap k a -> Key (HashMap k) -> a

Keyed (HashMap k) 
Instance details

Defined in Data.Key

Methods

mapWithKey :: (Key (HashMap k) -> a -> b) -> HashMap k a -> HashMap k b

(Eq k, Hashable k) => Lookup (HashMap k) 
Instance details

Defined in Data.Key

Methods

lookup :: Key (HashMap k) -> HashMap k a -> Maybe a

TraversableWithKey (HashMap k) 
Instance details

Defined in Data.Key

Methods

traverseWithKey :: Applicative f => (Key (HashMap k) -> a -> f b) -> HashMap k a -> f (HashMap k b)

mapWithKeyM :: Monad m => (Key (HashMap k) -> a -> m b) -> HashMap k a -> m (HashMap k b)

(Eq k, Hashable k) => Zip (HashMap k) 
Instance details

Defined in Data.Key

Methods

zipWith :: (a -> b -> c) -> HashMap k a -> HashMap k b -> HashMap k c

zip :: HashMap k a -> HashMap k b -> HashMap k (a, b)

zap :: HashMap k (a -> b) -> HashMap k a -> HashMap k b

(Eq k, Hashable k) => ZipWithKey (HashMap k) 
Instance details

Defined in Data.Key

Methods

zipWithKey :: (Key (HashMap k) -> a -> b -> c) -> HashMap k a -> HashMap k b -> HashMap k c

zapWithKey :: HashMap k (Key (HashMap k) -> a -> b) -> HashMap k a -> HashMap k b

(Eq key, Hashable key) => PolyMap (HashMap key) 
Instance details

Defined in Data.Containers

Methods

differenceMap :: HashMap key value1 -> HashMap key value2 -> HashMap key value1 #

intersectionMap :: HashMap key value1 -> HashMap key value2 -> HashMap key value1 #

intersectionWithMap :: (value1 -> value2 -> value3) -> HashMap key value1 -> HashMap key value2 -> HashMap key value3 #

(Default k, Hashable k) => Pointed (HashMap k) 
Instance details

Defined in Data.Pointed

Methods

point :: a -> HashMap k a

(Hashable k, Eq k) => Alt (HashMap k) 
Instance details

Defined in Data.Functor.Alt

Methods

(<!>) :: HashMap k a -> HashMap k a -> HashMap k a

some :: Applicative (HashMap k) => HashMap k a -> HashMap k [a]

many :: Applicative (HashMap k) => HashMap k a -> HashMap k [a]

(Hashable k, Eq k) => Apply (HashMap k) 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(<.>) :: HashMap k (a -> b) -> HashMap k a -> HashMap k b

(.>) :: HashMap k a -> HashMap k b -> HashMap k b

(<.) :: HashMap k a -> HashMap k b -> HashMap k a

liftF2 :: (a -> b -> c) -> HashMap k a -> HashMap k b -> HashMap k c

(Hashable k, Eq k) => Bind (HashMap k) 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(>>-) :: HashMap k a -> (a -> HashMap k b) -> HashMap k b

join :: HashMap k (HashMap k a) -> HashMap k a

(Hashable k, Eq k) => Plus (HashMap k) 
Instance details

Defined in Data.Functor.Plus

Methods

zero :: HashMap k a

(Eq k, Hashable k) => Filterable (HashMap k) 
Instance details

Defined in Witherable

Methods

mapMaybe :: (a -> Maybe b) -> HashMap k a -> HashMap k b

catMaybes :: HashMap k (Maybe a) -> HashMap k a

filter :: (a -> Bool) -> HashMap k a -> HashMap k a

(Eq k, Hashable k) => Witherable (HashMap k) 
Instance details

Defined in Witherable

Methods

wither :: Applicative f => (a -> f (Maybe b)) -> HashMap k a -> f (HashMap k b)

witherM :: Monad m => (a -> m (Maybe b)) -> HashMap k a -> m (HashMap k b)

filterA :: Applicative f => (a -> f Bool) -> HashMap k a -> f (HashMap k a)

witherMap :: Applicative m => (HashMap k b -> r) -> (a -> m (Maybe b)) -> HashMap k a -> m r

(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

(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) => At (HashMap k a) 
Instance details

Defined in Control.Lens.At

Methods

at :: Index (HashMap k a) -> Lens' (HashMap k a) (Maybe (IxValue (HashMap k a)))

(Eq k, Hashable k) => Ixed (HashMap k a) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (HashMap k a) -> Traversal' (HashMap k a) (IxValue (HashMap k a))

AsEmpty (HashMap k a) 
Instance details

Defined in Control.Lens.Empty

Methods

_Empty :: Prism' (HashMap k a) ()

(Hashable k, Eq k) => Wrapped (HashMap k a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (HashMap k a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (HashMap k a) = [(k, a)]

Methods

_Wrapped' :: Iso' (HashMap k a) (Unwrapped (HashMap k a))

(Hashable k, Eq k) => HasKeysSet (HashMap k v) 
Instance details

Defined in Data.Containers

Associated Types

type KeySet (HashMap k v) 
Instance details

Defined in Data.Containers

type KeySet (HashMap k v) = HashSet k

Methods

keysSet :: HashMap k v -> KeySet (HashMap k v) #

(Eq key, Hashable key) => IsMap (HashMap key value) 
Instance details

Defined in Data.Containers

Associated Types

type MapValue (HashMap key value) 
Instance details

Defined in Data.Containers

type MapValue (HashMap key value) = value

Methods

lookup :: ContainerKey (HashMap key value) -> HashMap key value -> Maybe (MapValue (HashMap key value)) #

insertMap :: ContainerKey (HashMap key value) -> MapValue (HashMap key value) -> HashMap key value -> HashMap key value #

deleteMap :: ContainerKey (HashMap key value) -> HashMap key value -> HashMap key value #

singletonMap :: ContainerKey (HashMap key value) -> MapValue (HashMap key value) -> HashMap key value #

mapFromList :: [(ContainerKey (HashMap key value), MapValue (HashMap key value))] -> HashMap key value #

mapToList :: HashMap key value -> [(ContainerKey (HashMap key value), MapValue (HashMap key value))] #

findWithDefault :: MapValue (HashMap key value) -> ContainerKey (HashMap key value) -> HashMap key value -> MapValue (HashMap key value) #

insertWith :: (MapValue (HashMap key value) -> MapValue (HashMap key value) -> MapValue (HashMap key value)) -> ContainerKey (HashMap key value) -> MapValue (HashMap key value) -> HashMap key value -> HashMap key value #

insertWithKey :: (ContainerKey (HashMap key value) -> MapValue (HashMap key value) -> MapValue (HashMap key value) -> MapValue (HashMap key value)) -> ContainerKey (HashMap key value) -> MapValue (HashMap key value) -> HashMap key value -> HashMap key value #

insertLookupWithKey :: (ContainerKey (HashMap key value) -> MapValue (HashMap key value) -> MapValue (HashMap key value) -> MapValue (HashMap key value)) -> ContainerKey (HashMap key value) -> MapValue (HashMap key value) -> HashMap key value -> (Maybe (MapValue (HashMap key value)), HashMap key value) #

adjustMap :: (MapValue (HashMap key value) -> MapValue (HashMap key value)) -> ContainerKey (HashMap key value) -> HashMap key value -> HashMap key value #

adjustWithKey :: (ContainerKey (HashMap key value) -> MapValue (HashMap key value) -> MapValue (HashMap key value)) -> ContainerKey (HashMap key value) -> HashMap key value -> HashMap key value #

updateMap :: (MapValue (HashMap key value) -> Maybe (MapValue (HashMap key value))) -> ContainerKey (HashMap key value) -> HashMap key value -> HashMap key value #

updateWithKey :: (ContainerKey (HashMap key value) -> MapValue (HashMap key value) -> Maybe (MapValue (HashMap key value))) -> ContainerKey (HashMap key value) -> HashMap key value -> HashMap key value #

updateLookupWithKey :: (ContainerKey (HashMap key value) -> MapValue (HashMap key value) -> Maybe (MapValue (HashMap key value))) -> ContainerKey (HashMap key value) -> HashMap key value -> (Maybe (MapValue (HashMap key value)), HashMap key value) #

alterMap :: (Maybe (MapValue (HashMap key value)) -> Maybe (MapValue (HashMap key value))) -> ContainerKey (HashMap key value) -> HashMap key value -> HashMap key value #

unionWith :: (MapValue (HashMap key value) -> MapValue (HashMap key value) -> MapValue (HashMap key value)) -> HashMap key value -> HashMap key value -> HashMap key value #

unionWithKey :: (ContainerKey (HashMap key value) -> MapValue (HashMap key value) -> MapValue (HashMap key value) -> MapValue (HashMap key value)) -> HashMap key value -> HashMap key value -> HashMap key value #

unionsWith :: (MapValue (HashMap key value) -> MapValue (HashMap key value) -> MapValue (HashMap key value)) -> [HashMap key value] -> HashMap key value #

mapWithKey :: (ContainerKey (HashMap key value) -> MapValue (HashMap key value) -> MapValue (HashMap key value)) -> HashMap key value -> HashMap key value #

omapKeysWith :: (MapValue (HashMap key value) -> MapValue (HashMap key value) -> MapValue (HashMap key value)) -> (ContainerKey (HashMap key value) -> ContainerKey (HashMap key value)) -> HashMap key value -> HashMap key value #

filterMap :: (MapValue (HashMap key value) -> Bool) -> HashMap key value -> HashMap key value #

(Eq key, Hashable key) => SetContainer (HashMap key value) 
Instance details

Defined in Data.Containers

Associated Types

type ContainerKey (HashMap key value) 
Instance details

Defined in Data.Containers

type ContainerKey (HashMap key value) = key

Methods

member :: ContainerKey (HashMap key value) -> HashMap key value -> Bool #

notMember :: ContainerKey (HashMap key value) -> HashMap key value -> Bool #

union :: HashMap key value -> HashMap key value -> HashMap key value #

unions :: (MonoFoldable mono, Element mono ~ HashMap key value) => mono -> HashMap key value #

difference :: HashMap key value -> HashMap key value -> HashMap key value #

intersection :: HashMap key value -> HashMap key value -> HashMap key value #

keys :: HashMap key value -> [ContainerKey (HashMap key value)] #

(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) #

Hashable k => One (HashMap k v) 
Instance details

Defined in Relude.Container.One

Associated Types

type OneItem (HashMap k v) 
Instance details

Defined in Relude.Container.One

type OneItem (HashMap k v) = (k, v)

Methods

one :: OneItem (HashMap k v) -> HashMap k v

Hashable k => DynamicMap (HashMap k v) 
Instance details

Defined in Relude.Extra.Map

Methods

insert :: Key (HashMap k v) -> Val (HashMap k v) -> HashMap k v -> HashMap k v

insertWith :: (Val (HashMap k v) -> Val (HashMap k v) -> Val (HashMap k v)) -> Key (HashMap k v) -> Val (HashMap k v) -> HashMap k v -> HashMap k v

delete :: Key (HashMap k v) -> HashMap k v -> HashMap k v

alter :: (Maybe (Val (HashMap k v)) -> Maybe (Val (HashMap k v))) -> Key (HashMap k v) -> HashMap k v -> HashMap k v

Hashable k => StaticMap (HashMap k v) 
Instance details

Defined in Relude.Extra.Map

Associated Types

type Key (HashMap k v) 
Instance details

Defined in Relude.Extra.Map

type Key (HashMap k v) = k
type Val (HashMap k v) 
Instance details

Defined in Relude.Extra.Map

type Val (HashMap k v) = v

Methods

size :: HashMap k v -> Int

lookup :: Key (HashMap k v) -> HashMap k v -> Maybe (Val (HashMap k v))

member :: Key (HashMap k v) -> HashMap k v -> Bool

(t ~ HashMap k' a', Hashable k, Eq k) => Rewrapped (HashMap k a) t 
Instance details

Defined in Control.Lens.Wrapped

c ~ d => Each (HashMap c a) (HashMap d b) a b 
Instance details

Defined in Control.Lens.Each

Methods

each :: Traversal (HashMap c a) (HashMap d b) a b

type BPMKeyConstraint HashMap key 
Instance details

Defined in Data.Containers

type BPMKeyConstraint HashMap key = (Hashable key, Eq key)
type Key (HashMap k) 
Instance details

Defined in Data.Key

type Key (HashMap k) = k
type Item (HashMap k v) 
Instance details

Defined in Data.HashMap.Internal

type Item (HashMap k v) = (k, v)
type Index (HashMap k a) 
Instance details

Defined in Control.Lens.At

type Index (HashMap k a) = k
type IxValue (HashMap k a) 
Instance details

Defined in Control.Lens.At

type IxValue (HashMap k a) = a
type Unwrapped (HashMap k a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (HashMap k a) = [(k, a)]
type ContainerKey (HashMap key value) 
Instance details

Defined in Data.Containers

type ContainerKey (HashMap key value) = key
type KeySet (HashMap k v) 
Instance details

Defined in Data.Containers

type KeySet (HashMap k v) = HashSet k
type MapValue (HashMap key value) 
Instance details

Defined in Data.Containers

type MapValue (HashMap key value) = value
type Element (HashMap k v) 
Instance details

Defined in Data.MonoTraversable

type Element (HashMap k v) = v
type OneItem (HashMap k v) 
Instance details

Defined in Relude.Container.One

type OneItem (HashMap k v) = (k, v)
type Key (HashMap k v) 
Instance details

Defined in Relude.Extra.Map

type Key (HashMap k v) = k
type Val (HashMap k v) 
Instance details

Defined in Relude.Extra.Map

type Val (HashMap k v) = v

breadcrumbLink :: HasPath controller => Html -> controller -> BreadcrumbItem Source #

data BreadcrumbItem Source #

Constructors

BreadcrumbItem 

Fields

  • breadcrumbLabel :: Html

    The label of a single breadcrumbs item. May be HTML, thus use SVG or font icon.

  • url :: Maybe Text

    The URL of the item. If Nothing, it will only show the label.

Instances

Instances details
Show BreadcrumbItem Source # 
Instance details

Defined in IHP.Breadcrumb.Types

type String = [Char] #

class ViewFetchHelpMessage where Source #

This class provides helpful compile-time error messages when you use common controller functions inside of your views.

Methods

fetch :: a Source #

query :: a Source #

Instances

Instances details
(TypeError ('Text "\8216fetch\8216 or \8216query\8216 can only be used inside your controller actions. You have to call it from your controller action and then pass the result to the view.") :: Constraint) => ViewFetchHelpMessage Source # 
Instance details

Defined in IHP.ViewSupport

Methods

fetch :: a Source #

query :: a Source #

type LByteString = ByteString #

set :: forall model (name :: Symbol) value. (KnownSymbol name, SetField name model value) => Proxy name -> value -> model -> model Source #

Sets a field of a record and returns the new record.

Example:

data Project = Project { name :: Text, isPublic :: Bool }

let project = Project { name = "Hello World", isPublic = False }
>>> set #name "New Name" project
Project { name = "New Name", isPublic = False }
>>> set #isPublic True project
Project { name = "Hello World", isPublic = True }

data Maybe a #

Constructors

Nothing 
Just a 

Instances

Instances details
Arbitrary1 Maybe 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitrary :: Gen a -> Gen (Maybe a)

liftShrink :: (a -> [a]) -> Maybe a -> [Maybe a]

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

Hashable1 Maybe 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> Maybe a -> Int

Invariant Maybe 
Instance details

Defined in Data.Functor.Invariant

Methods

invmap :: (a -> b) -> (b -> a) -> Maybe a -> Maybe b

FoldableWithKey Maybe 
Instance details

Defined in Data.Key

Methods

toKeyedList :: Maybe a -> [(Key Maybe, a)]

foldMapWithKey :: Monoid m => (Key Maybe -> a -> m) -> Maybe a -> m

foldrWithKey :: (Key Maybe -> a -> b -> b) -> b -> Maybe a -> b

foldlWithKey :: (b -> Key Maybe -> a -> b) -> b -> Maybe a -> b

Indexable Maybe 
Instance details

Defined in Data.Key

Methods

index :: Maybe a -> Key Maybe -> a

Keyed Maybe 
Instance details

Defined in Data.Key

Methods

mapWithKey :: (Key Maybe -> a -> b) -> Maybe a -> Maybe b

Lookup Maybe 
Instance details

Defined in Data.Key

Methods

lookup :: Key Maybe -> Maybe a -> Maybe a

TraversableWithKey Maybe 
Instance details

Defined in Data.Key

Methods

traverseWithKey :: Applicative f => (Key Maybe -> a -> f b) -> Maybe a -> f (Maybe b)

mapWithKeyM :: Monad m => (Key Maybe -> a -> m b) -> Maybe a -> m (Maybe b)

Zip Maybe 
Instance details

Defined in Data.Key

Methods

zipWith :: (a -> b -> c) -> Maybe a -> Maybe b -> Maybe c

zip :: Maybe a -> Maybe b -> Maybe (a, b)

zap :: Maybe (a -> b) -> Maybe a -> Maybe b

ZipWithKey Maybe 
Instance details

Defined in Data.Key

Methods

zipWithKey :: (Key Maybe -> a -> b -> c) -> Maybe a -> Maybe b -> Maybe c

zapWithKey :: Maybe (Key Maybe -> a -> b) -> Maybe a -> Maybe b

Pointed Maybe 
Instance details

Defined in Data.Pointed

Methods

point :: a -> Maybe a

Crosswalk Maybe 
Instance details

Defined in Data.Crosswalk

Methods

crosswalk :: Align f => (a -> f b) -> Maybe a -> f (Maybe b)

sequenceL :: Align f => Maybe (f a) -> f (Maybe a)

Alt Maybe 
Instance details

Defined in Data.Functor.Alt

Methods

(<!>) :: Maybe a -> Maybe a -> Maybe a

some :: Applicative Maybe => Maybe a -> Maybe [a]

many :: Applicative Maybe => Maybe a -> Maybe [a]

Apply Maybe 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(<.>) :: Maybe (a -> b) -> Maybe a -> Maybe b

(.>) :: Maybe a -> Maybe b -> Maybe b

(<.) :: Maybe a -> Maybe b -> Maybe a

liftF2 :: (a -> b -> c) -> Maybe a -> Maybe b -> Maybe c

Bind Maybe 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(>>-) :: Maybe a -> (a -> Maybe b) -> Maybe b

join :: Maybe (Maybe a) -> Maybe a

Extend Maybe 
Instance details

Defined in Data.Functor.Extend

Methods

duplicated :: Maybe a -> Maybe (Maybe a)

extended :: (Maybe a -> b) -> Maybe a -> Maybe b

Plus Maybe 
Instance details

Defined in Data.Functor.Plus

Methods

zero :: Maybe a

Filterable Maybe 
Instance details

Defined in Witherable

Methods

mapMaybe :: (a -> Maybe b) -> Maybe a -> Maybe b

catMaybes :: Maybe (Maybe a) -> Maybe a

filter :: (a -> Bool) -> Maybe a -> Maybe a

Witherable Maybe 
Instance details

Defined in Witherable

Methods

wither :: Applicative f => (a -> f (Maybe b)) -> Maybe a -> f (Maybe b)

witherM :: Monad m => (a -> m (Maybe b)) -> Maybe a -> m (Maybe b)

filterA :: Applicative f => (a -> f Bool) -> Maybe a -> f (Maybe a)

witherMap :: Applicative m => (Maybe b -> r) -> (a -> m (Maybe b)) -> Maybe a -> m r

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

ComonadCofree Maybe NonEmpty 
Instance details

Defined in Control.Comonad.Cofree.Class

Methods

unwrap :: NonEmpty a -> Maybe (NonEmpty 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

MonadBase Maybe Maybe 
Instance details

Defined in Control.Monad.Base

Methods

liftBase :: Maybe α -> Maybe α

FilterableWithIndex () Maybe 
Instance details

Defined in Witherable

Methods

imapMaybe :: (() -> a -> Maybe b) -> Maybe a -> Maybe b

ifilter :: (() -> a -> Bool) -> Maybe a -> Maybe a

WitherableWithIndex () Maybe 
Instance details

Defined in Witherable

Methods

iwither :: Applicative f => (() -> a -> f (Maybe b)) -> Maybe a -> f (Maybe b)

iwitherM :: Monad m => (() -> a -> m (Maybe b)) -> Maybe a -> m (Maybe b)

ifilterA :: Applicative f => (() -> a -> f Bool) -> Maybe a -> f (Maybe a)

SetField "distinctClause" SQLQuery (Maybe ByteString) Source # 
Instance details

Defined in IHP.QueryBuilder

SetField "distinctOnClause" SQLQuery (Maybe ByteString) Source # 
Instance details

Defined in IHP.QueryBuilder

SetField "limitClause" SQLQuery (Maybe ByteString) Source # 
Instance details

Defined in IHP.QueryBuilder

SetField "offsetClause" SQLQuery (Maybe ByteString) Source # 
Instance details

Defined in IHP.QueryBuilder

SetField "queryIndex" SQLQuery (Maybe ByteString) Source # 
Instance details

Defined in IHP.QueryBuilder

SetField "whereCondition" SQLQuery (Maybe Condition) Source # 
Instance details

Defined in IHP.QueryBuilder

OutputableP env a => OutputableP env (Maybe a) 
Instance details

Defined in GHC.Utils.Outputable

Methods

pdoc :: env -> Maybe a -> SDoc

Lift a => Lift (Maybe a :: Type) 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Maybe a -> m Exp

liftTyped :: forall (m :: Type -> Type). Quote m => Maybe a -> Code m (Maybe a)

Structured a => Structured (Maybe a) 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy (Maybe a) -> Structure

structureHash' :: Tagged (Maybe a) MD5

Arbitrary a => Arbitrary (Maybe a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (Maybe a)

shrink :: Maybe a -> [Maybe a]

CoArbitrary a => CoArbitrary (Maybe a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Maybe a -> Gen b -> Gen b

Function a => Function (Maybe a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Maybe a -> b) -> Maybe a :-> b

Testable prop => Testable (Maybe prop) 
Instance details

Defined in Test.QuickCheck.Property

Methods

property :: Maybe prop -> Property

propertyForAllShrinkShow :: Gen a -> (a -> [a]) -> (a -> [String]) -> (a -> Maybe prop) -> Property

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

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) #

IsString string => IsString (Maybe string) Source #

Allows `Just "someThing"` to be written as `"someThing"`

Instance details

Defined in IHP.HaskellSupport

Methods

fromString :: String -> Maybe string #

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 #

NormalForm a => NormalForm (Maybe a) 
Instance details

Defined in Basement.NormalForm

Methods

toNormalForm :: Maybe a -> ()

Serialize a => Serialize (Maybe a) 
Instance details

Defined in Data.Serialize

Methods

put :: Putter (Maybe a)

get :: Get (Maybe a)

Default (Maybe a) 
Instance details

Defined in Data.Default.Class

Methods

def :: Maybe a #

NFData a => NFData (Maybe a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Maybe a -> () #

Outputable a => Outputable (Maybe a) 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Maybe a -> SDoc

Eq (DeBruijn a) => Eq (DeBruijn (Maybe a)) 
Instance details

Defined in GHC.Core.Map.Type

Methods

(==) :: DeBruijn (Maybe a) -> DeBruijn (Maybe a) -> Bool #

(/=) :: DeBruijn (Maybe a) -> DeBruijn (Maybe a) -> Bool #

Eq a => Eq (Maybe a) 
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 #

ToCxt a => ToCxt (Maybe a) 
Instance details

Defined in Language.Haskell.Meta.Syntax.Translate

Methods

toCxt :: Maybe a -> Cxt

ToDecs a => ToDecs (Maybe a) 
Instance details

Defined in Language.Haskell.Meta.Syntax.Translate

Methods

toDecs :: Maybe a -> [Dec]

ToDerivClauses a => ToDerivClauses (Maybe a) 
Instance details

Defined in Language.Haskell.Meta.Syntax.Translate

Methods

toDerivClauses :: Maybe a -> [DerivClause]

ToMaybeKind a => ToMaybeKind (Maybe a) 
Instance details

Defined in Language.Haskell.Meta.Syntax.Translate

Methods

toMaybeKind :: Maybe a -> Maybe Kind

ToNames a => ToNames (Maybe a) 
Instance details

Defined in Language.Haskell.Meta.Syntax.Translate

Methods

toNames :: Maybe a -> [Name]

ToTyVars a => ToTyVars (Maybe a) 
Instance details

Defined in Language.Haskell.Meta.Syntax.Translate

Methods

toTyVars :: Maybe a -> [TyVarBndr_ ()]

Match a => Match (Maybe a) 
Instance details

Defined in Network.HTTP.Accept

Methods

match :: Maybe a -> Maybe a -> Maybe Int

(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

ApplyAttribute attribute => ApplyAttribute (Maybe attribute) 
Instance details

Defined in IHP.HSX.Attribute

Methods

applyAttribute :: Text -> Text -> Maybe attribute -> Html -> Html

ToHtml a => ToHtml (Maybe a) 
Instance details

Defined in IHP.HSX.ToHtml

Methods

toHtml :: Maybe a -> Html #

At (Maybe a) 
Instance details

Defined in Control.Lens.At

Methods

at :: Index (Maybe a) -> Lens' (Maybe a) (Maybe (IxValue (Maybe a)))

Ixed (Maybe a) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (Maybe a) -> Traversal' (Maybe a) (IxValue (Maybe a))

AsEmpty (Maybe a) 
Instance details

Defined in Control.Lens.Empty

Methods

_Empty :: Prism' (Maybe a) ()

HasTypeVars t => HasTypeVars (Maybe t) 
Instance details

Defined in Language.Haskell.TH.Lens

Methods

typeVarsEx :: Set Name -> Traversal' (Maybe t) Name

VerifiyPassword (Maybe Text) Source # 
Instance details

Defined in IHP.AuthSupport.Authentication

ParamReader param => ParamReader (Maybe param) Source # 
Instance details

Defined in IHP.Controller.Param

IsEmpty (Maybe value) Source # 
Instance details

Defined in IHP.HaskellSupport

Methods

isEmpty :: Maybe value -> Bool Source #

InputValue fieldType => InputValue (Maybe fieldType) Source # 
Instance details

Defined in IHP.ModelSupport

Methods

inputValue :: Maybe fieldType -> Text Source #

EqOrIsOperator (Maybe something) Source # 
Instance details

Defined in IHP.QueryBuilder

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) #

FromField a => FromField (Maybe a) 
Instance details

Defined in Database.PostgreSQL.Simple.FromField

Methods

fromField :: FieldParser (Maybe a)

FromField a => FromRow (Maybe (Only a)) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe (Only a))

FromField a => FromRow (Maybe (Vector a)) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe (Vector a))

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f, FromField g, FromField h, FromField i, FromField j) => FromRow (Maybe (a, b, c, d, e, f, g, h, i, j)) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe (a, b, c, d, e, f, g, h, i, j))

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f, FromField g, FromField h, FromField i, FromField j, FromField k) => FromRow (Maybe (a, b, c, d, e, f, g, h, i, j, k)) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe (a, b, c, d, e, f, g, h, i, j, k))

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f, FromField g, FromField h, FromField i, FromField j, FromField k, FromField l) => FromRow (Maybe (a, b, c, d, e, f, g, h, i, j, k, l)) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe (a, b, c, d, e, f, g, h, i, j, k, l))

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f, FromField g, FromField h, FromField i, FromField j, FromField k, FromField l, FromField m) => FromRow (Maybe (a, b, c, d, e, f, g, h, i, j, k, l, m)) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe (a, b, c, d, e, f, g, h, i, j, k, l, m))

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f, FromField g, FromField h, FromField i, FromField j, FromField k, FromField l, FromField m, FromField n) => FromRow (Maybe (a, b, c, d, e, f, g, h, i, j, k, l, m, n)) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe (a, b, c, d, e, f, g, h, i, j, k, l, m, n))

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f, FromField g, FromField h, FromField i, FromField j, FromField k, FromField l, FromField m, FromField n, FromField o) => FromRow (Maybe (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o))

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f, FromField g, FromField h, FromField i, FromField j, FromField k, FromField l, FromField m, FromField n, FromField o, FromField p) => FromRow (Maybe (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p)) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p))

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f, FromField g, FromField h, FromField i, FromField j, FromField k, FromField l, FromField m, FromField n, FromField o, FromField p, FromField q) => FromRow (Maybe (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q)) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q))

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f, FromField g, FromField h, FromField i, FromField j, FromField k, FromField l, FromField m, FromField n, FromField o, FromField p, FromField q, FromField r) => FromRow (Maybe (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r)) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r))

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f, FromField g, FromField h, FromField i, FromField j, FromField k, FromField l, FromField m, FromField n, FromField o, FromField p, FromField q, FromField r, FromField s) => FromRow (Maybe (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s)) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s))

(FromField a, FromField b) => FromRow (Maybe (a, b)) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe (a, b))

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f, FromField g, FromField h, FromField i, FromField j, FromField k, FromField l, FromField m, FromField n, FromField o, FromField p, FromField q, FromField r, FromField s, FromField t) => FromRow (Maybe (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t)) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o, p, q, r, s, t))

(FromField a, FromField b, FromField c) => FromRow (Maybe (a, b, c)) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe (a, b, c))

(FromField a, FromField b, FromField c, FromField d) => FromRow (Maybe (a, b, c, d)) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe (a, b, c, d))

(FromField a, FromField b, FromField c, FromField d, FromField e) => FromRow (Maybe (a, b, c, d, e)) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe (a, b, c, d, e))

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f) => FromRow (Maybe (a, b, c, d, e, f)) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe (a, b, c, d, e, f))

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f, FromField g) => FromRow (Maybe (a, b, c, d, e, f, g)) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe (a, b, c, d, e, f, g))

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f, FromField g, FromField h) => FromRow (Maybe (a, b, c, d, e, f, g, h)) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe (a, b, c, d, e, f, g, h))

(FromField a, FromField b, FromField c, FromField d, FromField e, FromField f, FromField g, FromField h, FromField i) => FromRow (Maybe (a, b, c, d, e, f, g, h, i)) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe (a, b, c, d, e, f, g, h, i))

FromField a => FromRow (Maybe [a]) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe [a])

ToField a => ToField (Maybe a) 
Instance details

Defined in Database.PostgreSQL.Simple.ToField

Methods

toField :: Maybe a -> Action

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

Boolean (Maybe a) 
Instance details

Defined in Text.XML.Cursor

Methods

bool :: Maybe a -> Bool

(model ~ GetModelById (Id' table), GetTableName model ~ table, FilterPrimaryKey table) => Fetchable (Maybe (Id' table)) model Source # 
Instance details

Defined in IHP.Fetch

Associated Types

type FetchResult (Maybe (Id' table)) model 
Instance details

Defined in IHP.Fetch

type FetchResult (Maybe (Id' table)) model = [model]

Methods

fetch :: Maybe (Id' table) -> IO (FetchResult (Maybe (Id' table)) model) Source #

fetchOneOrNothing :: Maybe (Id' table) -> IO (Maybe model) Source #

fetchOne :: Maybe (Id' table) -> IO model Source #

SingI ('Nothing :: Maybe a) 
Instance details

Defined in GHC.Generics

Methods

sing :: Sing ('Nothing :: Maybe a)

Strict (Maybe a) (Maybe a) 
Instance details

Defined in Data.Strict.Classes

Methods

toStrict :: Maybe a -> Maybe a

toLazy :: Maybe a -> Maybe a

Each (Maybe a) (Maybe b) a b 
Instance details

Defined in Control.Lens.Each

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)

From (Maybe a) (Either () a) 
Instance details

Defined in Basement.From

Methods

from :: Maybe a -> Either () a

type Failure Maybe 
Instance details

Defined in Basement.Monad

type Failure Maybe = ()
type Key Maybe 
Instance details

Defined in Data.Key

type Key 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 Anno (Maybe Role) 
Instance details

Defined in GHC.Hs.Decls

type Anno (Maybe Role) = SrcAnn NoEpAnns
type Anno (Maybe Role) 
Instance details

Defined in GHC.Hs.Decls

type Anno (Maybe Role) = SrcAnn NoEpAnns
type Index (Maybe a) 
Instance details

Defined in Control.Lens.At

type Index (Maybe a) = ()
type IxValue (Maybe a) 
Instance details

Defined in Control.Lens.At

type IxValue (Maybe a) = a
type Element (Maybe a) 
Instance details

Defined in Data.MonoTraversable

type Element (Maybe a) = a
type FetchResult (Maybe (Id' table)) model Source # 
Instance details

Defined in IHP.Fetch

type FetchResult (Maybe (Id' table)) model = [model]

renderFlashMessages :: (?context :: ControllerContext) => Html Source #

Displays the flash messages for the current request.

You can add a flash message to the next request by calling setSuccessMessage or setErrorMessage:

action CreateProjectAction = do
    ...
    setSuccessMessage "Your project has been created successfully"
    redirectTo ShowProjectAction { .. }
action CreateTeamAction = do
    unless userOnPaidPlan do
        setErrorMessage "This requires you to be on the paid plan"
        redirectTo NewTeamAction

    ...

For success messages, the text message is wrapped in a class="alert alert-success".../div, which is automatically styled by bootstrap. Errors flash messages are wraped in class="alert alert-danger".../div.

withTransaction :: (?modelContext :: ModelContext) => ((?modelContext :: ModelContext) => IO a) -> IO a Source #

Executes the given block with a database transaction

Example:

withTransaction do
   company <- newRecord @Company |> createRecord

   -- When creating the user fails, there will be no company left over
   user <- newRecord @User
       |> set #companyId company.id
       |> createRecord

   company <- company
       |> set #ownerId user.id
       |> updateRecord

data Char #

Instances

Instances details
Structured Char 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy Char -> Structure

structureHash' :: Tagged Char MD5

ListAssertable Char 
Instance details

Defined in Test.HUnit.Base

Methods

listAssert :: [Char] -> Assertion

Arbitrary Char 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen Char

shrink :: Char -> [Char]

CoArbitrary Char 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Char -> Gen b -> Gen b

Function Char 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Char -> b) -> Char :-> b

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

ToJSON Char 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Char 
Instance details

Defined in Data.Aeson.Types.ToJSON

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

Methods

succ :: Char -> Char #

pred :: Char -> Char #

toEnum :: Int -> Char #

fromEnum :: Char -> Int #

enumFrom :: Char -> [Char] #

enumFromThen :: Char -> Char -> [Char] #

enumFromTo :: Char -> Char -> [Char] #

enumFromThenTo :: Char -> Char -> Char -> [Char] #

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

NormalForm Char 
Instance details

Defined in Basement.NormalForm

Methods

toNormalForm :: Char -> ()

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 ()

ToMarkup String 
Instance details

Defined in Text.Blaze

Methods

toMarkup :: String -> Markup

preEscapedToMarkup :: String -> Markup

ToMarkup Char 
Instance details

Defined in Text.Blaze

Methods

toMarkup :: Char -> Markup

preEscapedToMarkup :: Char -> Markup

ToValue String 
Instance details

Defined in Text.Blaze

Methods

toValue :: String -> AttributeValue

preEscapedToValue :: String -> AttributeValue

ToValue Char 
Instance details

Defined in Text.Blaze

Methods

toValue :: Char -> AttributeValue

preEscapedToValue :: Char -> AttributeValue

ToBuilder String 
Instance details

Defined in Data.Bytes.Builder.Class

Methods

toBuilder :: String -> Builder

FoldCase Char 
Instance details

Defined in Data.CaseInsensitive.Internal

Methods

foldCase :: Char -> Char

foldCaseList :: [Char] -> [Char]

Serialize Char 
Instance details

Defined in Data.Serialize

Methods

put :: Putter Char

get :: Get Char

NFData Char 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Char -> () #

ToLogStr String 
Instance details

Defined in System.Log.FastLogger.LogStr

Methods

toLogStr :: String -> LogStr #

ToJExpr Char 
Instance details

Defined in GHC.JS.Make

Methods

toJExpr :: Char -> JExpr

toJExprFromList :: [Char] -> JExpr

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 #

ToLit String 
Instance details

Defined in Language.Haskell.Meta.Syntax.Translate

Methods

toLit :: String -> Lit

ToLit Char 
Instance details

Defined in Language.Haskell.Meta.Syntax.Translate

Methods

toLit :: Char -> Lit

ToName String 
Instance details

Defined in Language.Haskell.Meta.Syntax.Translate

Methods

toName :: String -> Name

HpcHash Char 
Instance details

Defined in Trace.Hpc.Util

Methods

toHash :: Char -> Hash

ToHtml String 
Instance details

Defined in IHP.HSX.ToHtml

Methods

toHtml :: String -> Html #

IsText String 
Instance details

Defined in Data.Text.Lens

Methods

packed :: Iso' String String

builder :: Iso' String Builder

text :: IndexedTraversal' Int String Char

AsJSON String 
Instance details

Defined in Data.Aeson.Lens

Methods

_JSON :: (FromJSON a, ToJSON b) => Prism String String a b

AsNumber String 
Instance details

Defined in Data.Aeson.Lens

Methods

_Number :: Prism' String Scientific

_Double :: Prism' String Double

_Integer :: Prism' String Integer

AsValue String 
Instance details

Defined in Data.Aeson.Lens

Methods

_Value :: Prism' String Value

_String :: Prism' String Text

_Bool :: Prism' String Bool

_Null :: Prism' String ()

_Object :: Prism' String (KeyMap Value)

_Array :: Prism' String (Vector Value)

IsKey String 
Instance details

Defined in Data.Aeson.Lens

Methods

_Key :: Iso' String Key

EnvVarReader String Source # 
Instance details

Defined in IHP.EnvVar

TraversableStream String 
Instance details

Defined in Text.Megaparsec.Stream

Methods

reachOffset :: Int -> PosState String -> (Maybe String, PosState String)

reachOffsetNoLine :: Int -> PosState String -> PosState String

VisualStream String 
Instance details

Defined in Text.Megaparsec.Stream

Methods

showTokens :: Proxy String -> NonEmpty (Token String) -> String

tokensLength :: Proxy String -> NonEmpty (Token String) -> Int

FromField Char 
Instance details

Defined in Database.PostgreSQL.Simple.FromField

Methods

fromField :: FieldParser Char

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

Prim Char 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: Char -> Int#

alignment# :: Char -> Int#

indexByteArray# :: ByteArray# -> Int# -> Char

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, Char #)

writeByteArray# :: MutableByteArray# s -> Int# -> Char -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> Char -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> Char

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, Char #)

writeOffAddr# :: Addr# -> Int# -> Char -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> Char -> State# s -> State# s

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

Extract String 
Instance details

Defined in Text.Regex.Base.RegexLike

ToLText String 
Instance details

Defined in Relude.String.Conversion

Methods

toLText :: String -> LText

ToString String 
Instance details

Defined in Relude.String.Conversion

Methods

toString :: String -> String

ToText String 
Instance details

Defined in Relude.String.Conversion

Methods

toText :: String -> Text

Random Char 
Instance details

Defined in System.Random.TF.Instances

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]

Unbox Char 
Instance details

Defined in Data.Vector.Unboxed.Base

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)

ToBuilder Char Builder 
Instance details

Defined in Data.Builder

Methods

toBuilder :: Char -> Builder #

ToBuilder Char Builder 
Instance details

Defined in Data.Builder

Methods

toBuilder :: Char -> Builder #

ConvertUtf8 String ByteString 
Instance details

Defined in Relude.String.Conversion

ConvertUtf8 String ShortByteString 
Instance details

Defined in Relude.String.Conversion

Methods

encodeUtf8 :: String -> ShortByteString

decodeUtf8 :: ShortByteString -> String

decodeUtf8Strict :: ShortByteString -> Either UnicodeException String

ConvertUtf8 String LByteString 
Instance details

Defined in Relude.String.Conversion

Methods

encodeUtf8 :: String -> LByteString

decodeUtf8 :: LByteString -> String

decodeUtf8Strict :: LByteString -> Either UnicodeException String

ConvertibleStrings LazyByteString String 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: LazyByteString -> String #

ConvertibleStrings LazyText String 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: LazyText -> String #

ConvertibleStrings StrictByteString String 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: StrictByteString -> String #

ConvertibleStrings StrictText String 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: StrictText -> String #

ConvertibleStrings String LazyByteString 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: String -> LazyByteString #

ConvertibleStrings String LazyText 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: String -> LazyText #

ConvertibleStrings String StrictByteString 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: String -> StrictByteString #

ConvertibleStrings String StrictText 
Instance details

Defined in Data.String.Conversions

Methods

convertString :: String -> StrictText #

ConvertibleStrings String String 
Instance details

Defined in Data.String.Conversions

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))

Monad m => Stream ByteString m Char 
Instance details

Defined in Text.Parsec.Prim

Methods

uncons :: ByteString -> m (Maybe (Char, ByteString))

Monad m => Stream ByteString m Char 
Instance details

Defined in Text.Parsec.Prim

Methods

uncons :: ByteString -> m (Maybe (Char, ByteString))

Monad m => Stream Text m Char 
Instance details

Defined in Text.Parsec.Prim

Methods

uncons :: Text -> m (Maybe (Char, Text))

Monad m => Stream Text m Char 
Instance details

Defined in Text.Parsec.Prim

Methods

uncons :: Text -> m (Maybe (Char, Text))

KnownSymbol n => Reifies (n :: Symbol) String 
Instance details

Defined in Data.Reflection

Methods

reflect :: proxy n -> String

Cons Text Text Char Char 
Instance details

Defined in Control.Lens.Cons

Methods

_Cons :: Prism Text Text (Char, Text) (Char, Text)

Cons Text Text Char Char 
Instance details

Defined in Control.Lens.Cons

Methods

_Cons :: Prism Text Text (Char, Text) (Char, Text)

Snoc Text Text Char Char 
Instance details

Defined in Control.Lens.Cons

Methods

_Snoc :: Prism Text Text (Text, Char) (Text, Char)

Snoc Text Text Char Char 
Instance details

Defined in Control.Lens.Cons

Methods

_Snoc :: Prism Text Text (Text, Char) (Text, Char)

GEq1 v (UChar :: Type -> Type) 
Instance details

Defined in Data.Functor.Classes.Generic.Internal

Methods

gliftEq :: Eq1Args v a b -> UChar a -> UChar b -> Bool

GOrd1 v (UChar :: Type -> Type) 
Instance details

Defined in Data.Functor.Classes.Generic.Internal

Methods

gliftCompare :: Ord1Args v a b -> UChar a -> UChar b -> Ordering

GShow1Con v (UChar :: Type -> Type) 
Instance details

Defined in Data.Functor.Classes.Generic.Internal

Methods

gliftShowsPrecCon :: Options -> ConType -> Show1Args v a -> Int -> UChar a -> ShowS

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) #

ToMarkup (NonEmpty Char) 
Instance details

Defined in Text.Blaze

Methods

toMarkup :: NonEmpty Char -> Markup

preEscapedToMarkup :: NonEmpty Char -> Markup

ToValue (NonEmpty Char) 
Instance details

Defined in Text.Blaze

Methods

toValue :: NonEmpty Char -> AttributeValue

preEscapedToValue :: NonEmpty Char -> AttributeValue

QueryKeyLike [Char] 
Instance details

Defined in Network.HTTP.Types.QueryLike

Methods

toQueryKey :: [Char] -> ByteString

QueryValueLike [Char] 
Instance details

Defined in Network.HTTP.Types.QueryLike

Invariant (UChar :: Type -> Type) 
Instance details

Defined in Data.Functor.Invariant

Methods

invmap :: (a -> b) -> (b -> a) -> UChar a -> UChar b

FromField [Char] 
Instance details

Defined in Database.PostgreSQL.Simple.FromField

Methods

fromField :: FieldParser [Char]

ToField [Char] 
Instance details

Defined in Database.PostgreSQL.Simple.ToField

Methods

toField :: [Char] -> Action

Uncons (Seq Char) 
Instance details

Defined in Text.Regex.TDFA.NewDFA.Uncons

Methods

uncons :: Seq Char -> Maybe (Char, Seq Char)

Uncons [Char] 
Instance details

Defined in Text.Regex.TDFA.NewDFA.Uncons

Methods

uncons :: [Char] -> Maybe (Char, [Char])

OutputCap [Char] 
Instance details

Defined in System.Console.Terminfo.Base

Methods

hasOkPadding :: [Char] -> String -> Bool

outputCap :: ([Int] -> String) -> [Int] -> [Char]

TermStr [Char] 
Instance details

Defined in System.Console.Terminfo.Base

IsNullaryCon (UChar :: Type -> Type) 
Instance details

Defined in Data.Functor.Classes.Generic.Internal

Methods

isNullaryCon :: UChar a -> Bool

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 ()

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 #

ToJExpr a => ToJExpr (Map String a) 
Instance details

Defined in GHC.JS.Make

Methods

toJExpr :: Map String a -> JExpr

toJExprFromList :: [Map String a] -> JExpr

GEq (UChar p) 
Instance details

Defined in Data.Functor.Classes.Generic.Internal

Methods

geq :: UChar p -> UChar p -> Bool

GOrd (UChar p) 
Instance details

Defined in Data.Functor.Classes.Generic.Internal

Methods

gcompare :: UChar p -> UChar p -> Ordering

GShowCon (UChar p) 
Instance details

Defined in Data.Functor.Classes.Generic.Internal

Methods

gshowsPrecCon :: Options -> ConType -> Int -> UChar p -> ShowS

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 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

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

Example Expectation 
Instance details

Defined in Test.Hspec.Core.Example

Associated Types

type Arg Expectation 
Instance details

Defined in Test.Hspec.Core.Example

type Arg Expectation = ()

Methods

evaluateExample :: Expectation -> Params -> (ActionWith (Arg Expectation) -> IO ()) -> ProgressCallback -> IO Result

Invariant IO 
Instance details

Defined in Data.Functor.Invariant

Methods

invmap :: (a -> b) -> (b -> a) -> IO a -> IO b

Pointed IO 
Instance details

Defined in Data.Pointed

Methods

point :: a -> IO a

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

Methods

primitive :: (State# (PrimState IO) -> (# State# (PrimState IO), a #)) -> IO a

Alt IO 
Instance details

Defined in Data.Functor.Alt

Methods

(<!>) :: IO a -> IO a -> IO a

some :: Applicative IO => IO a -> IO [a]

many :: Applicative IO => IO a -> IO [a]

Apply IO 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(<.>) :: IO (a -> b) -> IO a -> IO b

(.>) :: IO a -> IO b -> IO b

(<.) :: IO a -> IO b -> IO a

liftF2 :: (a -> b -> c) -> IO a -> IO b -> IO c

Bind IO 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(>>-) :: IO a -> (a -> IO b) -> IO b

join :: IO (IO a) -> IO a

Plus IO 
Instance details

Defined in Data.Functor.Plus

Methods

zero :: 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 #

ToApplication Application 
Instance details

Defined in Network.Wai.UrlMap

Methods

toApplication :: Application -> Application

ToApplication UrlMap 
Instance details

Defined in Network.Wai.UrlMap

Methods

toApplication :: UrlMap -> Application

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

MonadBase IO IO 
Instance details

Defined in Control.Monad.Base

Methods

liftBase :: IO α -> IO α

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 Data.Primitive.TArray.Classic

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 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 ()

Handleable SomeException IO Handler 
Instance details

Defined in Control.Lens.Internal.Exception

Methods

handler :: Typeable a => Getting (First a) SomeException a -> (a -> IO r) -> Handler r

handler_ :: Typeable a => Getting (First a) SomeException a -> IO r -> Handler r

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 ()

Assertable t => Assertable (IO t) 
Instance details

Defined in Test.HUnit.Base

Methods

assert :: IO t -> Assertion

AssertionPredicable t => AssertionPredicable (IO t) 
Instance details

Defined in Test.HUnit.Base

Methods

assertionPredicate :: IO t -> AssertionPredicate

Assertable t => Testable (IO t) 
Instance details

Defined in Test.HUnit.Base

Methods

test :: IO t -> Test

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

Default a => Default (IO a) 
Instance details

Defined in Data.Default.Class

Methods

def :: IO a #

IsFormatter (IO Formatter) 
Instance details

Defined in Test.Hspec.Discover

Methods

toFormatter :: IO Formatter -> IO Formatter

(TypeError ('Text "Use 'let x = param \"..\"' instead of 'x <- param \"..\"'") :: Constraint) => ParamReader (IO param) Source #

Custom error hint when the param is called with do-notation

Example:

action Example = do
    myParam <- param "hello"

Now a custom type error will be shown telling the user to use let myParam = param "hello" instead of do-notation.

Instance details

Defined in IHP.Controller.Param

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 #

HasGetter (IO a) a 
Instance details

Defined in Data.StateVar

Methods

get :: MonadIO m => IO a -> m a

Example (a -> Expectation) 
Instance details

Defined in Test.Hspec.Core.Example

Associated Types

type Arg (a -> Expectation) 
Instance details

Defined in Test.Hspec.Core.Example

type Arg (a -> Expectation) = a

Methods

evaluateExample :: (a -> Expectation) -> Params -> (ActionWith (Arg (a -> Expectation)) -> IO ()) -> ProgressCallback -> IO Result

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 Arg Expectation 
Instance details

Defined in Test.Hspec.Core.Example

type Arg Expectation = ()
type PrimState IO 
Instance details

Defined in Control.Monad.Primitive

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
type Arg (a -> Expectation) 
Instance details

Defined in Test.Hspec.Core.Example

type Arg (a -> Expectation) = a

setLayout :: (?context :: ControllerContext) => ((?context :: ControllerContext) => Layout) -> IO () Source #

newtype ViewLayout Source #

Constructors

ViewLayout ((?context :: ControllerContext) => Layout) 

data Either a b #

Constructors

Left a 
Right b 

Instances

Instances details
Arbitrary2 Either 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitrary2 :: Gen a -> Gen b -> Gen (Either a b)

liftShrink2 :: (a -> [a]) -> (b -> [b]) -> Either a b -> [Either a b]

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 #

Assoc Either 
Instance details

Defined in Data.Bifunctor.Assoc

Methods

assoc :: Either (Either a b) c -> Either a (Either b c)

unassoc :: Either a (Either b c) -> Either (Either a b) c

Swap Either 
Instance details

Defined in Data.Bifunctor.Swap

Methods

swap :: Either a b -> Either b a

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

Invariant2 Either 
Instance details

Defined in Data.Functor.Invariant

Methods

invmap2 :: (a -> c) -> (c -> a) -> (b -> d) -> (d -> b) -> Either a b -> Either c d

Bicrosswalk Either 
Instance details

Defined in Data.Crosswalk

Methods

bicrosswalk :: Align f => (a -> f c) -> (b -> f d) -> Either a b -> f (Either c d)

bisequenceL :: Align f => Either (f a) (f b) -> f (Either a b)

Bitraversable1 Either 
Instance details

Defined in Data.Semigroup.Traversable.Class

Methods

bitraverse1 :: Apply f => (a -> f b) -> (c -> f d) -> Either a c -> f (Either b d)

bisequence1 :: Apply f => Either (f a) (f b) -> f (Either a b)

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)

Arbitrary a => Arbitrary1 (Either a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitrary :: Gen a0 -> Gen (Either a a0)

liftShrink :: (a0 -> [a0]) -> Either a a0 -> [Either a a0]

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

Hashable a => Hashable1 (Either a) 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a0 -> Int) -> Int -> Either a a0 -> Int

Invariant (Either a) 
Instance details

Defined in Data.Functor.Invariant

Methods

invmap :: (a0 -> b) -> (b -> a0) -> Either a a0 -> Either a b

Pointed (Either a) 
Instance details

Defined in Data.Pointed

Methods

point :: a0 -> Either a a0

Alt (Either a) 
Instance details

Defined in Data.Functor.Alt

Methods

(<!>) :: Either a a0 -> Either a a0 -> Either a a0

some :: Applicative (Either a) => Either a a0 -> Either a [a0]

many :: Applicative (Either a) => Either a a0 -> Either a [a0]

Apply (Either a) 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(<.>) :: Either a (a0 -> b) -> Either a a0 -> Either a b

(.>) :: Either a a0 -> Either a b -> Either a b

(<.) :: Either a a0 -> Either a b -> Either a a0

liftF2 :: (a0 -> b -> c) -> Either a a0 -> Either a b -> Either a c

Bind (Either a) 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(>>-) :: Either a a0 -> (a0 -> Either a b) -> Either a b

join :: Either a (Either a a0) -> Either a a0

Extend (Either a) 
Instance details

Defined in Data.Functor.Extend

Methods

duplicated :: Either a a0 -> Either a (Either a a0)

extended :: (Either a a0 -> b) -> Either a a0 -> Either a b

Monoid e => Filterable (Either e) 
Instance details

Defined in Witherable

Methods

mapMaybe :: (a -> Maybe b) -> Either e a -> Either e b

catMaybes :: Either e (Maybe a) -> Either e a

filter :: (a -> Bool) -> Either e a -> Either e a

Monoid e => Witherable (Either e) 
Instance details

Defined in Witherable

Methods

wither :: Applicative f => (a -> f (Maybe b)) -> Either e a -> f (Either e b)

witherM :: Monad m => (a -> m (Maybe b)) -> Either e a -> m (Either e b)

filterA :: Applicative f => (a -> f Bool) -> Either e a -> f (Either e a)

witherMap :: Applicative m => (Either e b -> r) -> (a -> m (Maybe b)) -> Either e a -> m r

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

MonadBase (Either e) (Either e) 
Instance details

Defined in Control.Monad.Base

Methods

liftBase :: Either e α -> Either e α

From (Maybe a) (Either () a) 
Instance details

Defined in Basement.From

Methods

from :: Maybe a -> Either () 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

(Arbitrary a, Arbitrary b) => Arbitrary (Either a b) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (Either a b)

shrink :: Either a b -> [Either a b]

(CoArbitrary a, CoArbitrary b) => CoArbitrary (Either a b) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Either a b -> Gen b0 -> Gen b0

(Function a, Function b) => Function (Either a b) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Either a b -> b0) -> Either a b :-> b0

(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 #

(NormalForm l, NormalForm r) => NormalForm (Either l r) 
Instance details

Defined in Basement.NormalForm

Methods

toNormalForm :: Either l r -> ()

(Serialize a, Serialize b) => Serialize (Either a b) 
Instance details

Defined in Data.Serialize

Methods

put :: Putter (Either a b)

get :: Get (Either a b)

(NFData a, NFData b) => NFData (Either a b) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Either a b -> () #

(Outputable a, Outputable b) => Outputable (Either a b) 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Either a b -> SDoc

(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 #

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) #

(FromField a, FromField b) => FromField (Either a b) 
Instance details

Defined in Database.PostgreSQL.Simple.FromField

Methods

fromField :: FieldParser (Either a b)

(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

(Lexicographic a, Lexicographic b) => Lexicographic (Either a b) 
Instance details

Defined in Data.Vector.Algorithms.AmericanFlag

Methods

extent :: Either a b -> Int

size :: Proxy (Either a b) -> Int

index :: Int -> Either a b -> Int

Boolean (Either a b) 
Instance details

Defined in Text.XML.Cursor

Methods

bool :: Either a b -> Bool

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

From (Either a b) (These a b) 
Instance details

Defined in Basement.From

Methods

from :: Either a b -> These a b

Strict (Either a b) (Either a b) 
Instance details

Defined in Data.Strict.Classes

Methods

toStrict :: Either a b -> Either a b

toLazy :: Either a b -> Either a b

(a ~ a', b ~ b') => Each (Either a a') (Either b b') a b 
Instance details

Defined in Control.Lens.Each

Methods

each :: Traversal (Either a a') (Either b b') a b

(FilterableWithIndex i f, FilterableWithIndex j g) => FilterableWithIndex (Either i j) (Product f g) 
Instance details

Defined in Witherable

Methods

imapMaybe :: (Either i j -> a -> Maybe b) -> Product f g a -> Product f g b

ifilter :: (Either i j -> a -> Bool) -> Product f g a -> Product f g a

(FilterableWithIndex i f, FilterableWithIndex j g) => FilterableWithIndex (Either i j) (Sum f g) 
Instance details

Defined in Witherable

Methods

imapMaybe :: (Either i j -> a -> Maybe b) -> Sum f g a -> Sum f g b

ifilter :: (Either i j -> a -> Bool) -> Sum f g a -> Sum f g a

(WitherableWithIndex i f, WitherableWithIndex j g) => WitherableWithIndex (Either i j) (Product f g) 
Instance details

Defined in Witherable

Methods

iwither :: Applicative f0 => (Either i j -> a -> f0 (Maybe b)) -> Product f g a -> f0 (Product f g b)

iwitherM :: Monad m => (Either i j -> a -> m (Maybe b)) -> Product f g a -> m (Product f g b)

ifilterA :: Applicative f0 => (Either i j -> a -> f0 Bool) -> Product f g a -> f0 (Product f g a)

(WitherableWithIndex i f, WitherableWithIndex j g) => WitherableWithIndex (Either i j) (Sum f g) 
Instance details

Defined in Witherable

Methods

iwither :: Applicative f0 => (Either i j -> a -> f0 (Maybe b)) -> Sum f g a -> f0 (Sum f g b)

iwitherM :: Monad m => (Either i j -> a -> m (Maybe b)) -> Sum f g a -> m (Sum f g b)

ifilterA :: Applicative f0 => (Either i j -> a -> f0 Bool) -> Sum f g a -> f0 (Sum f g a)

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

data Float #

Instances

Instances details
Structured Float 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy Float -> Structure

structureHash' :: Tagged Float MD5

Arbitrary Float 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen Float

shrink :: Float -> [Float]

CoArbitrary Float 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Float -> Gen b -> Gen b

Function Float 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Float -> b) -> Float :-> b

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

ToJSON Float 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Float 
Instance details

Defined in Data.Aeson.Types.ToJSON

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

Fractional Float 
Instance details

Defined in Basement.Compat.NumLiteral

HasNegation Float 
Instance details

Defined in Basement.Compat.NumLiteral

Methods

negate :: Float -> Float

Integral Float 
Instance details

Defined in Basement.Compat.NumLiteral

NormalForm Float 
Instance details

Defined in Basement.NormalForm

Methods

toNormalForm :: Float -> ()

Additive Float 
Instance details

Defined in Basement.Numerical.Additive

Methods

azero :: Float

(+) :: Float -> Float -> Float

scale :: IsNatural n => n -> Float -> Float

Divisible Float 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

(/) :: Float -> Float -> Float

Multiplicative Float 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

midentity :: Float

(*) :: Float -> Float -> Float

(^) :: (IsNatural n, Enum n, IDivisible n) => Float -> n -> Float

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 ()

ToMarkup Float 
Instance details

Defined in Text.Blaze

Methods

toMarkup :: Float -> Markup

preEscapedToMarkup :: Float -> Markup

ToValue Float 
Instance details

Defined in Text.Blaze

Methods

toValue :: Float -> AttributeValue

preEscapedToValue :: Float -> AttributeValue

Serialize Float 
Instance details

Defined in Data.Serialize

Methods

put :: Putter Float

get :: Get Float

Default Float 
Instance details

Defined in Data.Default.Class

Methods

def :: Float #

NFData Float 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Float -> () #

ToLogStr Float 
Instance details

Defined in System.Log.FastLogger.LogStr

Methods

toLogStr :: Float -> LogStr #

Outputable Float 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Float -> SDoc

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 #

ToLit Float 
Instance details

Defined in Language.Haskell.Meta.Syntax.Translate

Methods

toLit :: Float -> Lit

ParamReader Float Source # 
Instance details

Defined in IHP.Controller.Param

InputValue Float Source # 
Instance details

Defined in IHP.ModelSupport

FromField Float 
Instance details

Defined in Database.PostgreSQL.Simple.FromField

Methods

fromField :: FieldParser Float

ToField Float 
Instance details

Defined in Database.PostgreSQL.Simple.ToField

Methods

toField :: Float -> Action

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

Prim Float 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: Float -> Int#

alignment# :: Float -> Int#

indexByteArray# :: ByteArray# -> Int# -> Float

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, Float #)

writeByteArray# :: MutableByteArray# s -> Int# -> Float -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> Float -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> Float

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, Float #)

writeOffAddr# :: Addr# -> Int# -> Float -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> Float -> State# s -> State# s

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

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 ()

GEq1 v (UFloat :: Type -> Type) 
Instance details

Defined in Data.Functor.Classes.Generic.Internal

Methods

gliftEq :: Eq1Args v a b -> UFloat a -> UFloat b -> Bool

GOrd1 v (UFloat :: Type -> Type) 
Instance details

Defined in Data.Functor.Classes.Generic.Internal

Methods

gliftCompare :: Ord1Args v a b -> UFloat a -> UFloat b -> Ordering

GShow1Con v (UFloat :: Type -> Type) 
Instance details

Defined in Data.Functor.Classes.Generic.Internal

Methods

gliftShowsPrecCon :: Options -> ConType -> Show1Args v a -> Int -> UFloat a -> ShowS

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) #

Invariant (UFloat :: Type -> Type) 
Instance details

Defined in Data.Functor.Invariant

Methods

invmap :: (a -> b) -> (b -> a) -> UFloat a -> UFloat b

ToField (PGRange Float) 
Instance details

Defined in Database.PostgreSQL.Simple.Range

Methods

toField :: PGRange Float -> Action

IsNullaryCon (UFloat :: Type -> Type) 
Instance details

Defined in Data.Functor.Classes.Generic.Internal

Methods

isNullaryCon :: UFloat a -> Bool

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 Data.Functor.Classes.Generic.Internal

Methods

geq :: UFloat p -> UFloat p -> Bool

GOrd (UFloat p) 
Instance details

Defined in Data.Functor.Classes.Generic.Internal

Methods

gcompare :: UFloat p -> UFloat p -> Ordering

GShowCon (UFloat p) 
Instance details

Defined in Data.Functor.Classes.Generic.Internal

Methods

gshowsPrecCon :: Options -> ConType -> Int -> 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 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 #

Zip Vector 
Instance details

Defined in Data.ChunkedZip

Methods

zipWith :: (a -> b -> c) -> Vector a -> Vector b -> Vector c #

zip :: Vector a -> Vector b -> Vector (a, b) #

zap :: Vector (a -> b) -> Vector a -> Vector b

unzip :: Vector (a, b) -> (Vector a, Vector b) #

Zip3 Vector 
Instance details

Defined in Data.ChunkedZip

Methods

zipWith3 :: (a -> b -> c -> d) -> Vector a -> Vector b -> Vector c -> Vector d #

zip3 :: Vector a -> Vector b -> Vector c -> Vector (a, b, c) #

zap3 :: Vector (a -> b -> c) -> Vector a -> Vector b -> Vector c

unzip3 :: Vector (a, b, c) -> (Vector a, Vector b, Vector c) #

Zip4 Vector 
Instance details

Defined in Data.ChunkedZip

Methods

zipWith4 :: (a -> b -> c -> d -> e) -> Vector a -> Vector b -> Vector c -> Vector d -> Vector e #

zip4 :: Vector a -> Vector b -> Vector c -> Vector d -> Vector (a, b, c, d) #

zap4 :: Vector (a -> b -> c -> d) -> Vector a -> Vector b -> Vector c -> Vector d

unzip4 :: Vector (a, b, c, d) -> (Vector a, Vector b, Vector c, Vector d) #

Zip5 Vector 
Instance details

Defined in Data.ChunkedZip

Methods

zipWith5 :: (a -> b -> c -> d -> e -> g) -> Vector a -> Vector b -> Vector c -> Vector d -> Vector e -> Vector g #

zip5 :: Vector a -> Vector b -> Vector c -> Vector d -> Vector e -> Vector (a, b, c, d, e) #

zap5 :: Vector (a -> b -> c -> d -> e) -> Vector a -> Vector b -> Vector c -> Vector d -> Vector e

unzip5 :: Vector (a, b, c, d, e) -> (Vector a, Vector b, Vector c, Vector d, Vector e) #

Zip6 Vector 
Instance details

Defined in Data.ChunkedZip

Methods

zipWith6 :: (a -> b -> c -> d -> e -> g -> h) -> Vector a -> Vector b -> Vector c -> Vector d -> Vector e -> Vector g -> Vector h #

zip6 :: Vector a -> Vector b -> Vector c -> Vector d -> Vector e -> Vector g -> Vector (a, b, c, d, e, g) #

zap6 :: Vector (a -> b -> c -> d -> e -> g) -> Vector a -> Vector b -> Vector c -> Vector d -> Vector e -> Vector g

unzip6 :: Vector (a, b, c, d, e, g) -> (Vector a, Vector b, Vector c, Vector d, Vector e, Vector g) #

NFData1 Vector 
Instance details

Defined in Data.Vector

Methods

liftRnf :: (a -> ()) -> Vector a -> ()

Crosswalk Vector 
Instance details

Defined in Data.Crosswalk

Methods

crosswalk :: Align f => (a -> f b) -> Vector a -> f (Vector b)

sequenceL :: Align f => Vector (f a) -> f (Vector a)

Filterable Vector 
Instance details

Defined in Witherable

Methods

mapMaybe :: (a -> Maybe b) -> Vector a -> Vector b

catMaybes :: Vector (Maybe a) -> Vector a

filter :: (a -> Bool) -> Vector a -> Vector a

Witherable Vector 
Instance details

Defined in Witherable

Methods

wither :: Applicative f => (a -> f (Maybe b)) -> Vector a -> f (Vector b)

witherM :: Monad m => (a -> m (Maybe b)) -> Vector a -> m (Vector b)

filterA :: Applicative f => (a -> f Bool) -> Vector a -> f (Vector a)

witherMap :: Applicative m => (Vector b -> r) -> (a -> m (Maybe b)) -> Vector a -> m r

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

FilterableWithIndex Int Vector 
Instance details

Defined in Witherable

Methods

imapMaybe :: (Int -> a -> Maybe b) -> Vector a -> Vector b

ifilter :: (Int -> a -> Bool) -> Vector a -> Vector a

WitherableWithIndex Int Vector 
Instance details

Defined in Witherable

Methods

iwither :: Applicative f => (Int -> a -> f (Maybe b)) -> Vector a -> f (Vector b)

iwitherM :: Monad m => (Int -> a -> m (Maybe b)) -> Vector a -> m (Vector b)

ifilterA :: Applicative f => (Int -> a -> f Bool) -> Vector a -> f (Vector a)

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

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 #

Ixed (Vector a) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (Vector a) -> Traversal' (Vector a) (IxValue (Vector a))

AsEmpty (Vector a) 
Instance details

Defined in Control.Lens.Empty

Methods

_Empty :: Prism' (Vector a) ()

Reversing (Vector a) 
Instance details

Defined in Control.Lens.Internal.Iso

Methods

reversing :: Vector a -> Vector a

Wrapped (Vector a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Vector a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (Vector a) = [a]

Methods

_Wrapped' :: Iso' (Vector a) (Unwrapped (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 #

(FromField a, Typeable a) => FromField (Vector a) 
Instance details

Defined in Database.PostgreSQL.Simple.FromField

Methods

fromField :: FieldParser (Vector a)

FromField a => FromRow (Vector a) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Vector a)

FromField a => FromRow (Maybe (Vector a)) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe (Vector a))

ToField a => ToField (Vector a) 
Instance details

Defined in Database.PostgreSQL.Simple.ToField

Methods

toField :: Vector a -> Action

t ~ Vector a' => Rewrapped (Vector a) t 
Instance details

Defined in Control.Lens.Wrapped

Cons (Vector a) (Vector b) a b 
Instance details

Defined in Control.Lens.Cons

Methods

_Cons :: Prism (Vector a) (Vector b) (a, Vector a) (b, Vector b)

Snoc (Vector a) (Vector b) a b 
Instance details

Defined in Control.Lens.Cons

Methods

_Snoc :: Prism (Vector a) (Vector b) (Vector a, a) (Vector b, b)

Each (Vector a) (Vector b) a b 
Instance details

Defined in Control.Lens.Each

Methods

each :: Traversal (Vector a) (Vector b) a b

type Key Vector 
Instance details

Defined in Data.Vector.Instances

type Key Vector = Int
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 Index (Vector a) 
Instance details

Defined in Control.Lens.At

type Index (Vector a) = Int
type IxValue (Vector a) 
Instance details

Defined in Control.Lens.At

type IxValue (Vector a) = a
type Unwrapped (Vector a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (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

param :: ViewParamHelpMessage => a Source #

class Show a #

Minimal complete definition

showsPrec | show

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

Methods

showsPrec :: Int -> MungedPackageId -> ShowS #

show :: MungedPackageId -> String

showList :: [MungedPackageId] -> ShowS #

Show MungedPackageName 
Instance details

Defined in Distribution.Types.MungedPackageName

Methods

showsPrec :: Int -> MungedPackageName -> ShowS #

show :: MungedPackageName -> String

showList :: [MungedPackageName] -> ShowS #

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

Methods

showsPrec :: Int -> PackageIdentifier -> ShowS #

show :: PackageIdentifier -> String

showList :: [PackageIdentifier] -> ShowS #

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 Counts 
Instance details

Defined in Test.HUnit.Base

Methods

showsPrec :: Int -> Counts -> ShowS #

show :: Counts -> String

showList :: [Counts] -> ShowS #

Show Node 
Instance details

Defined in Test.HUnit.Base

Methods

showsPrec :: Int -> Node -> ShowS #

show :: Node -> String

showList :: [Node] -> ShowS #

Show State 
Instance details

Defined in Test.HUnit.Base

Methods

showsPrec :: Int -> State -> ShowS #

show :: State -> String

showList :: [State] -> ShowS #

Show Test 
Instance details

Defined in Test.HUnit.Base

Methods

showsPrec :: Int -> Test -> ShowS #

show :: Test -> String

showList :: [Test] -> ShowS #

Show FailureReason 
Instance details

Defined in Test.HUnit.Lang

Methods

showsPrec :: Int -> FailureReason -> ShowS #

show :: FailureReason -> String

showList :: [FailureReason] -> ShowS #

Show HUnitFailure 
Instance details

Defined in Test.HUnit.Lang

Methods

showsPrec :: Int -> HUnitFailure -> ShowS #

show :: HUnitFailure -> String

showList :: [HUnitFailure] -> ShowS #

Show Result 
Instance details

Defined in Test.HUnit.Lang

Methods

showsPrec :: Int -> Result -> ShowS #

show :: Result -> String

showList :: [Result] -> ShowS #

Show ASCIIString 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> ASCIIString -> ShowS #

show :: ASCIIString -> String

showList :: [ASCIIString] -> ShowS #

Show PrintableString 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> PrintableString -> ShowS #

show :: PrintableString -> String

showList :: [PrintableString] -> ShowS #

Show UnicodeString 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> UnicodeString -> ShowS #

show :: UnicodeString -> String

showList :: [UnicodeString] -> ShowS #

Show A 
Instance details

Defined in Test.QuickCheck.Poly

Methods

showsPrec :: Int -> A -> ShowS #

show :: A -> String

showList :: [A] -> ShowS #

Show B 
Instance details

Defined in Test.QuickCheck.Poly

Methods

showsPrec :: Int -> B -> ShowS #

show :: B -> String

showList :: [B] -> ShowS #

Show C 
Instance details

Defined in Test.QuickCheck.Poly

Methods

showsPrec :: Int -> C -> ShowS #

show :: C -> String

showList :: [C] -> ShowS #

Show OrdA 
Instance details

Defined in Test.QuickCheck.Poly

Methods

showsPrec :: Int -> OrdA -> ShowS #

show :: OrdA -> String

showList :: [OrdA] -> ShowS #

Show OrdB 
Instance details

Defined in Test.QuickCheck.Poly

Methods

showsPrec :: Int -> OrdB -> ShowS #

show :: OrdB -> String

showList :: [OrdB] -> ShowS #

Show OrdC 
Instance details

Defined in Test.QuickCheck.Poly

Methods

showsPrec :: Int -> OrdC -> ShowS #

show :: OrdC -> String

showList :: [OrdC] -> ShowS #

Show QCGen 
Instance details

Defined in Test.QuickCheck.Random

Methods

showsPrec :: Int -> QCGen -> ShowS #

show :: QCGen -> String

showList :: [QCGen] -> ShowS #

Show Confidence 
Instance details

Defined in Test.QuickCheck.State

Methods

showsPrec :: Int -> Confidence -> ShowS #

show :: Confidence -> String

showList :: [Confidence] -> ShowS #

Show Args 
Instance details

Defined in Test.QuickCheck.Test

Methods

showsPrec :: Int -> Args -> ShowS #

show :: Args -> String

showList :: [Args] -> ShowS #

Show Result 
Instance details

Defined in Test.QuickCheck.Test

Methods

showsPrec :: Int -> Result -> ShowS #

show :: Result -> String

showList :: [Result] -> ShowS #

Show Cell 
Instance details

Defined in Test.QuickCheck.Text

Methods

showsPrec :: Int -> Cell -> ShowS #

show :: Cell -> String

showList :: [Cell] -> ShowS #

Show Str 
Instance details

Defined in Test.QuickCheck.Text

Methods

showsPrec :: Int -> Str -> ShowS #

show :: Str -> String

showList :: [Str] -> ShowS #

Show RSAError 
Instance details

Defined in Codec.Crypto.RSA.Pure

Methods

showsPrec :: Int -> RSAError -> ShowS #

show :: RSAError -> String

showList :: [RSAError] -> 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

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 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 ASN1Error 
Instance details

Defined in Data.ASN1.Error

Methods

showsPrec :: Int -> ASN1Error -> ShowS #

show :: ASN1Error -> String

showList :: [ASN1Error] -> ShowS #

Show BitArray 
Instance details

Defined in Data.ASN1.BitArray

Methods

showsPrec :: Int -> BitArray -> ShowS #

show :: BitArray -> String

showList :: [BitArray] -> ShowS #

Show BitArrayOutOfBound 
Instance details

Defined in Data.ASN1.BitArray

Methods

showsPrec :: Int -> BitArrayOutOfBound -> ShowS #

show :: BitArrayOutOfBound -> String

showList :: [BitArrayOutOfBound] -> ShowS #

Show PrettyType 
Instance details

Defined in Data.ASN1.Pretty

Methods

showsPrec :: Int -> PrettyType -> ShowS #

show :: PrettyType -> String

showList :: [PrettyType] -> ShowS #

Show ASN1 
Instance details

Defined in Data.ASN1.Types

Methods

showsPrec :: Int -> ASN1 -> ShowS #

show :: ASN1 -> String

showList :: [ASN1] -> ShowS #

Show ASN1ConstructionType 
Instance details

Defined in Data.ASN1.Types

Methods

showsPrec :: Int -> ASN1ConstructionType -> ShowS #

show :: ASN1ConstructionType -> String

showList :: [ASN1ConstructionType] -> ShowS #

Show ASN1TimeType 
Instance details

Defined in Data.ASN1.Types

Methods

showsPrec :: Int -> ASN1TimeType -> ShowS #

show :: ASN1TimeType -> String

showList :: [ASN1TimeType] -> ShowS #

Show ASN1Class 
Instance details

Defined in Data.ASN1.Types.Lowlevel

Methods

showsPrec :: Int -> ASN1Class -> ShowS #

show :: ASN1Class -> String

showList :: [ASN1Class] -> ShowS #

Show ASN1Event 
Instance details

Defined in Data.ASN1.Types.Lowlevel

Methods

showsPrec :: Int -> ASN1Event -> ShowS #

show :: ASN1Event -> String

showList :: [ASN1Event] -> ShowS #

Show ASN1Header 
Instance details

Defined in Data.ASN1.Types.Lowlevel

Methods

showsPrec :: Int -> ASN1Header -> ShowS #

show :: ASN1Header -> String

showList :: [ASN1Header] -> ShowS #

Show ASN1Length 
Instance details

Defined in Data.ASN1.Types.Lowlevel

Methods

showsPrec :: Int -> ASN1Length -> ShowS #

show :: ASN1Length -> String

showList :: [ASN1Length] -> ShowS #

Show ASN1CharacterString 
Instance details

Defined in Data.ASN1.Types.String

Methods

showsPrec :: Int -> ASN1CharacterString -> ShowS #

show :: ASN1CharacterString -> String

showList :: [ASN1CharacterString] -> ShowS #

Show ASN1StringEncoding 
Instance details

Defined in Data.ASN1.Types.String

Methods

showsPrec :: Int -> ASN1StringEncoding -> ShowS #

show :: ASN1StringEncoding -> String

showList :: [ASN1StringEncoding] -> ShowS #

Show AsyncCancelled 
Instance details

Defined in Control.Concurrent.Async.Internal

Show ExceptionInLinkedThread 
Instance details

Defined in Control.Concurrent.Async.Internal

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 Credential 
Instance details

Defined in Web.Authenticate.OAuth

Methods

showsPrec :: Int -> Credential -> ShowS #

show :: Credential -> String

showList :: [Credential] -> ShowS #

Show OAuth 
Instance details

Defined in Web.Authenticate.OAuth

Methods

showsPrec :: Int -> OAuth -> ShowS #

show :: OAuth -> String

showList :: [OAuth] -> ShowS #

Show OAuthException 
Instance details

Defined in Web.Authenticate.OAuth

Methods

showsPrec :: Int -> OAuthException -> ShowS #

show :: OAuthException -> String

showList :: [OAuthException] -> ShowS #

Show OAuthVersion 
Instance details

Defined in Web.Authenticate.OAuth

Methods

showsPrec :: Int -> OAuthVersion -> ShowS #

show :: OAuthVersion -> String

showList :: [OAuthVersion] -> ShowS #

Show SignMethod 
Instance details

Defined in Web.Authenticate.OAuth

Methods

showsPrec :: Int -> SignMethod -> ShowS #

show :: SignMethod -> String

showList :: [SignMethod] -> ShowS #

Show DebounceEdge 
Instance details

Defined in Control.Debounce.Internal

Methods

showsPrec :: Int -> DebounceEdge -> ShowS #

show :: DebounceEdge -> String

showList :: [DebounceEdge] -> 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 Endianness 
Instance details

Defined in Basement.Endianness

Methods

showsPrec :: Int -> Endianness -> ShowS #

show :: Endianness -> String

showList :: [Endianness] -> ShowS #

Show InvalidRecast 
Instance details

Defined in Basement.Exception

Methods

showsPrec :: Int -> InvalidRecast -> ShowS #

show :: InvalidRecast -> String

showList :: [InvalidRecast] -> ShowS #

Show NonEmptyCollectionIsEmpty 
Instance details

Defined in Basement.Exception

Methods

showsPrec :: Int -> NonEmptyCollectionIsEmpty -> ShowS #

show :: NonEmptyCollectionIsEmpty -> String

showList :: [NonEmptyCollectionIsEmpty] -> ShowS #

Show OutOfBound 
Instance details

Defined in Basement.Exception

Methods

showsPrec :: Int -> OutOfBound -> ShowS #

show :: OutOfBound -> String

showList :: [OutOfBound] -> ShowS #

Show OutOfBoundOperation 
Instance details

Defined in Basement.Exception

Methods

showsPrec :: Int -> OutOfBoundOperation -> ShowS #

show :: OutOfBoundOperation -> String

showList :: [OutOfBoundOperation] -> ShowS #

Show RecastDestinationSize 
Instance details

Defined in Basement.Exception

Methods

showsPrec :: Int -> RecastDestinationSize -> ShowS #

show :: RecastDestinationSize -> String

showList :: [RecastDestinationSize] -> ShowS #

Show RecastSourceSize 
Instance details

Defined in Basement.Exception

Methods

showsPrec :: Int -> RecastSourceSize -> ShowS #

show :: RecastSourceSize -> String

showList :: [RecastSourceSize] -> 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 AsciiString 
Instance details

Defined in Basement.Types.AsciiString

Methods

showsPrec :: Int -> AsciiString -> ShowS #

show :: AsciiString -> String

showList :: [AsciiString] -> ShowS #

Show Char7 
Instance details

Defined in Basement.Types.Char7

Methods

showsPrec :: Int -> Char7 -> ShowS #

show :: Char7 -> String

showList :: [Char7] -> ShowS #

Show FileSize 
Instance details

Defined in Basement.Types.OffsetSize

Methods

showsPrec :: Int -> FileSize -> ShowS #

show :: FileSize -> String

showList :: [FileSize] -> ShowS #

Show Word128 
Instance details

Defined in Basement.Types.Word128

Methods

showsPrec :: Int -> Word128 -> ShowS #

show :: Word128 -> String

showList :: [Word128] -> ShowS #

Show Word256 
Instance details

Defined in Basement.Types.Word256

Methods

showsPrec :: Int -> Word256 -> ShowS #

show :: Word256 -> String

showList :: [Word256] -> ShowS #

Show String 
Instance details

Defined in Basement.UTF8.Base

Methods

showsPrec :: Int -> String -> ShowS #

show :: String -> String

showList :: [String] -> ShowS #

Show Options 
Instance details

Defined in Data.Bifunctor.TH

Methods

showsPrec :: Int -> Options -> ShowS #

show :: Options -> String

showList :: [Options] -> ShowS #

Show ByteOrder 
Instance details

Defined in System.ByteOrder

Methods

showsPrec :: Int -> ByteOrder -> ShowS #

show :: ByteOrder -> String

showList :: [ByteOrder] -> ShowS #

Show Chunks 
Instance details

Defined in Data.Bytes.Chunks

Methods

showsPrec :: Int -> Chunks -> ShowS #

show :: Chunks -> String

showList :: [Chunks] -> ShowS #

Show Bytes 
Instance details

Defined in Data.Bytes.Internal

Methods

showsPrec :: Int -> Bytes -> ShowS #

show :: Bytes -> String

showList :: [Bytes] -> 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

Methods

showsPrec :: Int -> ShortByteString -> ShowS #

show :: ShortByteString -> String

showList :: [ShortByteString] -> ShowS #

Show IV 
Instance details

Defined in Web.ClientSession

Methods

showsPrec :: Int -> IV -> ShowS #

show :: IV -> String

showList :: [IV] -> ShowS #

Show Key 
Instance details

Defined in Web.ClientSession

Methods

showsPrec :: Int -> Key -> ShowS #

show :: Key -> String

showList :: [Key] -> 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 SameSiteOption 
Instance details

Defined in Web.Cookie

Methods

showsPrec :: Int -> SameSiteOption -> ShowS #

show :: SameSiteOption -> String

showList :: [SameSiteOption] -> ShowS #

Show SetCookie 
Instance details

Defined in Web.Cookie

Methods

showsPrec :: Int -> SetCookie -> ShowS #

show :: SetCookie -> String

showList :: [SetCookie] -> ShowS #

Show CipherError 
Instance details

Defined in Crypto.Classes.Exceptions

Methods

showsPrec :: Int -> CipherError -> ShowS #

show :: CipherError -> String

showList :: [CipherError] -> ShowS #

Show GenError 
Instance details

Defined in Crypto.Random

Methods

showsPrec :: Int -> GenError -> ShowS #

show :: GenError -> String

showList :: [GenError] -> ShowS #

Show ReseedInfo 
Instance details

Defined in Crypto.Random

Methods

showsPrec :: Int -> ReseedInfo -> ShowS #

show :: ReseedInfo -> String

showList :: [ReseedInfo] -> ShowS #

Show BlockCipherError 
Instance details

Defined in Crypto.Types

Methods

showsPrec :: Int -> BlockCipherError -> ShowS #

show :: BlockCipherError -> String

showList :: [BlockCipherError] -> ShowS #

Show Params 
Instance details

Defined in Crypto.Types.PubKey.DH

Methods

showsPrec :: Int -> Params -> ShowS #

show :: Params -> String

showList :: [Params] -> ShowS #

Show PrivateNumber 
Instance details

Defined in Crypto.Types.PubKey.DH

Methods

showsPrec :: Int -> PrivateNumber -> ShowS #

show :: PrivateNumber -> String

showList :: [PrivateNumber] -> ShowS #

Show PublicNumber 
Instance details

Defined in Crypto.Types.PubKey.DH

Methods

showsPrec :: Int -> PublicNumber -> ShowS #

show :: PublicNumber -> String

showList :: [PublicNumber] -> ShowS #

Show SharedKey 
Instance details

Defined in Crypto.Types.PubKey.DH

Methods

showsPrec :: Int -> SharedKey -> ShowS #

show :: SharedKey -> String

showList :: [SharedKey] -> ShowS #

Show KeyPair 
Instance details

Defined in Crypto.Types.PubKey.DSA

Methods

showsPrec :: Int -> KeyPair -> ShowS #

show :: KeyPair -> String

showList :: [KeyPair] -> ShowS #

Show Params 
Instance details

Defined in Crypto.Types.PubKey.DSA

Methods

showsPrec :: Int -> Params -> ShowS #

show :: Params -> String

showList :: [Params] -> ShowS #

Show PrivateKey 
Instance details

Defined in Crypto.Types.PubKey.DSA

Methods

showsPrec :: Int -> PrivateKey -> ShowS #

show :: PrivateKey -> String

showList :: [PrivateKey] -> ShowS #

Show PublicKey 
Instance details

Defined in Crypto.Types.PubKey.DSA

Methods

showsPrec :: Int -> PublicKey -> ShowS #

show :: PublicKey -> String

showList :: [PublicKey] -> ShowS #

Show Signature 
Instance details

Defined in Crypto.Types.PubKey.DSA

Methods

showsPrec :: Int -> Signature -> ShowS #

show :: Signature -> String

showList :: [Signature] -> ShowS #

Show Curve 
Instance details

Defined in Crypto.Types.PubKey.ECC

Methods

showsPrec :: Int -> Curve -> ShowS #

show :: Curve -> String

showList :: [Curve] -> ShowS #

Show CurveBinary 
Instance details

Defined in Crypto.Types.PubKey.ECC

Methods

showsPrec :: Int -> CurveBinary -> ShowS #

show :: CurveBinary -> String

showList :: [CurveBinary] -> ShowS #

Show CurveCommon 
Instance details

Defined in Crypto.Types.PubKey.ECC

Methods

showsPrec :: Int -> CurveCommon -> ShowS #

show :: CurveCommon -> String

showList :: [CurveCommon] -> ShowS #

Show CurveName 
Instance details

Defined in Crypto.Types.PubKey.ECC

Methods

showsPrec :: Int -> CurveName -> ShowS #

show :: CurveName -> String

showList :: [CurveName] -> ShowS #

Show CurvePrime 
Instance details

Defined in Crypto.Types.PubKey.ECC

Methods

showsPrec :: Int -> CurvePrime -> ShowS #

show :: CurvePrime -> String

showList :: [CurvePrime] -> ShowS #

Show Point 
Instance details

Defined in Crypto.Types.PubKey.ECC

Methods

showsPrec :: Int -> Point -> ShowS #

show :: Point -> String

showList :: [Point] -> ShowS #

Show KeyPair 
Instance details

Defined in Crypto.Types.PubKey.ECDSA

Methods

showsPrec :: Int -> KeyPair -> ShowS #

show :: KeyPair -> String

showList :: [KeyPair] -> ShowS #

Show PrivateKey 
Instance details

Defined in Crypto.Types.PubKey.ECDSA

Methods

showsPrec :: Int -> PrivateKey -> ShowS #

show :: PrivateKey -> String

showList :: [PrivateKey] -> ShowS #

Show PublicKey 
Instance details

Defined in Crypto.Types.PubKey.ECDSA

Methods

showsPrec :: Int -> PublicKey -> ShowS #

show :: PublicKey -> String

showList :: [PublicKey] -> ShowS #

Show Signature 
Instance details

Defined in Crypto.Types.PubKey.ECDSA

Methods

showsPrec :: Int -> Signature -> ShowS #

show :: Signature -> String

showList :: [Signature] -> ShowS #

Show KeyPair 
Instance details

Defined in Crypto.Types.PubKey.RSA

Methods

showsPrec :: Int -> KeyPair -> ShowS #

show :: KeyPair -> String

showList :: [KeyPair] -> ShowS #

Show PrivateKey 
Instance details

Defined in Crypto.Types.PubKey.RSA

Methods

showsPrec :: Int -> PrivateKey -> ShowS #

show :: PrivateKey -> String

showList :: [PrivateKey] -> ShowS #

Show PublicKey 
Instance details

Defined in Crypto.Types.PubKey.RSA

Methods

showsPrec :: Int -> PublicKey -> ShowS #

show :: PublicKey -> String

showList :: [PublicKey] -> 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 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 HostCannotConnect 
Instance details

Defined in Network.Connection

Methods

showsPrec :: Int -> HostCannotConnect -> ShowS #

show :: HostCannotConnect -> String

showList :: [HostCannotConnect] -> ShowS #

Show HostNotResolved 
Instance details

Defined in Network.Connection

Methods

showsPrec :: Int -> HostNotResolved -> ShowS #

show :: HostNotResolved -> String

showList :: [HostNotResolved] -> ShowS #

Show LineTooLong 
Instance details

Defined in Network.Connection

Methods

showsPrec :: Int -> LineTooLong -> ShowS #

show :: LineTooLong -> String

showList :: [LineTooLong] -> ShowS #

Show PEMError 
Instance details

Defined in Data.X509.File

Methods

showsPrec :: Int -> PEMError -> ShowS #

show :: PEMError -> String

showList :: [PEMError] -> ShowS #

Show FailedReason 
Instance details

Defined in Data.X509.Validation

Methods

showsPrec :: Int -> FailedReason -> ShowS #

show :: FailedReason -> String

showList :: [FailedReason] -> ShowS #

Show ValidationChecks 
Instance details

Defined in Data.X509.Validation

Methods

showsPrec :: Int -> ValidationChecks -> ShowS #

show :: ValidationChecks -> String

showList :: [ValidationChecks] -> 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 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 ChaChaException 
Instance details

Defined in Crypto.Cipher.ChaChaPoly1305.Conduit

Methods

showsPrec :: Int -> ChaChaException -> ShowS #

show :: ChaChaException -> String

showList :: [ChaChaException] -> ShowS #

Show LogStr 
Instance details

Defined in System.Log.FastLogger.LogStr

Methods

showsPrec :: Int -> LogStr -> ShowS #

show :: LogStr -> String

showList :: [LogStr] -> ShowS #

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 Arg 
Instance details

Defined in Control.Monad.Free.TH

Methods

showsPrec :: Int -> Arg -> ShowS #

show :: Arg -> String

showList :: [Arg] -> ShowS #

Show UniqueSet 
Instance details

Defined in GHC.Cmm.Dataflow.Collections

Methods

showsPrec :: Int -> UniqueSet -> ShowS #

show :: UniqueSet -> String

showList :: [UniqueSet] -> ShowS #

Show Label 
Instance details

Defined in GHC.Cmm.Dataflow.Label

Methods

showsPrec :: Int -> Label -> ShowS #

show :: Label -> String

showList :: [Label] -> ShowS #

Show LabelSet 
Instance details

Defined in GHC.Cmm.Dataflow.Label

Methods

showsPrec :: Int -> LabelSet -> ShowS #

show :: LabelSet -> String

showList :: [LabelSet] -> ShowS #

Show ExtMode 
Instance details

Defined in GHC.CmmToAsm.AArch64.Instr

Methods

showsPrec :: Int -> ExtMode -> ShowS #

show :: ExtMode -> String

showList :: [ExtMode] -> ShowS #

Show Operand 
Instance details

Defined in GHC.CmmToAsm.AArch64.Instr

Methods

showsPrec :: Int -> Operand -> ShowS #

show :: Operand -> String

showList :: [Operand] -> ShowS #

Show ShiftMode 
Instance details

Defined in GHC.CmmToAsm.AArch64.Instr

Methods

showsPrec :: Int -> ShiftMode -> ShowS #

show :: ShiftMode -> String

showList :: [ShiftMode] -> ShowS #

Show PrimElemRep 
Instance details

Defined in GHC.Core.TyCon

Methods

showsPrec :: Int -> PrimElemRep -> ShowS #

show :: PrimElemRep -> String

showList :: [PrimElemRep] -> ShowS #

Show PrimRep 
Instance details

Defined in GHC.Core.TyCon

Methods

showsPrec :: Int -> PrimRep -> ShowS #

show :: PrimRep -> String

showList :: [PrimRep] -> ShowS #

Show FastString 
Instance details

Defined in GHC.Data.FastString

Methods

showsPrec :: Int -> FastString -> ShowS #

show :: FastString -> String

showList :: [FastString] -> ShowS #

Show LexicalFastString 
Instance details

Defined in GHC.Data.FastString

Methods

showsPrec :: Int -> LexicalFastString -> ShowS #

show :: LexicalFastString -> String

showList :: [LexicalFastString] -> ShowS #

Show NonDetFastString 
Instance details

Defined in GHC.Data.FastString

Methods

showsPrec :: Int -> NonDetFastString -> ShowS #

show :: NonDetFastString -> String

showList :: [NonDetFastString] -> ShowS #

Show Backend 
Instance details

Defined in GHC.Driver.Backend

Methods

showsPrec :: Int -> Backend -> ShowS #

show :: Backend -> String

showList :: [Backend] -> ShowS #

Show PrimitiveImplementation 
Instance details

Defined in GHC.Driver.Backend

Methods

showsPrec :: Int -> PrimitiveImplementation -> ShowS #

show :: PrimitiveImplementation -> String

showList :: [PrimitiveImplementation] -> ShowS #

Show DynamicTooState 
Instance details

Defined in GHC.Driver.DynFlags

Methods

showsPrec :: Int -> DynamicTooState -> ShowS #

show :: DynamicTooState -> String

showList :: [DynamicTooState] -> ShowS #

Show GhcLink 
Instance details

Defined in GHC.Driver.DynFlags

Methods

showsPrec :: Int -> GhcLink -> ShowS #

show :: GhcLink -> String

showList :: [GhcLink] -> ShowS #

Show IncludeSpecs 
Instance details

Defined in GHC.Driver.DynFlags

Methods

showsPrec :: Int -> IncludeSpecs -> ShowS #

show :: IncludeSpecs -> String

showList :: [IncludeSpecs] -> ShowS #

Show PackageArg 
Instance details

Defined in GHC.Driver.DynFlags

Methods

showsPrec :: Int -> PackageArg -> ShowS #

show :: PackageArg -> String

showList :: [PackageArg] -> ShowS #

Show RtsOptsEnabled 
Instance details

Defined in GHC.Driver.DynFlags

Methods

showsPrec :: Int -> RtsOptsEnabled -> ShowS #

show :: RtsOptsEnabled -> String

showList :: [RtsOptsEnabled] -> ShowS #

Show PmEquality 
Instance details

Defined in GHC.HsToCore.Pmc.Solver.Types

Methods

showsPrec :: Int -> PmEquality -> ShowS #

show :: PmEquality -> String

showList :: [PmEquality] -> ShowS #

Show AOp 
Instance details

Defined in GHC.JS.Syntax

Methods

showsPrec :: Int -> AOp -> ShowS #

show :: AOp -> String

showList :: [AOp] -> ShowS #

Show Op 
Instance details

Defined in GHC.JS.Syntax

Methods

showsPrec :: Int -> Op -> ShowS #

show :: Op -> String

showList :: [Op] -> ShowS #

Show UOp 
Instance details

Defined in GHC.JS.Syntax

Methods

showsPrec :: Int -> UOp -> ShowS #

show :: UOp -> String

showList :: [UOp] -> ShowS #

Show Ident 
Instance details

Defined in GHC.JS.Unsat.Syntax

Methods

showsPrec :: Int -> Ident -> ShowS #

show :: Ident -> String

showList :: [Ident] -> ShowS #

Show JOp 
Instance details

Defined in GHC.JS.Unsat.Syntax

Methods

showsPrec :: Int -> JOp -> ShowS #

show :: JOp -> String

showList :: [JOp] -> ShowS #

Show JUOp 
Instance details

Defined in GHC.JS.Unsat.Syntax

Methods

showsPrec :: Int -> JUOp -> ShowS #

show :: JUOp -> String

showList :: [JUOp] -> ShowS #

Show Anchor 
Instance details

Defined in GHC.Parser.Annotation

Methods

showsPrec :: Int -> Anchor -> ShowS #

show :: Anchor -> String

showList :: [Anchor] -> ShowS #

Show AnchorOperation 
Instance details

Defined in GHC.Parser.Annotation

Methods

showsPrec :: Int -> AnchorOperation -> ShowS #

show :: AnchorOperation -> String

showList :: [AnchorOperation] -> ShowS #

Show AnnKeywordId 
Instance details

Defined in GHC.Parser.Annotation

Methods

showsPrec :: Int -> AnnKeywordId -> ShowS #

show :: AnnKeywordId -> String

showList :: [AnnKeywordId] -> ShowS #

Show DeltaPos 
Instance details

Defined in GHC.Parser.Annotation

Methods

showsPrec :: Int -> DeltaPos -> ShowS #

show :: DeltaPos -> String

showList :: [DeltaPos] -> ShowS #

Show EpaComment 
Instance details

Defined in GHC.Parser.Annotation

Methods

showsPrec :: Int -> EpaComment -> ShowS #

show :: EpaComment -> String

showList :: [EpaComment] -> ShowS #

Show EpaCommentTok 
Instance details

Defined in GHC.Parser.Annotation

Methods

showsPrec :: Int -> EpaCommentTok -> ShowS #

show :: EpaCommentTok -> String

showList :: [EpaCommentTok] -> ShowS #

Show HasE 
Instance details

Defined in GHC.Parser.Annotation

Methods

showsPrec :: Int -> HasE -> ShowS #

show :: HasE -> String

showList :: [HasE] -> ShowS #

Show IsUnicodeSyntax 
Instance details

Defined in GHC.Parser.Annotation

Methods

showsPrec :: Int -> IsUnicodeSyntax -> ShowS #

show :: IsUnicodeSyntax -> String

showList :: [IsUnicodeSyntax] -> ShowS #

Show LexErrKind 
Instance details

Defined in GHC.Parser.Errors.Types

Methods

showsPrec :: Int -> LexErrKind -> ShowS #

show :: LexErrKind -> String

showList :: [LexErrKind] -> ShowS #

Show NumUnderscoreReason 
Instance details

Defined in GHC.Parser.Errors.Types

Methods

showsPrec :: Int -> NumUnderscoreReason -> ShowS #

show :: NumUnderscoreReason -> String

showList :: [NumUnderscoreReason] -> ShowS #

Show HasKinds 
Instance details

Defined in GHC.Tc.Errors.Types

Methods

showsPrec :: Int -> HasKinds -> ShowS #

show :: HasKinds -> String

showList :: [HasKinds] -> ShowS #

Show SuggestPartialTypeSignatures 
Instance details

Defined in GHC.Tc.Errors.Types

Methods

showsPrec :: Int -> SuggestPartialTypeSignatures -> ShowS #

show :: SuggestPartialTypeSignatures -> String

showList :: [SuggestPartialTypeSignatures] -> ShowS #

Show SuggestUndecidableInstances 
Instance details

Defined in GHC.Tc.Errors.Types

Methods

showsPrec :: Int -> SuggestUndecidableInstances -> ShowS #

show :: SuggestUndecidableInstances -> String

showList :: [SuggestUndecidableInstances] -> ShowS #

Show InlineSpec 
Instance details

Defined in GHC.Types.Basic

Methods

showsPrec :: Int -> InlineSpec -> ShowS #

show :: InlineSpec -> String

showList :: [InlineSpec] -> ShowS #

Show Levity 
Instance details

Defined in GHC.Types.Basic

Methods

showsPrec :: Int -> Levity -> ShowS #

show :: Levity -> String

showList :: [Levity] -> ShowS #

Show PprPrec 
Instance details

Defined in GHC.Types.Basic

Methods

showsPrec :: Int -> PprPrec -> ShowS #

show :: PprPrec -> String

showList :: [PprPrec] -> ShowS #

Show RuleMatchInfo 
Instance details

Defined in GHC.Types.Basic

Methods

showsPrec :: Int -> RuleMatchInfo -> ShowS #

show :: RuleMatchInfo -> String

showList :: [RuleMatchInfo] -> ShowS #

Show DiagnosticReason 
Instance details

Defined in GHC.Types.Error

Methods

showsPrec :: Int -> DiagnosticReason -> ShowS #

show :: DiagnosticReason -> String

showList :: [DiagnosticReason] -> ShowS #

Show Severity 
Instance details

Defined in GHC.Types.Error

Methods

showsPrec :: Int -> Severity -> ShowS #

show :: Severity -> String

showList :: [Severity] -> ShowS #

Show DuplicateRecordFields 
Instance details

Defined in GHC.Types.FieldLabel

Methods

showsPrec :: Int -> DuplicateRecordFields -> ShowS #

show :: DuplicateRecordFields -> String

showList :: [DuplicateRecordFields] -> ShowS #

Show FieldSelectors 
Instance details

Defined in GHC.Types.FieldLabel

Methods

showsPrec :: Int -> FieldSelectors -> ShowS #

show :: FieldSelectors -> String

showList :: [FieldSelectors] -> ShowS #

Show Safety 
Instance details

Defined in GHC.Types.ForeignCall

Methods

showsPrec :: Int -> Safety -> ShowS #

show :: Safety -> String

showList :: [Safety] -> ShowS #

Show FieldsOrSelectors 
Instance details

Defined in GHC.Types.Name.Reader

Methods

showsPrec :: Int -> FieldsOrSelectors -> ShowS #

show :: FieldsOrSelectors -> String

showList :: [FieldsOrSelectors] -> ShowS #

Show SaneDouble 
Instance details

Defined in GHC.Types.SaneDouble

Methods

showsPrec :: Int -> SaneDouble -> ShowS #

show :: SaneDouble -> String

showList :: [SaneDouble] -> ShowS #

Show HsBootOrSig 
Instance details

Defined in GHC.Types.SourceFile

Methods

showsPrec :: Int -> HsBootOrSig -> ShowS #

show :: HsBootOrSig -> String

showList :: [HsBootOrSig] -> ShowS #

Show HscSource 
Instance details

Defined in GHC.Types.SourceFile

Methods

showsPrec :: Int -> HscSource -> ShowS #

show :: HscSource -> String

showList :: [HscSource] -> ShowS #

Show FractionalExponentBase 
Instance details

Defined in GHC.Types.SourceText

Methods

showsPrec :: Int -> FractionalExponentBase -> ShowS #

show :: FractionalExponentBase -> String

showList :: [FractionalExponentBase] -> ShowS #

Show FractionalLit 
Instance details

Defined in GHC.Types.SourceText

Methods

showsPrec :: Int -> FractionalLit -> ShowS #

show :: FractionalLit -> String

showList :: [FractionalLit] -> ShowS #

Show IntegralLit 
Instance details

Defined in GHC.Types.SourceText

Methods

showsPrec :: Int -> IntegralLit -> ShowS #

show :: IntegralLit -> String

showList :: [IntegralLit] -> ShowS #

Show SourceText 
Instance details

Defined in GHC.Types.SourceText

Methods

showsPrec :: Int -> SourceText -> ShowS #

show :: SourceText -> String

showList :: [SourceText] -> ShowS #

Show BufPos 
Instance details

Defined in GHC.Types.SrcLoc

Methods

showsPrec :: Int -> BufPos -> ShowS #

show :: BufPos -> String

showList :: [BufPos] -> ShowS #

Show BufSpan 
Instance details

Defined in GHC.Types.SrcLoc

Methods

showsPrec :: Int -> BufSpan -> ShowS #

show :: BufSpan -> String

showList :: [BufSpan] -> ShowS #

Show PsLoc 
Instance details

Defined in GHC.Types.SrcLoc

Methods

showsPrec :: Int -> PsLoc -> ShowS #

show :: PsLoc -> String

showList :: [PsLoc] -> ShowS #

Show PsSpan 
Instance details

Defined in GHC.Types.SrcLoc

Methods

showsPrec :: Int -> PsSpan -> ShowS #

show :: PsSpan -> String

showList :: [PsSpan] -> ShowS #

Show RealSrcLoc 
Instance details

Defined in GHC.Types.SrcLoc

Methods

showsPrec :: Int -> RealSrcLoc -> ShowS #

show :: RealSrcLoc -> String

showList :: [RealSrcLoc] -> ShowS #

Show RealSrcSpan 
Instance details

Defined in GHC.Types.SrcLoc

Methods

showsPrec :: Int -> RealSrcSpan -> ShowS #

show :: RealSrcSpan -> String

showList :: [RealSrcSpan] -> ShowS #

Show SrcLoc 
Instance details

Defined in GHC.Types.SrcLoc

Methods

showsPrec :: Int -> SrcLoc -> ShowS #

show :: SrcLoc -> String

showList :: [SrcLoc] -> ShowS #

Show SrcSpan 
Instance details

Defined in GHC.Types.SrcLoc

Methods

showsPrec :: Int -> SrcSpan -> ShowS #

show :: SrcSpan -> String

showList :: [SrcSpan] -> ShowS #

Show UnhelpfulSpanReason 
Instance details

Defined in GHC.Types.SrcLoc

Methods

showsPrec :: Int -> UnhelpfulSpanReason -> ShowS #

show :: UnhelpfulSpanReason -> String

showList :: [UnhelpfulSpanReason] -> ShowS #

Show TickishPlacement 
Instance details

Defined in GHC.Types.Tickish

Methods

showsPrec :: Int -> TickishPlacement -> ShowS #

show :: TickishPlacement -> String

showList :: [TickishPlacement] -> ShowS #

Show ModLocation 
Instance details

Defined in GHC.Unit.Module.Location

Methods

showsPrec :: Int -> ModLocation -> ShowS #

show :: ModLocation -> String

showList :: [ModLocation] -> ShowS #

Show WarningCategory 
Instance details

Defined in GHC.Unit.Module.Warnings

Methods

showsPrec :: Int -> WarningCategory -> ShowS #

show :: WarningCategory -> String

showList :: [WarningCategory] -> ShowS #

Show Unit 
Instance details

Defined in GHC.Unit.Types

Methods

showsPrec :: Int -> Unit -> ShowS #

show :: Unit -> String

showList :: [Unit] -> ShowS #

Show SpliceDecoration 
Instance details

Defined in Language.Haskell.Syntax.Decls

Methods

showsPrec :: Int -> SpliceDecoration -> ShowS #

show :: SpliceDecoration -> String

showList :: [SpliceDecoration] -> ShowS #

Show IsBootInterface 
Instance details

Defined in Language.Haskell.Syntax.ImpExp

Methods

showsPrec :: Int -> IsBootInterface -> ShowS #

show :: IsBootInterface -> String

showList :: [IsBootInterface] -> ShowS #

Show ModuleName 
Instance details

Defined in Language.Haskell.Syntax.Module.Name

Methods

showsPrec :: Int -> ModuleName -> ShowS #

show :: ModuleName -> String

showList :: [ModuleName] -> 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 ClosureType 
Instance details

Defined in GHC.Exts.Heap.ClosureTypes

Methods

showsPrec :: Int -> ClosureType -> ShowS #

show :: ClosureType -> String

showList :: [ClosureType] -> ShowS #

Show Box 
Instance details

Defined in GHC.Exts.Heap.Closures

Methods

showsPrec :: Int -> Box -> ShowS #

show :: Box -> String

showList :: [Box] -> ShowS #

Show PrimType 
Instance details

Defined in GHC.Exts.Heap.Closures

Methods

showsPrec :: Int -> PrimType -> ShowS #

show :: PrimType -> String

showList :: [PrimType] -> ShowS #

Show TsoFlags 
Instance details

Defined in GHC.Exts.Heap.Closures

Methods

showsPrec :: Int -> TsoFlags -> ShowS #

show :: TsoFlags -> String

showList :: [TsoFlags] -> ShowS #

Show WhatNext 
Instance details

Defined in GHC.Exts.Heap.Closures

Methods

showsPrec :: Int -> WhatNext -> ShowS #

show :: WhatNext -> String

showList :: [WhatNext] -> ShowS #

Show WhyBlocked 
Instance details

Defined in GHC.Exts.Heap.Closures

Methods

showsPrec :: Int -> WhyBlocked -> ShowS #

show :: WhyBlocked -> String

showList :: [WhyBlocked] -> ShowS #

Show StgInfoTable 
Instance details

Defined in GHC.Exts.Heap.InfoTable.Types

Methods

showsPrec :: Int -> StgInfoTable -> ShowS #

show :: StgInfoTable -> String

showList :: [StgInfoTable] -> ShowS #

Show CostCentre 
Instance details

Defined in GHC.Exts.Heap.ProfInfo.Types

Methods

showsPrec :: Int -> CostCentre -> ShowS #

show :: CostCentre -> String

showList :: [CostCentre] -> ShowS #

Show CostCentreStack 
Instance details

Defined in GHC.Exts.Heap.ProfInfo.Types

Methods

showsPrec :: Int -> CostCentreStack -> ShowS #

show :: CostCentreStack -> String

showList :: [CostCentreStack] -> ShowS #

Show IndexTable 
Instance details

Defined in GHC.Exts.Heap.ProfInfo.Types

Methods

showsPrec :: Int -> IndexTable -> ShowS #

show :: IndexTable -> String

showList :: [IndexTable] -> ShowS #

Show StgTSOProfInfo 
Instance details

Defined in GHC.Exts.Heap.ProfInfo.Types

Methods

showsPrec :: Int -> StgTSOProfInfo -> ShowS #

show :: StgTSOProfInfo -> String

showList :: [StgTSOProfInfo] -> 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 FFIConv 
Instance details

Defined in GHCi.FFI

Methods

showsPrec :: Int -> FFIConv -> ShowS #

show :: FFIConv -> String

showList :: [FFIConv] -> ShowS #

Show FFIType 
Instance details

Defined in GHCi.FFI

Methods

showsPrec :: Int -> FFIType -> ShowS #

show :: FFIType -> String

showList :: [FFIType] -> ShowS #

Show EvalOpts 
Instance details

Defined in GHCi.Message

Methods

showsPrec :: Int -> EvalOpts -> ShowS #

show :: EvalOpts -> String

showList :: [EvalOpts] -> ShowS #

Show QState 
Instance details

Defined in GHCi.Message

Methods

showsPrec :: Int -> QState -> ShowS #

show :: QState -> String

showList :: [QState] -> ShowS #

Show SerializableException 
Instance details

Defined in GHCi.Message

Methods

showsPrec :: Int -> SerializableException -> ShowS #

show :: SerializableException -> String

showList :: [SerializableException] -> ShowS #

Show THResultType 
Instance details

Defined in GHCi.Message

Methods

showsPrec :: Int -> THResultType -> ShowS #

show :: THResultType -> String

showList :: [THResultType] -> ShowS #

Show HValue 
Instance details

Defined in GHCi.RemoteTypes

Methods

showsPrec :: Int -> HValue -> ShowS #

show :: HValue -> String

showList :: [HValue] -> ShowS #

Show ResolvedBCO 
Instance details

Defined in GHCi.ResolvedBCO

Methods

showsPrec :: Int -> ResolvedBCO -> ShowS #

show :: ResolvedBCO -> String

showList :: [ResolvedBCO] -> ShowS #

Show ResolvedBCOPtr 
Instance details

Defined in GHCi.ResolvedBCO

Methods

showsPrec :: Int -> ResolvedBCOPtr -> ShowS #

show :: ResolvedBCOPtr -> String

showList :: [ResolvedBCOPtr] -> ShowS #

Show GHCiQException 
Instance details

Defined in GHCi.TH

Methods

showsPrec :: Int -> GHCiQException -> ShowS #

show :: GHCiQException -> String

showList :: [GHCiQException] -> ShowS #

Show Completion 
Instance details

Defined in System.Console.Haskeline.Completion

Methods

showsPrec :: Int -> Completion -> ShowS #

show :: Completion -> String

showList :: [Completion] -> ShowS #

Show History 
Instance details

Defined in System.Console.Haskeline.History

Methods

showsPrec :: Int -> History -> ShowS #

show :: History -> String

showList :: [History] -> ShowS #

Show Comment 
Instance details

Defined in Language.Haskell.Exts.Comments

Methods

showsPrec :: Int -> Comment -> ShowS #

show :: Comment -> String

showList :: [Comment] -> ShowS #

Show UnknownPragma 
Instance details

Defined in Language.Haskell.Exts.Comments

Methods

showsPrec :: Int -> UnknownPragma -> ShowS #

show :: UnknownPragma -> String

showList :: [UnknownPragma] -> ShowS #

Show Extension 
Instance details

Defined in Language.Haskell.Exts.Extension

Methods

showsPrec :: Int -> Extension -> ShowS #

show :: Extension -> String

showList :: [Extension] -> ShowS #

Show KnownExtension 
Instance details

Defined in Language.Haskell.Exts.Extension

Methods

showsPrec :: Int -> KnownExtension -> ShowS #

show :: KnownExtension -> String

showList :: [KnownExtension] -> ShowS #

Show Language 
Instance details

Defined in Language.Haskell.Exts.Extension

Methods

showsPrec :: Int -> Language -> ShowS #

show :: Language -> String

showList :: [Language] -> ShowS #

Show Fixity 
Instance details

Defined in Language.Haskell.Exts.Fixity

Methods

showsPrec :: Int -> Fixity -> ShowS #

show :: Fixity -> String

showList :: [Fixity] -> ShowS #

Show SrcLoc 
Instance details

Defined in Language.Haskell.Exts.SrcLoc

Methods

showsPrec :: Int -> SrcLoc -> ShowS #

show :: SrcLoc -> String

showList :: [SrcLoc] -> ShowS #

Show SrcSpan 
Instance details

Defined in Language.Haskell.Exts.SrcLoc

Methods

showsPrec :: Int -> SrcSpan -> ShowS #

show :: SrcSpan -> String

showList :: [SrcSpan] -> ShowS #

Show SrcSpanInfo 
Instance details

Defined in Language.Haskell.Exts.SrcLoc

Methods

showsPrec :: Int -> SrcSpanInfo -> ShowS #

show :: SrcSpanInfo -> String

showList :: [SrcSpanInfo] -> ShowS #

Show Boxed 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Boxed -> ShowS #

show :: Boxed -> String

showList :: [Boxed] -> ShowS #

Show Tool 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Tool -> ShowS #

show :: Tool -> String

showList :: [Tool] -> ShowS #

Show Cookie 
Instance details

Defined in System.INotify

Methods

showsPrec :: Int -> Cookie -> ShowS #

show :: Cookie -> String

showList :: [Cookie] -> ShowS #

Show Event 
Instance details

Defined in System.INotify

Methods

showsPrec :: Int -> Event -> ShowS #

show :: Event -> String

showList :: [Event] -> ShowS #

Show FDEvent 
Instance details

Defined in System.INotify

Methods

showsPrec :: Int -> FDEvent -> ShowS #

show :: FDEvent -> String

showList :: [FDEvent] -> ShowS #

Show INotify 
Instance details

Defined in System.INotify

Methods

showsPrec :: Int -> INotify -> ShowS #

show :: INotify -> String

showList :: [INotify] -> ShowS #

Show WatchDescriptor 
Instance details

Defined in System.INotify

Methods

showsPrec :: Int -> WatchDescriptor -> ShowS #

show :: WatchDescriptor -> String

showList :: [WatchDescriptor] -> ShowS #

Show UnixEpoch 
Instance details

Defined in Data.Hourglass.Epoch

Methods

showsPrec :: Int -> UnixEpoch -> ShowS #

show :: UnixEpoch -> String

showList :: [UnixEpoch] -> ShowS #

Show WindowsEpoch 
Instance details

Defined in Data.Hourglass.Epoch

Methods

showsPrec :: Int -> WindowsEpoch -> ShowS #

show :: WindowsEpoch -> String

showList :: [WindowsEpoch] -> ShowS #

Show Date 
Instance details

Defined in Time.Types

Methods

showsPrec :: Int -> Date -> ShowS #

show :: Date -> String

showList :: [Date] -> ShowS #

Show DateTime 
Instance details

Defined in Time.Types

Methods

showsPrec :: Int -> DateTime -> ShowS #

show :: DateTime -> String

showList :: [DateTime] -> ShowS #

Show Elapsed 
Instance details

Defined in Time.Types

Methods

showsPrec :: Int -> Elapsed -> ShowS #

show :: Elapsed -> String

showList :: [Elapsed] -> ShowS #

Show ElapsedP 
Instance details

Defined in Time.Types

Methods

showsPrec :: Int -> ElapsedP -> ShowS #

show :: ElapsedP -> String

showList :: [ElapsedP] -> ShowS #

Show Hours 
Instance details

Defined in Time.Types

Methods

showsPrec :: Int -> Hours -> ShowS #

show :: Hours -> String

showList :: [Hours] -> ShowS #

Show Minutes 
Instance details

Defined in Time.Types

Methods

showsPrec :: Int -> Minutes -> ShowS #

show :: Minutes -> String

showList :: [Minutes] -> ShowS #

Show Month 
Instance details

Defined in Time.Types

Methods

showsPrec :: Int -> Month -> ShowS #

show :: Month -> String

showList :: [Month] -> ShowS #

Show NanoSeconds 
Instance details

Defined in Time.Types

Methods

showsPrec :: Int -> NanoSeconds -> ShowS #

show :: NanoSeconds -> String

showList :: [NanoSeconds] -> ShowS #

Show Seconds 
Instance details

Defined in Time.Types

Methods

showsPrec :: Int -> Seconds -> ShowS #

show :: Seconds -> String

showList :: [Seconds] -> ShowS #

Show TimeOfDay 
Instance details

Defined in Time.Types

Methods

showsPrec :: Int -> TimeOfDay -> ShowS #

show :: TimeOfDay -> String

showList :: [TimeOfDay] -> ShowS #

Show TimezoneOffset 
Instance details

Defined in Time.Types

Methods

showsPrec :: Int -> TimezoneOffset -> ShowS #

show :: TimezoneOffset -> String

showList :: [TimezoneOffset] -> ShowS #

Show WeekDay 
Instance details

Defined in Time.Types

Methods

showsPrec :: Int -> WeekDay -> ShowS #

show :: WeekDay -> String

showList :: [WeekDay] -> ShowS #

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 FailureReason 
Instance details

Defined in Test.Hspec.Core.Example

Methods

showsPrec :: Int -> FailureReason -> ShowS #

show :: FailureReason -> String

showList :: [FailureReason] -> ShowS #

Show Params 
Instance details

Defined in Test.Hspec.Core.Example

Methods

showsPrec :: Int -> Params -> ShowS #

show :: Params -> String

showList :: [Params] -> ShowS #

Show Result 
Instance details

Defined in Test.Hspec.Core.Example

Methods

showsPrec :: Int -> Result -> ShowS #

show :: Result -> String

showList :: [Result] -> ShowS #

Show ResultStatus 
Instance details

Defined in Test.Hspec.Core.Example

Methods

showsPrec :: Int -> ResultStatus -> ShowS #

show :: ResultStatus -> String

showList :: [ResultStatus] -> ShowS #

Show Event 
Instance details

Defined in Test.Hspec.Core.Format

Methods

showsPrec :: Int -> Event -> ShowS #

show :: Event -> String

showList :: [Event] -> ShowS #

Show Item 
Instance details

Defined in Test.Hspec.Core.Format

Methods

showsPrec :: Int -> Item -> ShowS #

show :: Item -> String

showList :: [Item] -> ShowS #

Show Result 
Instance details

Defined in Test.Hspec.Core.Format

Methods

showsPrec :: Int -> Result -> ShowS #

show :: Result -> String

showList :: [Result] -> ShowS #

Show Chunk 
Instance details

Defined in Test.Hspec.Core.Formatters.V2

Methods

showsPrec :: Int -> Chunk -> ShowS #

show :: Chunk -> String

showList :: [Chunk] -> ShowS #

Show ColorChunk 
Instance details

Defined in Test.Hspec.Core.Formatters.V2

Methods

showsPrec :: Int -> ColorChunk -> ShowS #

show :: ColorChunk -> String

showList :: [ColorChunk] -> ShowS #

Show ProgressReporting 
Instance details

Defined in Test.Hspec.Core.Runner

Methods

showsPrec :: Int -> ProgressReporting -> ShowS #

show :: ProgressReporting -> String

showList :: [ProgressReporting] -> ShowS #

Show UseColor 
Instance details

Defined in Test.Hspec.Core.Runner

Methods

showsPrec :: Int -> UseColor -> ShowS #

show :: UseColor -> String

showList :: [UseColor] -> 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

Methods

showsPrec :: Int -> HttpExceptionContent -> ShowS #

show :: HttpExceptionContent -> String

showList :: [HttpExceptionContent] -> ShowS #

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 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 MediaType 
Instance details

Defined in Network.HTTP.Media.MediaType.Internal

Methods

showsPrec :: Int -> MediaType -> ShowS #

show :: MediaType -> String

showList :: [MediaType] -> 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 Token 
Instance details

Defined in Network.HPACK.Token

Methods

showsPrec :: Int -> Token -> ShowS #

show :: Token -> String

showList :: [Token] -> ShowS #

Show Attribute 
Instance details

Defined in IHP.HSX.Parser

Methods

showsPrec :: Int -> Attribute -> ShowS #

show :: Attribute -> String

showList :: [Attribute] -> ShowS #

Show AttributeValue 
Instance details

Defined in IHP.HSX.Parser

Methods

showsPrec :: Int -> AttributeValue -> ShowS #

show :: AttributeValue -> String

showList :: [AttributeValue] -> ShowS #

Show Node 
Instance details

Defined in IHP.HSX.Parser

Methods

showsPrec :: Int -> Node -> ShowS #

show :: Node -> String

showList :: [Node] -> ShowS #

Show TokenTree 
Instance details

Defined in IHP.HSX.Parser

Methods

showsPrec :: Int -> TokenTree -> ShowS #

show :: TokenTree -> String

showList :: [TokenTree] -> ShowS #

Show Point 
Instance details

Defined in IHP.Postgres.Point

Methods

showsPrec :: Int -> Point -> ShowS #

show :: Point -> String

showList :: [Point] -> ShowS #

Show Polygon 
Instance details

Defined in IHP.Postgres.Polygon

Methods

showsPrec :: Int -> Polygon -> ShowS #

show :: Polygon -> String

showList :: [Polygon] -> ShowS #

Show Lexeme 
Instance details

Defined in IHP.Postgres.TSVector

Methods

showsPrec :: Int -> Lexeme -> ShowS #

show :: Lexeme -> String

showList :: [Lexeme] -> ShowS #

Show LexemeRanking 
Instance details

Defined in IHP.Postgres.TSVector

Methods

showsPrec :: Int -> LexemeRanking -> ShowS #

show :: LexemeRanking -> String

showList :: [LexemeRanking] -> ShowS #

Show TSVector 
Instance details

Defined in IHP.Postgres.TSVector

Methods

showsPrec :: Int -> TSVector -> ShowS #

show :: TSVector -> String

showList :: [TSVector] -> ShowS #

Show PGInterval 
Instance details

Defined in IHP.Postgres.TimeParser

Methods

showsPrec :: Int -> PGInterval -> ShowS #

show :: PGInterval -> String

showList :: [PGInterval] -> ShowS #

Show PGTimeInterval 
Instance details

Defined in IHP.Postgres.TimeParser

Show InflectionException 
Instance details

Defined in Text.Inflections.Types

Methods

showsPrec :: Int -> InflectionException -> ShowS #

show :: InflectionException -> String

showList :: [InflectionException] -> ShowS #

Show SomeWord 
Instance details

Defined in Text.Inflections.Types

Methods

showsPrec :: Int -> SomeWord -> ShowS #

show :: SomeWord -> String

showList :: [SomeWord] -> ShowS #

Show Ini 
Instance details

Defined in Data.Ini

Methods

showsPrec :: Int -> Ini -> ShowS #

show :: Ini -> String

showList :: [Ini] -> ShowS #

Show KeySeparator 
Instance details

Defined in Data.Ini

Methods

showsPrec :: Int -> KeySeparator -> ShowS #

show :: KeySeparator -> String

showList :: [KeySeparator] -> ShowS #

Show WriteIniSettings 
Instance details

Defined in Data.Ini

Methods

showsPrec :: Int -> WriteIniSettings -> ShowS #

show :: WriteIniSettings -> String

showList :: [WriteIniSettings] -> ShowS #

Show Options 
Instance details

Defined in Data.Functor.Invariant.TH

Methods

showsPrec :: Int -> Options -> ShowS #

show :: Options -> String

showList :: [Options] -> ShowS #

Show IP 
Instance details

Defined in Net.IP

Methods

showsPrec :: Int -> IP -> ShowS #

show :: IP -> String

showList :: [IP] -> ShowS #

Show IPv4 
Instance details

Defined in Net.IPv4

Methods

showsPrec :: Int -> IPv4 -> ShowS #

show :: IPv4 -> String

showList :: [IPv4] -> ShowS #

Show IPv4Range 
Instance details

Defined in Net.IPv4

Methods

showsPrec :: Int -> IPv4Range -> ShowS #

show :: IPv4Range -> String

showList :: [IPv4Range] -> ShowS #

Show IPv6 
Instance details

Defined in Net.IPv6

Methods

showsPrec :: Int -> IPv6 -> ShowS #

show :: IPv6 -> String

showList :: [IPv6] -> ShowS #

Show IPv6Range 
Instance details

Defined in Net.IPv6

Methods

showsPrec :: Int -> IPv6Range -> ShowS #

show :: IPv6Range -> String

showList :: [IPv6Range] -> ShowS #

Show Mac 
Instance details

Defined in Net.Mac

Methods

showsPrec :: Int -> Mac -> ShowS #

show :: Mac -> String

showList :: [Mac] -> ShowS #

Show MacCodec 
Instance details

Defined in Net.Mac

Methods

showsPrec :: Int -> MacCodec -> ShowS #

show :: MacCodec -> String

showList :: [MacCodec] -> ShowS #

Show MacGrouping 
Instance details

Defined in Net.Mac

Methods

showsPrec :: Int -> MacGrouping -> ShowS #

show :: MacGrouping -> String

showList :: [MacGrouping] -> 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 HandlingException 
Instance details

Defined in Control.Lens.Internal.Exception

Methods

showsPrec :: Int -> HandlingException -> ShowS #

show :: HandlingException -> String

showList :: [HandlingException] -> ShowS #

Show DefName 
Instance details

Defined in Control.Lens.Internal.FieldTH

Methods

showsPrec :: Int -> DefName -> ShowS #

show :: DefName -> String

showList :: [DefName] -> ShowS #

Show BreadcrumbItem Source # 
Instance details

Defined in IHP.Breadcrumb.Types

Show ParamException Source # 
Instance details

Defined in IHP.Controller.Param

Show ResponseException Source # 
Instance details

Defined in IHP.Controller.Response

Show SessionError Source # 
Instance details

Defined in IHP.Controller.Session

Methods

showsPrec :: Int -> SessionError -> ShowS #

show :: SessionError -> String

showList :: [SessionError] -> ShowS #

Show Change Source # 
Instance details

Defined in IHP.DataSync.ChangeNotifications

Methods

showsPrec :: Int -> Change -> ShowS #

show :: Change -> String

showList :: [Change] -> ShowS #

Show ChangeNotification Source # 
Instance details

Defined in IHP.DataSync.ChangeNotifications

Show ChangeSet Source # 
Instance details

Defined in IHP.DataSync.ChangeNotifications

Methods

showsPrec :: Int -> ChangeSet -> ShowS #

show :: ChangeSet -> String

showList :: [ChangeSet] -> ShowS #

Show ConditionExpression Source # 
Instance details

Defined in IHP.DataSync.DynamicQuery

Show ConditionOperator Source # 
Instance details

Defined in IHP.DataSync.DynamicQuery

Show DynamicSQLQuery Source # 
Instance details

Defined in IHP.DataSync.DynamicQuery

Show DynamicValue Source # 
Instance details

Defined in IHP.DataSync.DynamicQuery

Methods

showsPrec :: Int -> DynamicValue -> ShowS #

show :: DynamicValue -> String

showList :: [DynamicValue] -> ShowS #

Show FunctionCall Source # 
Instance details

Defined in IHP.DataSync.DynamicQuery

Methods

showsPrec :: Int -> FunctionCall -> ShowS #

show :: FunctionCall -> String

showList :: [FunctionCall] -> ShowS #

Show OrderByClause Source # 
Instance details

Defined in IHP.DataSync.DynamicQuery

Methods

showsPrec :: Int -> OrderByClause -> ShowS #

show :: OrderByClause -> String

showList :: [OrderByClause] -> ShowS #

Show SelectedColumns Source # 
Instance details

Defined in IHP.DataSync.DynamicQuery

Show UndecodedJSON Source # 
Instance details

Defined in IHP.DataSync.DynamicQuery

Methods

showsPrec :: Int -> UndecodedJSON -> ShowS #

show :: UndecodedJSON -> String

showList :: [UndecodedJSON] -> ShowS #

Show ApiController Source # 
Instance details

Defined in IHP.DataSync.REST.Types

Methods

showsPrec :: Int -> ApiController -> ShowS #

show :: ApiController -> String

showList :: [ApiController] -> ShowS #

Show DataSyncMessage Source # 
Instance details

Defined in IHP.DataSync.Types

Show Environment Source # 
Instance details

Defined in IHP.Environment

Methods

showsPrec :: Int -> Environment -> ShowS #

show :: Environment -> String

showList :: [Environment] -> ShowS #

Show ExceptionWithCallStack Source # 
Instance details

Defined in IHP.FrameworkConfig

Show RootApplication Source # 
Instance details

Defined in IHP.FrameworkConfig

Show BaseJob Source # 
Instance details

Defined in IHP.Job.Dashboard.Types

Methods

showsPrec :: Int -> BaseJob -> ShowS #

show :: BaseJob -> String

showList :: [BaseJob] -> ShowS #

Show BackoffStrategy Source # 
Instance details

Defined in IHP.Job.Types

Show JobStatus Source # 
Instance details

Defined in IHP.Job.Types

Methods

showsPrec :: Int -> JobStatus -> ShowS #

show :: JobStatus -> String

showList :: [JobStatus] -> ShowS #

Show LogLevel Source # 
Instance details

Defined in IHP.Log.Types

Methods

showsPrec :: Int -> LogLevel -> ShowS #

show :: LogLevel -> String

showList :: [LogLevel] -> ShowS #

Show MailAttachment Source # 
Instance details

Defined in IHP.Mail.Types

Show EnhancedSqlError Source # 
Instance details

Defined in IHP.ModelSupport

Show MetaBag Source # 
Instance details

Defined in IHP.ModelSupport

Methods

showsPrec :: Int -> MetaBag -> ShowS #

show :: MetaBag -> String

showList :: [MetaBag] -> ShowS #

Show RecordNotFoundException Source # 
Instance details

Defined in IHP.ModelSupport

Show Violation Source # 
Instance details

Defined in IHP.ModelSupport

Methods

showsPrec :: Int -> Violation -> ShowS #

show :: Violation -> String

showList :: [Violation] -> ShowS #

Show Pagination Source # 
Instance details

Defined in IHP.Pagination.Types

Methods

showsPrec :: Int -> Pagination -> ShowS #

show :: Pagination -> String

showList :: [Pagination] -> ShowS #

Show Condition Source # 
Instance details

Defined in IHP.QueryBuilder

Methods

showsPrec :: Int -> Condition -> ShowS #

show :: Condition -> String

showList :: [Condition] -> ShowS #

Show FilterOperator Source # 
Instance details

Defined in IHP.QueryBuilder

Show Join Source # 
Instance details

Defined in IHP.QueryBuilder

Methods

showsPrec :: Int -> Join -> ShowS #

show :: Join -> String

showList :: [Join] -> ShowS #

Show OrderByClause Source # 
Instance details

Defined in IHP.QueryBuilder

Methods

showsPrec :: Int -> OrderByClause -> ShowS #

show :: OrderByClause -> String

showList :: [OrderByClause] -> ShowS #

Show OrderByDirection Source # 
Instance details

Defined in IHP.QueryBuilder

Show SQLQuery Source # 
Instance details

Defined in IHP.QueryBuilder

Methods

showsPrec :: Int -> SQLQuery -> ShowS #

show :: SQLQuery -> String

showList :: [SQLQuery] -> ShowS #

Show TypedAutoRouteError Source # 
Instance details

Defined in IHP.Router.Types

Show UnexpectedMethodException Source # 
Instance details

Defined in IHP.Router.Types

Show Sitemap Source # 
Instance details

Defined in IHP.SEO.Sitemap.Types

Methods

showsPrec :: Int -> Sitemap -> ShowS #

show :: Sitemap -> String

showList :: [Sitemap] -> ShowS #

Show SitemapChangeFrequency Source # 
Instance details

Defined in IHP.SEO.Sitemap.Types

Show SitemapController Source # 
Instance details

Defined in IHP.SEO.Sitemap.Types

Show SitemapLink Source # 
Instance details

Defined in IHP.SEO.Sitemap.Types

Methods

showsPrec :: Int -> SitemapLink -> ShowS #

show :: SitemapLink -> String

showList :: [SitemapLink] -> ShowS #

Show Migration Source # 
Instance details

Defined in IHP.SchemaMigration

Methods

showsPrec :: Int -> Migration -> ShowS #

show :: Migration -> String

showList :: [Migration] -> ShowS #

Show ValidatorResult Source # 
Instance details

Defined in IHP.ValidationSupport.Types

Show Edition Source # 
Instance details

Defined in IHP.Version

Methods

showsPrec :: Int -> Edition -> ShowS #

show :: Edition -> String

showList :: [Edition] -> ShowS #

Show WelcomeController Source # 
Instance details

Defined in IHP.Welcome.Controller

Show InvalidPosException 
Instance details

Defined in Text.Megaparsec.Pos

Methods

showsPrec :: Int -> InvalidPosException -> ShowS #

show :: InvalidPosException -> String

showList :: [InvalidPosException] -> ShowS #

Show Pos 
Instance details

Defined in Text.Megaparsec.Pos

Methods

showsPrec :: Int -> Pos -> ShowS #

show :: Pos -> String

showList :: [Pos] -> ShowS #

Show SourcePos 
Instance details

Defined in Text.Megaparsec.Pos

Methods

showsPrec :: Int -> SourcePos -> ShowS #

show :: SourcePos -> String

showList :: [SourcePos] -> ShowS #

Show Base 
Instance details

Defined in Data.ByteArray.Encoding

Methods

showsPrec :: Int -> Base -> ShowS #

show :: Base -> String

showList :: [Base] -> ShowS #

Show ScrubbedBytes 
Instance details

Defined in Data.ByteArray.ScrubbedBytes

Methods

showsPrec :: Int -> ScrubbedBytes -> ShowS #

show :: ScrubbedBytes -> String

showList :: [ScrubbedBytes] -> 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 Address 
Instance details

Defined in Network.Mail.Mime

Methods

showsPrec :: Int -> Address -> ShowS #

show :: Address -> String

showList :: [Address] -> ShowS #

Show Boundary 
Instance details

Defined in Network.Mail.Mime

Methods

showsPrec :: Int -> Boundary -> ShowS #

show :: Boundary -> String

showList :: [Boundary] -> ShowS #

Show Disposition 
Instance details

Defined in Network.Mail.Mime

Methods

showsPrec :: Int -> Disposition -> ShowS #

show :: Disposition -> String

showList :: [Disposition] -> ShowS #

Show Encoding 
Instance details

Defined in Network.Mail.Mime

Methods

showsPrec :: Int -> Encoding -> ShowS #

show :: Encoding -> String

showList :: [Encoding] -> ShowS #

Show ImageContent 
Instance details

Defined in Network.Mail.Mime

Methods

showsPrec :: Int -> ImageContent -> ShowS #

show :: ImageContent -> String

showList :: [ImageContent] -> ShowS #

Show InlineImage 
Instance details

Defined in Network.Mail.Mime

Methods

showsPrec :: Int -> InlineImage -> ShowS #

show :: InlineImage -> String

showList :: [InlineImage] -> ShowS #

Show Mail 
Instance details

Defined in Network.Mail.Mime

Methods

showsPrec :: Int -> Mail -> ShowS #

show :: Mail -> String

showList :: [Mail] -> ShowS #

Show Part 
Instance details

Defined in Network.Mail.Mime

Methods

showsPrec :: Int -> Part -> ShowS #

show :: Part -> String

showList :: [Part] -> ShowS #

Show PartContent 
Instance details

Defined in Network.Mail.Mime

Methods

showsPrec :: Int -> PartContent -> ShowS #

show :: PartContent -> String

showList :: [PartContent] -> ShowS #

Show SES 
Instance details

Defined in Network.Mail.Mime.SES

Methods

showsPrec :: Int -> SES -> ShowS #

show :: SES -> String

showList :: [SES] -> ShowS #

Show SESException 
Instance details

Defined in Network.Mail.Mime.SES

Methods

showsPrec :: Int -> SESException -> ShowS #

show :: SESException -> String

showList :: [SESException] -> ShowS #

Show Backend 
Instance details

Defined in Network.Minio.AdminAPI

Methods

showsPrec :: Int -> Backend -> ShowS #

show :: Backend -> String

showList :: [Backend] -> ShowS #

Show ConnStats 
Instance details

Defined in Network.Minio.AdminAPI

Methods

showsPrec :: Int -> ConnStats -> ShowS #

show :: ConnStats -> String

showList :: [ConnStats] -> ShowS #

Show CountNAvgTime 
Instance details

Defined in Network.Minio.AdminAPI

Methods

showsPrec :: Int -> CountNAvgTime -> ShowS #

show :: CountNAvgTime -> String

showList :: [CountNAvgTime] -> ShowS #

Show DriveInfo 
Instance details

Defined in Network.Minio.AdminAPI

Methods

showsPrec :: Int -> DriveInfo -> ShowS #

show :: DriveInfo -> String

showList :: [DriveInfo] -> ShowS #

Show ErasureInfo 
Instance details

Defined in Network.Minio.AdminAPI

Methods

showsPrec :: Int -> ErasureInfo -> ShowS #

show :: ErasureInfo -> String

showList :: [ErasureInfo] -> ShowS #

Show HealItemType 
Instance details

Defined in Network.Minio.AdminAPI

Methods

showsPrec :: Int -> HealItemType -> ShowS #

show :: HealItemType -> String

showList :: [HealItemType] -> ShowS #

Show HealOpts 
Instance details

Defined in Network.Minio.AdminAPI

Methods

showsPrec :: Int -> HealOpts -> ShowS #

show :: HealOpts -> String

showList :: [HealOpts] -> ShowS #

Show HealResultItem 
Instance details

Defined in Network.Minio.AdminAPI

Methods

showsPrec :: Int -> HealResultItem -> ShowS #

show :: HealResultItem -> String

showList :: [HealResultItem] -> ShowS #

Show HealStartResp 
Instance details

Defined in Network.Minio.AdminAPI

Methods

showsPrec :: Int -> HealStartResp -> ShowS #

show :: HealStartResp -> String

showList :: [HealStartResp] -> ShowS #

Show HealStatus 
Instance details

Defined in Network.Minio.AdminAPI

Methods

showsPrec :: Int -> HealStatus -> ShowS #

show :: HealStatus -> String

showList :: [HealStatus] -> ShowS #

Show HttpStats 
Instance details

Defined in Network.Minio.AdminAPI

Methods

showsPrec :: Int -> HttpStats -> ShowS #

show :: HttpStats -> String

showList :: [HttpStats] -> ShowS #

Show NodeSummary 
Instance details

Defined in Network.Minio.AdminAPI

Methods

showsPrec :: Int -> NodeSummary -> ShowS #

show :: NodeSummary -> String

showList :: [NodeSummary] -> ShowS #

Show SIData 
Instance details

Defined in Network.Minio.AdminAPI

Methods

showsPrec :: Int -> SIData -> ShowS #

show :: SIData -> String

showList :: [SIData] -> ShowS #

Show ServerInfo 
Instance details

Defined in Network.Minio.AdminAPI

Methods

showsPrec :: Int -> ServerInfo -> ShowS #

show :: ServerInfo -> String

showList :: [ServerInfo] -> ShowS #

Show ServerProps 
Instance details

Defined in Network.Minio.AdminAPI

Methods

showsPrec :: Int -> ServerProps -> ShowS #

show :: ServerProps -> String

showList :: [ServerProps] -> ShowS #

Show ServerVersion 
Instance details

Defined in Network.Minio.AdminAPI

Methods

showsPrec :: Int -> ServerVersion -> ShowS #

show :: ServerVersion -> String

showList :: [ServerVersion] -> ShowS #

Show ServiceAction 
Instance details

Defined in Network.Minio.AdminAPI

Methods

showsPrec :: Int -> ServiceAction -> ShowS #

show :: ServiceAction -> String

showList :: [ServiceAction] -> ShowS #

Show ServiceStatus 
Instance details

Defined in Network.Minio.AdminAPI

Methods

showsPrec :: Int -> ServiceStatus -> ShowS #

show :: ServiceStatus -> String

showList :: [ServiceStatus] -> ShowS #

Show SetConfigResult 
Instance details

Defined in Network.Minio.AdminAPI

Methods

showsPrec :: Int -> SetConfigResult -> ShowS #

show :: SetConfigResult -> String

showList :: [SetConfigResult] -> ShowS #

Show StorageClass 
Instance details

Defined in Network.Minio.AdminAPI

Methods

showsPrec :: Int -> StorageClass -> ShowS #

show :: StorageClass -> String

showList :: [StorageClass] -> ShowS #

Show StorageInfo 
Instance details

Defined in Network.Minio.AdminAPI

Methods

showsPrec :: Int -> StorageInfo -> ShowS #

show :: StorageInfo -> String

showList :: [StorageInfo] -> ShowS #

Show AccessKey 
Instance details

Defined in Network.Minio.Credentials.Types

Methods

showsPrec :: Int -> AccessKey -> ShowS #

show :: AccessKey -> String

showList :: [AccessKey] -> ShowS #

Show CredentialValue 
Instance details

Defined in Network.Minio.Credentials.Types

Methods

showsPrec :: Int -> CredentialValue -> ShowS #

show :: CredentialValue -> String

showList :: [CredentialValue] -> ShowS #

Show ExpiryTime 
Instance details

Defined in Network.Minio.Credentials.Types

Methods

showsPrec :: Int -> ExpiryTime -> ShowS #

show :: ExpiryTime -> String

showList :: [ExpiryTime] -> ShowS #

Show SecretKey 
Instance details

Defined in Network.Minio.Credentials.Types

Methods

showsPrec :: Int -> SecretKey -> ShowS #

show :: SecretKey -> String

showList :: [SecretKey] -> ShowS #

Show SessionToken 
Instance details

Defined in Network.Minio.Credentials.Types

Methods

showsPrec :: Int -> SessionToken -> ShowS #

show :: SessionToken -> String

showList :: [SessionToken] -> ShowS #

Show BucketInfo 
Instance details

Defined in Network.Minio.Data

Methods

showsPrec :: Int -> BucketInfo -> ShowS #

show :: BucketInfo -> String

showList :: [BucketInfo] -> ShowS #

Show CSVProp 
Instance details

Defined in Network.Minio.Data

Methods

showsPrec :: Int -> CSVProp -> ShowS #

show :: CSVProp -> String

showList :: [CSVProp] -> ShowS #

Show CompressionType 
Instance details

Defined in Network.Minio.Data

Methods

showsPrec :: Int -> CompressionType -> ShowS #

show :: CompressionType -> String

showList :: [CompressionType] -> ShowS #

Show DestinationInfo 
Instance details

Defined in Network.Minio.Data

Methods

showsPrec :: Int -> DestinationInfo -> ShowS #

show :: DestinationInfo -> String

showList :: [DestinationInfo] -> ShowS #

Show Event 
Instance details

Defined in Network.Minio.Data

Methods

showsPrec :: Int -> Event -> ShowS #

show :: Event -> String

showList :: [Event] -> ShowS #

Show EventMessage 
Instance details

Defined in Network.Minio.Data

Methods

showsPrec :: Int -> EventMessage -> ShowS #

show :: EventMessage -> String

showList :: [EventMessage] -> ShowS #

Show ExpressionType 
Instance details

Defined in Network.Minio.Data

Methods

showsPrec :: Int -> ExpressionType -> ShowS #

show :: ExpressionType -> String

showList :: [ExpressionType] -> ShowS #

Show FileHeaderInfo 
Instance details

Defined in Network.Minio.Data

Methods

showsPrec :: Int -> FileHeaderInfo -> ShowS #

show :: FileHeaderInfo -> String

showList :: [FileHeaderInfo] -> ShowS #

Show Filter 
Instance details

Defined in Network.Minio.Data

Methods

showsPrec :: Int -> Filter -> ShowS #

show :: Filter -> String

showList :: [Filter] -> ShowS #

Show FilterKey 
Instance details

Defined in Network.Minio.Data

Methods

showsPrec :: Int -> FilterKey -> ShowS #

show :: FilterKey -> String

showList :: [FilterKey] -> ShowS #

Show FilterRule 
Instance details

Defined in Network.Minio.Data

Methods

showsPrec :: Int -> FilterRule -> ShowS #

show :: FilterRule -> String

showList :: [FilterRule] -> ShowS #

Show FilterRules 
Instance details

Defined in Network.Minio.Data

Methods

showsPrec :: Int -> FilterRules -> ShowS #

show :: FilterRules -> String

showList :: [FilterRules] -> ShowS #

Show InputFormatInfo 
Instance details

Defined in Network.Minio.Data

Methods

showsPrec :: Int -> InputFormatInfo -> ShowS #

show :: InputFormatInfo -> String

showList :: [InputFormatInfo] -> ShowS #

Show InputSerialization 
Instance details

Defined in Network.Minio.Data

Methods

showsPrec :: Int -> InputSerialization -> ShowS #

show :: InputSerialization -> String

showList :: [InputSerialization] -> ShowS #

Show JSONInputProp 
Instance details

Defined in Network.Minio.Data

Methods

showsPrec :: Int -> JSONInputProp -> ShowS #

show :: JSONInputProp -> String

showList :: [JSONInputProp] -> ShowS #

Show JSONOutputProp 
Instance details

Defined in Network.Minio.Data

Methods

showsPrec :: Int -> JSONOutputProp -> ShowS #

show :: JSONOutputProp -> String

showList :: [JSONOutputProp] -> ShowS #

Show JSONType 
Instance details

Defined in Network.Minio.Data

Methods

showsPrec :: Int -> JSONType -> ShowS #

show :: JSONType -> String

showList :: [JSONType] -> ShowS #

Show ListObjectsResult 
Instance details

Defined in Network.Minio.Data

Methods

showsPrec :: Int -> ListObjectsResult -> ShowS #

show :: ListObjectsResult -> String

showList :: [ListObjectsResult] -> ShowS #

Show ListObjectsV1Result 
Instance details

Defined in Network.Minio.Data

Methods

showsPrec :: Int -> ListObjectsV1Result -> ShowS #

show :: ListObjectsV1Result -> String

showList :: [ListObjectsV1Result] -> ShowS #

Show ListPartsResult 
Instance details

Defined in Network.Minio.Data

Methods

showsPrec :: Int -> ListPartsResult -> ShowS #

show :: ListPartsResult -> String

showList :: [ListPartsResult] -> ShowS #

Show ListUploadsResult 
Instance details

Defined in Network.Minio.Data

Methods

showsPrec :: Int -> ListUploadsResult -> ShowS #

show :: ListUploadsResult -> String

showList :: [ListUploadsResult] -> ShowS #

Show MsgHeaderName 
Instance details

Defined in Network.Minio.Data

Methods

showsPrec :: Int -> MsgHeaderName -> ShowS #

show :: MsgHeaderName -> String

showList :: [MsgHeaderName] -> ShowS #

Show Notification 
Instance details

Defined in Network.Minio.Data

Methods

showsPrec :: Int -> Notification -> ShowS #

show :: Notification -> String

showList :: [Notification] -> ShowS #

Show NotificationConfig 
Instance details

Defined in Network.Minio.Data

Methods

showsPrec :: Int -> NotificationConfig -> ShowS #

show :: NotificationConfig -> String

showList :: [NotificationConfig] -> ShowS #

Show ObjectInfo 
Instance details

Defined in Network.Minio.Data

Methods

showsPrec :: Int -> ObjectInfo -> ShowS #

show :: ObjectInfo -> String

showList :: [ObjectInfo] -> ShowS #

Show ObjectPartInfo 
Instance details

Defined in Network.Minio.Data

Methods

showsPrec :: Int -> ObjectPartInfo -> ShowS #

show :: ObjectPartInfo -> String

showList :: [ObjectPartInfo] -> ShowS #

Show OutputSerialization 
Instance details

Defined in Network.Minio.Data

Methods

showsPrec :: Int -> OutputSerialization -> ShowS #

show :: OutputSerialization -> String

showList :: [OutputSerialization] -> ShowS #

Show Progress 
Instance details

Defined in Network.Minio.Data

Methods

showsPrec :: Int -> Progress -> ShowS #

show :: Progress -> String

showList :: [Progress] -> ShowS #

Show QuoteFields 
Instance details

Defined in Network.Minio.Data

Methods

showsPrec :: Int -> QuoteFields -> ShowS #

show :: QuoteFields -> String

showList :: [QuoteFields] -> ShowS #

Show SSECKey 
Instance details

Defined in Network.Minio.Data

Methods

showsPrec :: Int -> SSECKey -> ShowS #

show :: SSECKey -> String

showList :: [SSECKey] -> ShowS #

Show SelectRequest 
Instance details

Defined in Network.Minio.Data

Methods

showsPrec :: Int -> SelectRequest -> ShowS #

show :: SelectRequest -> String

showList :: [SelectRequest] -> ShowS #

Show SourceInfo 
Instance details

Defined in Network.Minio.Data

Methods

showsPrec :: Int -> SourceInfo -> ShowS #

show :: SourceInfo -> String

showList :: [SourceInfo] -> ShowS #

Show UploadInfo 
Instance details

Defined in Network.Minio.Data

Methods

showsPrec :: Int -> UploadInfo -> ShowS #

show :: UploadInfo -> String

showList :: [UploadInfo] -> ShowS #

Show MErrV 
Instance details

Defined in Network.Minio.Errors

Methods

showsPrec :: Int -> MErrV -> ShowS #

show :: MErrV -> String

showList :: [MErrV] -> ShowS #

Show MinioErr 
Instance details

Defined in Network.Minio.Errors

Methods

showsPrec :: Int -> MinioErr -> ShowS #

show :: MinioErr -> String

showList :: [MinioErr] -> ShowS #

Show ServiceErr 
Instance details

Defined in Network.Minio.Errors

Methods

showsPrec :: Int -> ServiceErr -> ShowS #

show :: ServiceErr -> String

showList :: [ServiceErr] -> ShowS #

Show PostPolicy 
Instance details

Defined in Network.Minio.PresignedOperations

Methods

showsPrec :: Int -> PostPolicy -> ShowS #

show :: PostPolicy -> String

showList :: [PostPolicy] -> ShowS #

Show PostPolicyCondition 
Instance details

Defined in Network.Minio.PresignedOperations

Methods

showsPrec :: Int -> PostPolicyCondition -> ShowS #

show :: PostPolicyCondition -> String

showList :: [PostPolicyCondition] -> ShowS #

Show PostPolicyError 
Instance details

Defined in Network.Minio.PresignedOperations

Methods

showsPrec :: Int -> PostPolicyError -> ShowS #

show :: PostPolicyError -> String

showList :: [PostPolicyError] -> ShowS #

Show NullError 
Instance details

Defined in Data.NonNull

Methods

showsPrec :: Int -> NullError -> ShowS #

show :: NullError -> String

showList :: [NullError] -> 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 HostEntry 
Instance details

Defined in Network.BSD

Methods

showsPrec :: Int -> HostEntry -> ShowS #

show :: HostEntry -> String

showList :: [HostEntry] -> ShowS #

Show NetworkEntry 
Instance details

Defined in Network.BSD

Methods

showsPrec :: Int -> NetworkEntry -> ShowS #

show :: NetworkEntry -> String

showList :: [NetworkEntry] -> ShowS #

Show ProtocolEntry 
Instance details

Defined in Network.BSD

Methods

showsPrec :: Int -> ProtocolEntry -> ShowS #

show :: ProtocolEntry -> String

showList :: [ProtocolEntry] -> ShowS #

Show ServiceEntry 
Instance details

Defined in Network.BSD

Methods

showsPrec :: Int -> ServiceEntry -> ShowS #

show :: ServiceEntry -> String

showList :: [ServiceEntry] -> ShowS #

Show BufferOverrun 
Instance details

Defined in Network.ByteOrder

Methods

showsPrec :: Int -> BufferOverrun -> ShowS #

show :: BufferOverrun -> String

showList :: [BufferOverrun] -> ShowS #

Show IPv4 
Instance details

Defined in Network.Info

Methods

showsPrec :: Int -> IPv4 -> ShowS #

show :: IPv4 -> String

showList :: [IPv4] -> ShowS #

Show IPv6 
Instance details

Defined in Network.Info

Methods

showsPrec :: Int -> IPv6 -> ShowS #

show :: IPv6 -> String

showList :: [IPv6] -> ShowS #

Show MAC 
Instance details

Defined in Network.Info

Methods

showsPrec :: Int -> MAC -> ShowS #

show :: MAC -> String

showList :: [MAC] -> ShowS #

Show NetworkInterface 
Instance details

Defined in Network.Info

Methods

showsPrec :: Int -> NetworkInterface -> ShowS #

show :: NetworkInterface -> String

showList :: [NetworkInterface] -> 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 TimeLocale 
Instance details

Defined in System.Locale

Methods

showsPrec :: Int -> TimeLocale -> ShowS #

show :: TimeLocale -> String

showList :: [TimeLocale] -> ShowS #

Show CalendarTime 
Instance details

Defined in System.Time

Methods

showsPrec :: Int -> CalendarTime -> ShowS #

show :: CalendarTime -> String

showList :: [CalendarTime] -> ShowS #

Show ClockTime 
Instance details

Defined in System.Time

Methods

showsPrec :: Int -> ClockTime -> ShowS #

show :: ClockTime -> String

showList :: [ClockTime] -> ShowS #

Show Day 
Instance details

Defined in System.Time

Methods

showsPrec :: Int -> Day -> ShowS #

show :: Day -> String

showList :: [Day] -> ShowS #

Show Month 
Instance details

Defined in System.Time

Methods

showsPrec :: Int -> Month -> ShowS #

show :: Month -> String

showList :: [Month] -> ShowS #

Show TimeDiff 
Instance details

Defined in System.Time

Methods

showsPrec :: Int -> TimeDiff -> ShowS #

show :: TimeDiff -> String

showList :: [TimeDiff] -> 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 EncodingException 
Instance details

Defined in System.OsString.Encoding.Internal

Methods

showsPrec :: Int -> EncodingException -> ShowS #

show :: EncodingException -> String

showList :: [EncodingException] -> 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 ParseError 
Instance details

Defined in Text.Parsec.Error

Methods

showsPrec :: Int -> ParseError -> ShowS #

show :: ParseError -> String

showList :: [ParseError] -> ShowS #

Show SourcePos 
Instance details

Defined in Text.Parsec.Pos

Methods

showsPrec :: Int -> SourcePos -> ShowS #

show :: SourcePos -> String

showList :: [SourcePos] -> ShowS #

Show Replacement 
Instance details

Defined in Text.Regex.PCRE.ByteString.Utils

Methods

showsPrec :: Int -> Replacement -> ShowS #

show :: Replacement -> String

showList :: [Replacement] -> ShowS #

Show Cancel 
Instance details

Defined in Database.PostgreSQL.LibPQ

Methods

showsPrec :: Int -> Cancel -> ShowS #

show :: Cancel -> String

showList :: [Cancel] -> ShowS #

Show Column 
Instance details

Defined in Database.PostgreSQL.LibPQ

Methods

showsPrec :: Int -> Column -> ShowS #

show :: Column -> String

showList :: [Column] -> ShowS #

Show CopyInResult 
Instance details

Defined in Database.PostgreSQL.LibPQ

Methods

showsPrec :: Int -> CopyInResult -> ShowS #

show :: CopyInResult -> String

showList :: [CopyInResult] -> ShowS #

Show CopyOutResult 
Instance details

Defined in Database.PostgreSQL.LibPQ

Methods

showsPrec :: Int -> CopyOutResult -> ShowS #

show :: CopyOutResult -> String

showList :: [CopyOutResult] -> ShowS #

Show FlushStatus 
Instance details

Defined in Database.PostgreSQL.LibPQ

Methods

showsPrec :: Int -> FlushStatus -> ShowS #

show :: FlushStatus -> String

showList :: [FlushStatus] -> ShowS #

Show LoFd 
Instance details

Defined in Database.PostgreSQL.LibPQ

Methods

showsPrec :: Int -> LoFd -> ShowS #

show :: LoFd -> String

showList :: [LoFd] -> ShowS #

Show Result 
Instance details

Defined in Database.PostgreSQL.LibPQ

Methods

showsPrec :: Int -> Result -> ShowS #

show :: Result -> String

showList :: [Result] -> ShowS #

Show Row 
Instance details

Defined in Database.PostgreSQL.LibPQ

Methods

showsPrec :: Int -> Row -> ShowS #

show :: Row -> String

showList :: [Row] -> ShowS #

Show ConnStatus 
Instance details

Defined in Database.PostgreSQL.LibPQ.Enums

Methods

showsPrec :: Int -> ConnStatus -> ShowS #

show :: ConnStatus -> String

showList :: [ConnStatus] -> ShowS #

Show ExecStatus 
Instance details

Defined in Database.PostgreSQL.LibPQ.Enums

Methods

showsPrec :: Int -> ExecStatus -> ShowS #

show :: ExecStatus -> String

showList :: [ExecStatus] -> ShowS #

Show FieldCode 
Instance details

Defined in Database.PostgreSQL.LibPQ.Enums

Methods

showsPrec :: Int -> FieldCode -> ShowS #

show :: FieldCode -> String

showList :: [FieldCode] -> ShowS #

Show Format 
Instance details

Defined in Database.PostgreSQL.LibPQ.Enums

Methods

showsPrec :: Int -> Format -> ShowS #

show :: Format -> String

showList :: [Format] -> ShowS #

Show PollingStatus 
Instance details

Defined in Database.PostgreSQL.LibPQ.Enums

Methods

showsPrec :: Int -> PollingStatus -> ShowS #

show :: PollingStatus -> String

showList :: [PollingStatus] -> ShowS #

Show TransactionStatus 
Instance details

Defined in Database.PostgreSQL.LibPQ.Enums

Methods

showsPrec :: Int -> TransactionStatus -> ShowS #

show :: TransactionStatus -> String

showList :: [TransactionStatus] -> ShowS #

Show Verbosity 
Instance details

Defined in Database.PostgreSQL.LibPQ.Enums

Methods

showsPrec :: Int -> Verbosity -> ShowS #

show :: Verbosity -> String

showList :: [Verbosity] -> ShowS #

Show Oid 
Instance details

Defined in Database.PostgreSQL.LibPQ.Oid

Methods

showsPrec :: Int -> Oid -> ShowS #

show :: Oid -> String

showList :: [Oid] -> ShowS #

Show ArrayFormat 
Instance details

Defined in Database.PostgreSQL.Simple.Arrays

Methods

showsPrec :: Int -> ArrayFormat -> ShowS #

show :: ArrayFormat -> String

showList :: [ArrayFormat] -> ShowS #

Show CopyOutResult 
Instance details

Defined in Database.PostgreSQL.Simple.Copy

Methods

showsPrec :: Int -> CopyOutResult -> ShowS #

show :: CopyOutResult -> String

showList :: [CopyOutResult] -> ShowS #

Show ConstraintViolation 
Instance details

Defined in Database.PostgreSQL.Simple.Errors

Methods

showsPrec :: Int -> ConstraintViolation -> ShowS #

show :: ConstraintViolation -> String

showList :: [ConstraintViolation] -> ShowS #

Show ResultError 
Instance details

Defined in Database.PostgreSQL.Simple.FromField

Methods

showsPrec :: Int -> ResultError -> ShowS #

show :: ResultError -> String

showList :: [ResultError] -> ShowS #

Show ConnectInfo 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Methods

showsPrec :: Int -> ConnectInfo -> ShowS #

show :: ConnectInfo -> String

showList :: [ConnectInfo] -> ShowS #

Show FormatError 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Methods

showsPrec :: Int -> FormatError -> ShowS #

show :: FormatError -> String

showList :: [FormatError] -> ShowS #

Show QueryError 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Methods

showsPrec :: Int -> QueryError -> ShowS #

show :: QueryError -> String

showList :: [QueryError] -> ShowS #

Show SomePostgreSqlException 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Methods

showsPrec :: Int -> SomePostgreSqlException -> ShowS #

show :: SomePostgreSqlException -> String

showList :: [SomePostgreSqlException] -> ShowS #

Show SqlError 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Methods

showsPrec :: Int -> SqlError -> ShowS #

show :: SqlError -> String

showList :: [SqlError] -> ShowS #

Show Notification 
Instance details

Defined in Database.PostgreSQL.Simple.Notification

Methods

showsPrec :: Int -> Notification -> ShowS #

show :: Notification -> String

showList :: [Notification] -> ShowS #

Show ManyErrors 
Instance details

Defined in Database.PostgreSQL.Simple.Ok

Methods

showsPrec :: Int -> ManyErrors -> ShowS #

show :: ManyErrors -> String

showList :: [ManyErrors] -> ShowS #

Show Action 
Instance details

Defined in Database.PostgreSQL.Simple.ToField

Methods

showsPrec :: Int -> Action -> ShowS #

show :: Action -> String

showList :: [Action] -> ShowS #

Show IsolationLevel 
Instance details

Defined in Database.PostgreSQL.Simple.Transaction

Methods

showsPrec :: Int -> IsolationLevel -> ShowS #

show :: IsolationLevel -> String

showList :: [IsolationLevel] -> ShowS #

Show ReadWriteMode 
Instance details

Defined in Database.PostgreSQL.Simple.Transaction

Methods

showsPrec :: Int -> ReadWriteMode -> ShowS #

show :: ReadWriteMode -> String

showList :: [ReadWriteMode] -> ShowS #

Show TransactionMode 
Instance details

Defined in Database.PostgreSQL.Simple.Transaction

Methods

showsPrec :: Int -> TransactionMode -> ShowS #

show :: TransactionMode -> String

showList :: [TransactionMode] -> ShowS #

Show Default 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

showsPrec :: Int -> Default -> ShowS #

show :: Default -> String

showList :: [Default] -> ShowS #

Show Identifier 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

showsPrec :: Int -> Identifier -> ShowS #

show :: Identifier -> String

showList :: [Identifier] -> ShowS #

Show Null 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

showsPrec :: Int -> Null -> ShowS #

show :: Null -> String

showList :: [Null] -> ShowS #

Show QualifiedIdentifier 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

showsPrec :: Int -> QualifiedIdentifier -> ShowS #

show :: QualifiedIdentifier -> String

showList :: [QualifiedIdentifier] -> ShowS #

Show Query 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

showsPrec :: Int -> Query -> ShowS #

show :: Query -> String

showList :: [Query] -> ShowS #

Show Savepoint 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

showsPrec :: Int -> Savepoint -> ShowS #

show :: Savepoint -> String

showList :: [Savepoint] -> 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 Addr 
Instance details

Defined in Data.Primitive.Addr

Methods

showsPrec :: Int -> Addr -> ShowS #

show :: Addr -> String

showList :: [Addr] -> 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 Salt 
Instance details

Defined in Crypto.PasswordStore

Methods

showsPrec :: Int -> Salt -> ShowS #

show :: Salt -> String

showList :: [Salt] -> ShowS #

Show StdGen 
Instance details

Defined in System.Random.Internal

Methods

showsPrec :: Int -> StdGen -> ShowS #

show :: StdGen -> String

showList :: [StdGen] -> ShowS #

Show CompOption 
Instance details

Defined in Text.Regex.PCRE.Wrap

Methods

showsPrec :: Int -> CompOption -> ShowS #

show :: CompOption -> String

showList :: [CompOption] -> ShowS #

Show ConfigWhat 
Instance details

Defined in Text.Regex.PCRE.Wrap

Methods

showsPrec :: Int -> ConfigWhat -> ShowS #

show :: ConfigWhat -> String

showList :: [ConfigWhat] -> ShowS #

Show ExecOption 
Instance details

Defined in Text.Regex.PCRE.Wrap

Methods

showsPrec :: Int -> ExecOption -> ShowS #

show :: ExecOption -> String

showList :: [ExecOption] -> ShowS #

Show InfoWhat 
Instance details

Defined in Text.Regex.PCRE.Wrap

Methods

showsPrec :: Int -> InfoWhat -> ShowS #

show :: InfoWhat -> String

showList :: [InfoWhat] -> ShowS #

Show ReturnCode 
Instance details

Defined in Text.Regex.PCRE.Wrap

Methods

showsPrec :: Int -> ReturnCode -> ShowS #

show :: ReturnCode -> String

showList :: [ReturnCode] -> ShowS #

Show Action 
Instance details

Defined in Text.Regex.TDFA.Common

Methods

showsPrec :: Int -> Action -> ShowS #

show :: Action -> String

showList :: [Action] -> ShowS #

Show CompOption 
Instance details

Defined in Text.Regex.TDFA.Common

Methods

showsPrec :: Int -> CompOption -> ShowS #

show :: CompOption -> String

showList :: [CompOption] -> ShowS #

Show DFA 
Instance details

Defined in Text.Regex.TDFA.Common

Methods

showsPrec :: Int -> DFA -> ShowS #

show :: DFA -> String

showList :: [DFA] -> ShowS #

Show DT 
Instance details

Defined in Text.Regex.TDFA.Common

Methods

showsPrec :: Int -> DT -> ShowS #

show :: DT -> String

showList :: [DT] -> ShowS #

Show DoPa 
Instance details

Defined in Text.Regex.TDFA.Common

Methods

showsPrec :: Int -> DoPa -> ShowS #

show :: DoPa -> String

showList :: [DoPa] -> ShowS #

Show ExecOption 
Instance details

Defined in Text.Regex.TDFA.Common

Methods

showsPrec :: Int -> ExecOption -> ShowS #

show :: ExecOption -> String

showList :: [ExecOption] -> ShowS #

Show GroupInfo 
Instance details

Defined in Text.Regex.TDFA.Common

Methods

showsPrec :: Int -> GroupInfo -> ShowS #

show :: GroupInfo -> String

showList :: [GroupInfo] -> ShowS #

Show Instructions 
Instance details

Defined in Text.Regex.TDFA.Common

Methods

showsPrec :: Int -> Instructions -> ShowS #

show :: Instructions -> String

showList :: [Instructions] -> ShowS #

Show OP 
Instance details

Defined in Text.Regex.TDFA.Common

Methods

showsPrec :: Int -> OP -> ShowS #

show :: OP -> String

showList :: [OP] -> ShowS #

Show Orbits 
Instance details

Defined in Text.Regex.TDFA.Common

Methods

showsPrec :: Int -> Orbits -> ShowS #

show :: Orbits -> String

showList :: [Orbits] -> ShowS #

Show QNFA 
Instance details

Defined in Text.Regex.TDFA.Common

Methods

showsPrec :: Int -> QNFA -> ShowS #

show :: QNFA -> String

showList :: [QNFA] -> ShowS #

Show QT 
Instance details

Defined in Text.Regex.TDFA.Common

Methods

showsPrec :: Int -> QT -> ShowS #

show :: QT -> String

showList :: [QT] -> ShowS #

Show TagTask 
Instance details

Defined in Text.Regex.TDFA.Common

Methods

showsPrec :: Int -> TagTask -> ShowS #

show :: TagTask -> String

showList :: [TagTask] -> ShowS #

Show TagUpdate 
Instance details

Defined in Text.Regex.TDFA.Common

Methods

showsPrec :: Int -> TagUpdate -> ShowS #

show :: TagUpdate -> String

showList :: [TagUpdate] -> ShowS #

Show WhichTest 
Instance details

Defined in Text.Regex.TDFA.Common

Methods

showsPrec :: Int -> WhichTest -> ShowS #

show :: WhichTest -> String

showList :: [WhichTest] -> ShowS #

Show WinEmpty 
Instance details

Defined in Text.Regex.TDFA.Common

Methods

showsPrec :: Int -> WinEmpty -> ShowS #

show :: WinEmpty -> String

showList :: [WinEmpty] -> ShowS #

Show HandleTag 
Instance details

Defined in Text.Regex.TDFA.CorePattern

Methods

showsPrec :: Int -> HandleTag -> ShowS #

show :: HandleTag -> String

showList :: [HandleTag] -> ShowS #

Show P 
Instance details

Defined in Text.Regex.TDFA.CorePattern

Methods

showsPrec :: Int -> P -> ShowS #

show :: P -> String

showList :: [P] -> ShowS #

Show Q 
Instance details

Defined in Text.Regex.TDFA.CorePattern

Methods

showsPrec :: Int -> Q -> ShowS #

show :: Q -> String

showList :: [Q] -> ShowS #

Show SetTestInfo 
Instance details

Defined in Text.Regex.TDFA.CorePattern

Methods

showsPrec :: Int -> SetTestInfo -> ShowS #

show :: SetTestInfo -> String

showList :: [SetTestInfo] -> ShowS #

Show Wanted 
Instance details

Defined in Text.Regex.TDFA.CorePattern

Methods

showsPrec :: Int -> Wanted -> ShowS #

show :: Wanted -> String

showList :: [Wanted] -> ShowS #

Show WScratch 
Instance details

Defined in Text.Regex.TDFA.NewDFA.Engine_NC

Methods

showsPrec :: Int -> WScratch -> ShowS #

show :: WScratch -> String

showList :: [WScratch] -> ShowS #

Show Pattern 
Instance details

Defined in Text.Regex.TDFA.Pattern

Methods

showsPrec :: Int -> Pattern -> ShowS #

show :: Pattern -> String

showList :: [Pattern] -> ShowS #

Show PatternSet 
Instance details

Defined in Text.Regex.TDFA.Pattern

Methods

showsPrec :: Int -> PatternSet -> ShowS #

show :: PatternSet -> String

showList :: [PatternSet] -> ShowS #

Show PatternSetCharacterClass 
Instance details

Defined in Text.Regex.TDFA.Pattern

Methods

showsPrec :: Int -> PatternSetCharacterClass -> ShowS #

show :: PatternSetCharacterClass -> String

showList :: [PatternSetCharacterClass] -> ShowS #

Show PatternSetCollatingElement 
Instance details

Defined in Text.Regex.TDFA.Pattern

Methods

showsPrec :: Int -> PatternSetCollatingElement -> ShowS #

show :: PatternSetCollatingElement -> String

showList :: [PatternSetCollatingElement] -> ShowS #

Show PatternSetEquivalenceClass 
Instance details

Defined in Text.Regex.TDFA.Pattern

Methods

showsPrec :: Int -> PatternSetEquivalenceClass -> ShowS #

show :: PatternSetEquivalenceClass -> String

showList :: [PatternSetEquivalenceClass] -> ShowS #

Show AlterOrbit 
Instance details

Defined in Text.Regex.TDFA.TDFA

Methods

showsPrec :: Int -> AlterOrbit -> ShowS #

show :: AlterOrbit -> String

showList :: [AlterOrbit] -> ShowS #

Show Undefined 
Instance details

Defined in Relude.Debug

Methods

showsPrec :: Int -> Undefined -> ShowS #

show :: Undefined -> String

showList :: [Undefined] -> ShowS #

Show Bug 
Instance details

Defined in Relude.Exception

Methods

showsPrec :: Int -> Bug -> ShowS #

show :: Bug -> String

showList :: [Bug] -> ShowS #

Show Acquisition 
Instance details

Defined in Data.Pool.Introspection

Methods

showsPrec :: Int -> Acquisition -> ShowS #

show :: Acquisition -> String

showList :: [Acquisition] -> 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 ReleaseType 
Instance details

Defined in Data.Acquire.Internal

Methods

showsPrec :: Int -> ReleaseType -> ShowS #

show :: ReleaseType -> String

showList :: [ReleaseType] -> 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 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 AuthType 
Instance details

Defined in Network.Mail.SMTP.Auth

Methods

showsPrec :: Int -> AuthType -> ShowS #

show :: AuthType -> String

showList :: [AuthType] -> ShowS #

Show Command 
Instance details

Defined in Network.Mail.SMTP.Types

Methods

showsPrec :: Int -> Command -> ShowS #

show :: Command -> String

showList :: [Command] -> ShowS #

Show Response 
Instance details

Defined in Network.Mail.SMTP.Types

Methods

showsPrec :: Int -> Response -> ShowS #

show :: Response -> String

showList :: [Response] -> ShowS #

Show SocksAddress 
Instance details

Defined in Network.Socks5.Types

Methods

showsPrec :: Int -> SocksAddress -> ShowS #

show :: SocksAddress -> String

showList :: [SocksAddress] -> ShowS #

Show SocksCommand 
Instance details

Defined in Network.Socks5.Types

Methods

showsPrec :: Int -> SocksCommand -> ShowS #

show :: SocksCommand -> String

showList :: [SocksCommand] -> ShowS #

Show SocksError 
Instance details

Defined in Network.Socks5.Types

Methods

showsPrec :: Int -> SocksError -> ShowS #

show :: SocksError -> String

showList :: [SocksError] -> ShowS #

Show SocksHostAddress 
Instance details

Defined in Network.Socks5.Types

Methods

showsPrec :: Int -> SocksHostAddress -> ShowS #

show :: SocksHostAddress -> String

showList :: [SocksHostAddress] -> ShowS #

Show SocksMethod 
Instance details

Defined in Network.Socks5.Types

Methods

showsPrec :: Int -> SocksMethod -> ShowS #

show :: SocksMethod -> String

showList :: [SocksMethod] -> ShowS #

Show SocksReply 
Instance details

Defined in Network.Socks5.Types

Methods

showsPrec :: Int -> SocksReply -> ShowS #

show :: SocksReply -> String

showList :: [SocksReply] -> ShowS #

Show SocksVersion 
Instance details

Defined in Network.Socks5.Types

Methods

showsPrec :: Int -> SocksVersion -> ShowS #

show :: SocksVersion -> String

showList :: [SocksVersion] -> ShowS #

Show SocksVersionNotSupported 
Instance details

Defined in Network.Socks5.Types

Methods

showsPrec :: Int -> SocksVersionNotSupported -> ShowS #

show :: SocksVersionNotSupported -> String

showList :: [SocksVersionNotSupported] -> 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 SMGen 
Instance details

Defined in System.Random.SplitMix

Methods

showsPrec :: Int -> SMGen -> ShowS #

show :: SMGen -> String

showList :: [SMGen] -> ShowS #

Show SMGen 
Instance details

Defined in System.Random.SplitMix32

Methods

showsPrec :: Int -> SMGen -> ShowS #

show :: SMGen -> String

showList :: [SMGen] -> ShowS #

Show FileType 
Instance details

Defined in Data.Streaming.Filesystem

Methods

showsPrec :: Int -> FileType -> ShowS #

show :: FileType -> String

showList :: [FileType] -> ShowS #

Show HostPreference 
Instance details

Defined in Data.Streaming.Network.Internal

Methods

showsPrec :: Int -> HostPreference -> ShowS #

show :: HostPreference -> String

showList :: [HostPreference] -> ShowS #

Show ProcessExitedUnsuccessfully 
Instance details

Defined in Data.Streaming.Process

Methods

showsPrec :: Int -> ProcessExitedUnsuccessfully -> ShowS #

show :: ProcessExitedUnsuccessfully -> String

showList :: [ProcessExitedUnsuccessfully] -> ShowS #

Show CodePoint 
Instance details

Defined in Data.Streaming.Text

Methods

showsPrec :: Int -> CodePoint -> ShowS #

show :: CodePoint -> String

showList :: [CodePoint] -> ShowS #

Show DecoderState 
Instance details

Defined in Data.Streaming.Text

Methods

showsPrec :: Int -> DecoderState -> ShowS #

show :: DecoderState -> String

showList :: [DecoderState] -> ShowS #

Show S 
Instance details

Defined in Data.Streaming.Text

Methods

showsPrec :: Int -> S -> ShowS #

show :: S -> String

showList :: [S] -> ShowS #

Show PopperRes 
Instance details

Defined in Data.Streaming.Zlib

Methods

showsPrec :: Int -> PopperRes -> ShowS #

show :: PopperRes -> String

showList :: [PopperRes] -> ShowS #

Show ZlibException 
Instance details

Defined in Data.Streaming.Zlib

Methods

showsPrec :: Int -> ZlibException -> ShowS #

show :: ZlibException -> String

showList :: [ZlibException] -> ShowS #

Show Strategy 
Instance details

Defined in Data.Streaming.Zlib.Lowlevel

Methods

showsPrec :: Int -> Strategy -> ShowS #

show :: Strategy -> String

showList :: [Strategy] -> 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 SetupTermError 
Instance details

Defined in System.Console.Terminfo.Base

Methods

showsPrec :: Int -> SetupTermError -> ShowS #

show :: SetupTermError -> String

showList :: [SetupTermError] -> ShowS #

Show Color 
Instance details

Defined in System.Console.Terminfo.Color

Methods

showsPrec :: Int -> Color -> ShowS #

show :: Color -> String

showList :: [Color] -> 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

Methods

showsPrec :: Int -> UnicodeException -> ShowS #

show :: UnicodeException -> String

showList :: [UnicodeException] -> ShowS #

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 Hex 
Instance details

Defined in System.Random.TF.Gen

Methods

showsPrec :: Int -> Hex -> ShowS #

show :: Hex -> String

showList :: [Hex] -> ShowS #

Show TFGen 
Instance details

Defined in System.Random.TF.Gen

Methods

showsPrec :: Int -> TFGen -> ShowS #

show :: TFGen -> String

showList :: [TFGen] -> ShowS #

Show TFGenR 
Instance details

Defined in System.Random.TF.Gen

Methods

showsPrec :: Int -> TFGenR -> ShowS #

show :: TFGenR -> String

showList :: [TFGenR] -> 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 TypeclassInstance 
Instance details

Defined in Language.Haskell.TH.ReifyMany.Internal

Methods

showsPrec :: Int -> TypeclassInstance -> ShowS #

show :: TypeclassInstance -> String

showList :: [TypeclassInstance] -> ShowS #

Show CalendarDiffDays 
Instance details

Defined in Data.Time.Calendar.CalendarDiffDays

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 DayOfWeek 
Instance details

Defined in Data.Time.Calendar.Week

Methods

showsPrec :: Int -> DayOfWeek -> ShowS #

show :: DayOfWeek -> String

showList :: [DayOfWeek] -> 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

Show SystemTime 
Instance details

Defined in Data.Time.Clock.Internal.SystemTime

Methods

showsPrec :: Int -> SystemTime -> ShowS #

show :: SystemTime -> String

showList :: [SystemTime] -> ShowS #

Show TimeLocale 
Instance details

Defined in Data.Time.Format.Locale

Methods

showsPrec :: Int -> TimeLocale -> ShowS #

show :: TimeLocale -> String

showList :: [TimeLocale] -> ShowS #

Show CalendarDiffTime 
Instance details

Defined in Data.Time.LocalTime.Internal.CalendarDiffTime

Show LocalTime 
Instance details

Defined in Data.Time.LocalTime.Internal.LocalTime

Methods

showsPrec :: Int -> LocalTime -> ShowS #

show :: LocalTime -> String

showList :: [LocalTime] -> ShowS #

Show TimeOfDay 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeOfDay

Methods

showsPrec :: Int -> TimeOfDay -> ShowS #

show :: TimeOfDay -> String

showList :: [TimeOfDay] -> ShowS #

Show TimeZone 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeZone

Methods

showsPrec :: Int -> TimeZone -> ShowS #

show :: TimeZone -> String

showList :: [TimeZone] -> ShowS #

Show ZonedTime 
Instance details

Defined in Data.Time.LocalTime.Internal.ZonedTime

Methods

showsPrec :: Int -> ZonedTime -> ShowS #

show :: ZonedTime -> String

showList :: [ZonedTime] -> ShowS #

Show TimeoutThread 
Instance details

Defined in System.TimeManager

Methods

showsPrec :: Int -> TimeoutThread -> ShowS #

show :: TimeoutThread -> String

showList :: [TimeoutThread] -> ShowS #

Show Attosecond 
Instance details

Defined in Data.Time.Units

Methods

showsPrec :: Int -> Attosecond -> ShowS #

show :: Attosecond -> String

showList :: [Attosecond] -> ShowS #

Show Day 
Instance details

Defined in Data.Time.Units

Methods

showsPrec :: Int -> Day -> ShowS #

show :: Day -> String

showList :: [Day] -> ShowS #

Show Femtosecond 
Instance details

Defined in Data.Time.Units

Methods

showsPrec :: Int -> Femtosecond -> ShowS #

show :: Femtosecond -> String

showList :: [Femtosecond] -> ShowS #

Show Fortnight 
Instance details

Defined in Data.Time.Units

Methods

showsPrec :: Int -> Fortnight -> ShowS #

show :: Fortnight -> String

showList :: [Fortnight] -> ShowS #

Show Hour 
Instance details

Defined in Data.Time.Units

Methods

showsPrec :: Int -> Hour -> ShowS #

show :: Hour -> String

showList :: [Hour] -> ShowS #

Show Microsecond 
Instance details

Defined in Data.Time.Units

Methods

showsPrec :: Int -> Microsecond -> ShowS #

show :: Microsecond -> String

showList :: [Microsecond] -> ShowS #

Show Millisecond 
Instance details

Defined in Data.Time.Units

Methods

showsPrec :: Int -> Millisecond -> ShowS #

show :: Millisecond -> String

showList :: [Millisecond] -> ShowS #

Show Minute 
Instance details

Defined in Data.Time.Units

Methods

showsPrec :: Int -> Minute -> ShowS #

show :: Minute -> String

showList :: [Minute] -> ShowS #

Show Nanosecond 
Instance details

Defined in Data.Time.Units

Methods

showsPrec :: Int -> Nanosecond -> ShowS #

show :: Nanosecond -> String

showList :: [Nanosecond] -> ShowS #

Show Picosecond 
Instance details

Defined in Data.Time.Units

Methods

showsPrec :: Int -> Picosecond -> ShowS #

show :: Picosecond -> String

showList :: [Picosecond] -> ShowS #

Show Second 
Instance details

Defined in Data.Time.Units

Methods

showsPrec :: Int -> Second -> ShowS #

show :: Second -> String

showList :: [Second] -> ShowS #

Show Week 
Instance details

Defined in Data.Time.Units

Methods

showsPrec :: Int -> Week -> ShowS #

show :: Week -> String

showList :: [Week] -> ShowS #

Show Bulk 
Instance details

Defined in Network.TLS.Cipher

Methods

showsPrec :: Int -> Bulk -> ShowS #

show :: Bulk -> String

showList :: [Bulk] -> ShowS #

Show BulkDirection 
Instance details

Defined in Network.TLS.Cipher

Methods

showsPrec :: Int -> BulkDirection -> ShowS #

show :: BulkDirection -> String

showList :: [BulkDirection] -> ShowS #

Show BulkState 
Instance details

Defined in Network.TLS.Cipher

Methods

showsPrec :: Int -> BulkState -> ShowS #

show :: BulkState -> String

showList :: [BulkState] -> ShowS #

Show Cipher 
Instance details

Defined in Network.TLS.Cipher

Methods

showsPrec :: Int -> Cipher -> ShowS #

show :: Cipher -> String

showList :: [Cipher] -> ShowS #

Show CipherKeyExchangeType 
Instance details

Defined in Network.TLS.Cipher

Methods

showsPrec :: Int -> CipherKeyExchangeType -> ShowS #

show :: CipherKeyExchangeType -> String

showList :: [CipherKeyExchangeType] -> ShowS #

Show Compression 
Instance details

Defined in Network.TLS.Compression

Methods

showsPrec :: Int -> Compression -> ShowS #

show :: Compression -> String

showList :: [Compression] -> ShowS #

Show ByteArrayPair 
Instance details

Defined in Data.Tuple.Types

Methods

showsPrec :: Int -> ByteArrayPair -> ShowS #

show :: ByteArrayPair -> String

showList :: [ByteArrayPair] -> ShowS #

Show ByteArrayTriple 
Instance details

Defined in Data.Tuple.Types

Methods

showsPrec :: Int -> ByteArrayTriple -> ShowS #

show :: ByteArrayTriple -> String

showList :: [ByteArrayTriple] -> ShowS #

Show DoublePair 
Instance details

Defined in Data.Tuple.Types

Methods

showsPrec :: Int -> DoublePair -> ShowS #

show :: DoublePair -> String

showList :: [DoublePair] -> ShowS #

Show DoubleTriple 
Instance details

Defined in Data.Tuple.Types

Methods

showsPrec :: Int -> DoubleTriple -> ShowS #

show :: DoubleTriple -> String

showList :: [DoubleTriple] -> ShowS #

Show IntPair 
Instance details

Defined in Data.Tuple.Types

Methods

showsPrec :: Int -> IntPair -> ShowS #

show :: IntPair -> String

showList :: [IntPair] -> ShowS #

Show IntTriple 
Instance details

Defined in Data.Tuple.Types

Methods

showsPrec :: Int -> IntTriple -> ShowS #

show :: IntTriple -> String

showList :: [IntTriple] -> ShowS #

Show WordPair 
Instance details

Defined in Data.Tuple.Types

Methods

showsPrec :: Int -> WordPair -> ShowS #

show :: WordPair -> String

showList :: [WordPair] -> ShowS #

Show WordTriple 
Instance details

Defined in Data.Tuple.Types

Methods

showsPrec :: Int -> WordTriple -> ShowS #

show :: WordTriple -> String

showList :: [WordTriple] -> 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 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 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 State 
Instance details

Defined in Data.UUID.V1

Methods

showsPrec :: Int -> State -> ShowS #

show :: State -> String

showList :: [State] -> 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 Order 
Instance details

Defined in Data.Vector.Algorithms.Tim

Methods

showsPrec :: Int -> Order -> ShowS #

show :: Order -> String

showList :: [Order] -> ShowS #

Show FilePart 
Instance details

Defined in Network.Wai.Internal

Methods

showsPrec :: Int -> FilePart -> ShowS #

show :: FilePart -> String

showList :: [FilePart] -> ShowS #

Show Request 
Instance details

Defined in Network.Wai.Internal

Methods

showsPrec :: Int -> Request -> ShowS #

show :: Request -> String

showList :: [Request] -> ShowS #

Show RequestBodyLength 
Instance details

Defined in Network.Wai.Internal

Methods

showsPrec :: Int -> RequestBodyLength -> ShowS #

show :: RequestBodyLength -> String

showList :: [RequestBodyLength] -> ShowS #

Show Piece 
Instance details

Defined in WaiAppStatic.Types

Methods

showsPrec :: Int -> Piece -> ShowS #

show :: Piece -> String

showList :: [Piece] -> ShowS #

Show CorsResourcePolicy 
Instance details

Defined in Network.Wai.Middleware.Cors

Methods

showsPrec :: Int -> CorsResourcePolicy -> ShowS #

show :: CorsResourcePolicy -> String

showList :: [CorsResourcePolicy] -> ShowS #

Show ApprootMiddlewareNotSetup 
Instance details

Defined in Network.Wai.Middleware.Approot

Methods

showsPrec :: Int -> ApprootMiddlewareNotSetup -> ShowS #

show :: ApprootMiddlewareNotSetup -> String

showList :: [ApprootMiddlewareNotSetup] -> ShowS #

Show CombineSettings 
Instance details

Defined in Network.Wai.Middleware.CombineHeaders

Methods

showsPrec :: Int -> CombineSettings -> ShowS #

show :: CombineSettings -> String

showList :: [CombineSettings] -> ShowS #

Show HandleType 
Instance details

Defined in Network.Wai.Middleware.CombineHeaders

Methods

showsPrec :: Int -> HandleType -> ShowS #

show :: HandleType -> String

showList :: [HandleType] -> ShowS #

Show GzipFiles 
Instance details

Defined in Network.Wai.Middleware.Gzip

Methods

showsPrec :: Int -> GzipFiles -> ShowS #

show :: GzipFiles -> String

showList :: [GzipFiles] -> ShowS #

Show Bound 
Instance details

Defined in Network.Wai.Parse

Methods

showsPrec :: Int -> Bound -> ShowS #

show :: Bound -> String

showList :: [Bound] -> ShowS #

Show RequestParseException 
Instance details

Defined in Network.Wai.Parse

Methods

showsPrec :: Int -> RequestParseException -> ShowS #

show :: RequestParseException -> String

showList :: [RequestParseException] -> ShowS #

Show RequestSizeException 
Instance details

Defined in Network.Wai.Request

Methods

showsPrec :: Int -> RequestSizeException -> ShowS #

show :: RequestSizeException -> String

showList :: [RequestSizeException] -> ShowS #

Show SResponse 
Instance details

Defined in Network.Wai.Test

Methods

showsPrec :: Int -> SResponse -> ShowS #

show :: SResponse -> String

showList :: [SResponse] -> ShowS #

Show ExceptionInsideResponseBody 
Instance details

Defined in Network.Wai.Handler.Warp.Types

Methods

showsPrec :: Int -> ExceptionInsideResponseBody -> ShowS #

show :: ExceptionInsideResponseBody -> String

showList :: [ExceptionInsideResponseBody] -> ShowS #

Show InvalidRequest 
Instance details

Defined in Network.Wai.Handler.Warp.Types

Methods

showsPrec :: Int -> InvalidRequest -> ShowS #

show :: InvalidRequest -> String

showList :: [InvalidRequest] -> ShowS #

Show CompressionOptions 
Instance details

Defined in Network.WebSockets.Connection.Options

Methods

showsPrec :: Int -> CompressionOptions -> ShowS #

show :: CompressionOptions -> String

showList :: [CompressionOptions] -> ShowS #

Show PermessageDeflate 
Instance details

Defined in Network.WebSockets.Connection.Options

Methods

showsPrec :: Int -> PermessageDeflate -> ShowS #

show :: PermessageDeflate -> String

showList :: [PermessageDeflate] -> ShowS #

Show SizeLimit 
Instance details

Defined in Network.WebSockets.Connection.Options

Methods

showsPrec :: Int -> SizeLimit -> ShowS #

show :: SizeLimit -> String

showList :: [SizeLimit] -> ShowS #

Show PongTimeout 
Instance details

Defined in Network.WebSockets.Connection.PingPong

Methods

showsPrec :: Int -> PongTimeout -> ShowS #

show :: PongTimeout -> String

showList :: [PongTimeout] -> ShowS #

Show HandshakeException 
Instance details

Defined in Network.WebSockets.Http

Methods

showsPrec :: Int -> HandshakeException -> ShowS #

show :: HandshakeException -> String

showList :: [HandshakeException] -> ShowS #

Show Request 
Instance details

Defined in Network.WebSockets.Http

Methods

showsPrec :: Int -> Request -> ShowS #

show :: Request -> String

showList :: [Request] -> ShowS #

Show RequestHead 
Instance details

Defined in Network.WebSockets.Http

Methods

showsPrec :: Int -> RequestHead -> ShowS #

show :: RequestHead -> String

showList :: [RequestHead] -> ShowS #

Show Response 
Instance details

Defined in Network.WebSockets.Http

Methods

showsPrec :: Int -> Response -> ShowS #

show :: Response -> String

showList :: [Response] -> ShowS #

Show ResponseHead 
Instance details

Defined in Network.WebSockets.Http

Methods

showsPrec :: Int -> ResponseHead -> ShowS #

show :: ResponseHead -> String

showList :: [ResponseHead] -> ShowS #

Show ConnectionException 
Instance details

Defined in Network.WebSockets.Types

Methods

showsPrec :: Int -> ConnectionException -> ShowS #

show :: ConnectionException -> String

showList :: [ConnectionException] -> ShowS #

Show ConnectionType 
Instance details

Defined in Network.WebSockets.Types

Methods

showsPrec :: Int -> ConnectionType -> ShowS #

show :: ConnectionType -> String

showList :: [ConnectionType] -> ShowS #

Show ControlMessage 
Instance details

Defined in Network.WebSockets.Types

Methods

showsPrec :: Int -> ControlMessage -> ShowS #

show :: ControlMessage -> String

showList :: [ControlMessage] -> ShowS #

Show DataMessage 
Instance details

Defined in Network.WebSockets.Types

Methods

showsPrec :: Int -> DataMessage -> ShowS #

show :: DataMessage -> String

showList :: [DataMessage] -> ShowS #

Show Message 
Instance details

Defined in Network.WebSockets.Types

Methods

showsPrec :: Int -> Message -> ShowS #

show :: Message -> String

showList :: [Message] -> ShowS #

Show Int128 
Instance details

Defined in Data.WideWord.Int128

Methods

showsPrec :: Int -> Int128 -> ShowS #

show :: Int128 -> String

showList :: [Int128] -> ShowS #

Show Word128 
Instance details

Defined in Data.WideWord.Word128

Methods

showsPrec :: Int -> Word128 -> ShowS #

show :: Word128 -> String

showList :: [Word128] -> ShowS #

Show Word256 
Instance details

Defined in Data.WideWord.Word256

Methods

showsPrec :: Int -> Word256 -> ShowS #

show :: Word256 -> String

showList :: [Word256] -> ShowS #

Show HtmlTable 
Instance details

Defined in Text.XHtml.Table

Methods

showsPrec :: Int -> HtmlTable -> ShowS #

show :: HtmlTable -> String

showList :: [HtmlTable] -> ShowS #

Show Document 
Instance details

Defined in Text.XML

Methods

showsPrec :: Int -> Document -> ShowS #

show :: Document -> String

showList :: [Document] -> ShowS #

Show Element 
Instance details

Defined in Text.XML

Methods

showsPrec :: Int -> Element -> ShowS #

show :: Element -> String

showList :: [Element] -> ShowS #

Show Node 
Instance details

Defined in Text.XML

Methods

showsPrec :: Int -> Node -> ShowS #

show :: Node -> String

showList :: [Node] -> ShowS #

Show UnresolvedEntityException 
Instance details

Defined in Text.XML

Methods

showsPrec :: Int -> UnresolvedEntityException -> ShowS #

show :: UnresolvedEntityException -> String

showList :: [UnresolvedEntityException] -> ShowS #

Show XMLException 
Instance details

Defined in Text.XML

Methods

showsPrec :: Int -> XMLException -> ShowS #

show :: XMLException -> String

showList :: [XMLException] -> ShowS #

Show XmlException 
Instance details

Defined in Text.XML.Stream.Parse

Methods

showsPrec :: Int -> XmlException -> ShowS #

show :: XmlException -> String

showList :: [XmlException] -> ShowS #

Show InvalidEventStream 
Instance details

Defined in Text.XML.Unresolved

Methods

showsPrec :: Int -> InvalidEventStream -> ShowS #

show :: InvalidEventStream -> String

showList :: [InvalidEventStream] -> ShowS #

Show Content 
Instance details

Defined in Data.XML.Types

Methods

showsPrec :: Int -> Content -> ShowS #

show :: Content -> String

showList :: [Content] -> ShowS #

Show Doctype 
Instance details

Defined in Data.XML.Types

Methods

showsPrec :: Int -> Doctype -> ShowS #

show :: Doctype -> String

showList :: [Doctype] -> ShowS #

Show Document 
Instance details

Defined in Data.XML.Types

Methods

showsPrec :: Int -> Document -> ShowS #

show :: Document -> String

showList :: [Document] -> ShowS #

Show Element 
Instance details

Defined in Data.XML.Types

Methods

showsPrec :: Int -> Element -> ShowS #

show :: Element -> String

showList :: [Element] -> ShowS #

Show Event 
Instance details

Defined in Data.XML.Types

Methods

showsPrec :: Int -> Event -> ShowS #

show :: Event -> String

showList :: [Event] -> ShowS #

Show ExternalID 
Instance details

Defined in Data.XML.Types

Methods

showsPrec :: Int -> ExternalID -> ShowS #

show :: ExternalID -> String

showList :: [ExternalID] -> ShowS #

Show Instruction 
Instance details

Defined in Data.XML.Types

Methods

showsPrec :: Int -> Instruction -> ShowS #

show :: Instruction -> String

showList :: [Instruction] -> ShowS #

Show Miscellaneous 
Instance details

Defined in Data.XML.Types

Methods

showsPrec :: Int -> Miscellaneous -> ShowS #

show :: Miscellaneous -> String

showList :: [Miscellaneous] -> ShowS #

Show Name 
Instance details

Defined in Data.XML.Types

Methods

showsPrec :: Int -> Name -> ShowS #

show :: Name -> String

showList :: [Name] -> ShowS #

Show Node 
Instance details

Defined in Data.XML.Types

Methods

showsPrec :: Int -> Node -> ShowS #

show :: Node -> String

showList :: [Node] -> ShowS #

Show Prologue 
Instance details

Defined in Data.XML.Types

Methods

showsPrec :: Int -> Prologue -> ShowS #

show :: Prologue -> String

showList :: [Prologue] -> 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 a => Show (Only a) 
Instance details

Defined in Data.Tuple.Only

Methods

showsPrec :: Int -> Only a -> ShowS #

show :: Only a -> String

showList :: [Only a] -> ShowS #

Show (Blind a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> Blind a -> ShowS #

show :: Blind a -> String

showList :: [Blind a] -> ShowS #

Show a => Show (Fixed a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> Fixed a -> ShowS #

show :: Fixed a -> String

showList :: [Fixed a] -> ShowS #

Show a => Show (InfiniteList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> InfiniteList a -> ShowS #

show :: InfiniteList a -> String

showList :: [InfiniteList a] -> ShowS #

Show a => Show (Large a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> Large a -> ShowS #

show :: Large a -> String

showList :: [Large a] -> ShowS #

Show a => Show (Negative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> Negative a -> ShowS #

show :: Negative a -> String

showList :: [Negative a] -> ShowS #

Show a => Show (NonEmptyList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> NonEmptyList a -> ShowS #

show :: NonEmptyList a -> String

showList :: [NonEmptyList a] -> ShowS #

Show a => Show (NonNegative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> NonNegative a -> ShowS #

show :: NonNegative a -> String

showList :: [NonNegative a] -> ShowS #

Show a => Show (NonPositive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> NonPositive a -> ShowS #

show :: NonPositive a -> String

showList :: [NonPositive a] -> ShowS #

Show a => Show (NonZero a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> NonZero a -> ShowS #

show :: NonZero a -> String

showList :: [NonZero a] -> ShowS #

Show a => Show (OrderedList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> OrderedList a -> ShowS #

show :: OrderedList a -> String

showList :: [OrderedList a] -> ShowS #

Show a => Show (Positive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> Positive a -> ShowS #

show :: Positive a -> String

showList :: [Positive a] -> ShowS #

Show a => Show (Shrink2 a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> Shrink2 a -> ShowS #

show :: Shrink2 a -> String

showList :: [Shrink2 a] -> ShowS #

Show a => Show (Small a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> Small a -> ShowS #

show :: Small a -> String

showList :: [Small a] -> ShowS #

Show a => Show (Smart a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> Smart a -> ShowS #

show :: Smart a -> String

showList :: [Smart a] -> ShowS #

Show a => Show (SortedList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> SortedList a -> ShowS #

show :: SortedList a -> String

showList :: [SortedList a] -> ShowS #

Show (Digest t) 
Instance details

Defined in Data.Digest.Pure.SHA

Methods

showsPrec :: Int -> Digest t -> ShowS #

show :: Digest t -> String

showList :: [Digest t] -> 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 (Ticket a) 
Instance details

Defined in Data.Atomics.Internal

Methods

showsPrec :: Int -> Ticket a -> ShowS #

show :: Ticket a -> String

showList :: [Ticket 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 (Array a) 
Instance details

Defined in Basement.BoxedArray

Methods

showsPrec :: Int -> Array a -> ShowS #

show :: Array a -> String

showList :: [Array a] -> ShowS #

Show a => Show (BE a) 
Instance details

Defined in Basement.Endianness

Methods

showsPrec :: Int -> BE a -> ShowS #

show :: BE a -> String

showList :: [BE a] -> ShowS #

Show a => Show (LE a) 
Instance details

Defined in Basement.Endianness

Methods

showsPrec :: Int -> LE a -> ShowS #

show :: LE a -> String

showList :: [LE a] -> ShowS #

Show (FinalPtr a) 
Instance details

Defined in Basement.FinalPtr

Methods

showsPrec :: Int -> FinalPtr a -> ShowS #

show :: FinalPtr a -> String

showList :: [FinalPtr a] -> ShowS #

Show a => Show (NonEmpty a) 
Instance details

Defined in Basement.NonEmpty

Methods

showsPrec :: Int -> NonEmpty a -> ShowS #

show :: NonEmpty a -> String

showList :: [NonEmpty a] -> ShowS #

Show (CountOf ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

showsPrec :: Int -> CountOf ty -> ShowS #

show :: CountOf ty -> String

showList :: [CountOf ty] -> ShowS #

Show (Offset ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

showsPrec :: Int -> Offset ty -> ShowS #

show :: Offset ty -> String

showList :: [Offset ty] -> ShowS #

(PrimType ty, Show ty) => Show (UArray ty) 
Instance details

Defined in Basement.UArray.Base

Methods

showsPrec :: Int -> UArray ty -> ShowS #

show :: UArray ty -> String

showList :: [UArray ty] -> ShowS #

Show a => Show (Decoder a) 
Instance details

Defined in Data.Binary.Get.Internal

Methods

showsPrec :: Int -> Decoder a -> ShowS #

show :: Decoder a -> String

showList :: [Decoder a] -> ShowS #

KnownNat n => Show (ByteArrayN n) 
Instance details

Defined in Data.Bytes.Types

Methods

showsPrec :: Int -> ByteArrayN n -> ShowS #

show :: ByteArrayN n -> String

showList :: [ByteArrayN n] -> ShowS #

KnownNat n => Show (BytesN n) 
Instance details

Defined in Data.Bytes.Types

Methods

showsPrec :: Int -> BytesN n -> ShowS #

show :: BytesN n -> String

showList :: [BytesN n] -> 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 r => Show (Result r) 
Instance details

Defined in Data.Serialize.Get

Methods

showsPrec :: Int -> Result r -> ShowS #

show :: Result r -> String

showList :: [Result r] -> 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 (IV k) 
Instance details

Defined in Crypto.Types

Methods

showsPrec :: Int -> IV k -> ShowS #

show :: IV k -> String

showList :: [IV k] -> ShowS #

Show (Digest a) 
Instance details

Defined in Crypto.Hash.Types

Methods

showsPrec :: Int -> Digest a -> ShowS #

show :: Digest a -> String

showList :: [Digest a] -> ShowS #

Show a => Show (CryptoFailable a) 
Instance details

Defined in Crypto.Error.Types

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 #

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 v => Show (UniqueMap v) 
Instance details

Defined in GHC.Cmm.Dataflow.Collections

Methods

showsPrec :: Int -> UniqueMap v -> ShowS #

show :: UniqueMap v -> String

showList :: [UniqueMap v] -> ShowS #

Show v => Show (LabelMap v) 
Instance details

Defined in GHC.Cmm.Dataflow.Label

Methods

showsPrec :: Int -> LabelMap v -> ShowS #

show :: LabelMap v -> String

showList :: [LabelMap v] -> ShowS #

Show a => Show (FromListCounting a) 
Instance details

Defined in GHC.Data.Graph.Inductive.PatriciaTree

Methods

showsPrec :: Int -> FromListCounting a -> ShowS #

show :: FromListCounting a -> String

showList :: [FromListCounting a] -> ShowS #

Show a => Show (OnOff a) 
Instance details

Defined in GHC.Driver.DynFlags

Methods

showsPrec :: Int -> OnOff a -> ShowS #

show :: OnOff a -> String

showList :: [OnOff a] -> ShowS #

Show a => Show (IdentSupply a) 
Instance details

Defined in GHC.JS.Unsat.Syntax

Methods

showsPrec :: Int -> IdentSupply a -> ShowS #

show :: IdentSupply a -> String

showList :: [IdentSupply a] -> ShowS #

Show (MsgEnvelope DiagnosticMessage) 
Instance details

Defined in GHC.Types.Error

Methods

showsPrec :: Int -> MsgEnvelope DiagnosticMessage -> ShowS #

show :: MsgEnvelope DiagnosticMessage -> String

showList :: [MsgEnvelope DiagnosticMessage] -> ShowS #

Show mod => Show (GenWithIsBoot mod) 
Instance details

Defined in GHC.Unit.Types

Methods

showsPrec :: Int -> GenWithIsBoot mod -> ShowS #

show :: GenWithIsBoot mod -> String

showList :: [GenWithIsBoot mod] -> 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 b => Show (GenClosure b) 
Instance details

Defined in GHC.Exts.Heap.Closures

Methods

showsPrec :: Int -> GenClosure b -> ShowS #

show :: GenClosure b -> String

showList :: [GenClosure b] -> ShowS #

Show a => Show (EvalExpr a) 
Instance details

Defined in GHCi.Message

Methods

showsPrec :: Int -> EvalExpr a -> ShowS #

show :: EvalExpr a -> String

showList :: [EvalExpr a] -> ShowS #

Show a => Show (EvalResult a) 
Instance details

Defined in GHCi.Message

Methods

showsPrec :: Int -> EvalResult a -> ShowS #

show :: EvalResult a -> String

showList :: [EvalResult a] -> ShowS #

Show (Message a) 
Instance details

Defined in GHCi.Message

Methods

showsPrec :: Int -> Message a -> ShowS #

show :: Message a -> String

showList :: [Message a] -> ShowS #

Show a => Show (QResult a) 
Instance details

Defined in GHCi.Message

Methods

showsPrec :: Int -> QResult a -> ShowS #

show :: QResult a -> String

showList :: [QResult a] -> ShowS #

Show (THMessage a) 
Instance details

Defined in GHCi.Message

Methods

showsPrec :: Int -> THMessage a -> ShowS #

show :: THMessage a -> String

showList :: [THMessage a] -> ShowS #

Show a => Show (THResult a) 
Instance details

Defined in GHCi.Message

Methods

showsPrec :: Int -> THResult a -> ShowS #

show :: THResult a -> String

showList :: [THResult a] -> ShowS #

Show (RemotePtr a) 
Instance details

Defined in GHCi.RemoteTypes

Methods

showsPrec :: Int -> RemotePtr a -> ShowS #

show :: RemotePtr a -> String

showList :: [RemotePtr a] -> ShowS #

Show (RemoteRef a) 
Instance details

Defined in GHCi.RemoteTypes

Methods

showsPrec :: Int -> RemoteRef a -> ShowS #

show :: RemoteRef a -> String

showList :: [RemoteRef a] -> 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 l => Show (GuardedAlt l) 
Instance details

Defined in Language.Haskell.Exts.ExactPrint

Methods

showsPrec :: Int -> GuardedAlt l -> ShowS #

show :: GuardedAlt l -> String

showList :: [GuardedAlt l] -> ShowS #

Show l => Show (GuardedAlts l) 
Instance details

Defined in Language.Haskell.Exts.ExactPrint

Methods

showsPrec :: Int -> GuardedAlts l -> ShowS #

show :: GuardedAlts l -> String

showList :: [GuardedAlts l] -> ShowS #

Show a => Show (ListOf a) 
Instance details

Defined in Language.Haskell.Exts.Parser

Methods

showsPrec :: Int -> ListOf a -> ShowS #

show :: ListOf a -> String

showList :: [ListOf a] -> ShowS #

Show l => Show (ModuleHeadAndImports l) 
Instance details

Defined in Language.Haskell.Exts.Parser

Methods

showsPrec :: Int -> ModuleHeadAndImports l -> ShowS #

show :: ModuleHeadAndImports l -> String

showList :: [ModuleHeadAndImports l] -> ShowS #

Show a => Show (NonGreedy a) 
Instance details

Defined in Language.Haskell.Exts.Parser

Methods

showsPrec :: Int -> NonGreedy a -> ShowS #

show :: NonGreedy a -> String

showList :: [NonGreedy a] -> ShowS #

Show l => Show (PragmasAndModuleHead l) 
Instance details

Defined in Language.Haskell.Exts.Parser

Methods

showsPrec :: Int -> PragmasAndModuleHead l -> ShowS #

show :: PragmasAndModuleHead l -> String

showList :: [PragmasAndModuleHead l] -> ShowS #

Show l => Show (PragmasAndModuleName l) 
Instance details

Defined in Language.Haskell.Exts.Parser

Methods

showsPrec :: Int -> PragmasAndModuleName l -> ShowS #

show :: PragmasAndModuleName l -> String

showList :: [PragmasAndModuleName l] -> ShowS #

Show a => Show (Loc a) 
Instance details

Defined in Language.Haskell.Exts.SrcLoc

Methods

showsPrec :: Int -> Loc a -> ShowS #

show :: Loc a -> String

showList :: [Loc a] -> ShowS #

Show l => Show (Activation l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Activation l -> ShowS #

show :: Activation l -> String

showList :: [Activation l] -> ShowS #

Show l => Show (Alt l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Alt l -> ShowS #

show :: Alt l -> String

showList :: [Alt l] -> ShowS #

Show l => Show (Annotation l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Annotation l -> ShowS #

show :: Annotation l -> String

showList :: [Annotation l] -> ShowS #

Show l => Show (Assoc l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Assoc l -> ShowS #

show :: Assoc l -> String

showList :: [Assoc l] -> ShowS #

Show l => Show (Asst l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Asst l -> ShowS #

show :: Asst l -> String

showList :: [Asst l] -> ShowS #

Show l => Show (BangType l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> BangType l -> ShowS #

show :: BangType l -> String

showList :: [BangType l] -> ShowS #

Show l => Show (Binds l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Binds l -> ShowS #

show :: Binds l -> String

showList :: [Binds l] -> ShowS #

Show l => Show (BooleanFormula l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> BooleanFormula l -> ShowS #

show :: BooleanFormula l -> String

showList :: [BooleanFormula l] -> ShowS #

Show l => Show (Bracket l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Bracket l -> ShowS #

show :: Bracket l -> String

showList :: [Bracket l] -> ShowS #

Show l => Show (CName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> CName l -> ShowS #

show :: CName l -> String

showList :: [CName l] -> ShowS #

Show l => Show (CallConv l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> CallConv l -> ShowS #

show :: CallConv l -> String

showList :: [CallConv l] -> ShowS #

Show l => Show (ClassDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> ClassDecl l -> ShowS #

show :: ClassDecl l -> String

showList :: [ClassDecl l] -> ShowS #

Show l => Show (ConDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> ConDecl l -> ShowS #

show :: ConDecl l -> String

showList :: [ConDecl l] -> ShowS #

Show l => Show (Context l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Context l -> ShowS #

show :: Context l -> String

showList :: [Context l] -> ShowS #

Show l => Show (DataOrNew l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> DataOrNew l -> ShowS #

show :: DataOrNew l -> String

showList :: [DataOrNew l] -> ShowS #

Show l => Show (Decl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Decl l -> ShowS #

show :: Decl l -> String

showList :: [Decl l] -> ShowS #

Show l => Show (DeclHead l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> DeclHead l -> ShowS #

show :: DeclHead l -> String

showList :: [DeclHead l] -> ShowS #

Show l => Show (DerivStrategy l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> DerivStrategy l -> ShowS #

show :: DerivStrategy l -> String

showList :: [DerivStrategy l] -> ShowS #

Show l => Show (Deriving l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Deriving l -> ShowS #

show :: Deriving l -> String

showList :: [Deriving l] -> ShowS #

Show l => Show (EWildcard l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> EWildcard l -> ShowS #

show :: EWildcard l -> String

showList :: [EWildcard l] -> ShowS #

Show l => Show (Exp l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Exp l -> ShowS #

show :: Exp l -> String

showList :: [Exp l] -> ShowS #

Show l => Show (ExportSpec l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> ExportSpec l -> ShowS #

show :: ExportSpec l -> String

showList :: [ExportSpec l] -> ShowS #

Show l => Show (ExportSpecList l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> ExportSpecList l -> ShowS #

show :: ExportSpecList l -> String

showList :: [ExportSpecList l] -> ShowS #

Show l => Show (FieldDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> FieldDecl l -> ShowS #

show :: FieldDecl l -> String

showList :: [FieldDecl l] -> ShowS #

Show l => Show (FieldUpdate l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> FieldUpdate l -> ShowS #

show :: FieldUpdate l -> String

showList :: [FieldUpdate l] -> ShowS #

Show l => Show (FunDep l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> FunDep l -> ShowS #

show :: FunDep l -> String

showList :: [FunDep l] -> ShowS #

Show l => Show (GadtDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> GadtDecl l -> ShowS #

show :: GadtDecl l -> String

showList :: [GadtDecl l] -> ShowS #

Show l => Show (GuardedRhs l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> GuardedRhs l -> ShowS #

show :: GuardedRhs l -> String

showList :: [GuardedRhs l] -> ShowS #

Show l => Show (IPBind l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> IPBind l -> ShowS #

show :: IPBind l -> String

showList :: [IPBind l] -> ShowS #

Show l => Show (IPName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> IPName l -> ShowS #

show :: IPName l -> String

showList :: [IPName l] -> ShowS #

Show l => Show (ImportDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> ImportDecl l -> ShowS #

show :: ImportDecl l -> String

showList :: [ImportDecl l] -> ShowS #

Show l => Show (ImportSpec l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> ImportSpec l -> ShowS #

show :: ImportSpec l -> String

showList :: [ImportSpec l] -> ShowS #

Show l => Show (ImportSpecList l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> ImportSpecList l -> ShowS #

show :: ImportSpecList l -> String

showList :: [ImportSpecList l] -> ShowS #

Show l => Show (InjectivityInfo l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> InjectivityInfo l -> ShowS #

show :: InjectivityInfo l -> String

showList :: [InjectivityInfo l] -> ShowS #

Show l => Show (InstDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> InstDecl l -> ShowS #

show :: InstDecl l -> String

showList :: [InstDecl l] -> ShowS #

Show l => Show (InstHead l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> InstHead l -> ShowS #

show :: InstHead l -> String

showList :: [InstHead l] -> ShowS #

Show l => Show (InstRule l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> InstRule l -> ShowS #

show :: InstRule l -> String

showList :: [InstRule l] -> ShowS #

Show l => Show (Literal l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Literal l -> ShowS #

show :: Literal l -> String

showList :: [Literal l] -> ShowS #

Show l => Show (Match l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Match l -> ShowS #

show :: Match l -> String

showList :: [Match l] -> ShowS #

Show l => Show (MaybePromotedName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> MaybePromotedName l -> ShowS #

show :: MaybePromotedName l -> String

showList :: [MaybePromotedName l] -> ShowS #

Show l => Show (Module l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Module l -> ShowS #

show :: Module l -> String

showList :: [Module l] -> ShowS #

Show l => Show (ModuleHead l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> ModuleHead l -> ShowS #

show :: ModuleHead l -> String

showList :: [ModuleHead l] -> ShowS #

Show l => Show (ModuleName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> ModuleName l -> ShowS #

show :: ModuleName l -> String

showList :: [ModuleName l] -> ShowS #

Show l => Show (ModulePragma l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> ModulePragma l -> ShowS #

show :: ModulePragma l -> String

showList :: [ModulePragma l] -> ShowS #

Show l => Show (Name l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Name l -> ShowS #

show :: Name l -> String

showList :: [Name l] -> ShowS #

Show l => Show (Namespace l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Namespace l -> ShowS #

show :: Namespace l -> String

showList :: [Namespace l] -> ShowS #

Show l => Show (Op l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Op l -> ShowS #

show :: Op l -> String

showList :: [Op l] -> ShowS #

Show l => Show (Overlap l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Overlap l -> ShowS #

show :: Overlap l -> String

showList :: [Overlap l] -> ShowS #

Show l => Show (PXAttr l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> PXAttr l -> ShowS #

show :: PXAttr l -> String

showList :: [PXAttr l] -> ShowS #

Show l => Show (Pat l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Pat l -> ShowS #

show :: Pat l -> String

showList :: [Pat l] -> ShowS #

Show l => Show (PatField l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> PatField l -> ShowS #

show :: PatField l -> String

showList :: [PatField l] -> ShowS #

Show l => Show (PatternSynDirection l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> PatternSynDirection l -> ShowS #

show :: PatternSynDirection l -> String

showList :: [PatternSynDirection l] -> ShowS #

Show l => Show (Promoted l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Promoted l -> ShowS #

show :: Promoted l -> String

showList :: [Promoted l] -> ShowS #

Show l => Show (QName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> QName l -> ShowS #

show :: QName l -> String

showList :: [QName l] -> ShowS #

Show l => Show (QOp l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> QOp l -> ShowS #

show :: QOp l -> String

showList :: [QOp l] -> ShowS #

Show l => Show (QualConDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> QualConDecl l -> ShowS #

show :: QualConDecl l -> String

showList :: [QualConDecl l] -> ShowS #

Show l => Show (QualStmt l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> QualStmt l -> ShowS #

show :: QualStmt l -> String

showList :: [QualStmt l] -> ShowS #

Show l => Show (RPat l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> RPat l -> ShowS #

show :: RPat l -> String

showList :: [RPat l] -> ShowS #

Show l => Show (RPatOp l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> RPatOp l -> ShowS #

show :: RPatOp l -> String

showList :: [RPatOp l] -> ShowS #

Show l => Show (ResultSig l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> ResultSig l -> ShowS #

show :: ResultSig l -> String

showList :: [ResultSig l] -> ShowS #

Show l => Show (Rhs l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Rhs l -> ShowS #

show :: Rhs l -> String

showList :: [Rhs l] -> ShowS #

Show l => Show (Role l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Role l -> ShowS #

show :: Role l -> String

showList :: [Role l] -> ShowS #

Show l => Show (Rule l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Rule l -> ShowS #

show :: Rule l -> String

showList :: [Rule l] -> ShowS #

Show l => Show (RuleVar l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> RuleVar l -> ShowS #

show :: RuleVar l -> String

showList :: [RuleVar l] -> ShowS #

Show l => Show (Safety l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Safety l -> ShowS #

show :: Safety l -> String

showList :: [Safety l] -> ShowS #

Show l => Show (Sign l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Sign l -> ShowS #

show :: Sign l -> String

showList :: [Sign l] -> ShowS #

Show l => Show (SpecialCon l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> SpecialCon l -> ShowS #

show :: SpecialCon l -> String

showList :: [SpecialCon l] -> ShowS #

Show l => Show (Splice l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Splice l -> ShowS #

show :: Splice l -> String

showList :: [Splice l] -> ShowS #

Show l => Show (Stmt l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Stmt l -> ShowS #

show :: Stmt l -> String

showList :: [Stmt l] -> ShowS #

Show l => Show (TyVarBind l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> TyVarBind l -> ShowS #

show :: TyVarBind l -> String

showList :: [TyVarBind l] -> ShowS #

Show l => Show (Type l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Type l -> ShowS #

show :: Type l -> String

showList :: [Type l] -> ShowS #

Show l => Show (TypeEqn l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> TypeEqn l -> ShowS #

show :: TypeEqn l -> String

showList :: [TypeEqn l] -> ShowS #

Show l => Show (Unpackedness l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> Unpackedness l -> ShowS #

show :: Unpackedness l -> String

showList :: [Unpackedness l] -> ShowS #

Show l => Show (WarningText l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> WarningText l -> ShowS #

show :: WarningText l -> String

showList :: [WarningText l] -> ShowS #

Show l => Show (XAttr l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> XAttr l -> ShowS #

show :: XAttr l -> String

showList :: [XAttr l] -> ShowS #

Show l => Show (XName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

showsPrec :: Int -> XName l -> ShowS #

show :: XName l -> String

showList :: [XName l] -> ShowS #

Show (ElapsedSince epoch) 
Instance details

Defined in Data.Hourglass.Epoch

Methods

showsPrec :: Int -> ElapsedSince epoch -> ShowS #

show :: ElapsedSince epoch -> String

showList :: [ElapsedSince epoch] -> ShowS #

Show (ElapsedSinceP epoch) 
Instance details

Defined in Data.Hourglass.Epoch

Methods

showsPrec :: Int -> ElapsedSinceP epoch -> ShowS #

show :: ElapsedSinceP epoch -> String

showList :: [ElapsedSinceP epoch] -> 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 (Word 'Acronym) 
Instance details

Defined in Text.Inflections.Types

Methods

showsPrec :: Int -> Word 'Acronym -> ShowS #

show :: Word 'Acronym -> String

showList :: [Word 'Acronym] -> ShowS #

Show (Word 'Normal) 
Instance details

Defined in Text.Inflections.Types

Methods

showsPrec :: Int -> Word 'Normal -> ShowS #

show :: Word 'Normal -> String

showList :: [Word 'Normal] -> 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 (Deque a) 
Instance details

Defined in Control.Lens.Internal.Deque

Methods

showsPrec :: Int -> Deque a -> ShowS #

show :: Deque a -> String

showList :: [Deque a] -> ShowS #

Show (FieldException a) 
Instance details

Defined in Data.Data.Lens

Methods

showsPrec :: Int -> FieldException a -> ShowS #

show :: FieldException a -> String

showList :: [FieldException a] -> ShowS #

Show valueType => Show (FieldWithDefault valueType) Source # 
Instance details

Defined in IHP.ModelSupport

Methods

showsPrec :: Int -> FieldWithDefault valueType -> ShowS #

show :: FieldWithDefault valueType -> String

showList :: [FieldWithDefault valueType] -> ShowS #

Show (PrimaryKey model) => Show (Id' model) Source # 
Instance details

Defined in IHP.ModelSupport

Methods

showsPrec :: Int -> Id' model -> ShowS #

show :: Id' model -> String

showList :: [Id' model] -> ShowS #

Show (QueryBuilder table) Source # 
Instance details

Defined in IHP.QueryBuilder

Methods

showsPrec :: Int -> QueryBuilder table -> ShowS #

show :: QueryBuilder table -> String

showList :: [QueryBuilder table] -> ShowS #

Show (Blind x) 
Instance details

Defined in Text.Megaparsec.Debug

Methods

showsPrec :: Int -> Blind x -> ShowS #

show :: Blind x -> String

showList :: [Blind x] -> ShowS #

Show e => Show (ErrorFancy e) 
Instance details

Defined in Text.Megaparsec.Error

Methods

showsPrec :: Int -> ErrorFancy e -> ShowS #

show :: ErrorFancy e -> String

showList :: [ErrorFancy e] -> ShowS #

Show t => Show (ErrorItem t) 
Instance details

Defined in Text.Megaparsec.Error

Methods

showsPrec :: Int -> ErrorItem t -> ShowS #

show :: ErrorItem t -> String

showList :: [ErrorItem t] -> ShowS #

Show s => Show (PosState s) 
Instance details

Defined in Text.Megaparsec.State

Methods

showsPrec :: Int -> PosState s -> ShowS #

show :: PosState s -> String

showList :: [PosState s] -> ShowS #

Show 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 (Fin n) 
Instance details

Defined in Arithmetic.Types

Methods

showsPrec :: Int -> Fin n -> ShowS #

show :: Fin n -> String

showList :: [Fin n] -> ShowS #

Show (Nat n) 
Instance details

Defined in Arithmetic.Unsafe

Methods

showsPrec :: Int -> Nat n -> ShowS #

show :: Nat n -> String

showList :: [Nat n] -> 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 (RegexpSplit a) 
Instance details

Defined in Text.Regex.PCRE.ByteString.Utils

Methods

showsPrec :: Int -> RegexpSplit a -> ShowS #

show :: RegexpSplit a -> String

showList :: [RegexpSplit a] -> ShowS #

Show a => Show (Aeson a) 
Instance details

Defined in Database.PostgreSQL.Simple.Newtypes

Methods

showsPrec :: Int -> Aeson a -> ShowS #

show :: Aeson a -> String

showList :: [Aeson a] -> ShowS #

Show a => Show (Ok a) 
Instance details

Defined in Database.PostgreSQL.Simple.Ok

Methods

showsPrec :: Int -> Ok a -> ShowS #

show :: Ok a -> String

showList :: [Ok a] -> ShowS #

Show a => Show (PGRange a) 
Instance details

Defined in Database.PostgreSQL.Simple.Range

Methods

showsPrec :: Int -> PGRange a -> ShowS #

show :: PGRange a -> String

showList :: [PGRange a] -> ShowS #

Show a => Show (RangeBound a) 
Instance details

Defined in Database.PostgreSQL.Simple.Range

Methods

showsPrec :: Int -> RangeBound a -> ShowS #

show :: RangeBound a -> String

showList :: [RangeBound a] -> ShowS #

Show a => Show (Binary a) 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

showsPrec :: Int -> Binary a -> ShowS #

show :: Binary a -> String

showList :: [Binary a] -> ShowS #

Show a => Show (In a) 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

showsPrec :: Int -> In a -> ShowS #

show :: In a -> String

showList :: [In a] -> ShowS #

Show a => Show (PGArray a) 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

showsPrec :: Int -> PGArray a -> ShowS #

show :: PGArray a -> String

showList :: [PGArray a] -> ShowS #

Show a => Show (Values a) 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

showsPrec :: Int -> Values a -> ShowS #

show :: Values a -> String

showList :: [Values 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 ann => Show (Diag ann) 
Instance details

Defined in Prettyprinter.Internal.Debug

Methods

showsPrec :: Int -> Diag ann -> ShowS #

show :: Diag ann -> String

showList :: [Diag ann] -> ShowS #

Show ann => Show (SimpleDocTok ann) 
Instance details

Defined in Prettyprinter.Render.Util.SimpleDocTree

Methods

showsPrec :: Int -> SimpleDocTok ann -> ShowS #

show :: SimpleDocTok ann -> String

showList :: [SimpleDocTok ann] -> ShowS #

Show ann => Show (SimpleDocTree ann) 
Instance details

Defined in Prettyprinter.Render.Util.SimpleDocTree

Methods

showsPrec :: Int -> SimpleDocTree ann -> ShowS #

show :: SimpleDocTree ann -> String

showList :: [SimpleDocTree 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 (CharMap a) 
Instance details

Defined in Data.IntMap.CharMap2

Methods

showsPrec :: Int -> CharMap a -> ShowS #

show :: CharMap a -> String

showList :: [CharMap a] -> ShowS #

Show (EnumSet e) 
Instance details

Defined in Data.IntSet.EnumSet2

Methods

showsPrec :: Int -> EnumSet e -> ShowS #

show :: EnumSet e -> String

showList :: [EnumSet e] -> ShowS #

Show a => Show (Resource a) 
Instance details

Defined in Data.Pool.Introspection

Methods

showsPrec :: Int -> Resource a -> ShowS #

show :: Resource a -> String

showList :: [Resource a] -> 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 a => Show (Maybe a) 
Instance details

Defined in Data.Strict.Maybe

Methods

showsPrec :: Int -> Maybe a -> ShowS #

show :: Maybe a -> String

showList :: [Maybe a] -> ShowS #

Show flag => Show (TyVarBndr flag) 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> TyVarBndr flag -> ShowS #

show :: TyVarBndr flag -> String

showList :: [TyVarBndr flag] -> ShowS #

Show (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 #

UTF8Bytes string index => Show (UTF8 string) 
Instance details

Defined in Data.String.UTF8

Methods

showsPrec :: Int -> UTF8 string -> ShowS #

show :: UTF8 string -> String

showList :: [UTF8 string] -> 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 c => Show (FileInfo c) 
Instance details

Defined in Network.Wai.Parse

Methods

showsPrec :: Int -> FileInfo c -> ShowS #

show :: FileInfo c -> String

showList :: [FileInfo c] -> ShowS #

Show age => Show (CacheResponse age) 
Instance details

Defined in Network.Wreq.Cache

Methods

showsPrec :: Int -> CacheResponse age -> ShowS #

show :: CacheResponse age -> String

showList :: [CacheResponse age] -> ShowS #

Show node => Show (Cursor node) 
Instance details

Defined in Text.XML.Cursor.Generic

Methods

showsPrec :: Int -> Cursor node -> ShowS #

show :: Cursor node -> String

showList :: [Cursor node] -> 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 a, Show b) => Show (a :-> b) 
Instance details

Defined in Test.QuickCheck.Function

Methods

showsPrec :: Int -> (a :-> b) -> ShowS #

show :: (a :-> b) -> String

showList :: [a :-> b] -> ShowS #

(Show a, Show b) => Show (Fun a b) 
Instance details

Defined in Test.QuickCheck.Function

Methods

showsPrec :: Int -> Fun a b -> ShowS #

show :: Fun a b -> String

showList :: [Fun a b] -> ShowS #

Show a => Show (Shrinking s a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

showsPrec :: Int -> Shrinking s a -> ShowS #

show :: Shrinking s a -> String

showList :: [Shrinking s a] -> ShowS #

(Show k, Show e) => Show (TkArray k e) 
Instance details

Defined in Data.Aeson.Decoding.Tokens

Methods

showsPrec :: Int -> TkArray k e -> ShowS #

show :: TkArray k e -> String

showList :: [TkArray k e] -> ShowS #

(Show k, Show e) => Show (TkRecord k e) 
Instance details

Defined in Data.Aeson.Decoding.Tokens

Methods

showsPrec :: Int -> TkRecord k e -> ShowS #

show :: TkRecord k e -> String

showList :: [TkRecord k e] -> ShowS #

(Show k, Show e) => Show (Tokens k e) 
Instance details

Defined in Data.Aeson.Decoding.Tokens

Methods

showsPrec :: Int -> Tokens k e -> ShowS #

show :: Tokens k e -> String

showList :: [Tokens k e] -> ShowS #

(Ix ix, Show ix, Show e, IArray UArray e) => Show (UArray ix e) 
Instance details

Defined in Data.Array.Base

Methods

showsPrec :: Int -> UArray ix e -> ShowS #

show :: UArray ix e -> String

showList :: [UArray ix e] -> ShowS #

(Show i, Show r) => Show (IResult i r) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

showsPrec :: Int -> IResult i r -> ShowS #

show :: IResult i r -> String

showList :: [IResult i r] -> ShowS #

(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 #

(PrimType a, Show a) => Show (BlockN n a) 
Instance details

Defined in Basement.Sized.Block

Methods

showsPrec :: Int -> BlockN n a -> ShowS #

show :: BlockN n a -> String

showList :: [BlockN n a] -> ShowS #

Show a => Show (ListN n a) 
Instance details

Defined in Basement.Sized.List

Methods

showsPrec :: Int -> ListN n a -> ShowS #

show :: ListN n a -> String

showList :: [ListN n a] -> ShowS #

(PrimType a, Show a) => Show (UVect n a) 
Instance details

Defined in Basement.Sized.UVect

Methods

showsPrec :: Int -> UVect n a -> ShowS #

show :: UVect n a -> String

showList :: [UVect n a] -> ShowS #

Show a => Show (Vect n a) 
Instance details

Defined in Basement.Sized.Vect

Methods

showsPrec :: Int -> Vect n a -> ShowS #

show :: Vect n a -> String

showList :: [Vect n a] -> ShowS #

(Show a, Show b) => Show (These a b) 
Instance details

Defined in Basement.These

Methods

showsPrec :: Int -> These a b -> ShowS #

show :: These a b -> String

showList :: [These a b] -> ShowS #

(Show k, Show a) => Show (Map k a) 
Instance details

Defined in Data.Map.Internal

Methods

showsPrec :: Int -> Map k a -> ShowS #

show :: Map k a -> String

showList :: [Map k a] -> ShowS #

Show (MacKey c d) 
Instance details

Defined in Crypto.HMAC

Methods

showsPrec :: Int -> MacKey c d -> ShowS #

show :: MacKey c d -> String

showList :: [MacKey c d] -> 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 (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 #

(Show1 f, Show a) => Show (Cofree f a) 
Instance details

Defined in Control.Comonad.Cofree

Methods

showsPrec :: Int -> Cofree f a -> ShowS #

show :: Cofree f a -> String

showList :: [Cofree f a] -> ShowS #

(Show1 w, Show a) => Show (CoiterT w a) 
Instance details

Defined in Control.Comonad.Trans.Coiter

Methods

showsPrec :: Int -> CoiterT w a -> ShowS #

show :: CoiterT w a -> String

showList :: [CoiterT w a] -> ShowS #

(Show1 f, Show a) => Show (Free f a) 
Instance details

Defined in Control.Monad.Free

Methods

showsPrec :: Int -> Free f a -> ShowS #

show :: Free f a -> String

showList :: [Free f a] -> ShowS #

(Show1 f, Show a) => Show (Free f a) 
Instance details

Defined in Control.Monad.Free.Ap

Methods

showsPrec :: Int -> Free f a -> ShowS #

show :: Free f a -> String

showList :: [Free f a] -> ShowS #

(Show1 m, Show a) => Show (IterT m a) 
Instance details

Defined in Control.Monad.Trans.Iter

Methods

showsPrec :: Int -> IterT m a -> ShowS #

show :: IterT m a -> String

showList :: [IterT m a] -> ShowS #

(Show a, Show b) => Show (Gr a b) 
Instance details

Defined in GHC.Data.Graph.Inductive.PatriciaTree

Methods

showsPrec :: Int -> Gr a b -> ShowS #

show :: Gr a b -> String

showList :: [Gr a b] -> ShowS #

(Show l, Show e) => Show (GenLocated l e) 
Instance details

Defined in GHC.Types.SrcLoc

Methods

showsPrec :: Int -> GenLocated l e -> ShowS #

show :: GenLocated l e -> String

showList :: [GenLocated l e] -> ShowS #

Show a => Show (EvalStatus_ a b) 
Instance details

Defined in GHCi.Message

Methods

showsPrec :: Int -> EvalStatus_ a b -> ShowS #

show :: EvalStatus_ a b -> String

showList :: [EvalStatus_ a b] -> ShowS #

(Show k, Show a) => Show (IPRTable k a) 
Instance details

Defined in Data.IP.RouteTable.Internal

Methods

showsPrec :: Int -> IPRTable k a -> ShowS #

show :: IPRTable k a -> String

showList :: [IPRTable k a] -> ShowS #

(Functor f, Show1 f, Show a) => Show (Coyoneda f a) 
Instance details

Defined in Data.Functor.Coyoneda

Methods

showsPrec :: Int -> Coyoneda f a -> ShowS #

show :: Coyoneda f a -> String

showList :: [Coyoneda f a] -> ShowS #

Show (f a) => Show (Yoneda f a) 
Instance details

Defined in Data.Functor.Yoneda

Methods

showsPrec :: Int -> Yoneda f a -> ShowS #

show :: Yoneda f a -> String

showList :: [Yoneda f a] -> ShowS #

(Show i, Show a) => Show (Level i a) 
Instance details

Defined in Control.Lens.Internal.Level

Methods

showsPrec :: Int -> Level i a -> ShowS #

show :: Level i a -> String

showList :: [Level i a] -> ShowS #

(Show a, Show b) => Show (LabeledData a b) Source # 
Instance details

Defined in IHP.ModelSupport

Methods

showsPrec :: Int -> LabeledData a b -> ShowS #

show :: LabeledData a b -> String

showList :: [LabeledData a b] -> ShowS #

(Show c, Show a) => Show (ShowComment c a) 
Instance details

Defined in Text.Megaparsec.Debug

Methods

showsPrec :: Int -> ShowComment c a -> ShowS #

show :: ShowComment c a -> String

showList :: [ShowComment c a] -> ShowS #

(Show (Token s), Show e) => Show (ParseError s e) 
Instance details

Defined in Text.Megaparsec.Error

Methods

showsPrec :: Int -> ParseError s e -> ShowS #

show :: ParseError s e -> String

showList :: [ParseError s e] -> ShowS #

(Show s, Show (Token s), Show e) => Show (ParseErrorBundle s e) 
Instance details

Defined in Text.Megaparsec.Error

Methods

showsPrec :: Int -> ParseErrorBundle s e -> ShowS #

show :: ParseErrorBundle s e -> String

showList :: [ParseErrorBundle s e] -> ShowS #

(Show (ParseError s e), Show s) => Show (State s e) 
Instance details

Defined in Text.Megaparsec.State

Methods

showsPrec :: Int -> State s e -> ShowS #

show :: State s e -> String

showList :: [State s e] -> ShowS #

(Show 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 h, Show t) => Show (h :. t) 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

showsPrec :: Int -> (h :. t) -> ShowS #

show :: (h :. t) -> String

showList :: [h :. t] -> ShowS #

(Show a, PrimUnlifted a, unlifted_a ~ Unlifted a) => Show (UnliftedArray_ unlifted_a a) 
Instance details

Defined in Data.Primitive.Unlifted.Array.ST

Methods

showsPrec :: Int -> UnliftedArray_ unlifted_a a -> ShowS #

show :: UnliftedArray_ unlifted_a a -> String

showList :: [UnliftedArray_ unlifted_a a] -> ShowS #

(Show a, PrimUnlifted a, unlifted_a ~ Unlifted a) => Show (SmallUnliftedArray_ a unlifted_a) 
Instance details

Defined in Data.Primitive.Unlifted.SmallArray.ST

Methods

showsPrec :: Int -> SmallUnliftedArray_ a unlifted_a -> ShowS #

show :: SmallUnliftedArray_ a unlifted_a -> String

showList :: [SmallUnliftedArray_ a unlifted_a] -> ShowS #

Show a => Show (EnumMap k a) 
Instance details

Defined in Data.IntMap.EnumMap2

Methods

showsPrec :: Int -> EnumMap k a -> ShowS #

show :: EnumMap k a -> String

showList :: [EnumMap k a] -> ShowS #

Show (f a) => Show (Zippy f a) 
Instance details

Defined in Data.Zip

Methods

showsPrec :: Int -> Zippy f a -> ShowS #

show :: Zippy f a -> String

showList :: [Zippy f a] -> ShowS #

(Show a, Show b) => Show (Either a b) 
Instance details

Defined in Data.Strict.Either

Methods

showsPrec :: Int -> Either a b -> ShowS #

show :: Either a b -> String

showList :: [Either a b] -> ShowS #

(Show a, Show b) => Show (These a b) 
Instance details

Defined in Data.Strict.These

Methods

showsPrec :: Int -> These a b -> ShowS #

show :: These a b -> String

showList :: [These a b] -> ShowS #

(Show a, Show b) => Show (Pair a b) 
Instance details

Defined in Data.Strict.Tuple

Methods

showsPrec :: Int -> Pair a b -> ShowS #

show :: Pair a b -> String

showList :: [Pair a b] -> ShowS #

(Show a, Show b) => 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 #

(GShow (Rep1 f a), Generic1 f) => Show (FunctorClassesDefault f a) 
Instance details

Defined in Data.Functor.Classes.Generic.Internal

Methods

showsPrec :: Int -> FunctorClassesDefault f a -> ShowS #

show :: FunctorClassesDefault f a -> String

showList :: [FunctorClassesDefault f a] -> ShowS #

Show (TypeRepMap f) 
Instance details

Defined in Data.TypeRepMap.Internal

Methods

showsPrec :: Int -> TypeRepMap f -> ShowS #

show :: TypeRepMap f -> String

showList :: [TypeRepMap f] -> ShowS #

Show (WrapTypeable f) 
Instance details

Defined in Data.TypeRepMap.Internal

Methods

showsPrec :: Int -> WrapTypeable f -> ShowS #

show :: WrapTypeable f -> String

showList :: [WrapTypeable f] -> 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 k, Show v, Ord k, Hashable k) => Show (Store k v) 
Instance details

Defined in Network.Wreq.Cache.Store

Methods

showsPrec :: Int -> Store k v -> ShowS #

show :: Store k v -> String

showList :: [Store 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 (bi a b) => Show (Biap bi a b) 
Instance details

Defined in Data.Bifunctor.Biap

Methods

showsPrec :: Int -> Biap bi a b -> ShowS #

show :: Biap bi a b -> String

showList :: [Biap bi a b] -> ShowS #

Show (p (Fix p a) a) => Show (Fix p a) 
Instance details

Defined in Data.Bifunctor.Fix

Methods

showsPrec :: Int -> Fix p a -> ShowS #

show :: Fix p a -> String

showList :: [Fix p a] -> ShowS #

Show (p a a) => Show (Join p a) 
Instance details

Defined in Data.Bifunctor.Join

Methods

showsPrec :: Int -> Join p a -> ShowS #

show :: Join p a -> String

showList :: [Join p a] -> ShowS #

(Show a, Show (f b)) => Show (CofreeF f a b) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

showsPrec :: Int -> CofreeF f a b -> ShowS #

show :: CofreeF f a b -> String

showList :: [CofreeF f a b] -> ShowS #

Show (w (CofreeF f a (CofreeT f w a))) => Show (CofreeT f w a) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

showsPrec :: Int -> CofreeT f w a -> ShowS #

show :: CofreeT f w a -> String

showList :: [CofreeT f w a] -> ShowS #

(Show a, Show (f b)) => Show (FreeF f a b) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

showsPrec :: Int -> FreeF f a b -> ShowS #

show :: FreeF f a b -> String

showList :: [FreeF f a b] -> ShowS #

(Show1 f, Show1 m, Show a) => Show (FreeT f m a) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

showsPrec :: Int -> FreeT f m a -> ShowS #

show :: FreeT f m a -> String

showList :: [FreeT f m a] -> ShowS #

(Show a, Show (f b)) => Show (FreeF f a b) 
Instance details

Defined in Control.Monad.Trans.Free.Ap

Methods

showsPrec :: Int -> FreeF f a b -> ShowS #

show :: FreeF f a b -> String

showList :: [FreeF f a b] -> ShowS #

(Show1 f, Show1 m, Show a) => Show (FreeT f m a) 
Instance details

Defined in Control.Monad.Trans.Free.Ap

Methods

showsPrec :: Int -> FreeT f m a -> ShowS #

show :: FreeT f m a -> String

showList :: [FreeT f m a] -> ShowS #

Show (f a) => Show (WrappedContravariant f a) 
Instance details

Defined in Data.Functor.Invariant

Methods

showsPrec :: Int -> WrappedContravariant f a -> ShowS #

show :: WrappedContravariant f a -> String

showList :: [WrappedContravariant f a] -> ShowS #

Show (f a) => Show (WrappedFunctor f a) 
Instance details

Defined in Data.Functor.Invariant

Methods

showsPrec :: Int -> WrappedFunctor f a -> ShowS #

show :: WrappedFunctor f a -> String

showList :: [WrappedFunctor f a] -> ShowS #

Show (f (a, b)) => Show (AlongsideLeft f b a) 
Instance details

Defined in Control.Lens.Internal.Getter

Methods

showsPrec :: Int -> AlongsideLeft f b a -> ShowS #

show :: AlongsideLeft f b a -> String

showList :: [AlongsideLeft f b a] -> ShowS #

Show (f (a, b)) => Show (AlongsideRight f a b) 
Instance details

Defined in Control.Lens.Internal.Getter

Methods

showsPrec :: Int -> AlongsideRight f a b -> ShowS #

show :: AlongsideRight f a b -> String

showList :: [AlongsideRight f a b] -> ShowS #

Show (JobsDashboardController authType jobs) Source # 
Instance details

Defined in IHP.Job.Dashboard.Types

Methods

showsPrec :: Int -> JobsDashboardController authType jobs -> ShowS #

show :: JobsDashboardController authType jobs -> String

showList :: [JobsDashboardController authType jobs] -> ShowS #

Show value => Show (FieldWithUpdate name value) Source # 
Instance details

Defined in IHP.ModelSupport

Methods

showsPrec :: Int -> FieldWithUpdate name value -> ShowS #

show :: FieldWithUpdate name value -> String

showList :: [FieldWithUpdate name value] -> ShowS #

Show b => Show (Tagged s b) 
Instance details

Defined in Data.Tagged

Methods

showsPrec :: Int -> Tagged s b -> ShowS #

show :: Tagged s b -> String

showList :: [Tagged s b] -> ShowS #

(Show (f a), Show (g a), Show a) => Show (These1 f g a) 
Instance details

Defined in Data.Functor.These

Methods

showsPrec :: Int -> These1 f g a -> ShowS #

show :: These1 f g a -> String

showList :: [These1 f g a] -> ShowS #

(Show1 f, Show a) => Show (Backwards f a) 
Instance details

Defined in Control.Applicative.Backwards

Methods

showsPrec :: Int -> Backwards f a -> ShowS #

show :: Backwards f a -> String

showList :: [Backwards f a] -> ShowS #

(Show e, Show1 m, Show a) => Show (ExceptT e m a) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

showsPrec :: Int -> ExceptT e m a -> ShowS #

show :: ExceptT e m a -> String

showList :: [ExceptT e m a] -> ShowS #

(Show1 f, Show a) => Show (IdentityT f a) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

showsPrec :: Int -> IdentityT f a -> ShowS #

show :: IdentityT f a -> String

showList :: [IdentityT f a] -> ShowS #

(Show w, Show1 m, Show a) => Show (WriterT w m a) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

showsPrec :: Int -> WriterT w m a -> ShowS #

show :: WriterT w m a -> String

showList :: [WriterT w m a] -> ShowS #

(Show w, Show1 m, Show a) => Show (WriterT w m a) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

showsPrec :: Int -> WriterT w m a -> ShowS #

show :: WriterT w m a -> String

showList :: [WriterT w m a] -> ShowS #

Show a => Show (Constant a b) 
Instance details

Defined in Data.Functor.Constant

Methods

showsPrec :: Int -> Constant a b -> ShowS #

show :: Constant a b -> String

showList :: [Constant a b] -> ShowS #

(Show1 f, Show a) => Show (Reverse f a) 
Instance details

Defined in Data.Functor.Reverse

Methods

showsPrec :: Int -> Reverse f a -> ShowS #

show :: Reverse f a -> String

showList :: [Reverse f a] -> ShowS #

Show (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 (Handling a s m) 
Instance details

Defined in Control.Lens.Internal.Exception

Methods

showsPrec :: Int -> Handling a s m -> ShowS #

show :: Handling a s m -> String

showList :: [Handling a s m] -> ShowS #

(Show i, Show a) => Show (Magma i t b a) 
Instance details

Defined in Control.Lens.Internal.Magma

Methods

showsPrec :: Int -> Magma i t b a -> ShowS #

show :: Magma i t b a -> String

showList :: [Magma i t b a] -> ShowS #

(Show 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 (f a) => Show (Clown f a b) 
Instance details

Defined in Data.Bifunctor.Clown

Methods

showsPrec :: Int -> Clown f a b -> ShowS #

show :: Clown f a b -> String

showList :: [Clown f a b] -> ShowS #

Show (p b a) => Show (Flip p a b) 
Instance details

Defined in Data.Bifunctor.Flip

Methods

showsPrec :: Int -> Flip p a b -> ShowS #

show :: Flip p a b -> String

showList :: [Flip p a b] -> ShowS #

Show (g b) => Show (Joker g a b) 
Instance details

Defined in Data.Bifunctor.Joker

Methods

showsPrec :: Int -> Joker g a b -> ShowS #

show :: Joker g a b -> String

showList :: [Joker g a b] -> ShowS #

Show (p a b) => Show (WrappedBifunctor p a b) 
Instance details

Defined in Data.Bifunctor.Wrapped

Methods

showsPrec :: Int -> WrappedBifunctor p a b -> ShowS #

show :: WrappedBifunctor p a b -> String

showList :: [WrappedBifunctor p a b] -> 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 (p a b) => Show (WrappedProfunctor p a b) 
Instance details

Defined in Data.Functor.Invariant

Methods

showsPrec :: Int -> WrappedProfunctor p a b -> ShowS #

show :: WrappedProfunctor p a b -> String

showList :: [WrappedProfunctor p a b] -> 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 (f a b), Show (g a b)) => Show (Product f g a b) 
Instance details

Defined in Data.Bifunctor.Product

Methods

showsPrec :: Int -> Product f g a b -> ShowS #

show :: Product f g a b -> String

showList :: [Product f g a b] -> ShowS #

(Show (p a b), Show (q a b)) => Show (Sum p q a b) 
Instance details

Defined in Data.Bifunctor.Sum

Methods

showsPrec :: Int -> Sum p q a b -> ShowS #

show :: Sum p q a b -> String

showList :: [Sum p q a b] -> ShowS #

(Show a, Show b, Show c, Show d, Show e, Show f) => Show (a, b, c, d, e, f) 
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 (f (p a b)) => Show (Tannen f p a b) 
Instance details

Defined in Data.Bifunctor.Tannen

Methods

showsPrec :: Int -> Tannen f p a b -> ShowS #

show :: Tannen f p a b -> String

showList :: [Tannen f p a b] -> ShowS #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g) => Show (a, b, c, d, e, f, g) 
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 (p (f a) (g b)) => Show (Biff p f g a b) 
Instance details

Defined in Data.Bifunctor.Biff

Methods

showsPrec :: Int -> Biff p f g a b -> ShowS #

show :: Biff p f g a b -> String

showList :: [Biff p f g a b] -> ShowS #

(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i) => Show (a, b, c, d, e, f, g, h, i) 
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 #

currentViewId :: (?view :: view, Typeable view) => Text Source #

Returns a string to be used as a html id attribute for the current view. E.g. when calling currentViewId while rendering the view Web.View.Projects.Show, this will return "projects-show"

Useful to automatically scope certain css rules to a specific view. Example:

module Web.View.Projects.Show where
render = [hsx|<div id={currentViewId}>Hello World!</div>|]

This will render id="projects-show"Hello World!/div

forEach :: (MonoFoldable mono, Applicative m) => mono -> (Element mono -> m ()) -> m () Source #

Example:

forEach users \user -> putStrLn (tshow user)

Example: Within HSX

renderUser :: User -> Html
renderUser user = [hsx|<div>User: {user.name}</div>|]

render = [hsx|{forEach users renderUser}|]

isActivePath :: (?context :: ControllerContext, PathString controller) => controller -> Bool Source #

Returns True when the current request path matches the path given as argument. Takes into account the search query: ?name=value

Example: The browser has requested the url /Projects.

>>> isActivePath "/Projects"
True

Returns True because "/Projects" is the current requested path.

>>> isActivePath "/Users"
False

Returns false because "/Users" is not "/Projects"

Example: The browser has requested the url /Projects.

>>> isActivePath "/Projects/1"
False

This function returns False when a sub-path is request. Use isActivePathOrSub if you want this example to return True.

isActivePathOrSub :: (?context :: ControllerContext, PathString controller) => controller -> Bool Source #

Returns True when the current request path starts with the path given as argument.

Example: The browser has requested the url /Projects/1.

>>> isActivePathOrSub "/Projects"
True

Example: The browser has requested the url /Projects.

>>> isActivePathOrSub "/Projects"
True

Also see isActivePath.

css :: QuasiQuoter Source #

onClick :: AttributeValue -> Attribute Source #

onLoad :: AttributeValue -> Attribute Source #

viewContext :: (?context :: ControllerContext) => ControllerContext Source #

Alias for ?context

addStyle :: ConvertibleStrings string Text => string -> Markup Source #

Adds an inline style element to the html.

This helps to work around the issue, that our HSX parser cannot deal with CSS yet.

Example:

myStyle = addStyle "#my-div { color: blue; }"
[hsx|{myStyle}<div id="my-div">Hello World</div>|]

This will render like:

<style>
    #my-div { color: blue; }
</style>
<div id="my-div">Hello World</div>

isActiveController :: forall {k} (controller :: k). (?context :: ControllerContext, Typeable controller) => Bool Source #

Returns True when the given type matches the type of the currently executed controller action

Example: The browser has requested /Posts and the Posts action of the PostsController is called.

>>> isActiveController @PostsController
True

Returns True because the current action is part of the PostsController

isActiveAction :: (?context :: ControllerContext, HasPath controllerAction) => controllerAction -> Bool Source #

Returns True when the given action matches the path of the currently executed action

Example: The browser has requested /PostsAction.

>>> isActiveAction PostsAction
True

nl2br :: (Textual text, ToHtml text) => text -> Html Source #

Replaces all newline characters with a br tag. Useful for displaying preformatted text.

>>> nl2br "Hello\nWorld!"
[hsx|Hello<br/>World!|]

stripTags :: Text -> Text Source #

Removes all html tags from a given html text

>>> stripTags "This is <b>Bold</b>"
"This is Bold"

fromCSSFramework :: forall (field :: Symbol) appliedFunction. (?context :: ControllerContext, KnownSymbol field, HasField field CSSFramework (CSSFramework -> appliedFunction)) => Proxy field -> appliedFunction Source #

liveReloadWebsocketUrl :: (?context :: ControllerContext) => Text Source #

The URL for the dev-mode live reload server. Typically "ws://localhost:8001"

delete :: Eq a => a -> [a] -> [a] #

take :: Int -> [a] -> [a] #

currentUser :: (?context :: ControllerContext, user ~ CurrentUserRecord, Typeable user) => user Source #

currentUserId :: (?context :: ControllerContext, HasField "id" user userId, Typeable user, user ~ CurrentUserRecord) => userId Source #

currentAdmin :: (?context :: ControllerContext, admin ~ CurrentAdminRecord, Typeable admin) => admin Source #

autoRefreshMeta :: (?context :: ControllerContext) => Html Source #

takeWhile :: (a -> Bool) -> [a] -> [a] #

type Id model = Id' (GetTableName model) Source #

We need to map the model to its table name to prevent infinite recursion in the model data definition E.g. `type Project = Project' { id :: Id Project }` will not work But `type Project = Project' { id :: Id "projects" }` will

assetPath :: (?context :: ControllerContext) => Text -> Text Source #

Adds a cache buster to a asset path

>>> assetPath "/keyhandlers.js"
"/keyhandlers.js?v=9be8995c-7055-43d9-a1b2-43e05c210271"

The asset version can be configured using the IHP_ASSET_VERSION environment variable.

assetVersion :: (?context :: ControllerContext) => Text Source #

Returns the assetVersion

>>> assetVersion
"9be8995c-7055-43d9-a1b2-43e05c210271"

The asset version can be configured using the IHP_ASSET_VERSION environment variable.

newtype AssetVersion Source #

Constructors

AssetVersion Text 

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 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 Gen 
Instance details

Defined in Test.QuickCheck.Gen

Methods

(>>=) :: Gen a -> (a -> Gen b) -> Gen b #

(>>) :: Gen a -> Gen b -> Gen b #

return :: a -> Gen a #

Monad Rose 
Instance details

Defined in Test.QuickCheck.Property

Methods

(>>=) :: Rose a -> (a -> Rose b) -> Rose b #

(>>) :: Rose a -> Rose b -> Rose b #

return :: a -> Rose 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 ParseASN1 
Instance details

Defined in Data.ASN1.Parse

Methods

(>>=) :: ParseASN1 a -> (a -> ParseASN1 b) -> ParseASN1 b #

(>>) :: ParseASN1 a -> ParseASN1 b -> ParseASN1 b #

return :: a -> ParseASN1 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 Get 
Instance details

Defined in Data.Binary.Get.Internal

Methods

(>>=) :: Get a -> (a -> Get b) -> Get b #

(>>) :: Get a -> Get b -> Get b #

return :: a -> Get a #

Monad PutM 
Instance details

Defined in Data.Binary.Put

Methods

(>>=) :: PutM a -> (a -> PutM b) -> PutM b #

(>>) :: PutM a -> PutM b -> PutM b #

return :: a -> PutM a #

Monad MarkupM 
Instance details

Defined in Text.Blaze.Internal

Methods

(>>=) :: MarkupM a -> (a -> MarkupM b) -> MarkupM b #

(>>) :: MarkupM a -> MarkupM b -> MarkupM b #

return :: a -> MarkupM 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 Get 
Instance details

Defined in Data.Serialize.Get

Methods

(>>=) :: Get a -> (a -> Get b) -> Get b #

(>>) :: Get a -> Get b -> Get b #

return :: a -> Get a #

Monad PutM 
Instance details

Defined in Data.Serialize.Put

Methods

(>>=) :: PutM a -> (a -> PutM b) -> PutM b #

(>>) :: PutM a -> PutM b -> PutM b #

return :: a -> PutM 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 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 NormM 
Instance details

Defined in GHC.Core.FamInstEnv

Methods

(>>=) :: NormM a -> (a -> NormM b) -> NormM b #

(>>) :: NormM a -> NormM b -> NormM b #

return :: a -> NormM a #

Monad PV 
Instance details

Defined in GHC.Parser.PostProcess

Methods

(>>=) :: PV a -> (a -> PV b) -> PV b #

(>>) :: PV a -> PV b -> PV b #

return :: a -> PV a #

Monad SolverStage 
Instance details

Defined in GHC.Tc.Solver.Monad

Methods

(>>=) :: SolverStage a -> (a -> SolverStage b) -> SolverStage b #

(>>) :: SolverStage a -> SolverStage b -> SolverStage b #

return :: a -> SolverStage a #

Monad TcS 
Instance details

Defined in GHC.Tc.Solver.Monad

Methods

(>>=) :: TcS a -> (a -> TcS b) -> TcS b #

(>>) :: TcS a -> TcS b -> TcS b #

return :: a -> TcS a #

Monad 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 GHCiQ 
Instance details

Defined in GHCi.TH

Methods

(>>=) :: GHCiQ a -> (a -> GHCiQ b) -> GHCiQ b #

(>>) :: GHCiQ a -> GHCiQ b -> GHCiQ b #

return :: a -> GHCiQ a #

Monad EP 
Instance details

Defined in Language.Haskell.Exts.ExactPrint

Methods

(>>=) :: EP a -> (a -> EP b) -> EP b #

(>>) :: EP a -> EP b -> EP b #

return :: a -> EP a #

Monad Deque 
Instance details

Defined in Control.Lens.Internal.Deque

Methods

(>>=) :: Deque a -> (a -> Deque b) -> Deque b #

(>>) :: Deque a -> Deque b -> Deque b #

return :: a -> Deque a #

Monad Minio 
Instance details

Defined in Network.Minio.Data

Methods

(>>=) :: Minio a -> (a -> Minio b) -> Minio b #

(>>) :: Minio a -> Minio b -> Minio b #

return :: a -> Minio 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 Eval 
Instance details

Defined in Control.Parallel.Strategies

Methods

(>>=) :: Eval a -> (a -> Eval b) -> Eval b #

(>>) :: Eval a -> Eval b -> Eval b #

return :: a -> Eval a #

Monad Conversion 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Methods

(>>=) :: Conversion a -> (a -> Conversion b) -> Conversion b #

(>>) :: Conversion a -> Conversion b -> Conversion b #

return :: a -> Conversion a #

Monad RowParser 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Methods

(>>=) :: RowParser a -> (a -> RowParser b) -> RowParser b #

(>>) :: RowParser a -> RowParser b -> RowParser b #

return :: a -> RowParser a #

Monad Ok 
Instance details

Defined in Database.PostgreSQL.Simple.Ok

Methods

(>>=) :: Ok a -> (a -> Ok b) -> Ok b #

(>>) :: Ok a -> Ok b -> Ok b #

return :: a -> Ok 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 Acquire 
Instance details

Defined in Data.Acquire.Internal

Methods

(>>=) :: Acquire a -> (a -> Acquire b) -> Acquire b #

(>>) :: Acquire a -> Acquire b -> Acquire b #

return :: a -> Acquire 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 Capability 
Instance details

Defined in System.Console.Terminfo.Base

Methods

(>>=) :: Capability a -> (a -> Capability b) -> Capability b #

(>>) :: Capability a -> Capability b -> Capability b #

return :: a -> Capability 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 Box 
Instance details

Defined in Data.Stream.Monadic

Methods

(>>=) :: Box a -> (a -> Box b) -> Box b #

(>>) :: Box a -> Box b -> Box b #

return :: a -> Box a #

Monad AttrParser 
Instance details

Defined in Text.XML.Stream.Parse

Methods

(>>=) :: AttrParser a -> (a -> AttrParser b) -> AttrParser b #

(>>) :: AttrParser a -> AttrParser b -> AttrParser b #

return :: a -> AttrParser 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 m => Monad (PropertyM m) 
Instance details

Defined in Test.QuickCheck.Monadic

Methods

(>>=) :: PropertyM m a -> (a -> PropertyM m b) -> PropertyM m b #

(>>) :: PropertyM m a -> PropertyM m b -> PropertyM m b #

return :: a -> PropertyM m a #

Representable f => Monad (Co f) 
Instance details

Defined in Data.Functor.Rep

Methods

(>>=) :: Co f a -> (a -> Co f b) -> Co f b #

(>>) :: Co f a -> Co f b -> Co f b #

return :: a -> Co f a #

Monad (Parser i) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

(>>=) :: Parser i a -> (a -> Parser i b) -> Parser i b #

(>>) :: Parser i a -> Parser i b -> Parser i b #

return :: a -> Parser i a #

Monad m => Monad (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 #

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 (EitherR r) 
Instance details

Defined in Data.EitherR

Methods

(>>=) :: EitherR r a -> (a -> EitherR r b) -> EitherR r b #

(>>) :: EitherR r a -> EitherR r b -> EitherR r b #

return :: a -> EitherR r a #

Monad m => Monad (CatchT m) 
Instance details

Defined in Control.Monad.Catch.Pure

Methods

(>>=) :: CatchT m a -> (a -> CatchT m b) -> CatchT m b #

(>>) :: CatchT m a -> CatchT m b -> CatchT m b #

return :: a -> CatchT m a #

Alternative f => Monad (Cofree f) 
Instance details

Defined in Control.Comonad.Cofree

Methods

(>>=) :: Cofree f a -> (a -> Cofree f b) -> Cofree f b #

(>>) :: Cofree f a -> Cofree f b -> Cofree f b #

return :: a -> Cofree f a #

Functor f => Monad (Free f) 
Instance details

Defined in Control.Monad.Free

Methods

(>>=) :: Free f a -> (a -> Free f b) -> Free f b #

(>>) :: Free f a -> Free f b -> Free f b #

return :: a -> Free f a #

Applicative f => Monad (Free f) 
Instance details

Defined in Control.Monad.Free.Ap

Methods

(>>=) :: Free f a -> (a -> Free f b) -> Free f b #

(>>) :: Free f a -> Free f b -> Free f b #

return :: a -> Free f a #

Monad (F f) 
Instance details

Defined in Control.Monad.Free.Church

Methods

(>>=) :: F f a -> (a -> F f b) -> F f b #

(>>) :: F f a -> F f b -> F f b #

return :: a -> F f a #

Monad m => Monad (IterT m) 
Instance details

Defined in Control.Monad.Trans.Iter

Methods

(>>=) :: IterT m a -> (a -> IterT m b) -> IterT m b #

(>>) :: IterT m a -> IterT m b -> IterT m b #

return :: a -> IterT m a #

Monad (DocM s) 
Instance details

Defined in Language.Haskell.Exts.Pretty

Methods

(>>=) :: DocM s a -> (a -> DocM s b) -> DocM s b #

(>>) :: DocM s a -> DocM s b -> DocM s b #

return :: a -> DocM s a #

Monad m => Monad (Coyoneda m) 
Instance details

Defined in Data.Functor.Coyoneda

Methods

(>>=) :: Coyoneda m a -> (a -> Coyoneda m b) -> Coyoneda m b #

(>>) :: Coyoneda m a -> Coyoneda m b -> Coyoneda m b #

return :: a -> Coyoneda m a #

Monad m => Monad (Yoneda m) 
Instance details

Defined in Data.Functor.Yoneda

Methods

(>>=) :: Yoneda m a -> (a -> Yoneda m b) -> Yoneda m b #

(>>) :: Yoneda m a -> Yoneda m b -> Yoneda m b #

return :: a -> Yoneda m a #

Monad (ReifiedFold s) 
Instance details

Defined in Control.Lens.Reified

Methods

(>>=) :: ReifiedFold s a -> (a -> ReifiedFold s b) -> ReifiedFold s b #

(>>) :: ReifiedFold s a -> ReifiedFold s b -> ReifiedFold s b #

return :: a -> ReifiedFold s a #

Monad (ReifiedGetter s) 
Instance details

Defined in Control.Lens.Reified

Methods

(>>=) :: ReifiedGetter s a -> (a -> ReifiedGetter s b) -> ReifiedGetter s b #

(>>) :: ReifiedGetter s a -> ReifiedGetter s b -> ReifiedGetter s b #

return :: a -> ReifiedGetter s a #

Monad (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 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 (UniqueParser s) 
Instance details

Defined in Prettyprinter.Render.Util.SimpleDocTree

Methods

(>>=) :: UniqueParser s a -> (a -> UniqueParser s b) -> UniqueParser s b #

(>>) :: UniqueParser s a -> UniqueParser s b -> UniqueParser s b #

return :: a -> UniqueParser s 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 #

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 #

(Representable f, Monad m) => Monad (ReaderT f m) 
Instance details

Defined in Control.Monad.Representable.Reader

Methods

(>>=) :: ReaderT f m a -> (a -> ReaderT f m b) -> ReaderT f m b #

(>>) :: ReaderT f m a -> ReaderT f m b -> ReaderT f m b #

return :: a -> ReaderT f m a #

(Representable g, Monad m) => Monad (StateT g m) 
Instance details

Defined in Control.Monad.Representable.State

Methods

(>>=) :: StateT g m a -> (a -> StateT g m b) -> StateT g m b #

(>>) :: StateT g m a -> StateT g m b -> StateT g m b #

return :: a -> StateT g m 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 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 #

Monad m => Monad (Reader r m) 
Instance details

Defined in Basement.Compat.MonadTrans

Methods

(>>=) :: Reader r m a -> (a -> Reader r m b) -> Reader r m b #

(>>) :: Reader r m a -> Reader r m b -> Reader r m b #

return :: a -> Reader r m a #

Monad m => Monad (State r m) 
Instance details

Defined in Basement.Compat.MonadTrans

Methods

(>>=) :: State r m a -> (a -> State r m b) -> State r m b #

(>>) :: State r m a -> State r m b -> State r m b #

return :: a -> State r m a #

Monad (bi a) => Monad (Biap bi a) 
Instance details

Defined in Data.Bifunctor.Biap

Methods

(>>=) :: Biap bi a a0 -> (a0 -> Biap bi a b) -> Biap bi a b #

(>>) :: Biap bi a a0 -> Biap bi a b -> Biap bi a b #

return :: a0 -> Biap bi a a0 #

(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 (ExceptRT r m) 
Instance details

Defined in Data.EitherR

Methods

(>>=) :: ExceptRT r m a -> (a -> ExceptRT r m b) -> ExceptRT r m b #

(>>) :: ExceptRT r m a -> ExceptRT r m b -> ExceptRT r m b #

return :: a -> ExceptRT r m a #

(Alternative f, Monad w) => Monad (CofreeT f w) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

(>>=) :: CofreeT f w a -> (a -> CofreeT f w b) -> CofreeT f w b #

(>>) :: CofreeT f w a -> CofreeT f w b -> CofreeT f w b #

return :: a -> CofreeT f w a #

(Functor f, Monad m) => Monad (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

(>>=) :: FreeT f m a -> (a -> FreeT f m b) -> FreeT f m b #

(>>) :: FreeT f m a -> FreeT f m b -> FreeT f m b #

return :: a -> FreeT f m a #

(Applicative f, Monad m) => Monad (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free.Ap

Methods

(>>=) :: FreeT f m a -> (a -> FreeT f m b) -> FreeT f m b #

(>>) :: FreeT f m a -> FreeT f m b -> FreeT f m b #

return :: a -> FreeT f m a #

Monad (FT f m) 
Instance details

Defined in Control.Monad.Trans.Free.Church

Methods

(>>=) :: FT f m a -> (a -> FT f m b) -> FT f m b #

(>>) :: FT f m a -> FT f m b -> FT f m b #

return :: a -> FT f m a #

Monad m => Monad (WrappedFunctor m) 
Instance details

Defined in Data.Functor.Invariant

Methods

(>>=) :: WrappedFunctor m a -> (a -> WrappedFunctor m b) -> WrappedFunctor m b #

(>>) :: WrappedFunctor m a -> WrappedFunctor m b -> WrappedFunctor m b #

return :: a -> WrappedFunctor m a #

Monad (Indexed i a) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

(>>=) :: Indexed i a a0 -> (a0 -> Indexed i a b) -> Indexed i a b #

(>>) :: Indexed i a a0 -> Indexed i a b -> Indexed i a b #

return :: a0 -> Indexed i a a0 #

Monad (t m) => Monad (LiftingAccum t m) 
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 #

Monoid output => Monad (StackMachine output style) 
Instance details

Defined in Prettyprinter.Render.Util.StackMachine

Methods

(>>=) :: StackMachine output style a -> (a -> StackMachine output style b) -> StackMachine output style b #

(>>) :: StackMachine output style a -> StackMachine output style b -> StackMachine output style b #

return :: a -> StackMachine output style a #

(Monad (Rep p), Representable p) => Monad (Prep p) 
Instance details

Defined in Data.Profunctor.Rep

Methods

(>>=) :: Prep p a -> (a -> Prep p b) -> Prep p b #

(>>) :: Prep p a -> Prep p b -> Prep p b #

return :: a -> Prep p a #

Monad (Tagged s) 
Instance details

Defined in Data.Tagged

Methods

(>>=) :: Tagged s a -> (a -> Tagged s b) -> Tagged s b #

(>>) :: Tagged s a -> Tagged s b -> Tagged s b #

return :: a -> Tagged s a #

(Monoid w, Functor m, Monad m) => Monad (AccumT w m) 
Instance details

Defined in Control.Monad.Trans.Accum

Methods

(>>=) :: AccumT w m a -> (a -> AccumT w m b) -> AccumT w m b #

(>>) :: AccumT w m a -> AccumT w m b -> AccumT w m b #

return :: a -> AccumT w m a #

Monad m => Monad (ExceptT e m) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

(>>=) :: ExceptT e m a -> (a -> ExceptT e m b) -> ExceptT e m b #

(>>) :: ExceptT e m a -> ExceptT e m b -> ExceptT e m b #

return :: a -> ExceptT e m a #

Monad m => Monad (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

(>>=) :: IdentityT m a -> (a -> IdentityT m b) -> IdentityT m b #

(>>) :: IdentityT m a -> IdentityT m b -> IdentityT m b #

return :: a -> IdentityT m a #

Monad m => Monad (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

(>>=) :: ReaderT r m a -> (a -> ReaderT r m b) -> ReaderT r m b #

(>>) :: ReaderT r m a -> ReaderT r m b -> ReaderT r m b #

return :: a -> ReaderT r m a #

Monad m => Monad (SelectT r m) 
Instance details

Defined in Control.Monad.Trans.Select

Methods

(>>=) :: SelectT r m a -> (a -> SelectT r m b) -> SelectT r m b #

(>>) :: SelectT r m a -> SelectT r m b -> SelectT r m b #

return :: a -> SelectT r m a #

Monad m => Monad (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Lazy

Methods

(>>=) :: StateT s m a -> (a -> StateT s m b) -> StateT s m b #

(>>) :: StateT s m a -> StateT s m b -> StateT s m b #

return :: a -> StateT s m a #

Monad m => Monad (StateT s m) 
Instance details

Defined in Control.Monad.Trans.State.Strict

Methods

(>>=) :: StateT s m a -> (a -> StateT s m b) -> StateT s m b #

(>>) :: StateT s m a -> StateT s m b -> StateT s m b #

return :: a -> StateT s m a #

Monad m => Monad (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.CPS

Methods

(>>=) :: WriterT w m a -> (a -> WriterT w m b) -> WriterT w m b #

(>>) :: WriterT w m a -> WriterT w m b -> WriterT w m b #

return :: a -> WriterT w m a #

(Monoid w, Monad m) => Monad (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

(>>=) :: WriterT w m a -> (a -> WriterT w m b) -> WriterT w m b #

(>>) :: WriterT w m a -> WriterT w m b -> WriterT w m b #

return :: a -> WriterT w m a #

(Monoid w, Monad m) => Monad (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

(>>=) :: WriterT w m a -> (a -> WriterT w m b) -> WriterT w m b #

(>>) :: WriterT w m a -> WriterT w m b -> WriterT w m b #

return :: a -> WriterT w m a #

Monad m => Monad (Reverse m) 
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) #

(Adjunction f g, Monad m) => Monad (AdjointT f g m) 
Instance details

Defined in Control.Monad.Trans.Adjoint

Methods

(>>=) :: AdjointT f g m a -> (a -> AdjointT f g m b) -> AdjointT f g m b #

(>>) :: AdjointT f g m a -> AdjointT f g m b -> AdjointT f g m b #

return :: a -> AdjointT f g m a #

(Adjunction f g, Comonad w) => Monad (AdjointT f g w) 
Instance details

Defined in Control.Monad.Trans.Contravariant.Adjoint

Methods

(>>=) :: AdjointT f g w a -> (a -> AdjointT f g w b) -> AdjointT f g w b #

(>>) :: AdjointT f g w a -> AdjointT f g w b -> AdjointT f g w b #

return :: a -> AdjointT f g w a #

Comonad w => Monad (ContsT r w m) 
Instance details

Defined in Control.Monad.Trans.Conts

Methods

(>>=) :: ContsT r w m a -> (a -> ContsT r w m b) -> ContsT r w m b #

(>>) :: ContsT r w m a -> ContsT r w m b -> ContsT r w m b #

return :: a -> ContsT r w m a #

(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 (Cokleisli w a) 
Instance details

Defined in Control.Comonad

Methods

(>>=) :: Cokleisli w a a0 -> (a0 -> Cokleisli w a b) -> Cokleisli w a b #

(>>) :: Cokleisli w a a0 -> Cokleisli w a b -> Cokleisli w a b #

return :: a0 -> Cokleisli w a a0 #

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 #

Comonad w => Monad (CoT w m) 
Instance details

Defined in Control.Monad.Co

Methods

(>>=) :: CoT w m a -> (a -> CoT w m b) -> CoT w m b #

(>>) :: CoT w m a -> CoT w m b -> CoT w m b #

return :: a -> CoT w m a #

Monad (Codensity f) 
Instance details

Defined in Control.Monad.Codensity

Methods

(>>=) :: Codensity f a -> (a -> Codensity f b) -> Codensity f b #

(>>) :: Codensity f a -> Codensity f b -> Codensity f b #

return :: a -> Codensity f a #

Stream s => Monad (ParsecT e s m) 
Instance details

Defined in Text.Megaparsec.Internal

Methods

(>>=) :: ParsecT e s m a -> (a -> ParsecT e s m b) -> ParsecT e s m b #

(>>) :: ParsecT e s m a -> ParsecT e s m b -> ParsecT e s m b #

return :: a -> ParsecT e s m a #

Monad (ParsecT s u m) 
Instance details

Defined in Text.Parsec.Prim

Methods

(>>=) :: ParsecT s u m a -> (a -> ParsecT s u m b) -> ParsecT s u m b #

(>>) :: ParsecT s u m a -> ParsecT s u m b -> ParsecT s u m b #

return :: a -> ParsecT s u m a #

Monad (Costar f a) 
Instance details

Defined in Data.Profunctor.Types

Methods

(>>=) :: Costar f a a0 -> (a0 -> Costar f a b) -> Costar f a b #

(>>) :: Costar f a a0 -> Costar f a b -> Costar f a b #

return :: a0 -> Costar f a a0 #

Monad f => Monad (Star f a) 
Instance details

Defined in Data.Profunctor.Types

Methods

(>>=) :: Star f a a0 -> (a0 -> Star f a b) -> Star f a b #

(>>) :: Star f a a0 -> Star f a b -> Star f a b #

return :: a0 -> Star f a a0 #

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 #

head :: [a] -> Maybe a Source #

headMay :: [a] -> Maybe a Source #

last :: [a] -> Maybe a Source #

lastMay :: [a] -> Maybe a Source #

tail :: [a] -> Maybe [a] Source #

tailMay :: [a] -> Maybe [a] Source #

initMay :: [a] -> Maybe [a] Source #

plain :: QuasiQuoter Source #

(++) :: Semigroup a => a -> a -> a Source #

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 #

MutableAtomicRef (IORef a) 
Instance details

Defined in Data.Mutable.Class

Methods

atomicModifyRef :: (PrimMonad m, PrimState m ~ MCState (IORef a)) => IORef a -> (RefElement (IORef a) -> (RefElement (IORef a), a0)) -> m a0 #

atomicModifyRef' :: (PrimMonad m, PrimState m ~ MCState (IORef a)) => IORef a -> (RefElement (IORef a) -> (RefElement (IORef a), a0)) -> m a0 #

Monoid w => MutableCollection (IORef w) 
Instance details

Defined in Data.Mutable.Class

Associated Types

type CollElement (IORef w) 
Instance details

Defined in Data.Mutable.Class

Methods

newColl :: (PrimMonad m, PrimState m ~ MCState (IORef w)) => m (IORef w) #

MutableContainer (IORef a) 
Instance details

Defined in Data.Mutable.Class

Associated Types

type MCState (IORef a) 
Instance details

Defined in Data.Mutable.Class

IsSequence a => MutablePopBack (IORef a) 
Instance details

Defined in Data.Mutable.Class

Methods

popBack :: (PrimMonad m, PrimState m ~ MCState (IORef a)) => IORef a -> m (Maybe (CollElement (IORef a))) #

IsSequence a => MutablePopFront (IORef a) 
Instance details

Defined in Data.Mutable.Class

Methods

popFront :: (PrimMonad m, PrimState m ~ MCState (IORef a)) => IORef a -> m (Maybe (CollElement (IORef a))) #

IsSequence a => MutablePushBack (IORef a) 
Instance details

Defined in Data.Mutable.Class

Methods

pushBack :: (PrimMonad m, PrimState m ~ MCState (IORef a)) => IORef a -> CollElement (IORef a) -> m () #

IsSequence a => MutablePushFront (IORef a) 
Instance details

Defined in Data.Mutable.Class

Methods

pushFront :: (PrimMonad m, PrimState m ~ MCState (IORef a)) => IORef a -> CollElement (IORef a) -> m () #

MutableRef (IORef a) 
Instance details

Defined in Data.Mutable.Class

Associated Types

type RefElement (IORef a) 
Instance details

Defined in Data.Mutable.Class

type RefElement (IORef a) = a

Methods

newRef :: (PrimMonad m, PrimState m ~ MCState (IORef a)) => RefElement (IORef a) -> m (IORef a) #

readRef :: (PrimMonad m, PrimState m ~ MCState (IORef a)) => IORef a -> m (RefElement (IORef a)) #

writeRef :: (PrimMonad m, PrimState m ~ MCState (IORef a)) => IORef a -> RefElement (IORef a) -> m () #

modifyRef :: (PrimMonad m, PrimState m ~ MCState (IORef a)) => IORef a -> (RefElement (IORef a) -> RefElement (IORef a)) -> m () #

modifyRef' :: (PrimMonad m, PrimState m ~ MCState (IORef a)) => IORef a -> (RefElement (IORef a) -> RefElement (IORef a)) -> m () #

FromField a => FromField (IORef a) 
Instance details

Defined in Database.PostgreSQL.Simple.FromField

Methods

fromField :: FieldParser (IORef a)

PrimUnlifted (IORef a) 
Instance details

Defined in Data.Primitive.Unlifted.Class

Associated Types

type Unlifted (IORef a) 
Instance details

Defined in Data.Primitive.Unlifted.Class

type Unlifted (IORef a) = MutVar# RealWorld a

Methods

toUnlifted# :: IORef a -> Unlifted (IORef a)

fromUnlifted# :: Unlifted (IORef a) -> IORef a

HasGetter (IORef a) a 
Instance details

Defined in Data.StateVar

Methods

get :: MonadIO m => IORef a -> m a

HasSetter (IORef a) a 
Instance details

Defined in Data.StateVar

Methods

($=) :: MonadIO m => IORef a -> a -> m ()

HasUpdate (IORef a) a a 
Instance details

Defined in Data.StateVar

Methods

($~) :: MonadIO m => IORef a -> (a -> a) -> m ()

($~!) :: MonadIO m => IORef a -> (a -> a) -> m ()

type CollElement (IORef w) 
Instance details

Defined in Data.Mutable.Class

type MCState (IORef a) 
Instance details

Defined in Data.Mutable.Class

type RefElement (IORef a) 
Instance details

Defined in Data.Mutable.Class

type RefElement (IORef a) = a
type Unlifted (IORef a) 
Instance details

Defined in Data.Primitive.Unlifted.Class

type Unlifted (IORef a) = MutVar# RealWorld a

null :: MonoFoldable mono => mono -> Bool #

when :: Applicative f => Bool -> f () -> f () #

unless :: Applicative f => Bool -> f () -> f () #

class (Functor t, Foldable t) => Traversable (t :: Type -> Type) where #

Minimal complete definition

traverse | sequenceA

Methods

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 UniqueMap 
Instance details

Defined in GHC.Cmm.Dataflow.Collections

Methods

traverse :: Applicative f => (a -> f b) -> UniqueMap a -> f (UniqueMap b) #

sequenceA :: Applicative f => UniqueMap (f a) -> f (UniqueMap a) #

mapM :: Monad m => (a -> m b) -> UniqueMap a -> m (UniqueMap b) #

sequence :: Monad m => UniqueMap (m a) -> m (UniqueMap a) #

Traversable LabelMap 
Instance details

Defined in GHC.Cmm.Dataflow.Label

Methods

traverse :: Applicative f => (a -> f b) -> LabelMap a -> f (LabelMap b) #

sequenceA :: Applicative f => LabelMap (f a) -> f (LabelMap a) #

mapM :: Monad m => (a -> m b) -> LabelMap a -> m (LabelMap b) #

sequence :: Monad m => LabelMap (m a) -> m (LabelMap a) #

Traversable Bag 
Instance details

Defined in GHC.Data.Bag

Methods

traverse :: Applicative f => (a -> f b) -> Bag a -> f (Bag b) #

sequenceA :: Applicative f => Bag (f a) -> f (Bag a) #

mapM :: Monad m => (a -> m b) -> Bag a -> m (Bag b) #

sequence :: Monad m => Bag (m a) -> m (Bag a) #

Traversable PV_Result 
Instance details

Defined in GHC.Parser.PostProcess

Methods

traverse :: Applicative f => (a -> f b) -> PV_Result a -> f (PV_Result b) #

sequenceA :: Applicative f => PV_Result (f a) -> f (PV_Result a) #

mapM :: Monad m => (a -> m b) -> PV_Result a -> m (PV_Result b) #

sequence :: Monad m => PV_Result (m a) -> m (PV_Result a) #

Traversable Messages 
Instance details

Defined in GHC.Types.Error

Methods

traverse :: Applicative f => (a -> f b) -> Messages a -> f (Messages b) #

sequenceA :: Applicative f => Messages (f a) -> f (Messages a) #

mapM :: Monad m => (a -> m b) -> Messages a -> m (Messages b) #

sequence :: Monad m => Messages (m a) -> m (Messages a) #

Traversable MsgEnvelope 
Instance details

Defined in GHC.Types.Error

Methods

traverse :: Applicative f => (a -> f b) -> MsgEnvelope a -> f (MsgEnvelope b) #

sequenceA :: Applicative f => MsgEnvelope (f a) -> f (MsgEnvelope a) #

mapM :: Monad m => (a -> m b) -> MsgEnvelope a -> m (MsgEnvelope b) #

sequence :: Monad m => MsgEnvelope (m a) -> m (MsgEnvelope a) #

Traversable GenWithIsBoot 
Instance details

Defined in GHC.Unit.Types

Methods

traverse :: Applicative f => (a -> f b) -> GenWithIsBoot a -> f (GenWithIsBoot b) #

sequenceA :: Applicative f => GenWithIsBoot (f a) -> f (GenWithIsBoot a) #

mapM :: Monad m => (a -> m b) -> GenWithIsBoot a -> m (GenWithIsBoot b) #

sequence :: Monad m => GenWithIsBoot (m a) -> m (GenWithIsBoot a) #

Traversable DataDefnCons 
Instance details

Defined in Language.Haskell.Syntax.Decls

Methods

traverse :: Applicative f => (a -> f b) -> DataDefnCons a -> f (DataDefnCons b) #

sequenceA :: Applicative f => DataDefnCons (f a) -> f (DataDefnCons a) #

mapM :: Monad m => (a -> m b) -> DataDefnCons a -> m (DataDefnCons b) #

sequence :: Monad m => DataDefnCons (m a) -> m (DataDefnCons 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 GenClosure 
Instance details

Defined in GHC.Exts.Heap.Closures

Methods

traverse :: Applicative f => (a -> f b) -> GenClosure a -> f (GenClosure b) #

sequenceA :: Applicative f => GenClosure (f a) -> f (GenClosure a) #

mapM :: Monad m => (a -> m b) -> GenClosure a -> m (GenClosure b) #

sequence :: Monad m => GenClosure (m a) -> m (GenClosure a) #

Traversable Activation 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Activation a -> f (Activation b) #

sequenceA :: Applicative f => Activation (f a) -> f (Activation a) #

mapM :: Monad m => (a -> m b) -> Activation a -> m (Activation b) #

sequence :: Monad m => Activation (m a) -> m (Activation a) #

Traversable Alt 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Alt a -> f (Alt b) #

sequenceA :: Applicative f => Alt (f a) -> f (Alt a) #

mapM :: Monad m => (a -> m b) -> Alt a -> m (Alt b) #

sequence :: Monad m => Alt (m a) -> m (Alt a) #

Traversable Annotation 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Annotation a -> f (Annotation b) #

sequenceA :: Applicative f => Annotation (f a) -> f (Annotation a) #

mapM :: Monad m => (a -> m b) -> Annotation a -> m (Annotation b) #

sequence :: Monad m => Annotation (m a) -> m (Annotation a) #

Traversable Assoc 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Assoc a -> f (Assoc b) #

sequenceA :: Applicative f => Assoc (f a) -> f (Assoc a) #

mapM :: Monad m => (a -> m b) -> Assoc a -> m (Assoc b) #

sequence :: Monad m => Assoc (m a) -> m (Assoc a) #

Traversable Asst 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Asst a -> f (Asst b) #

sequenceA :: Applicative f => Asst (f a) -> f (Asst a) #

mapM :: Monad m => (a -> m b) -> Asst a -> m (Asst b) #

sequence :: Monad m => Asst (m a) -> m (Asst a) #

Traversable BangType 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> BangType a -> f (BangType b) #

sequenceA :: Applicative f => BangType (f a) -> f (BangType a) #

mapM :: Monad m => (a -> m b) -> BangType a -> m (BangType b) #

sequence :: Monad m => BangType (m a) -> m (BangType a) #

Traversable Binds 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Binds a -> f (Binds b) #

sequenceA :: Applicative f => Binds (f a) -> f (Binds a) #

mapM :: Monad m => (a -> m b) -> Binds a -> m (Binds b) #

sequence :: Monad m => Binds (m a) -> m (Binds a) #

Traversable BooleanFormula 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> BooleanFormula a -> f (BooleanFormula b) #

sequenceA :: Applicative f => BooleanFormula (f a) -> f (BooleanFormula a) #

mapM :: Monad m => (a -> m b) -> BooleanFormula a -> m (BooleanFormula b) #

sequence :: Monad m => BooleanFormula (m a) -> m (BooleanFormula a) #

Traversable Bracket 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Bracket a -> f (Bracket b) #

sequenceA :: Applicative f => Bracket (f a) -> f (Bracket a) #

mapM :: Monad m => (a -> m b) -> Bracket a -> m (Bracket b) #

sequence :: Monad m => Bracket (m a) -> m (Bracket a) #

Traversable CName 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> CName a -> f (CName b) #

sequenceA :: Applicative f => CName (f a) -> f (CName a) #

mapM :: Monad m => (a -> m b) -> CName a -> m (CName b) #

sequence :: Monad m => CName (m a) -> m (CName a) #

Traversable CallConv 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> CallConv a -> f (CallConv b) #

sequenceA :: Applicative f => CallConv (f a) -> f (CallConv a) #

mapM :: Monad m => (a -> m b) -> CallConv a -> m (CallConv b) #

sequence :: Monad m => CallConv (m a) -> m (CallConv a) #

Traversable ClassDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> ClassDecl a -> f (ClassDecl b) #

sequenceA :: Applicative f => ClassDecl (f a) -> f (ClassDecl a) #

mapM :: Monad m => (a -> m b) -> ClassDecl a -> m (ClassDecl b) #

sequence :: Monad m => ClassDecl (m a) -> m (ClassDecl a) #

Traversable ConDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> ConDecl a -> f (ConDecl b) #

sequenceA :: Applicative f => ConDecl (f a) -> f (ConDecl a) #

mapM :: Monad m => (a -> m b) -> ConDecl a -> m (ConDecl b) #

sequence :: Monad m => ConDecl (m a) -> m (ConDecl a) #

Traversable Context 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Context a -> f (Context b) #

sequenceA :: Applicative f => Context (f a) -> f (Context a) #

mapM :: Monad m => (a -> m b) -> Context a -> m (Context b) #

sequence :: Monad m => Context (m a) -> m (Context a) #

Traversable DataOrNew 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> DataOrNew a -> f (DataOrNew b) #

sequenceA :: Applicative f => DataOrNew (f a) -> f (DataOrNew a) #

mapM :: Monad m => (a -> m b) -> DataOrNew a -> m (DataOrNew b) #

sequence :: Monad m => DataOrNew (m a) -> m (DataOrNew a) #

Traversable Decl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Decl a -> f (Decl b) #

sequenceA :: Applicative f => Decl (f a) -> f (Decl a) #

mapM :: Monad m => (a -> m b) -> Decl a -> m (Decl b) #

sequence :: Monad m => Decl (m a) -> m (Decl a) #

Traversable DeclHead 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> DeclHead a -> f (DeclHead b) #

sequenceA :: Applicative f => DeclHead (f a) -> f (DeclHead a) #

mapM :: Monad m => (a -> m b) -> DeclHead a -> m (DeclHead b) #

sequence :: Monad m => DeclHead (m a) -> m (DeclHead a) #

Traversable DerivStrategy 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> DerivStrategy a -> f (DerivStrategy b) #

sequenceA :: Applicative f => DerivStrategy (f a) -> f (DerivStrategy a) #

mapM :: Monad m => (a -> m b) -> DerivStrategy a -> m (DerivStrategy b) #

sequence :: Monad m => DerivStrategy (m a) -> m (DerivStrategy a) #

Traversable Deriving 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Deriving a -> f (Deriving b) #

sequenceA :: Applicative f => Deriving (f a) -> f (Deriving a) #

mapM :: Monad m => (a -> m b) -> Deriving a -> m (Deriving b) #

sequence :: Monad m => Deriving (m a) -> m (Deriving a) #

Traversable EWildcard 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> EWildcard a -> f (EWildcard b) #

sequenceA :: Applicative f => EWildcard (f a) -> f (EWildcard a) #

mapM :: Monad m => (a -> m b) -> EWildcard a -> m (EWildcard b) #

sequence :: Monad m => EWildcard (m a) -> m (EWildcard a) #

Traversable Exp 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Exp a -> f (Exp b) #

sequenceA :: Applicative f => Exp (f a) -> f (Exp a) #

mapM :: Monad m => (a -> m b) -> Exp a -> m (Exp b) #

sequence :: Monad m => Exp (m a) -> m (Exp a) #

Traversable ExportSpec 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> ExportSpec a -> f (ExportSpec b) #

sequenceA :: Applicative f => ExportSpec (f a) -> f (ExportSpec a) #

mapM :: Monad m => (a -> m b) -> ExportSpec a -> m (ExportSpec b) #

sequence :: Monad m => ExportSpec (m a) -> m (ExportSpec a) #

Traversable ExportSpecList 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> ExportSpecList a -> f (ExportSpecList b) #

sequenceA :: Applicative f => ExportSpecList (f a) -> f (ExportSpecList a) #

mapM :: Monad m => (a -> m b) -> ExportSpecList a -> m (ExportSpecList b) #

sequence :: Monad m => ExportSpecList (m a) -> m (ExportSpecList a) #

Traversable FieldDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> FieldDecl a -> f (FieldDecl b) #

sequenceA :: Applicative f => FieldDecl (f a) -> f (FieldDecl a) #

mapM :: Monad m => (a -> m b) -> FieldDecl a -> m (FieldDecl b) #

sequence :: Monad m => FieldDecl (m a) -> m (FieldDecl a) #

Traversable FieldUpdate 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> FieldUpdate a -> f (FieldUpdate b) #

sequenceA :: Applicative f => FieldUpdate (f a) -> f (FieldUpdate a) #

mapM :: Monad m => (a -> m b) -> FieldUpdate a -> m (FieldUpdate b) #

sequence :: Monad m => FieldUpdate (m a) -> m (FieldUpdate a) #

Traversable FunDep 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> FunDep a -> f (FunDep b) #

sequenceA :: Applicative f => FunDep (f a) -> f (FunDep a) #

mapM :: Monad m => (a -> m b) -> FunDep a -> m (FunDep b) #

sequence :: Monad m => FunDep (m a) -> m (FunDep a) #

Traversable GadtDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> GadtDecl a -> f (GadtDecl b) #

sequenceA :: Applicative f => GadtDecl (f a) -> f (GadtDecl a) #

mapM :: Monad m => (a -> m b) -> GadtDecl a -> m (GadtDecl b) #

sequence :: Monad m => GadtDecl (m a) -> m (GadtDecl a) #

Traversable GuardedRhs 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> GuardedRhs a -> f (GuardedRhs b) #

sequenceA :: Applicative f => GuardedRhs (f a) -> f (GuardedRhs a) #

mapM :: Monad m => (a -> m b) -> GuardedRhs a -> m (GuardedRhs b) #

sequence :: Monad m => GuardedRhs (m a) -> m (GuardedRhs a) #

Traversable IPBind 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> IPBind a -> f (IPBind b) #

sequenceA :: Applicative f => IPBind (f a) -> f (IPBind a) #

mapM :: Monad m => (a -> m b) -> IPBind a -> m (IPBind b) #

sequence :: Monad m => IPBind (m a) -> m (IPBind a) #

Traversable IPName 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> IPName a -> f (IPName b) #

sequenceA :: Applicative f => IPName (f a) -> f (IPName a) #

mapM :: Monad m => (a -> m b) -> IPName a -> m (IPName b) #

sequence :: Monad m => IPName (m a) -> m (IPName a) #

Traversable ImportDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> ImportDecl a -> f (ImportDecl b) #

sequenceA :: Applicative f => ImportDecl (f a) -> f (ImportDecl a) #

mapM :: Monad m => (a -> m b) -> ImportDecl a -> m (ImportDecl b) #

sequence :: Monad m => ImportDecl (m a) -> m (ImportDecl a) #

Traversable ImportSpec 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> ImportSpec a -> f (ImportSpec b) #

sequenceA :: Applicative f => ImportSpec (f a) -> f (ImportSpec a) #

mapM :: Monad m => (a -> m b) -> ImportSpec a -> m (ImportSpec b) #

sequence :: Monad m => ImportSpec (m a) -> m (ImportSpec a) #

Traversable ImportSpecList 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> ImportSpecList a -> f (ImportSpecList b) #

sequenceA :: Applicative f => ImportSpecList (f a) -> f (ImportSpecList a) #

mapM :: Monad m => (a -> m b) -> ImportSpecList a -> m (ImportSpecList b) #

sequence :: Monad m => ImportSpecList (m a) -> m (ImportSpecList a) #

Traversable InjectivityInfo 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> InjectivityInfo a -> f (InjectivityInfo b) #

sequenceA :: Applicative f => InjectivityInfo (f a) -> f (InjectivityInfo a) #

mapM :: Monad m => (a -> m b) -> InjectivityInfo a -> m (InjectivityInfo b) #

sequence :: Monad m => InjectivityInfo (m a) -> m (InjectivityInfo a) #

Traversable InstDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> InstDecl a -> f (InstDecl b) #

sequenceA :: Applicative f => InstDecl (f a) -> f (InstDecl a) #

mapM :: Monad m => (a -> m b) -> InstDecl a -> m (InstDecl b) #

sequence :: Monad m => InstDecl (m a) -> m (InstDecl a) #

Traversable InstHead 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> InstHead a -> f (InstHead b) #

sequenceA :: Applicative f => InstHead (f a) -> f (InstHead a) #

mapM :: Monad m => (a -> m b) -> InstHead a -> m (InstHead b) #

sequence :: Monad m => InstHead (m a) -> m (InstHead a) #

Traversable InstRule 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> InstRule a -> f (InstRule b) #

sequenceA :: Applicative f => InstRule (f a) -> f (InstRule a) #

mapM :: Monad m => (a -> m b) -> InstRule a -> m (InstRule b) #

sequence :: Monad m => InstRule (m a) -> m (InstRule a) #

Traversable Literal 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Literal a -> f (Literal b) #

sequenceA :: Applicative f => Literal (f a) -> f (Literal a) #

mapM :: Monad m => (a -> m b) -> Literal a -> m (Literal b) #

sequence :: Monad m => Literal (m a) -> m (Literal a) #

Traversable Match 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Match a -> f (Match b) #

sequenceA :: Applicative f => Match (f a) -> f (Match a) #

mapM :: Monad m => (a -> m b) -> Match a -> m (Match b) #

sequence :: Monad m => Match (m a) -> m (Match a) #

Traversable MaybePromotedName 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> MaybePromotedName a -> f (MaybePromotedName b) #

sequenceA :: Applicative f => MaybePromotedName (f a) -> f (MaybePromotedName a) #

mapM :: Monad m => (a -> m b) -> MaybePromotedName a -> m (MaybePromotedName b) #

sequence :: Monad m => MaybePromotedName (m a) -> m (MaybePromotedName a) #

Traversable Module 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Module a -> f (Module b) #

sequenceA :: Applicative f => Module (f a) -> f (Module a) #

mapM :: Monad m => (a -> m b) -> Module a -> m (Module b) #

sequence :: Monad m => Module (m a) -> m (Module a) #

Traversable ModuleHead 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> ModuleHead a -> f (ModuleHead b) #

sequenceA :: Applicative f => ModuleHead (f a) -> f (ModuleHead a) #

mapM :: Monad m => (a -> m b) -> ModuleHead a -> m (ModuleHead b) #

sequence :: Monad m => ModuleHead (m a) -> m (ModuleHead a) #

Traversable ModuleName 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> ModuleName a -> f (ModuleName b) #

sequenceA :: Applicative f => ModuleName (f a) -> f (ModuleName a) #

mapM :: Monad m => (a -> m b) -> ModuleName a -> m (ModuleName b) #

sequence :: Monad m => ModuleName (m a) -> m (ModuleName a) #

Traversable ModulePragma 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> ModulePragma a -> f (ModulePragma b) #

sequenceA :: Applicative f => ModulePragma (f a) -> f (ModulePragma a) #

mapM :: Monad m => (a -> m b) -> ModulePragma a -> m (ModulePragma b) #

sequence :: Monad m => ModulePragma (m a) -> m (ModulePragma a) #

Traversable Name 
Instance details

Defined in Language.Haskell.Exts.Syntax

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 Namespace 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Namespace a -> f (Namespace b) #

sequenceA :: Applicative f => Namespace (f a) -> f (Namespace a) #

mapM :: Monad m => (a -> m b) -> Namespace a -> m (Namespace b) #

sequence :: Monad m => Namespace (m a) -> m (Namespace a) #

Traversable Op 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Op a -> f (Op b) #

sequenceA :: Applicative f => Op (f a) -> f (Op a) #

mapM :: Monad m => (a -> m b) -> Op a -> m (Op b) #

sequence :: Monad m => Op (m a) -> m (Op a) #

Traversable Overlap 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Overlap a -> f (Overlap b) #

sequenceA :: Applicative f => Overlap (f a) -> f (Overlap a) #

mapM :: Monad m => (a -> m b) -> Overlap a -> m (Overlap b) #

sequence :: Monad m => Overlap (m a) -> m (Overlap a) #

Traversable PXAttr 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> PXAttr a -> f (PXAttr b) #

sequenceA :: Applicative f => PXAttr (f a) -> f (PXAttr a) #

mapM :: Monad m => (a -> m b) -> PXAttr a -> m (PXAttr b) #

sequence :: Monad m => PXAttr (m a) -> m (PXAttr a) #

Traversable Pat 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Pat a -> f (Pat b) #

sequenceA :: Applicative f => Pat (f a) -> f (Pat a) #

mapM :: Monad m => (a -> m b) -> Pat a -> m (Pat b) #

sequence :: Monad m => Pat (m a) -> m (Pat a) #

Traversable PatField 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> PatField a -> f (PatField b) #

sequenceA :: Applicative f => PatField (f a) -> f (PatField a) #

mapM :: Monad m => (a -> m b) -> PatField a -> m (PatField b) #

sequence :: Monad m => PatField (m a) -> m (PatField a) #

Traversable PatternSynDirection 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> PatternSynDirection a -> f (PatternSynDirection b) #

sequenceA :: Applicative f => PatternSynDirection (f a) -> f (PatternSynDirection a) #

mapM :: Monad m => (a -> m b) -> PatternSynDirection a -> m (PatternSynDirection b) #

sequence :: Monad m => PatternSynDirection (m a) -> m (PatternSynDirection a) #

Traversable Promoted 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Promoted a -> f (Promoted b) #

sequenceA :: Applicative f => Promoted (f a) -> f (Promoted a) #

mapM :: Monad m => (a -> m b) -> Promoted a -> m (Promoted b) #

sequence :: Monad m => Promoted (m a) -> m (Promoted a) #

Traversable QName 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> QName a -> f (QName b) #

sequenceA :: Applicative f => QName (f a) -> f (QName a) #

mapM :: Monad m => (a -> m b) -> QName a -> m (QName b) #

sequence :: Monad m => QName (m a) -> m (QName a) #

Traversable QOp 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> QOp a -> f (QOp b) #

sequenceA :: Applicative f => QOp (f a) -> f (QOp a) #

mapM :: Monad m => (a -> m b) -> QOp a -> m (QOp b) #

sequence :: Monad m => QOp (m a) -> m (QOp a) #

Traversable QualConDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> QualConDecl a -> f (QualConDecl b) #

sequenceA :: Applicative f => QualConDecl (f a) -> f (QualConDecl a) #

mapM :: Monad m => (a -> m b) -> QualConDecl a -> m (QualConDecl b) #

sequence :: Monad m => QualConDecl (m a) -> m (QualConDecl a) #

Traversable QualStmt 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> QualStmt a -> f (QualStmt b) #

sequenceA :: Applicative f => QualStmt (f a) -> f (QualStmt a) #

mapM :: Monad m => (a -> m b) -> QualStmt a -> m (QualStmt b) #

sequence :: Monad m => QualStmt (m a) -> m (QualStmt a) #

Traversable RPat 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> RPat a -> f (RPat b) #

sequenceA :: Applicative f => RPat (f a) -> f (RPat a) #

mapM :: Monad m => (a -> m b) -> RPat a -> m (RPat b) #

sequence :: Monad m => RPat (m a) -> m (RPat a) #

Traversable RPatOp 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> RPatOp a -> f (RPatOp b) #

sequenceA :: Applicative f => RPatOp (f a) -> f (RPatOp a) #

mapM :: Monad m => (a -> m b) -> RPatOp a -> m (RPatOp b) #

sequence :: Monad m => RPatOp (m a) -> m (RPatOp a) #

Traversable ResultSig 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> ResultSig a -> f (ResultSig b) #

sequenceA :: Applicative f => ResultSig (f a) -> f (ResultSig a) #

mapM :: Monad m => (a -> m b) -> ResultSig a -> m (ResultSig b) #

sequence :: Monad m => ResultSig (m a) -> m (ResultSig a) #

Traversable Rhs 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Rhs a -> f (Rhs b) #

sequenceA :: Applicative f => Rhs (f a) -> f (Rhs a) #

mapM :: Monad m => (a -> m b) -> Rhs a -> m (Rhs b) #

sequence :: Monad m => Rhs (m a) -> m (Rhs a) #

Traversable Role 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Role a -> f (Role b) #

sequenceA :: Applicative f => Role (f a) -> f (Role a) #

mapM :: Monad m => (a -> m b) -> Role a -> m (Role b) #

sequence :: Monad m => Role (m a) -> m (Role a) #

Traversable Rule 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Rule a -> f (Rule b) #

sequenceA :: Applicative f => Rule (f a) -> f (Rule a) #

mapM :: Monad m => (a -> m b) -> Rule a -> m (Rule b) #

sequence :: Monad m => Rule (m a) -> m (Rule a) #

Traversable RuleVar 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> RuleVar a -> f (RuleVar b) #

sequenceA :: Applicative f => RuleVar (f a) -> f (RuleVar a) #

mapM :: Monad m => (a -> m b) -> RuleVar a -> m (RuleVar b) #

sequence :: Monad m => RuleVar (m a) -> m (RuleVar a) #

Traversable Safety 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Safety a -> f (Safety b) #

sequenceA :: Applicative f => Safety (f a) -> f (Safety a) #

mapM :: Monad m => (a -> m b) -> Safety a -> m (Safety b) #

sequence :: Monad m => Safety (m a) -> m (Safety a) #

Traversable Sign 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Sign a -> f (Sign b) #

sequenceA :: Applicative f => Sign (f a) -> f (Sign a) #

mapM :: Monad m => (a -> m b) -> Sign a -> m (Sign b) #

sequence :: Monad m => Sign (m a) -> m (Sign a) #

Traversable SpecialCon 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> SpecialCon a -> f (SpecialCon b) #

sequenceA :: Applicative f => SpecialCon (f a) -> f (SpecialCon a) #

mapM :: Monad m => (a -> m b) -> SpecialCon a -> m (SpecialCon b) #

sequence :: Monad m => SpecialCon (m a) -> m (SpecialCon a) #

Traversable Splice 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Splice a -> f (Splice b) #

sequenceA :: Applicative f => Splice (f a) -> f (Splice a) #

mapM :: Monad m => (a -> m b) -> Splice a -> m (Splice b) #

sequence :: Monad m => Splice (m a) -> m (Splice a) #

Traversable Stmt 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Stmt a -> f (Stmt b) #

sequenceA :: Applicative f => Stmt (f a) -> f (Stmt a) #

mapM :: Monad m => (a -> m b) -> Stmt a -> m (Stmt b) #

sequence :: Monad m => Stmt (m a) -> m (Stmt a) #

Traversable TyVarBind 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> TyVarBind a -> f (TyVarBind b) #

sequenceA :: Applicative f => TyVarBind (f a) -> f (TyVarBind a) #

mapM :: Monad m => (a -> m b) -> TyVarBind a -> m (TyVarBind b) #

sequence :: Monad m => TyVarBind (m a) -> m (TyVarBind a) #

Traversable Type 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Type a -> f (Type b) #

sequenceA :: Applicative f => Type (f a) -> f (Type a) #

mapM :: Monad m => (a -> m b) -> Type a -> m (Type b) #

sequence :: Monad m => Type (m a) -> m (Type a) #

Traversable TypeEqn 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> TypeEqn a -> f (TypeEqn b) #

sequenceA :: Applicative f => TypeEqn (f a) -> f (TypeEqn a) #

mapM :: Monad m => (a -> m b) -> TypeEqn a -> m (TypeEqn b) #

sequence :: Monad m => TypeEqn (m a) -> m (TypeEqn a) #

Traversable Unpackedness 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> Unpackedness a -> f (Unpackedness b) #

sequenceA :: Applicative f => Unpackedness (f a) -> f (Unpackedness a) #

mapM :: Monad m => (a -> m b) -> Unpackedness a -> m (Unpackedness b) #

sequence :: Monad m => Unpackedness (m a) -> m (Unpackedness a) #

Traversable WarningText 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> WarningText a -> f (WarningText b) #

sequenceA :: Applicative f => WarningText (f a) -> f (WarningText a) #

mapM :: Monad m => (a -> m b) -> WarningText a -> m (WarningText b) #

sequence :: Monad m => WarningText (m a) -> m (WarningText a) #

Traversable XAttr 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> XAttr a -> f (XAttr b) #

sequenceA :: Applicative f => XAttr (f a) -> f (XAttr a) #

mapM :: Monad m => (a -> m b) -> XAttr a -> m (XAttr b) #

sequence :: Monad m => XAttr (m a) -> m (XAttr a) #

Traversable XName 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

traverse :: Applicative f => (a -> f b) -> XName a -> f (XName b) #

sequenceA :: Applicative f => XName (f a) -> f (XName a) #

mapM :: Monad m => (a -> m b) -> XName a -> m (XName b) #

sequence :: Monad m => XName (m a) -> m (XName 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 Deque 
Instance details

Defined in Control.Lens.Internal.Deque

Methods

traverse :: Applicative f => (a -> f b) -> Deque a -> f (Deque b) #

sequenceA :: Applicative f => Deque (f a) -> f (Deque a) #

mapM :: Monad m => (a -> m b) -> Deque a -> m (Deque b) #

sequence :: Monad m => Deque (m a) -> m (Deque 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 SimpleDocTree 
Instance details

Defined in Prettyprinter.Render.Util.SimpleDocTree

Methods

traverse :: Applicative f => (a -> f b) -> SimpleDocTree a -> f (SimpleDocTree b) #

sequenceA :: Applicative f => SimpleDocTree (f a) -> f (SimpleDocTree a) #

mapM :: Monad m => (a -> m b) -> SimpleDocTree a -> m (SimpleDocTree b) #

sequence :: Monad m => SimpleDocTree (m a) -> m (SimpleDocTree 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 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 f => Traversable (Cofree f) 
Instance details

Defined in Control.Comonad.Cofree

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Cofree f a -> f0 (Cofree f b) #

sequenceA :: Applicative f0 => Cofree f (f0 a) -> f0 (Cofree f a) #

mapM :: Monad m => (a -> m b) -> Cofree f a -> m (Cofree f b) #

sequence :: Monad m => Cofree f (m a) -> m (Cofree f a) #

Traversable w => Traversable (CoiterT w) 
Instance details

Defined in Control.Comonad.Trans.Coiter

Methods

traverse :: Applicative f => (a -> f b) -> CoiterT w a -> f (CoiterT w b) #

sequenceA :: Applicative f => CoiterT w (f a) -> f (CoiterT w a) #

mapM :: Monad m => (a -> m b) -> CoiterT w a -> m (CoiterT w b) #

sequence :: Monad m => CoiterT w (m a) -> m (CoiterT w a) #

Traversable f => Traversable (Free f) 
Instance details

Defined in Control.Monad.Free

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Free f a -> f0 (Free f b) #

sequenceA :: Applicative f0 => Free f (f0 a) -> f0 (Free f a) #

mapM :: Monad m => (a -> m b) -> Free f a -> m (Free f b) #

sequence :: Monad m => Free f (m a) -> m (Free f a) #

Traversable f => Traversable (Free f) 
Instance details

Defined in Control.Monad.Free.Ap

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Free f a -> f0 (Free f b) #

sequenceA :: Applicative f0 => Free f (f0 a) -> f0 (Free f a) #

mapM :: Monad m => (a -> m b) -> Free f a -> m (Free f b) #

sequence :: Monad m => Free f (m a) -> m (Free f a) #

Traversable f => Traversable (F f) 
Instance details

Defined in Control.Monad.Free.Church

Methods

traverse :: Applicative f0 => (a -> f0 b) -> F f a -> f0 (F f b) #

sequenceA :: Applicative f0 => F f (f0 a) -> f0 (F f a) #

mapM :: Monad m => (a -> m b) -> F f a -> m (F f b) #

sequence :: Monad m => F f (m a) -> m (F f a) #

(Monad m, Traversable m) => Traversable (IterT m) 
Instance details

Defined in Control.Monad.Trans.Iter

Methods

traverse :: Applicative f => (a -> f b) -> IterT m a -> f (IterT m b) #

sequenceA :: Applicative f => IterT m (f a) -> f (IterT m a) #

mapM :: Monad m0 => (a -> m0 b) -> IterT m a -> m0 (IterT m b) #

sequence :: Monad m0 => IterT m (m0 a) -> m0 (IterT m a) #

Traversable (GenLocated l) 
Instance details

Defined in GHC.Types.SrcLoc

Methods

traverse :: Applicative f => (a -> f b) -> GenLocated l a -> f (GenLocated l b) #

sequenceA :: Applicative f => GenLocated l (f a) -> f (GenLocated l a) #

mapM :: Monad m => (a -> m b) -> GenLocated l a -> m (GenLocated l b) #

sequence :: Monad m => GenLocated l (m a) -> m (GenLocated l a) #

Traversable (HsFieldBind lhs) 
Instance details

Defined in Language.Haskell.Syntax.Pat

Methods

traverse :: Applicative f => (a -> f b) -> HsFieldBind lhs a -> f (HsFieldBind lhs b) #

sequenceA :: Applicative f => HsFieldBind lhs (f a) -> f (HsFieldBind lhs a) #

mapM :: Monad m => (a -> m b) -> HsFieldBind lhs a -> m (HsFieldBind lhs b) #

sequence :: Monad m => HsFieldBind lhs (m a) -> m (HsFieldBind lhs 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 (IPRTable k) 
Instance details

Defined in Data.IP.RouteTable.Internal

Methods

traverse :: Applicative f => (a -> f b) -> IPRTable k a -> f (IPRTable k b) #

sequenceA :: Applicative f => IPRTable k (f a) -> f (IPRTable k a) #

mapM :: Monad m => (a -> m b) -> IPRTable k a -> m (IPRTable k b) #

sequence :: Monad m => IPRTable k (m a) -> m (IPRTable k a) #

Traversable f => Traversable (Coyoneda f) 
Instance details

Defined in Data.Functor.Coyoneda

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Coyoneda f a -> f0 (Coyoneda f b) #

sequenceA :: Applicative f0 => Coyoneda f (f0 a) -> f0 (Coyoneda f a) #

mapM :: Monad m => (a -> m b) -> Coyoneda f a -> m (Coyoneda f b) #

sequence :: Monad m => Coyoneda f (m a) -> m (Coyoneda f a) #

Traversable f => Traversable (Yoneda f) 
Instance details

Defined in Data.Functor.Yoneda

Methods

traverse :: Applicative f0 => (a -> f0 b) -> Yoneda f a -> f0 (Yoneda f b) #

sequenceA :: Applicative f0 => Yoneda f (f0 a) -> f0 (Yoneda f a) #

mapM :: Monad m => (a -> m b) -> Yoneda f a -> m (Yoneda f b) #

sequence :: Monad m => Yoneda f (m a) -> m (Yoneda f a) #

Traversable (Level i) 
Instance details

Defined in Control.Lens.Internal.Level

Methods

traverse :: Applicative f => (a -> f b) -> Level i a -> f (Level i b) #

sequenceA :: Applicative f => Level i (f a) -> f (Level i a) #

mapM :: Monad m => (a -> m b) -> Level i a -> m (Level i b) #

sequence :: Monad m => Level i (m a) -> m (Level i a) #

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 f => Traversable (WrappedFoldable f) 
Instance details

Defined in Witherable

Methods

traverse :: Applicative f0 => (a -> f0 b) -> WrappedFoldable f a -> f0 (WrappedFoldable f b) #

sequenceA :: Applicative f0 => WrappedFoldable f (f0 a) -> f0 (WrappedFoldable f a) #

mapM :: Monad m => (a -> m b) -> WrappedFoldable f a -> m (WrappedFoldable f b) #

sequence :: Monad m => WrappedFoldable f (m a) -> m (WrappedFoldable f 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 f, Traversable m) => Traversable (ReaderT f m) 
Instance details

Defined in Control.Monad.Representable.Reader

Methods

traverse :: Applicative f0 => (a -> f0 b) -> ReaderT f m a -> f0 (ReaderT f m b) #

sequenceA :: Applicative f0 => ReaderT f m (f0 a) -> f0 (ReaderT f m a) #

mapM :: Monad m0 => (a -> m0 b) -> ReaderT f m a -> m0 (ReaderT f m b) #

sequence :: Monad m0 => ReaderT f m (m0 a) -> m0 (ReaderT f m 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 (bi a) => Traversable (Biap bi a) 
Instance details

Defined in Data.Bifunctor.Biap

Methods

traverse :: Applicative f => (a0 -> f b) -> Biap bi a a0 -> f (Biap bi a b) #

sequenceA :: Applicative f => Biap bi a (f a0) -> f (Biap bi a a0) #

mapM :: Monad m => (a0 -> m b) -> Biap bi a a0 -> m (Biap bi a b) #

sequence :: Monad m => Biap bi a (m a0) -> m (Biap bi a a0) #

Bitraversable p => Traversable (Fix p) 
Instance details

Defined in Data.Bifunctor.Fix

Methods

traverse :: Applicative f => (a -> f b) -> Fix p a -> f (Fix p b) #

sequenceA :: Applicative f => Fix p (f a) -> f (Fix p a) #

mapM :: Monad m => (a -> m b) -> Fix p a -> m (Fix p b) #

sequence :: Monad m => Fix p (m a) -> m (Fix p a) #

Bitraversable p => Traversable (Join p) 
Instance details

Defined in Data.Bifunctor.Join

Methods

traverse :: Applicative f => (a -> f b) -> Join p a -> f (Join p b) #

sequenceA :: Applicative f => Join p (f a) -> f (Join p a) #

mapM :: Monad m => (a -> m b) -> Join p a -> m (Join p b) #

sequence :: Monad m => Join p (m a) -> m (Join p a) #

Traversable w => Traversable (EnvT e w) 
Instance details

Defined in Control.Comonad.Trans.Env

Methods

traverse :: Applicative f => (a -> f b) -> EnvT e w a -> f (EnvT e w b) #

sequenceA :: Applicative f => EnvT e w (f a) -> f (EnvT e w a) #

mapM :: Monad m => (a -> m b) -> EnvT e w a -> m (EnvT e w b) #

sequence :: Monad m => EnvT e w (m a) -> m (EnvT e w a) #

Traversable f => Traversable (CofreeF f a) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

traverse :: Applicative f0 => (a0 -> f0 b) -> CofreeF f a a0 -> f0 (CofreeF f a b) #

sequenceA :: Applicative f0 => CofreeF f a (f0 a0) -> f0 (CofreeF f a a0) #

mapM :: Monad m => (a0 -> m b) -> CofreeF f a a0 -> m (CofreeF f a b) #

sequence :: Monad m => CofreeF f a (m a0) -> m (CofreeF f a a0) #

(Traversable f, Traversable w) => Traversable (CofreeT f w) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

traverse :: Applicative f0 => (a -> f0 b) -> CofreeT f w a -> f0 (CofreeT f w b) #

sequenceA :: Applicative f0 => CofreeT f w (f0 a) -> f0 (CofreeT f w a) #

mapM :: Monad m => (a -> m b) -> CofreeT f w a -> m (CofreeT f w b) #

sequence :: Monad m => CofreeT f w (m a) -> m (CofreeT f w a) #

Traversable f => Traversable (FreeF f a) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

traverse :: Applicative f0 => (a0 -> f0 b) -> FreeF f a a0 -> f0 (FreeF f a b) #

sequenceA :: Applicative f0 => FreeF f a (f0 a0) -> f0 (FreeF f a a0) #

mapM :: Monad m => (a0 -> m b) -> FreeF f a a0 -> m (FreeF f a b) #

sequence :: Monad m => FreeF f a (m a0) -> m (FreeF f a a0) #

(Monad m, Traversable m, Traversable f) => Traversable (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

traverse :: Applicative f0 => (a -> f0 b) -> FreeT f m a -> f0 (FreeT f m b) #

sequenceA :: Applicative f0 => FreeT f m (f0 a) -> f0 (FreeT f m a) #

mapM :: Monad m0 => (a -> m0 b) -> FreeT f m a -> m0 (FreeT f m b) #

sequence :: Monad m0 => FreeT f m (m0 a) -> m0 (FreeT f m a) #

Traversable f => Traversable (FreeF f a) 
Instance details

Defined in Control.Monad.Trans.Free.Ap

Methods

traverse :: Applicative f0 => (a0 -> f0 b) -> FreeF f a a0 -> f0 (FreeF f a b) #

sequenceA :: Applicative f0 => FreeF f a (f0 a0) -> f0 (FreeF f a a0) #

mapM :: Monad m => (a0 -> m b) -> FreeF f a a0 -> m (FreeF f a b) #

sequence :: Monad m => FreeF f a (m a0) -> m (FreeF f a a0) #

(Monad m, Traversable m, Traversable f) => Traversable (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free.Ap

Methods

traverse :: Applicative f0 => (a -> f0 b) -> FreeT f m a -> f0 (FreeT f m b) #

sequenceA :: Applicative f0 => FreeT f m (f0 a) -> f0 (FreeT f m a) #

mapM :: Monad m0 => (a -> m0 b) -> FreeT f m a -> m0 (FreeT f m b) #

sequence :: Monad m0 => FreeT f m (m0 a) -> m0 (FreeT f m a) #

(Monad m, Traversable m, Traversable f) => Traversable (FT f m) 
Instance details

Defined in Control.Monad.Trans.Free.Church

Methods

traverse :: Applicative f0 => (a -> f0 b) -> FT f m a -> f0 (FT f m b) #

sequenceA :: Applicative f0 => FT f m (f0 a) -> f0 (FT f m a) #

mapM :: Monad m0 => (a -> m0 b) -> FT f m a -> m0 (FT f m b) #

sequence :: Monad m0 => FT f m (m0 a) -> m0 (FT f m a) #

Traversable f => Traversable (WrappedFunctor f) 
Instance details

Defined in Data.Functor.Invariant

Methods

traverse :: Applicative f0 => (a -> f0 b) -> WrappedFunctor f a -> f0 (WrappedFunctor f b) #

sequenceA :: Applicative f0 => WrappedFunctor f (f0 a) -> f0 (WrappedFunctor f a) #

mapM :: Monad m => (a -> m b) -> WrappedFunctor f a -> m (WrappedFunctor f b) #

sequence :: Monad m => WrappedFunctor f (m a) -> m (WrappedFunctor f a) #

Traversable f => Traversable (AlongsideLeft f b) 
Instance details

Defined in Control.Lens.Internal.Getter

Methods

traverse :: Applicative f0 => (a -> f0 b0) -> AlongsideLeft f b a -> f0 (AlongsideLeft f b b0) #

sequenceA :: Applicative f0 => AlongsideLeft f b (f0 a) -> f0 (AlongsideLeft f b a) #

mapM :: Monad m => (a -> m b0) -> AlongsideLeft f b a -> m (AlongsideLeft f b b0) #

sequence :: Monad m => AlongsideLeft f b (m a) -> m (AlongsideLeft f b a) #

Traversable f => Traversable (AlongsideRight f a) 
Instance details

Defined in Control.Lens.Internal.Getter

Methods

traverse :: Applicative f0 => (a0 -> f0 b) -> AlongsideRight f a a0 -> f0 (AlongsideRight f a b) #

sequenceA :: Applicative f0 => AlongsideRight f a (f0 a0) -> f0 (AlongsideRight f a a0) #

mapM :: Monad m => (a0 -> m b) -> AlongsideRight f a a0 -> m (AlongsideRight f a b) #

sequence :: Monad m => AlongsideRight f a (m a0) -> m (AlongsideRight f a a0) #

Traversable (Baz t b) 
Instance details

Defined in Data.Profunctor.Traversing

Methods

traverse :: Applicative f => (a -> f b0) -> Baz t b a -> f (Baz t b b0) #

sequenceA :: Applicative f => Baz t b (f a) -> f (Baz t b a) #

mapM :: Monad m => (a -> m b0) -> Baz t b a -> m (Baz t b b0) #

sequence :: Monad m => Baz t b (m a) -> m (Baz t b 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 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 (Magma i t b) 
Instance details

Defined in Control.Lens.Internal.Magma

Methods

traverse :: Applicative f => (a -> f b0) -> Magma i t b a -> f (Magma i t b b0) #

sequenceA :: Applicative f => Magma i t b (f a) -> f (Magma i t b a) #

mapM :: Monad m => (a -> m b0) -> Magma i t b a -> m (Magma i t b b0) #

sequence :: Monad m => Magma i t b (m a) -> m (Magma i t b a) #

Traversable (Forget r a :: Type -> Type) 
Instance details

Defined in Data.Profunctor.Types

Methods

traverse :: Applicative f => (a0 -> f b) -> Forget r a a0 -> f (Forget r a b) #

sequenceA :: Applicative f => Forget r a (f a0) -> f (Forget r a a0) #

mapM :: Monad m => (a0 -> m b) -> Forget r a a0 -> m (Forget r a b) #

sequence :: Monad m => Forget r a (m a0) -> m (Forget r a a0) #

(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) #

Traversable (Clown f a :: Type -> Type) 
Instance details

Defined in Data.Bifunctor.Clown

Methods

traverse :: Applicative f0 => (a0 -> f0 b) -> Clown f a a0 -> f0 (Clown f a b) #

sequenceA :: Applicative f0 => Clown f a (f0 a0) -> f0 (Clown f a a0) #

mapM :: Monad m => (a0 -> m b) -> Clown f a a0 -> m (Clown f a b) #

sequence :: Monad m => Clown f a (m a0) -> m (Clown f a a0) #

Bitraversable p => Traversable (Flip p a) 
Instance details

Defined in Data.Bifunctor.Flip

Methods

traverse :: Applicative f => (a0 -> f b) -> Flip p a a0 -> f (Flip p a b) #

sequenceA :: Applicative f => Flip p a (f a0) -> f (Flip p a a0) #

mapM :: Monad m => (a0 -> m b) -> Flip p a a0 -> m (Flip p a b) #

sequence :: Monad m => Flip p a (m a0) -> m (Flip p a a0) #

Traversable g => Traversable (Joker g a) 
Instance details

Defined in Data.Bifunctor.Joker

Methods

traverse :: Applicative f => (a0 -> f b) -> Joker g a a0 -> f (Joker g a b) #

sequenceA :: Applicative f => Joker g a (f a0) -> f (Joker g a a0) #

mapM :: Monad m => (a0 -> m b) -> Joker g a a0 -> m (Joker g a b) #

sequence :: Monad m => Joker g a (m a0) -> m (Joker g a a0) #

Bitraversable p => Traversable (WrappedBifunctor p a) 
Instance details

Defined in Data.Bifunctor.Wrapped

Methods

traverse :: Applicative f => (a0 -> f b) -> WrappedBifunctor p a a0 -> f (WrappedBifunctor p a b) #

sequenceA :: Applicative f => WrappedBifunctor p a (f a0) -> f (WrappedBifunctor p a a0) #

mapM :: Monad m => (a0 -> m b) -> WrappedBifunctor p a a0 -> m (WrappedBifunctor p a b) #

sequence :: Monad m => WrappedBifunctor p a (m a0) -> m (WrappedBifunctor p a a0) #

(Traversable (f a), Traversable (g a)) => Traversable (Product f g a) 
Instance details

Defined in Data.Bifunctor.Product

Methods

traverse :: Applicative f0 => (a0 -> f0 b) -> Product f g a a0 -> f0 (Product f g a b) #

sequenceA :: Applicative f0 => Product f g a (f0 a0) -> f0 (Product f g a a0) #

mapM :: Monad m => (a0 -> m b) -> Product f g a a0 -> m (Product f g a b) #

sequence :: Monad m => Product f g a (m a0) -> m (Product f g a a0) #

(Traversable (f a), Traversable (g a)) => Traversable (Sum f g a) 
Instance details

Defined in Data.Bifunctor.Sum

Methods

traverse :: Applicative f0 => (a0 -> f0 b) -> Sum f g a a0 -> f0 (Sum f g a b) #

sequenceA :: Applicative f0 => Sum f g a (f0 a0) -> f0 (Sum f g a a0) #

mapM :: Monad m => (a0 -> m b) -> Sum f g a a0 -> m (Sum f g a b) #

sequence :: Monad m => Sum f g a (m a0) -> m (Sum f g a a0) #

(Traversable f, Bitraversable p) => Traversable (Tannen f p a) 
Instance details

Defined in Data.Bifunctor.Tannen

Methods

traverse :: Applicative f0 => (a0 -> f0 b) -> Tannen f p a a0 -> f0 (Tannen f p a b) #

sequenceA :: Applicative f0 => Tannen f p a (f0 a0) -> f0 (Tannen f p a a0) #

mapM :: Monad m => (a0 -> m b) -> Tannen f p a a0 -> m (Tannen f p a b) #

sequence :: Monad m => Tannen f p a (m a0) -> m (Tannen f p a a0) #

(Bitraversable p, Traversable g) => Traversable (Biff p f g a) 
Instance details

Defined in Data.Bifunctor.Biff

Methods

traverse :: Applicative f0 => (a0 -> f0 b) -> Biff p f g a a0 -> f0 (Biff p f g a b) #

sequenceA :: Applicative f0 => Biff p f g a (f0 a0) -> f0 (Biff p f g a a0) #

mapM :: Monad m => (a0 -> m b) -> Biff p f g a a0 -> m (Biff p f g a b) #

sequence :: Monad m => Biff p f g a (m a0) -> m (Biff p f g a a0) #

mapM_ :: (Foldable t, Monad m) => (a -> m b) -> t a -> m () #

forM :: (Traversable t, Monad m) => t a -> (a -> m b) -> m (t b) #

forM_ :: (Foldable t, Monad m) => t a -> (a -> m b) -> m () #

sequence_ :: (Foldable t, Monad m) => t (m a) -> m () #

join :: Monad m => m (m a) -> m a #

forever :: Applicative f => f a -> f b #

unwords :: [Text] -> Text #

unlines :: [Text] -> Text #

words :: Text -> [Text] #

lines :: Text -> [Text] #

splitAt :: Int -> Text -> (Text, Text) #

data Symbol #

Instances

Instances details
SingKind Symbol 
Instance details

Defined in GHC.Generics

Associated Types

type DemoteRep Symbol 
Instance details

Defined in GHC.Generics

type DemoteRep Symbol = String

Methods

fromSing :: forall (a :: Symbol). Sing a -> DemoteRep Symbol

TestCoercion SSymbol 
Instance details

Defined in GHC.TypeLits

Methods

testCoercion :: forall (a :: Symbol) (b :: Symbol). SSymbol a -> SSymbol b -> Maybe (Coercion a b)

TestEquality SSymbol 
Instance details

Defined in GHC.TypeLits

Methods

testEquality :: forall (a :: Symbol) (b :: Symbol). SSymbol a -> SSymbol b -> Maybe (a :~: b)

KnownSymbol a => SingI (a :: Symbol) 
Instance details

Defined in GHC.Generics

Methods

sing :: Sing a

KnownSymbol n => Reifies (n :: Symbol) String 
Instance details

Defined in Data.Reflection

Methods

reflect :: proxy n -> String

HasField "frameworkConfig" ControllerContext FrameworkConfig Source # 
Instance details

Defined in IHP.Controller.Context

HasField "frameworkConfig" FrameworkConfig FrameworkConfig Source # 
Instance details

Defined in IHP.FrameworkConfig

HasField "logger" ControllerContext Logger Source # 
Instance details

Defined in IHP.Controller.Context

HasField "logger" Logger Logger Source # 
Instance details

Defined in IHP.Log.Types

Methods

getField :: Logger -> Logger #

(KnownSymbol name, name' ~ name) => IsLabel name (Proxy name') Source # 
Instance details

Defined in IHP.HaskellSupport

Methods

fromLabel :: Proxy name' #

(KnownSymbol foreignTable, foreignModel ~ GetModelByTableName foreignTable, KnownSymbol indexColumn, HasField indexColumn foreignModel indexValue) => HasQueryBuilder (LabeledQueryBuilderWrapper foreignTable indexColumn indexValue) NoJoins Source # 
Instance details

Defined in IHP.QueryBuilder

Methods

getQueryBuilder :: forall (table :: Symbol). LabeledQueryBuilderWrapper foreignTable indexColumn indexValue table -> QueryBuilder table Source #

injectQueryBuilder :: forall (table :: Symbol). QueryBuilder table -> LabeledQueryBuilderWrapper foreignTable indexColumn indexValue table Source #

getQueryIndex :: forall (table :: Symbol). LabeledQueryBuilderWrapper foreignTable indexColumn indexValue table -> Maybe ByteString

FillParams ('[] :: [Symbol]) record Source # 
Instance details

Defined in IHP.Controller.Param

Methods

fill :: record -> record Source #

(KnownSymbol name, ToField value) => ToField (FieldWithUpdate name value) 
Instance details

Defined in IHP.ModelSupport

Methods

toField :: FieldWithUpdate name value -> Action

(FillParams rest record, KnownSymbol fieldName, SetField fieldName record fieldType, ParamReader fieldType, HasField "meta" record MetaBag, SetField "meta" record MetaBag) => FillParams (fieldName ': rest) record Source # 
Instance details

Defined in IHP.Controller.Param

Methods

fill :: record -> record Source #

IsRecord (M1 S ('MetaSel ('Nothing :: Maybe Symbol) u ss ds) f) False 
Instance details

Defined in Data.Aeson.Types.Generic

(model ~ GetModelByTableName table, KnownSymbol table, FromField value, KnownSymbol foreignTable, foreignModel ~ GetModelByTableName foreignTable, KnownSymbol columnName, HasField columnName foreignModel value, HasQueryBuilder (LabeledQueryBuilderWrapper foreignTable columnName value) NoJoins) => Fetchable (LabeledQueryBuilderWrapper foreignTable columnName value table) model Source # 
Instance details

Defined in IHP.Fetch

Associated Types

type FetchResult (LabeledQueryBuilderWrapper foreignTable columnName value table) model 
Instance details

Defined in IHP.Fetch

type FetchResult (LabeledQueryBuilderWrapper foreignTable columnName value table) model = [LabeledData value model]

Methods

fetch :: LabeledQueryBuilderWrapper foreignTable columnName value table -> IO (FetchResult (LabeledQueryBuilderWrapper foreignTable columnName value table) model) Source #

fetchOneOrNothing :: LabeledQueryBuilderWrapper foreignTable columnName value table -> IO (Maybe model) Source #

fetchOne :: LabeledQueryBuilderWrapper foreignTable columnName value table -> IO model Source #

type DemoteRep Symbol 
Instance details

Defined in GHC.Generics

type DemoteRep Symbol = String
data Sing (s :: Symbol) 
Instance details

Defined in GHC.Generics

data Sing (s :: Symbol) where
type Compare (a :: Symbol) (b :: Symbol) 
Instance details

Defined in Data.Type.Ord

type Compare (a :: Symbol) (b :: Symbol) = CmpSymbol a b
type FetchResult (LabeledQueryBuilderWrapper foreignTable columnName value table) model Source # 
Instance details

Defined in IHP.Fetch

type FetchResult (LabeledQueryBuilderWrapper foreignTable columnName value table) model = [LabeledData value model]

symbolVal :: forall (n :: Symbol) proxy. KnownSymbol n => proxy n -> String #

data ModelContext Source #

Provides the db connection and some IHP-specific db configuration

Constructors

ModelContext 

Fields

class CanUpdate a where Source #

Minimal complete definition

updateRecord

Methods

updateRecord :: a -> IO a Source #

updateRecordDiscardResult :: a -> IO () Source #

Like updateRecord but doesn't return the updated record

type NormalizeModel model = GetModelByTableName (GetTableName model) Source #

Helper type to deal with models where relations are included or that are only partially fetched Examples:

>>> NormalizeModel (Include "author_id" Post)
Post
>>> NormalizeModel Post
Post

type family GetTableName model :: Symbol Source #

type family GetModelName model :: Symbol Source #

createRecord :: (?modelContext :: ModelContext, CanCreate model) => model -> IO model Source #

deleteRecord :: forall record (table :: Symbol). (?modelContext :: ModelContext, Table record, Show (PrimaryKey table), HasField "id" record (Id record), GetTableName record ~ table, record ~ GetModelByTableName table) => record -> IO () Source #

Runs a DELETE query for a record.

>>> let project :: Project = ...
>>> deleteRecord project
DELETE FROM projects WHERE id = '..'

Use deleteRecords if you want to delete multiple records.

data MetaBag Source #

Every IHP database record has a magic meta field which keeps a MetaBag inside. This data structure is used e.g. to keep track of the validation errors that happend.

Constructors

MetaBag 

Fields

  • annotations :: ![(Text, Violation)]

    Stores validation failures, as a list of (field name, error) pairs. E.g. annotations = [ ("name", TextViolation "cannot be empty") ]

  • touchedFields :: ![Text]

    Whenever a set is callled on a field, it will be marked as touched. Only touched fields are saved to the database when you call updateRecord

  • originalDatabaseRecord :: Maybe Dynamic

    When the record has been fetched from the database, we save the initial database record here. This is used by didChange to check if a field value is different from the initial database value.

Instances

Instances details
Show MetaBag Source # 
Instance details

Defined in IHP.ModelSupport

Methods

showsPrec :: Int -> MetaBag -> ShowS #

show :: MetaBag -> String

showList :: [MetaBag] -> ShowS #

Default MetaBag Source # 
Instance details

Defined in IHP.ModelSupport

Methods

def :: MetaBag #

Eq MetaBag Source # 
Instance details

Defined in IHP.ModelSupport

Methods

(==) :: MetaBag -> MetaBag -> Bool #

(/=) :: MetaBag -> MetaBag -> Bool #

SetField "annotations" MetaBag [(Text, Violation)] Source # 
Instance details

Defined in IHP.ModelSupport

SetField "touchedFields" MetaBag [Text] Source # 
Instance details

Defined in IHP.ModelSupport

Methods

setField :: [Text] -> MetaBag -> MetaBag Source #

throw :: forall a e. Exception e => e -> a #

throwIO :: Exception e => e -> IO a #

catch :: Exception e => IO a -> (e -> IO a) -> IO a #

fail :: MonadFail m => String -> m a #

trimming :: QuasiQuoter #

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)

type Type = TYPE LiftedRep #

type family Include (name :: Symbol) model Source #

type family PrimaryKey (tableName :: Symbol) Source #

Provides the primary key type for a given table. The instances are usually declared by the generated haskell code in Generated.Types

Example: Defining the primary key for a users table

type instance PrimaryKey "users" = UUID

Example: Defining the primary key for a table with a SERIAL pk

type instance PrimaryKey "projects" = Int

class IsString a where #

Methods

fromString :: String -> a #

Instances

Instances details
IsString ModuleName 
Instance details

Defined in Distribution.ModuleName

Methods

fromString :: String -> 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

Methods

fromString :: String -> FlagName #

IsString PackageName 
Instance details

Defined in Distribution.Types.PackageName

Methods

fromString :: String -> 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 ASN1CharacterString 
Instance details

Defined in Data.ASN1.Types.String

Methods

fromString :: String -> ASN1CharacterString #

IsString AsciiString 
Instance details

Defined in Basement.Types.AsciiString

Methods

fromString :: String -> AsciiString #

IsString String 
Instance details

Defined in Basement.UTF8.Base

Methods

fromString :: String -> String #

IsString AttributeValue 
Instance details

Defined in Text.Blaze.Internal

Methods

fromString :: String -> AttributeValue #

IsString ChoiceString 
Instance details

Defined in Text.Blaze.Internal

Methods

fromString :: String -> ChoiceString #

IsString StaticString 
Instance details

Defined in Text.Blaze.Internal

Methods

fromString :: String -> StaticString #

IsString Tag 
Instance details

Defined in Text.Blaze.Internal

Methods

fromString :: String -> Tag #

IsString Builder 
Instance details

Defined in Data.Bytes.Builder.Unsafe

Methods

fromString :: String -> Builder #

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

Methods

fromString :: String -> ShortByteString #

IsString LogStr 
Instance details

Defined in System.Log.FastLogger.LogStr

Methods

fromString :: String -> LogStr #

IsString FastString 
Instance details

Defined in GHC.Data.FastString

Methods

fromString :: String -> FastString #

IsString SDoc 
Instance details

Defined in GHC.Utils.Outputable

Methods

fromString :: String -> SDoc #

IsString ShortText 
Instance details

Defined in GHC.Data.ShortText

Methods

fromString :: String -> ShortText #

IsString RequestBody 
Instance details

Defined in Network.HTTP.Client.Types

Methods

fromString :: String -> RequestBody #

IsString MediaType 
Instance details

Defined in Network.HTTP.Media.MediaType.Internal

Methods

fromString :: String -> MediaType #

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 ScrubbedBytes 
Instance details

Defined in Data.ByteArray.ScrubbedBytes

Methods

fromString :: String -> ScrubbedBytes #

IsString Address 
Instance details

Defined in Network.Mail.Mime

Methods

fromString :: String -> Address #

IsString AccessKey 
Instance details

Defined in Network.Minio.Credentials.Types

Methods

fromString :: String -> AccessKey #

IsString SecretKey 
Instance details

Defined in Network.Minio.Credentials.Types

Methods

fromString :: String -> SecretKey #

IsString SessionToken 
Instance details

Defined in Network.Minio.Credentials.Types

Methods

fromString :: String -> SessionToken #

IsString ConnectInfo 
Instance details

Defined in Network.Minio.Data

Methods

fromString :: String -> ConnectInfo #

IsString Identifier 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

fromString :: String -> Identifier #

IsString QualifiedIdentifier 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

fromString :: String -> QualifiedIdentifier #

IsString Query 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

fromString :: String -> Query #

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 HostPreference 
Instance details

Defined in Data.Streaming.Network.Internal

Methods

fromString :: String -> HostPreference #

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 UUID Source # 
Instance details

Defined in IHP.HaskellSupport

Methods

fromString :: String -> UUID #

IsString AuthSettings 
Instance details

Defined in Network.Wai.Middleware.HttpAuth

Methods

fromString :: String -> AuthSettings #

IsString Content 
Instance details

Defined in Data.XML.Types

Methods

fromString :: String -> Content #

IsString Name 
Instance details

Defined in Data.XML.Types

Methods

fromString :: String -> Name #

IsString Node 
Instance details

Defined in Data.XML.Types

Methods

fromString :: String -> Node #

IsString (Encoding' a) 
Instance details

Defined in Data.Aeson.Encoding.Internal

Methods

fromString :: String -> Encoding' a #

IsString a => IsString (Identity a) 
Instance details

Defined in Data.String

Methods

fromString :: String -> Identity a #

a ~ () => IsString (MarkupM a) 
Instance details

Defined in Text.Blaze.Internal

Methods

fromString :: String -> MarkupM 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 #

(Read (PrimaryKey model), ParsePrimaryKey (PrimaryKey model)) => IsString (Id' model) Source #

Sometimes you have a hardcoded UUID value which represents some record id. This instance allows you to write the Id like a string:

let projectId = "ca63aace-af4b-4e6c-bcfa-76ca061dbdc6" :: Id Project
Instance details

Defined in IHP.ModelSupport

Methods

fromString :: String -> Id' model #

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 #

UTF8Bytes string index => IsString (UTF8 string) 
Instance details

Defined in Data.String.UTF8

Methods

fromString :: String -> UTF8 string #

a ~ Name => IsString (NameMatcher a) 
Instance details

Defined in Text.XML.Stream.Parse

Methods

fromString :: String -> NameMatcher a #

IsString string => IsString (Maybe string) Source #

Allows `Just "someThing"` to be written as `"someThing"`

Instance details

Defined in IHP.HaskellSupport

Methods

fromString :: String -> Maybe string #

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 (Text, Bool) Source #

Allows `("my-class", True)` to be written as `"my-class"`

Useful together with classes

Instance details

Defined in IHP.View.Classes

Methods

fromString :: String -> (Text, Bool) #

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 #

(a ~ Tokens s, IsString a, Eq a, Stream s, Ord e) => IsString (ParsecT e s m a) 
Instance details

Defined in Text.Megaparsec.Internal

Methods

fromString :: String -> ParsecT e s m a #

(|>>) :: Functor f => f a -> (a -> b) -> f b infixl 8 Source #

whenEmpty :: (Applicative f, IsEmpty value) => value -> f () -> f () Source #

whenNonEmpty :: (IsEmpty a, Applicative f) => a -> f () -> f () Source #

setJust :: forall model (name :: Symbol) value. (KnownSymbol name, SetField name model (Maybe value)) => Proxy name -> value -> model -> model Source #

Like set but wraps the value with a Just. Useful when you want to set a Maybe field

Example:

data Project = Project { name :: Maybe Text }

let project = Project { name = Nothing }
>>> setJust #name "New Name" project
Project { name = Just "New Name" }

setMaybe :: forall model (name :: Symbol) value. (KnownSymbol name, SetField name model (Maybe value)) => Proxy name -> Maybe value -> model -> model Source #

Like set but doesn't set the value if it's Nothing. Useful when you update NULL values | e.g. via a cron job and don't want to lose that work on subsequent updates.

Example:

data Project = Project { name :: Maybe Text }

let project = Project { name = Nothing }
>>> setMaybe #name (Just "New Name") project
Project { name = Just "New Name" }
>>> setMaybe #name Nothing project
Project { name = Just "New Name" } -- previous value is kept

ifOrEmpty :: Monoid a => Bool -> a -> a Source #

modify :: forall model (name :: Symbol) value. (KnownSymbol name, HasField name model value, SetField name model value) => Proxy name -> (value -> value) -> model -> model Source #

modifyJust :: forall model (name :: Symbol) value. (KnownSymbol name, HasField name model (Maybe value), SetField name model (Maybe value)) => Proxy name -> (value -> value) -> model -> model Source #

class SetField (field :: Symbol) model value | field model -> value where Source #

Methods

setField :: value -> model -> model Source #

Instances

Instances details
SetField "maxItems" Options Int Source # 
Instance details

Defined in IHP.Pagination.Types

SetField "selectFrom" SQLQuery ByteString Source # 
Instance details

Defined in IHP.QueryBuilder

SetField "windowSize" Options Int Source # 
Instance details

Defined in IHP.Pagination.Types

SetField "annotations" MetaBag [(Text, Violation)] Source # 
Instance details

Defined in IHP.ModelSupport

SetField "asyncs" DataSyncController [Async ()] Source # 
Instance details

Defined in IHP.DataSync.ControllerImpl

SetField "distinctClause" SQLQuery (Maybe ByteString) Source # 
Instance details

Defined in IHP.QueryBuilder

SetField "distinctOnClause" SQLQuery (Maybe ByteString) Source # 
Instance details

Defined in IHP.QueryBuilder

SetField "limitClause" SQLQuery (Maybe ByteString) Source # 
Instance details

Defined in IHP.QueryBuilder

SetField "offsetClause" SQLQuery (Maybe ByteString) Source # 
Instance details

Defined in IHP.QueryBuilder

SetField "orderByClause" SQLQuery [OrderByClause] Source # 
Instance details

Defined in IHP.QueryBuilder

SetField "queryIndex" SQLQuery (Maybe ByteString) Source # 
Instance details

Defined in IHP.QueryBuilder

SetField "touchedFields" MetaBag [Text] Source # 
Instance details

Defined in IHP.ModelSupport

Methods

setField :: [Text] -> MetaBag -> MetaBag Source #

SetField "whereCondition" SQLQuery (Maybe Condition) Source # 
Instance details

Defined in IHP.QueryBuilder

SetField "subscriptions" DataSyncController (HashMap UUID (MVar ())) Source # 
Instance details

Defined in IHP.DataSync.ControllerImpl

SetField "transactions" DataSyncController (HashMap UUID DataSyncTransaction) Source # 
Instance details

Defined in IHP.DataSync.ControllerImpl

SetField "cssFramework" (FormContext record) CSSFramework Source # 
Instance details

Defined in IHP.View.Types

Methods

setField :: CSSFramework -> FormContext record -> FormContext record Source #

SetField "disableJavascriptSubmission" (FormContext record) Bool Source # 
Instance details

Defined in IHP.View.Types

Methods

setField :: Bool -> FormContext record -> FormContext record Source #

SetField "formAction" (FormContext record) Text Source # 
Instance details

Defined in IHP.View.Types

Methods

setField :: Text -> FormContext record -> FormContext record Source #

SetField "formClass" (FormContext record) Text Source # 
Instance details

Defined in IHP.View.Types

Methods

setField :: Text -> FormContext record -> FormContext record Source #

SetField "formId" (FormContext record) Text Source # 
Instance details

Defined in IHP.View.Types

Methods

setField :: Text -> FormContext record -> FormContext record Source #

SetField "formMethod" (FormContext record) Text Source # 
Instance details

Defined in IHP.View.Types

Methods

setField :: Text -> FormContext record -> FormContext record Source #

SetField "model" (FormContext record) record Source # 
Instance details

Defined in IHP.View.Types

Methods

setField :: record -> FormContext record -> FormContext record Source #

SetField "customFormAttributes" (FormContext record) [(Text, Text)] Source # 
Instance details

Defined in IHP.View.Types

Methods

setField :: [(Text, Text)] -> FormContext record -> FormContext record Source #

class HasField field model value => UpdateField (field :: Symbol) model model' value value' | model model' value' -> value where Source #

Methods

updateField :: value' -> model -> model' Source #

incrementField :: forall model (name :: Symbol) value. (KnownSymbol name, HasField name model value, SetField name model value, Num value) => Proxy name -> model -> model Source #

Plus 1 on record field.

Example:

data Project = Project { name :: Text, followersCount :: Int }

let project = Project { name = "Hello World", followersCount = 0 }
>>> project |> incrementField #followersCount
Project { name = "Hello World", followersCount = 1 }

decrementField :: forall model (name :: Symbol) value. (KnownSymbol name, HasField name model value, SetField name model value, Num value) => Proxy name -> model -> model Source #

Minus 1 on a record field.

Example:

data Project = Project { name :: Text, followersCount :: Int }

let project = Project { name = "Hello World", followersCount = 1337 }
>>> project |> decrementField #followersCount
Project { name = "Hello World", followersCount = 1336 }

forEachWithIndex :: Applicative m => [a] -> ((Int, a) -> m ()) -> m () Source #

Like forEach but with an index, starting at 0

Example: With a Callback

forEachWithIndex users \(index, user) -> putStrLn (tshow index <> ": " <> tshow user)

Example: With a Function

printUser :: (Int, User) -> IO ()
printUser (index, user) = putStrLn (tshow index <> ": " <> tshow user)

forEachWithIndex users printUser

Example: Within HSX

renderUser :: (Int, User) -> Html
renderUser (index, user) = [hsx|<div>User {index}: {user.name}</div>|]

render = [hsx|{forEachWithIndex users renderUser}|]

textToInt :: Text -> Maybe Int Source #

Parses a text to an int. Returns Nothing on failure.

Example:

>>> textToInt "1337"
Just 1337
>>> textToInt "bad input"
Nothing

isWeekend :: Day -> Bool Source #

Returns True when day is Saturday or Sunday.

Example:

>>> isWeekend $ fromGregorian 2019 10 7
False
>>> isWeekend $ fromGregorian 2020 6 13
True

todayIsWeekend :: IO Bool Source #

Returns True when today is Saturday or Sunday.

Example:

do
    todayIsWeekend <- isWeekend
    when todayIsWeekend (putStrLn "It's weekend!")

debug :: Show value => value -> value Source #

Debug-print a value during evaluation

Alias for traceShowId

includes :: (MonoFoldable container, Eq (Element container)) => Element container -> container -> Bool Source #

symbolToText :: forall (symbol :: Symbol). KnownSymbol symbol => Text Source #

Returns the value of a type level symbol as a text

>>> symbolToText @"hello"
"hello"
>>> symbolToText @(GetTableName User)
"users"

symbolToByteString :: forall (symbol :: Symbol). KnownSymbol symbol => ByteString Source #

Returns the value of a type level symbol as a bytestring

>>> symbolToByteString @"hello"
"hello"
>>> symbolToByteString @(GetTableName User)
"users"

class IsEmpty value where Source #

Used by nonEmpty and isEmptyValue to check for emptyness

Methods

isEmpty :: value -> Bool Source #

Returns True when the value is an empty string, empty list, zero UUID, etc.

Instances

Instances details
IsEmpty Text Source # 
Instance details

Defined in IHP.HaskellSupport

Methods

isEmpty :: Text -> Bool Source #

IsEmpty UUID Source # 
Instance details

Defined in IHP.HaskellSupport

Methods

isEmpty :: UUID -> Bool Source #

IsEmpty (PrimaryKey table) => IsEmpty (Id' table) Source # 
Instance details

Defined in IHP.ModelSupport

Methods

isEmpty :: Id' table -> Bool Source #

IsEmpty (Maybe value) Source # 
Instance details

Defined in IHP.HaskellSupport

Methods

isEmpty :: Maybe value -> Bool Source #

IsEmpty [a] Source # 
Instance details

Defined in IHP.HaskellSupport

Methods

isEmpty :: [a] -> Bool Source #

IsEmpty (Map a b) Source # 
Instance details

Defined in IHP.HaskellSupport

Methods

isEmpty :: Map a b -> Bool Source #

copyFields :: CopyFields fields destinationRecord sourceRecord => sourceRecord -> destinationRecord -> destinationRecord Source #

Provides the copyFields function

Useful to rewrite getter-setter code like this:

let newProject = newRecord @Project
    |> set #name (otherProject.name)
    |> set #isPublic (otherProject.isPublic)
    |> set #userId (otherProject.userId)

With copyFields this can be written like this:

let newProject = newRecord @Project
    |> copyFields @["name", "isPublic", "userId"] otherProject

allEnumValues :: Enum enumType => [enumType] Source #

Returns a list of all values of an enum type

Given a data structure like this:

data Color = Yellow | Red | Blue deriving (Enum)

You can call allEnumValues to get a list of all colors:

>>> allEnumValues @Color
[Yellow, Red, Blue]

This also works if the enum is defined in the Schema.sql:

CREATE TYPE brokerage_subscription_type AS ENUM ('basic_subscription', 'bronze_subscription', 'silver_subscription', 'gold_subscription');
>>> allEnumValues @BrokerageSubscriptionType
[BasicSubscription, BronzeSubscription, SilverSubscription]

class Record model where Source #

Methods

newRecord :: model Source #

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

BiPolyMap Map 
Instance details

Defined in Data.Containers

Associated Types

type BPMKeyConstraint Map key 
Instance details

Defined in Data.Containers

type BPMKeyConstraint Map key = Ord key

Methods

mapKeysWith :: (BPMKeyConstraint Map k1, BPMKeyConstraint Map k2) => (v -> v -> v) -> (k1 -> k2) -> Map k1 v -> Map k2 v #

Ord k => TraverseMax k (Map k) 
Instance details

Defined in Control.Lens.Traversal

Methods

traverseMax :: IndexedTraversal' k (Map k v) v

Ord k => TraverseMin k (Map k) 
Instance details

Defined in Control.Lens.Traversal

Methods

traverseMin :: IndexedTraversal' k (Map k v) v

FilterableWithIndex k (Map k) 
Instance details

Defined in Witherable

Methods

imapMaybe :: (k -> a -> Maybe b) -> Map k a -> Map k b

ifilter :: (k -> a -> Bool) -> Map k a -> Map k a

WitherableWithIndex k (Map k) 
Instance details

Defined in Witherable

Methods

iwither :: Applicative f => (k -> a -> f (Maybe b)) -> Map k a -> f (Map k b)

iwitherM :: Monad m => (k -> a -> m (Maybe b)) -> Map k a -> m (Map k b)

ifilterA :: Applicative f => (k -> a -> f Bool) -> Map k a -> f (Map k a)

(OutputableP env key, OutputableP env elt) => OutputableP env (Map key elt) 
Instance details

Defined in GHC.Utils.Outputable

Methods

pdoc :: env -> Map key elt -> SDoc

(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)

(Ord k, Arbitrary k) => Arbitrary1 (Map k) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitrary :: Gen a -> Gen (Map k a)

liftShrink :: (a -> [a]) -> Map k a -> [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 #

Ord k => TrieMap (Map k) 
Instance details

Defined in GHC.Data.TrieMap

Associated Types

type Key (Map k) 
Instance details

Defined in GHC.Data.TrieMap

type Key (Map k) = k

Methods

emptyTM :: Map k a

lookupTM :: Key (Map k) -> Map k b -> Maybe b

alterTM :: Key (Map k) -> XT b -> Map k b -> Map k b

filterTM :: (a -> Bool) -> Map k a -> Map k a

foldTM :: (a -> b -> b) -> Map k a -> b -> b

Hashable k => Hashable1 (Map k) 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> Map k a -> Int

Invariant (Map k) 
Instance details

Defined in Data.Functor.Invariant

Methods

invmap :: (a -> b) -> (b -> a) -> Map k a -> Map k b

Ord k => Adjustable (Map k) 
Instance details

Defined in Data.Key

Methods

adjust :: (a -> a) -> Key (Map k) -> Map k a -> Map k a

replace :: Key (Map k) -> a -> Map k a -> Map k a

FoldableWithKey (Map k) 
Instance details

Defined in Data.Key

Methods

toKeyedList :: Map k a -> [(Key (Map k), a)]

foldMapWithKey :: Monoid m => (Key (Map k) -> a -> m) -> Map k a -> m

foldrWithKey :: (Key (Map k) -> a -> b -> b) -> b -> Map k a -> b

foldlWithKey :: (b -> Key (Map k) -> a -> b) -> b -> Map k a -> b

Ord k => Indexable (Map k) 
Instance details

Defined in Data.Key

Methods

index :: Map k a -> Key (Map k) -> a

Keyed (Map k) 
Instance details

Defined in Data.Key

Methods

mapWithKey :: (Key (Map k) -> a -> b) -> Map k a -> Map k b

Ord k => Lookup (Map k) 
Instance details

Defined in Data.Key

Methods

lookup :: Key (Map k) -> Map k a -> Maybe a

TraversableWithKey (Map k) 
Instance details

Defined in Data.Key

Methods

traverseWithKey :: Applicative f => (Key (Map k) -> a -> f b) -> Map k a -> f (Map k b)

mapWithKeyM :: Monad m => (Key (Map k) -> a -> m b) -> Map k a -> m (Map k b)

Ord k => Zip (Map k) 
Instance details

Defined in Data.Key

Methods

zipWith :: (a -> b -> c) -> Map k a -> Map k b -> Map k c

zip :: Map k a -> Map k b -> Map k (a, b)

zap :: Map k (a -> b) -> Map k a -> Map k b

Ord k => ZipWithKey (Map k) 
Instance details

Defined in Data.Key

Methods

zipWithKey :: (Key (Map k) -> a -> b -> c) -> Map k a -> Map k b -> Map k c

zapWithKey :: Map k (Key (Map k) -> a -> b) -> Map k a -> Map k b

Ord key => PolyMap (Map key) 
Instance details

Defined in Data.Containers

Methods

differenceMap :: Map key value1 -> Map key value2 -> Map key value1 #

intersectionMap :: Map key value1 -> Map key value2 -> Map key value1 #

intersectionWithMap :: (value1 -> value2 -> value3) -> Map key value1 -> Map key value2 -> Map key value3 #

Default k => Pointed (Map k) 
Instance details

Defined in Data.Pointed

Methods

point :: a -> Map k a

Ord k => Alt (Map k) 
Instance details

Defined in Data.Functor.Alt

Methods

(<!>) :: Map k a -> Map k a -> Map k a

some :: Applicative (Map k) => Map k a -> Map k [a]

many :: Applicative (Map k) => Map k a -> Map k [a]

Ord k => Apply (Map k) 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(<.>) :: Map k (a -> b) -> Map k a -> Map k b

(.>) :: Map k a -> Map k b -> Map k b

(<.) :: Map k a -> Map k b -> Map k a

liftF2 :: (a -> b -> c) -> Map k a -> Map k b -> Map k c

Ord k => Bind (Map k) 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(>>-) :: Map k a -> (a -> Map k b) -> Map k b

join :: Map k (Map k a) -> Map k a

Ord k => Plus (Map k) 
Instance details

Defined in Data.Functor.Plus

Methods

zero :: Map k a

Filterable (Map k) 
Instance details

Defined in Witherable

Methods

mapMaybe :: (a -> Maybe b) -> Map k a -> Map k b

catMaybes :: Map k (Maybe a) -> Map k a

filter :: (a -> Bool) -> Map k a -> Map k a

Witherable (Map k) 
Instance details

Defined in Witherable

Methods

wither :: Applicative f => (a -> f (Maybe b)) -> Map k a -> f (Map k b)

witherM :: Monad m => (a -> m (Maybe b)) -> Map k a -> m (Map k b)

filterA :: Applicative f => (a -> f Bool) -> Map k a -> f (Map k a)

witherMap :: Applicative m => (Map k b -> r) -> (a -> m (Maybe b)) -> Map k a -> m r

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

(Ord k, Arbitrary k, Arbitrary v) => Arbitrary (Map k v) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (Map k v)

shrink :: Map k v -> [Map k v]

(CoArbitrary k, CoArbitrary v) => CoArbitrary (Map k v) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Map k v -> Gen b -> Gen b

(Ord a, Function a, Function b) => Function (Map a b) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Map a b -> b0) -> Map a b :-> b0

(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 #

(Ord k, Serialize k, Serialize e) => Serialize (Map k e) 
Instance details

Defined in Data.Serialize

Methods

put :: Putter (Map k e)

get :: Get (Map k e)

(NFData k, NFData a) => NFData (Map k a) 
Instance details

Defined in Data.Map.Internal

Methods

rnf :: Map k a -> () #

ToJExpr a => ToJExpr (Map String a) 
Instance details

Defined in GHC.JS.Make

Methods

toJExpr :: Map String a -> JExpr

toJExprFromList :: [Map String a] -> JExpr

(Outputable key, Outputable elt) => Outputable (Map key elt) 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Map key elt -> SDoc

(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 #

Ord k => At (Map k a) 
Instance details

Defined in Control.Lens.At

Methods

at :: Index (Map k a) -> Lens' (Map k a) (Maybe (IxValue (Map k a)))

Ord k => Ixed (Map k a) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (Map k a) -> Traversal' (Map k a) (IxValue (Map k a))

AsEmpty (Map k a) 
Instance details

Defined in Control.Lens.Empty

Methods

_Empty :: Prism' (Map k a) ()

Ord k => Wrapped (Map k a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Map k a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (Map k a) = [(k, a)]

Methods

_Wrapped' :: Iso' (Map k a) (Unwrapped (Map k a))

IsEmpty (Map a b) Source # 
Instance details

Defined in IHP.HaskellSupport

Methods

isEmpty :: Map a b -> Bool Source #

Ord k => HasKeysSet (Map k v) 
Instance details

Defined in Data.Containers

Associated Types

type KeySet (Map k v) 
Instance details

Defined in Data.Containers

type KeySet (Map k v) = Set k

Methods

keysSet :: Map k v -> KeySet (Map k v) #

Ord key => IsMap (Map key value) 
Instance details

Defined in Data.Containers

Associated Types

type MapValue (Map key value) 
Instance details

Defined in Data.Containers

type MapValue (Map key value) = value

Methods

lookup :: ContainerKey (Map key value) -> Map key value -> Maybe (MapValue (Map key value)) #

insertMap :: ContainerKey (Map key value) -> MapValue (Map key value) -> Map key value -> Map key value #

deleteMap :: ContainerKey (Map key value) -> Map key value -> Map key value #

singletonMap :: ContainerKey (Map key value) -> MapValue (Map key value) -> Map key value #

mapFromList :: [(ContainerKey (Map key value), MapValue (Map key value))] -> Map key value #

mapToList :: Map key value -> [(ContainerKey (Map key value), MapValue (Map key value))] #

findWithDefault :: MapValue (Map key value) -> ContainerKey (Map key value) -> Map key value -> MapValue (Map key value) #

insertWith :: (MapValue (Map key value) -> MapValue (Map key value) -> MapValue (Map key value)) -> ContainerKey (Map key value) -> MapValue (Map key value) -> Map key value -> Map key value #

insertWithKey :: (ContainerKey (Map key value) -> MapValue (Map key value) -> MapValue (Map key value) -> MapValue (Map key value)) -> ContainerKey (Map key value) -> MapValue (Map key value) -> Map key value -> Map key value #

insertLookupWithKey :: (ContainerKey (Map key value) -> MapValue (Map key value) -> MapValue (Map key value) -> MapValue (Map key value)) -> ContainerKey (Map key value) -> MapValue (Map key value) -> Map key value -> (Maybe (MapValue (Map key value)), Map key value) #

adjustMap :: (MapValue (Map key value) -> MapValue (Map key value)) -> ContainerKey (Map key value) -> Map key value -> Map key value #

adjustWithKey :: (ContainerKey (Map key value) -> MapValue (Map key value) -> MapValue (Map key value)) -> ContainerKey (Map key value) -> Map key value -> Map key value #

updateMap :: (MapValue (Map key value) -> Maybe (MapValue (Map key value))) -> ContainerKey (Map key value) -> Map key value -> Map key value #

updateWithKey :: (ContainerKey (Map key value) -> MapValue (Map key value) -> Maybe (MapValue (Map key value))) -> ContainerKey (Map key value) -> Map key value -> Map key value #

updateLookupWithKey :: (ContainerKey (Map key value) -> MapValue (Map key value) -> Maybe (MapValue (Map key value))) -> ContainerKey (Map key value) -> Map key value -> (Maybe (MapValue (Map key value)), Map key value) #

alterMap :: (Maybe (MapValue (Map key value)) -> Maybe (MapValue (Map key value))) -> ContainerKey (Map key value) -> Map key value -> Map key value #

unionWith :: (MapValue (Map key value) -> MapValue (Map key value) -> MapValue (Map key value)) -> Map key value -> Map key value -> Map key value #

unionWithKey :: (ContainerKey (Map key value) -> MapValue (Map key value) -> MapValue (Map key value) -> MapValue (Map key value)) -> Map key value -> Map key value -> Map key value #

unionsWith :: (MapValue (Map key value) -> MapValue (Map key value) -> MapValue (Map key value)) -> [Map key value] -> Map key value #

mapWithKey :: (ContainerKey (Map key value) -> MapValue (Map key value) -> MapValue (Map key value)) -> Map key value -> Map key value #

omapKeysWith :: (MapValue (Map key value) -> MapValue (Map key value) -> MapValue (Map key value)) -> (ContainerKey (Map key value) -> ContainerKey (Map key value)) -> Map key value -> Map key value #

filterMap :: (MapValue (Map key value) -> Bool) -> Map key value -> Map key value #

Ord k => SetContainer (Map k v) 
Instance details

Defined in Data.Containers

Associated Types

type ContainerKey (Map k v) 
Instance details

Defined in Data.Containers

type ContainerKey (Map k v) = k

Methods

member :: ContainerKey (Map k v) -> Map k v -> Bool #

notMember :: ContainerKey (Map k v) -> Map k v -> Bool #

union :: Map k v -> Map k v -> Map k v #

unions :: (MonoFoldable mono, Element mono ~ Map k v) => mono -> Map k v #

difference :: Map k v -> Map k v -> Map k v #

intersection :: Map k v -> Map k v -> Map k v #

keys :: Map k v -> [ContainerKey (Map k v)] #

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) #

One (Map k v) 
Instance details

Defined in Relude.Container.One

Associated Types

type OneItem (Map k v) 
Instance details

Defined in Relude.Container.One

type OneItem (Map k v) = (k, v)

Methods

one :: OneItem (Map k v) -> Map k v

Ord k => DynamicMap (Map k v) 
Instance details

Defined in Relude.Extra.Map

Methods

insert :: Key (Map k v) -> Val (Map k v) -> Map k v -> Map k v

insertWith :: (Val (Map k v) -> Val (Map k v) -> Val (Map k v)) -> Key (Map k v) -> Val (Map k v) -> Map k v -> Map k v

delete :: Key (Map k v) -> Map k v -> Map k v

alter :: (Maybe (Val (Map k v)) -> Maybe (Val (Map k v))) -> Key (Map k v) -> Map k v -> Map k v

Ord k => StaticMap (Map k v) 
Instance details

Defined in Relude.Extra.Map

Associated Types

type Key (Map k v) 
Instance details

Defined in Relude.Extra.Map

type Key (Map k v) = k
type Val (Map k v) 
Instance details

Defined in Relude.Extra.Map

type Val (Map k v) = v

Methods

size :: Map k v -> Int

lookup :: Key (Map k v) -> Map k v -> Maybe (Val (Map k v))

member :: Key (Map k v) -> Map k v -> Bool

(t ~ Map k' a', Ord k) => Rewrapped (Map k a) t 
Instance details

Defined in Control.Lens.Wrapped

c ~ d => Each (Map c a) (Map d b) a b 
Instance details

Defined in Control.Lens.Each

Methods

each :: Traversal (Map c a) (Map d b) a b

type BPMKeyConstraint Map key 
Instance details

Defined in Data.Containers

type BPMKeyConstraint Map key = Ord key
type Key (Map k) 
Instance details

Defined in GHC.Data.TrieMap

type Key (Map k) = k
type Key (Map k) 
Instance details

Defined in Data.Key

type Key (Map k) = k
type Item (Map k v) 
Instance details

Defined in Data.Map.Internal

type Item (Map k v) = (k, v)
type Index (Map k a) 
Instance details

Defined in Control.Lens.At

type Index (Map k a) = k
type IxValue (Map k a) 
Instance details

Defined in Control.Lens.At

type IxValue (Map k a) = a
type Unwrapped (Map k a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (Map k a) = [(k, a)]
type ContainerKey (Map k v) 
Instance details

Defined in Data.Containers

type ContainerKey (Map k v) = k
type KeySet (Map k v) 
Instance details

Defined in Data.Containers

type KeySet (Map k v) = Set k
type MapValue (Map key value) 
Instance details

Defined in Data.Containers

type MapValue (Map key value) = value
type Element (Map k v) 
Instance details

Defined in Data.MonoTraversable

type Element (Map k v) = v
type OneItem (Map k v) 
Instance details

Defined in Relude.Container.One

type OneItem (Map k v) = (k, v)
type Key (Map k v) 
Instance details

Defined in Relude.Extra.Map

type Key (Map k v) = k
type Val (Map k v) 
Instance details

Defined in Relude.Extra.Map

type Val (Map k v) = v

tableNameToModelName :: Text -> Text Source #

Transforms a underscore table name to a camel case model name.

>>> tableNameToModelName "users"
"User"
>>> tableNameToModelName "projects"
"Project"

columnNameToFieldName :: Text -> Text Source #

Transforms a underscore table column name to a camel case attribute name for use in haskell.

>>> columnNameToFieldName "email"
"email"
>>> columnNameToFieldName "project_id"
"projectId"

modelNameToTableName :: Text -> Text Source #

Transforms a camel case model name to a underscored table name.

>>> modelNameToTableName "User"
"users"
>>> modelNameToTableName "UserProject"
"user_projects"

humanize :: Text -> Text Source #

Returns a more friendly version for an identifier

ucfirst :: Text -> Text Source #

Make a text's first character uppercase

>>> ucfirst "hello world"
"Hello World"
>>> ucfirst "Already uppercase"
"Already uppercase"

lcfirst :: Text -> Text Source #

Make a text's first character lowercase

>>> lcfirst "Hello World"
"hello World"
>>> lcfirst "alread lowercase"
"already lowercase"

fieldNameToColumnName :: Text -> Text Source #

Transforms a camel case attribute name from haskell to a underscore table column name for the database.

>>> fieldNameToColumnName "email"
"email"
>>> fieldNameToColumnName "projectId"
"project_id"

escapeHaskellKeyword :: Text -> Text Source #

Add '_' to the end of a name if it is a reserved haskell keyword

>>> escapeHaskellKeyword "test"
"test"
>>> escapeHaskellKeyword "type"
"type_"

tableNameToControllerName :: Text -> Text Source #

Transforms a underscore table name to a name for a controller

>>> tableNameToControllerName "users"
"Users"
>>> tableNameToControllerName "projects"
"Projects"
>>> tableNameToControllerName "user_projects"
"UserProjects"

enumValueToControllerName :: Text -> Text Source #

Transforms a enum value to a name for a model

>>> enumValueToControllerName "happy"
"Happy"
>>> enumValueToControllerName "very happy"
"VeryHappy"
>>> enumValueToControllerName "very_happy"
"VeryHappy"

toSlug :: Text -> Text Source #

Transforms a string to a value to be safely used in urls

>>> toSlug "IHP Release: 21.08.2020 (v21082020)"
"ihp-release-21-08-2020-v21082020"
>>> toSlug "Hallo! @ Welt"
"hallo-welt"

fieldNameToFieldLabel :: Text -> Text Source #

Transform a data-field name like userName to a friendly human-readable name like User name

>>> fieldNameToFieldLabel "userName"
"User name"

columnNameToFieldLabel :: Text -> Text Source #

Transform a column name like user_name to a friendly human-readable name like User name

>>> columnNameToFieldLabel "user_name"
"User name"

removeIdSuffix :: Text -> Text Source #

Removes Id from a string

>>> removeIdSuffix "User Id"
"User"

When the string does not end with Id, it will just return the input string:

>>> removeIdSuffix "Project"
"Project"

class HasField (x :: k) r a | x r -> a where #

Methods

getField :: r -> a #

Instances

Instances details
HasField "frameworkConfig" ControllerContext FrameworkConfig Source # 
Instance details

Defined in IHP.Controller.Context

HasField "frameworkConfig" FrameworkConfig FrameworkConfig Source # 
Instance details

Defined in IHP.FrameworkConfig

HasField "logger" ControllerContext Logger Source # 
Instance details

Defined in IHP.Controller.Context

HasField "logger" Logger Logger Source # 
Instance details

Defined in IHP.Log.Types

Methods

getField :: Logger -> Logger #

($) :: (a -> b) -> a -> b #

pageTitle :: (?context :: ControllerContext) => Text Source #

Returns the current page title. The title can be set using setTitle "my title" from the action.

If the title hasn't been set yet, this will return an empty string. You can also use pageTitleOrDefault to pass a custom default title.

You can use this inside your title tag like this:

[hsx|
    <head>
        <title>{pageTitle}</title>
    </head>
|]
  • App-wide default title:*

You can set a app-wide default title by calling setTitle from the FrontController.hs:

instance InitControllerContext Web where
    initContext = do
        setLayout defaultLayout
        initAutoRefresh
        setTitle "Jobs"
  • View-specific title:*

You can set a custom title inside the view by calling setTitle inside the beforeRender hook.

module JobSite.View.JobPositions.Show where

instance View ShowView where
    beforeRender ShowView { .. } = do
        setTitle "Custom title"

    html ShowView { .. } = [hsx|..|]

pageTitleOrDefault :: (?context :: ControllerContext) => Text -> Text Source #

Returns the current page title, like pageTitle but returns a provided default value instead of an empty string if no title is set.

You can use this inside your title tag like this:

[hsx|
    <head>
        <title>{pageTitleOrDefault "My Application"}</title>
    </head>
|]

pageTitleOrNothing :: (?context :: ControllerContext) => Maybe Text Source #

Returns the current page title or Nothing if not set yet

descriptionOrDefault :: (?context :: ControllerContext) => Text -> Html Source #

Returns name="description" content="Lorem Ipsum" element. The description can be set using setDescription "my description" from the view.

You can use this inside your Layout like this:

[hsx|
    <head>
        <title>{pageTitle}</title>
        {descriptionOrDefault "CO2 Database"}
    </head>
|]
  • View-specific description:*

You can override the default description inside the view by calling setDescription inside the beforeRender hook:

module JobSite.View.JobPositions.Show where

instance View ShowView where
    beforeRender ShowView { .. } = do
        setDescription "The CO2 Footprint of beef is about 67kg CO2 per 1kg of beef."

    html ShowView { .. } = [hsx|..|]

ogTitleOrDefault :: (?context :: ControllerContext) => Text -> Html Source #

Returns the meta og:title element. The og:title can be set using setOGTitle "my title" from the view.

You can use this inside your Layout like this:

[hsx|
    <head>
        <title>{pageTitle}</title>
        {ogTitleOrDefault "default title"}
    </head>
|]
  • View-specific og:title:*

You can override the default og:title inside the view by calling setOGTitle inside the beforeRender hook:

module JobSite.View.JobPositions.Show where

instance View ShowView where
    beforeRender ShowView { .. } = do
        setOGTitle "Custom title"

    html ShowView { .. } = [hsx|..|]

ogTypeOrDefault :: (?context :: ControllerContext) => Text -> Html Source #

Returns the meta og:type element. The og:type can be set using setOGType "data" from the view.

You can use this inside your Layout like this:

[hsx|
    <head>
        <title>{pageTitle}</title>
        {ogTypeOrDefault "data"}
    </head>
|]
  • View-specific og:type:*

You can override the default og:type inside the view by calling setOGType inside the beforeRender hook:

module JobSite.View.JobPositions.Show where

instance View ShowView where
    beforeRender ShowView { .. } = do
        setOGType "mytype"

    html ShowView { .. } = [hsx|..|]

ogDescriptionOrDefault :: (?context :: ControllerContext) => Text -> Html Source #

Returns the meta og:description element. The og:description can be set using setOGDescription "my description" from the view.

You can use this inside your Layout like this:

[hsx|
    <head>
        <title>{pageTitle}</title>
        {ogDescriptionOrDefault "CO2 Database"}
    </head>
|]
  • View-specific og:description:*

You can override the default og:description inside the view by calling setOGDescription inside the beforeRender hook:

module JobSite.View.JobPositions.Show where

instance View ShowView where
    beforeRender ShowView { .. } = do
        setOGDescription "The CO2 Footprint of beef is about 67kg CO2 per 1kg of beef."

    html ShowView { .. } = [hsx|..|]

ogUrl :: (?context :: ControllerContext) => Html Source #

Returns the meta og:url element if setOGUrl "https://example.com/" was called before.

You can use this inside your Layout like this:

[hsx|
    <head>
        <title>{pageTitle}</title>
        {ogUrl}
    </head>
|]

When setOGUrl is not called, no meta tag will be rendered.

  • Setting og:url:*

You can set the og:url inside the view by calling setOGUrl inside the beforeRender hook:

module JobSite.View.JobPositions.Show where

instance View ShowView where
    beforeRender ShowView { .. } = do
        setOGUrl (urlTo ShowAction { .. })

    html ShowView { .. } = [hsx|..|]

ogImage :: (?context :: ControllerContext) => Html Source #

Returns the meta og:image element if setOGImage "https://example.com/image.png" was called before.

You can use this inside your Layout like this:

[hsx|
    <head>
        <title>{pageTitle}</title>
        {ogImage}
    </head>
|]

When setOGImage is not called, no meta tag will be rendered.

  • Setting og:image:*

You can set the og:image inside the view by calling setOGImage inside the beforeRender hook:

module JobSite.View.JobPositions.Show where

instance View ShowView where
    beforeRender ShowView { .. } = do
        setOGImage "https://example.com/image.png"

    html ShowView { .. } = [hsx|..|]

setTitle :: (?context :: ControllerContext) => Text -> IO () Source #

Sets the page title. Can be accessed using '{pageTitle}' inside your Layout.hs.

Example:

action ShowProjectAction { projectId } = do
    project <- fetch projectId
    setTitle (project.title)

Inside your layout use it like:

defaultLayout :: Html -> Html
defaultLayout inner = [hsx|
<head>
    <title>{pageTitle}</title>
</head>
|]

setDescription :: (?context :: ControllerContext) => Text -> IO () Source #

setOGTitle :: (?context :: ControllerContext) => Text -> IO () Source #

setOGType :: (?context :: ControllerContext) => Text -> IO () Source #

setOGDescription :: (?context :: ControllerContext) => Text -> IO () Source #

setOGUrl :: (?context :: ControllerContext) => Text -> IO () Source #

setOGImage :: (?context :: ControllerContext) => Text -> IO () Source #

pluralize :: Text -> Text Source #

pluralize a given word >>> pluralize "person" "people" >>> pluralize "dog" "dogs"

singularize :: Text -> Text Source #

singularize a given word >>> singularize "people" "person" >>> singularize "cats" "cat"

inflect :: Text -> Int -> Text Source #

inflect a word given any number >>> inflect "person" 1 "person" >>> inflect "person" 2 "people"

mapMaybe :: (a -> Maybe b) -> [a] -> [b] #

fromMaybe :: a -> Maybe a -> a #

isJust :: Maybe a -> Bool #

listToMaybe :: [a] -> Maybe 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 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

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

Assertable Bool 
Instance details

Defined in Test.HUnit.Base

Methods

assert :: Bool -> Assertion

AssertionPredicable Bool 
Instance details

Defined in Test.HUnit.Base

Methods

assertionPredicate :: Bool -> AssertionPredicate

Arbitrary Bool 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen Bool

shrink :: Bool -> [Bool]

CoArbitrary Bool 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Bool -> Gen b -> Gen b

Function Bool 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Bool -> b) -> Bool :-> b

Testable Bool 
Instance details

Defined in Test.QuickCheck.Property

Methods

property :: Bool -> Property

propertyForAllShrinkShow :: Gen a -> (a -> [a]) -> (a -> [String]) -> (a -> Bool) -> Property

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

ToJSON Bool 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Bool 
Instance details

Defined in Data.Aeson.Types.ToJSON

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

Methods

succ :: Bool -> Bool #

pred :: Bool -> Bool #

toEnum :: Int -> Bool #

fromEnum :: Bool -> Int #

enumFrom :: Bool -> [Bool] #

enumFromThen :: Bool -> Bool -> [Bool] #

enumFromTo :: Bool -> Bool -> [Bool] #

enumFromThenTo :: Bool -> Bool -> Bool -> [Bool] #

Generic Bool 
Instance details

Defined in GHC.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

NormalForm Bool 
Instance details

Defined in Basement.NormalForm

Methods

toNormalForm :: Bool -> ()

ToMarkup Bool 
Instance details

Defined in Text.Blaze

Methods

toMarkup :: Bool -> Markup

preEscapedToMarkup :: Bool -> Markup

ToValue Bool 
Instance details

Defined in Text.Blaze

Methods

toValue :: Bool -> AttributeValue

preEscapedToValue :: Bool -> AttributeValue

Serialize Bool 
Instance details

Defined in Data.Serialize

Methods

put :: Putter Bool

get :: Get Bool

Default Bool Source # 
Instance details

Defined in IHP.ModelSupport

Methods

def :: Bool #

NFData Bool 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Bool -> () #

ToJExpr Bool 
Instance details

Defined in GHC.JS.Make

Methods

toJExpr :: Bool -> JExpr

toJExprFromList :: [Bool] -> JExpr

Outputable Bool 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Bool -> SDoc

Eq Bool 
Instance details

Defined in GHC.Classes

Methods

(==) :: Bool -> Bool -> Bool #

(/=) :: Bool -> Bool -> Bool #

Ord Bool 
Instance details

Defined in GHC.Classes

Methods

compare :: Bool -> Bool -> Ordering #

(<) :: Bool -> Bool -> Bool #

(<=) :: Bool -> Bool -> Bool #

(>) :: Bool -> Bool -> Bool #

(>=) :: Bool -> Bool -> Bool #

max :: Bool -> Bool -> Bool #

min :: Bool -> Bool -> Bool #

Hashable Bool 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Bool -> Int #

hash :: Bool -> Int #

HpcHash Bool 
Instance details

Defined in Trace.Hpc.Util

Methods

toHash :: Bool -> Hash

Example Bool 
Instance details

Defined in Test.Hspec.Core.Example

Associated Types

type Arg Bool 
Instance details

Defined in Test.Hspec.Core.Example

type Arg Bool = ()

Methods

evaluateExample :: Bool -> Params -> (ActionWith (Arg Bool) -> IO ()) -> ProgressCallback -> IO Result

ApplyAttribute Bool 
Instance details

Defined in IHP.HSX.Attribute

Methods

applyAttribute :: Text -> Text -> Bool -> Html -> Html

ParamReader Bool Source #

Parses a boolean.

Html form checkboxes usually use on or off for representation. These values are supported here.

Instance details

Defined in IHP.Controller.Param

EnvVarReader Bool Source # 
Instance details

Defined in IHP.EnvVar

InputValue Bool Source # 
Instance details

Defined in IHP.ModelSupport

Methods

inputValue :: Bool -> Text Source #

FromCInt Bool 
Instance details

Defined in Database.PostgreSQL.LibPQ.Enums

Methods

fromCInt :: CInt -> Maybe Bool

ToCInt Bool 
Instance details

Defined in Database.PostgreSQL.LibPQ.Enums

Methods

toCInt :: Bool -> CInt

FromField Bool 
Instance details

Defined in Database.PostgreSQL.Simple.FromField

Methods

fromField :: FieldParser Bool

ToField Bool 
Instance details

Defined in Database.PostgreSQL.Simple.ToField

Methods

toField :: Bool -> Action

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

Random Bool 
Instance details

Defined in System.Random.TF.Instances

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]

Unbox Bool 
Instance details

Defined in Data.Vector.Unboxed.Base

Boolean Bool 
Instance details

Defined in Text.XML.Cursor

Methods

bool :: Bool -> Bool

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 ()

SetField "disableJavascriptSubmission" (FormContext record) Bool Source # 
Instance details

Defined in IHP.View.Types

Methods

setField :: Bool -> FormContext record -> FormContext record Source #

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 ()

IsString (Text, Bool) Source #

Allows `("my-class", True)` to be written as `"my-class"`

Useful together with classes

Instance details

Defined in IHP.View.Classes

Methods

fromString :: String -> (Text, Bool) #

Example (a -> Bool) 
Instance details

Defined in Test.Hspec.Core.Example

Associated Types

type Arg (a -> Bool) 
Instance details

Defined in Test.Hspec.Core.Example

type Arg (a -> Bool) = a

Methods

evaluateExample :: (a -> Bool) -> Params -> (ActionWith (Arg (a -> Bool)) -> IO ()) -> ProgressCallback -> IO Result

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
type Anno Bool 
Instance details

Defined in GHC.Hs.Decls

type Anno Bool = SrcAnn NoEpAnns
type Arg Bool 
Instance details

Defined in Test.Hspec.Core.Example

type Arg Bool = ()
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)
type Arg (a -> Bool) 
Instance details

Defined in Test.Hspec.Core.Example

type Arg (a -> Bool) = a

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 ProgramSearchPathEntry 
Instance details

Defined in Distribution.Simple.Program.Find

Methods

(==) :: ProgramSearchPathEntry -> ProgramSearchPathEntry -> Bool #

(/=) :: ProgramSearchPathEntry -> ProgramSearchPathEntry -> 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 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

Methods

(==) :: ModuleName -> ModuleName -> Bool #

(/=) :: ModuleName -> ModuleName -> Bool #

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

Methods

(==) :: FlagName -> FlagName -> Bool #

(/=) :: FlagName -> FlagName -> Bool #

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

Methods

(==) :: LibraryName -> LibraryName -> Bool #

(/=) :: LibraryName -> LibraryName -> Bool #

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

Methods

(==) :: MungedPackageId -> MungedPackageId -> Bool #

(/=) :: MungedPackageId -> MungedPackageId -> Bool #

Eq MungedPackageName 
Instance details

Defined in Distribution.Types.MungedPackageName

Methods

(==) :: MungedPackageName -> MungedPackageName -> Bool #

(/=) :: MungedPackageName -> MungedPackageName -> Bool #

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

Methods

(==) :: PackageIdentifier -> PackageIdentifier -> Bool #

(/=) :: PackageIdentifier -> PackageIdentifier -> Bool #

Eq PackageName 
Instance details

Defined in Distribution.Types.PackageName

Methods

(==) :: PackageName -> PackageName -> Bool #

(/=) :: PackageName -> PackageName -> Bool #

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

Methods

(==) :: VersionRange -> VersionRange -> Bool #

(/=) :: VersionRange -> VersionRange -> Bool #

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 Counts 
Instance details

Defined in Test.HUnit.Base

Methods

(==) :: Counts -> Counts -> Bool #

(/=) :: Counts -> Counts -> Bool #

Eq Node 
Instance details

Defined in Test.HUnit.Base

Methods

(==) :: Node -> Node -> Bool #

(/=) :: Node -> Node -> Bool #

Eq State 
Instance details

Defined in Test.HUnit.Base

Methods

(==) :: State -> State -> Bool #

(/=) :: State -> State -> Bool #

Eq FailureReason 
Instance details

Defined in Test.HUnit.Lang

Methods

(==) :: FailureReason -> FailureReason -> Bool #

(/=) :: FailureReason -> FailureReason -> Bool #

Eq HUnitFailure 
Instance details

Defined in Test.HUnit.Lang

Methods

(==) :: HUnitFailure -> HUnitFailure -> Bool #

(/=) :: HUnitFailure -> HUnitFailure -> Bool #

Eq Result 
Instance details

Defined in Test.HUnit.Lang

Methods

(==) :: Result -> Result -> Bool #

(/=) :: Result -> Result -> Bool #

Eq Shrunk 
Instance details

Defined in Test.QuickCheck.Function

Methods

(==) :: Shrunk -> Shrunk -> Bool #

(/=) :: Shrunk -> Shrunk -> Bool #

Eq ASCIIString 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(==) :: ASCIIString -> ASCIIString -> Bool #

(/=) :: ASCIIString -> ASCIIString -> Bool #

Eq PrintableString 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(==) :: PrintableString -> PrintableString -> Bool #

(/=) :: PrintableString -> PrintableString -> Bool #

Eq UnicodeString 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(==) :: UnicodeString -> UnicodeString -> Bool #

(/=) :: UnicodeString -> UnicodeString -> Bool #

Eq A 
Instance details

Defined in Test.QuickCheck.Poly

Methods

(==) :: A -> A -> Bool #

(/=) :: A -> A -> Bool #

Eq B 
Instance details

Defined in Test.QuickCheck.Poly

Methods

(==) :: B -> B -> Bool #

(/=) :: B -> B -> Bool #

Eq C 
Instance details

Defined in Test.QuickCheck.Poly

Methods

(==) :: C -> C -> Bool #

(/=) :: C -> C -> Bool #

Eq OrdA 
Instance details

Defined in Test.QuickCheck.Poly

Methods

(==) :: OrdA -> OrdA -> Bool #

(/=) :: OrdA -> OrdA -> Bool #

Eq OrdB 
Instance details

Defined in Test.QuickCheck.Poly

Methods

(==) :: OrdB -> OrdB -> Bool #

(/=) :: OrdB -> OrdB -> Bool #

Eq OrdC 
Instance details

Defined in Test.QuickCheck.Poly

Methods

(==) :: OrdC -> OrdC -> Bool #

(/=) :: OrdC -> OrdC -> Bool #

Eq RSAError 
Instance details

Defined in Codec.Crypto.RSA.Pure

Methods

(==) :: RSAError -> RSAError -> Bool #

(/=) :: RSAError -> RSAError -> 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

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

Eq Value 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

(==) :: Value -> Value -> Bool #

(/=) :: Value -> Value -> Bool #

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 ASN1Error 
Instance details

Defined in Data.ASN1.Error

Methods

(==) :: ASN1Error -> ASN1Error -> Bool #

(/=) :: ASN1Error -> ASN1Error -> Bool #

Eq BitArray 
Instance details

Defined in Data.ASN1.BitArray

Methods

(==) :: BitArray -> BitArray -> Bool #

(/=) :: BitArray -> BitArray -> Bool #

Eq BitArrayOutOfBound 
Instance details

Defined in Data.ASN1.BitArray

Methods

(==) :: BitArrayOutOfBound -> BitArrayOutOfBound -> Bool #

(/=) :: BitArrayOutOfBound -> BitArrayOutOfBound -> Bool #

Eq PrettyType 
Instance details

Defined in Data.ASN1.Pretty

Methods

(==) :: PrettyType -> PrettyType -> Bool #

(/=) :: PrettyType -> PrettyType -> Bool #

Eq ASN1 
Instance details

Defined in Data.ASN1.Types

Methods

(==) :: ASN1 -> ASN1 -> Bool #

(/=) :: ASN1 -> ASN1 -> Bool #

Eq ASN1ConstructionType 
Instance details

Defined in Data.ASN1.Types

Methods

(==) :: ASN1ConstructionType -> ASN1ConstructionType -> Bool #

(/=) :: ASN1ConstructionType -> ASN1ConstructionType -> Bool #

Eq ASN1TimeType 
Instance details

Defined in Data.ASN1.Types

Methods

(==) :: ASN1TimeType -> ASN1TimeType -> Bool #

(/=) :: ASN1TimeType -> ASN1TimeType -> Bool #

Eq ASN1Class 
Instance details

Defined in Data.ASN1.Types.Lowlevel

Methods

(==) :: ASN1Class -> ASN1Class -> Bool #

(/=) :: ASN1Class -> ASN1Class -> Bool #

Eq ASN1Event 
Instance details

Defined in Data.ASN1.Types.Lowlevel

Methods

(==) :: ASN1Event -> ASN1Event -> Bool #

(/=) :: ASN1Event -> ASN1Event -> Bool #

Eq ASN1Header 
Instance details

Defined in Data.ASN1.Types.Lowlevel

Methods

(==) :: ASN1Header -> ASN1Header -> Bool #

(/=) :: ASN1Header -> ASN1Header -> Bool #

Eq ASN1Length 
Instance details

Defined in Data.ASN1.Types.Lowlevel

Methods

(==) :: ASN1Length -> ASN1Length -> Bool #

(/=) :: ASN1Length -> ASN1Length -> Bool #

Eq ASN1CharacterString 
Instance details

Defined in Data.ASN1.Types.String

Methods

(==) :: ASN1CharacterString -> ASN1CharacterString -> Bool #

(/=) :: ASN1CharacterString -> ASN1CharacterString -> Bool #

Eq ASN1StringEncoding 
Instance details

Defined in Data.ASN1.Types.String

Methods

(==) :: ASN1StringEncoding -> ASN1StringEncoding -> Bool #

(/=) :: ASN1StringEncoding -> ASN1StringEncoding -> 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 Credential 
Instance details

Defined in Web.Authenticate.OAuth

Methods

(==) :: Credential -> Credential -> Bool #

(/=) :: Credential -> Credential -> Bool #

Eq OAuth 
Instance details

Defined in Web.Authenticate.OAuth

Methods

(==) :: OAuth -> OAuth -> Bool #

(/=) :: OAuth -> OAuth -> Bool #

Eq OAuthException 
Instance details

Defined in Web.Authenticate.OAuth

Methods

(==) :: OAuthException -> OAuthException -> Bool #

(/=) :: OAuthException -> OAuthException -> Bool #

Eq OAuthVersion 
Instance details

Defined in Web.Authenticate.OAuth

Methods

(==) :: OAuthVersion -> OAuthVersion -> Bool #

(/=) :: OAuthVersion -> OAuthVersion -> Bool #

Eq SignMethod 
Instance details

Defined in Web.Authenticate.OAuth

Methods

(==) :: SignMethod -> SignMethod -> Bool #

(/=) :: SignMethod -> SignMethod -> Bool #

Eq DebounceEdge 
Instance details

Defined in Control.Debounce.Internal

Methods

(==) :: DebounceEdge -> DebounceEdge -> Bool #

(/=) :: DebounceEdge -> DebounceEdge -> 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

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

Methods

(==) :: ThreadId -> ThreadId -> Bool #

(/=) :: ThreadId -> ThreadId -> Bool #

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

Methods

(==) :: ExitCode -> ExitCode -> Bool #

(/=) :: ExitCode -> ExitCode -> Bool #

Eq IOErrorType 
Instance details

Defined in GHC.IO.Exception

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 PinnedStatus 
Instance details

Defined in Basement.Compat.Primitive

Methods

(==) :: PinnedStatus -> PinnedStatus -> Bool #

(/=) :: PinnedStatus -> PinnedStatus -> Bool #

Eq Endianness 
Instance details

Defined in Basement.Endianness

Methods

(==) :: Endianness -> Endianness -> Bool #

(/=) :: Endianness -> Endianness -> Bool #

Eq OutOfBoundOperation 
Instance details

Defined in Basement.Exception

Methods

(==) :: OutOfBoundOperation -> OutOfBoundOperation -> Bool #

(/=) :: OutOfBoundOperation -> OutOfBoundOperation -> Bool #

Eq RecastDestinationSize 
Instance details

Defined in Basement.Exception

Methods

(==) :: RecastDestinationSize -> RecastDestinationSize -> Bool #

(/=) :: RecastDestinationSize -> RecastDestinationSize -> Bool #

Eq RecastSourceSize 
Instance details

Defined in Basement.Exception

Methods

(==) :: RecastSourceSize -> RecastSourceSize -> Bool #

(/=) :: RecastSourceSize -> RecastSourceSize -> 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 AsciiString 
Instance details

Defined in Basement.Types.AsciiString

Methods

(==) :: AsciiString -> AsciiString -> Bool #

(/=) :: AsciiString -> AsciiString -> Bool #

Eq Char7 
Instance details

Defined in Basement.Types.Char7

Methods

(==) :: Char7 -> Char7 -> Bool #

(/=) :: Char7 -> Char7 -> Bool #

Eq FileSize 
Instance details

Defined in Basement.Types.OffsetSize

Methods

(==) :: FileSize -> FileSize -> Bool #

(/=) :: FileSize -> FileSize -> Bool #

Eq Addr 
Instance details

Defined in Basement.Types.Ptr

Methods

(==) :: Addr -> Addr -> Bool #

(/=) :: Addr -> Addr -> Bool #

Eq Word128 
Instance details

Defined in Basement.Types.Word128

Methods

(==) :: Word128 -> Word128 -> Bool #

(/=) :: Word128 -> Word128 -> Bool #

Eq Word256 
Instance details

Defined in Basement.Types.Word256

Methods

(==) :: Word256 -> Word256 -> Bool #

(/=) :: Word256 -> Word256 -> Bool #

Eq String 
Instance details

Defined in Basement.UTF8.Base

Methods

(==) :: String -> String -> Bool #

(/=) :: String -> String -> Bool #

Eq BiFun 
Instance details

Defined in Data.Bifunctor.TH

Methods

(==) :: BiFun -> BiFun -> Bool #

(/=) :: BiFun -> BiFun -> Bool #

Eq Options 
Instance details

Defined in Data.Bifunctor.TH

Methods

(==) :: Options -> Options -> Bool #

(/=) :: Options -> Options -> Bool #

Eq ByteOrder 
Instance details

Defined in System.ByteOrder

Methods

(==) :: ByteOrder -> ByteOrder -> Bool #

(/=) :: ByteOrder -> ByteOrder -> Bool #

Eq Chunks 
Instance details

Defined in Data.Bytes.Chunks

Methods

(==) :: Chunks -> Chunks -> Bool #

(/=) :: Chunks -> Chunks -> Bool #

Eq Bytes 
Instance details

Defined in Data.Bytes.Internal

Methods

(==) :: Bytes -> Bytes -> Bool #

(/=) :: Bytes -> Bytes -> Bool #

Eq Builder Source #

Need for the 'Eq QueryBuilder' instance

You likely wonder: Why do we need the 'Eq SQLQuery' instance if this causes so much trouble? This has to do with how has-many and belongs-to relations are models by the SchemaCompiler

E.g. given a table users and a table posts. Each Post belongs to a user. The schema compiler will add a field 'posts :: QueryBuilder "posts"' with the default value query |> filterWhere (#userId, self.id) to all users by default.

This is needed to support syntax like this:

fetch user.posts
Instance details

Defined in IHP.QueryBuilder

Methods

(==) :: Builder -> Builder -> Bool #

(/=) :: Builder -> Builder -> 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

Methods

(==) :: ShortByteString -> ShortByteString -> Bool #

(/=) :: ShortByteString -> ShortByteString -> Bool #

Eq More 
Instance details

Defined in Data.Serialize.Get

Methods

(==) :: More -> More -> Bool #

(/=) :: More -> More -> Bool #

Eq IV 
Instance details

Defined in Web.ClientSession

Methods

(==) :: IV -> IV -> Bool #

(/=) :: IV -> IV -> Bool #

Eq Key 
Instance details

Defined in Web.ClientSession

Methods

(==) :: Key -> Key -> Bool #

(/=) :: Key -> Key -> 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 SameSiteOption 
Instance details

Defined in Web.Cookie

Methods

(==) :: SameSiteOption -> SameSiteOption -> Bool #

(/=) :: SameSiteOption -> SameSiteOption -> Bool #

Eq SetCookie 
Instance details

Defined in Web.Cookie

Methods

(==) :: SetCookie -> SetCookie -> Bool #

(/=) :: SetCookie -> SetCookie -> Bool #

Eq CipherError 
Instance details

Defined in Crypto.Classes.Exceptions

Methods

(==) :: CipherError -> CipherError -> Bool #

(/=) :: CipherError -> CipherError -> Bool #

Eq GenError 
Instance details

Defined in Crypto.Random

Methods

(==) :: GenError -> GenError -> Bool #

(/=) :: GenError -> GenError -> Bool #

Eq ReseedInfo 
Instance details

Defined in Crypto.Random

Methods

(==) :: ReseedInfo -> ReseedInfo -> Bool #

(/=) :: ReseedInfo -> ReseedInfo -> Bool #

Eq BlockCipherError 
Instance details

Defined in Crypto.Types

Methods

(==) :: BlockCipherError -> BlockCipherError -> Bool #

(/=) :: BlockCipherError -> BlockCipherError -> Bool #

Eq Params 
Instance details

Defined in Crypto.Types.PubKey.DH

Methods

(==) :: Params -> Params -> Bool #

(/=) :: Params -> Params -> Bool #

Eq PrivateNumber 
Instance details

Defined in Crypto.Types.PubKey.DH

Methods

(==) :: PrivateNumber -> PrivateNumber -> Bool #

(/=) :: PrivateNumber -> PrivateNumber -> Bool #

Eq PublicNumber 
Instance details

Defined in Crypto.Types.PubKey.DH

Methods

(==) :: PublicNumber -> PublicNumber -> Bool #

(/=) :: PublicNumber -> PublicNumber -> Bool #

Eq SharedKey 
Instance details

Defined in Crypto.Types.PubKey.DH

Methods

(==) :: SharedKey -> SharedKey -> Bool #

(/=) :: SharedKey -> SharedKey -> Bool #

Eq KeyPair 
Instance details

Defined in Crypto.Types.PubKey.DSA

Methods

(==) :: KeyPair -> KeyPair -> Bool #

(/=) :: KeyPair -> KeyPair -> Bool #

Eq Params 
Instance details

Defined in Crypto.Types.PubKey.DSA

Methods

(==) :: Params -> Params -> Bool #

(/=) :: Params -> Params -> Bool #

Eq PrivateKey 
Instance details

Defined in Crypto.Types.PubKey.DSA

Methods

(==) :: PrivateKey -> PrivateKey -> Bool #

(/=) :: PrivateKey -> PrivateKey -> Bool #

Eq PublicKey 
Instance details

Defined in Crypto.Types.PubKey.DSA

Methods

(==) :: PublicKey -> PublicKey -> Bool #

(/=) :: PublicKey -> PublicKey -> Bool #

Eq Signature 
Instance details

Defined in Crypto.Types.PubKey.DSA

Methods

(==) :: Signature -> Signature -> Bool #

(/=) :: Signature -> Signature -> Bool #

Eq Curve 
Instance details

Defined in Crypto.Types.PubKey.ECC

Methods

(==) :: Curve -> Curve -> Bool #

(/=) :: Curve -> Curve -> Bool #

Eq CurveBinary 
Instance details

Defined in Crypto.Types.PubKey.ECC

Methods

(==) :: CurveBinary -> CurveBinary -> Bool #

(/=) :: CurveBinary -> CurveBinary -> Bool #

Eq CurveCommon 
Instance details

Defined in Crypto.Types.PubKey.ECC

Methods

(==) :: CurveCommon -> CurveCommon -> Bool #

(/=) :: CurveCommon -> CurveCommon -> Bool #

Eq CurveName 
Instance details

Defined in Crypto.Types.PubKey.ECC

Methods

(==) :: CurveName -> CurveName -> Bool #

(/=) :: CurveName -> CurveName -> Bool #

Eq CurvePrime 
Instance details

Defined in Crypto.Types.PubKey.ECC

Methods

(==) :: CurvePrime -> CurvePrime -> Bool #

(/=) :: CurvePrime -> CurvePrime -> Bool #

Eq Point 
Instance details

Defined in Crypto.Types.PubKey.ECC

Methods

(==) :: Point -> Point -> Bool #

(/=) :: Point -> Point -> Bool #

Eq KeyPair 
Instance details

Defined in Crypto.Types.PubKey.ECDSA

Methods

(==) :: KeyPair -> KeyPair -> Bool #

(/=) :: KeyPair -> KeyPair -> Bool #

Eq PrivateKey 
Instance details

Defined in Crypto.Types.PubKey.ECDSA

Methods

(==) :: PrivateKey -> PrivateKey -> Bool #

(/=) :: PrivateKey -> PrivateKey -> Bool #

Eq PublicKey 
Instance details

Defined in Crypto.Types.PubKey.ECDSA

Methods

(==) :: PublicKey -> PublicKey -> Bool #

(/=) :: PublicKey -> PublicKey -> Bool #

Eq Signature 
Instance details

Defined in Crypto.Types.PubKey.ECDSA

Methods

(==) :: Signature -> Signature -> Bool #

(/=) :: Signature -> Signature -> Bool #

Eq KeyPair 
Instance details

Defined in Crypto.Types.PubKey.RSA

Methods

(==) :: KeyPair -> KeyPair -> Bool #

(/=) :: KeyPair -> KeyPair -> Bool #

Eq PrivateKey 
Instance details

Defined in Crypto.Types.PubKey.RSA

Methods

(==) :: PrivateKey -> PrivateKey -> Bool #

(/=) :: PrivateKey -> PrivateKey -> Bool #

Eq PublicKey 
Instance details

Defined in Crypto.Types.PubKey.RSA

Methods

(==) :: PublicKey -> PublicKey -> Bool #

(/=) :: PublicKey -> PublicKey -> Bool #

Eq MAC224 
Instance details

Defined in Crypto.MAC.SHA3

Methods

(==) :: MAC224 -> MAC224 -> Bool #

(/=) :: MAC224 -> MAC224 -> Bool #

Eq MAC256 
Instance details

Defined in Crypto.MAC.SHA3

Methods

(==) :: MAC256 -> MAC256 -> Bool #

(/=) :: MAC256 -> MAC256 -> Bool #

Eq MAC384 
Instance details

Defined in Crypto.MAC.SHA3

Methods

(==) :: MAC384 -> MAC384 -> Bool #

(/=) :: MAC384 -> MAC384 -> Bool #

Eq MAC512 
Instance details

Defined in Crypto.MAC.SHA3

Methods

(==) :: MAC512 -> MAC512 -> Bool #

(/=) :: MAC512 -> MAC512 -> 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 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 FailedReason 
Instance details

Defined in Data.X509.Validation

Methods

(==) :: FailedReason -> FailedReason -> Bool #

(/=) :: FailedReason -> FailedReason -> Bool #

Eq ValidationChecks 
Instance details

Defined in Data.X509.Validation

Methods

(==) :: ValidationChecks -> ValidationChecks -> Bool #

(/=) :: ValidationChecks -> ValidationChecks -> 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 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 LogStr 
Instance details

Defined in System.Log.FastLogger.LogStr

Methods

(==) :: LogStr -> LogStr -> Bool #

(/=) :: LogStr -> LogStr -> Bool #

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 UniqueSet 
Instance details

Defined in GHC.Cmm.Dataflow.Collections

Methods

(==) :: UniqueSet -> UniqueSet -> Bool #

(/=) :: UniqueSet -> UniqueSet -> Bool #

Eq Label 
Instance details

Defined in GHC.Cmm.Dataflow.Label

Methods

(==) :: Label -> Label -> Bool #

(/=) :: Label -> Label -> Bool #

Eq LabelSet 
Instance details

Defined in GHC.Cmm.Dataflow.Label

Methods

(==) :: LabelSet -> LabelSet -> Bool #

(/=) :: LabelSet -> LabelSet -> Bool #

Eq ExtMode 
Instance details

Defined in GHC.CmmToAsm.AArch64.Instr

Methods

(==) :: ExtMode -> ExtMode -> Bool #

(/=) :: ExtMode -> ExtMode -> Bool #

Eq Operand 
Instance details

Defined in GHC.CmmToAsm.AArch64.Instr

Methods

(==) :: Operand -> Operand -> Bool #

(/=) :: Operand -> Operand -> Bool #

Eq ShiftMode 
Instance details

Defined in GHC.CmmToAsm.AArch64.Instr

Methods

(==) :: ShiftMode -> ShiftMode -> Bool #

(/=) :: ShiftMode -> ShiftMode -> Bool #

Eq Target 
Instance details

Defined in GHC.CmmToAsm.AArch64.Instr

Methods

(==) :: Target -> Target -> Bool #

(/=) :: Target -> Target -> Bool #

Eq AltCon 
Instance details

Defined in GHC.Core

Methods

(==) :: AltCon -> AltCon -> Bool #

(/=) :: AltCon -> AltCon -> Bool #

Eq UnfoldingCache 
Instance details

Defined in GHC.Core

Methods

(==) :: UnfoldingCache -> UnfoldingCache -> Bool #

(/=) :: UnfoldingCache -> UnfoldingCache -> Bool #

Eq UnfoldingGuidance 
Instance details

Defined in GHC.Core

Methods

(==) :: UnfoldingGuidance -> UnfoldingGuidance -> Bool #

(/=) :: UnfoldingGuidance -> UnfoldingGuidance -> Bool #

Eq Class 
Instance details

Defined in GHC.Core.Class

Methods

(==) :: Class -> Class -> Bool #

(/=) :: Class -> Class -> Bool #

Eq CoAxiomRule 
Instance details

Defined in GHC.Core.Coercion.Axiom

Methods

(==) :: CoAxiomRule -> CoAxiomRule -> Bool #

(/=) :: CoAxiomRule -> CoAxiomRule -> Bool #

Eq ConLike 
Instance details

Defined in GHC.Core.ConLike

Methods

(==) :: ConLike -> ConLike -> Bool #

(/=) :: ConLike -> ConLike -> Bool #

Eq DataCon 
Instance details

Defined in GHC.Core.DataCon

Methods

(==) :: DataCon -> DataCon -> Bool #

(/=) :: DataCon -> DataCon -> Bool #

Eq StrictnessMark 
Instance details

Defined in GHC.Core.DataCon

Methods

(==) :: StrictnessMark -> StrictnessMark -> Bool #

(/=) :: StrictnessMark -> StrictnessMark -> Bool #

Eq CoSel 
Instance details

Defined in GHC.Core.TyCo.Rep

Methods

(==) :: CoSel -> CoSel -> Bool #

(/=) :: CoSel -> CoSel -> Bool #

Eq FunSel 
Instance details

Defined in GHC.Core.TyCo.Rep

Methods

(==) :: FunSel -> FunSel -> Bool #

(/=) :: FunSel -> FunSel -> Bool #

Eq TyLit 
Instance details

Defined in GHC.Core.TyCo.Rep

Methods

(==) :: TyLit -> TyLit -> Bool #

(/=) :: TyLit -> TyLit -> Bool #

Eq Injectivity 
Instance details

Defined in GHC.Core.TyCon

Methods

(==) :: Injectivity -> Injectivity -> Bool #

(/=) :: Injectivity -> Injectivity -> Bool #

Eq PrimElemRep 
Instance details

Defined in GHC.Core.TyCon

Methods

(==) :: PrimElemRep -> PrimElemRep -> Bool #

(/=) :: PrimElemRep -> PrimElemRep -> Bool #

Eq PrimRep 
Instance details

Defined in GHC.Core.TyCon

Methods

(==) :: PrimRep -> PrimRep -> Bool #

(/=) :: PrimRep -> PrimRep -> Bool #

Eq TyCon 
Instance details

Defined in GHC.Core.TyCon

Methods

(==) :: TyCon -> TyCon -> Bool #

(/=) :: TyCon -> TyCon -> Bool #

Eq FastString 
Instance details

Defined in GHC.Data.FastString

Methods

(==) :: FastString -> FastString -> Bool #

(/=) :: FastString -> FastString -> Bool #

Eq LexicalFastString 
Instance details

Defined in GHC.Data.FastString

Methods

(==) :: LexicalFastString -> LexicalFastString -> Bool #

(/=) :: LexicalFastString -> LexicalFastString -> Bool #

Eq NonDetFastString 
Instance details

Defined in GHC.Data.FastString

Methods

(==) :: NonDetFastString -> NonDetFastString -> Bool #

(/=) :: NonDetFastString -> NonDetFastString -> Bool #

Eq CompilerInfo 
Instance details

Defined in GHC.Driver.DynFlags

Methods

(==) :: CompilerInfo -> CompilerInfo -> Bool #

(/=) :: CompilerInfo -> CompilerInfo -> Bool #

Eq DynLibLoader 
Instance details

Defined in GHC.Driver.DynFlags

Methods

(==) :: DynLibLoader -> DynLibLoader -> Bool #

(/=) :: DynLibLoader -> DynLibLoader -> Bool #

Eq DynamicTooState 
Instance details

Defined in GHC.Driver.DynFlags

Methods

(==) :: DynamicTooState -> DynamicTooState -> Bool #

(/=) :: DynamicTooState -> DynamicTooState -> Bool #

Eq GhcLink 
Instance details

Defined in GHC.Driver.DynFlags

Methods

(==) :: GhcLink -> GhcLink -> Bool #

(/=) :: GhcLink -> GhcLink -> Bool #

Eq GhcMode 
Instance details

Defined in GHC.Driver.DynFlags

Methods

(==) :: GhcMode -> GhcMode -> Bool #

(/=) :: GhcMode -> GhcMode -> Bool #

Eq IgnorePackageFlag 
Instance details

Defined in GHC.Driver.DynFlags

Methods

(==) :: IgnorePackageFlag -> IgnorePackageFlag -> Bool #

(/=) :: IgnorePackageFlag -> IgnorePackageFlag -> Bool #

Eq LinkerInfo 
Instance details

Defined in GHC.Driver.DynFlags

Methods

(==) :: LinkerInfo -> LinkerInfo -> Bool #

(/=) :: LinkerInfo -> LinkerInfo -> Bool #

Eq ModRenaming 
Instance details

Defined in GHC.Driver.DynFlags

Methods

(==) :: ModRenaming -> ModRenaming -> Bool #

(/=) :: ModRenaming -> ModRenaming -> Bool #

Eq PackageArg 
Instance details

Defined in GHC.Driver.DynFlags

Methods

(==) :: PackageArg -> PackageArg -> Bool #

(/=) :: PackageArg -> PackageArg -> Bool #

Eq PackageDBFlag 
Instance details

Defined in GHC.Driver.DynFlags

Methods

(==) :: PackageDBFlag -> PackageDBFlag -> Bool #

(/=) :: PackageDBFlag -> PackageDBFlag -> Bool #

Eq PackageFlag 
Instance details

Defined in GHC.Driver.DynFlags

Methods

(==) :: PackageFlag -> PackageFlag -> Bool #

(/=) :: PackageFlag -> PackageFlag -> Bool #

Eq PkgDbRef 
Instance details

Defined in GHC.Driver.DynFlags

Methods

(==) :: PkgDbRef -> PkgDbRef -> Bool #

(/=) :: PkgDbRef -> PkgDbRef -> Bool #

Eq TrustFlag 
Instance details

Defined in GHC.Driver.DynFlags

Methods

(==) :: TrustFlag -> TrustFlag -> Bool #

(/=) :: TrustFlag -> TrustFlag -> Bool #

Eq AnnsModule 
Instance details

Defined in GHC.Hs

Methods

(==) :: AnnsModule -> AnnsModule -> Bool #

(/=) :: AnnsModule -> AnnsModule -> Bool #

Eq HsRuleAnn 
Instance details

Defined in GHC.Hs.Decls

Methods

(==) :: HsRuleAnn -> HsRuleAnn -> Bool #

(/=) :: HsRuleAnn -> HsRuleAnn -> Bool #

Eq BotInfo 
Instance details

Defined in GHC.HsToCore.Pmc.Solver.Types

Methods

(==) :: BotInfo -> BotInfo -> Bool #

(/=) :: BotInfo -> BotInfo -> Bool #

Eq PmAltCon 
Instance details

Defined in GHC.HsToCore.Pmc.Solver.Types

Methods

(==) :: PmAltCon -> PmAltCon -> Bool #

(/=) :: PmAltCon -> PmAltCon -> Bool #

Eq PmEquality 
Instance details

Defined in GHC.HsToCore.Pmc.Solver.Types

Methods

(==) :: PmEquality -> PmEquality -> Bool #

(/=) :: PmEquality -> PmEquality -> Bool #

Eq PmLit 
Instance details

Defined in GHC.HsToCore.Pmc.Solver.Types

Methods

(==) :: PmLit -> PmLit -> Bool #

(/=) :: PmLit -> PmLit -> Bool #

Eq BuildingCabalPackage 
Instance details

Defined in GHC.Iface.Errors.Types

Methods

(==) :: BuildingCabalPackage -> BuildingCabalPackage -> Bool #

(/=) :: BuildingCabalPackage -> BuildingCabalPackage -> Bool #

Eq AOp 
Instance details

Defined in GHC.JS.Syntax

Methods

(==) :: AOp -> AOp -> Bool #

(/=) :: AOp -> AOp -> Bool #

Eq JExpr 
Instance details

Defined in GHC.JS.Syntax

Methods

(==) :: JExpr -> JExpr -> Bool #

(/=) :: JExpr -> JExpr -> Bool #

Eq JStat 
Instance details

Defined in GHC.JS.Syntax

Methods

(==) :: JStat -> JStat -> Bool #

(/=) :: JStat -> JStat -> Bool #

Eq JVal 
Instance details

Defined in GHC.JS.Syntax

Methods

(==) :: JVal -> JVal -> Bool #

(/=) :: JVal -> JVal -> Bool #

Eq Op 
Instance details

Defined in GHC.JS.Syntax

Methods

(==) :: Op -> Op -> Bool #

(/=) :: Op -> Op -> Bool #

Eq UOp 
Instance details

Defined in GHC.JS.Syntax

Methods

(==) :: UOp -> UOp -> Bool #

(/=) :: UOp -> UOp -> Bool #

Eq Ident 
Instance details

Defined in GHC.JS.Unsat.Syntax

Methods

(==) :: Ident -> Ident -> Bool #

(/=) :: Ident -> Ident -> Bool #

Eq JExpr 
Instance details

Defined in GHC.JS.Unsat.Syntax

Methods

(==) :: JExpr -> JExpr -> Bool #

(/=) :: JExpr -> JExpr -> Bool #

Eq JOp 
Instance details

Defined in GHC.JS.Unsat.Syntax

Methods

(==) :: JOp -> JOp -> Bool #

(/=) :: JOp -> JOp -> Bool #

Eq JStat 
Instance details

Defined in GHC.JS.Unsat.Syntax

Methods

(==) :: JStat -> JStat -> Bool #

(/=) :: JStat -> JStat -> Bool #

Eq JUOp 
Instance details

Defined in GHC.JS.Unsat.Syntax

Methods

(==) :: JUOp -> JUOp -> Bool #

(/=) :: JUOp -> JUOp -> Bool #

Eq JVal 
Instance details

Defined in GHC.JS.Unsat.Syntax

Methods

(==) :: JVal -> JVal -> Bool #

(/=) :: JVal -> JVal -> Bool #

Eq AddEpAnn 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: AddEpAnn -> AddEpAnn -> Bool #

(/=) :: AddEpAnn -> AddEpAnn -> Bool #

Eq Anchor 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: Anchor -> Anchor -> Bool #

(/=) :: Anchor -> Anchor -> Bool #

Eq AnchorOperation 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: AnchorOperation -> AnchorOperation -> Bool #

(/=) :: AnchorOperation -> AnchorOperation -> Bool #

Eq AnnKeywordId 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: AnnKeywordId -> AnnKeywordId -> Bool #

(/=) :: AnnKeywordId -> AnnKeywordId -> Bool #

Eq AnnList 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: AnnList -> AnnList -> Bool #

(/=) :: AnnList -> AnnList -> Bool #

Eq AnnListItem 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: AnnListItem -> AnnListItem -> Bool #

(/=) :: AnnListItem -> AnnListItem -> Bool #

Eq AnnPragma 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: AnnPragma -> AnnPragma -> Bool #

(/=) :: AnnPragma -> AnnPragma -> Bool #

Eq AnnSortKey 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: AnnSortKey -> AnnSortKey -> Bool #

(/=) :: AnnSortKey -> AnnSortKey -> Bool #

Eq DeltaPos 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: DeltaPos -> DeltaPos -> Bool #

(/=) :: DeltaPos -> DeltaPos -> Bool #

Eq EpAnnComments 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: EpAnnComments -> EpAnnComments -> Bool #

(/=) :: EpAnnComments -> EpAnnComments -> Bool #

Eq EpaComment 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: EpaComment -> EpaComment -> Bool #

(/=) :: EpaComment -> EpaComment -> Bool #

Eq EpaCommentTok 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: EpaCommentTok -> EpaCommentTok -> Bool #

(/=) :: EpaCommentTok -> EpaCommentTok -> Bool #

Eq EpaLocation 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: EpaLocation -> EpaLocation -> Bool #

(/=) :: EpaLocation -> EpaLocation -> Bool #

Eq HasE 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: HasE -> HasE -> Bool #

(/=) :: HasE -> HasE -> Bool #

Eq IsUnicodeSyntax 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: IsUnicodeSyntax -> IsUnicodeSyntax -> Bool #

(/=) :: IsUnicodeSyntax -> IsUnicodeSyntax -> Bool #

Eq NameAdornment 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: NameAdornment -> NameAdornment -> Bool #

(/=) :: NameAdornment -> NameAdornment -> Bool #

Eq NameAnn 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: NameAnn -> NameAnn -> Bool #

(/=) :: NameAnn -> NameAnn -> Bool #

Eq NoEpAnns 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: NoEpAnns -> NoEpAnns -> Bool #

(/=) :: NoEpAnns -> NoEpAnns -> Bool #

Eq ParenType 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: ParenType -> ParenType -> Bool #

(/=) :: ParenType -> ParenType -> Bool #

Eq TokenLocation 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: TokenLocation -> TokenLocation -> Bool #

(/=) :: TokenLocation -> TokenLocation -> Bool #

Eq TrailingAnn 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: TrailingAnn -> TrailingAnn -> Bool #

(/=) :: TrailingAnn -> TrailingAnn -> Bool #

Eq LexErrKind 
Instance details

Defined in GHC.Parser.Errors.Types

Methods

(==) :: LexErrKind -> LexErrKind -> Bool #

(/=) :: LexErrKind -> LexErrKind -> Bool #

Eq NumUnderscoreReason 
Instance details

Defined in GHC.Parser.Errors.Types

Methods

(==) :: NumUnderscoreReason -> NumUnderscoreReason -> Bool #

(/=) :: NumUnderscoreReason -> NumUnderscoreReason -> Bool #

Eq ParseContext 
Instance details

Defined in GHC.Parser.Errors.Types

Methods

(==) :: ParseContext -> ParseContext -> Bool #

(/=) :: ParseContext -> ParseContext -> Bool #

Eq PatIncompleteDoBlock 
Instance details

Defined in GHC.Parser.Errors.Types

Methods

(==) :: PatIncompleteDoBlock -> PatIncompleteDoBlock -> Bool #

(/=) :: PatIncompleteDoBlock -> PatIncompleteDoBlock -> Bool #

Eq NoExtFieldSilent 
Instance details

Defined in GHC.Stg.Syntax

Methods

(==) :: NoExtFieldSilent -> NoExtFieldSilent -> Bool #

(/=) :: NoExtFieldSilent -> NoExtFieldSilent -> Bool #

Eq BlockRef 
Instance details

Defined in GHC.StgToJS.Object

Methods

(==) :: BlockRef -> BlockRef -> Bool #

(/=) :: BlockRef -> BlockRef -> Bool #

Eq ExportedFun 
Instance details

Defined in GHC.StgToJS.Object

Methods

(==) :: ExportedFun -> ExportedFun -> Bool #

(/=) :: ExportedFun -> ExportedFun -> Bool #

Eq AssociatedTyLastVarInKind 
Instance details

Defined in GHC.Tc.Errors.Types

Methods

(==) :: AssociatedTyLastVarInKind -> AssociatedTyLastVarInKind -> Bool #

(/=) :: AssociatedTyLastVarInKind -> AssociatedTyLastVarInKind -> Bool #

Eq AssociatedTyNotParamOverLastTyVar 
Instance details

Defined in GHC.Tc.Errors.Types

Methods

(==) :: AssociatedTyNotParamOverLastTyVar -> AssociatedTyNotParamOverLastTyVar -> Bool #

(/=) :: AssociatedTyNotParamOverLastTyVar -> AssociatedTyNotParamOverLastTyVar -> Bool #

Eq DeriveAnyClassEnabled 
Instance details

Defined in GHC.Tc.Errors.Types

Methods

(==) :: DeriveAnyClassEnabled -> DeriveAnyClassEnabled -> Bool #

(/=) :: DeriveAnyClassEnabled -> DeriveAnyClassEnabled -> Bool #

Eq Exported 
Instance details

Defined in GHC.Tc.Errors.Types

Methods

(==) :: Exported -> Exported -> Bool #

(/=) :: Exported -> Exported -> Bool #

Eq HasAssociatedDataFamInsts 
Instance details

Defined in GHC.Tc.Errors.Types

Methods

(==) :: HasAssociatedDataFamInsts -> HasAssociatedDataFamInsts -> Bool #

(/=) :: HasAssociatedDataFamInsts -> HasAssociatedDataFamInsts -> Bool #

Eq HasKinds 
Instance details

Defined in GHC.Tc.Errors.Types

Methods

(==) :: HasKinds -> HasKinds -> Bool #

(/=) :: HasKinds -> HasKinds -> Bool #

Eq HasWildcard 
Instance details

Defined in GHC.Tc.Errors.Types

Methods

(==) :: HasWildcard -> HasWildcard -> Bool #

(/=) :: HasWildcard -> HasWildcard -> Bool #

Eq SuggestPartialTypeSignatures 
Instance details

Defined in GHC.Tc.Errors.Types

Methods

(==) :: SuggestPartialTypeSignatures -> SuggestPartialTypeSignatures -> Bool #

(/=) :: SuggestPartialTypeSignatures -> SuggestPartialTypeSignatures -> Bool #

Eq SuggestUndecidableInstances 
Instance details

Defined in GHC.Tc.Errors.Types

Methods

(==) :: SuggestUndecidableInstances -> SuggestUndecidableInstances -> Bool #

(/=) :: SuggestUndecidableInstances -> SuggestUndecidableInstances -> Bool #

Eq UnsupportedCallConvention 
Instance details

Defined in GHC.Tc.Errors.Types

Methods

(==) :: UnsupportedCallConvention -> UnsupportedCallConvention -> Bool #

(/=) :: UnsupportedCallConvention -> UnsupportedCallConvention -> Bool #

Eq UsingGeneralizedNewtypeDeriving 
Instance details

Defined in GHC.Tc.Errors.Types

Methods

(==) :: UsingGeneralizedNewtypeDeriving -> UsingGeneralizedNewtypeDeriving -> Bool #

(/=) :: UsingGeneralizedNewtypeDeriving -> UsingGeneralizedNewtypeDeriving -> Bool #

Eq CheckTyEqProblem 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

(==) :: CheckTyEqProblem -> CheckTyEqProblem -> Bool #

(/=) :: CheckTyEqProblem -> CheckTyEqProblem -> Bool #

Eq CtFlavour 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

(==) :: CtFlavour -> CtFlavour -> Bool #

(/=) :: CtFlavour -> CtFlavour -> Bool #

Eq HasGivenEqs 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

(==) :: HasGivenEqs -> HasGivenEqs -> Bool #

(/=) :: HasGivenEqs -> HasGivenEqs -> Bool #

Eq SubGoalDepth 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

(==) :: SubGoalDepth -> SubGoalDepth -> Bool #

(/=) :: SubGoalDepth -> SubGoalDepth -> Bool #

Eq ReportRedundantConstraints 
Instance details

Defined in GHC.Tc.Types.Origin

Methods

(==) :: ReportRedundantConstraints -> ReportRedundantConstraints -> Bool #

(/=) :: ReportRedundantConstraints -> ReportRedundantConstraints -> Bool #

Eq UserTypeCtxt 
Instance details

Defined in GHC.Tc.Types.Origin

Methods

(==) :: UserTypeCtxt -> UserTypeCtxt -> Bool #

(/=) :: UserTypeCtxt -> UserTypeCtxt -> Bool #

Eq TcLevel 
Instance details

Defined in GHC.Tc.Utils.TcType

Methods

(==) :: TcLevel -> TcLevel -> Bool #

(/=) :: TcLevel -> TcLevel -> Bool #

Eq Activation 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: Activation -> Activation -> Bool #

(/=) :: Activation -> Activation -> Bool #

Eq Alignment 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: Alignment -> Alignment -> Bool #

(/=) :: Alignment -> Alignment -> Bool #

Eq CbvMark 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: CbvMark -> CbvMark -> Bool #

(/=) :: CbvMark -> CbvMark -> Bool #

Eq CompilerPhase 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: CompilerPhase -> CompilerPhase -> Bool #

(/=) :: CompilerPhase -> CompilerPhase -> Bool #

Eq DoPmc 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: DoPmc -> DoPmc -> Bool #

(/=) :: DoPmc -> DoPmc -> Bool #

Eq FunctionOrData 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: FunctionOrData -> FunctionOrData -> Bool #

(/=) :: FunctionOrData -> FunctionOrData -> Bool #

Eq InlinePragma 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: InlinePragma -> InlinePragma -> Bool #

(/=) :: InlinePragma -> InlinePragma -> Bool #

Eq InlineSpec 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: InlineSpec -> InlineSpec -> Bool #

(/=) :: InlineSpec -> InlineSpec -> Bool #

Eq InsideLam 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: InsideLam -> InsideLam -> Bool #

(/=) :: InsideLam -> InsideLam -> Bool #

Eq IntWithInf 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: IntWithInf -> IntWithInf -> Bool #

(/=) :: IntWithInf -> IntWithInf -> Bool #

Eq InterestingCxt 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: InterestingCxt -> InterestingCxt -> Bool #

(/=) :: InterestingCxt -> InterestingCxt -> Bool #

Eq LeftOrRight 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: LeftOrRight -> LeftOrRight -> Bool #

(/=) :: LeftOrRight -> LeftOrRight -> Bool #

Eq Levity 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: Levity -> Levity -> Bool #

(/=) :: Levity -> Levity -> Bool #

Eq OccInfo 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: OccInfo -> OccInfo -> Bool #

(/=) :: OccInfo -> OccInfo -> Bool #

Eq OneShotInfo 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: OneShotInfo -> OneShotInfo -> Bool #

(/=) :: OneShotInfo -> OneShotInfo -> Bool #

Eq Origin 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: Origin -> Origin -> Bool #

(/=) :: Origin -> Origin -> Bool #

Eq OverlapFlag 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: OverlapFlag -> OverlapFlag -> Bool #

(/=) :: OverlapFlag -> OverlapFlag -> Bool #

Eq OverlapMode 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: OverlapMode -> OverlapMode -> Bool #

(/=) :: OverlapMode -> OverlapMode -> Bool #

Eq PprPrec 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: PprPrec -> PprPrec -> Bool #

(/=) :: PprPrec -> PprPrec -> Bool #

Eq RecFlag 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: RecFlag -> RecFlag -> Bool #

(/=) :: RecFlag -> RecFlag -> Bool #

Eq RuleMatchInfo 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: RuleMatchInfo -> RuleMatchInfo -> Bool #

(/=) :: RuleMatchInfo -> RuleMatchInfo -> Bool #

Eq TailCallInfo 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: TailCallInfo -> TailCallInfo -> Bool #

(/=) :: TailCallInfo -> TailCallInfo -> Bool #

Eq TupleSort 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: TupleSort -> TupleSort -> Bool #

(/=) :: TupleSort -> TupleSort -> Bool #

Eq TypeOrConstraint 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: TypeOrConstraint -> TypeOrConstraint -> Bool #

(/=) :: TypeOrConstraint -> TypeOrConstraint -> Bool #

Eq TypeOrData 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: TypeOrData -> TypeOrData -> Bool #

(/=) :: TypeOrData -> TypeOrData -> Bool #

Eq TypeOrKind 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: TypeOrKind -> TypeOrKind -> Bool #

(/=) :: TypeOrKind -> TypeOrKind -> Bool #

Eq UnboxedTupleOrSum 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: UnboxedTupleOrSum -> UnboxedTupleOrSum -> Bool #

(/=) :: UnboxedTupleOrSum -> UnboxedTupleOrSum -> Bool #

Eq DiagnosticReason 
Instance details

Defined in GHC.Types.Error

Methods

(==) :: DiagnosticReason -> DiagnosticReason -> Bool #

(/=) :: DiagnosticReason -> DiagnosticReason -> Bool #

Eq Severity 
Instance details

Defined in GHC.Types.Error

Methods

(==) :: Severity -> Severity -> Bool #

(/=) :: Severity -> Severity -> Bool #

Eq DuplicateRecordFields 
Instance details

Defined in GHC.Types.FieldLabel

Methods

(==) :: DuplicateRecordFields -> DuplicateRecordFields -> Bool #

(/=) :: DuplicateRecordFields -> DuplicateRecordFields -> Bool #

Eq FieldLabel 
Instance details

Defined in GHC.Types.FieldLabel

Methods

(==) :: FieldLabel -> FieldLabel -> Bool #

(/=) :: FieldLabel -> FieldLabel -> Bool #

Eq FieldSelectors 
Instance details

Defined in GHC.Types.FieldLabel

Methods

(==) :: FieldSelectors -> FieldSelectors -> Bool #

(/=) :: FieldSelectors -> FieldSelectors -> Bool #

Eq Fixity 
Instance details

Defined in GHC.Types.Fixity

Methods

(==) :: Fixity -> Fixity -> Bool #

(/=) :: Fixity -> Fixity -> Bool #

Eq FixityDirection 
Instance details

Defined in GHC.Types.Fixity

Methods

(==) :: FixityDirection -> FixityDirection -> Bool #

(/=) :: FixityDirection -> FixityDirection -> Bool #

Eq LexicalFixity 
Instance details

Defined in GHC.Types.Fixity

Methods

(==) :: LexicalFixity -> LexicalFixity -> Bool #

(/=) :: LexicalFixity -> LexicalFixity -> Bool #

Eq CCallConv 
Instance details

Defined in GHC.Types.ForeignCall

Methods

(==) :: CCallConv -> CCallConv -> Bool #

(/=) :: CCallConv -> CCallConv -> Bool #

Eq CCallSpec 
Instance details

Defined in GHC.Types.ForeignCall

Methods

(==) :: CCallSpec -> CCallSpec -> Bool #

(/=) :: CCallSpec -> CCallSpec -> Bool #

Eq CCallTarget 
Instance details

Defined in GHC.Types.ForeignCall

Methods

(==) :: CCallTarget -> CCallTarget -> Bool #

(/=) :: CCallTarget -> CCallTarget -> Bool #

Eq CType 
Instance details

Defined in GHC.Types.ForeignCall

Methods

(==) :: CType -> CType -> Bool #

(/=) :: CType -> CType -> Bool #

Eq ForeignCall 
Instance details

Defined in GHC.Types.ForeignCall

Methods

(==) :: ForeignCall -> ForeignCall -> Bool #

(/=) :: ForeignCall -> ForeignCall -> Bool #

Eq Header 
Instance details

Defined in GHC.Types.ForeignCall

Methods

(==) :: Header -> Header -> Bool #

(/=) :: Header -> Header -> Bool #

Eq Safety 
Instance details

Defined in GHC.Types.ForeignCall

Methods

(==) :: Safety -> Safety -> Bool #

(/=) :: Safety -> Safety -> Bool #

Eq CafInfo 
Instance details

Defined in GHC.Types.Id.Info

Methods

(==) :: CafInfo -> CafInfo -> Bool #

(/=) :: CafInfo -> CafInfo -> Bool #

Eq RecSelParent 
Instance details

Defined in GHC.Types.Id.Info

Methods

(==) :: RecSelParent -> RecSelParent -> Bool #

(/=) :: RecSelParent -> RecSelParent -> Bool #

Eq Name 
Instance details

Defined in GHC.Types.Name

Methods

(==) :: Name -> Name -> Bool #

(/=) :: Name -> Name -> Bool #

Eq NameSpace 
Instance details

Defined in GHC.Types.Name.Occurrence

Methods

(==) :: NameSpace -> NameSpace -> Bool #

(/=) :: NameSpace -> NameSpace -> Bool #

Eq OccName 
Instance details

Defined in GHC.Types.Name.Occurrence

Methods

(==) :: OccName -> OccName -> Bool #

(/=) :: OccName -> OccName -> Bool #

Eq FieldsOrSelectors 
Instance details

Defined in GHC.Types.Name.Reader

Methods

(==) :: FieldsOrSelectors -> FieldsOrSelectors -> Bool #

(/=) :: FieldsOrSelectors -> FieldsOrSelectors -> Bool #

Eq ImpDeclSpec 
Instance details

Defined in GHC.Types.Name.Reader

Methods

(==) :: ImpDeclSpec -> ImpDeclSpec -> Bool #

(/=) :: ImpDeclSpec -> ImpDeclSpec -> Bool #

Eq ImpItemSpec 
Instance details

Defined in GHC.Types.Name.Reader

Methods

(==) :: ImpItemSpec -> ImpItemSpec -> Bool #

(/=) :: ImpItemSpec -> ImpItemSpec -> Bool #

Eq ImportSpec 
Instance details

Defined in GHC.Types.Name.Reader

Methods

(==) :: ImportSpec -> ImportSpec -> Bool #

(/=) :: ImportSpec -> ImportSpec -> Bool #

Eq Parent 
Instance details

Defined in GHC.Types.Name.Reader

Methods

(==) :: Parent -> Parent -> Bool #

(/=) :: Parent -> Parent -> Bool #

Eq RdrName 
Instance details

Defined in GHC.Types.Name.Reader

Methods

(==) :: RdrName -> RdrName -> Bool #

(/=) :: RdrName -> RdrName -> Bool #

Eq SaneDouble 
Instance details

Defined in GHC.Types.SaneDouble

Methods

(==) :: SaneDouble -> SaneDouble -> Bool #

(/=) :: SaneDouble -> SaneDouble -> Bool #

Eq HsBootOrSig 
Instance details

Defined in GHC.Types.SourceFile

Methods

(==) :: HsBootOrSig -> HsBootOrSig -> Bool #

(/=) :: HsBootOrSig -> HsBootOrSig -> Bool #

Eq HscSource 
Instance details

Defined in GHC.Types.SourceFile

Methods

(==) :: HscSource -> HscSource -> Bool #

(/=) :: HscSource -> HscSource -> Bool #

Eq FractionalExponentBase 
Instance details

Defined in GHC.Types.SourceText

Methods

(==) :: FractionalExponentBase -> FractionalExponentBase -> Bool #

(/=) :: FractionalExponentBase -> FractionalExponentBase -> Bool #

Eq FractionalLit 
Instance details

Defined in GHC.Types.SourceText

Methods

(==) :: FractionalLit -> FractionalLit -> Bool #

(/=) :: FractionalLit -> FractionalLit -> Bool #

Eq IntegralLit 
Instance details

Defined in GHC.Types.SourceText

Methods

(==) :: IntegralLit -> IntegralLit -> Bool #

(/=) :: IntegralLit -> IntegralLit -> Bool #

Eq SourceText 
Instance details

Defined in GHC.Types.SourceText

Methods

(==) :: SourceText -> SourceText -> Bool #

(/=) :: SourceText -> SourceText -> Bool #

Eq StringLiteral 
Instance details

Defined in GHC.Types.SourceText

Methods

(==) :: StringLiteral -> StringLiteral -> Bool #

(/=) :: StringLiteral -> StringLiteral -> Bool #

Eq BufPos 
Instance details

Defined in GHC.Types.SrcLoc

Methods

(==) :: BufPos -> BufPos -> Bool #

(/=) :: BufPos -> BufPos -> Bool #

Eq BufSpan 
Instance details

Defined in GHC.Types.SrcLoc

Methods

(==) :: BufSpan -> BufSpan -> Bool #

(/=) :: BufSpan -> BufSpan -> Bool #

Eq PsLoc 
Instance details

Defined in GHC.Types.SrcLoc

Methods

(==) :: PsLoc -> PsLoc -> Bool #

(/=) :: PsLoc -> PsLoc -> Bool #

Eq PsSpan 
Instance details

Defined in GHC.Types.SrcLoc

Methods

(==) :: PsSpan -> PsSpan -> Bool #

(/=) :: PsSpan -> PsSpan -> Bool #

Eq RealSrcLoc 
Instance details

Defined in GHC.Types.SrcLoc

Methods

(==) :: RealSrcLoc -> RealSrcLoc -> Bool #

(/=) :: RealSrcLoc -> RealSrcLoc -> Bool #

Eq RealSrcSpan 
Instance details

Defined in GHC.Types.SrcLoc

Methods

(==) :: RealSrcSpan -> RealSrcSpan -> Bool #

(/=) :: RealSrcSpan -> RealSrcSpan -> Bool #

Eq SrcLoc 
Instance details

Defined in GHC.Types.SrcLoc

Methods

(==) :: SrcLoc -> SrcLoc -> Bool #

(/=) :: SrcLoc -> SrcLoc -> Bool #

Eq SrcSpan 
Instance details

Defined in GHC.Types.SrcLoc

Methods

(==) :: SrcSpan -> SrcSpan -> Bool #

(/=) :: SrcSpan -> SrcSpan -> Bool #

Eq UnhelpfulSpanReason 
Instance details

Defined in GHC.Types.SrcLoc

Methods

(==) :: UnhelpfulSpanReason -> UnhelpfulSpanReason -> Bool #

(/=) :: UnhelpfulSpanReason -> UnhelpfulSpanReason -> Bool #

Eq TickishPlacement 
Instance details

Defined in GHC.Types.Tickish

Methods

(==) :: TickishPlacement -> TickishPlacement -> Bool #

(/=) :: TickishPlacement -> TickishPlacement -> Bool #

Eq TickishScoping 
Instance details

Defined in GHC.Types.Tickish

Methods

(==) :: TickishScoping -> TickishScoping -> Bool #

(/=) :: TickishScoping -> TickishScoping -> Bool #

Eq ForAllTyFlag 
Instance details

Defined in GHC.Types.Var

Methods

(==) :: ForAllTyFlag -> ForAllTyFlag -> Bool #

(/=) :: ForAllTyFlag -> ForAllTyFlag -> Bool #

Eq FunTyFlag 
Instance details

Defined in GHC.Types.Var

Methods

(==) :: FunTyFlag -> FunTyFlag -> Bool #

(/=) :: FunTyFlag -> FunTyFlag -> Bool #

Eq Specificity 
Instance details

Defined in GHC.Types.Var

Methods

(==) :: Specificity -> Specificity -> Bool #

(/=) :: Specificity -> Specificity -> Bool #

Eq Var 
Instance details

Defined in GHC.Types.Var

Methods

(==) :: Var -> Var -> Bool #

(/=) :: Var -> Var -> Bool #

Eq PackageId 
Instance details

Defined in GHC.Unit.Info

Methods

(==) :: PackageId -> PackageId -> Bool #

(/=) :: PackageId -> PackageId -> Bool #

Eq PackageName 
Instance details

Defined in GHC.Unit.Info

Methods

(==) :: PackageName -> PackageName -> Bool #

(/=) :: PackageName -> PackageName -> Bool #

Eq InWarningCategory 
Instance details

Defined in GHC.Unit.Module.Warnings

Methods

(==) :: InWarningCategory -> InWarningCategory -> Bool #

(/=) :: InWarningCategory -> InWarningCategory -> Bool #

Eq WarningCategory 
Instance details

Defined in GHC.Unit.Module.Warnings

Methods

(==) :: WarningCategory -> WarningCategory -> Bool #

(/=) :: WarningCategory -> WarningCategory -> Bool #

Eq UnitId 
Instance details

Defined in GHC.Unit.Types

Methods

(==) :: UnitId -> UnitId -> Bool #

(/=) :: UnitId -> UnitId -> Bool #

Eq BindingSite 
Instance details

Defined in GHC.Utils.Outputable

Methods

(==) :: BindingSite -> BindingSite -> Bool #

(/=) :: BindingSite -> BindingSite -> Bool #

Eq Boxity 
Instance details

Defined in Language.Haskell.Syntax.Basic

Methods

(==) :: Boxity -> Boxity -> Bool #

(/=) :: Boxity -> Boxity -> Bool #

Eq FieldLabelString 
Instance details

Defined in Language.Haskell.Syntax.Basic

Methods

(==) :: FieldLabelString -> FieldLabelString -> Bool #

(/=) :: FieldLabelString -> FieldLabelString -> Bool #

Eq Role 
Instance details

Defined in Language.Haskell.Syntax.Basic

Methods

(==) :: Role -> Role -> Bool #

(/=) :: Role -> Role -> Bool #

Eq SrcStrictness 
Instance details

Defined in Language.Haskell.Syntax.Basic

Methods

(==) :: SrcStrictness -> SrcStrictness -> Bool #

(/=) :: SrcStrictness -> SrcStrictness -> Bool #

Eq SrcUnpackedness 
Instance details

Defined in Language.Haskell.Syntax.Basic

Methods

(==) :: SrcUnpackedness -> SrcUnpackedness -> Bool #

(/=) :: SrcUnpackedness -> SrcUnpackedness -> Bool #

Eq NewOrData 
Instance details

Defined in Language.Haskell.Syntax.Decls

Methods

(==) :: NewOrData -> NewOrData -> Bool #

(/=) :: NewOrData -> NewOrData -> Bool #

Eq SpliceDecoration 
Instance details

Defined in Language.Haskell.Syntax.Decls

Methods

(==) :: SpliceDecoration -> SpliceDecoration -> Bool #

(/=) :: SpliceDecoration -> SpliceDecoration -> Bool #

Eq LamCaseVariant 
Instance details

Defined in Language.Haskell.Syntax.Expr

Methods

(==) :: LamCaseVariant -> LamCaseVariant -> Bool #

(/=) :: LamCaseVariant -> LamCaseVariant -> Bool #

Eq DataConCantHappen 
Instance details

Defined in Language.Haskell.Syntax.Extension

Methods

(==) :: DataConCantHappen -> DataConCantHappen -> Bool #

(/=) :: DataConCantHappen -> DataConCantHappen -> Bool #

Eq NoExtField 
Instance details

Defined in Language.Haskell.Syntax.Extension

Methods

(==) :: NoExtField -> NoExtField -> Bool #

(/=) :: NoExtField -> NoExtField -> Bool #

Eq IEWildcard 
Instance details

Defined in Language.Haskell.Syntax.ImpExp

Methods

(==) :: IEWildcard -> IEWildcard -> Bool #

(/=) :: IEWildcard -> IEWildcard -> Bool #

Eq ImportDeclQualifiedStyle 
Instance details

Defined in Language.Haskell.Syntax.ImpExp

Methods

(==) :: ImportDeclQualifiedStyle -> ImportDeclQualifiedStyle -> Bool #

(/=) :: ImportDeclQualifiedStyle -> ImportDeclQualifiedStyle -> Bool #

Eq ImportListInterpretation 
Instance details

Defined in Language.Haskell.Syntax.ImpExp

Methods

(==) :: ImportListInterpretation -> ImportListInterpretation -> Bool #

(/=) :: ImportListInterpretation -> ImportListInterpretation -> Bool #

Eq IsBootInterface 
Instance details

Defined in Language.Haskell.Syntax.ImpExp

Methods

(==) :: IsBootInterface -> IsBootInterface -> Bool #

(/=) :: IsBootInterface -> IsBootInterface -> Bool #

Eq OverLitVal 
Instance details

Defined in Language.Haskell.Syntax.Lit

Methods

(==) :: OverLitVal -> OverLitVal -> Bool #

(/=) :: OverLitVal -> OverLitVal -> Bool #

Eq ModuleName 
Instance details

Defined in Language.Haskell.Syntax.Module.Name

Methods

(==) :: ModuleName -> ModuleName -> Bool #

(/=) :: ModuleName -> ModuleName -> Bool #

Eq RecFieldsDotDot 
Instance details

Defined in Language.Haskell.Syntax.Pat

Methods

(==) :: RecFieldsDotDot -> RecFieldsDotDot -> Bool #

(/=) :: RecFieldsDotDot -> RecFieldsDotDot -> Bool #

Eq HsIPName 
Instance details

Defined in Language.Haskell.Syntax.Type

Methods

(==) :: HsIPName -> HsIPName -> Bool #

(/=) :: HsIPName -> HsIPName -> Bool #

Eq PromotionFlag 
Instance details

Defined in Language.Haskell.Syntax.Type

Methods

(==) :: PromotionFlag -> PromotionFlag -> Bool #

(/=) :: PromotionFlag -> PromotionFlag -> 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 ClosureType 
Instance details

Defined in GHC.Exts.Heap.ClosureTypes

Methods

(==) :: ClosureType -> ClosureType -> Bool #

(/=) :: ClosureType -> ClosureType -> Bool #

Eq PrimType 
Instance details

Defined in GHC.Exts.Heap.Closures

Methods

(==) :: PrimType -> PrimType -> Bool #

(/=) :: PrimType -> PrimType -> Bool #

Eq TsoFlags 
Instance details

Defined in GHC.Exts.Heap.Closures

Methods

(==) :: TsoFlags -> TsoFlags -> Bool #

(/=) :: TsoFlags -> TsoFlags -> Bool #

Eq WhatNext 
Instance details

Defined in GHC.Exts.Heap.Closures

Methods

(==) :: WhatNext -> WhatNext -> Bool #

(/=) :: WhatNext -> WhatNext -> Bool #

Eq WhyBlocked 
Instance details

Defined in GHC.Exts.Heap.Closures

Methods

(==) :: WhyBlocked -> WhyBlocked -> Bool #

(/=) :: WhyBlocked -> WhyBlocked -> Bool #

Eq CostCentre 
Instance details

Defined in GHC.Exts.Heap.ProfInfo.Types

Methods

(==) :: CostCentre -> CostCentre -> Bool #

(/=) :: CostCentre -> CostCentre -> Bool #

Eq CostCentreStack 
Instance details

Defined in GHC.Exts.Heap.ProfInfo.Types

Methods

(==) :: CostCentreStack -> CostCentreStack -> Bool #

(/=) :: CostCentreStack -> CostCentreStack -> Bool #

Eq IndexTable 
Instance details

Defined in GHC.Exts.Heap.ProfInfo.Types

Methods

(==) :: IndexTable -> IndexTable -> Bool #

(/=) :: IndexTable -> IndexTable -> Bool #

Eq StgTSOProfInfo 
Instance details

Defined in GHC.Exts.Heap.ProfInfo.Types

Methods

(==) :: StgTSOProfInfo -> StgTSOProfInfo -> Bool #

(/=) :: StgTSOProfInfo -> StgTSOProfInfo -> 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 Completion 
Instance details

Defined in System.Console.Haskeline.Completion

Methods

(==) :: Completion -> Completion -> Bool #

(/=) :: Completion -> Completion -> Bool #

Eq Comment 
Instance details

Defined in Language.Haskell.Exts.Comments

Methods

(==) :: Comment -> Comment -> Bool #

(/=) :: Comment -> Comment -> Bool #

Eq UnknownPragma 
Instance details

Defined in Language.Haskell.Exts.Comments

Methods

(==) :: UnknownPragma -> UnknownPragma -> Bool #

(/=) :: UnknownPragma -> UnknownPragma -> Bool #

Eq Extension 
Instance details

Defined in Language.Haskell.Exts.Extension

Methods

(==) :: Extension -> Extension -> Bool #

(/=) :: Extension -> Extension -> Bool #

Eq KnownExtension 
Instance details

Defined in Language.Haskell.Exts.Extension

Methods

(==) :: KnownExtension -> KnownExtension -> Bool #

(/=) :: KnownExtension -> KnownExtension -> Bool #

Eq Language 
Instance details

Defined in Language.Haskell.Exts.Extension

Methods

(==) :: Language -> Language -> Bool #

(/=) :: Language -> Language -> Bool #

Eq Fixity 
Instance details

Defined in Language.Haskell.Exts.Fixity

Methods

(==) :: Fixity -> Fixity -> Bool #

(/=) :: Fixity -> Fixity -> Bool #

Eq PPLayout 
Instance details

Defined in Language.Haskell.Exts.Pretty

Methods

(==) :: PPLayout -> PPLayout -> Bool #

(/=) :: PPLayout -> PPLayout -> Bool #

Eq SrcLoc 
Instance details

Defined in Language.Haskell.Exts.SrcLoc

Methods

(==) :: SrcLoc -> SrcLoc -> Bool #

(/=) :: SrcLoc -> SrcLoc -> Bool #

Eq SrcSpan 
Instance details

Defined in Language.Haskell.Exts.SrcLoc

Methods

(==) :: SrcSpan -> SrcSpan -> Bool #

(/=) :: SrcSpan -> SrcSpan -> Bool #

Eq SrcSpanInfo 
Instance details

Defined in Language.Haskell.Exts.SrcLoc

Methods

(==) :: SrcSpanInfo -> SrcSpanInfo -> Bool #

(/=) :: SrcSpanInfo -> SrcSpanInfo -> Bool #

Eq Boxed 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Boxed -> Boxed -> Bool #

(/=) :: Boxed -> Boxed -> Bool #

Eq Tool 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Tool -> Tool -> Bool #

(/=) :: Tool -> Tool -> Bool #

Eq Cookie 
Instance details

Defined in System.INotify

Methods

(==) :: Cookie -> Cookie -> Bool #

(/=) :: Cookie -> Cookie -> Bool #

Eq Event 
Instance details

Defined in System.INotify

Methods

(==) :: Event -> Event -> Bool #

(/=) :: Event -> Event -> Bool #

Eq EventVariety 
Instance details

Defined in System.INotify

Methods

(==) :: EventVariety -> EventVariety -> Bool #

(/=) :: EventVariety -> EventVariety -> Bool #

Eq FDEvent 
Instance details

Defined in System.INotify

Methods

(==) :: FDEvent -> FDEvent -> Bool #

(/=) :: FDEvent -> FDEvent -> Bool #

Eq INotify 
Instance details

Defined in System.INotify

Methods

(==) :: INotify -> INotify -> Bool #

(/=) :: INotify -> INotify -> Bool #

Eq WatchDescriptor 
Instance details

Defined in System.INotify

Methods

(==) :: WatchDescriptor -> WatchDescriptor -> Bool #

(/=) :: WatchDescriptor -> WatchDescriptor -> Bool #

Eq UnixEpoch 
Instance details

Defined in Data.Hourglass.Epoch

Methods

(==) :: UnixEpoch -> UnixEpoch -> Bool #

(/=) :: UnixEpoch -> UnixEpoch -> Bool #

Eq WindowsEpoch 
Instance details

Defined in Data.Hourglass.Epoch

Methods

(==) :: WindowsEpoch -> WindowsEpoch -> Bool #

(/=) :: WindowsEpoch -> WindowsEpoch -> Bool #

Eq Date 
Instance details

Defined in Time.Types

Methods

(==) :: Date -> Date -> Bool #

(/=) :: Date -> Date -> Bool #

Eq DateTime 
Instance details

Defined in Time.Types

Methods

(==) :: DateTime -> DateTime -> Bool #

(/=) :: DateTime -> DateTime -> Bool #

Eq Elapsed 
Instance details

Defined in Time.Types

Methods

(==) :: Elapsed -> Elapsed -> Bool #

(/=) :: Elapsed -> Elapsed -> Bool #

Eq ElapsedP 
Instance details

Defined in Time.Types

Methods

(==) :: ElapsedP -> ElapsedP -> Bool #

(/=) :: ElapsedP -> ElapsedP -> Bool #

Eq Hours 
Instance details

Defined in Time.Types

Methods

(==) :: Hours -> Hours -> Bool #

(/=) :: Hours -> Hours -> Bool #

Eq Minutes 
Instance details

Defined in Time.Types

Methods

(==) :: Minutes -> Minutes -> Bool #

(/=) :: Minutes -> Minutes -> Bool #

Eq Month 
Instance details

Defined in Time.Types

Methods

(==) :: Month -> Month -> Bool #

(/=) :: Month -> Month -> Bool #

Eq NanoSeconds 
Instance details

Defined in Time.Types

Methods

(==) :: NanoSeconds -> NanoSeconds -> Bool #

(/=) :: NanoSeconds -> NanoSeconds -> Bool #

Eq Seconds 
Instance details

Defined in Time.Types

Methods

(==) :: Seconds -> Seconds -> Bool #

(/=) :: Seconds -> Seconds -> Bool #

Eq TimeOfDay 
Instance details

Defined in Time.Types

Methods

(==) :: TimeOfDay -> TimeOfDay -> Bool #

(/=) :: TimeOfDay -> TimeOfDay -> Bool #

Eq TimezoneOffset 
Instance details

Defined in Time.Types

Methods

(==) :: TimezoneOffset -> TimezoneOffset -> Bool #

(/=) :: TimezoneOffset -> TimezoneOffset -> Bool #

Eq WeekDay 
Instance details

Defined in Time.Types

Methods

(==) :: WeekDay -> WeekDay -> Bool #

(/=) :: WeekDay -> WeekDay -> Bool #

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 Chunk 
Instance details

Defined in Test.Hspec.Core.Formatters.V2

Methods

(==) :: Chunk -> Chunk -> Bool #

(/=) :: Chunk -> Chunk -> Bool #

Eq ColorChunk 
Instance details

Defined in Test.Hspec.Core.Formatters.V2

Methods

(==) :: ColorChunk -> ColorChunk -> Bool #

(/=) :: ColorChunk -> ColorChunk -> Bool #

Eq StartsWith 
Instance details

Defined in Test.Hspec.Core.Formatters.V2

Methods

(==) :: StartsWith -> StartsWith -> Bool #

(/=) :: StartsWith -> StartsWith -> Bool #

Eq ProgressReporting 
Instance details

Defined in Test.Hspec.Core.Runner

Methods

(==) :: ProgressReporting -> ProgressReporting -> Bool #

(/=) :: ProgressReporting -> ProgressReporting -> Bool #

Eq UseColor 
Instance details

Defined in Test.Hspec.Core.Runner

Methods

(==) :: UseColor -> UseColor -> Bool #

(/=) :: UseColor -> UseColor -> 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 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 MediaType 
Instance details

Defined in Network.HTTP.Media.MediaType.Internal

Methods

(==) :: MediaType -> MediaType -> Bool #

(/=) :: MediaType -> MediaType -> 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

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 Token 
Instance details

Defined in Network.HPACK.Token

Methods

(==) :: Token -> Token -> Bool #

(/=) :: Token -> Token -> Bool #

Eq Attribute 
Instance details

Defined in IHP.HSX.Parser

Methods

(==) :: Attribute -> Attribute -> Bool #

(/=) :: Attribute -> Attribute -> Bool #

Eq AttributeValue 
Instance details

Defined in IHP.HSX.Parser

Methods

(==) :: AttributeValue -> AttributeValue -> Bool #

(/=) :: AttributeValue -> AttributeValue -> Bool #

Eq Node 
Instance details

Defined in IHP.HSX.Parser

Methods

(==) :: Node -> Node -> Bool #

(/=) :: Node -> Node -> Bool #

Eq Point 
Instance details

Defined in IHP.Postgres.Point

Methods

(==) :: Point -> Point -> Bool #

(/=) :: Point -> Point -> Bool #

Eq Polygon 
Instance details

Defined in IHP.Postgres.Polygon

Methods

(==) :: Polygon -> Polygon -> Bool #

(/=) :: Polygon -> Polygon -> Bool #

Eq Lexeme 
Instance details

Defined in IHP.Postgres.TSVector

Methods

(==) :: Lexeme -> Lexeme -> Bool #

(/=) :: Lexeme -> Lexeme -> Bool #

Eq LexemeRanking 
Instance details

Defined in IHP.Postgres.TSVector

Eq TSVector 
Instance details

Defined in IHP.Postgres.TSVector

Eq PGInterval 
Instance details

Defined in IHP.Postgres.TimeParser

Eq PGTimeInterval 
Instance details

Defined in IHP.Postgres.TimeParser

Eq InflectionException 
Instance details

Defined in Text.Inflections.Types

Methods

(==) :: InflectionException -> InflectionException -> Bool #

(/=) :: InflectionException -> InflectionException -> Bool #

Eq SomeWord 
Instance details

Defined in Text.Inflections.Types

Methods

(==) :: SomeWord -> SomeWord -> Bool #

(/=) :: SomeWord -> SomeWord -> Bool #

Eq Ini 
Instance details

Defined in Data.Ini

Methods

(==) :: Ini -> Ini -> Bool #

(/=) :: Ini -> Ini -> Bool #

Eq KeySeparator 
Instance details

Defined in Data.Ini

Methods

(==) :: KeySeparator -> KeySeparator -> Bool #

(/=) :: KeySeparator -> KeySeparator -> Bool #

Eq Options 
Instance details

Defined in Data.Functor.Invariant.TH

Methods

(==) :: Options -> Options -> Bool #

(/=) :: Options -> Options -> Bool #

Eq IP 
Instance details

Defined in Net.IP

Methods

(==) :: IP -> IP -> Bool #

(/=) :: IP -> IP -> Bool #

Eq IPv4 
Instance details

Defined in Net.IPv4

Methods

(==) :: IPv4 -> IPv4 -> Bool #

(/=) :: IPv4 -> IPv4 -> Bool #

Eq IPv4Range 
Instance details

Defined in Net.IPv4

Methods

(==) :: IPv4Range -> IPv4Range -> Bool #

(/=) :: IPv4Range -> IPv4Range -> Bool #

Eq IPv6 
Instance details

Defined in Net.IPv6

Methods

(==) :: IPv6 -> IPv6 -> Bool #

(/=) :: IPv6 -> IPv6 -> Bool #

Eq IPv6Range 
Instance details

Defined in Net.IPv6

Methods

(==) :: IPv6Range -> IPv6Range -> Bool #

(/=) :: IPv6Range -> IPv6Range -> Bool #

Eq Mac 
Instance details

Defined in Net.Mac

Methods

(==) :: Mac -> Mac -> Bool #

(/=) :: Mac -> Mac -> Bool #

Eq MacCodec 
Instance details

Defined in Net.Mac

Methods

(==) :: MacCodec -> MacCodec -> Bool #

(/=) :: MacCodec -> MacCodec -> Bool #

Eq MacGrouping 
Instance details

Defined in Net.Mac

Methods

(==) :: MacGrouping -> MacGrouping -> Bool #

(/=) :: MacGrouping -> MacGrouping -> 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 DefName 
Instance details

Defined in Control.Lens.Internal.FieldTH

Methods

(==) :: DefName -> DefName -> Bool #

(/=) :: DefName -> DefName -> Bool #

Eq NCon 
Instance details

Defined in Control.Lens.Internal.PrismTH

Methods

(==) :: NCon -> NCon -> Bool #

(/=) :: NCon -> NCon -> Bool #

Eq ParamException Source # 
Instance details

Defined in IHP.Controller.Param

Eq SessionError Source # 
Instance details

Defined in IHP.Controller.Session

Eq Change Source # 
Instance details

Defined in IHP.DataSync.ChangeNotifications

Methods

(==) :: Change -> Change -> Bool #

(/=) :: Change -> Change -> Bool #

Eq ChangeNotification Source # 
Instance details

Defined in IHP.DataSync.ChangeNotifications

Eq ChangeSet Source #

The patch is over 8000 bytes, so we have stored it in the large_pg_notifications table

Instance details

Defined in IHP.DataSync.ChangeNotifications

Eq ConditionExpression Source # 
Instance details

Defined in IHP.DataSync.DynamicQuery

Eq ConditionOperator Source # 
Instance details

Defined in IHP.DataSync.DynamicQuery

Eq DynamicSQLQuery Source # 
Instance details

Defined in IHP.DataSync.DynamicQuery

Eq DynamicValue Source # 
Instance details

Defined in IHP.DataSync.DynamicQuery

Eq FunctionCall Source # 
Instance details

Defined in IHP.DataSync.DynamicQuery

Eq OrderByClause Source # 
Instance details

Defined in IHP.DataSync.DynamicQuery

Eq SelectedColumns Source # 
Instance details

Defined in IHP.DataSync.DynamicQuery

Eq UndecodedJSON Source # 
Instance details

Defined in IHP.DataSync.DynamicQuery

Eq ApiController Source # 
Instance details

Defined in IHP.DataSync.REST.Types

Eq TableWithRLS Source # 
Instance details

Defined in IHP.DataSync.RowLevelSecurity

Eq DataSyncMessage Source # 
Instance details

Defined in IHP.DataSync.Types

Eq Environment Source # 
Instance details

Defined in IHP.Environment

Eq RootApplication Source # 
Instance details

Defined in IHP.FrameworkConfig

Eq BackoffStrategy Source # 
Instance details

Defined in IHP.Job.Types

Eq JobStatus Source # 
Instance details

Defined in IHP.Job.Types

Eq LogLevel Source # 
Instance details

Defined in IHP.Log.Types

Eq MailAttachment Source # 
Instance details

Defined in IHP.Mail.Types

Eq MetaBag Source # 
Instance details

Defined in IHP.ModelSupport

Methods

(==) :: MetaBag -> MetaBag -> Bool #

(/=) :: MetaBag -> MetaBag -> Bool #

Eq Violation Source # 
Instance details

Defined in IHP.ModelSupport

Eq Condition Source # 
Instance details

Defined in IHP.QueryBuilder

Eq FilterOperator Source # 
Instance details

Defined in IHP.QueryBuilder

Eq Join Source # 
Instance details

Defined in IHP.QueryBuilder

Methods

(==) :: Join -> Join -> Bool #

(/=) :: Join -> Join -> Bool #

Eq OrderByClause Source # 
Instance details

Defined in IHP.QueryBuilder

Eq OrderByDirection Source # 
Instance details

Defined in IHP.QueryBuilder

Eq SQLQuery Source # 
Instance details

Defined in IHP.QueryBuilder

Eq Sitemap Source # 
Instance details

Defined in IHP.SEO.Sitemap.Types

Methods

(==) :: Sitemap -> Sitemap -> Bool #

(/=) :: Sitemap -> Sitemap -> Bool #

Eq SitemapChangeFrequency Source # 
Instance details

Defined in IHP.SEO.Sitemap.Types

Eq SitemapController Source # 
Instance details

Defined in IHP.SEO.Sitemap.Types

Eq SitemapLink Source # 
Instance details

Defined in IHP.SEO.Sitemap.Types

Eq Migration Source # 
Instance details

Defined in IHP.SchemaMigration

Eq ValidatorResult Source # 
Instance details

Defined in IHP.ValidationSupport.Types

Eq Edition Source # 
Instance details

Defined in IHP.Version

Methods

(==) :: Edition -> Edition -> Bool #

(/=) :: Edition -> Edition -> Bool #

Eq WelcomeController Source # 
Instance details

Defined in IHP.Welcome.Controller

Eq InvalidPosException 
Instance details

Defined in Text.Megaparsec.Pos

Methods

(==) :: InvalidPosException -> InvalidPosException -> Bool #

(/=) :: InvalidPosException -> InvalidPosException -> Bool #

Eq Pos 
Instance details

Defined in Text.Megaparsec.Pos

Methods

(==) :: Pos -> Pos -> Bool #

(/=) :: Pos -> Pos -> Bool #

Eq SourcePos 
Instance details

Defined in Text.Megaparsec.Pos

Methods

(==) :: SourcePos -> SourcePos -> Bool #

(/=) :: SourcePos -> SourcePos -> Bool #

Eq Base 
Instance details

Defined in Data.ByteArray.Encoding

Methods

(==) :: Base -> Base -> Bool #

(/=) :: Base -> Base -> Bool #

Eq ScrubbedBytes 
Instance details

Defined in Data.ByteArray.ScrubbedBytes

Methods

(==) :: ScrubbedBytes -> ScrubbedBytes -> Bool #

(/=) :: ScrubbedBytes -> ScrubbedBytes -> 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 Address 
Instance details

Defined in Network.Mail.Mime

Methods

(==) :: Address -> Address -> Bool #

(/=) :: Address -> Address -> Bool #

Eq Boundary 
Instance details

Defined in Network.Mail.Mime

Eq Disposition 
Instance details

Defined in Network.Mail.Mime

Eq Encoding 
Instance details

Defined in Network.Mail.Mime

Eq Part 
Instance details

Defined in Network.Mail.Mime

Methods

(==) :: Part -> Part -> Bool #

(/=) :: Part -> Part -> Bool #

Eq PartContent 
Instance details

Defined in Network.Mail.Mime

Eq QPC 
Instance details

Defined in Network.Mail.Mime

Methods

(==) :: QPC -> QPC -> Bool #

(/=) :: QPC -> QPC -> Bool #

Eq Backend 
Instance details

Defined in Network.Minio.AdminAPI

Methods

(==) :: Backend -> Backend -> Bool #

(/=) :: Backend -> Backend -> Bool #

Eq ConnStats 
Instance details

Defined in Network.Minio.AdminAPI

Methods

(==) :: ConnStats -> ConnStats -> Bool #

(/=) :: ConnStats -> ConnStats -> Bool #

Eq CountNAvgTime 
Instance details

Defined in Network.Minio.AdminAPI

Methods

(==) :: CountNAvgTime -> CountNAvgTime -> Bool #

(/=) :: CountNAvgTime -> CountNAvgTime -> Bool #

Eq DriveInfo 
Instance details

Defined in Network.Minio.AdminAPI

Methods

(==) :: DriveInfo -> DriveInfo -> Bool #

(/=) :: DriveInfo -> DriveInfo -> Bool #

Eq ErasureInfo 
Instance details

Defined in Network.Minio.AdminAPI

Methods

(==) :: ErasureInfo -> ErasureInfo -> Bool #

(/=) :: ErasureInfo -> ErasureInfo -> Bool #

Eq HealItemType 
Instance details

Defined in Network.Minio.AdminAPI

Methods

(==) :: HealItemType -> HealItemType -> Bool #

(/=) :: HealItemType -> HealItemType -> Bool #

Eq HealOpts 
Instance details

Defined in Network.Minio.AdminAPI

Methods

(==) :: HealOpts -> HealOpts -> Bool #

(/=) :: HealOpts -> HealOpts -> Bool #

Eq HealResultItem 
Instance details

Defined in Network.Minio.AdminAPI

Methods

(==) :: HealResultItem -> HealResultItem -> Bool #

(/=) :: HealResultItem -> HealResultItem -> Bool #

Eq HealStartResp 
Instance details

Defined in Network.Minio.AdminAPI

Methods

(==) :: HealStartResp -> HealStartResp -> Bool #

(/=) :: HealStartResp -> HealStartResp -> Bool #

Eq HealStatus 
Instance details

Defined in Network.Minio.AdminAPI

Methods

(==) :: HealStatus -> HealStatus -> Bool #

(/=) :: HealStatus -> HealStatus -> Bool #

Eq HttpStats 
Instance details

Defined in Network.Minio.AdminAPI

Methods

(==) :: HttpStats -> HttpStats -> Bool #

(/=) :: HttpStats -> HttpStats -> Bool #

Eq NodeSummary 
Instance details

Defined in Network.Minio.AdminAPI

Methods

(==) :: NodeSummary -> NodeSummary -> Bool #

(/=) :: NodeSummary -> NodeSummary -> Bool #

Eq SIData 
Instance details

Defined in Network.Minio.AdminAPI

Methods

(==) :: SIData -> SIData -> Bool #

(/=) :: SIData -> SIData -> Bool #

Eq ServerInfo 
Instance details

Defined in Network.Minio.AdminAPI

Methods

(==) :: ServerInfo -> ServerInfo -> Bool #

(/=) :: ServerInfo -> ServerInfo -> Bool #

Eq ServerProps 
Instance details

Defined in Network.Minio.AdminAPI

Methods

(==) :: ServerProps -> ServerProps -> Bool #

(/=) :: ServerProps -> ServerProps -> Bool #

Eq ServerVersion 
Instance details

Defined in Network.Minio.AdminAPI

Methods

(==) :: ServerVersion -> ServerVersion -> Bool #

(/=) :: ServerVersion -> ServerVersion -> Bool #

Eq ServiceAction 
Instance details

Defined in Network.Minio.AdminAPI

Methods

(==) :: ServiceAction -> ServiceAction -> Bool #

(/=) :: ServiceAction -> ServiceAction -> Bool #

Eq ServiceStatus 
Instance details

Defined in Network.Minio.AdminAPI

Methods

(==) :: ServiceStatus -> ServiceStatus -> Bool #

(/=) :: ServiceStatus -> ServiceStatus -> Bool #

Eq SetConfigResult 
Instance details

Defined in Network.Minio.AdminAPI

Methods

(==) :: SetConfigResult -> SetConfigResult -> Bool #

(/=) :: SetConfigResult -> SetConfigResult -> Bool #

Eq StorageClass 
Instance details

Defined in Network.Minio.AdminAPI

Methods

(==) :: StorageClass -> StorageClass -> Bool #

(/=) :: StorageClass -> StorageClass -> Bool #

Eq StorageInfo 
Instance details

Defined in Network.Minio.AdminAPI

Methods

(==) :: StorageInfo -> StorageInfo -> Bool #

(/=) :: StorageInfo -> StorageInfo -> Bool #

Eq AccessKey 
Instance details

Defined in Network.Minio.Credentials.Types

Methods

(==) :: AccessKey -> AccessKey -> Bool #

(/=) :: AccessKey -> AccessKey -> Bool #

Eq CredentialValue 
Instance details

Defined in Network.Minio.Credentials.Types

Methods

(==) :: CredentialValue -> CredentialValue -> Bool #

(/=) :: CredentialValue -> CredentialValue -> Bool #

Eq ExpiryTime 
Instance details

Defined in Network.Minio.Credentials.Types

Methods

(==) :: ExpiryTime -> ExpiryTime -> Bool #

(/=) :: ExpiryTime -> ExpiryTime -> Bool #

Eq SecretKey 
Instance details

Defined in Network.Minio.Credentials.Types

Methods

(==) :: SecretKey -> SecretKey -> Bool #

(/=) :: SecretKey -> SecretKey -> Bool #

Eq SessionToken 
Instance details

Defined in Network.Minio.Credentials.Types

Methods

(==) :: SessionToken -> SessionToken -> Bool #

(/=) :: SessionToken -> SessionToken -> Bool #

Eq BucketInfo 
Instance details

Defined in Network.Minio.Data

Methods

(==) :: BucketInfo -> BucketInfo -> Bool #

(/=) :: BucketInfo -> BucketInfo -> Bool #

Eq CSVProp 
Instance details

Defined in Network.Minio.Data

Methods

(==) :: CSVProp -> CSVProp -> Bool #

(/=) :: CSVProp -> CSVProp -> Bool #

Eq CompressionType 
Instance details

Defined in Network.Minio.Data

Methods

(==) :: CompressionType -> CompressionType -> Bool #

(/=) :: CompressionType -> CompressionType -> Bool #

Eq DestinationInfo 
Instance details

Defined in Network.Minio.Data

Methods

(==) :: DestinationInfo -> DestinationInfo -> Bool #

(/=) :: DestinationInfo -> DestinationInfo -> Bool #

Eq Event 
Instance details

Defined in Network.Minio.Data

Methods

(==) :: Event -> Event -> Bool #

(/=) :: Event -> Event -> Bool #

Eq EventMessage 
Instance details

Defined in Network.Minio.Data

Methods

(==) :: EventMessage -> EventMessage -> Bool #

(/=) :: EventMessage -> EventMessage -> Bool #

Eq ExpressionType 
Instance details

Defined in Network.Minio.Data

Methods

(==) :: ExpressionType -> ExpressionType -> Bool #

(/=) :: ExpressionType -> ExpressionType -> Bool #

Eq FileHeaderInfo 
Instance details

Defined in Network.Minio.Data

Methods

(==) :: FileHeaderInfo -> FileHeaderInfo -> Bool #

(/=) :: FileHeaderInfo -> FileHeaderInfo -> Bool #

Eq Filter 
Instance details

Defined in Network.Minio.Data

Methods

(==) :: Filter -> Filter -> Bool #

(/=) :: Filter -> Filter -> Bool #

Eq FilterKey 
Instance details

Defined in Network.Minio.Data

Methods

(==) :: FilterKey -> FilterKey -> Bool #

(/=) :: FilterKey -> FilterKey -> Bool #

Eq FilterRule 
Instance details

Defined in Network.Minio.Data

Methods

(==) :: FilterRule -> FilterRule -> Bool #

(/=) :: FilterRule -> FilterRule -> Bool #

Eq FilterRules 
Instance details

Defined in Network.Minio.Data

Methods

(==) :: FilterRules -> FilterRules -> Bool #

(/=) :: FilterRules -> FilterRules -> Bool #

Eq InputFormatInfo 
Instance details

Defined in Network.Minio.Data

Methods

(==) :: InputFormatInfo -> InputFormatInfo -> Bool #

(/=) :: InputFormatInfo -> InputFormatInfo -> Bool #

Eq InputSerialization 
Instance details

Defined in Network.Minio.Data

Methods

(==) :: InputSerialization -> InputSerialization -> Bool #

(/=) :: InputSerialization -> InputSerialization -> Bool #

Eq JSONInputProp 
Instance details

Defined in Network.Minio.Data

Methods

(==) :: JSONInputProp -> JSONInputProp -> Bool #

(/=) :: JSONInputProp -> JSONInputProp -> Bool #

Eq JSONOutputProp 
Instance details

Defined in Network.Minio.Data

Methods

(==) :: JSONOutputProp -> JSONOutputProp -> Bool #

(/=) :: JSONOutputProp -> JSONOutputProp -> Bool #

Eq JSONType 
Instance details

Defined in Network.Minio.Data

Methods

(==) :: JSONType -> JSONType -> Bool #

(/=) :: JSONType -> JSONType -> Bool #

Eq ListObjectsResult 
Instance details

Defined in Network.Minio.Data

Methods

(==) :: ListObjectsResult -> ListObjectsResult -> Bool #

(/=) :: ListObjectsResult -> ListObjectsResult -> Bool #

Eq ListObjectsV1Result 
Instance details

Defined in Network.Minio.Data

Methods

(==) :: ListObjectsV1Result -> ListObjectsV1Result -> Bool #

(/=) :: ListObjectsV1Result -> ListObjectsV1Result -> Bool #

Eq ListPartsResult 
Instance details

Defined in Network.Minio.Data

Methods

(==) :: ListPartsResult -> ListPartsResult -> Bool #

(/=) :: ListPartsResult -> ListPartsResult -> Bool #

Eq ListUploadsResult 
Instance details

Defined in Network.Minio.Data

Methods

(==) :: ListUploadsResult -> ListUploadsResult -> Bool #

(/=) :: ListUploadsResult -> ListUploadsResult -> Bool #

Eq MsgHeaderName 
Instance details

Defined in Network.Minio.Data

Methods

(==) :: MsgHeaderName -> MsgHeaderName -> Bool #

(/=) :: MsgHeaderName -> MsgHeaderName -> Bool #

Eq Notification 
Instance details

Defined in Network.Minio.Data

Methods

(==) :: Notification -> Notification -> Bool #

(/=) :: Notification -> Notification -> Bool #

Eq NotificationConfig 
Instance details

Defined in Network.Minio.Data

Methods

(==) :: NotificationConfig -> NotificationConfig -> Bool #

(/=) :: NotificationConfig -> NotificationConfig -> Bool #

Eq ObjectInfo 
Instance details

Defined in Network.Minio.Data

Methods

(==) :: ObjectInfo -> ObjectInfo -> Bool #

(/=) :: ObjectInfo -> ObjectInfo -> Bool #

Eq ObjectPartInfo 
Instance details

Defined in Network.Minio.Data

Methods

(==) :: ObjectPartInfo -> ObjectPartInfo -> Bool #

(/=) :: ObjectPartInfo -> ObjectPartInfo -> Bool #

Eq OutputSerialization 
Instance details

Defined in Network.Minio.Data

Methods

(==) :: OutputSerialization -> OutputSerialization -> Bool #

(/=) :: OutputSerialization -> OutputSerialization -> Bool #

Eq Progress 
Instance details

Defined in Network.Minio.Data

Methods

(==) :: Progress -> Progress -> Bool #

(/=) :: Progress -> Progress -> Bool #

Eq QuoteFields 
Instance details

Defined in Network.Minio.Data

Methods

(==) :: QuoteFields -> QuoteFields -> Bool #

(/=) :: QuoteFields -> QuoteFields -> Bool #

Eq SSECKey 
Instance details

Defined in Network.Minio.Data

Methods

(==) :: SSECKey -> SSECKey -> Bool #

(/=) :: SSECKey -> SSECKey -> Bool #

Eq SelectRequest 
Instance details

Defined in Network.Minio.Data

Methods

(==) :: SelectRequest -> SelectRequest -> Bool #

(/=) :: SelectRequest -> SelectRequest -> Bool #

Eq SourceInfo 
Instance details

Defined in Network.Minio.Data

Methods

(==) :: SourceInfo -> SourceInfo -> Bool #

(/=) :: SourceInfo -> SourceInfo -> Bool #

Eq UploadInfo 
Instance details

Defined in Network.Minio.Data

Methods

(==) :: UploadInfo -> UploadInfo -> Bool #

(/=) :: UploadInfo -> UploadInfo -> Bool #

Eq MErrV 
Instance details

Defined in Network.Minio.Errors

Methods

(==) :: MErrV -> MErrV -> Bool #

(/=) :: MErrV -> MErrV -> Bool #

Eq MinioErr 
Instance details

Defined in Network.Minio.Errors

Methods

(==) :: MinioErr -> MinioErr -> Bool #

(/=) :: MinioErr -> MinioErr -> Bool #

Eq ServiceErr 
Instance details

Defined in Network.Minio.Errors

Methods

(==) :: ServiceErr -> ServiceErr -> Bool #

(/=) :: ServiceErr -> ServiceErr -> Bool #

Eq PostPolicy 
Instance details

Defined in Network.Minio.PresignedOperations

Methods

(==) :: PostPolicy -> PostPolicy -> Bool #

(/=) :: PostPolicy -> PostPolicy -> Bool #

Eq PostPolicyCondition 
Instance details

Defined in Network.Minio.PresignedOperations

Methods

(==) :: PostPolicyCondition -> PostPolicyCondition -> Bool #

(/=) :: PostPolicyCondition -> PostPolicyCondition -> Bool #

Eq PostPolicyError 
Instance details

Defined in Network.Minio.PresignedOperations

Methods

(==) :: PostPolicyError -> PostPolicyError -> Bool #

(/=) :: PostPolicyError -> PostPolicyError -> Bool #

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 BufferOverrun 
Instance details

Defined in Network.ByteOrder

Methods

(==) :: BufferOverrun -> BufferOverrun -> Bool #

(/=) :: BufferOverrun -> BufferOverrun -> Bool #

Eq IPv4 
Instance details

Defined in Network.Info

Methods

(==) :: IPv4 -> IPv4 -> Bool #

(/=) :: IPv4 -> IPv4 -> Bool #

Eq IPv6 
Instance details

Defined in Network.Info

Methods

(==) :: IPv6 -> IPv6 -> Bool #

(/=) :: IPv6 -> IPv6 -> Bool #

Eq MAC 
Instance details

Defined in Network.Info

Methods

(==) :: MAC -> MAC -> Bool #

(/=) :: MAC -> MAC -> 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 TimeLocale 
Instance details

Defined in System.Locale

Methods

(==) :: TimeLocale -> TimeLocale -> Bool #

(/=) :: TimeLocale -> TimeLocale -> Bool #

Eq CalendarTime 
Instance details

Defined in System.Time

Methods

(==) :: CalendarTime -> CalendarTime -> Bool #

(/=) :: CalendarTime -> CalendarTime -> Bool #

Eq ClockTime 
Instance details

Defined in System.Time

Methods

(==) :: ClockTime -> ClockTime -> Bool #

(/=) :: ClockTime -> ClockTime -> Bool #

Eq Day 
Instance details

Defined in System.Time

Methods

(==) :: Day -> Day -> Bool #

(/=) :: Day -> Day -> Bool #

Eq Month 
Instance details

Defined in System.Time

Methods

(==) :: Month -> Month -> Bool #

(/=) :: Month -> Month -> Bool #

Eq TimeDiff 
Instance details

Defined in System.Time

Methods

(==) :: TimeDiff -> TimeDiff -> Bool #

(/=) :: TimeDiff -> TimeDiff -> 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 EncodingException 
Instance details

Defined in System.OsString.Encoding.Internal

Methods

(==) :: EncodingException -> EncodingException -> Bool #

(/=) :: EncodingException -> EncodingException -> 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 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 SourcePos 
Instance details

Defined in Text.Parsec.Pos

Methods

(==) :: SourcePos -> SourcePos -> Bool #

(/=) :: SourcePos -> SourcePos -> Bool #

Eq Cancel 
Instance details

Defined in Database.PostgreSQL.LibPQ

Methods

(==) :: Cancel -> Cancel -> Bool #

(/=) :: Cancel -> Cancel -> Bool #

Eq Column 
Instance details

Defined in Database.PostgreSQL.LibPQ

Methods

(==) :: Column -> Column -> Bool #

(/=) :: Column -> Column -> Bool #

Eq CopyInResult 
Instance details

Defined in Database.PostgreSQL.LibPQ

Methods

(==) :: CopyInResult -> CopyInResult -> Bool #

(/=) :: CopyInResult -> CopyInResult -> Bool #

Eq FlushStatus 
Instance details

Defined in Database.PostgreSQL.LibPQ

Methods

(==) :: FlushStatus -> FlushStatus -> Bool #

(/=) :: FlushStatus -> FlushStatus -> Bool #

Eq LoFd 
Instance details

Defined in Database.PostgreSQL.LibPQ

Methods

(==) :: LoFd -> LoFd -> Bool #

(/=) :: LoFd -> LoFd -> Bool #

Eq Result 
Instance details

Defined in Database.PostgreSQL.LibPQ

Methods

(==) :: Result -> Result -> Bool #

(/=) :: Result -> Result -> Bool #

Eq Row 
Instance details

Defined in Database.PostgreSQL.LibPQ

Methods

(==) :: Row -> Row -> Bool #

(/=) :: Row -> Row -> Bool #

Eq ConnStatus 
Instance details

Defined in Database.PostgreSQL.LibPQ.Enums

Methods

(==) :: ConnStatus -> ConnStatus -> Bool #

(/=) :: ConnStatus -> ConnStatus -> Bool #

Eq ExecStatus 
Instance details

Defined in Database.PostgreSQL.LibPQ.Enums

Methods

(==) :: ExecStatus -> ExecStatus -> Bool #

(/=) :: ExecStatus -> ExecStatus -> Bool #

Eq FieldCode 
Instance details

Defined in Database.PostgreSQL.LibPQ.Enums

Methods

(==) :: FieldCode -> FieldCode -> Bool #

(/=) :: FieldCode -> FieldCode -> Bool #

Eq Format 
Instance details

Defined in Database.PostgreSQL.LibPQ.Enums

Methods

(==) :: Format -> Format -> Bool #

(/=) :: Format -> Format -> Bool #

Eq PollingStatus 
Instance details

Defined in Database.PostgreSQL.LibPQ.Enums

Methods

(==) :: PollingStatus -> PollingStatus -> Bool #

(/=) :: PollingStatus -> PollingStatus -> Bool #

Eq TransactionStatus 
Instance details

Defined in Database.PostgreSQL.LibPQ.Enums

Methods

(==) :: TransactionStatus -> TransactionStatus -> Bool #

(/=) :: TransactionStatus -> TransactionStatus -> Bool #

Eq Verbosity 
Instance details

Defined in Database.PostgreSQL.LibPQ.Enums

Methods

(==) :: Verbosity -> Verbosity -> Bool #

(/=) :: Verbosity -> Verbosity -> Bool #

Eq Connection 
Instance details

Defined in Database.PostgreSQL.LibPQ.Internal

Methods

(==) :: Connection -> Connection -> Bool #

(/=) :: Connection -> Connection -> Bool #

Eq Oid 
Instance details

Defined in Database.PostgreSQL.LibPQ.Oid

Methods

(==) :: Oid -> Oid -> Bool #

(/=) :: Oid -> Oid -> Bool #

Eq ArrayFormat 
Instance details

Defined in Database.PostgreSQL.Simple.Arrays

Methods

(==) :: ArrayFormat -> ArrayFormat -> Bool #

(/=) :: ArrayFormat -> ArrayFormat -> Bool #

Eq CopyOutResult 
Instance details

Defined in Database.PostgreSQL.Simple.Copy

Methods

(==) :: CopyOutResult -> CopyOutResult -> Bool #

(/=) :: CopyOutResult -> CopyOutResult -> Bool #

Eq ConstraintViolation 
Instance details

Defined in Database.PostgreSQL.Simple.Errors

Methods

(==) :: ConstraintViolation -> ConstraintViolation -> Bool #

(/=) :: ConstraintViolation -> ConstraintViolation -> Bool #

Eq ResultError 
Instance details

Defined in Database.PostgreSQL.Simple.FromField

Methods

(==) :: ResultError -> ResultError -> Bool #

(/=) :: ResultError -> ResultError -> Bool #

Eq ConnectInfo 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Methods

(==) :: ConnectInfo -> ConnectInfo -> Bool #

(/=) :: ConnectInfo -> ConnectInfo -> Bool #

Eq Connection 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Methods

(==) :: Connection -> Connection -> Bool #

(/=) :: Connection -> Connection -> Bool #

Eq FormatError 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Methods

(==) :: FormatError -> FormatError -> Bool #

(/=) :: FormatError -> FormatError -> Bool #

Eq QueryError 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Methods

(==) :: QueryError -> QueryError -> Bool #

(/=) :: QueryError -> QueryError -> Bool #

Eq SqlError 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Methods

(==) :: SqlError -> SqlError -> Bool #

(/=) :: SqlError -> SqlError -> Bool #

Eq Notification 
Instance details

Defined in Database.PostgreSQL.Simple.Notification

Methods

(==) :: Notification -> Notification -> Bool #

(/=) :: Notification -> Notification -> Bool #

Eq Action Source #

Needed for the 'Eq QueryBuilder' instance

Instance details

Defined in IHP.QueryBuilder

Methods

(==) :: Action -> Action -> Bool #

(/=) :: Action -> Action -> Bool #

Eq IsolationLevel 
Instance details

Defined in Database.PostgreSQL.Simple.Transaction

Methods

(==) :: IsolationLevel -> IsolationLevel -> Bool #

(/=) :: IsolationLevel -> IsolationLevel -> Bool #

Eq ReadWriteMode 
Instance details

Defined in Database.PostgreSQL.Simple.Transaction

Methods

(==) :: ReadWriteMode -> ReadWriteMode -> Bool #

(/=) :: ReadWriteMode -> ReadWriteMode -> Bool #

Eq TransactionMode 
Instance details

Defined in Database.PostgreSQL.Simple.Transaction

Methods

(==) :: TransactionMode -> TransactionMode -> Bool #

(/=) :: TransactionMode -> TransactionMode -> Bool #

Eq Identifier 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

(==) :: Identifier -> Identifier -> Bool #

(/=) :: Identifier -> Identifier -> Bool #

Eq QualifiedIdentifier 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

(==) :: QualifiedIdentifier -> QualifiedIdentifier -> Bool #

(/=) :: QualifiedIdentifier -> QualifiedIdentifier -> Bool #

Eq Query 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

(==) :: Query -> Query -> Bool #

(/=) :: Query -> Query -> Bool #

Eq Savepoint 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

(==) :: Savepoint -> Savepoint -> Bool #

(/=) :: Savepoint -> Savepoint -> 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 Addr 
Instance details

Defined in Data.Primitive.Addr

Methods

(==) :: Addr -> Addr -> Bool #

(/=) :: Addr -> Addr -> 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 Salt 
Instance details

Defined in Crypto.PasswordStore

Methods

(==) :: Salt -> Salt -> Bool #

(/=) :: Salt -> Salt -> Bool #

Eq StdGen 
Instance details

Defined in System.Random.Internal

Methods

(==) :: StdGen -> StdGen -> Bool #

(/=) :: StdGen -> StdGen -> Bool #

Eq CompOption 
Instance details

Defined in Text.Regex.PCRE.Wrap

Methods

(==) :: CompOption -> CompOption -> Bool #

(/=) :: CompOption -> CompOption -> Bool #

Eq ConfigWhat 
Instance details

Defined in Text.Regex.PCRE.Wrap

Methods

(==) :: ConfigWhat -> ConfigWhat -> Bool #

(/=) :: ConfigWhat -> ConfigWhat -> Bool #

Eq ExecOption 
Instance details

Defined in Text.Regex.PCRE.Wrap

Methods

(==) :: ExecOption -> ExecOption -> Bool #

(/=) :: ExecOption -> ExecOption -> Bool #

Eq InfoWhat 
Instance details

Defined in Text.Regex.PCRE.Wrap

Methods

(==) :: InfoWhat -> InfoWhat -> Bool #

(/=) :: InfoWhat -> InfoWhat -> Bool #

Eq ReturnCode 
Instance details

Defined in Text.Regex.PCRE.Wrap

Methods

(==) :: ReturnCode -> ReturnCode -> Bool #

(/=) :: ReturnCode -> ReturnCode -> Bool #

Eq Action 
Instance details

Defined in Text.Regex.TDFA.Common

Methods

(==) :: Action -> Action -> Bool #

(/=) :: Action -> Action -> Bool #

Eq DoPa 
Instance details

Defined in Text.Regex.TDFA.Common

Methods

(==) :: DoPa -> DoPa -> Bool #

(/=) :: DoPa -> DoPa -> Bool #

Eq OP 
Instance details

Defined in Text.Regex.TDFA.Common

Methods

(==) :: OP -> OP -> Bool #

(/=) :: OP -> OP -> Bool #

Eq QT 
Instance details

Defined in Text.Regex.TDFA.Common

Methods

(==) :: QT -> QT -> Bool #

(/=) :: QT -> QT -> Bool #

Eq TagTask 
Instance details

Defined in Text.Regex.TDFA.Common

Methods

(==) :: TagTask -> TagTask -> Bool #

(/=) :: TagTask -> TagTask -> Bool #

Eq TagUpdate 
Instance details

Defined in Text.Regex.TDFA.Common

Methods

(==) :: TagUpdate -> TagUpdate -> Bool #

(/=) :: TagUpdate -> TagUpdate -> Bool #

Eq WhichTest 
Instance details

Defined in Text.Regex.TDFA.Common

Methods

(==) :: WhichTest -> WhichTest -> Bool #

(/=) :: WhichTest -> WhichTest -> Bool #

Eq P 
Instance details

Defined in Text.Regex.TDFA.CorePattern

Methods

(==) :: P -> P -> Bool #

(/=) :: P -> P -> Bool #

Eq Q 
Instance details

Defined in Text.Regex.TDFA.CorePattern

Methods

(==) :: Q -> Q -> Bool #

(/=) :: Q -> Q -> Bool #

Eq SetTestInfo 
Instance details

Defined in Text.Regex.TDFA.CorePattern

Methods

(==) :: SetTestInfo -> SetTestInfo -> Bool #

(/=) :: SetTestInfo -> SetTestInfo -> Bool #

Eq Wanted 
Instance details

Defined in Text.Regex.TDFA.CorePattern

Methods

(==) :: Wanted -> Wanted -> Bool #

(/=) :: Wanted -> Wanted -> Bool #

Eq Pattern 
Instance details

Defined in Text.Regex.TDFA.Pattern

Methods

(==) :: Pattern -> Pattern -> Bool #

(/=) :: Pattern -> Pattern -> Bool #

Eq PatternSet 
Instance details

Defined in Text.Regex.TDFA.Pattern

Methods

(==) :: PatternSet -> PatternSet -> Bool #

(/=) :: PatternSet -> PatternSet -> Bool #

Eq PatternSetCharacterClass 
Instance details

Defined in Text.Regex.TDFA.Pattern

Methods

(==) :: PatternSetCharacterClass -> PatternSetCharacterClass -> Bool #

(/=) :: PatternSetCharacterClass -> PatternSetCharacterClass -> Bool #

Eq PatternSetCollatingElement 
Instance details

Defined in Text.Regex.TDFA.Pattern

Methods

(==) :: PatternSetCollatingElement -> PatternSetCollatingElement -> Bool #

(/=) :: PatternSetCollatingElement -> PatternSetCollatingElement -> Bool #

Eq PatternSetEquivalenceClass 
Instance details

Defined in Text.Regex.TDFA.Pattern

Methods

(==) :: PatternSetEquivalenceClass -> PatternSetEquivalenceClass -> Bool #

(/=) :: PatternSetEquivalenceClass -> PatternSetEquivalenceClass -> Bool #

Eq Undefined 
Instance details

Defined in Relude.Debug

Methods

(==) :: Undefined -> Undefined -> Bool #

(/=) :: Undefined -> Undefined -> Bool #

Eq Acquisition 
Instance details

Defined in Data.Pool.Introspection

Methods

(==) :: Acquisition -> Acquisition -> Bool #

(/=) :: Acquisition -> Acquisition -> 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 Scientific 
Instance details

Defined in Data.Scientific

Methods

(==) :: Scientific -> Scientific -> Bool #

(/=) :: Scientific -> Scientific -> Bool #

Eq SemaphoreName 
Instance details

Defined in System.Semaphore

Methods

(==) :: SemaphoreName -> SemaphoreName -> Bool #

(/=) :: SemaphoreName -> SemaphoreName -> Bool #

Eq Skein_1024_1024 
Instance details

Defined in Crypto.Skein

Methods

(==) :: Skein_1024_1024 -> Skein_1024_1024 -> Bool #

(/=) :: Skein_1024_1024 -> Skein_1024_1024 -> Bool #

Eq Skein_1024_384 
Instance details

Defined in Crypto.Skein

Methods

(==) :: Skein_1024_384 -> Skein_1024_384 -> Bool #

(/=) :: Skein_1024_384 -> Skein_1024_384 -> Bool #

Eq Skein_1024_512 
Instance details

Defined in Crypto.Skein

Methods

(==) :: Skein_1024_512 -> Skein_1024_512 -> Bool #

(/=) :: Skein_1024_512 -> Skein_1024_512 -> Bool #

Eq Skein_256_128 
Instance details

Defined in Crypto.Skein

Methods

(==) :: Skein_256_128 -> Skein_256_128 -> Bool #

(/=) :: Skein_256_128 -> Skein_256_128 -> Bool #

Eq Skein_256_160 
Instance details

Defined in Crypto.Skein

Methods

(==) :: Skein_256_160 -> Skein_256_160 -> Bool #

(/=) :: Skein_256_160 -> Skein_256_160 -> Bool #

Eq Skein_256_224 
Instance details

Defined in Crypto.Skein

Methods

(==) :: Skein_256_224 -> Skein_256_224 -> Bool #

(/=) :: Skein_256_224 -> Skein_256_224 -> Bool #

Eq Skein_256_256 
Instance details

Defined in Crypto.Skein

Methods

(==) :: Skein_256_256 -> Skein_256_256 -> Bool #

(/=) :: Skein_256_256 -> Skein_256_256 -> Bool #

Eq Skein_512_128 
Instance details

Defined in Crypto.Skein

Methods

(==) :: Skein_512_128 -> Skein_512_128 -> Bool #

(/=) :: Skein_512_128 -> Skein_512_128 -> Bool #

Eq Skein_512_160 
Instance details

Defined in Crypto.Skein

Methods

(==) :: Skein_512_160 -> Skein_512_160 -> Bool #

(/=) :: Skein_512_160 -> Skein_512_160 -> Bool #

Eq Skein_512_224 
Instance details

Defined in Crypto.Skein

Methods

(==) :: Skein_512_224 -> Skein_512_224 -> Bool #

(/=) :: Skein_512_224 -> Skein_512_224 -> Bool #

Eq Skein_512_256 
Instance details

Defined in Crypto.Skein

Methods

(==) :: Skein_512_256 -> Skein_512_256 -> Bool #

(/=) :: Skein_512_256 -> Skein_512_256 -> Bool #

Eq Skein_512_384 
Instance details

Defined in Crypto.Skein

Methods

(==) :: Skein_512_384 -> Skein_512_384 -> Bool #

(/=) :: Skein_512_384 -> Skein_512_384 -> Bool #

Eq Skein_512_512 
Instance details

Defined in Crypto.Skein

Methods

(==) :: Skein_512_512 -> Skein_512_512 -> Bool #

(/=) :: Skein_512_512 -> Skein_512_512 -> Bool #

Eq SMTPConnection 
Instance details

Defined in Network.Mail.SMTP

Methods

(==) :: SMTPConnection -> SMTPConnection -> Bool #

(/=) :: SMTPConnection -> SMTPConnection -> Bool #

Eq AuthType 
Instance details

Defined in Network.Mail.SMTP.Auth

Methods

(==) :: AuthType -> AuthType -> Bool #

(/=) :: AuthType -> AuthType -> Bool #

Eq Command 
Instance details

Defined in Network.Mail.SMTP.Types

Methods

(==) :: Command -> Command -> Bool #

(/=) :: Command -> Command -> Bool #

Eq Response 
Instance details

Defined in Network.Mail.SMTP.Types

Methods

(==) :: Response -> Response -> Bool #

(/=) :: Response -> Response -> Bool #

Eq SocksAddress 
Instance details

Defined in Network.Socks5.Types

Methods

(==) :: SocksAddress -> SocksAddress -> Bool #

(/=) :: SocksAddress -> SocksAddress -> Bool #

Eq SocksCommand 
Instance details

Defined in Network.Socks5.Types

Methods

(==) :: SocksCommand -> SocksCommand -> Bool #

(/=) :: SocksCommand -> SocksCommand -> Bool #

Eq SocksError 
Instance details

Defined in Network.Socks5.Types

Methods

(==) :: SocksError -> SocksError -> Bool #

(/=) :: SocksError -> SocksError -> Bool #

Eq SocksHostAddress 
Instance details

Defined in Network.Socks5.Types

Methods

(==) :: SocksHostAddress -> SocksHostAddress -> Bool #

(/=) :: SocksHostAddress -> SocksHostAddress -> Bool #

Eq SocksMethod 
Instance details

Defined in Network.Socks5.Types

Methods

(==) :: SocksMethod -> SocksMethod -> Bool #

(/=) :: SocksMethod -> SocksMethod -> Bool #

Eq SocksReply 
Instance details

Defined in Network.Socks5.Types

Methods

(==) :: SocksReply -> SocksReply -> Bool #

(/=) :: SocksReply -> SocksReply -> Bool #

Eq SocksVersion 
Instance details

Defined in Network.Socks5.Types

Methods

(==) :: SocksVersion -> SocksVersion -> Bool #

(/=) :: SocksVersion -> SocksVersion -> 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 TSem 
Instance details

Defined in Control.Concurrent.STM.TSem

Methods

(==) :: TSem -> TSem -> Bool #

(/=) :: TSem -> TSem -> Bool #

Eq FileType 
Instance details

Defined in Data.Streaming.Filesystem

Methods

(==) :: FileType -> FileType -> Bool #

(/=) :: FileType -> FileType -> Bool #

Eq HostPreference 
Instance details

Defined in Data.Streaming.Network.Internal

Methods

(==) :: HostPreference -> HostPreference -> Bool #

(/=) :: HostPreference -> HostPreference -> Bool #

Eq CodePoint 
Instance details

Defined in Data.Streaming.Text

Methods

(==) :: CodePoint -> CodePoint -> Bool #

(/=) :: CodePoint -> CodePoint -> Bool #

Eq DecoderState 
Instance details

Defined in Data.Streaming.Text

Methods

(==) :: DecoderState -> DecoderState -> Bool #

(/=) :: DecoderState -> DecoderState -> Bool #

Eq Strategy 
Instance details

Defined in Data.Streaming.Zlib.Lowlevel

Methods

(==) :: Strategy -> Strategy -> Bool #

(/=) :: Strategy -> Strategy -> 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 Color 
Instance details

Defined in System.Console.Terminfo.Color

Methods

(==) :: Color -> Color -> Bool #

(/=) :: Color -> Color -> Bool #

Eq UnicodeException 
Instance details

Defined in Data.Text.Encoding.Error

Methods

(==) :: UnicodeException -> UnicodeException -> Bool #

(/=) :: UnicodeException -> UnicodeException -> Bool #

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 CalendarDiffDays 
Instance details

Defined in Data.Time.Calendar.CalendarDiffDays

Eq Day 
Instance details

Defined in Data.Time.Calendar.Days

Methods

(==) :: Day -> Day -> Bool #

(/=) :: Day -> Day -> Bool #

Eq Month 
Instance details

Defined in Data.Time.Calendar.Month

Methods

(==) :: Month -> Month -> Bool #

(/=) :: Month -> Month -> Bool #

Eq Quarter 
Instance details

Defined in Data.Time.Calendar.Quarter

Methods

(==) :: Quarter -> Quarter -> Bool #

(/=) :: Quarter -> Quarter -> Bool #

Eq QuarterOfYear 
Instance details

Defined in Data.Time.Calendar.Quarter

Methods

(==) :: QuarterOfYear -> QuarterOfYear -> Bool #

(/=) :: QuarterOfYear -> QuarterOfYear -> Bool #

Eq DayOfWeek 
Instance details

Defined in Data.Time.Calendar.Week

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

Eq NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Eq SystemTime 
Instance details

Defined in Data.Time.Clock.Internal.SystemTime

Methods

(==) :: SystemTime -> SystemTime -> Bool #

(/=) :: SystemTime -> SystemTime -> Bool #

Eq UTCTime 
Instance details

Defined in Data.Time.Clock.Internal.UTCTime

Methods

(==) :: UTCTime -> UTCTime -> Bool #

(/=) :: UTCTime -> UTCTime -> Bool #

Eq UniversalTime 
Instance details

Defined in Data.Time.Clock.Internal.UniversalTime

Eq TimeLocale 
Instance details

Defined in Data.Time.Format.Locale

Eq CalendarDiffTime 
Instance details

Defined in Data.Time.LocalTime.Internal.CalendarDiffTime

Eq LocalTime 
Instance details

Defined in Data.Time.LocalTime.Internal.LocalTime

Eq TimeOfDay 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeOfDay

Eq TimeZone 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeZone

Eq Attosecond 
Instance details

Defined in Data.Time.Units

Methods

(==) :: Attosecond -> Attosecond -> Bool #

(/=) :: Attosecond -> Attosecond -> Bool #

Eq Day 
Instance details

Defined in Data.Time.Units

Methods

(==) :: Day -> Day -> Bool #

(/=) :: Day -> Day -> Bool #

Eq Femtosecond 
Instance details

Defined in Data.Time.Units

Methods

(==) :: Femtosecond -> Femtosecond -> Bool #

(/=) :: Femtosecond -> Femtosecond -> Bool #

Eq Fortnight 
Instance details

Defined in Data.Time.Units

Methods

(==) :: Fortnight -> Fortnight -> Bool #

(/=) :: Fortnight -> Fortnight -> Bool #

Eq Hour 
Instance details

Defined in Data.Time.Units

Methods

(==) :: Hour -> Hour -> Bool #

(/=) :: Hour -> Hour -> Bool #

Eq Microsecond 
Instance details

Defined in Data.Time.Units

Methods

(==) :: Microsecond -> Microsecond -> Bool #

(/=) :: Microsecond -> Microsecond -> Bool #

Eq Millisecond 
Instance details

Defined in Data.Time.Units

Methods

(==) :: Millisecond -> Millisecond -> Bool #

(/=) :: Millisecond -> Millisecond -> Bool #

Eq Minute 
Instance details

Defined in Data.Time.Units

Methods

(==) :: Minute -> Minute -> Bool #

(/=) :: Minute -> Minute -> Bool #

Eq Nanosecond 
Instance details

Defined in Data.Time.Units

Methods

(==) :: Nanosecond -> Nanosecond -> Bool #

(/=) :: Nanosecond -> Nanosecond -> Bool #

Eq Picosecond 
Instance details

Defined in Data.Time.Units

Methods

(==) :: Picosecond -> Picosecond -> Bool #

(/=) :: Picosecond -> Picosecond -> Bool #

Eq Second 
Instance details

Defined in Data.Time.Units

Methods

(==) :: Second -> Second -> Bool #

(/=) :: Second -> Second -> Bool #

Eq Week 
Instance details

Defined in Data.Time.Units

Methods

(==) :: Week -> Week -> Bool #

(/=) :: Week -> Week -> Bool #

Eq Bulk 
Instance details

Defined in Network.TLS.Cipher

Methods

(==) :: Bulk -> Bulk -> Bool #

(/=) :: Bulk -> Bulk -> Bool #

Eq BulkDirection 
Instance details

Defined in Network.TLS.Cipher

Methods

(==) :: BulkDirection -> BulkDirection -> Bool #

(/=) :: BulkDirection -> BulkDirection -> Bool #

Eq Cipher 
Instance details

Defined in Network.TLS.Cipher

Methods

(==) :: Cipher -> Cipher -> Bool #

(/=) :: Cipher -> Cipher -> Bool #

Eq CipherKeyExchangeType 
Instance details

Defined in Network.TLS.Cipher

Methods

(==) :: CipherKeyExchangeType -> CipherKeyExchangeType -> Bool #

(/=) :: CipherKeyExchangeType -> CipherKeyExchangeType -> Bool #

Eq Compression 
Instance details

Defined in Network.TLS.Compression

Methods

(==) :: Compression -> Compression -> Bool #

(/=) :: Compression -> Compression -> Bool #

Eq ByteArrayPair 
Instance details

Defined in Data.Tuple.Types

Methods

(==) :: ByteArrayPair -> ByteArrayPair -> Bool #

(/=) :: ByteArrayPair -> ByteArrayPair -> Bool #

Eq ByteArrayTriple 
Instance details

Defined in Data.Tuple.Types

Methods

(==) :: ByteArrayTriple -> ByteArrayTriple -> Bool #

(/=) :: ByteArrayTriple -> ByteArrayTriple -> Bool #

Eq DoublePair 
Instance details

Defined in Data.Tuple.Types

Methods

(==) :: DoublePair -> DoublePair -> Bool #

(/=) :: DoublePair -> DoublePair -> Bool #

Eq DoubleTriple 
Instance details

Defined in Data.Tuple.Types

Methods

(==) :: DoubleTriple -> DoubleTriple -> Bool #

(/=) :: DoubleTriple -> DoubleTriple -> Bool #

Eq IntPair 
Instance details

Defined in Data.Tuple.Types

Methods

(==) :: IntPair -> IntPair -> Bool #

(/=) :: IntPair -> IntPair -> Bool #

Eq IntTriple 
Instance details

Defined in Data.Tuple.Types

Methods

(==) :: IntTriple -> IntTriple -> Bool #

(/=) :: IntTriple -> IntTriple -> Bool #

Eq WordPair 
Instance details

Defined in Data.Tuple.Types

Methods

(==) :: WordPair -> WordPair -> Bool #

(/=) :: WordPair -> WordPair -> Bool #

Eq WordTriple 
Instance details

Defined in Data.Tuple.Types

Methods

(==) :: WordTriple -> WordTriple -> Bool #

(/=) :: WordTriple -> WordTriple -> Bool #

Eq Advice 
Instance details

Defined in System.Posix.Fcntl

Methods

(==) :: Advice -> Advice -> Bool #

(/=) :: Advice -> Advice -> 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 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 Unique 
Instance details

Defined in Data.Unique.Really

Methods

(==) :: Unique -> Unique -> Bool #

(/=) :: Unique -> Unique -> 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 Order 
Instance details

Defined in Data.Vector.Algorithms.Tim

Methods

(==) :: Order -> Order -> Bool #

(/=) :: Order -> Order -> Bool #

Eq Piece 
Instance details

Defined in WaiAppStatic.Types

Methods

(==) :: Piece -> Piece -> Bool #

(/=) :: Piece -> Piece -> Bool #

Eq CorsResourcePolicy 
Instance details

Defined in Network.Wai.Middleware.Cors

Methods

(==) :: CorsResourcePolicy -> CorsResourcePolicy -> Bool #

(/=) :: CorsResourcePolicy -> CorsResourcePolicy -> Bool #

Eq CombineSettings 
Instance details

Defined in Network.Wai.Middleware.CombineHeaders

Methods

(==) :: CombineSettings -> CombineSettings -> Bool #

(/=) :: CombineSettings -> CombineSettings -> Bool #

Eq HandleType 
Instance details

Defined in Network.Wai.Middleware.CombineHeaders

Methods

(==) :: HandleType -> HandleType -> Bool #

(/=) :: HandleType -> HandleType -> Bool #

Eq GzipFiles 
Instance details

Defined in Network.Wai.Middleware.Gzip

Methods

(==) :: GzipFiles -> GzipFiles -> Bool #

(/=) :: GzipFiles -> GzipFiles -> Bool #

Eq Bound 
Instance details

Defined in Network.Wai.Parse

Methods

(==) :: Bound -> Bound -> Bool #

(/=) :: Bound -> Bound -> Bool #

Eq RequestParseException 
Instance details

Defined in Network.Wai.Parse

Methods

(==) :: RequestParseException -> RequestParseException -> Bool #

(/=) :: RequestParseException -> RequestParseException -> Bool #

Eq RequestSizeException 
Instance details

Defined in Network.Wai.Request

Methods

(==) :: RequestSizeException -> RequestSizeException -> Bool #

(/=) :: RequestSizeException -> RequestSizeException -> Bool #

Eq SResponse 
Instance details

Defined in Network.Wai.Test

Methods

(==) :: SResponse -> SResponse -> Bool #

(/=) :: SResponse -> SResponse -> Bool #

Eq InvalidRequest 
Instance details

Defined in Network.Wai.Handler.Warp.Types

Methods

(==) :: InvalidRequest -> InvalidRequest -> Bool #

(/=) :: InvalidRequest -> InvalidRequest -> Bool #

Eq CompressionOptions 
Instance details

Defined in Network.WebSockets.Connection.Options

Methods

(==) :: CompressionOptions -> CompressionOptions -> Bool #

(/=) :: CompressionOptions -> CompressionOptions -> Bool #

Eq PermessageDeflate 
Instance details

Defined in Network.WebSockets.Connection.Options

Methods

(==) :: PermessageDeflate -> PermessageDeflate -> Bool #

(/=) :: PermessageDeflate -> PermessageDeflate -> Bool #

Eq SizeLimit 
Instance details

Defined in Network.WebSockets.Connection.Options

Methods

(==) :: SizeLimit -> SizeLimit -> Bool #

(/=) :: SizeLimit -> SizeLimit -> Bool #

Eq ConnectionException 
Instance details

Defined in Network.WebSockets.Types

Methods

(==) :: ConnectionException -> ConnectionException -> Bool #

(/=) :: ConnectionException -> ConnectionException -> Bool #

Eq ConnectionType 
Instance details

Defined in Network.WebSockets.Types

Methods

(==) :: ConnectionType -> ConnectionType -> Bool #

(/=) :: ConnectionType -> ConnectionType -> Bool #

Eq ControlMessage 
Instance details

Defined in Network.WebSockets.Types

Methods

(==) :: ControlMessage -> ControlMessage -> Bool #

(/=) :: ControlMessage -> ControlMessage -> Bool #

Eq DataMessage 
Instance details

Defined in Network.WebSockets.Types

Methods

(==) :: DataMessage -> DataMessage -> Bool #

(/=) :: DataMessage -> DataMessage -> Bool #

Eq Message 
Instance details

Defined in Network.WebSockets.Types

Methods

(==) :: Message -> Message -> Bool #

(/=) :: Message -> Message -> Bool #

Eq Int128 
Instance details

Defined in Data.WideWord.Int128

Methods

(==) :: Int128 -> Int128 -> Bool #

(/=) :: Int128 -> Int128 -> Bool #

Eq Word128 
Instance details

Defined in Data.WideWord.Word128

Methods

(==) :: Word128 -> Word128 -> Bool #

(/=) :: Word128 -> Word128 -> Bool #

Eq Word256 
Instance details

Defined in Data.WideWord.Word256

Methods

(==) :: Word256 -> Word256 -> Bool #

(/=) :: Word256 -> Word256 -> Bool #

Eq Document 
Instance details

Defined in Text.XML

Methods

(==) :: Document -> Document -> Bool #

(/=) :: Document -> Document -> Bool #

Eq Element 
Instance details

Defined in Text.XML

Methods

(==) :: Element -> Element -> Bool #

(/=) :: Element -> Element -> Bool #

Eq Node 
Instance details

Defined in Text.XML

Methods

(==) :: Node -> Node -> Bool #

(/=) :: Node -> Node -> Bool #

Eq Content 
Instance details

Defined in Data.XML.Types

Methods

(==) :: Content -> Content -> Bool #

(/=) :: Content -> Content -> Bool #

Eq Doctype 
Instance details

Defined in Data.XML.Types

Methods

(==) :: Doctype -> Doctype -> Bool #

(/=) :: Doctype -> Doctype -> Bool #

Eq Document 
Instance details

Defined in Data.XML.Types

Methods

(==) :: Document -> Document -> Bool #

(/=) :: Document -> Document -> Bool #

Eq Element 
Instance details

Defined in Data.XML.Types

Methods

(==) :: Element -> Element -> Bool #

(/=) :: Element -> Element -> Bool #

Eq Event 
Instance details

Defined in Data.XML.Types

Methods

(==) :: Event -> Event -> Bool #

(/=) :: Event -> Event -> Bool #

Eq ExternalID 
Instance details

Defined in Data.XML.Types

Methods

(==) :: ExternalID -> ExternalID -> Bool #

(/=) :: ExternalID -> ExternalID -> Bool #

Eq Instruction 
Instance details

Defined in Data.XML.Types

Methods

(==) :: Instruction -> Instruction -> Bool #

(/=) :: Instruction -> Instruction -> Bool #

Eq Miscellaneous 
Instance details

Defined in Data.XML.Types

Methods

(==) :: Miscellaneous -> Miscellaneous -> Bool #

(/=) :: Miscellaneous -> Miscellaneous -> Bool #

Eq Name 
Instance details

Defined in Data.XML.Types

Methods

(==) :: Name -> Name -> Bool #

(/=) :: Name -> Name -> Bool #

Eq Node 
Instance details

Defined in Data.XML.Types

Methods

(==) :: Node -> Node -> Bool #

(/=) :: Node -> Node -> Bool #

Eq Prologue 
Instance details

Defined in Data.XML.Types

Methods

(==) :: Prologue -> Prologue -> Bool #

(/=) :: Prologue -> Prologue -> Bool #

Eq DecompressError 
Instance details

Defined in Codec.Compression.Zlib.Internal

Methods

(==) :: DecompressError -> DecompressError -> Bool #

(/=) :: DecompressError -> DecompressError -> 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 a => Eq (Only a) 
Instance details

Defined in Data.Tuple.Only

Methods

(==) :: Only a -> Only a -> Bool #

(/=) :: Only a -> Only a -> Bool #

Eq a => Eq (Blind a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(==) :: Blind a -> Blind a -> Bool #

(/=) :: Blind a -> Blind a -> Bool #

Eq a => Eq (Fixed a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(==) :: Fixed a -> Fixed a -> Bool #

(/=) :: Fixed a -> Fixed a -> Bool #

Eq a => Eq (Large a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(==) :: Large a -> Large a -> Bool #

(/=) :: Large a -> Large a -> Bool #

Eq a => Eq (Negative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(==) :: Negative a -> Negative a -> Bool #

(/=) :: Negative a -> Negative a -> Bool #

Eq a => Eq (NonEmptyList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(==) :: NonEmptyList a -> NonEmptyList a -> Bool #

(/=) :: NonEmptyList a -> NonEmptyList a -> Bool #

Eq a => Eq (NonNegative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(==) :: NonNegative a -> NonNegative a -> Bool #

(/=) :: NonNegative a -> NonNegative a -> Bool #

Eq a => Eq (NonPositive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(==) :: NonPositive a -> NonPositive a -> Bool #

(/=) :: NonPositive a -> NonPositive a -> Bool #

Eq a => Eq (NonZero a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(==) :: NonZero a -> NonZero a -> Bool #

(/=) :: NonZero a -> NonZero a -> Bool #

Eq a => Eq (OrderedList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(==) :: OrderedList a -> OrderedList a -> Bool #

(/=) :: OrderedList a -> OrderedList a -> Bool #

Eq a => Eq (Positive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(==) :: Positive a -> Positive a -> Bool #

(/=) :: Positive a -> Positive a -> Bool #

Eq a => Eq (Shrink2 a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(==) :: Shrink2 a -> Shrink2 a -> Bool #

(/=) :: Shrink2 a -> Shrink2 a -> Bool #

Eq a => Eq (Small a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(==) :: Small a -> Small a -> Bool #

(/=) :: Small a -> Small a -> Bool #

Eq a => Eq (SortedList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

(==) :: SortedList a -> SortedList a -> Bool #

(/=) :: SortedList a -> SortedList a -> Bool #

Eq (Digest t) 
Instance details

Defined in Data.Digest.Pure.SHA

Methods

(==) :: Digest t -> Digest t -> Bool #

(/=) :: Digest t -> Digest t -> 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 (Async a) 
Instance details

Defined in Control.Concurrent.Async.Internal

Methods

(==) :: Async a -> Async a -> Bool #

(/=) :: Async a -> Async a -> Bool #

Eq (Ticket a) 
Instance details

Defined in Data.Atomics.Internal

Methods

(==) :: Ticket a -> Ticket a -> Bool #

(/=) :: Ticket a -> Ticket 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

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 (Array a) 
Instance details

Defined in Basement.BoxedArray

Methods

(==) :: Array a -> Array a -> Bool #

(/=) :: Array a -> Array a -> Bool #

Eq a => Eq (BE a) 
Instance details

Defined in Basement.Endianness

Methods

(==) :: BE a -> BE a -> Bool #

(/=) :: BE a -> BE a -> Bool #

Eq a => Eq (LE a) 
Instance details

Defined in Basement.Endianness

Methods

(==) :: LE a -> LE a -> Bool #

(/=) :: LE a -> LE a -> Bool #

Eq (FinalPtr a) 
Instance details

Defined in Basement.FinalPtr

Methods

(==) :: FinalPtr a -> FinalPtr a -> Bool #

(/=) :: FinalPtr a -> FinalPtr a -> 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 (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 (IV k) 
Instance details

Defined in Crypto.Types

Methods

(==) :: IV k -> IV k -> Bool #

(/=) :: IV k -> IV k -> Bool #

Eq (HMAC a) 
Instance details

Defined in Crypto.Hash

Methods

(==) :: HMAC a -> HMAC a -> Bool #

(/=) :: HMAC a -> HMAC a -> Bool #

Eq (Digest a) 
Instance details

Defined in Crypto.Hash.Types

Methods

(==) :: Digest a -> Digest a -> Bool #

(/=) :: Digest a -> Digest 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 #

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 (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 v => Eq (UniqueMap v) 
Instance details

Defined in GHC.Cmm.Dataflow.Collections

Methods

(==) :: UniqueMap v -> UniqueMap v -> Bool #

(/=) :: UniqueMap v -> UniqueMap v -> Bool #

Eq v => Eq (LabelMap v) 
Instance details

Defined in GHC.Cmm.Dataflow.Label

Methods

(==) :: LabelMap v -> LabelMap v -> Bool #

(/=) :: LabelMap v -> LabelMap v -> Bool #

Eq (CoAxiom br) 
Instance details

Defined in GHC.Core.Coercion.Axiom

Methods

(==) :: CoAxiom br -> CoAxiom br -> Bool #

(/=) :: CoAxiom br -> CoAxiom br -> Bool #

Eq (DeBruijn Coercion) 
Instance details

Defined in GHC.Core.Map.Type

Methods

(==) :: DeBruijn Coercion -> DeBruijn Coercion -> Bool #

(/=) :: DeBruijn Coercion -> DeBruijn Coercion -> Bool #

Eq (DeBruijn Type) 
Instance details

Defined in GHC.Core.Map.Type

Methods

(==) :: DeBruijn Type -> DeBruijn Type -> Bool #

(/=) :: DeBruijn Type -> DeBruijn Type -> Bool #

Eq (DeBruijn Var) 
Instance details

Defined in GHC.Core.Map.Type

Methods

(==) :: DeBruijn Var -> DeBruijn Var -> Bool #

(/=) :: DeBruijn Var -> DeBruijn Var -> Bool #

Eq (DeBruijn a) => Eq (DeBruijn (Maybe a)) 
Instance details

Defined in GHC.Core.Map.Type

Methods

(==) :: DeBruijn (Maybe a) -> DeBruijn (Maybe a) -> Bool #

(/=) :: DeBruijn (Maybe a) -> DeBruijn (Maybe a) -> Bool #

Eq (DeBruijn a) => Eq (DeBruijn [a]) 
Instance details

Defined in GHC.Core.Map.Type

Methods

(==) :: DeBruijn [a] -> DeBruijn [a] -> Bool #

(/=) :: DeBruijn [a] -> DeBruijn [a] -> Bool #

Eq a => Eq (FromListCounting a) 
Instance details

Defined in GHC.Data.Graph.Inductive.PatriciaTree

Methods

(==) :: FromListCounting a -> FromListCounting a -> Bool #

(/=) :: FromListCounting a -> FromListCounting a -> Bool #

Eq a => Eq (OnOff a) 
Instance details

Defined in GHC.Driver.DynFlags

Methods

(==) :: OnOff a -> OnOff a -> Bool #

(/=) :: OnOff a -> OnOff a -> Bool #

Eq a => Eq (IdentSupply a) 
Instance details

Defined in GHC.JS.Unsat.Syntax

Methods

(==) :: IdentSupply a -> IdentSupply a -> Bool #

(/=) :: IdentSupply a -> IdentSupply a -> Bool #

Eq ann => Eq (EpAnn ann) 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: EpAnn ann -> EpAnn ann -> Bool #

(/=) :: EpAnn ann -> EpAnn ann -> Bool #

Eq a => Eq (SrcSpanAnn' a) 
Instance details

Defined in GHC.Parser.Annotation

Methods

(==) :: SrcSpanAnn' a -> SrcSpanAnn' a -> Bool #

(/=) :: SrcSpanAnn' a -> SrcSpanAnn' a -> Bool #

Eq tc => Eq (TyConFlavour tc) 
Instance details

Defined in GHC.Types.Basic

Methods

(==) :: TyConFlavour tc -> TyConFlavour tc -> Bool #

(/=) :: TyConFlavour tc -> TyConFlavour tc -> Bool #

Eq (GenTickish 'TickishPassCmm) 
Instance details

Defined in GHC.Types.Tickish

Methods

(==) :: GenTickish 'TickishPassCmm -> GenTickish 'TickishPassCmm -> Bool #

(/=) :: GenTickish 'TickishPassCmm -> GenTickish 'TickishPassCmm -> Bool #

Eq (GenTickish 'TickishPassCore) 
Instance details

Defined in GHC.Types.Tickish

Methods

(==) :: GenTickish 'TickishPassCore -> GenTickish 'TickishPassCore -> Bool #

(/=) :: GenTickish 'TickishPassCore -> GenTickish 'TickishPassCore -> Bool #

(Eq (HsToken "in"), Eq (IdP pass)) => Eq (WarningTxt pass) 
Instance details

Defined in GHC.Unit.Module.Warnings

Methods

(==) :: WarningTxt pass -> WarningTxt pass -> Bool #

(/=) :: WarningTxt pass -> WarningTxt pass -> Bool #

Eq (IdP pass) => Eq (Warnings pass) 
Instance details

Defined in GHC.Unit.Module.Warnings

Methods

(==) :: Warnings pass -> Warnings pass -> Bool #

(/=) :: Warnings pass -> Warnings pass -> Bool #

Eq unit => Eq (Definite unit) 
Instance details

Defined in GHC.Unit.Types

Methods

(==) :: Definite unit -> Definite unit -> Bool #

(/=) :: Definite unit -> Definite unit -> Bool #

Eq (GenInstantiatedUnit unit) 
Instance details

Defined in GHC.Unit.Types

Methods

(==) :: GenInstantiatedUnit unit -> GenInstantiatedUnit unit -> Bool #

(/=) :: GenInstantiatedUnit unit -> GenInstantiatedUnit unit -> Bool #

Eq unit => Eq (GenModule unit) 
Instance details

Defined in GHC.Unit.Types

Methods

(==) :: GenModule unit -> GenModule unit -> Bool #

(/=) :: GenModule unit -> GenModule unit -> Bool #

IsUnitId u => Eq (GenUnit u) 
Instance details

Defined in GHC.Unit.Types

Methods

(==) :: GenUnit u -> GenUnit u -> Bool #

(/=) :: GenUnit u -> GenUnit u -> Bool #

Eq mod => Eq (GenWithIsBoot mod) 
Instance details

Defined in GHC.Unit.Types

Methods

(==) :: GenWithIsBoot mod -> GenWithIsBoot mod -> Bool #

(/=) :: GenWithIsBoot mod -> GenWithIsBoot mod -> Bool #

Eq a => Eq (DataDefnCons a) 
Instance details

Defined in Language.Haskell.Syntax.Decls

Methods

(==) :: DataDefnCons a -> DataDefnCons a -> Bool #

(/=) :: DataDefnCons a -> DataDefnCons a -> Bool #

Eq (HsLit x) 
Instance details

Defined in Language.Haskell.Syntax.Lit

Methods

(==) :: HsLit x -> HsLit x -> Bool #

(/=) :: HsLit x -> HsLit x -> Bool #

Eq (XXOverLit p) => Eq (HsOverLit p) 
Instance details

Defined in Language.Haskell.Syntax.Lit

Methods

(==) :: HsOverLit p -> HsOverLit p -> Bool #

(/=) :: HsOverLit p -> HsOverLit p -> Bool #

(Eq (XRec pass RdrName), Eq (XCFieldOcc pass), Eq (XXFieldOcc pass)) => Eq (FieldOcc pass) 
Instance details

Defined in Language.Haskell.Syntax.Type

Methods

(==) :: FieldOcc pass -> FieldOcc pass -> Bool #

(/=) :: FieldOcc pass -> FieldOcc pass -> Bool #

Eq a => Eq (Hashed a) 
Instance details

Defined in Data.Hashable.Class

Methods

(==) :: Hashed a -> Hashed a -> Bool #

(/=) :: Hashed a -> Hashed a -> Bool #

Eq a => Eq (ListOf a) 
Instance details

Defined in Language.Haskell.Exts.Parser

Methods

(==) :: ListOf a -> ListOf a -> Bool #

(/=) :: ListOf a -> ListOf a -> Bool #

Eq l => Eq (ModuleHeadAndImports l) 
Instance details

Defined in Language.Haskell.Exts.Parser

Methods

(==) :: ModuleHeadAndImports l -> ModuleHeadAndImports l -> Bool #

(/=) :: ModuleHeadAndImports l -> ModuleHeadAndImports l -> Bool #

Eq a => Eq (NonGreedy a) 
Instance details

Defined in Language.Haskell.Exts.Parser

Methods

(==) :: NonGreedy a -> NonGreedy a -> Bool #

(/=) :: NonGreedy a -> NonGreedy a -> Bool #

Eq l => Eq (PragmasAndModuleHead l) 
Instance details

Defined in Language.Haskell.Exts.Parser

Methods

(==) :: PragmasAndModuleHead l -> PragmasAndModuleHead l -> Bool #

(/=) :: PragmasAndModuleHead l -> PragmasAndModuleHead l -> Bool #

Eq l => Eq (PragmasAndModuleName l) 
Instance details

Defined in Language.Haskell.Exts.Parser

Methods

(==) :: PragmasAndModuleName l -> PragmasAndModuleName l -> Bool #

(/=) :: PragmasAndModuleName l -> PragmasAndModuleName l -> Bool #

Eq a => Eq (Loc a) 
Instance details

Defined in Language.Haskell.Exts.SrcLoc

Methods

(==) :: Loc a -> Loc a -> Bool #

(/=) :: Loc a -> Loc a -> Bool #

Eq l => Eq (Activation l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Activation l -> Activation l -> Bool #

(/=) :: Activation l -> Activation l -> Bool #

Eq l => Eq (Alt l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Alt l -> Alt l -> Bool #

(/=) :: Alt l -> Alt l -> Bool #

Eq l => Eq (Annotation l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Annotation l -> Annotation l -> Bool #

(/=) :: Annotation l -> Annotation l -> Bool #

Eq l => Eq (Assoc l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Assoc l -> Assoc l -> Bool #

(/=) :: Assoc l -> Assoc l -> Bool #

Eq l => Eq (Asst l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Asst l -> Asst l -> Bool #

(/=) :: Asst l -> Asst l -> Bool #

Eq l => Eq (BangType l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: BangType l -> BangType l -> Bool #

(/=) :: BangType l -> BangType l -> Bool #

Eq l => Eq (Binds l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Binds l -> Binds l -> Bool #

(/=) :: Binds l -> Binds l -> Bool #

Eq l => Eq (BooleanFormula l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: BooleanFormula l -> BooleanFormula l -> Bool #

(/=) :: BooleanFormula l -> BooleanFormula l -> Bool #

Eq l => Eq (Bracket l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Bracket l -> Bracket l -> Bool #

(/=) :: Bracket l -> Bracket l -> Bool #

Eq l => Eq (CName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: CName l -> CName l -> Bool #

(/=) :: CName l -> CName l -> Bool #

Eq l => Eq (CallConv l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: CallConv l -> CallConv l -> Bool #

(/=) :: CallConv l -> CallConv l -> Bool #

Eq l => Eq (ClassDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: ClassDecl l -> ClassDecl l -> Bool #

(/=) :: ClassDecl l -> ClassDecl l -> Bool #

Eq l => Eq (ConDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: ConDecl l -> ConDecl l -> Bool #

(/=) :: ConDecl l -> ConDecl l -> Bool #

Eq l => Eq (Context l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Context l -> Context l -> Bool #

(/=) :: Context l -> Context l -> Bool #

Eq l => Eq (DataOrNew l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: DataOrNew l -> DataOrNew l -> Bool #

(/=) :: DataOrNew l -> DataOrNew l -> Bool #

Eq l => Eq (Decl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Decl l -> Decl l -> Bool #

(/=) :: Decl l -> Decl l -> Bool #

Eq l => Eq (DeclHead l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: DeclHead l -> DeclHead l -> Bool #

(/=) :: DeclHead l -> DeclHead l -> Bool #

Eq l => Eq (DerivStrategy l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: DerivStrategy l -> DerivStrategy l -> Bool #

(/=) :: DerivStrategy l -> DerivStrategy l -> Bool #

Eq l => Eq (Deriving l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Deriving l -> Deriving l -> Bool #

(/=) :: Deriving l -> Deriving l -> Bool #

Eq l => Eq (EWildcard l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: EWildcard l -> EWildcard l -> Bool #

(/=) :: EWildcard l -> EWildcard l -> Bool #

Eq l => Eq (Exp l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Exp l -> Exp l -> Bool #

(/=) :: Exp l -> Exp l -> Bool #

Eq l => Eq (ExportSpec l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: ExportSpec l -> ExportSpec l -> Bool #

(/=) :: ExportSpec l -> ExportSpec l -> Bool #

Eq l => Eq (ExportSpecList l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: ExportSpecList l -> ExportSpecList l -> Bool #

(/=) :: ExportSpecList l -> ExportSpecList l -> Bool #

Eq l => Eq (FieldDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: FieldDecl l -> FieldDecl l -> Bool #

(/=) :: FieldDecl l -> FieldDecl l -> Bool #

Eq l => Eq (FieldUpdate l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: FieldUpdate l -> FieldUpdate l -> Bool #

(/=) :: FieldUpdate l -> FieldUpdate l -> Bool #

Eq l => Eq (FunDep l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: FunDep l -> FunDep l -> Bool #

(/=) :: FunDep l -> FunDep l -> Bool #

Eq l => Eq (GadtDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: GadtDecl l -> GadtDecl l -> Bool #

(/=) :: GadtDecl l -> GadtDecl l -> Bool #

Eq l => Eq (GuardedRhs l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: GuardedRhs l -> GuardedRhs l -> Bool #

(/=) :: GuardedRhs l -> GuardedRhs l -> Bool #

Eq l => Eq (IPBind l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: IPBind l -> IPBind l -> Bool #

(/=) :: IPBind l -> IPBind l -> Bool #

Eq l => Eq (IPName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: IPName l -> IPName l -> Bool #

(/=) :: IPName l -> IPName l -> Bool #

Eq l => Eq (ImportDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: ImportDecl l -> ImportDecl l -> Bool #

(/=) :: ImportDecl l -> ImportDecl l -> Bool #

Eq l => Eq (ImportSpec l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: ImportSpec l -> ImportSpec l -> Bool #

(/=) :: ImportSpec l -> ImportSpec l -> Bool #

Eq l => Eq (ImportSpecList l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: ImportSpecList l -> ImportSpecList l -> Bool #

(/=) :: ImportSpecList l -> ImportSpecList l -> Bool #

Eq l => Eq (InjectivityInfo l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: InjectivityInfo l -> InjectivityInfo l -> Bool #

(/=) :: InjectivityInfo l -> InjectivityInfo l -> Bool #

Eq l => Eq (InstDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: InstDecl l -> InstDecl l -> Bool #

(/=) :: InstDecl l -> InstDecl l -> Bool #

Eq l => Eq (InstHead l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: InstHead l -> InstHead l -> Bool #

(/=) :: InstHead l -> InstHead l -> Bool #

Eq l => Eq (InstRule l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: InstRule l -> InstRule l -> Bool #

(/=) :: InstRule l -> InstRule l -> Bool #

Eq l => Eq (Literal l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Literal l -> Literal l -> Bool #

(/=) :: Literal l -> Literal l -> Bool #

Eq l => Eq (Match l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Match l -> Match l -> Bool #

(/=) :: Match l -> Match l -> Bool #

Eq l => Eq (MaybePromotedName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: MaybePromotedName l -> MaybePromotedName l -> Bool #

(/=) :: MaybePromotedName l -> MaybePromotedName l -> Bool #

Eq l => Eq (Module l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Module l -> Module l -> Bool #

(/=) :: Module l -> Module l -> Bool #

Eq l => Eq (ModuleHead l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: ModuleHead l -> ModuleHead l -> Bool #

(/=) :: ModuleHead l -> ModuleHead l -> Bool #

Eq l => Eq (ModuleName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: ModuleName l -> ModuleName l -> Bool #

(/=) :: ModuleName l -> ModuleName l -> Bool #

Eq l => Eq (ModulePragma l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: ModulePragma l -> ModulePragma l -> Bool #

(/=) :: ModulePragma l -> ModulePragma l -> Bool #

Eq l => Eq (Name l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Name l -> Name l -> Bool #

(/=) :: Name l -> Name l -> Bool #

Eq l => Eq (Namespace l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Namespace l -> Namespace l -> Bool #

(/=) :: Namespace l -> Namespace l -> Bool #

Eq l => Eq (Op l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Op l -> Op l -> Bool #

(/=) :: Op l -> Op l -> Bool #

Eq l => Eq (Overlap l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Overlap l -> Overlap l -> Bool #

(/=) :: Overlap l -> Overlap l -> Bool #

Eq l => Eq (PXAttr l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: PXAttr l -> PXAttr l -> Bool #

(/=) :: PXAttr l -> PXAttr l -> Bool #

Eq l => Eq (Pat l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Pat l -> Pat l -> Bool #

(/=) :: Pat l -> Pat l -> Bool #

Eq l => Eq (PatField l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: PatField l -> PatField l -> Bool #

(/=) :: PatField l -> PatField l -> Bool #

Eq l => Eq (PatternSynDirection l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: PatternSynDirection l -> PatternSynDirection l -> Bool #

(/=) :: PatternSynDirection l -> PatternSynDirection l -> Bool #

Eq l => Eq (Promoted l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Promoted l -> Promoted l -> Bool #

(/=) :: Promoted l -> Promoted l -> Bool #

Eq l => Eq (QName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: QName l -> QName l -> Bool #

(/=) :: QName l -> QName l -> Bool #

Eq l => Eq (QOp l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: QOp l -> QOp l -> Bool #

(/=) :: QOp l -> QOp l -> Bool #

Eq l => Eq (QualConDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: QualConDecl l -> QualConDecl l -> Bool #

(/=) :: QualConDecl l -> QualConDecl l -> Bool #

Eq l => Eq (QualStmt l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: QualStmt l -> QualStmt l -> Bool #

(/=) :: QualStmt l -> QualStmt l -> Bool #

Eq l => Eq (RPat l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: RPat l -> RPat l -> Bool #

(/=) :: RPat l -> RPat l -> Bool #

Eq l => Eq (RPatOp l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: RPatOp l -> RPatOp l -> Bool #

(/=) :: RPatOp l -> RPatOp l -> Bool #

Eq l => Eq (ResultSig l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: ResultSig l -> ResultSig l -> Bool #

(/=) :: ResultSig l -> ResultSig l -> Bool #

Eq l => Eq (Rhs l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Rhs l -> Rhs l -> Bool #

(/=) :: Rhs l -> Rhs l -> Bool #

Eq l => Eq (Role l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Role l -> Role l -> Bool #

(/=) :: Role l -> Role l -> Bool #

Eq l => Eq (Rule l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Rule l -> Rule l -> Bool #

(/=) :: Rule l -> Rule l -> Bool #

Eq l => Eq (RuleVar l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: RuleVar l -> RuleVar l -> Bool #

(/=) :: RuleVar l -> RuleVar l -> Bool #

Eq l => Eq (Safety l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Safety l -> Safety l -> Bool #

(/=) :: Safety l -> Safety l -> Bool #

Eq l => Eq (Sign l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Sign l -> Sign l -> Bool #

(/=) :: Sign l -> Sign l -> Bool #

Eq l => Eq (SpecialCon l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: SpecialCon l -> SpecialCon l -> Bool #

(/=) :: SpecialCon l -> SpecialCon l -> Bool #

Eq l => Eq (Splice l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Splice l -> Splice l -> Bool #

(/=) :: Splice l -> Splice l -> Bool #

Eq l => Eq (Stmt l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Stmt l -> Stmt l -> Bool #

(/=) :: Stmt l -> Stmt l -> Bool #

Eq l => Eq (TyVarBind l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: TyVarBind l -> TyVarBind l -> Bool #

(/=) :: TyVarBind l -> TyVarBind l -> Bool #

Eq l => Eq (Type l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Type l -> Type l -> Bool #

(/=) :: Type l -> Type l -> Bool #

Eq l => Eq (TypeEqn l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: TypeEqn l -> TypeEqn l -> Bool #

(/=) :: TypeEqn l -> TypeEqn l -> Bool #

Eq l => Eq (Unpackedness l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: Unpackedness l -> Unpackedness l -> Bool #

(/=) :: Unpackedness l -> Unpackedness l -> Bool #

Eq l => Eq (WarningText l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: WarningText l -> WarningText l -> Bool #

(/=) :: WarningText l -> WarningText l -> Bool #

Eq l => Eq (XAttr l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: XAttr l -> XAttr l -> Bool #

(/=) :: XAttr l -> XAttr l -> Bool #

Eq l => Eq (XName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

(==) :: XName l -> XName l -> Bool #

(/=) :: XName l -> XName l -> Bool #

Eq (ElapsedSince epoch) 
Instance details

Defined in Data.Hourglass.Epoch

Methods

(==) :: ElapsedSince epoch -> ElapsedSince epoch -> Bool #

(/=) :: ElapsedSince epoch -> ElapsedSince epoch -> Bool #

Eq (ElapsedSinceP epoch) 
Instance details

Defined in Data.Hourglass.Epoch

Methods

(==) :: ElapsedSinceP epoch -> ElapsedSinceP epoch -> Bool #

(/=) :: ElapsedSinceP epoch -> ElapsedSinceP epoch -> Bool #

Eq (Word t) 
Instance details

Defined in Text.Inflections.Types

Methods

(==) :: Word t -> Word t -> Bool #

(/=) :: Word t -> Word t -> 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 (Deque a) 
Instance details

Defined in Control.Lens.Internal.Deque

Methods

(==) :: Deque a -> Deque a -> Bool #

(/=) :: Deque a -> Deque a -> Bool #

Eq valueType => Eq (FieldWithDefault valueType) Source # 
Instance details

Defined in IHP.ModelSupport

Methods

(==) :: FieldWithDefault valueType -> FieldWithDefault valueType -> Bool #

(/=) :: FieldWithDefault valueType -> FieldWithDefault valueType -> Bool #

Eq (PrimaryKey table) => Eq (Id' table) Source # 
Instance details

Defined in IHP.ModelSupport

Methods

(==) :: Id' table -> Id' table -> Bool #

(/=) :: Id' table -> Id' table -> Bool #

Eq (QueryBuilder table) Source # 
Instance details

Defined in IHP.QueryBuilder

Methods

(==) :: QueryBuilder table -> QueryBuilder table -> Bool #

(/=) :: QueryBuilder table -> QueryBuilder table -> Bool #

Eq e => Eq (ErrorFancy e) 
Instance details

Defined in Text.Megaparsec.Error

Methods

(==) :: ErrorFancy e -> ErrorFancy e -> Bool #

(/=) :: ErrorFancy e -> ErrorFancy e -> Bool #

Eq t => Eq (ErrorItem t) 
Instance details

Defined in Text.Megaparsec.Error

Methods

(==) :: ErrorItem t -> ErrorItem t -> Bool #

(/=) :: ErrorItem t -> ErrorItem t -> Bool #

Eq e => Eq (EF e) 
Instance details

Defined in Text.Megaparsec.Error.Builder

Methods

(==) :: EF e -> EF e -> Bool #

(/=) :: EF e -> EF e -> Bool #

Eq (Token s) => Eq (ET s) 
Instance details

Defined in Text.Megaparsec.Error.Builder

Methods

(==) :: ET s -> ET s -> Bool #

(/=) :: ET s -> ET s -> Bool #

Eq s => Eq (PosState s) 
Instance details

Defined in Text.Megaparsec.State

Methods

(==) :: PosState s -> PosState s -> Bool #

(/=) :: PosState s -> PosState s -> Bool #

Eq 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 (Fin n) 
Instance details

Defined in Arithmetic.Types

Methods

(==) :: Fin n -> Fin n -> Bool #

(/=) :: Fin n -> Fin n -> 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 (RegexpSplit a) 
Instance details

Defined in Text.Regex.PCRE.ByteString.Utils

Methods

(==) :: RegexpSplit a -> RegexpSplit a -> Bool #

(/=) :: RegexpSplit a -> RegexpSplit a -> Bool #

Eq a => Eq (Aeson a) 
Instance details

Defined in Database.PostgreSQL.Simple.Newtypes

Methods

(==) :: Aeson a -> Aeson a -> Bool #

(/=) :: Aeson a -> Aeson a -> Bool #

Eq a => Eq (Ok a) 
Instance details

Defined in Database.PostgreSQL.Simple.Ok

Methods

(==) :: Ok a -> Ok a -> Bool #

(/=) :: Ok a -> Ok a -> Bool #

Ord a => Eq (PGRange a) 
Instance details

Defined in Database.PostgreSQL.Simple.Range

Methods

(==) :: PGRange a -> PGRange a -> Bool #

(/=) :: PGRange a -> PGRange a -> Bool #

Eq a => Eq (RangeBound a) 
Instance details

Defined in Database.PostgreSQL.Simple.Range

Methods

(==) :: RangeBound a -> RangeBound a -> Bool #

(/=) :: RangeBound a -> RangeBound a -> Bool #

Eq a => Eq (Binary a) 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

(==) :: Binary a -> Binary a -> Bool #

(/=) :: Binary a -> Binary a -> Bool #

Eq a => Eq (In a) 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

(==) :: In a -> In a -> Bool #

(/=) :: In a -> In a -> Bool #

Eq a => Eq (PGArray a) 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

(==) :: PGArray a -> PGArray a -> Bool #

(/=) :: PGArray a -> PGArray a -> Bool #

Eq a => Eq (Values a) 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

(==) :: Values a -> Values a -> Bool #

(/=) :: Values a -> Values a -> 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 ann => Eq (SimpleDocTok ann) 
Instance details

Defined in Prettyprinter.Render.Util.SimpleDocTree

Methods

(==) :: SimpleDocTok ann -> SimpleDocTok ann -> Bool #

(/=) :: SimpleDocTok ann -> SimpleDocTok ann -> Bool #

Eq ann => Eq (SimpleDocTree ann) 
Instance details

Defined in Prettyprinter.Render.Util.SimpleDocTree

Methods

(==) :: SimpleDocTree ann -> SimpleDocTree ann -> Bool #

(/=) :: SimpleDocTree ann -> SimpleDocTree 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 (CharMap a) 
Instance details

Defined in Data.IntMap.CharMap2

Methods

(==) :: CharMap a -> CharMap a -> Bool #

(/=) :: CharMap a -> CharMap a -> Bool #

Eq (EnumSet e) 
Instance details

Defined in Data.IntSet.EnumSet2

Methods

(==) :: EnumSet e -> EnumSet e -> Bool #

(/=) :: EnumSet e -> EnumSet e -> Bool #

Eq a => Eq (Resource a) 
Instance details

Defined in Data.Pool.Introspection

Methods

(==) :: Resource a -> Resource a -> Bool #

(/=) :: Resource a -> Resource a -> 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 (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 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 (ChanEnd a) 
Instance details

Defined in Control.Concurrent.Chan.Unagi.Internal

Methods

(==) :: ChanEnd a -> ChanEnd a -> Bool #

(/=) :: ChanEnd a -> ChanEnd a -> Bool #

Eq (InChan a) 
Instance details

Defined in Control.Concurrent.Chan.Unagi.Internal

Methods

(==) :: InChan a -> InChan a -> Bool #

(/=) :: InChan a -> InChan a -> Bool #

Eq (OutChan a) 
Instance details

Defined in Control.Concurrent.Chan.Unagi.Internal

Methods

(==) :: OutChan a -> OutChan a -> Bool #

(/=) :: OutChan a -> OutChan 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 string => Eq (UTF8 string) 
Instance details

Defined in Data.String.UTF8

Methods

(==) :: UTF8 string -> UTF8 string -> Bool #

(/=) :: UTF8 string -> UTF8 string -> 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 c => Eq (FileInfo c) 
Instance details

Defined in Network.Wai.Parse

Methods

(==) :: FileInfo c -> FileInfo c -> Bool #

(/=) :: FileInfo c -> FileInfo c -> Bool #

Eq age => Eq (CacheResponse age) 
Instance details

Defined in Network.Wreq.Cache

Methods

(==) :: CacheResponse age -> CacheResponse age -> Bool #

(/=) :: CacheResponse age -> CacheResponse age -> 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 #

PrimType a => Eq (BlockN n a) 
Instance details

Defined in Basement.Sized.Block

Methods

(==) :: BlockN n a -> BlockN n a -> Bool #

(/=) :: BlockN n a -> BlockN n a -> Bool #

Eq a => Eq (ListN n a) 
Instance details

Defined in Basement.Sized.List

Methods

(==) :: ListN n a -> ListN n a -> Bool #

(/=) :: ListN n a -> ListN n a -> Bool #

PrimType a => Eq (UVect n a) 
Instance details

Defined in Basement.Sized.UVect

Methods

(==) :: UVect n a -> UVect n a -> Bool #

(/=) :: UVect n a -> UVect n a -> Bool #

Eq a => Eq (Vect n a) 
Instance details

Defined in Basement.Sized.Vect

Methods

(==) :: Vect n a -> Vect n a -> Bool #

(/=) :: Vect n a -> Vect n a -> Bool #

(Eq a, Eq b) => Eq (These a b) 
Instance details

Defined in Basement.These

Methods

(==) :: These a b -> These a b -> Bool #

(/=) :: These a b -> These a b -> Bool #

(Eq k, Eq a) => Eq (Map k a) 
Instance details

Defined in Data.Map.Internal

Methods

(==) :: Map k a -> Map k a -> Bool #

(/=) :: Map k a -> Map k a -> Bool #

Eq (MacKey c d) 
Instance details

Defined in Crypto.HMAC

Methods

(==) :: MacKey c d -> MacKey c d -> Bool #

(/=) :: MacKey c d -> MacKey c d -> 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 (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 #

(Eq1 f, Eq a) => Eq (Ap f a) 
Instance details

Defined in Control.Applicative.Free

Methods

(==) :: Ap f a -> Ap f a -> Bool #

(/=) :: Ap f a -> Ap f a -> Bool #

(Eq1 f, Eq a) => Eq (Cofree f a) 
Instance details

Defined in Control.Comonad.Cofree

Methods

(==) :: Cofree f a -> Cofree f a -> Bool #

(/=) :: Cofree f a -> Cofree f a -> Bool #

(Eq1 w, Eq a) => Eq (CoiterT w a) 
Instance details

Defined in Control.Comonad.Trans.Coiter

Methods

(==) :: CoiterT w a -> CoiterT w a -> Bool #

(/=) :: CoiterT w a -> CoiterT w a -> Bool #

(Eq1 f, Eq a) => Eq (Free f a) 
Instance details

Defined in Control.Monad.Free

Methods

(==) :: Free f a -> Free f a -> Bool #

(/=) :: Free f a -> Free f a -> Bool #

(Eq1 f, Eq a) => Eq (Free f a) 
Instance details

Defined in Control.Monad.Free.Ap

Methods

(==) :: Free f a -> Free f a -> Bool #

(/=) :: Free f a -> Free f a -> Bool #

(Eq1 m, Eq a) => Eq (IterT m a) 
Instance details

Defined in Control.Monad.Trans.Iter

Methods

(==) :: IterT m a -> IterT m a -> Bool #

(/=) :: IterT m a -> IterT m a -> Bool #

(Eq a, Ord b) => Eq (Gr a b) 
Instance details

Defined in GHC.Data.Graph.Inductive.PatriciaTree

Methods

(==) :: Gr a b -> Gr a b -> Bool #

(/=) :: Gr a b -> Gr a b -> Bool #

(Eq (IdP pass), Eq a) => Eq (WithHsDocIdentifiers a pass) 
Instance details

Defined in GHC.Hs.Doc

Methods

(==) :: WithHsDocIdentifiers a pass -> WithHsDocIdentifiers a pass -> Bool #

(/=) :: WithHsDocIdentifiers a pass -> WithHsDocIdentifiers a pass -> Bool #

(Eq l, Eq e) => Eq (GenLocated l e) 
Instance details

Defined in GHC.Types.SrcLoc

Methods

(==) :: GenLocated l e -> GenLocated l e -> Bool #

(/=) :: GenLocated l e -> GenLocated l e -> Bool #

(Eq k, Eq a) => Eq (UniqMap k a) 
Instance details

Defined in GHC.Types.Unique.Map

Methods

(==) :: UniqMap k a -> UniqMap k a -> Bool #

(/=) :: UniqMap k a -> UniqMap k a -> Bool #

(Eq k, Eq a) => Eq (IPRTable k a) 
Instance details

Defined in Data.IP.RouteTable.Internal

Methods

(==) :: IPRTable k a -> IPRTable k a -> Bool #

(/=) :: IPRTable k a -> IPRTable k a -> Bool #

(Eq1 f, Eq a) => Eq (Coyoneda f a) 
Instance details

Defined in Data.Functor.Coyoneda

Methods

(==) :: Coyoneda f a -> Coyoneda f a -> Bool #

(/=) :: Coyoneda f a -> Coyoneda f a -> Bool #

(Eq1 f, Eq a) => Eq (Yoneda f a) 
Instance details

Defined in Data.Functor.Yoneda

Methods

(==) :: Yoneda f a -> Yoneda f a -> Bool #

(/=) :: Yoneda f a -> Yoneda f a -> Bool #

(Eq i, Eq a) => Eq (Level i a) 
Instance details

Defined in Control.Lens.Internal.Level

Methods

(==) :: Level i a -> Level i a -> Bool #

(/=) :: Level i a -> Level i a -> Bool #

(Eq (Token s), Eq e) => Eq (ParseError s e) 
Instance details

Defined in Text.Megaparsec.Error

Methods

(==) :: ParseError s e -> ParseError s e -> Bool #

(/=) :: ParseError s e -> ParseError s e -> Bool #

(Eq s, Eq (Token s), Eq e) => Eq (ParseErrorBundle s e) 
Instance details

Defined in Text.Megaparsec.Error

Methods

(==) :: ParseErrorBundle s e -> ParseErrorBundle s e -> Bool #

(/=) :: ParseErrorBundle s e -> ParseErrorBundle s e -> Bool #

(Eq (ParseError s e), Eq s) => Eq (State s e) 
Instance details

Defined in Text.Megaparsec.State

Methods

(==) :: State s e -> State s e -> Bool #

(/=) :: State s e -> State s e -> Bool #

Eq 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 h, Eq t) => Eq (h :. t) 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

(==) :: (h :. t) -> (h :. t) -> Bool #

(/=) :: (h :. t) -> (h :. 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 (MVar s a) 
Instance details

Defined in Data.Primitive.MVar

Methods

(==) :: MVar s a -> MVar s a -> Bool #

(/=) :: MVar s a -> MVar s a -> Bool #

Eq (MutVar s a) 
Instance details

Defined in Data.Primitive.MutVar

Methods

(==) :: MutVar s a -> MutVar s a -> Bool #

(/=) :: MutVar s a -> MutVar 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 (PrimVar s a) 
Instance details

Defined in Data.Primitive.PrimVar

Methods

(==) :: PrimVar s a -> PrimVar s a -> Bool #

(/=) :: PrimVar s a -> PrimVar 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 i => Eq (TArray i a) 
Instance details

Defined in Data.Primitive.TArray.Classic

Methods

(==) :: TArray i a -> TArray i a -> Bool #

(/=) :: TArray i a -> TArray i a -> Bool #

(Eq a, PrimUnlifted a, unlifted_a ~ Unlifted a) => Eq (UnliftedArray_ unlifted_a a) 
Instance details

Defined in Data.Primitive.Unlifted.Array.ST

Methods

(==) :: UnliftedArray_ unlifted_a a -> UnliftedArray_ unlifted_a a -> Bool #

(/=) :: UnliftedArray_ unlifted_a a -> UnliftedArray_ unlifted_a a -> Bool #

(Eq a, PrimUnlifted a, unlifted_a ~ Unlifted a) => Eq (SmallUnliftedArray_ a unlifted_a) 
Instance details

Defined in Data.Primitive.Unlifted.SmallArray.ST

Methods

(==) :: SmallUnliftedArray_ a unlifted_a -> SmallUnliftedArray_ a unlifted_a -> Bool #

(/=) :: SmallUnliftedArray_ a unlifted_a -> SmallUnliftedArray_ a unlifted_a -> Bool #

Eq a => Eq (EnumMap k a) 
Instance details

Defined in Data.IntMap.EnumMap2

Methods

(==) :: EnumMap k a -> EnumMap k a -> Bool #

(/=) :: EnumMap k a -> EnumMap k a -> Bool #

Eq (f a) => Eq (Zippy f a) 
Instance details

Defined in Data.Zip

Methods

(==) :: Zippy f a -> Zippy f a -> Bool #

(/=) :: Zippy f a -> Zippy f a -> Bool #

(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 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 #

(GEq (Rep1 f a), Generic1 f) => Eq (FunctorClassesDefault f a) 
Instance details

Defined in Data.Functor.Classes.Generic.Internal

Methods

(==) :: FunctorClassesDefault f a -> FunctorClassesDefault f a -> Bool #

(/=) :: FunctorClassesDefault f a -> FunctorClassesDefault f a -> Bool #

(forall (a :: k). Typeable a => Eq (f a)) => Eq (TypeRepMap f) 
Instance details

Defined in Data.TypeRepMap.Internal

Methods

(==) :: TypeRepMap f -> TypeRepMap f -> Bool #

(/=) :: TypeRepMap f -> TypeRepMap f -> 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 #

(TypeError (('Text "Looks like you forgot to pass a " ':<>: 'ShowType (GetModelByTableName record)) ':<>: 'Text " id to this data constructor.") :: Constraint) => Eq (Id' record -> controller) Source # 
Instance details

Defined in IHP.ViewSupport

Methods

(==) :: (Id' record -> controller) -> (Id' record -> controller) -> Bool #

(/=) :: (Id' record -> controller) -> (Id' record -> controller) -> 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 (bi a b) => Eq (Biap bi a b) 
Instance details

Defined in Data.Bifunctor.Biap

Methods

(==) :: Biap bi a b -> Biap bi a b -> Bool #

(/=) :: Biap bi a b -> Biap bi a b -> Bool #

Eq (p (Fix p a) a) => Eq (Fix p a) 
Instance details

Defined in Data.Bifunctor.Fix

Methods

(==) :: Fix p a -> Fix p a -> Bool #

(/=) :: Fix p a -> Fix p a -> Bool #

Eq (p a a) => Eq (Join p a) 
Instance details

Defined in Data.Bifunctor.Join

Methods

(==) :: Join p a -> Join p a -> Bool #

(/=) :: Join p a -> Join p a -> Bool #

(Eq a, Eq (f b)) => Eq (CofreeF f a b) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

(==) :: CofreeF f a b -> CofreeF f a b -> Bool #

(/=) :: CofreeF f a b -> CofreeF f a b -> Bool #

Eq (w (CofreeF f a (CofreeT f w a))) => Eq (CofreeT f w a) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

(==) :: CofreeT f w a -> CofreeT f w a -> Bool #

(/=) :: CofreeT f w a -> CofreeT f w a -> Bool #

(Eq a, Eq (f b)) => Eq (FreeF f a b) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

(==) :: FreeF f a b -> FreeF f a b -> Bool #

(/=) :: FreeF f a b -> FreeF f a b -> Bool #

(Eq1 f, Eq1 m, Eq a) => Eq (FreeT f m a) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

(==) :: FreeT f m a -> FreeT f m a -> Bool #

(/=) :: FreeT f m a -> FreeT f m a -> Bool #

(Eq a, Eq (f b)) => Eq (FreeF f a b) 
Instance details

Defined in Control.Monad.Trans.Free.Ap

Methods

(==) :: FreeF f a b -> FreeF f a b -> Bool #

(/=) :: FreeF f a b -> FreeF f a b -> Bool #

(Eq1 f, Eq1 m, Eq a) => Eq (FreeT f m a) 
Instance details

Defined in Control.Monad.Trans.Free.Ap

Methods

(==) :: FreeT f m a -> FreeT f m a -> Bool #

(/=) :: FreeT f m a -> FreeT f m a -> Bool #

(Functor f, Monad m, Eq1 f, Eq1 m, Eq a) => Eq (FT f m a) 
Instance details

Defined in Control.Monad.Trans.Free.Church

Methods

(==) :: FT f m a -> FT f m a -> Bool #

(/=) :: FT f m a -> FT f m a -> Bool #

Eq (f a) => Eq (WrappedContravariant f a) 
Instance details

Defined in Data.Functor.Invariant

Methods

(==) :: WrappedContravariant f a -> WrappedContravariant f a -> Bool #

(/=) :: WrappedContravariant f a -> WrappedContravariant f a -> Bool #

Eq (f a) => Eq (WrappedFunctor f a) 
Instance details

Defined in Data.Functor.Invariant

Methods

(==) :: WrappedFunctor f a -> WrappedFunctor f a -> Bool #

(/=) :: WrappedFunctor f a -> WrappedFunctor f a -> Bool #

Eq (JobsDashboardController authType jobs) Source # 
Instance details

Defined in IHP.Job.Dashboard.Types

Methods

(==) :: JobsDashboardController authType jobs -> JobsDashboardController authType jobs -> Bool #

(/=) :: JobsDashboardController authType jobs -> JobsDashboardController authType jobs -> Bool #

Eq value => Eq (FieldWithUpdate name value) Source # 
Instance details

Defined in IHP.ModelSupport

Methods

(==) :: FieldWithUpdate name value -> FieldWithUpdate name value -> Bool #

(/=) :: FieldWithUpdate name value -> FieldWithUpdate name value -> Bool #

unlifted_a ~ Unlifted a => Eq (MutableUnliftedArray_ unlifted_a s a) 
Instance details

Defined in Data.Primitive.Unlifted.Array.ST

Methods

(==) :: MutableUnliftedArray_ unlifted_a s a -> MutableUnliftedArray_ unlifted_a s a -> Bool #

(/=) :: MutableUnliftedArray_ unlifted_a s a -> MutableUnliftedArray_ unlifted_a s a -> Bool #

unlifted_a ~ Unlifted a => Eq (UnliftedMVar_ s a unlifted_a) 
Instance details

Defined in Data.Primitive.Unlifted.MVar.ST

Methods

(==) :: UnliftedMVar_ s a unlifted_a -> UnliftedMVar_ s a unlifted_a -> Bool #

(/=) :: UnliftedMVar_ s a unlifted_a -> UnliftedMVar_ s a unlifted_a -> Bool #

unlifted_a ~ Unlifted a => Eq (UnliftedMutVar_ s a unlifted_a) 
Instance details

Defined in Data.Primitive.Unlifted.MutVar.ST

Methods

(==) :: UnliftedMutVar_ s a unlifted_a -> UnliftedMutVar_ s a unlifted_a -> Bool #

(/=) :: UnliftedMutVar_ s a unlifted_a -> UnliftedMutVar_ s a unlifted_a -> Bool #

unlifted_a ~ Unlifted a => Eq (SmallMutableUnliftedArray_ s a unlifted_a) 
Instance details

Defined in Data.Primitive.Unlifted.SmallArray.ST

Methods

(==) :: SmallMutableUnliftedArray_ s a unlifted_a -> SmallMutableUnliftedArray_ s a unlifted_a -> Bool #

(/=) :: SmallMutableUnliftedArray_ s a unlifted_a -> SmallMutableUnliftedArray_ s a unlifted_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 (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 (f a) => Eq (Clown f a b) 
Instance details

Defined in Data.Bifunctor.Clown

Methods

(==) :: Clown f a b -> Clown f a b -> Bool #

(/=) :: Clown f a b -> Clown f a b -> Bool #

Eq (p b a) => Eq (Flip p a b) 
Instance details

Defined in Data.Bifunctor.Flip

Methods

(==) :: Flip p a b -> Flip p a b -> Bool #

(/=) :: Flip p a b -> Flip p a b -> Bool #

Eq (g b) => Eq (Joker g a b) 
Instance details

Defined in Data.Bifunctor.Joker

Methods

(==) :: Joker g a b -> Joker g a b -> Bool #

(/=) :: Joker g a b -> Joker g a b -> Bool #

Eq (p a b) => Eq (WrappedBifunctor p a b) 
Instance details

Defined in Data.Bifunctor.Wrapped

Methods

(==) :: WrappedBifunctor p a b -> WrappedBifunctor p a b -> Bool #

(/=) :: WrappedBifunctor p a b -> WrappedBifunctor p a b -> Bool #

(Eq 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 (p a b) => Eq (WrappedProfunctor p a b) 
Instance details

Defined in Data.Functor.Invariant

Methods

(==) :: WrappedProfunctor p a b -> WrappedProfunctor p a b -> Bool #

(/=) :: WrappedProfunctor p a b -> WrappedProfunctor p a b -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e) => Eq (a, b, c, d, e) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e) -> (a, b, c, d, e) -> Bool #

(/=) :: (a, b, c, d, e) -> (a, b, c, d, e) -> Bool #

(Eq (f a b), Eq (g a b)) => Eq (Product f g a b) 
Instance details

Defined in Data.Bifunctor.Product

Methods

(==) :: Product f g a b -> Product f g a b -> Bool #

(/=) :: Product f g a b -> Product f g a b -> Bool #

(Eq (p a b), Eq (q a b)) => Eq (Sum p q a b) 
Instance details

Defined in Data.Bifunctor.Sum

Methods

(==) :: Sum p q a b -> Sum p q a b -> Bool #

(/=) :: Sum p q a b -> Sum p q a b -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f) => Eq (a, b, c, d, e, f) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> Bool #

(/=) :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> Bool #

Eq (f (p a b)) => Eq (Tannen f p a b) 
Instance details

Defined in Data.Bifunctor.Tannen

Methods

(==) :: Tannen f p a b -> Tannen f p a b -> Bool #

(/=) :: Tannen f p a b -> Tannen f p a b -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g) => Eq (a, b, c, d, e, f, g) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> Bool #

(/=) :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h) => Eq (a, b, c, d, e, f, g, h) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> Bool #

(/=) :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> Bool #

Eq (p (f a) (g b)) => Eq (Biff p f g a b) 
Instance details

Defined in Data.Bifunctor.Biff

Methods

(==) :: Biff p f g a b -> Biff p f g a b -> Bool #

(/=) :: Biff p f g a b -> Biff p f g a b -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i) => Eq (a, b, c, d, e, f, g, h, i) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> Bool #

(/=) :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j) => Eq (a, b, c, d, e, f, g, h, i, j) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> Bool #

(/=) :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j, Eq k) => Eq (a, b, c, d, e, f, g, h, i, j, k) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> Bool #

(/=) :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j, Eq k, Eq l) => Eq (a, b, c, d, e, f, g, h, i, j, k, l) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> Bool #

(/=) :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j, Eq k, Eq l, Eq m) => Eq (a, b, c, d, e, f, g, h, i, j, k, l, m) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Bool #

(/=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j, Eq k, Eq l, Eq m, Eq n) => Eq (a, b, c, d, e, f, g, h, i, j, k, l, m, n) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Bool #

(/=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Bool #

(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j, Eq k, Eq l, Eq m, Eq n, Eq o) => Eq (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Bool #

(/=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Bool #

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

Monoid Key 
Instance details

Defined in Data.Aeson.Key

Methods

mempty :: Key #

mappend :: Key -> Key -> Key #

mconcat :: [Key] -> Key #

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 Builder 
Instance details

Defined in Basement.Block.Builder

Methods

mempty :: Builder #

mappend :: Builder -> Builder -> Builder #

mconcat :: [Builder] -> Builder #

Monoid Builder 
Instance details

Defined in Basement.String.Builder

Methods

mempty :: Builder #

mappend :: Builder -> Builder -> Builder #

mconcat :: [Builder] -> Builder #

Monoid AsciiString 
Instance details

Defined in Basement.Types.AsciiString

Methods

mempty :: AsciiString #

mappend :: AsciiString -> AsciiString -> AsciiString #

mconcat :: [AsciiString] -> AsciiString #

Monoid String 
Instance details

Defined in Basement.UTF8.Base

Methods

mempty :: String #

mappend :: String -> String -> String #

mconcat :: [String] -> String #

Monoid Poke 
Instance details

Defined in Blaze.ByteString.Builder.Internal.Write

Methods

mempty :: Poke #

mappend :: Poke -> Poke -> Poke #

mconcat :: [Poke] -> Poke #

Monoid Write 
Instance details

Defined in Blaze.ByteString.Builder.Internal.Write

Methods

mempty :: Write #

mappend :: Write -> Write -> Write #

mconcat :: [Write] -> Write #

Monoid Attribute 
Instance details

Defined in Text.Blaze.Internal

Methods

mempty :: Attribute #

mappend :: Attribute -> Attribute -> Attribute #

mconcat :: [Attribute] -> Attribute #

Monoid AttributeValue 
Instance details

Defined in Text.Blaze.Internal

Methods

mempty :: AttributeValue #

mappend :: AttributeValue -> AttributeValue -> AttributeValue #

mconcat :: [AttributeValue] -> AttributeValue #

Monoid ChoiceString 
Instance details

Defined in Text.Blaze.Internal

Methods

mempty :: ChoiceString #

mappend :: ChoiceString -> ChoiceString -> ChoiceString #

mconcat :: [ChoiceString] -> ChoiceString #

Monoid Builder 
Instance details

Defined in Data.Bytes.Builder.Unsafe

Methods

mempty :: Builder #

mappend :: Builder -> Builder -> Builder #

mconcat :: [Builder] -> Builder #

Monoid Chunks 
Instance details

Defined in Data.Bytes.Chunks

Methods

mempty :: Chunks #

mappend :: Chunks -> Chunks -> Chunks #

mconcat :: [Chunks] -> Chunks #

Monoid Bytes 
Instance details

Defined in Data.Bytes.Internal

Methods

mempty :: Bytes #

mappend :: Bytes -> Bytes -> Bytes #

mconcat :: [Bytes] -> Bytes #

Monoid Builder 
Instance details

Defined in Data.ByteString.Builder.Internal

Methods

mempty :: Builder #

mappend :: Builder -> Builder -> Builder #

mconcat :: [Builder] -> Builder #

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

Methods

mempty :: ShortByteString #

mappend :: ShortByteString -> ShortByteString -> ShortByteString #

mconcat :: [ShortByteString] -> ShortByteString #

Monoid IntSet 
Instance details

Defined in Data.IntSet.Internal

Monoid CertificateStore 
Instance details

Defined in Data.X509.CertificateStore

Methods

mempty :: CertificateStore #

mappend :: CertificateStore -> CertificateStore -> CertificateStore #

mconcat :: [CertificateStore] -> CertificateStore #

Monoid LogStr 
Instance details

Defined in System.Log.FastLogger.LogStr

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 UniqueSet 
Instance details

Defined in GHC.Cmm.Dataflow.Collections

Methods

mempty :: UniqueSet #

mappend :: UniqueSet -> UniqueSet -> UniqueSet #

mconcat :: [UniqueSet] -> UniqueSet #

Monoid LabelSet 
Instance details

Defined in GHC.Cmm.Dataflow.Label

Methods

mempty :: LabelSet #

mappend :: LabelSet -> LabelSet -> LabelSet #

mconcat :: [LabelSet] -> LabelSet #

Monoid FastString 
Instance details

Defined in GHC.Data.FastString

Methods

mempty :: FastString #

mappend :: FastString -> FastString -> FastString #

mconcat :: [FastString] -> FastString #

Monoid Nablas 
Instance details

Defined in GHC.HsToCore.Pmc.Solver.Types

Methods

mempty :: Nablas #

mappend :: Nablas -> Nablas -> Nablas #

mconcat :: [Nablas] -> Nablas #

Monoid JStat 
Instance details

Defined in GHC.JS.Syntax

Methods

mempty :: JStat #

mappend :: JStat -> JStat -> JStat #

mconcat :: [JStat] -> JStat #

Monoid JStat 
Instance details

Defined in GHC.JS.Unsat.Syntax

Methods

mempty :: JStat #

mappend :: JStat -> JStat -> JStat #

mconcat :: [JStat] -> JStat #

Monoid AnnList 
Instance details

Defined in GHC.Parser.Annotation

Methods

mempty :: AnnList #

mappend :: AnnList -> AnnList -> AnnList #

mconcat :: [AnnList] -> AnnList #

Monoid AnnListItem 
Instance details

Defined in GHC.Parser.Annotation

Methods

mempty :: AnnListItem #

mappend :: AnnListItem -> AnnListItem -> AnnListItem #

mconcat :: [AnnListItem] -> AnnListItem #

Monoid AnnSortKey 
Instance details

Defined in GHC.Parser.Annotation

Methods

mempty :: AnnSortKey #

mappend :: AnnSortKey -> AnnSortKey -> AnnSortKey #

mconcat :: [AnnSortKey] -> AnnSortKey #

Monoid NameAnn 
Instance details

Defined in GHC.Parser.Annotation

Methods

mempty :: NameAnn #

mappend :: NameAnn -> NameAnn -> NameAnn #

mconcat :: [NameAnn] -> NameAnn #

Monoid CheckTyEqResult 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

mempty :: CheckTyEqResult #

mappend :: CheckTyEqResult -> CheckTyEqResult -> CheckTyEqResult #

mconcat :: [CheckTyEqResult] -> CheckTyEqResult #

Monoid HasGivenEqs 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

mempty :: HasGivenEqs #

mappend :: HasGivenEqs -> HasGivenEqs -> HasGivenEqs #

mconcat :: [HasGivenEqs] -> HasGivenEqs #

Monoid RewriterSet 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

mempty :: RewriterSet #

mappend :: RewriterSet -> RewriterSet -> RewriterSet #

mconcat :: [RewriterSet] -> RewriterSet #

Monoid InsideLam 
Instance details

Defined in GHC.Types.Basic

Methods

mempty :: InsideLam #

mappend :: InsideLam -> InsideLam -> InsideLam #

mconcat :: [InsideLam] -> InsideLam #

Monoid InterestingCxt 
Instance details

Defined in GHC.Types.Basic

Methods

mempty :: InterestingCxt #

mappend :: InterestingCxt -> InterestingCxt -> InterestingCxt #

mconcat :: [InterestingCxt] -> InterestingCxt #

Monoid ShadowedFieldGREs 
Instance details

Defined in GHC.Types.Name.Reader

Methods

mempty :: ShadowedFieldGREs #

mappend :: ShadowedFieldGREs -> ShadowedFieldGREs -> ShadowedFieldGREs #

mconcat :: [ShadowedFieldGREs] -> ShadowedFieldGREs #

Monoid ShadowedGREs 
Instance details

Defined in GHC.Types.Name.Reader

Methods

mempty :: ShadowedGREs #

mappend :: ShadowedGREs -> ShadowedGREs -> ShadowedGREs #

mconcat :: [ShadowedGREs] -> ShadowedGREs #

Monoid ModuleOrigin 
Instance details

Defined in GHC.Unit.State

Methods

mempty :: ModuleOrigin #

mappend :: ModuleOrigin -> ModuleOrigin -> ModuleOrigin #

mconcat :: [ModuleOrigin] -> ModuleOrigin #

Monoid UnitVisibility 
Instance details

Defined in GHC.Unit.State

Methods

mempty :: UnitVisibility #

mappend :: UnitVisibility -> UnitVisibility -> UnitVisibility #

mconcat :: [UnitVisibility] -> UnitVisibility #

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 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

Methods

mempty :: RequestBody #

mappend :: RequestBody -> RequestBody -> RequestBody #

mconcat :: [RequestBody] -> RequestBody #

Monoid Ini 
Instance details

Defined in Data.Ini

Methods

mempty :: Ini #

mappend :: Ini -> Ini -> Ini #

mconcat :: [Ini] -> Ini #

Monoid ScrubbedBytes 
Instance details

Defined in Data.ByteArray.ScrubbedBytes

Methods

mempty :: ScrubbedBytes #

mappend :: ScrubbedBytes -> ScrubbedBytes -> ScrubbedBytes #

mconcat :: [ScrubbedBytes] -> ScrubbedBytes #

Monoid AccessKey 
Instance details

Defined in Network.Minio.Credentials.Types

Methods

mempty :: AccessKey #

mappend :: AccessKey -> AccessKey -> AccessKey #

mconcat :: [AccessKey] -> AccessKey #

Monoid SecretKey 
Instance details

Defined in Network.Minio.Credentials.Types

Methods

mempty :: SecretKey #

mappend :: SecretKey -> SecretKey -> SecretKey #

mconcat :: [SecretKey] -> SecretKey #

Monoid SessionToken 
Instance details

Defined in Network.Minio.Credentials.Types

Methods

mempty :: SessionToken #

mappend :: SessionToken -> SessionToken -> SessionToken #

mconcat :: [SessionToken] -> SessionToken #

Monoid CSVProp 
Instance details

Defined in Network.Minio.Data

Methods

mempty :: CSVProp #

mappend :: CSVProp -> CSVProp -> CSVProp #

mconcat :: [CSVProp] -> CSVProp #

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 Query 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

mempty :: Query #

mappend :: Query -> Query -> Query #

mconcat :: [Query] -> Query #

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 SetTestInfo 
Instance details

Defined in Text.Regex.TDFA.CorePattern

Methods

mempty :: SetTestInfo #

mappend :: SetTestInfo -> SetTestInfo -> SetTestInfo #

mconcat :: [SetTestInfo] -> SetTestInfo #

Monoid TermOutput 
Instance details

Defined in System.Console.Terminfo.Base

Methods

mempty :: TermOutput #

mappend :: TermOutput -> TermOutput -> TermOutput #

mconcat :: [TermOutput] -> TermOutput #

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 SynonymExpansionSettings 
Instance details

Defined in Language.Haskell.TH.ExpandSyns

Methods

mempty :: SynonymExpansionSettings #

mappend :: SynonymExpansionSettings -> SynonymExpansionSettings -> SynonymExpansionSettings #

mconcat :: [SynonymExpansionSettings] -> SynonymExpansionSettings #

Monoid CalendarDiffDays 
Instance details

Defined in Data.Time.Calendar.CalendarDiffDays

Monoid CalendarDiffTime 
Instance details

Defined in Data.Time.LocalTime.Internal.CalendarDiffTime

Monoid MiddlewareSelection 
Instance details

Defined in Network.Wai.Middleware.Select

Methods

mempty :: MiddlewareSelection #

mappend :: MiddlewareSelection -> MiddlewareSelection -> MiddlewareSelection #

mconcat :: [MiddlewareSelection] -> MiddlewareSelection #

Monoid SizeLimit 
Instance details

Defined in Network.WebSockets.Connection.Options

Methods

mempty :: SizeLimit #

mappend :: SizeLimit -> SizeLimit -> SizeLimit #

mconcat :: [SizeLimit] -> SizeLimit #

Monoid Attributes 
Instance details

Defined in Text.XML.Stream.Render

Methods

mempty :: Attributes #

mappend :: Attributes -> Attributes -> Attributes #

mconcat :: [Attributes] -> Attributes #

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 #

(Semigroup a, Monoid a) => Monoid (Concurrently a) 
Instance details

Defined in Control.Concurrent.Async.Internal

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 #

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

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 (Array a) 
Instance details

Defined in Basement.BoxedArray

Methods

mempty :: Array a #

mappend :: Array a -> Array a -> Array a #

mconcat :: [Array a] -> Array a #

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 (PutM ()) 
Instance details

Defined in Data.Binary.Put

Methods

mempty :: PutM () #

mappend :: PutM () -> PutM () -> PutM () #

mconcat :: [PutM ()] -> PutM () #

Monoid a => Monoid (MarkupM a) 
Instance details

Defined in Text.Blaze.Internal

Methods

mempty :: MarkupM a #

mappend :: MarkupM a -> MarkupM a -> MarkupM a #

mconcat :: [MarkupM a] -> MarkupM a #

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 #

Monoid (PutM ()) 
Instance details

Defined in Data.Serialize.Put

Methods

mempty :: PutM () #

mappend :: PutM () -> PutM () -> PutM () #

mconcat :: [PutM ()] -> PutM () #

Num a => Monoid (TransferFunction a) 
Instance details

Defined in Data.Colour.RGBSpace

Methods

mempty :: TransferFunction a #

mappend :: TransferFunction a -> TransferFunction a -> TransferFunction a #

mconcat :: [TransferFunction a] -> TransferFunction 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 (Bag a) 
Instance details

Defined in GHC.Data.Bag

Methods

mempty :: Bag a #

mappend :: Bag a -> Bag a -> Bag a #

mconcat :: [Bag a] -> Bag a #

Monoid a => Monoid (EpAnn a) 
Instance details

Defined in GHC.Parser.Annotation

Methods

mempty :: EpAnn a #

mappend :: EpAnn a -> EpAnn a -> EpAnn a #

mconcat :: [EpAnn a] -> EpAnn a #

Monoid (Messages e) 
Instance details

Defined in GHC.Types.Error

Methods

mempty :: Messages e #

mappend :: Messages e -> Messages e -> Messages e #

mconcat :: [Messages e] -> Messages e #

Monoid a => Monoid (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 (Deque a) 
Instance details

Defined in Control.Lens.Internal.Deque

Methods

mempty :: Deque a #

mappend :: Deque a -> Deque a -> Deque a #

mconcat :: [Deque a] -> Deque a #

Monoid (Leftmost a) 
Instance details

Defined in Control.Lens.Internal.Fold

Methods

mempty :: Leftmost a #

mappend :: Leftmost a -> Leftmost a -> Leftmost a #

mconcat :: [Leftmost a] -> Leftmost a #

Monoid (Rightmost a) 
Instance details

Defined in Control.Lens.Internal.Fold

Methods

mempty :: Rightmost a #

mappend :: Rightmost a -> Rightmost a -> Rightmost a #

mconcat :: [Rightmost a] -> Rightmost a #

Monoid a => Monoid (May a) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

mempty :: May a #

mappend :: May a -> May a -> May a #

mconcat :: [May a] -> May a #

Ord e => Monoid (EF e) 
Instance details

Defined in Text.Megaparsec.Error.Builder

Methods

mempty :: EF e #

mappend :: EF e -> EF e -> EF e #

mconcat :: [EF e] -> EF e #

Stream s => Monoid (ET s) 
Instance details

Defined in Text.Megaparsec.Error.Builder

Methods

mempty :: ET s #

mappend :: ET s -> ET s -> ET s #

mconcat :: [ET s] -> ET s #

Ord t => Monoid (Hints t) 
Instance details

Defined in Text.Megaparsec.Internal

Methods

mempty :: Hints t #

mappend :: Hints t -> Hints t -> Hints t #

mconcat :: [Hints t] -> Hints t #

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 (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 #

Monoid (CharMap a) 
Instance details

Defined in Data.IntMap.CharMap2

Methods

mempty :: CharMap a #

mappend :: CharMap a -> CharMap a -> CharMap a #

mconcat :: [CharMap a] -> CharMap a #

Monoid (EnumSet e) 
Instance details

Defined in Data.IntSet.EnumSet2

Methods

mempty :: EnumSet e #

mappend :: EnumSet e -> EnumSet e -> EnumSet e #

mconcat :: [EnumSet e] -> EnumSet e #

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 #

(Generic a, GMonoid (Rep a)) => Monoid (GenericSemigroupMonoid a) 
Instance details

Defined in Data.Semigroup.Generic

Methods

mempty :: GenericSemigroupMonoid a #

mappend :: GenericSemigroupMonoid a -> GenericSemigroupMonoid a -> GenericSemigroupMonoid a #

mconcat :: [GenericSemigroupMonoid a] -> GenericSemigroupMonoid a #

Semigroup a => Monoid (Maybe a) 
Instance details

Defined in Data.Strict.Maybe

Methods

mempty :: Maybe a #

mappend :: Maybe a -> Maybe a -> Maybe a #

mconcat :: [Maybe a] -> Maybe a #

Monoid a => Monoid (Q a) 
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 (Vault s) 
Instance details

Defined in Data.Vault.ST.Lazy

Methods

mempty :: Vault s #

mappend :: Vault s -> Vault s -> Vault s #

mconcat :: [Vault s] -> Vault s #

Monoid (Vault s) 
Instance details

Defined in Data.Vault.ST.Strict

Methods

mempty :: Vault s #

mappend :: Vault s -> Vault s -> Vault s #

mconcat :: [Vault s] -> Vault s #

Monoid (Vector a) 
Instance details

Defined in Data.Vector

Methods

mempty :: Vector a #

mappend :: Vector a -> Vector a -> Vector a #

mconcat :: [Vector a] -> Vector a #

Prim a => Monoid (Vector a) 
Instance details

Defined in Data.Vector.Primitive

Methods

mempty :: Vector a #

mappend :: Vector a -> Vector a -> Vector a #

mconcat :: [Vector a] -> Vector a #

Storable a => Monoid (Vector a) 
Instance details

Defined in Data.Vector.Storable

Methods

mempty :: Vector a #

mappend :: Vector a -> Vector a -> Vector a #

mconcat :: [Vector a] -> Vector a #

Semigroup a => Monoid (Maybe a) 
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

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 #

(Monoid e, Monoid r) => Monoid (AllE e r) 
Instance details

Defined in Control.Error.Util

Methods

mempty :: AllE e r #

mappend :: AllE e r -> AllE e r -> AllE e r #

mconcat :: [AllE e r] -> AllE e r #

(Monoid e, Monoid r) => Monoid (AnyE e r) 
Instance details

Defined in Control.Error.Util

Methods

mempty :: AnyE e r #

mappend :: AnyE e r -> AnyE e r -> AnyE e r #

mconcat :: [AnyE e r] -> AnyE e r #

Monoid (Alt f a) 
Instance details

Defined in Control.Alternative.Free

Methods

mempty :: Alt f a #

mappend :: Alt f a -> Alt f a -> Alt f a #

mconcat :: [Alt f a] -> Alt f a #

Monoid (Alt f a) 
Instance details

Defined in Control.Alternative.Free.Final

Methods

mempty :: Alt f a #

mappend :: Alt f a -> Alt f a -> Alt f a #

mconcat :: [Alt f a] -> Alt f a #

(Monad m, Semigroup a, Monoid a) => Monoid (IterT m a) 
Instance details

Defined in Control.Monad.Trans.Iter

Methods

mempty :: IterT m a #

mappend :: IterT m a -> IterT m a -> IterT m a #

mconcat :: [IterT m a] -> IterT m a #

Monoid (UniqMap k a) 
Instance details

Defined in GHC.Types.Unique.Map

Methods

mempty :: UniqMap k a #

mappend :: UniqMap k a -> UniqMap k a -> UniqMap k a #

mconcat :: [UniqMap k a] -> UniqMap k a #

Routable k => Monoid (IPRTable k a) 
Instance details

Defined in Data.IP.RouteTable.Internal

Methods

mempty :: IPRTable k a #

mappend :: IPRTable k a -> IPRTable k a -> IPRTable k a #

mconcat :: [IPRTable k a] -> IPRTable k a #

(Contravariant f, Applicative f) => Monoid (Folding f a) 
Instance details

Defined in Control.Lens.Internal.Fold

Methods

mempty :: Folding f a #

mappend :: Folding f a -> Folding f a -> Folding f a #

mconcat :: [Folding f a] -> Folding f a #

Monad m => Monoid (Sequenced a m) 
Instance details

Defined in Control.Lens.Internal.Fold

Methods

mempty :: Sequenced a m #

mappend :: Sequenced a m -> Sequenced a m -> Sequenced a m #

mconcat :: [Sequenced a m] -> Sequenced a m #

Applicative f => Monoid (Traversed a f) 
Instance details

Defined in Control.Lens.Internal.Fold

Methods

mempty :: Traversed a f #

mappend :: Traversed a f -> Traversed a f -> Traversed a f #

mconcat :: [Traversed a f] -> Traversed a f #

(Apply f, Applicative f) => Monoid (TraversedF a f) 
Instance details

Defined in Control.Lens.Internal.Fold

Methods

mempty :: TraversedF a f #

mappend :: TraversedF a f -> TraversedF a f -> TraversedF a f #

mconcat :: [TraversedF a f] -> TraversedF a f #

Monoid (f a) => Monoid (Indexing f a) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

mempty :: Indexing f a #

mappend :: Indexing f a -> Indexing f a -> Indexing f a #

mconcat :: [Indexing f a] -> Indexing f a #

Monoid (Deepening i a) 
Instance details

Defined in Control.Lens.Internal.Level

Methods

mempty :: Deepening i a #

mappend :: Deepening i a -> Deepening i a -> Deepening i a #

mconcat :: [Deepening i a] -> Deepening i a #

Monoid a => Monoid (Err e a) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

mempty :: Err e a #

mappend :: Err e a -> Err e a -> Err e a #

mconcat :: [Err e a] -> Err e a #

Monoid (ReifiedFold s a) 
Instance details

Defined in Control.Lens.Reified

Methods

mempty :: ReifiedFold s a #

mappend :: ReifiedFold s a -> ReifiedFold s a -> ReifiedFold s a #

mconcat :: [ReifiedFold s a] -> ReifiedFold s a #

(Stream s, Ord e) => Monoid (ParseError s e) 
Instance details

Defined in Text.Megaparsec.Error

Methods

mempty :: ParseError s e #

mappend :: ParseError s e -> ParseError s e -> ParseError s e #

mconcat :: [ParseError s e] -> ParseError s e #

Monoid (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 #

(PrimUnlifted a, unlifted_a ~ Unlifted a) => Monoid (UnliftedArray_ unlifted_a a) 
Instance details

Defined in Data.Primitive.Unlifted.Array.ST

Methods

mempty :: UnliftedArray_ unlifted_a a #

mappend :: UnliftedArray_ unlifted_a a -> UnliftedArray_ unlifted_a a -> UnliftedArray_ unlifted_a a #

mconcat :: [UnliftedArray_ unlifted_a a] -> UnliftedArray_ unlifted_a a #

(PrimUnlifted a, unlifted_a ~ Unlifted a) => Monoid (SmallUnliftedArray_ a unlifted_a) 
Instance details

Defined in Data.Primitive.Unlifted.SmallArray.ST

Methods

mempty :: SmallUnliftedArray_ a unlifted_a #

mappend :: SmallUnliftedArray_ a unlifted_a -> SmallUnliftedArray_ a unlifted_a -> SmallUnliftedArray_ a unlifted_a #

mconcat :: [SmallUnliftedArray_ a unlifted_a] -> SmallUnliftedArray_ a unlifted_a #

Ord k => Monoid (EnumMap k a) 
Instance details

Defined in Data.IntMap.EnumMap2

Methods

mempty :: EnumMap k a #

mappend :: EnumMap k a -> EnumMap k a -> EnumMap k a #

mconcat :: [EnumMap k a] -> EnumMap k a #

(Repeat f, Monoid a) => Monoid (Zippy f a) 
Instance details

Defined in Data.Zip

Methods

mempty :: Zippy f a #

mappend :: Zippy f a -> Zippy f a -> Zippy f a #

mconcat :: [Zippy f a] -> Zippy f 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 (TypeRepMap f) 
Instance details

Defined in Data.TypeRepMap.Internal

Methods

mempty :: TypeRepMap f #

mappend :: TypeRepMap f -> TypeRepMap f -> TypeRepMap f #

mconcat :: [TypeRepMap f] -> TypeRepMap f #

(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 #

(Biapplicative bi, Monoid a, Monoid b) => Monoid (Biap bi a b) 
Instance details

Defined in Data.Bifunctor.Biap

Methods

mempty :: Biap bi a b #

mappend :: Biap bi a b -> Biap bi a b -> Biap bi a b #

mconcat :: [Biap bi a b] -> Biap bi a b #

(Monad m, Monoid r) => Monoid (Effect m r a) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

mempty :: Effect m r a #

mappend :: Effect m r a -> Effect m r a -> Effect m r a #

mconcat :: [Effect m r a] -> Effect m r a #

(Applicative f, Monoid a, Monad m) => Monoid (Freed f m a) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

mempty :: Freed f m a #

mappend :: Freed f m a -> Freed f m a -> Freed f m a #

mconcat :: [Freed f m a] -> Freed f m a #

Monoid (ReifiedIndexedFold i s a) 
Instance details

Defined in Control.Lens.Reified

Methods

mempty :: ReifiedIndexedFold i s a #

mappend :: ReifiedIndexedFold i s a -> ReifiedIndexedFold i s a -> ReifiedIndexedFold i s a #

mconcat :: [ReifiedIndexedFold i s a] -> ReifiedIndexedFold i s a #

Monad m => Monoid (Handler e m a) 
Instance details

Defined in Control.Monad.Error.Lens

Methods

mempty :: Handler e m a #

mappend :: Handler e m a -> Handler e m a -> Handler e m a #

mconcat :: [Handler e m a] -> Handler e m a #

(Profunctor p, Arrow p, Semigroup b, Monoid b) => Monoid (Closure p a b) 
Instance details

Defined in Data.Profunctor.Closed

Methods

mempty :: Closure p a b #

mappend :: Closure p a b -> Closure p a b -> Closure p a b #

mconcat :: [Closure p a b] -> Closure p a b #

ArrowPlus p => Monoid (Tambara p a b) 
Instance details

Defined in Data.Profunctor.Strong

Methods

mempty :: Tambara p a b #

mappend :: Tambara p a b -> Tambara p a b -> Tambara p a b #

mconcat :: [Tambara p a b] -> Tambara p a b #

Reifies s (ReifiedMonoid a) => Monoid (ReflectedMonoid a s) 
Instance details

Defined in Data.Reflection

Methods

mempty :: ReflectedMonoid a s #

mappend :: ReflectedMonoid a s -> ReflectedMonoid a s -> ReflectedMonoid a s #

mconcat :: [ReflectedMonoid a s] -> ReflectedMonoid a s #

(Semigroup a, Monoid a) => Monoid (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

mempty :: Tagged s a #

mappend :: Tagged s a -> Tagged s a -> Tagged s a #

mconcat :: [Tagged s a] -> Tagged s a #

Monoid a => Monoid (Constant a b) 
Instance details

Defined in Data.Functor.Constant

Methods

mempty :: Constant a b #

mappend :: Constant a b -> Constant a b -> Constant a b #

mconcat :: [Constant a b] -> Constant a b #

(Monoid a, Monoid b, Monoid c) => Monoid (a, b, c) 
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 () #

(Stream s, Monoid a) => Monoid (ParsecT e s m a) 
Instance details

Defined in Text.Megaparsec.Internal

Methods

mempty :: ParsecT e s m a #

mappend :: ParsecT e s m a -> ParsecT e s m a -> ParsecT e s m a #

mconcat :: [ParsecT e s m a] -> ParsecT e s m a #

(Monoid a, Semigroup (ParsecT s u m a)) => Monoid (ParsecT s u m a) 
Instance details

Defined in Text.Parsec.Prim

Methods

mempty :: ParsecT s u m a #

mappend :: ParsecT s u m a -> ParsecT s u m a -> ParsecT s u m a #

mconcat :: [ParsecT s u m a] -> ParsecT s u m a #

Monoid r => Monoid (Forget r a b) 
Instance details

Defined in Data.Profunctor.Types

Methods

mempty :: Forget r a b #

mappend :: Forget r a b -> Forget r a b -> Forget r a b #

mconcat :: [Forget r a b] -> Forget r a b #

(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 #

Contravariant g => Monoid (BazaarT p g a b t) 
Instance details

Defined in Control.Lens.Internal.Bazaar

Methods

mempty :: BazaarT p g a b t #

mappend :: BazaarT p g a b t -> BazaarT p g a b t -> BazaarT p g a b t #

mconcat :: [BazaarT p g a b t] -> BazaarT p g a b t #

(Monoid 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 () #

bool :: a -> a -> Bool -> 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 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 Gen 
Instance details

Defined in Test.QuickCheck.Gen

Methods

pure :: a -> Gen a #

(<*>) :: Gen (a -> b) -> Gen a -> Gen b #

liftA2 :: (a -> b -> c) -> Gen a -> Gen b -> Gen c #

(*>) :: Gen a -> Gen b -> Gen b #

(<*) :: Gen a -> Gen b -> Gen a #

Applicative Rose 
Instance details

Defined in Test.QuickCheck.Property

Methods

pure :: a -> Rose a #

(<*>) :: Rose (a -> b) -> Rose a -> Rose b #

liftA2 :: (a -> b -> c) -> Rose a -> Rose b -> Rose c #

(*>) :: Rose a -> Rose b -> Rose b #

(<*) :: Rose a -> Rose b -> Rose 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 ParseASN1 
Instance details

Defined in Data.ASN1.Parse

Methods

pure :: a -> ParseASN1 a #

(<*>) :: ParseASN1 (a -> b) -> ParseASN1 a -> ParseASN1 b #

liftA2 :: (a -> b -> c) -> ParseASN1 a -> ParseASN1 b -> ParseASN1 c #

(*>) :: ParseASN1 a -> ParseASN1 b -> ParseASN1 b #

(<*) :: ParseASN1 a -> ParseASN1 b -> ParseASN1 a #

Applicative Concurrently 
Instance details

Defined in Control.Concurrent.Async.Internal

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 Get 
Instance details

Defined in Data.Binary.Get.Internal

Methods

pure :: a -> Get a #

(<*>) :: Get (a -> b) -> Get a -> Get b #

liftA2 :: (a -> b -> c) -> Get a -> Get b -> Get c #

(*>) :: Get a -> Get b -> Get b #

(<*) :: Get a -> Get b -> Get a #

Applicative PutM 
Instance details

Defined in Data.Binary.Put

Methods

pure :: a -> PutM a #

(<*>) :: PutM (a -> b) -> PutM a -> PutM b #

liftA2 :: (a -> b -> c) -> PutM a -> PutM b -> PutM c #

(*>) :: PutM a -> PutM b -> PutM b #

(<*) :: PutM a -> PutM b -> PutM a #

Applicative MarkupM 
Instance details

Defined in Text.Blaze.Internal

Methods

pure :: a -> MarkupM a #

(<*>) :: MarkupM (a -> b) -> MarkupM a -> MarkupM b #

liftA2 :: (a -> b -> c) -> MarkupM a -> MarkupM b -> MarkupM c #

(*>) :: MarkupM a -> MarkupM b -> MarkupM b #

(<*) :: MarkupM a -> MarkupM b -> MarkupM 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 Get 
Instance details

Defined in Data.Serialize.Get

Methods

pure :: a -> Get a #

(<*>) :: Get (a -> b) -> Get a -> Get b #

liftA2 :: (a -> b -> c) -> Get a -> Get b -> Get c #

(*>) :: Get a -> Get b -> Get b #

(<*) :: Get a -> Get b -> Get a #

Applicative PutM 
Instance details

Defined in Data.Serialize.Put

Methods

pure :: a -> PutM a #

(<*>) :: PutM (a -> b) -> PutM a -> PutM b #

liftA2 :: (a -> b -> c) -> PutM a -> PutM b -> PutM c #

(*>) :: PutM a -> PutM b -> PutM b #

(<*) :: PutM a -> PutM b -> PutM 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 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 NormM 
Instance details

Defined in GHC.Core.FamInstEnv

Methods

pure :: a -> NormM a #

(<*>) :: NormM (a -> b) -> NormM a -> NormM b #

liftA2 :: (a -> b -> c) -> NormM a -> NormM b -> NormM c #

(*>) :: NormM a -> NormM b -> NormM b #

(<*) :: NormM a -> NormM b -> NormM a #

Applicative MatchResult 
Instance details

Defined in GHC.HsToCore.Monad

Methods

pure :: a -> MatchResult a #

(<*>) :: MatchResult (a -> b) -> MatchResult a -> MatchResult b #

liftA2 :: (a -> b -> c) -> MatchResult a -> MatchResult b -> MatchResult c #

(*>) :: MatchResult a -> MatchResult b -> MatchResult b #

(<*) :: MatchResult a -> MatchResult b -> MatchResult a #

Applicative PV 
Instance details

Defined in GHC.Parser.PostProcess

Methods

pure :: a -> PV a #

(<*>) :: PV (a -> b) -> PV a -> PV b #

liftA2 :: (a -> b -> c) -> PV a -> PV b -> PV c #

(*>) :: PV a -> PV b -> PV b #

(<*) :: PV a -> PV b -> PV a #

Applicative SolverStage 
Instance details

Defined in GHC.Tc.Solver.Monad

Methods

pure :: a -> SolverStage a #

(<*>) :: SolverStage (a -> b) -> SolverStage a -> SolverStage b #

liftA2 :: (a -> b -> c) -> SolverStage a -> SolverStage b -> SolverStage c #

(*>) :: SolverStage a -> SolverStage b -> SolverStage b #

(<*) :: SolverStage a -> SolverStage b -> SolverStage a #

Applicative TcS 
Instance details

Defined in GHC.Tc.Solver.Monad

Methods

pure :: a -> TcS a #

(<*>) :: TcS (a -> b) -> TcS a -> TcS b #

liftA2 :: (a -> b -> c) -> TcS a -> TcS b -> TcS c #

(*>) :: TcS a -> TcS b -> TcS b #

(<*) :: TcS a -> TcS b -> TcS a #

Applicative 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 GHCiQ 
Instance details

Defined in GHCi.TH

Methods

pure :: a -> GHCiQ a #

(<*>) :: GHCiQ (a -> b) -> GHCiQ a -> GHCiQ b #

liftA2 :: (a -> b -> c) -> GHCiQ a -> GHCiQ b -> GHCiQ c #

(*>) :: GHCiQ a -> GHCiQ b -> GHCiQ b #

(<*) :: GHCiQ a -> GHCiQ b -> GHCiQ a #

Applicative EP 
Instance details

Defined in Language.Haskell.Exts.ExactPrint

Methods

pure :: a -> EP a #

(<*>) :: EP (a -> b) -> EP a -> EP b #

liftA2 :: (a -> b -> c) -> EP a -> EP b -> EP c #

(*>) :: EP a -> EP b -> EP b #

(<*) :: EP a -> EP b -> EP a #

Applicative Deque 
Instance details

Defined in Control.Lens.Internal.Deque

Methods

pure :: a -> Deque a #

(<*>) :: Deque (a -> b) -> Deque a -> Deque b #

liftA2 :: (a -> b -> c) -> Deque a -> Deque b -> Deque c #

(*>) :: Deque a -> Deque b -> Deque b #

(<*) :: Deque a -> Deque b -> Deque a #

Applicative Minio 
Instance details

Defined in Network.Minio.Data

Methods

pure :: a -> Minio a #

(<*>) :: Minio (a -> b) -> Minio a -> Minio b #

liftA2 :: (a -> b -> c) -> Minio a -> Minio b -> Minio c #

(*>) :: Minio a -> Minio b -> Minio b #

(<*) :: Minio a -> Minio b -> Minio 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 Eval 
Instance details

Defined in Control.Parallel.Strategies

Methods

pure :: a -> Eval a #

(<*>) :: Eval (a -> b) -> Eval a -> Eval b #

liftA2 :: (a -> b -> c) -> Eval a -> Eval b -> Eval c #

(*>) :: Eval a -> Eval b -> Eval b #

(<*) :: Eval a -> Eval b -> Eval a #

Applicative Conversion 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Methods

pure :: a -> Conversion a #

(<*>) :: Conversion (a -> b) -> Conversion a -> Conversion b #

liftA2 :: (a -> b -> c) -> Conversion a -> Conversion b -> Conversion c #

(*>) :: Conversion a -> Conversion b -> Conversion b #

(<*) :: Conversion a -> Conversion b -> Conversion a #

Applicative RowParser 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Methods

pure :: a -> RowParser a #

(<*>) :: RowParser (a -> b) -> RowParser a -> RowParser b #

liftA2 :: (a -> b -> c) -> RowParser a -> RowParser b -> RowParser c #

(*>) :: RowParser a -> RowParser b -> RowParser b #

(<*) :: RowParser a -> RowParser b -> RowParser a #

Applicative Ok 
Instance details

Defined in Database.PostgreSQL.Simple.Ok

Methods

pure :: a -> Ok a #

(<*>) :: Ok (a -> b) -> Ok a -> Ok b #

liftA2 :: (a -> b -> c) -> Ok a -> Ok b -> Ok c #

(*>) :: Ok a -> Ok b -> Ok b #

(<*) :: Ok a -> Ok b -> Ok 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 Acquire 
Instance details

Defined in Data.Acquire.Internal

Methods

pure :: a -> Acquire a #

(<*>) :: Acquire (a -> b) -> Acquire a -> Acquire b #

liftA2 :: (a -> b -> c) -> Acquire a -> Acquire b -> Acquire c #

(*>) :: Acquire a -> Acquire b -> Acquire b #

(<*) :: Acquire a -> Acquire b -> Acquire 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 Capability 
Instance details

Defined in System.Console.Terminfo.Base

Methods

pure :: a -> Capability a #

(<*>) :: Capability (a -> b) -> Capability a -> Capability b #

liftA2 :: (a -> b -> c) -> Capability a -> Capability b -> Capability c #

(*>) :: Capability a -> Capability b -> Capability b #

(<*) :: Capability a -> Capability b -> Capability 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 Box 
Instance details

Defined in Data.Stream.Monadic

Methods

pure :: a -> Box a #

(<*>) :: Box (a -> b) -> Box a -> Box b #

liftA2 :: (a -> b -> c) -> Box a -> Box b -> Box c #

(*>) :: Box a -> Box b -> Box b #

(<*) :: Box a -> Box b -> Box a #

Applicative UrlMap' 
Instance details

Defined in Network.Wai.UrlMap

Methods

pure :: a -> UrlMap' a #

(<*>) :: UrlMap' (a -> b) -> UrlMap' a -> UrlMap' b #

liftA2 :: (a -> b -> c) -> UrlMap' a -> UrlMap' b -> UrlMap' c #

(*>) :: UrlMap' a -> UrlMap' b -> UrlMap' b #

(<*) :: UrlMap' a -> UrlMap' b -> UrlMap' a #

Applicative AttrParser 
Instance details

Defined in Text.XML.Stream.Parse

Methods

pure :: a -> AttrParser a #

(<*>) :: AttrParser (a -> b) -> AttrParser a -> AttrParser b #

liftA2 :: (a -> b -> c) -> AttrParser a -> AttrParser b -> AttrParser c #

(*>) :: AttrParser a -> AttrParser b -> AttrParser b #

(<*) :: AttrParser a -> AttrParser b -> AttrParser a #

Applicative NameMatcher 
Instance details

Defined in Text.XML.Stream.Parse

Methods

pure :: a -> NameMatcher a #

(<*>) :: NameMatcher (a -> b) -> NameMatcher a -> NameMatcher b #

liftA2 :: (a -> b -> c) -> NameMatcher a -> NameMatcher b -> NameMatcher c #

(*>) :: NameMatcher a -> NameMatcher b -> NameMatcher b #

(<*) :: NameMatcher a -> NameMatcher b -> NameMatcher 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 (PropertyM m) 
Instance details

Defined in Test.QuickCheck.Monadic

Methods

pure :: a -> PropertyM m a #

(<*>) :: PropertyM m (a -> b) -> PropertyM m a -> PropertyM m b #

liftA2 :: (a -> b -> c) -> PropertyM m a -> PropertyM m b -> PropertyM m c #

(*>) :: PropertyM m a -> PropertyM m b -> PropertyM m b #

(<*) :: PropertyM m a -> PropertyM m b -> PropertyM m a #

Representable f => Applicative (Co f) 
Instance details

Defined in Data.Functor.Rep

Methods

pure :: a -> Co f a #

(<*>) :: Co f (a -> b) -> Co f a -> Co f b #

liftA2 :: (a -> b -> c) -> Co f a -> Co f b -> Co f c #

(*>) :: Co f a -> Co f b -> Co f b #

(<*) :: Co f a -> Co f b -> Co f a #

Applicative (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 (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 #

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 #

Applicative (EitherR r) 
Instance details

Defined in Data.EitherR

Methods

pure :: a -> EitherR r a #

(<*>) :: EitherR r (a -> b) -> EitherR r a -> EitherR r b #

liftA2 :: (a -> b -> c) -> EitherR r a -> EitherR r b -> EitherR r c #

(*>) :: EitherR r a -> EitherR r b -> EitherR r b #

(<*) :: EitherR r a -> EitherR r b -> EitherR r 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 (Alt f) 
Instance details

Defined in Control.Alternative.Free

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 #

Applicative (AltF f) 
Instance details

Defined in Control.Alternative.Free

Methods

pure :: a -> AltF f a #

(<*>) :: AltF f (a -> b) -> AltF f a -> AltF f b #

liftA2 :: (a -> b -> c) -> AltF f a -> AltF f b -> AltF f c #

(*>) :: AltF f a -> AltF f b -> AltF f b #

(<*) :: AltF f a -> AltF f b -> AltF f a #

Applicative (Alt f) 
Instance details

Defined in Control.Alternative.Free.Final

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 #

Applicative (Ap f) 
Instance details

Defined in Control.Applicative.Free

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 (Ap f) 
Instance details

Defined in Control.Applicative.Free.Fast

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 (Ap f) 
Instance details

Defined in Control.Applicative.Free.Final

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 #

Alternative f => Applicative (Cofree f) 
Instance details

Defined in Control.Comonad.Cofree

Methods

pure :: a -> Cofree f a #

(<*>) :: Cofree f (a -> b) -> Cofree f a -> Cofree f b #

liftA2 :: (a -> b -> c) -> Cofree f a -> Cofree f b -> Cofree f c #

(*>) :: Cofree f a -> Cofree f b -> Cofree f b #

(<*) :: Cofree f a -> Cofree f b -> Cofree f a #

Functor f => Applicative (Free f) 
Instance details

Defined in Control.Monad.Free

Methods

pure :: a -> Free f a #

(<*>) :: Free f (a -> b) -> Free f a -> Free f b #

liftA2 :: (a -> b -> c) -> Free f a -> Free f b -> Free f c #

(*>) :: Free f a -> Free f b -> Free f b #

(<*) :: Free f a -> Free f b -> Free f a #

Applicative f => Applicative (Free f) 
Instance details

Defined in Control.Monad.Free.Ap

Methods

pure :: a -> Free f a #

(<*>) :: Free f (a -> b) -> Free f a -> Free f b #

liftA2 :: (a -> b -> c) -> Free f a -> Free f b -> Free f c #

(*>) :: Free f a -> Free f b -> Free f b #

(<*) :: Free f a -> Free f b -> Free f a #

Applicative (F f) 
Instance details

Defined in Control.Monad.Free.Church

Methods

pure :: a -> F f a #

(<*>) :: F f (a -> b) -> F f a -> F f b #

liftA2 :: (a -> b -> c) -> F f a -> F f b -> F f c #

(*>) :: F f a -> F f b -> F f b #

(<*) :: F f a -> F f b -> F f a #

Monad m => Applicative (IterT m) 
Instance details

Defined in Control.Monad.Trans.Iter

Methods

pure :: a -> IterT m a #

(<*>) :: IterT m (a -> b) -> IterT m a -> IterT m b #

liftA2 :: (a -> b -> c) -> IterT m a -> IterT m b -> IterT m c #

(*>) :: IterT m a -> IterT m b -> IterT m b #

(<*) :: IterT m a -> IterT m b -> IterT m a #

Applicative (DocM s) 
Instance details

Defined in Language.Haskell.Exts.Pretty

Methods

pure :: a -> DocM s a #

(<*>) :: DocM s (a -> b) -> DocM s a -> DocM s b #

liftA2 :: (a -> b -> c) -> DocM s a -> DocM s b -> DocM s c #

(*>) :: DocM s a -> DocM s b -> DocM s b #

(<*) :: DocM s a -> DocM s b -> DocM s a #

Applicative f => Applicative (Coyoneda f) 
Instance details

Defined in Data.Functor.Coyoneda

Methods

pure :: a -> Coyoneda f a #

(<*>) :: Coyoneda f (a -> b) -> Coyoneda f a -> Coyoneda f b #

liftA2 :: (a -> b -> c) -> Coyoneda f a -> Coyoneda f b -> Coyoneda f c #

(*>) :: Coyoneda f a -> Coyoneda f b -> Coyoneda f b #

(<*) :: Coyoneda f a -> Coyoneda f b -> Coyoneda f a #

Applicative f => Applicative (Yoneda f) 
Instance details

Defined in Data.Functor.Yoneda

Methods

pure :: a -> Yoneda f a #

(<*>) :: Yoneda f (a -> b) -> Yoneda f a -> Yoneda f b #

liftA2 :: (a -> b -> c) -> Yoneda f a -> Yoneda f b -> Yoneda f c #

(*>) :: Yoneda f a -> Yoneda f b -> Yoneda f b #

(<*) :: Yoneda f a -> Yoneda f b -> Yoneda f a #

Applicative (StateL s) 
Instance details

Defined in Data.Key

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.Key

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 f => Applicative (Indexing f) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

pure :: a -> Indexing f a #

(<*>) :: Indexing f (a -> b) -> Indexing f a -> Indexing f b #

liftA2 :: (a -> b -> c) -> Indexing f a -> Indexing f b -> Indexing f c #

(*>) :: Indexing f a -> Indexing f b -> Indexing f b #

(<*) :: Indexing f a -> Indexing f b -> Indexing f a #

Applicative f => Applicative (Indexing64 f) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

pure :: a -> Indexing64 f a #

(<*>) :: Indexing64 f (a -> b) -> Indexing64 f a -> Indexing64 f b #

liftA2 :: (a -> b -> c) -> Indexing64 f a -> Indexing64 f b -> Indexing64 f c #

(*>) :: Indexing64 f a -> Indexing64 f b -> Indexing64 f b #

(<*) :: Indexing64 f a -> Indexing64 f b -> Indexing64 f a #

Applicative (ReifiedFold s) 
Instance details

Defined in Control.Lens.Reified

Methods

pure :: a -> ReifiedFold s a #

(<*>) :: ReifiedFold s (a -> b) -> ReifiedFold s a -> ReifiedFold s b #

liftA2 :: (a -> b -> c) -> ReifiedFold s a -> ReifiedFold s b -> ReifiedFold s c #

(*>) :: ReifiedFold s a -> ReifiedFold s b -> ReifiedFold s b #

(<*) :: ReifiedFold s a -> ReifiedFold s b -> ReifiedFold s a #

Applicative (ReifiedGetter s) 
Instance details

Defined in Control.Lens.Reified

Methods

pure :: a -> ReifiedGetter s a #

(<*>) :: ReifiedGetter s (a -> b) -> ReifiedGetter s a -> ReifiedGetter s b #

liftA2 :: (a -> b -> c) -> ReifiedGetter s a -> ReifiedGetter s b -> ReifiedGetter s c #

(*>) :: ReifiedGetter s a -> ReifiedGetter s b -> ReifiedGetter s b #

(<*) :: ReifiedGetter s a -> ReifiedGetter s b -> ReifiedGetter s a #

Applicative (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 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 #

Functor m => Applicative (Permutation m) 
Instance details

Defined in Control.Applicative.Permutations

Methods

pure :: a -> Permutation m a #

(<*>) :: Permutation m (a -> b) -> Permutation m a -> Permutation m b #

liftA2 :: (a -> b -> c) -> Permutation m a -> Permutation m b -> Permutation m c #

(*>) :: Permutation m a -> Permutation m b -> Permutation m b #

(<*) :: Permutation m a -> Permutation m b -> Permutation m a #

Alternative m => Applicative (Permutation m) 
Instance details

Defined in Control.Monad.Permutations

Methods

pure :: a -> Permutation m a #

(<*>) :: Permutation m (a -> b) -> Permutation m a -> Permutation m b #

liftA2 :: (a -> b -> c) -> Permutation m a -> Permutation m b -> Permutation m c #

(*>) :: Permutation m a -> Permutation m b -> Permutation m b #

(<*) :: Permutation m a -> Permutation m b -> Permutation m a #

Applicative (UniqueParser s) 
Instance details

Defined in Prettyprinter.Render.Util.SimpleDocTree

Methods

pure :: a -> UniqueParser s a #

(<*>) :: UniqueParser s (a -> b) -> UniqueParser s a -> UniqueParser s b #

liftA2 :: (a -> b -> c) -> UniqueParser s a -> UniqueParser s b -> UniqueParser s c #

(*>) :: UniqueParser s a -> UniqueParser s b -> UniqueParser s b #

(<*) :: UniqueParser s a -> UniqueParser s b -> UniqueParser s 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 #

Repeat f => Applicative (Zippy f) 
Instance details

Defined in Data.Zip

Methods

pure :: a -> Zippy f a #

(<*>) :: Zippy f (a -> b) -> Zippy f a -> Zippy f b #

liftA2 :: (a -> b -> c) -> Zippy f a -> Zippy f b -> Zippy f c #

(*>) :: Zippy f a -> Zippy f b -> Zippy f b #

(<*) :: Zippy f a -> Zippy f b -> Zippy f a #

Apply f => Applicative (MaybeApply f) 
Instance details

Defined in Data.Functor.Bind.Class

Methods

pure :: a -> MaybeApply f a #

(<*>) :: MaybeApply f (a -> b) -> MaybeApply f a -> MaybeApply f b #

liftA2 :: (a -> b -> c) -> MaybeApply f a -> MaybeApply f b -> MaybeApply f c #

(*>) :: MaybeApply f a -> MaybeApply f b -> MaybeApply f b #

(<*) :: MaybeApply f a -> MaybeApply f b -> MaybeApply f a #

Applicative f => Applicative (WrappedApplicative f) 
Instance details

Defined in Data.Functor.Bind.Class

Methods

pure :: a -> WrappedApplicative f a #

(<*>) :: WrappedApplicative f (a -> b) -> WrappedApplicative f a -> WrappedApplicative f b #

liftA2 :: (a -> b -> c) -> WrappedApplicative f a -> WrappedApplicative f b -> WrappedApplicative f c #

(*>) :: WrappedApplicative f a -> WrappedApplicative f b -> WrappedApplicative f b #

(<*) :: WrappedApplicative f a -> WrappedApplicative f b -> WrappedApplicative f 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 #

Applicative f => Applicative (WrappedFoldable f) 
Instance details

Defined in Witherable

Methods

pure :: a -> WrappedFoldable f a #

(<*>) :: WrappedFoldable f (a -> b) -> WrappedFoldable f a -> WrappedFoldable f b #

liftA2 :: (a -> b -> c) -> WrappedFoldable f a -> WrappedFoldable f b -> WrappedFoldable f c #

(*>) :: WrappedFoldable f a -> WrappedFoldable f b -> WrappedFoldable f b #

(<*) :: WrappedFoldable f a -> WrappedFoldable f b -> WrappedFoldable f 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 #

(Applicative w, Monoid (Rep g), Representable g) => Applicative (StoreT g w) 
Instance details

Defined in Control.Comonad.Representable.Store

Methods

pure :: a -> StoreT g w a #

(<*>) :: StoreT g w (a -> b) -> StoreT g w a -> StoreT g w b #

liftA2 :: (a -> b -> c) -> StoreT g w a -> StoreT g w b -> StoreT g w c #

(*>) :: StoreT g w a -> StoreT g w b -> StoreT g w b #

(<*) :: StoreT g w a -> StoreT g w b -> StoreT g w a #

(Representable f, Applicative m) => Applicative (ReaderT f m) 
Instance details

Defined in Control.Monad.Representable.Reader

Methods

pure :: a -> ReaderT f m a #

(<*>) :: ReaderT f m (a -> b) -> ReaderT f m a -> ReaderT f m b #

liftA2 :: (a -> b -> c) -> ReaderT f m a -> ReaderT f m b -> ReaderT f m c #

(*>) :: ReaderT f m a -> ReaderT f m b -> ReaderT f m b #

(<*) :: ReaderT f m a -> ReaderT f m b -> ReaderT f m a #

(Representable g, Functor m, Monad m) => Applicative (StateT g m) 
Instance details

Defined in Control.Monad.Representable.State

Methods

pure :: a -> StateT g m a #

(<*>) :: StateT g m (a -> b) -> StateT g m a -> StateT g m b #

liftA2 :: (a -> b -> c) -> StateT g m a -> StateT g m b -> StateT g m c #

(*>) :: StateT g m a -> StateT g m b -> StateT g m b #

(<*) :: StateT g m a -> StateT g m b -> StateT g m 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 #

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 (Reader r m) 
Instance details

Defined in Basement.Compat.MonadTrans

Methods

pure :: a -> Reader r m a #

(<*>) :: Reader r m (a -> b) -> Reader r m a -> Reader r m b #

liftA2 :: (a -> b -> c) -> Reader r m a -> Reader r m b -> Reader r m c #

(*>) :: Reader r m a -> Reader r m b -> Reader r m b #

(<*) :: Reader r m a -> Reader r m b -> Reader r m a #

Monad m => Applicative (State s m) 
Instance details

Defined in Basement.Compat.MonadTrans

Methods

pure :: a -> State s m a #

(<*>) :: State s m (a -> b) -> State s m a -> State s m b #

liftA2 :: (a -> b -> c) -> State s m a -> State s m b -> State s m c #

(*>) :: State s m a -> State s m b -> State s m b #

(<*) :: State s m a -> State s m b -> State s m a #

Applicative (Mag a b) 
Instance details

Defined in Data.Biapplicative

Methods

pure :: a0 -> Mag a b a0 #

(<*>) :: Mag a b (a0 -> b0) -> Mag a b a0 -> Mag a b b0 #

liftA2 :: (a0 -> b0 -> c) -> Mag a b a0 -> Mag a b b0 -> Mag a b c #

(*>) :: Mag a b a0 -> Mag a b b0 -> Mag a b b0 #

(<*) :: Mag a b a0 -> Mag a b b0 -> Mag a b a0 #

Applicative (bi a) => Applicative (Biap bi a) 
Instance details

Defined in Data.Bifunctor.Biap

Methods

pure :: a0 -> Biap bi a a0 #

(<*>) :: Biap bi a (a0 -> b) -> Biap bi a a0 -> Biap bi a b #

liftA2 :: (a0 -> b -> c) -> Biap bi a a0 -> Biap bi a b -> Biap bi a c #

(*>) :: Biap bi a a0 -> Biap bi a b -> Biap bi a b #

(<*) :: Biap bi a a0 -> Biap bi a b -> Biap bi a a0 #

Biapplicative p => Applicative (Fix p) 
Instance details

Defined in Data.Bifunctor.Fix

Methods

pure :: a -> Fix p a #

(<*>) :: Fix p (a -> b) -> Fix p a -> Fix p b #

liftA2 :: (a -> b -> c) -> Fix p a -> Fix p b -> Fix p c #

(*>) :: Fix p a -> Fix p b -> Fix p b #

(<*) :: Fix p a -> Fix p b -> Fix p a #

Biapplicative p => Applicative (Join p) 
Instance details

Defined in Data.Bifunctor.Join

Methods

pure :: a -> Join p a #

(<*>) :: Join p (a -> b) -> Join p a -> Join p b #

liftA2 :: (a -> b -> c) -> Join p a -> Join p b -> Join p c #

(*>) :: Join p a -> Join p b -> Join p b #

(<*) :: Join p a -> Join p b -> Join p a #

(Monoid e, Applicative m) => Applicative (EnvT e m) 
Instance details

Defined in Control.Comonad.Trans.Env

Methods

pure :: a -> EnvT e m a #

(<*>) :: EnvT e m (a -> b) -> EnvT e m a -> EnvT e m b #

liftA2 :: (a -> b -> c) -> EnvT e m a -> EnvT e m b -> EnvT e m c #

(*>) :: EnvT e m a -> EnvT e m b -> EnvT e m b #

(<*) :: EnvT e m a -> EnvT e m b -> EnvT e m a #

(Applicative w, Monoid s) => Applicative (StoreT s w) 
Instance details

Defined in Control.Comonad.Trans.Store

Methods

pure :: a -> StoreT s w a #

(<*>) :: StoreT s w (a -> b) -> StoreT s w a -> StoreT s w b #

liftA2 :: (a -> b -> c) -> StoreT s w a -> StoreT s w b -> StoreT s w c #

(*>) :: StoreT s w a -> StoreT s w b -> StoreT s w b #

(<*) :: StoreT s w a -> StoreT s w b -> StoreT s w a #

Applicative w => Applicative (TracedT m w) 
Instance details

Defined in Control.Comonad.Trans.Traced

Methods

pure :: a -> TracedT m w a #

(<*>) :: TracedT m w (a -> b) -> TracedT m w a -> TracedT m w b #

liftA2 :: (a -> b -> c) -> TracedT m w a -> TracedT m w b -> TracedT m w c #

(*>) :: TracedT m w a -> TracedT m w b -> TracedT m w b #

(<*) :: TracedT m w a -> TracedT m w b -> TracedT m w 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 #

Monad m => Applicative (ExceptRT r m) 
Instance details

Defined in Data.EitherR

Methods

pure :: a -> ExceptRT r m a #

(<*>) :: ExceptRT r m (a -> b) -> ExceptRT r m a -> ExceptRT r m b #

liftA2 :: (a -> b -> c) -> ExceptRT r m a -> ExceptRT r m b -> ExceptRT r m c #

(*>) :: ExceptRT r m a -> ExceptRT r m b -> ExceptRT r m b #

(<*) :: ExceptRT r m a -> ExceptRT r m b -> ExceptRT r m a #

Applicative g => Applicative (ApF f g) 
Instance details

Defined in Control.Applicative.Trans.Free

Methods

pure :: a -> ApF f g a #

(<*>) :: ApF f g (a -> b) -> ApF f g a -> ApF f g b #

liftA2 :: (a -> b -> c) -> ApF f g a -> ApF f g b -> ApF f g c #

(*>) :: ApF f g a -> ApF f g b -> ApF f g b #

(<*) :: ApF f g a -> ApF f g b -> ApF f g a #

Applicative g => Applicative (ApT f g) 
Instance details

Defined in Control.Applicative.Trans.Free

Methods

pure :: a -> ApT f g a #

(<*>) :: ApT f g (a -> b) -> ApT f g a -> ApT f g b #

liftA2 :: (a -> b -> c) -> ApT f g a -> ApT f g b -> ApT f g c #

(*>) :: ApT f g a -> ApT f g b -> ApT f g b #

(<*) :: ApT f g a -> ApT f g b -> ApT f g a #

(Alternative f, Applicative w) => Applicative (CofreeT f w) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

pure :: a -> CofreeT f w a #

(<*>) :: CofreeT f w (a -> b) -> CofreeT f w a -> CofreeT f w b #

liftA2 :: (a -> b -> c) -> CofreeT f w a -> CofreeT f w b -> CofreeT f w c #

(*>) :: CofreeT f w a -> CofreeT f w b -> CofreeT f w b #

(<*) :: CofreeT f w a -> CofreeT f w b -> CofreeT f w a #

(Functor f, Monad m) => Applicative (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

pure :: a -> FreeT f m a #

(<*>) :: FreeT f m (a -> b) -> FreeT f m a -> FreeT f m b #

liftA2 :: (a -> b -> c) -> FreeT f m a -> FreeT f m b -> FreeT f m c #

(*>) :: FreeT f m a -> FreeT f m b -> FreeT f m b #

(<*) :: FreeT f m a -> FreeT f m b -> FreeT f m a #

(Applicative f, Applicative m) => Applicative (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free.Ap

Methods

pure :: a -> FreeT f m a #

(<*>) :: FreeT f m (a -> b) -> FreeT f m a -> FreeT f m b #

liftA2 :: (a -> b -> c) -> FreeT f m a -> FreeT f m b -> FreeT f m c #

(*>) :: FreeT f m a -> FreeT f m b -> FreeT f m b #

(<*) :: FreeT f m a -> FreeT f m b -> FreeT f m a #

Applicative (FT f m) 
Instance details

Defined in Control.Monad.Trans.Free.Church

Methods

pure :: a -> FT f m a #

(<*>) :: FT f m (a -> b) -> FT f m a -> FT f m b #

liftA2 :: (a -> b -> c) -> FT f m a -> FT f m b -> FT f m c #

(*>) :: FT f m a -> FT f m b -> FT f m b #

(<*) :: FT f m a -> FT f m b -> FT f m a #

Applicative f => Applicative (WrappedFunctor f) 
Instance details

Defined in Data.Functor.Invariant

Methods

pure :: a -> WrappedFunctor f a #

(<*>) :: WrappedFunctor f (a -> b) -> WrappedFunctor f a -> WrappedFunctor f b #

liftA2 :: (a -> b -> c) -> WrappedFunctor f a -> WrappedFunctor f b -> WrappedFunctor f c #

(*>) :: WrappedFunctor f a -> WrappedFunctor f b -> WrappedFunctor f b #

(<*) :: WrappedFunctor f a -> WrappedFunctor f b -> WrappedFunctor f a #

Applicative f => Applicative (Density f) 
Instance details

Defined in Control.Comonad.Density

Methods

pure :: a -> Density f a #

(<*>) :: Density f (a -> b) -> Density f a -> Density f b #

liftA2 :: (a -> b -> c) -> Density f a -> Density f b -> Density f c #

(*>) :: Density f a -> Density f b -> Density f b #

(<*) :: Density f a -> Density f b -> Density f a #

(Applicative f, Applicative g) => Applicative (Day f g) 
Instance details

Defined in Data.Functor.Day

Methods

pure :: a -> Day f g a #

(<*>) :: Day f g (a -> b) -> Day f g a -> Day f g b #

liftA2 :: (a -> b -> c) -> Day f g a -> Day f g b -> Day f g c #

(*>) :: Day f g a -> Day f g b -> Day f g b #

(<*) :: Day f g a -> Day f g b -> Day f g a #

(Functor g, g ~ h) => Applicative (Curried g h) 
Instance details

Defined in Data.Functor.Day.Curried

Methods

pure :: a -> Curried g h a #

(<*>) :: Curried g h (a -> b) -> Curried g h a -> Curried g h b #

liftA2 :: (a -> b -> c) -> Curried g h a -> Curried g h b -> Curried g h c #

(*>) :: Curried g h a -> Curried g h b -> Curried g h b #

(<*) :: Curried g h a -> Curried g h b -> Curried g h a #

Applicative (Indexed i a) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

pure :: a0 -> Indexed i a a0 #

(<*>) :: Indexed i a (a0 -> b) -> Indexed i a a0 -> Indexed i a b #

liftA2 :: (a0 -> b -> c) -> Indexed i a a0 -> Indexed i a b -> Indexed i a c #

(*>) :: Indexed i a a0 -> Indexed i a b -> Indexed i a b #

(<*) :: Indexed i a a0 -> Indexed i a b -> Indexed i a a0 #

Applicative (Flows i b) 
Instance details

Defined in Control.Lens.Internal.Level

Methods

pure :: a -> Flows i b a #

(<*>) :: Flows i b (a -> b0) -> Flows i b a -> Flows i b b0 #

liftA2 :: (a -> b0 -> c) -> Flows i b a -> Flows i b b0 -> Flows i b c #

(*>) :: Flows i b a -> Flows i b b0 -> Flows i b b0 #

(<*) :: Flows i b a -> Flows i b b0 -> Flows i b a #

Applicative (Mafic a b) 
Instance details

Defined in Control.Lens.Internal.Magma

Methods

pure :: a0 -> Mafic a b a0 #

(<*>) :: Mafic a b (a0 -> b0) -> Mafic a b a0 -> Mafic a b b0 #

liftA2 :: (a0 -> b0 -> c) -> Mafic a b a0 -> Mafic a b b0 -> Mafic a b c #

(*>) :: Mafic a b a0 -> Mafic a b b0 -> Mafic a b b0 #

(<*) :: Mafic a b a0 -> Mafic a b b0 -> Mafic a b a0 #

(Monad m, Monoid r) => Applicative (Effect m r) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

pure :: a -> Effect m r a #

(<*>) :: Effect m r (a -> b) -> Effect m r a -> Effect m r b #

liftA2 :: (a -> b -> c) -> Effect m r a -> Effect m r b -> Effect m r c #

(*>) :: Effect m r a -> Effect m r b -> Effect m r b #

(<*) :: Effect m r a -> Effect m r b -> Effect m r a #

(Monad m, Monoid s) => Applicative (Focusing m s) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

pure :: a -> Focusing m s a #

(<*>) :: Focusing m s (a -> b) -> Focusing m s a -> Focusing m s b #

liftA2 :: (a -> b -> c) -> Focusing m s a -> Focusing m s b -> Focusing m s c #

(*>) :: Focusing m s a -> Focusing m s b -> Focusing m s b #

(<*) :: Focusing m s a -> Focusing m s b -> Focusing m s a #

Applicative (k (May s)) => Applicative (FocusingMay k s) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

pure :: a -> FocusingMay k s a #

(<*>) :: FocusingMay k s (a -> b) -> FocusingMay k s a -> FocusingMay k s b #

liftA2 :: (a -> b -> c) -> FocusingMay k s a -> FocusingMay k s b -> FocusingMay k s c #

(*>) :: FocusingMay k s a -> FocusingMay k s b -> FocusingMay k s b #

(<*) :: FocusingMay k s a -> FocusingMay k s b -> FocusingMay k s a #

Monoid m => Applicative (Holes t m) 
Instance details

Defined in Control.Lens.Traversal

Methods

pure :: a -> Holes t m a #

(<*>) :: Holes t m (a -> b) -> Holes t m a -> Holes t m b #

liftA2 :: (a -> b -> c) -> Holes t m a -> Holes t m b -> Holes t m c #

(*>) :: Holes t m a -> Holes t m b -> Holes t m b #

(<*) :: Holes t m a -> Holes t m b -> Holes t m a #

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 #

Monoid output => Applicative (StackMachine output style) 
Instance details

Defined in Prettyprinter.Render.Util.StackMachine

Methods

pure :: a -> StackMachine output style a #

(<*>) :: StackMachine output style (a -> b) -> StackMachine output style a -> StackMachine output style b #

liftA2 :: (a -> b -> c) -> StackMachine output style a -> StackMachine output style b -> StackMachine output style c #

(*>) :: StackMachine output style a -> StackMachine output style b -> StackMachine output style b #

(<*) :: StackMachine output style a -> StackMachine output style b -> StackMachine output style a #

(Profunctor p, Arrow p) => Applicative (Closure p a) 
Instance details

Defined in Data.Profunctor.Closed

Methods

pure :: a0 -> Closure p a a0 #

(<*>) :: Closure p a (a0 -> b) -> Closure p a a0 -> Closure p a b #

liftA2 :: (a0 -> b -> c) -> Closure p a a0 -> Closure p a b -> Closure p a c #

(*>) :: Closure p a a0 -> Closure p a b -> Closure p a b #

(<*) :: Closure p a a0 -> Closure p a b -> Closure p a a0 #

(Applicative (Rep p), Representable p) => Applicative (Prep p) 
Instance details

Defined in Data.Profunctor.Rep

Methods

pure :: a -> Prep p a #

(<*>) :: Prep p (a -> b) -> Prep p a -> Prep p b #

liftA2 :: (a -> b -> c) -> Prep p a -> Prep p b -> Prep p c #

(*>) :: Prep p a -> Prep p b -> Prep p b #

(<*) :: Prep p a -> Prep p b -> Prep p a #

(Profunctor p, Arrow p) => Applicative (Tambara p a) 
Instance details

Defined in Data.Profunctor.Strong

Methods

pure :: a0 -> Tambara p a a0 #

(<*>) :: Tambara p a (a0 -> b) -> Tambara p a a0 -> Tambara p a b #

liftA2 :: (a0 -> b -> c) -> Tambara p a a0 -> Tambara p a b -> Tambara p a c #

(*>) :: Tambara p a a0 -> Tambara p a b -> Tambara p a b #

(<*) :: Tambara p a a0 -> Tambara p a b -> Tambara p a a0 #

Applicative (Bazaar a b) 
Instance details

Defined in Data.Profunctor.Traversing

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 #

Applicative f => Applicative (Static f a) 
Instance details

Defined in Data.Semigroupoid.Static

Methods

pure :: a0 -> Static f a a0 #

(<*>) :: Static f a (a0 -> b) -> Static f a a0 -> Static f a b #

liftA2 :: (a0 -> b -> c) -> Static f a a0 -> Static f a b -> Static f a c #

(*>) :: Static f a a0 -> Static f a b -> Static f a b #

(<*) :: Static f a a0 -> Static f a b -> Static f a a0 #

Applicative (Tagged s) 
Instance details

Defined in Data.Tagged

Methods

pure :: a -> Tagged s a #

(<*>) :: Tagged s (a -> b) -> Tagged s a -> Tagged s b #

liftA2 :: (a -> b -> c) -> Tagged s a -> Tagged s b -> Tagged s c #

(*>) :: Tagged s a -> Tagged s b -> Tagged s b #

(<*) :: Tagged s a -> Tagged s b -> Tagged s a #

Applicative f => Applicative (Backwards f) 
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 #

Applicative (Peat a b) 
Instance details

Defined in Data.Witherable

Methods

pure :: a0 -> Peat a b a0 #

(<*>) :: Peat a b (a0 -> b0) -> Peat a b a0 -> Peat a b b0 #

liftA2 :: (a0 -> b0 -> c) -> Peat a b a0 -> Peat a b b0 -> Peat a b c #

(*>) :: Peat a b a0 -> Peat a b b0 -> Peat a b b0 #

(<*) :: Peat a b a0 -> Peat a b b0 -> Peat a b a0 #

(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) #

(Adjunction f g, Monad m) => Applicative (AdjointT f g m) 
Instance details

Defined in Control.Monad.Trans.Adjoint

Methods

pure :: a -> AdjointT f g m a #

(<*>) :: AdjointT f g m (a -> b) -> AdjointT f g m a -> AdjointT f g m b #

liftA2 :: (a -> b -> c) -> AdjointT f g m a -> AdjointT f g m b -> AdjointT f g m c #

(*>) :: AdjointT f g m a -> AdjointT f g m b -> AdjointT f g m b #

(<*) :: AdjointT f g m a -> AdjointT f g m b -> AdjointT f g m a #

(Adjunction f g, Comonad w) => Applicative (AdjointT f g w) 
Instance details

Defined in Control.Monad.Trans.Contravariant.Adjoint

Methods

pure :: a -> AdjointT f g w a #

(<*>) :: AdjointT f g w (a -> b) -> AdjointT f g w a -> AdjointT f g w b #

liftA2 :: (a -> b -> c) -> AdjointT f g w a -> AdjointT f g w b -> AdjointT f g w c #

(*>) :: AdjointT f g w a -> AdjointT f g w b -> AdjointT f g w b #

(<*) :: AdjointT f g w a -> AdjointT f g w b -> AdjointT f g w a #

Comonad w => Applicative (ContsT r w m) 
Instance details

Defined in Control.Monad.Trans.Conts

Methods

pure :: a -> ContsT r w m a #

(<*>) :: ContsT r w m (a -> b) -> ContsT r w m a -> ContsT r w m b #

liftA2 :: (a -> b -> c) -> ContsT r w m a -> ContsT r w m b -> ContsT r w m c #

(*>) :: ContsT r w m a -> ContsT r w m b -> ContsT r w m b #

(<*) :: ContsT r w m a -> ContsT r w m b -> ContsT r w m a #

(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 (Cokleisli w a) 
Instance details

Defined in Control.Comonad

Methods

pure :: a0 -> Cokleisli w a a0 #

(<*>) :: Cokleisli w a (a0 -> b) -> Cokleisli w a a0 -> Cokleisli w a b #

liftA2 :: (a0 -> b -> c) -> Cokleisli w a a0 -> Cokleisli w a b -> Cokleisli w a c #

(*>) :: Cokleisli w a a0 -> Cokleisli w a b -> Cokleisli w a b #

(<*) :: Cokleisli w a a0 -> Cokleisli w a b -> Cokleisli w a a0 #

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 #

Comonad w => Applicative (CoT w m) 
Instance details

Defined in Control.Monad.Co

Methods

pure :: a -> CoT w m a #

(<*>) :: CoT w m (a -> b) -> CoT w m a -> CoT w m b #

liftA2 :: (a -> b -> c) -> CoT w m a -> CoT w m b -> CoT w m c #

(*>) :: CoT w m a -> CoT w m b -> CoT w m b #

(<*) :: CoT w m a -> CoT w m b -> CoT w m a #

Applicative (Codensity f) 
Instance details

Defined in Control.Monad.Codensity

Methods

pure :: a -> Codensity f a #

(<*>) :: Codensity f (a -> b) -> Codensity f a -> Codensity f b #

liftA2 :: (a -> b -> c) -> Codensity f a -> Codensity f b -> Codensity f c #

(*>) :: Codensity f a -> Codensity f b -> Codensity f b #

(<*) :: Codensity f a -> Codensity f b -> Codensity f a #

(Functor g, Applicative h) => Applicative (Lan g h) 
Instance details

Defined in Data.Functor.Kan.Lan

Methods

pure :: a -> Lan g h a #

(<*>) :: Lan g h (a -> b) -> Lan g h a -> Lan g h b #

liftA2 :: (a -> b -> c) -> Lan g h a -> Lan g h b -> Lan g h c #

(*>) :: Lan g h a -> Lan g h b -> Lan g h b #

(<*) :: Lan g h a -> Lan g h b -> Lan g h a #

Applicative (Bazaar p a b) 
Instance details

Defined in Control.Lens.Internal.Bazaar

Methods

pure :: a0 -> Bazaar p a b a0 #

(<*>) :: Bazaar p a b (a0 -> b0) -> Bazaar p a b a0 -> Bazaar p a b b0 #

liftA2 :: (a0 -> b0 -> c) -> Bazaar p a b a0 -> Bazaar p a b b0 -> Bazaar p a b c #

(*>) :: Bazaar p a b a0 -> Bazaar p a b b0 -> Bazaar p a b b0 #

(<*) :: Bazaar p a b a0 -> Bazaar p a b b0 -> Bazaar p a b a0 #

Applicative (Molten i a b) 
Instance details

Defined in Control.Lens.Internal.Magma

Methods

pure :: a0 -> Molten i a b a0 #

(<*>) :: Molten i a b (a0 -> b0) -> Molten i a b a0 -> Molten i a b b0 #

liftA2 :: (a0 -> b0 -> c) -> Molten i a b a0 -> Molten i a b b0 -> Molten i a b c #

(*>) :: Molten i a b a0 -> Molten i a b b0 -> Molten i a b b0 #

(<*) :: Molten i a b a0 -> Molten i a b b0 -> Molten i a b a0 #

Applicative (k (Err e s)) => Applicative (FocusingErr e k s) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

pure :: a -> FocusingErr e k s a #

(<*>) :: FocusingErr e k s (a -> b) -> FocusingErr e k s a -> FocusingErr e k s b #

liftA2 :: (a -> b -> c) -> FocusingErr e k s a -> FocusingErr e k s b -> FocusingErr e k s c #

(*>) :: FocusingErr e k s a -> FocusingErr e k s b -> FocusingErr e k s b #

(<*) :: FocusingErr e k s a -> FocusingErr e k s b -> FocusingErr e k s a #

Applicative (k (f s)) => Applicative (FocusingOn f k s) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

pure :: a -> FocusingOn f k s a #

(<*>) :: FocusingOn f k s (a -> b) -> FocusingOn f k s a -> FocusingOn f k s b #

liftA2 :: (a -> b -> c) -> FocusingOn f k s a -> FocusingOn f k s b -> FocusingOn f k s c #

(*>) :: FocusingOn f k s a -> FocusingOn f k s b -> FocusingOn f k s b #

(<*) :: FocusingOn f k s a -> FocusingOn f k s b -> FocusingOn f k s a #

Applicative (k (s, w)) => Applicative (FocusingPlus w k s) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

pure :: a -> FocusingPlus w k s a #

(<*>) :: FocusingPlus w k s (a -> b) -> FocusingPlus w k s a -> FocusingPlus w k s b #

liftA2 :: (a -> b -> c) -> FocusingPlus w k s a -> FocusingPlus w k s b -> FocusingPlus w k s c #

(*>) :: FocusingPlus w k s a -> FocusingPlus w k s b -> FocusingPlus w k s b #

(<*) :: FocusingPlus w k s a -> FocusingPlus w k s b -> FocusingPlus w k s a #

(Monad m, Monoid s, Monoid w) => Applicative (FocusingWith w m s) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

pure :: a -> FocusingWith w m s a #

(<*>) :: FocusingWith w m s (a -> b) -> FocusingWith w m s a -> FocusingWith w m s b #

liftA2 :: (a -> b -> c) -> FocusingWith w m s a -> FocusingWith w m s b -> FocusingWith w m s c #

(*>) :: FocusingWith w m s a -> FocusingWith w m s b -> FocusingWith w m s b #

(<*) :: FocusingWith w m s a -> FocusingWith w m s b -> FocusingWith w m s a #

Stream s => Applicative (ParsecT e s m) 
Instance details

Defined in Text.Megaparsec.Internal

Methods

pure :: a -> ParsecT e s m a #

(<*>) :: ParsecT e s m (a -> b) -> ParsecT e s m a -> ParsecT e s m b #

liftA2 :: (a -> b -> c) -> ParsecT e s m a -> ParsecT e s m b -> ParsecT e s m c #

(*>) :: ParsecT e s m a -> ParsecT e s m b -> ParsecT e s m b #

(<*) :: ParsecT e s m a -> ParsecT e s m b -> ParsecT e s m a #

Applicative (ParsecT s u m) 
Instance details

Defined in Text.Parsec.Prim

Methods

pure :: a -> ParsecT s u m a #

(<*>) :: ParsecT s u m (a -> b) -> ParsecT s u m a -> ParsecT s u m b #

liftA2 :: (a -> b -> c) -> ParsecT s u m a -> ParsecT s u m b -> ParsecT s u m c #

(*>) :: ParsecT s u m a -> ParsecT s u m b -> ParsecT s u m b #

(<*) :: ParsecT s u m a -> ParsecT s u m b -> ParsecT s u m a #

Applicative (Costar f a) 
Instance details

Defined in Data.Profunctor.Types

Methods

pure :: a0 -> Costar f a a0 #

(<*>) :: Costar f a (a0 -> b) -> Costar f a a0 -> Costar f a b #

liftA2 :: (a0 -> b -> c) -> Costar f a a0 -> Costar f a b -> Costar f a c #

(*>) :: Costar f a a0 -> Costar f a b -> Costar f a b #

(<*) :: Costar f a a0 -> Costar f a b -> Costar f a a0 #

Applicative f => Applicative (Star f a) 
Instance details

Defined in Data.Profunctor.Types

Methods

pure :: a0 -> Star f a a0 #

(<*>) :: Star f a (a0 -> b) -> Star f a a0 -> Star f a b #

liftA2 :: (a0 -> b -> c) -> Star f a a0 -> Star f a b -> Star f a c #

(*>) :: Star f a a0 -> Star f a b -> Star f a b #

(<*) :: Star f a a0 -> Star f a b -> Star f a a0 #

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 #

Applicative (BazaarT p g a b) 
Instance details

Defined in Control.Lens.Internal.Bazaar

Methods

pure :: a0 -> BazaarT p g a b a0 #

(<*>) :: BazaarT p g a b (a0 -> b0) -> BazaarT p g a b a0 -> BazaarT p g a b b0 #

liftA2 :: (a0 -> b0 -> c) -> BazaarT p g a b a0 -> BazaarT p g a b b0 -> BazaarT p g a b c #

(*>) :: BazaarT p g a b a0 -> BazaarT p g a b b0 -> BazaarT p g a b b0 #

(<*) :: BazaarT p g a b a0 -> BazaarT p g a b b0 -> BazaarT p g a b a0 #

Applicative (TakingWhile p f a b) 
Instance details

Defined in Control.Lens.Internal.Magma

Methods

pure :: a0 -> TakingWhile p f a b a0 #

(<*>) :: TakingWhile p f a b (a0 -> b0) -> TakingWhile p f a b a0 -> TakingWhile p f a b b0 #

liftA2 :: (a0 -> b0 -> c) -> TakingWhile p f a b a0 -> TakingWhile p f a b b0 -> TakingWhile p f a b c #

(*>) :: TakingWhile p f a b a0 -> TakingWhile p f a b b0 -> TakingWhile p f a b b0 #

(<*) :: TakingWhile p f a b a0 -> TakingWhile p f a b b0 -> TakingWhile p f a b a0 #

(Monoid s, Monoid w, Monad m) => Applicative (EffectRWS w st m s) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

pure :: a -> EffectRWS w st m s a #

(<*>) :: EffectRWS w st m s (a -> b) -> EffectRWS w st m s a -> EffectRWS w st m s b #

liftA2 :: (a -> b -> c) -> EffectRWS w st m s a -> EffectRWS w st m s b -> EffectRWS w st m s c #

(*>) :: EffectRWS w st m s a -> EffectRWS w st m s b -> EffectRWS w st m s b #

(<*) :: EffectRWS w st m s a -> EffectRWS w st m s b -> EffectRWS w st m s a #

Applicative (k (Freed f m s)) => Applicative (FocusingFree f m k s) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

pure :: a -> FocusingFree f m k s a #

(<*>) :: FocusingFree f m k s (a -> b) -> FocusingFree f m k s a -> FocusingFree f m k s b #

liftA2 :: (a -> b -> c) -> FocusingFree f m k s a -> FocusingFree f m k s b -> FocusingFree f m k s c #

(*>) :: FocusingFree f m k s a -> FocusingFree f m k s b -> FocusingFree f m k s b #

(<*) :: FocusingFree f m k s a -> FocusingFree f m k s b -> FocusingFree f m k s a #

Reifies s (ReifiedApplicative f) => Applicative (ReflectedApplicative f s) 
Instance details

Defined in Data.Reflection

Methods

pure :: a -> ReflectedApplicative f s a #

(<*>) :: ReflectedApplicative f s (a -> b) -> ReflectedApplicative f s a -> ReflectedApplicative f s b #

liftA2 :: (a -> b -> c) -> ReflectedApplicative f s a -> ReflectedApplicative f s b -> ReflectedApplicative f s c #

(*>) :: ReflectedApplicative f s a -> ReflectedApplicative f s b -> ReflectedApplicative f s b #

(<*) :: ReflectedApplicative f s a -> ReflectedApplicative f s b -> ReflectedApplicative f 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 IsLabel (x :: Symbol) a where #

Methods

fromLabel :: a #

Instances

Instances details
(KnownSymbol name, name' ~ name) => IsLabel name (Proxy name') Source # 
Instance details

Defined in IHP.HaskellSupport

Methods

fromLabel :: Proxy name' #

data Integer #

Instances

Instances details
Structured Integer 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy Integer -> Structure

structureHash' :: Tagged Integer MD5

Arbitrary Integer 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen Integer

shrink :: Integer -> [Integer]

CoArbitrary Integer 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Integer -> Gen b -> Gen b

Function Integer 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Integer -> b) -> Integer :-> b

FromJSON Integer 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Integer 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Integer 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Integer 
Instance details

Defined in Data.Aeson.Types.ToJSON

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

Fractional Rational 
Instance details

Defined in Basement.Compat.NumLiteral

HasNegation Integer 
Instance details

Defined in Basement.Compat.NumLiteral

Methods

negate :: Integer -> Integer

Integral Integer 
Instance details

Defined in Basement.Compat.NumLiteral

NormalForm Integer 
Instance details

Defined in Basement.NormalForm

Methods

toNormalForm :: Integer -> ()

Additive Rational 
Instance details

Defined in Basement.Numerical.Additive

Methods

azero :: Rational

(+) :: Rational -> Rational -> Rational

scale :: IsNatural n => n -> Rational -> Rational

Additive Integer 
Instance details

Defined in Basement.Numerical.Additive

Methods

azero :: Integer

(+) :: Integer -> Integer -> Integer

scale :: IsNatural n => n -> Integer -> Integer

Divisible Rational 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

(/) :: Rational -> Rational -> Rational

IDivisible Integer 
Instance details

Defined in Basement.Numerical.Multiplicative

Multiplicative Rational 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

midentity :: Rational

(*) :: Rational -> Rational -> Rational

(^) :: (IsNatural n, Enum n, IDivisible n) => Rational -> n -> Rational

Multiplicative Integer 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

midentity :: Integer

(*) :: Integer -> Integer -> Integer

(^) :: (IsNatural n, Enum n, IDivisible n) => Integer -> n -> Integer

IsIntegral Integer 
Instance details

Defined in Basement.Numerical.Number

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

ToMarkup Integer 
Instance details

Defined in Text.Blaze

Methods

toMarkup :: Integer -> Markup

preEscapedToMarkup :: Integer -> Markup

ToValue Integer 
Instance details

Defined in Text.Blaze

Methods

toValue :: Integer -> AttributeValue

preEscapedToValue :: Integer -> AttributeValue

Serialize Integer 
Instance details

Defined in Data.Serialize

Methods

put :: Putter Integer

get :: Get Integer

Default Integer 
Instance details

Defined in Data.Default.Class

Methods

def :: Integer #

NFData Integer 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Integer -> () #

ToLogStr Integer 
Instance details

Defined in System.Log.FastLogger.LogStr

Methods

toLogStr :: Integer -> LogStr #

ToJExpr Integer 
Instance details

Defined in GHC.JS.Make

Methods

toJExpr :: Integer -> JExpr

toJExprFromList :: [Integer] -> JExpr

Outputable Integer 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Integer -> SDoc

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 #

ToLit Integer 
Instance details

Defined in Language.Haskell.Meta.Syntax.Translate

Methods

toLit :: Integer -> Lit

HpcHash Integer 
Instance details

Defined in Trace.Hpc.Util

Methods

toHash :: Integer -> Hash

ParamReader Integer Source # 
Instance details

Defined in IHP.Controller.Param

InputValue Integer Source # 
Instance details

Defined in IHP.ModelSupport

FromField Integer 
Instance details

Defined in Database.PostgreSQL.Simple.FromField

Methods

fromField :: FieldParser Integer

ToField Integer 
Instance details

Defined in Database.PostgreSQL.Simple.ToField

Methods

toField :: Integer -> Action

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

Random Integer 
Instance details

Defined in System.Random.TF.Instances

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]

IsIntegral n => From n Integer 
Instance details

Defined in Basement.From

Methods

from :: n -> Integer

IntegralDownsize Integer Int16 
Instance details

Defined in Basement.IntegralConv

IntegralDownsize Integer Int32 
Instance details

Defined in Basement.IntegralConv

IntegralDownsize Integer Int64 
Instance details

Defined in Basement.IntegralConv

IntegralDownsize Integer Int8 
Instance details

Defined in Basement.IntegralConv

IntegralDownsize Integer Word16 
Instance details

Defined in Basement.IntegralConv

IntegralDownsize Integer Word32 
Instance details

Defined in Basement.IntegralConv

IntegralDownsize Integer Word64 
Instance details

Defined in Basement.IntegralConv

IntegralDownsize Integer Word8 
Instance details

Defined in Basement.IntegralConv

IntegralDownsize Integer Natural 
Instance details

Defined in Basement.IntegralConv

Methods

integralDownsize :: Integer -> Natural

integralDownsizeCheck :: Integer -> Maybe Natural

IsIntegral a => IntegralUpsize a Integer 
Instance details

Defined in Basement.IntegralConv

Methods

integralUpsize :: a -> Integer

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

KnownNat n => Reifies (n :: Nat) Integer 
Instance details

Defined in Data.Reflection

Methods

reflect :: proxy n -> Integer

FromField (Ratio Integer) 
Instance details

Defined in Database.PostgreSQL.Simple.FromField

Methods

fromField :: FieldParser (Ratio Integer)

ToField (PGRange Integer) 
Instance details

Defined in Database.PostgreSQL.Simple.Range

Methods

toField :: PGRange Integer -> Action

type Difference Integer 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Integer = Integer

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

Arbitrary Int 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen Int

shrink :: Int -> [Int]

CoArbitrary Int 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Int -> Gen b -> Gen b

Function Int 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Int -> b) -> Int :-> b

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

ToJSON Int 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Int 
Instance details

Defined in Data.Aeson.Types.ToJSON

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

HasNegation Int 
Instance details

Defined in Basement.Compat.NumLiteral

Methods

negate :: Int -> Int

Integral Int 
Instance details

Defined in Basement.Compat.NumLiteral

Methods

fromInteger :: Integer -> Int

NormalForm Int 
Instance details

Defined in Basement.NormalForm

Methods

toNormalForm :: Int -> ()

Additive Int 
Instance details

Defined in Basement.Numerical.Additive

Methods

azero :: Int

(+) :: Int -> Int -> Int

scale :: IsNatural n => n -> Int -> Int

IDivisible Int 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

div :: Int -> Int -> Int

mod :: Int -> Int -> Int

divMod :: Int -> Int -> (Int, Int)

Multiplicative Int 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

midentity :: Int

(*) :: Int -> Int -> Int

(^) :: (IsNatural n, Enum n, IDivisible n) => Int -> n -> Int

IsIntegral Int 
Instance details

Defined in Basement.Numerical.Number

Methods

toInteger :: Int -> Integer

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 ()

ToMarkup Int 
Instance details

Defined in Text.Blaze

Methods

toMarkup :: Int -> Markup

preEscapedToMarkup :: Int -> Markup

ToValue Int 
Instance details

Defined in Text.Blaze

Methods

toValue :: Int -> AttributeValue

preEscapedToValue :: Int -> AttributeValue

ToBoundedBuilder Int 
Instance details

Defined in Data.Bytes.Builder.Bounded.Class

Associated Types

type BoundedBuilderLength Int 
Instance details

Defined in Data.Bytes.Builder.Bounded.Class

type BoundedBuilderLength Int = 20

Methods

toBuilder :: Int -> Builder (BoundedBuilderLength Int)

ToBuilder Int 
Instance details

Defined in Data.Bytes.Builder.Class

Methods

toBuilder :: Int -> Builder

Serialize Int 
Instance details

Defined in Data.Serialize

Methods

put :: Putter Int

get :: Get Int

Default Int 
Instance details

Defined in Data.Default.Class

Methods

def :: Int #

NFData Int 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int -> () #

ToLogStr Int 
Instance details

Defined in System.Log.FastLogger.LogStr

Methods

toLogStr :: Int -> LogStr #

ToJExpr Int 
Instance details

Defined in GHC.JS.Make

Methods

toJExpr :: Int -> JExpr

toJExprFromList :: [Int] -> JExpr

Outputable Int 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Int -> SDoc

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 #

ToLit Int 
Instance details

Defined in Language.Haskell.Meta.Syntax.Translate

Methods

toLit :: Int -> Lit

HpcHash Int 
Instance details

Defined in Trace.Hpc.Util

Methods

toHash :: Int -> Hash

ParamReader Int Source # 
Instance details

Defined in IHP.Controller.Param

EnvVarReader Int Source # 
Instance details

Defined in IHP.EnvVar

InputValue Int Source # 
Instance details

Defined in IHP.ModelSupport

Methods

inputValue :: Int -> Text Source #

FromField Int 
Instance details

Defined in Database.PostgreSQL.Simple.FromField

Methods

fromField :: FieldParser Int

ToField Int 
Instance details

Defined in Database.PostgreSQL.Simple.ToField

Methods

toField :: Int -> Action

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

Prim Int 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: Int -> Int#

alignment# :: Int -> Int#

indexByteArray# :: ByteArray# -> Int# -> Int

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, Int #)

writeByteArray# :: MutableByteArray# s -> Int# -> Int -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> Int -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> Int

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, Int #)

writeOffAddr# :: Addr# -> Int# -> Int -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> Int -> State# s -> State# s

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

Random Int 
Instance details

Defined in System.Random.TF.Instances

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]

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

Lexicographic Int 
Instance details

Defined in Data.Vector.Algorithms.AmericanFlag

Methods

extent :: Int -> Int

size :: Proxy Int -> Int

index :: Int -> Int -> Int

Radix Int 
Instance details

Defined in Data.Vector.Algorithms.Radix

Methods

passes :: Int -> Int

size :: Int -> Int

radix :: Int -> Int -> 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

Cast Int64 Int 
Instance details

Defined in Basement.Cast

Methods

cast :: Int64 -> Int

Cast Word64 Int 
Instance details

Defined in Basement.Cast

Methods

cast :: Word64 -> Int

Cast Int Int64 
Instance details

Defined in Basement.Cast

Methods

cast :: Int -> Int64

Cast Int Word64 
Instance details

Defined in Basement.Cast

Methods

cast :: Int -> Word64

Cast Int Word 
Instance details

Defined in Basement.Cast

Methods

cast :: Int -> Word

Cast Word Int 
Instance details

Defined in Basement.Cast

Methods

cast :: Word -> Int

From Int16 Int 
Instance details

Defined in Basement.From

Methods

from :: Int16 -> Int

From Int32 Int 
Instance details

Defined in Basement.From

Methods

from :: Int32 -> Int

From Int8 Int 
Instance details

Defined in Basement.From

Methods

from :: Int8 -> Int

From Word16 Int 
Instance details

Defined in Basement.From

Methods

from :: Word16 -> Int

From Word32 Int 
Instance details

Defined in Basement.From

Methods

from :: Word32 -> Int

From Word8 Int 
Instance details

Defined in Basement.From

Methods

from :: Word8 -> Int

From Int Int64 
Instance details

Defined in Basement.From

Methods

from :: Int -> Int64

IntegralDownsize Int64 Int 
Instance details

Defined in Basement.IntegralConv

IntegralDownsize Int Int16 
Instance details

Defined in Basement.IntegralConv

Methods

integralDownsize :: Int -> Int16

integralDownsizeCheck :: Int -> Maybe Int16

IntegralDownsize Int Int32 
Instance details

Defined in Basement.IntegralConv

IntegralDownsize Int Int8 
Instance details

Defined in Basement.IntegralConv

Methods

integralDownsize :: Int -> Int8

integralDownsizeCheck :: Int -> Maybe Int8

IntegralUpsize Int16 Int 
Instance details

Defined in Basement.IntegralConv

Methods

integralUpsize :: Int16 -> Int

IntegralUpsize Int32 Int 
Instance details

Defined in Basement.IntegralConv

Methods

integralUpsize :: Int32 -> Int

IntegralUpsize Int8 Int 
Instance details

Defined in Basement.IntegralConv

Methods

integralUpsize :: Int8 -> Int

IntegralUpsize Word8 Int 
Instance details

Defined in Basement.IntegralConv

Methods

integralUpsize :: Word8 -> Int

IntegralUpsize Int Int64 
Instance details

Defined in Basement.IntegralConv

Methods

integralUpsize :: Int -> Int64

FoldableWithIndex Int Deque 
Instance details

Defined in Control.Lens.Internal.Deque

Methods

ifoldMap :: Monoid m => (Int -> a -> m) -> Deque a -> m

ifoldMap' :: Monoid m => (Int -> a -> m) -> Deque a -> m

ifoldr :: (Int -> a -> b -> b) -> b -> Deque a -> b

ifoldl :: (Int -> b -> a -> b) -> b -> Deque a -> b

ifoldr' :: (Int -> a -> b -> b) -> b -> Deque a -> b

ifoldl' :: (Int -> b -> a -> b) -> b -> Deque a -> b

FunctorWithIndex Int Deque 
Instance details

Defined in Control.Lens.Internal.Deque

Methods

imap :: (Int -> a -> b) -> Deque a -> Deque b

TraversableWithIndex Int Deque 
Instance details

Defined in Control.Lens.Internal.Deque

Methods

itraverse :: Applicative f => (Int -> a -> f b) -> Deque a -> f (Deque b)

TraverseMax Int IntMap 
Instance details

Defined in Control.Lens.Traversal

Methods

traverseMax :: IndexedTraversal' Int (IntMap v) v

TraverseMin Int IntMap 
Instance details

Defined in Control.Lens.Traversal

Methods

traverseMin :: IndexedTraversal' Int (IntMap v) v

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

UTF8Bytes ByteString Int 
Instance details

Defined in Codec.Binary.UTF8.Generic

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)

FilterableWithIndex Int ZipList 
Instance details

Defined in Witherable

Methods

imapMaybe :: (Int -> a -> Maybe b) -> ZipList a -> ZipList b

ifilter :: (Int -> a -> Bool) -> ZipList a -> ZipList a

FilterableWithIndex Int IntMap 
Instance details

Defined in Witherable

Methods

imapMaybe :: (Int -> a -> Maybe b) -> IntMap a -> IntMap b

ifilter :: (Int -> a -> Bool) -> IntMap a -> IntMap a

FilterableWithIndex Int Seq 
Instance details

Defined in Witherable

Methods

imapMaybe :: (Int -> a -> Maybe b) -> Seq a -> Seq b

ifilter :: (Int -> a -> Bool) -> Seq a -> Seq a

FilterableWithIndex Int Vector 
Instance details

Defined in Witherable

Methods

imapMaybe :: (Int -> a -> Maybe b) -> Vector a -> Vector b

ifilter :: (Int -> a -> Bool) -> Vector a -> Vector a

FilterableWithIndex Int [] 
Instance details

Defined in Witherable

Methods

imapMaybe :: (Int -> a -> Maybe b) -> [a] -> [b]

ifilter :: (Int -> a -> Bool) -> [a] -> [a]

WitherableWithIndex Int ZipList 
Instance details

Defined in Witherable

Methods

iwither :: Applicative f => (Int -> a -> f (Maybe b)) -> ZipList a -> f (ZipList b)

iwitherM :: Monad m => (Int -> a -> m (Maybe b)) -> ZipList a -> m (ZipList b)

ifilterA :: Applicative f => (Int -> a -> f Bool) -> ZipList a -> f (ZipList a)

WitherableWithIndex Int IntMap 
Instance details

Defined in Witherable

Methods

iwither :: Applicative f => (Int -> a -> f (Maybe b)) -> IntMap a -> f (IntMap b)

iwitherM :: Monad m => (Int -> a -> m (Maybe b)) -> IntMap a -> m (IntMap b)

ifilterA :: Applicative f => (Int -> a -> f Bool) -> IntMap a -> f (IntMap a)

WitherableWithIndex Int Seq 
Instance details

Defined in Witherable

Methods

iwither :: Applicative f => (Int -> a -> f (Maybe b)) -> Seq a -> f (Seq b)

iwitherM :: Monad m => (Int -> a -> m (Maybe b)) -> Seq a -> m (Seq b)

ifilterA :: Applicative f => (Int -> a -> f Bool) -> Seq a -> f (Seq a)

WitherableWithIndex Int Vector 
Instance details

Defined in Witherable

Methods

iwither :: Applicative f => (Int -> a -> f (Maybe b)) -> Vector a -> f (Vector b)

iwitherM :: Monad m => (Int -> a -> m (Maybe b)) -> Vector a -> m (Vector b)

ifilterA :: Applicative f => (Int -> a -> f Bool) -> Vector a -> f (Vector a)

WitherableWithIndex Int [] 
Instance details

Defined in Witherable

Methods

iwither :: Applicative f => (Int -> a -> f (Maybe b)) -> [a] -> f [b]

iwitherM :: Monad m => (Int -> a -> m (Maybe b)) -> [a] -> m [b]

ifilterA :: Applicative f => (Int -> a -> f Bool) -> [a] -> f [a]

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 ()

SetField "maxItems" Options Int Source # 
Instance details

Defined in IHP.Pagination.Types

SetField "windowSize" Options Int Source # 
Instance details

Defined in IHP.Pagination.Types

Reifies Z Int 
Instance details

Defined in Data.Reflection

Methods

reflect :: proxy Z -> Int

TryFrom Int (CountOf ty) 
Instance details

Defined in Basement.From

Methods

tryFrom :: Int -> Maybe (CountOf ty)

TryFrom Int (Offset ty) 
Instance details

Defined in Basement.From

Methods

tryFrom :: Int -> Maybe (Offset ty)

GEq1 v (UInt :: Type -> Type) 
Instance details

Defined in Data.Functor.Classes.Generic.Internal

Methods

gliftEq :: Eq1Args v a b -> UInt a -> UInt b -> Bool

GOrd1 v (UInt :: Type -> Type) 
Instance details

Defined in Data.Functor.Classes.Generic.Internal

Methods

gliftCompare :: Ord1Args v a b -> UInt a -> UInt b -> Ordering

GShow1Con v (UInt :: Type -> Type) 
Instance details

Defined in Data.Functor.Classes.Generic.Internal

Methods

gliftShowsPrecCon :: Options -> ConType -> Show1Args v a -> Int -> UInt a -> ShowS

Reifies n Int => Reifies (D n :: Type) Int 
Instance details

Defined in Data.Reflection

Methods

reflect :: proxy (D n) -> Int

Reifies n Int => Reifies (PD n :: Type) Int 
Instance details

Defined in Data.Reflection

Methods

reflect :: proxy (PD n) -> Int

Reifies n Int => Reifies (SD n :: Type) Int 
Instance details

Defined in Data.Reflection

Methods

reflect :: proxy (SD n) -> Int

Generic1 (URec Int :: k -> Type) 
Instance details

Defined in GHC.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) #

Invariant (UInt :: Type -> Type) 
Instance details

Defined in Data.Functor.Invariant

Methods

invmap :: (a -> b) -> (b -> a) -> UInt a -> UInt b

ToField (PGRange Int) 
Instance details

Defined in Database.PostgreSQL.Simple.Range

Methods

toField :: PGRange Int -> Action

IsNullaryCon (UInt :: Type -> Type) 
Instance details

Defined in Data.Functor.Classes.Generic.Internal

Methods

isNullaryCon :: UInt a -> Bool

From (CountOf ty) Int 
Instance details

Defined in Basement.From

Methods

from :: CountOf ty -> Int

Bizarre (Indexed Int) Mafic 
Instance details

Defined in Control.Lens.Internal.Magma

Methods

bazaar :: Applicative f => Indexed Int a (f b) -> Mafic a b t -> f t

UTF8Bytes [Word8] Int 
Instance details

Defined in Codec.Binary.UTF8.Generic

Methods

bsplit :: Int -> [Word8] -> ([Word8], [Word8])

bdrop :: Int -> [Word8] -> [Word8]

buncons :: [Word8] -> Maybe (Word8, [Word8])

elemIndex :: Word8 -> [Word8] -> Maybe Int

empty :: [Word8]

null :: [Word8] -> Bool

pack :: [Word8] -> [Word8]

tail :: [Word8] -> [Word8]

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 Data.Functor.Classes.Generic.Internal

Methods

geq :: UInt p -> UInt p -> Bool

GOrd (UInt p) 
Instance details

Defined in Data.Functor.Classes.Generic.Internal

Methods

gcompare :: UInt p -> UInt p -> Ordering

GShowCon (UInt p) 
Instance details

Defined in Data.Functor.Classes.Generic.Internal

Methods

gshowsPrecCon :: Options -> ConType -> Int -> 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
type BoundedBuilderLength Int 
Instance details

Defined in Data.Bytes.Builder.Bounded.Class

type BoundedBuilderLength Int = 20
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)))

(||) :: Bool -> Bool -> Bool #

(<>) :: Semigroup a => a -> a -> a #

class Enum a where #

Minimal complete definition

toEnum, fromEnum

Methods

succ :: a -> a #

pred :: a -> a #

toEnum :: Int -> a #

fromEnum :: a -> Int #

enumFrom :: a -> [a] #

enumFromThen :: a -> a -> [a] #

enumFromTo :: a -> a -> [a] #

enumFromThenTo :: a -> a -> a -> [a] #

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 ASN1Class 
Instance details

Defined in Data.ASN1.Types.Lowlevel

Methods

succ :: ASN1Class -> ASN1Class #

pred :: ASN1Class -> ASN1Class #

toEnum :: Int -> ASN1Class #

fromEnum :: ASN1Class -> Int #

enumFrom :: ASN1Class -> [ASN1Class] #

enumFromThen :: ASN1Class -> ASN1Class -> [ASN1Class] #

enumFromTo :: ASN1Class -> ASN1Class -> [ASN1Class] #

enumFromThenTo :: ASN1Class -> ASN1Class -> ASN1Class -> [ASN1Class] #

Enum OAuthVersion 
Instance details

Defined in Web.Authenticate.OAuth

Methods

succ :: OAuthVersion -> OAuthVersion #

pred :: OAuthVersion -> OAuthVersion #

toEnum :: Int -> OAuthVersion #

fromEnum :: OAuthVersion -> Int #

enumFrom :: OAuthVersion -> [OAuthVersion] #

enumFromThen :: OAuthVersion -> OAuthVersion -> [OAuthVersion] #

enumFromTo :: OAuthVersion -> OAuthVersion -> [OAuthVersion] #

enumFromThenTo :: OAuthVersion -> OAuthVersion -> OAuthVersion -> [OAuthVersion] #

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

Methods

succ :: Int16 -> Int16 #

pred :: Int16 -> Int16 #

toEnum :: Int -> Int16 #

fromEnum :: Int16 -> Int #

enumFrom :: Int16 -> [Int16] #

enumFromThen :: Int16 -> Int16 -> [Int16] #

enumFromTo :: Int16 -> Int16 -> [Int16] #

enumFromThenTo :: Int16 -> Int16 -> Int16 -> [Int16] #

Enum Int32 
Instance details

Defined in GHC.Int

Enum Int64 
Instance details

Defined in GHC.Int

Enum Int8 
Instance details

Defined in GHC.Int

Methods

succ :: Int8 -> Int8 #

pred :: Int8 -> Int8 #

toEnum :: Int -> Int8 #

fromEnum :: Int8 -> Int #

enumFrom :: Int8 -> [Int8] #

enumFromThen :: Int8 -> Int8 -> [Int8] #

enumFromTo :: Int8 -> Int8 -> [Int8] #

enumFromThenTo :: Int8 -> Int8 -> Int8 -> [Int8] #

Enum DoCostCentres 
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

Methods

succ :: Word16 -> Word16 #

pred :: Word16 -> Word16 #

toEnum :: Int -> Word16 #

fromEnum :: Word16 -> Int #

enumFrom :: Word16 -> [Word16] #

enumFromThen :: Word16 -> Word16 -> [Word16] #

enumFromTo :: Word16 -> Word16 -> [Word16] #

enumFromThenTo :: Word16 -> Word16 -> Word16 -> [Word16] #

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 Word128 
Instance details

Defined in Basement.Types.Word128

Methods

succ :: Word128 -> Word128 #

pred :: Word128 -> Word128 #

toEnum :: Int -> Word128 #

fromEnum :: Word128 -> Int #

enumFrom :: Word128 -> [Word128] #

enumFromThen :: Word128 -> Word128 -> [Word128] #

enumFromTo :: Word128 -> Word128 -> [Word128] #

enumFromThenTo :: Word128 -> Word128 -> Word128 -> [Word128] #

Enum Word256 
Instance details

Defined in Basement.Types.Word256

Methods

succ :: Word256 -> Word256 #

pred :: Word256 -> Word256 #

toEnum :: Int -> Word256 #

fromEnum :: Word256 -> Int #

enumFrom :: Word256 -> [Word256] #

enumFromThen :: Word256 -> Word256 -> [Word256] #

enumFromTo :: Word256 -> Word256 -> [Word256] #

enumFromThenTo :: Word256 -> Word256 -> Word256 -> [Word256] #

Enum PrivateNumber 
Instance details

Defined in Crypto.Types.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.Types.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 SharedKey 
Instance details

Defined in Crypto.Types.PubKey.DH

Methods

succ :: SharedKey -> SharedKey #

pred :: SharedKey -> SharedKey #

toEnum :: Int -> SharedKey #

fromEnum :: SharedKey -> Int #

enumFrom :: SharedKey -> [SharedKey] #

enumFromThen :: SharedKey -> SharedKey -> [SharedKey] #

enumFromTo :: SharedKey -> SharedKey -> [SharedKey] #

enumFromThenTo :: SharedKey -> SharedKey -> SharedKey -> [SharedKey] #

Enum CurveName 
Instance details

Defined in Crypto.Types.PubKey.ECC

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 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 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 PrimElemRep 
Instance details

Defined in GHC.Core.TyCon

Methods

succ :: PrimElemRep -> PrimElemRep #

pred :: PrimElemRep -> PrimElemRep #

toEnum :: Int -> PrimElemRep #

fromEnum :: PrimElemRep -> Int #

enumFrom :: PrimElemRep -> [PrimElemRep] #

enumFromThen :: PrimElemRep -> PrimElemRep -> [PrimElemRep] #

enumFromTo :: PrimElemRep -> PrimElemRep -> [PrimElemRep] #

enumFromThenTo :: PrimElemRep -> PrimElemRep -> PrimElemRep -> [PrimElemRep] #

Enum AOp 
Instance details

Defined in GHC.JS.Syntax

Methods

succ :: AOp -> AOp #

pred :: AOp -> AOp #

toEnum :: Int -> AOp #

fromEnum :: AOp -> Int #

enumFrom :: AOp -> [AOp] #

enumFromThen :: AOp -> AOp -> [AOp] #

enumFromTo :: AOp -> AOp -> [AOp] #

enumFromThenTo :: AOp -> AOp -> AOp -> [AOp] #

Enum Op 
Instance details

Defined in GHC.JS.Syntax

Methods

succ :: Op -> Op #

pred :: Op -> Op #

toEnum :: Int -> Op #

fromEnum :: Op -> Int #

enumFrom :: Op -> [Op] #

enumFromThen :: Op -> Op -> [Op] #

enumFromTo :: Op -> Op -> [Op] #

enumFromThenTo :: Op -> Op -> Op -> [Op] #

Enum UOp 
Instance details

Defined in GHC.JS.Syntax

Methods

succ :: UOp -> UOp #

pred :: UOp -> UOp #

toEnum :: Int -> UOp #

fromEnum :: UOp -> Int #

enumFrom :: UOp -> [UOp] #

enumFromThen :: UOp -> UOp -> [UOp] #

enumFromTo :: UOp -> UOp -> [UOp] #

enumFromThenTo :: UOp -> UOp -> UOp -> [UOp] #

Enum JOp 
Instance details

Defined in GHC.JS.Unsat.Syntax

Methods

succ :: JOp -> JOp #

pred :: JOp -> JOp #

toEnum :: Int -> JOp #

fromEnum :: JOp -> Int #

enumFrom :: JOp -> [JOp] #

enumFromThen :: JOp -> JOp -> [JOp] #

enumFromTo :: JOp -> JOp -> [JOp] #

enumFromThenTo :: JOp -> JOp -> JOp -> [JOp] #

Enum JUOp 
Instance details

Defined in GHC.JS.Unsat.Syntax

Methods

succ :: JUOp -> JUOp #

pred :: JUOp -> JUOp #

toEnum :: Int -> JUOp #

fromEnum :: JUOp -> Int #

enumFrom :: JUOp -> [JUOp] #

enumFromThen :: JUOp -> JUOp -> [JUOp] #

enumFromTo :: JUOp -> JUOp -> [JUOp] #

enumFromThenTo :: JUOp -> JUOp -> JUOp -> [JUOp] #

Enum CCallConv 
Instance details

Defined in GHC.Types.ForeignCall

Methods

succ :: CCallConv -> CCallConv #

pred :: CCallConv -> CCallConv #

toEnum :: Int -> CCallConv #

fromEnum :: CCallConv -> Int #

enumFrom :: CCallConv -> [CCallConv] #

enumFromThen :: CCallConv -> CCallConv -> [CCallConv] #

enumFromTo :: CCallConv -> CCallConv -> [CCallConv] #

enumFromThenTo :: CCallConv -> CCallConv -> CCallConv -> [CCallConv] #

Enum Safety 
Instance details

Defined in GHC.Types.ForeignCall

Methods

succ :: Safety -> Safety #

pred :: Safety -> Safety #

toEnum :: Int -> Safety #

fromEnum :: Safety -> Int #

enumFrom :: Safety -> [Safety] #

enumFromThen :: Safety -> Safety -> [Safety] #

enumFromTo :: Safety -> Safety -> [Safety] #

enumFromThenTo :: Safety -> Safety -> Safety -> [Safety] #

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 ClosureType 
Instance details

Defined in GHC.Exts.Heap.ClosureTypes

Methods

succ :: ClosureType -> ClosureType #

pred :: ClosureType -> ClosureType #

toEnum :: Int -> ClosureType #

fromEnum :: ClosureType -> Int #

enumFrom :: ClosureType -> [ClosureType] #

enumFromThen :: ClosureType -> ClosureType -> [ClosureType] #

enumFromTo :: ClosureType -> ClosureType -> [ClosureType] #

enumFromThenTo :: ClosureType -> ClosureType -> ClosureType -> [ClosureType] #

Enum Ordering 
Instance details

Defined in GHC.Enum

Enum THResultType 
Instance details

Defined in GHCi.Message

Methods

succ :: THResultType -> THResultType #

pred :: THResultType -> THResultType #

toEnum :: Int -> THResultType #

fromEnum :: THResultType -> Int #

enumFrom :: THResultType -> [THResultType] #

enumFromThen :: THResultType -> THResultType -> [THResultType] #

enumFromTo :: THResultType -> THResultType -> [THResultType] #

enumFromThenTo :: THResultType -> THResultType -> THResultType -> [THResultType] #

Enum KnownExtension 
Instance details

Defined in Language.Haskell.Exts.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 Hours 
Instance details

Defined in Time.Types

Methods

succ :: Hours -> Hours #

pred :: Hours -> Hours #

toEnum :: Int -> Hours #

fromEnum :: Hours -> Int #

enumFrom :: Hours -> [Hours] #

enumFromThen :: Hours -> Hours -> [Hours] #

enumFromTo :: Hours -> Hours -> [Hours] #

enumFromThenTo :: Hours -> Hours -> Hours -> [Hours] #

Enum Minutes 
Instance details

Defined in Time.Types

Methods

succ :: Minutes -> Minutes #

pred :: Minutes -> Minutes #

toEnum :: Int -> Minutes #

fromEnum :: Minutes -> Int #

enumFrom :: Minutes -> [Minutes] #

enumFromThen :: Minutes -> Minutes -> [Minutes] #

enumFromTo :: Minutes -> Minutes -> [Minutes] #

enumFromThenTo :: Minutes -> Minutes -> Minutes -> [Minutes] #

Enum Month 
Instance details

Defined in Time.Types

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 Seconds 
Instance details

Defined in Time.Types

Methods

succ :: Seconds -> Seconds #

pred :: Seconds -> Seconds #

toEnum :: Int -> Seconds #

fromEnum :: Seconds -> Int #

enumFrom :: Seconds -> [Seconds] #

enumFromThen :: Seconds -> Seconds -> [Seconds] #

enumFromTo :: Seconds -> Seconds -> [Seconds] #

enumFromThenTo :: Seconds -> Seconds -> Seconds -> [Seconds] #

Enum WeekDay 
Instance details

Defined in Time.Types

Methods

succ :: WeekDay -> WeekDay #

pred :: WeekDay -> WeekDay #

toEnum :: Int -> WeekDay #

fromEnum :: WeekDay -> Int #

enumFrom :: WeekDay -> [WeekDay] #

enumFromThen :: WeekDay -> WeekDay -> [WeekDay] #

enumFromTo :: WeekDay -> WeekDay -> [WeekDay] #

enumFromThenTo :: WeekDay -> WeekDay -> WeekDay -> [WeekDay] #

Enum StdMethod 
Instance details

Defined in Network.HTTP.Types.Method

Enum Status 
Instance details

Defined in Network.HTTP.Types.Status

Methods

succ :: Status -> Status #

pred :: Status -> Status #

toEnum :: Int -> Status #

fromEnum :: Status -> Int #

enumFrom :: Status -> [Status] #

enumFromThen :: Status -> Status -> [Status] #

enumFromTo :: Status -> Status -> [Status] #

enumFromThenTo :: Status -> Status -> Status -> [Status] #

Enum IPv4 
Instance details

Defined in Net.IPv4

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 Net.IPv6

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 Mac 
Instance details

Defined in Net.Mac

Methods

succ :: Mac -> Mac #

pred :: Mac -> Mac #

toEnum :: Int -> Mac #

fromEnum :: Mac -> Int #

enumFrom :: Mac -> [Mac] #

enumFromThen :: Mac -> Mac -> [Mac] #

enumFromTo :: Mac -> Mac -> [Mac] #

enumFromThenTo :: Mac -> Mac -> Mac -> [Mac] #

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 JobStatus Source # 
Instance details

Defined in IHP.Job.Types

Enum LogLevel Source # 
Instance details

Defined in IHP.Log.Types

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 Day 
Instance details

Defined in System.Time

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 System.Time

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 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 Column 
Instance details

Defined in Database.PostgreSQL.LibPQ

Methods

succ :: Column -> Column #

pred :: Column -> Column #

toEnum :: Int -> Column #

fromEnum :: Column -> Int #

enumFrom :: Column -> [Column] #

enumFromThen :: Column -> Column -> [Column] #

enumFromTo :: Column -> Column -> [Column] #

enumFromThenTo :: Column -> Column -> Column -> [Column] #

Enum Row 
Instance details

Defined in Database.PostgreSQL.LibPQ

Methods

succ :: Row -> Row #

pred :: Row -> Row #

toEnum :: Int -> Row #

fromEnum :: Row -> Int #

enumFrom :: Row -> [Row] #

enumFromThen :: Row -> Row -> [Row] #

enumFromTo :: Row -> Row -> [Row] #

enumFromThenTo :: Row -> Row -> Row -> [Row] #

Enum ExecStatus 
Instance details

Defined in Database.PostgreSQL.LibPQ.Enums

Methods

succ :: ExecStatus -> ExecStatus #

pred :: ExecStatus -> ExecStatus #

toEnum :: Int -> ExecStatus #

fromEnum :: ExecStatus -> Int #

enumFrom :: ExecStatus -> [ExecStatus] #

enumFromThen :: ExecStatus -> ExecStatus -> [ExecStatus] #

enumFromTo :: ExecStatus -> ExecStatus -> [ExecStatus] #

enumFromThenTo :: ExecStatus -> ExecStatus -> ExecStatus -> [ExecStatus] #

Enum FieldCode 
Instance details

Defined in Database.PostgreSQL.LibPQ.Enums

Methods

succ :: FieldCode -> FieldCode #

pred :: FieldCode -> FieldCode #

toEnum :: Int -> FieldCode #

fromEnum :: FieldCode -> Int #

enumFrom :: FieldCode -> [FieldCode] #

enumFromThen :: FieldCode -> FieldCode -> [FieldCode] #

enumFromTo :: FieldCode -> FieldCode -> [FieldCode] #

enumFromThenTo :: FieldCode -> FieldCode -> FieldCode -> [FieldCode] #

Enum Format 
Instance details

Defined in Database.PostgreSQL.LibPQ.Enums

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 Verbosity 
Instance details

Defined in Database.PostgreSQL.LibPQ.Enums

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 IsolationLevel 
Instance details

Defined in Database.PostgreSQL.Simple.Transaction

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 ReadWriteMode 
Instance details

Defined in Database.PostgreSQL.Simple.Transaction

Methods

succ :: ReadWriteMode -> ReadWriteMode #

pred :: ReadWriteMode -> ReadWriteMode #

toEnum :: Int -> ReadWriteMode #

fromEnum :: ReadWriteMode -> Int #

enumFrom :: ReadWriteMode -> [ReadWriteMode] #

enumFromThen :: ReadWriteMode -> ReadWriteMode -> [ReadWriteMode] #

enumFromTo :: ReadWriteMode -> ReadWriteMode -> [ReadWriteMode] #

enumFromThenTo :: ReadWriteMode -> ReadWriteMode -> ReadWriteMode -> [ReadWriteMode] #

Enum DoPa 
Instance details

Defined in Text.Regex.TDFA.Common

Methods

succ :: DoPa -> DoPa #

pred :: DoPa -> DoPa #

toEnum :: Int -> DoPa #

fromEnum :: DoPa -> Int #

enumFrom :: DoPa -> [DoPa] #

enumFromThen :: DoPa -> DoPa -> [DoPa] #

enumFromTo :: DoPa -> DoPa -> [DoPa] #

enumFromThenTo :: DoPa -> DoPa -> DoPa -> [DoPa] #

Enum WhichTest 
Instance details

Defined in Text.Regex.TDFA.Common

Methods

succ :: WhichTest -> WhichTest #

pred :: WhichTest -> WhichTest #

toEnum :: Int -> WhichTest #

fromEnum :: WhichTest -> Int #

enumFrom :: WhichTest -> [WhichTest] #

enumFromThen :: WhichTest -> WhichTest -> [WhichTest] #

enumFromTo :: WhichTest -> WhichTest -> [WhichTest] #

enumFromThenTo :: WhichTest -> WhichTest -> WhichTest -> [WhichTest] #

Enum Undefined 
Instance details

Defined in Relude.Debug

Methods

succ :: Undefined -> Undefined #

pred :: Undefined -> Undefined #

toEnum :: Int -> Undefined #

fromEnum :: Undefined -> Int #

enumFrom :: Undefined -> [Undefined] #

enumFromThen :: Undefined -> Undefined -> [Undefined] #

enumFromTo :: Undefined -> Undefined -> [Undefined] #

enumFromThenTo :: Undefined -> Undefined -> Undefined -> [Undefined] #

Enum SocksCommand 
Instance details

Defined in Network.Socks5.Types

Methods

succ :: SocksCommand -> SocksCommand #

pred :: SocksCommand -> SocksCommand #

toEnum :: Int -> SocksCommand #

fromEnum :: SocksCommand -> Int #

enumFrom :: SocksCommand -> [SocksCommand] #

enumFromThen :: SocksCommand -> SocksCommand -> [SocksCommand] #

enumFromTo :: SocksCommand -> SocksCommand -> [SocksCommand] #

enumFromThenTo :: SocksCommand -> SocksCommand -> SocksCommand -> [SocksCommand] #

Enum SocksError 
Instance details

Defined in Network.Socks5.Types

Methods

succ :: SocksError -> SocksError #

pred :: SocksError -> SocksError #

toEnum :: Int -> SocksError #

fromEnum :: SocksError -> Int #

enumFrom :: SocksError -> [SocksError] #

enumFromThen :: SocksError -> SocksError -> [SocksError] #

enumFromTo :: SocksError -> SocksError -> [SocksError] #

enumFromThenTo :: SocksError -> SocksError -> SocksError -> [SocksError] #

Enum SocksMethod 
Instance details

Defined in Network.Socks5.Types

Methods

succ :: SocksMethod -> SocksMethod #

pred :: SocksMethod -> SocksMethod #

toEnum :: Int -> SocksMethod #

fromEnum :: SocksMethod -> Int #

enumFrom :: SocksMethod -> [SocksMethod] #

enumFromThen :: SocksMethod -> SocksMethod -> [SocksMethod] #

enumFromTo :: SocksMethod -> SocksMethod -> [SocksMethod] #

enumFromThenTo :: SocksMethod -> SocksMethod -> SocksMethod -> [SocksMethod] #

Enum SocksReply 
Instance details

Defined in Network.Socks5.Types

Methods

succ :: SocksReply -> SocksReply #

pred :: SocksReply -> SocksReply #

toEnum :: Int -> SocksReply #

fromEnum :: SocksReply -> Int #

enumFrom :: SocksReply -> [SocksReply] #

enumFromThen :: SocksReply -> SocksReply -> [SocksReply] #

enumFromTo :: SocksReply -> SocksReply -> [SocksReply] #

enumFromThenTo :: SocksReply -> SocksReply -> SocksReply -> [SocksReply] #

Enum Strategy 
Instance details

Defined in Data.Streaming.Zlib.Lowlevel

Methods

succ :: Strategy -> Strategy #

pred :: Strategy -> Strategy #

toEnum :: Int -> Strategy #

fromEnum :: Strategy -> Int #

enumFrom :: Strategy -> [Strategy] #

enumFromThen :: Strategy -> Strategy -> [Strategy] #

enumFromTo :: Strategy -> Strategy -> [Strategy] #

enumFromThenTo :: Strategy -> Strategy -> Strategy -> [Strategy] #

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 DayOfWeek 
Instance details

Defined in Data.Time.Calendar.Week

Enum DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Enum NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Enum Attosecond 
Instance details

Defined in Data.Time.Units

Methods

succ :: Attosecond -> Attosecond #

pred :: Attosecond -> Attosecond #

toEnum :: Int -> Attosecond #

fromEnum :: Attosecond -> Int #

enumFrom :: Attosecond -> [Attosecond] #

enumFromThen :: Attosecond -> Attosecond -> [Attosecond] #

enumFromTo :: Attosecond -> Attosecond -> [Attosecond] #

enumFromThenTo :: Attosecond -> Attosecond -> Attosecond -> [Attosecond] #

Enum Day 
Instance details

Defined in Data.Time.Units

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 Femtosecond 
Instance details

Defined in Data.Time.Units

Methods

succ :: Femtosecond -> Femtosecond #

pred :: Femtosecond -> Femtosecond #

toEnum :: Int -> Femtosecond #

fromEnum :: Femtosecond -> Int #

enumFrom :: Femtosecond -> [Femtosecond] #

enumFromThen :: Femtosecond -> Femtosecond -> [Femtosecond] #

enumFromTo :: Femtosecond -> Femtosecond -> [Femtosecond] #

enumFromThenTo :: Femtosecond -> Femtosecond -> Femtosecond -> [Femtosecond] #

Enum Fortnight 
Instance details

Defined in Data.Time.Units

Methods

succ :: Fortnight -> Fortnight #

pred :: Fortnight -> Fortnight #

toEnum :: Int -> Fortnight #

fromEnum :: Fortnight -> Int #

enumFrom :: Fortnight -> [Fortnight] #

enumFromThen :: Fortnight -> Fortnight -> [Fortnight] #

enumFromTo :: Fortnight -> Fortnight -> [Fortnight] #

enumFromThenTo :: Fortnight -> Fortnight -> Fortnight -> [Fortnight] #

Enum Hour 
Instance details

Defined in Data.Time.Units

Methods

succ :: Hour -> Hour #

pred :: Hour -> Hour #

toEnum :: Int -> Hour #

fromEnum :: Hour -> Int #

enumFrom :: Hour -> [Hour] #

enumFromThen :: Hour -> Hour -> [Hour] #

enumFromTo :: Hour -> Hour -> [Hour] #

enumFromThenTo :: Hour -> Hour -> Hour -> [Hour] #

Enum Microsecond 
Instance details

Defined in Data.Time.Units

Methods

succ :: Microsecond -> Microsecond #

pred :: Microsecond -> Microsecond #

toEnum :: Int -> Microsecond #

fromEnum :: Microsecond -> Int #

enumFrom :: Microsecond -> [Microsecond] #

enumFromThen :: Microsecond -> Microsecond -> [Microsecond] #

enumFromTo :: Microsecond -> Microsecond -> [Microsecond] #

enumFromThenTo :: Microsecond -> Microsecond -> Microsecond -> [Microsecond] #

Enum Millisecond 
Instance details

Defined in Data.Time.Units

Methods

succ :: Millisecond -> Millisecond #

pred :: Millisecond -> Millisecond #

toEnum :: Int -> Millisecond #

fromEnum :: Millisecond -> Int #

enumFrom :: Millisecond -> [Millisecond] #

enumFromThen :: Millisecond -> Millisecond -> [Millisecond] #

enumFromTo :: Millisecond -> Millisecond -> [Millisecond] #

enumFromThenTo :: Millisecond -> Millisecond -> Millisecond -> [Millisecond] #

Enum Minute 
Instance details

Defined in Data.Time.Units

Methods

succ :: Minute -> Minute #

pred :: Minute -> Minute #

toEnum :: Int -> Minute #

fromEnum :: Minute -> Int #

enumFrom :: Minute -> [Minute] #

enumFromThen :: Minute -> Minute -> [Minute] #

enumFromTo :: Minute -> Minute -> [Minute] #

enumFromThenTo :: Minute -> Minute -> Minute -> [Minute] #

Enum Nanosecond 
Instance details

Defined in Data.Time.Units

Methods

succ :: Nanosecond -> Nanosecond #

pred :: Nanosecond -> Nanosecond #

toEnum :: Int -> Nanosecond #

fromEnum :: Nanosecond -> Int #

enumFrom :: Nanosecond -> [Nanosecond] #

enumFromThen :: Nanosecond -> Nanosecond -> [Nanosecond] #

enumFromTo :: Nanosecond -> Nanosecond -> [Nanosecond] #

enumFromThenTo :: Nanosecond -> Nanosecond -> Nanosecond -> [Nanosecond] #

Enum Picosecond 
Instance details

Defined in Data.Time.Units

Methods

succ :: Picosecond -> Picosecond #

pred :: Picosecond -> Picosecond #

toEnum :: Int -> Picosecond #

fromEnum :: Picosecond -> Int #

enumFrom :: Picosecond -> [Picosecond] #

enumFromThen :: Picosecond -> Picosecond -> [Picosecond] #

enumFromTo :: Picosecond -> Picosecond -> [Picosecond] #

enumFromThenTo :: Picosecond -> Picosecond -> Picosecond -> [Picosecond] #

Enum Second 
Instance details

Defined in Data.Time.Units

Methods

succ :: Second -> Second #

pred :: Second -> Second #

toEnum :: Int -> Second #

fromEnum :: Second -> Int #

enumFrom :: Second -> [Second] #

enumFromThen :: Second -> Second -> [Second] #

enumFromTo :: Second -> Second -> [Second] #

enumFromThenTo :: Second -> Second -> Second -> [Second] #

Enum Week 
Instance details

Defined in Data.Time.Units

Methods

succ :: Week -> Week #

pred :: Week -> Week #

toEnum :: Int -> Week #

fromEnum :: Week -> Int #

enumFrom :: Week -> [Week] #

enumFromThen :: Week -> Week -> [Week] #

enumFromTo :: Week -> Week -> [Week] #

enumFromThenTo :: Week -> Week -> Week -> [Week] #

Enum Int128 
Instance details

Defined in Data.WideWord.Int128

Methods

succ :: Int128 -> Int128 #

pred :: Int128 -> Int128 #

toEnum :: Int -> Int128 #

fromEnum :: Int128 -> Int #

enumFrom :: Int128 -> [Int128] #

enumFromThen :: Int128 -> Int128 -> [Int128] #

enumFromTo :: Int128 -> Int128 -> [Int128] #

enumFromThenTo :: Int128 -> Int128 -> Int128 -> [Int128] #

Enum Word128 
Instance details

Defined in Data.WideWord.Word128

Methods

succ :: Word128 -> Word128 #

pred :: Word128 -> Word128 #

toEnum :: Int -> Word128 #

fromEnum :: Word128 -> Int #

enumFrom :: Word128 -> [Word128] #

enumFromThen :: Word128 -> Word128 -> [Word128] #

enumFromTo :: Word128 -> Word128 -> [Word128] #

enumFromThenTo :: Word128 -> Word128 -> Word128 -> [Word128] #

Enum Word256 
Instance details

Defined in Data.WideWord.Word256

Methods

succ :: Word256 -> Word256 #

pred :: Word256 -> Word256 #

toEnum :: Int -> Word256 #

fromEnum :: Word256 -> Int #

enumFrom :: Word256 -> [Word256] #

enumFromThen :: Word256 -> Word256 -> [Word256] #

enumFromTo :: Word256 -> Word256 -> [Word256] #

enumFromThenTo :: Word256 -> Word256 -> Word256 -> [Word256] #

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

Methods

succ :: Natural -> Natural #

pred :: Natural -> Natural #

toEnum :: Int -> Natural #

fromEnum :: Natural -> Int #

enumFrom :: Natural -> [Natural] #

enumFromThen :: Natural -> Natural -> [Natural] #

enumFromTo :: Natural -> Natural -> [Natural] #

enumFromThenTo :: Natural -> Natural -> Natural -> [Natural] #

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

Methods

succ :: Bool -> Bool #

pred :: Bool -> Bool #

toEnum :: Int -> Bool #

fromEnum :: Bool -> Int #

enumFrom :: Bool -> [Bool] #

enumFromThen :: Bool -> Bool -> [Bool] #

enumFromTo :: Bool -> Bool -> [Bool] #

enumFromThenTo :: Bool -> Bool -> Bool -> [Bool] #

Enum Char 
Instance details

Defined in GHC.Enum

Methods

succ :: Char -> Char #

pred :: Char -> Char #

toEnum :: Int -> Char #

fromEnum :: Char -> Int #

enumFrom :: Char -> [Char] #

enumFromThen :: Char -> Char -> [Char] #

enumFromTo :: Char -> Char -> [Char] #

enumFromThenTo :: Char -> Char -> Char -> [Char] #

Enum Int 
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

Methods

succ :: Word -> Word #

pred :: Word -> Word #

toEnum :: Int -> Word #

fromEnum :: Word -> Int #

enumFrom :: Word -> [Word] #

enumFromThen :: Word -> Word -> [Word] #

enumFromTo :: Word -> Word -> [Word] #

enumFromThenTo :: Word -> Word -> Word -> [Word] #

Enum a => Enum (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 (Blind a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

succ :: Blind a -> Blind a #

pred :: Blind a -> Blind a #

toEnum :: Int -> Blind a #

fromEnum :: Blind a -> Int #

enumFrom :: Blind a -> [Blind a] #

enumFromThen :: Blind a -> Blind a -> [Blind a] #

enumFromTo :: Blind a -> Blind a -> [Blind a] #

enumFromThenTo :: Blind a -> Blind a -> Blind a -> [Blind a] #

Enum a => Enum (Fixed a) 
Instance details

Defined in Test.QuickCheck.Modifiers

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 a => Enum (Large a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

succ :: Large a -> Large a #

pred :: Large a -> Large a #

toEnum :: Int -> Large a #

fromEnum :: Large a -> Int #

enumFrom :: Large a -> [Large a] #

enumFromThen :: Large a -> Large a -> [Large a] #

enumFromTo :: Large a -> Large a -> [Large a] #

enumFromThenTo :: Large a -> Large a -> Large a -> [Large a] #

Enum a => Enum (Negative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

succ :: Negative a -> Negative a #

pred :: Negative a -> Negative a #

toEnum :: Int -> Negative a #

fromEnum :: Negative a -> Int #

enumFrom :: Negative a -> [Negative a] #

enumFromThen :: Negative a -> Negative a -> [Negative a] #

enumFromTo :: Negative a -> Negative a -> [Negative a] #

enumFromThenTo :: Negative a -> Negative a -> Negative a -> [Negative a] #

Enum a => Enum (NonNegative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

succ :: NonNegative a -> NonNegative a #

pred :: NonNegative a -> NonNegative a #

toEnum :: Int -> NonNegative a #

fromEnum :: NonNegative a -> Int #

enumFrom :: NonNegative a -> [NonNegative a] #

enumFromThen :: NonNegative a -> NonNegative a -> [NonNegative a] #

enumFromTo :: NonNegative a -> NonNegative a -> [NonNegative a] #

enumFromThenTo :: NonNegative a -> NonNegative a -> NonNegative a -> [NonNegative a] #

Enum a => Enum (NonPositive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

succ :: NonPositive a -> NonPositive a #

pred :: NonPositive a -> NonPositive a #

toEnum :: Int -> NonPositive a #

fromEnum :: NonPositive a -> Int #

enumFrom :: NonPositive a -> [NonPositive a] #

enumFromThen :: NonPositive a -> NonPositive a -> [NonPositive a] #

enumFromTo :: NonPositive a -> NonPositive a -> [NonPositive a] #

enumFromThenTo :: NonPositive a -> NonPositive a -> NonPositive a -> [NonPositive a] #

Enum a => Enum (NonZero a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

succ :: NonZero a -> NonZero a #

pred :: NonZero a -> NonZero a #

toEnum :: Int -> NonZero a #

fromEnum :: NonZero a -> Int #

enumFrom :: NonZero a -> [NonZero a] #

enumFromThen :: NonZero a -> NonZero a -> [NonZero a] #

enumFromTo :: NonZero a -> NonZero a -> [NonZero a] #

enumFromThenTo :: NonZero a -> NonZero a -> NonZero a -> [NonZero a] #

Enum a => Enum (Positive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

succ :: Positive a -> Positive a #

pred :: Positive a -> Positive a #

toEnum :: Int -> Positive a #

fromEnum :: Positive a -> Int #

enumFrom :: Positive a -> [Positive a] #

enumFromThen :: Positive a -> Positive a -> [Positive a] #

enumFromTo :: Positive a -> Positive a -> [Positive a] #

enumFromThenTo :: Positive a -> Positive a -> Positive a -> [Positive a] #

Enum a => Enum (Shrink2 a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

succ :: Shrink2 a -> Shrink2 a #

pred :: Shrink2 a -> Shrink2 a #

toEnum :: Int -> Shrink2 a #

fromEnum :: Shrink2 a -> Int #

enumFrom :: Shrink2 a -> [Shrink2 a] #

enumFromThen :: Shrink2 a -> Shrink2 a -> [Shrink2 a] #

enumFromTo :: Shrink2 a -> Shrink2 a -> [Shrink2 a] #

enumFromThenTo :: Shrink2 a -> Shrink2 a -> Shrink2 a -> [Shrink2 a] #

Enum a => Enum (Small a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

succ :: Small a -> Small a #

pred :: Small a -> Small a #

toEnum :: Int -> Small a #

fromEnum :: Small a -> Int #

enumFrom :: Small a -> [Small a] #

enumFromThen :: Small a -> Small a -> [Small a] #

enumFromTo :: Small a -> Small a -> [Small a] #

enumFromThenTo :: Small a -> Small a -> Small a -> [Small 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

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] #

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 (bi a b) => Enum (Biap bi a b) 
Instance details

Defined in Data.Bifunctor.Biap

Methods

succ :: Biap bi a b -> Biap bi a b #

pred :: Biap bi a b -> Biap bi a b #

toEnum :: Int -> Biap bi a b #

fromEnum :: Biap bi a b -> Int #

enumFrom :: Biap bi a b -> [Biap bi a b] #

enumFromThen :: Biap bi a b -> Biap bi a b -> [Biap bi a b] #

enumFromTo :: Biap bi a b -> Biap bi a b -> [Biap bi a b] #

enumFromThenTo :: Biap bi a b -> Biap bi a b -> Biap bi a b -> [Biap bi 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] #

(\\) :: Eq a => [a] -> [a] -> [a] #

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 #

(>=>) :: Monad m => (a -> m b) -> (b -> m c) -> a -> m c #

either :: (a -> c) -> (b -> c) -> Either a b -> c #

lefts :: [Either a b] -> [a] #

partitionEithers :: [Either a b] -> ([a], [b]) #

rights :: [Either a b] -> [b] #

asum :: (Foldable t, Alternative f) => t (f a) -> f a #

on :: (b -> b -> c) -> (a -> b) -> a -> a -> c #

(<$>) :: Functor f => (a -> b) -> f a -> f b #

maybe :: b -> (a -> b) -> Maybe a -> b #

maybeToList :: Maybe a -> [a] #

comparing :: Ord a => (b -> a) -> b -> b -> Ordering #

curry :: ((a, b) -> c) -> a -> b -> c #

fst :: (a, b) -> a #

snd :: (a, b) -> b #

swap :: (a, b) -> (b, a) #

uncurry :: (a -> b -> c) -> (a, b) -> c #

($!) :: (a -> b) -> a -> b #

(=<<) :: Monad m => (a -> m b) -> m a -> m b #

asTypeOf :: a -> a -> a #

const :: a -> b -> a #

flip :: (a -> b -> c) -> b -> a -> c #

until :: (a -> Bool) -> (a -> a) -> a -> a #

repeat :: a -> [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 #

odd :: Integral a => a -> Bool #

modifyIOError :: (IOError -> IOError) -> IO a -> IO a #

equating :: Eq a => (b -> a) -> b -> b -> Bool #

getArgs :: MonadIO m => m [Text] #

intersect :: Eq a => [a] -> [a] -> [a] #

(&&) :: Bool -> Bool -> Bool #

not :: Bool -> Bool #

all :: Foldable t => (a -> Bool) -> t a -> Bool #

and :: Foldable t => t Bool -> Bool #

any :: Foldable t => (a -> Bool) -> t a -> Bool #

concat :: Foldable t => t [a] -> [a] #

concatMap :: Foldable t => (a -> [b]) -> t a -> [b] #

notElem :: (Foldable t, Eq a) => a -> t a -> Bool #

or :: Foldable t => t Bool -> Bool #

maximumBy :: Foldable t => (a -> a -> Ordering) -> t a -> a #

minimumBy :: Foldable t => (a -> a -> Ordering) -> t a -> a #

catMaybes :: [Maybe a] -> [a] #

deleteBy :: (a -> a -> Bool) -> a -> [a] -> [a] #

singleton :: a -> [a] #

sort :: Ord a => [a] -> [a] #

sortOn :: Ord b => (a -> b) -> [a] -> [a] #

stripPrefix :: Eq a => [a] -> [a] -> Maybe [a] #

parseTimeM :: (MonadFail m, ParseTime t) => Bool -> TimeLocale -> String -> String -> m t #

newtype ExceptionTracker Source #

Interface for exception tracking services such as sentry

Constructors

ExceptionTracker 

Fields

atomicModifyIORef :: IORef a -> (a -> (a, b)) -> IO b #

atomicModifyIORef' :: IORef a -> (a -> (a, b)) -> IO b #

atomicWriteIORef :: IORef a -> a -> IO () #

mkWeakIORef :: IORef a -> IO () -> IO (Weak (IORef a)) #

modifyIORef :: IORef a -> (a -> a) -> IO () #

modifyIORef' :: IORef a -> (a -> a) -> IO () #

newIORef :: a -> IO (IORef a) #

readIORef :: IORef a -> IO a #

writeIORef :: IORef a -> a -> IO () #

asyncBound :: IO a -> IO (Async a) #

asyncOn :: Int -> IO a -> IO (Async a) #

asyncOnWithUnmask :: Int -> ((forall b. IO b -> IO b) -> IO a) -> IO (Async a) #

asyncWithUnmask :: ((forall b. IO b -> IO b) -> IO a) -> IO (Async a) #

cancel :: Async a -> IO () #

cancelWith :: Exception e => Async a -> e -> IO () #

concurrently :: IO a -> IO b -> IO (a, b) #

concurrently_ :: IO a -> IO b -> IO () #

forConcurrently :: Traversable t => t a -> (a -> IO b) -> IO (t b) #

forConcurrently_ :: Foldable f => f a -> (a -> IO b) -> IO () #

link :: Async a -> IO () #

link2 :: Async a -> Async b -> IO () #

mapConcurrently :: Traversable t => (a -> IO b) -> t a -> IO (t b) #

mapConcurrently_ :: Foldable f => (a -> IO b) -> f a -> IO () #

race :: IO a -> IO b -> IO (Either a b) #

race_ :: IO a -> IO b -> IO () #

wait :: Async a -> IO a #

waitAny :: [Async a] -> IO (Async a, a) #

waitAnyCancel :: [Async a] -> IO (Async a, a) #

waitBoth :: Async a -> Async b -> IO (a, b) #

waitEither :: Async a -> Async b -> IO (Either a b) #

waitEitherCancel :: Async a -> Async b -> IO (Either a b) #

waitEither_ :: Async a -> Async b -> IO () #

withAsync :: IO a -> (Async a -> IO b) -> IO b #

withAsyncBound :: IO a -> (Async a -> IO b) -> IO b #

withAsyncOn :: Int -> IO a -> (Async a -> IO b) -> IO b #

withAsyncOnWithUnmask :: Int -> ((forall c. IO c -> IO c) -> IO a) -> (Async a -> IO b) -> IO b #

withAsyncWithUnmask :: ((forall c. IO c -> IO c) -> IO a) -> (Async a -> IO b) -> IO b #

(&&&) :: Arrow a => a b c -> a b c' -> a b (c, c') #

(***) :: Arrow a => a b c -> a b' c' -> a (b, b') (c, c') #

first :: Arrow a => a b c -> a (b, d) (c, d) #

second :: Arrow a => a b c -> a (d, b) (d, c) #

class Monad m => MonadIO (m :: Type -> Type) where #

Methods

liftIO :: IO a -> m a #

Instances

Instances details
MonadIO TcS 
Instance details

Defined in GHC.Tc.Solver.Monad

Methods

liftIO :: IO a -> TcS a #

MonadIO IO 
Instance details

Defined in Control.Monad.IO.Class

Methods

liftIO :: IO a -> IO a #

MonadIO GHCiQ 
Instance details

Defined in GHCi.TH

Methods

liftIO :: IO a -> GHCiQ a #

MonadIO Minio 
Instance details

Defined in Network.Minio.Data

Methods

liftIO :: IO a -> Minio a #

MonadIO Acquire 
Instance details

Defined in Data.Acquire.Internal

Methods

liftIO :: IO a -> Acquire a #

MonadIO Q 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

liftIO :: IO a -> Q a #

MonadIO m => MonadIO (PropertyM m) 
Instance details

Defined in Test.QuickCheck.Monadic

Methods

liftIO :: IO a -> PropertyM m 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 (IterT m) 
Instance details

Defined in Control.Monad.Trans.Iter

Methods

liftIO :: IO a -> IterT m a #

MonadIO m => MonadIO (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

liftIO :: IO a -> ResourceT m 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 #

(Representable f, MonadIO m) => MonadIO (ReaderT f m) 
Instance details

Defined in Control.Monad.Representable.Reader

Methods

liftIO :: IO a -> ReaderT f m a #

MonadIO m => MonadIO (ExceptRT r m) 
Instance details

Defined in Data.EitherR

Methods

liftIO :: IO a -> ExceptRT r m a #

(Functor f, MonadIO m) => MonadIO (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

liftIO :: IO a -> FreeT f m a #

(Applicative f, MonadIO m) => MonadIO (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free.Ap

Methods

liftIO :: IO a -> FreeT f m a #

MonadIO m => MonadIO (FT f m) 
Instance details

Defined in Control.Monad.Trans.Free.Church

Methods

liftIO :: IO a -> FT f 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 #

(Comonad w, MonadIO m) => MonadIO (CoT w m) 
Instance details

Defined in Control.Monad.Co

Methods

liftIO :: IO a -> CoT w m a #

MonadIO m => MonadIO (Codensity m) 
Instance details

Defined in Control.Monad.Codensity

Methods

liftIO :: IO a -> Codensity m a #

(Stream s, MonadIO m) => MonadIO (ParsecT e s m) 
Instance details

Defined in Text.Megaparsec.Internal

Methods

liftIO :: IO a -> ParsecT e s m a #

MonadIO m => MonadIO (ParsecT s u m) 
Instance details

Defined in Text.Parsec.Prim

Methods

liftIO :: IO a -> ParsecT s u 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 #

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 -> ()

Apply Down 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(<.>) :: Down (a -> b) -> Down a -> Down b

(.>) :: Down a -> Down b -> Down b

(<.) :: Down a -> Down b -> Down a

liftF2 :: (a -> b -> c) -> Down a -> Down b -> Down c

Bind Down 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(>>-) :: Down a -> (a -> Down b) -> Down b

join :: Down (Down a) -> 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

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 -> () #

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 #

Wrapped (Down a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Down a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (Down a) = a

Methods

_Wrapped' :: Iso' (Down a) (Unwrapped (Down a))

Prim a => Prim (Down a) 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: Down a -> Int#

alignment# :: Down a -> Int#

indexByteArray# :: ByteArray# -> Int# -> Down a

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, Down a #)

writeByteArray# :: MutableByteArray# s -> Int# -> Down a -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> Down a -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> Down a

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, Down a #)

writeOffAddr# :: Addr# -> Int# -> Down a -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> Down a -> State# s -> State# s

Unbox a => Unbox (Down a) 
Instance details

Defined in Data.Vector.Unboxed.Base

t ~ Down b => Rewrapped (Down a) t 
Instance details

Defined in Control.Lens.Wrapped

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)))
type Unwrapped (Down a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (Down a) = a
newtype Vector (Down a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector (Down a) = V_Down (Vector a)

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 Word128 
Instance details

Defined in Basement.Types.Word128

Methods

sizeOf :: Word128 -> Int

alignment :: Word128 -> Int

peekElemOff :: Ptr Word128 -> Int -> IO Word128

pokeElemOff :: Ptr Word128 -> Int -> Word128 -> IO ()

peekByteOff :: Ptr b -> Int -> IO Word128

pokeByteOff :: Ptr b -> Int -> Word128 -> IO ()

peek :: Ptr Word128 -> IO Word128

poke :: Ptr Word128 -> Word128 -> IO ()

Storable Word256 
Instance details

Defined in Basement.Types.Word256

Methods

sizeOf :: Word256 -> Int

alignment :: Word256 -> Int

peekElemOff :: Ptr Word256 -> Int -> IO Word256

pokeElemOff :: Ptr Word256 -> Int -> Word256 -> IO ()

peekByteOff :: Ptr b -> Int -> IO Word256

pokeByteOff :: Ptr b -> Int -> Word256 -> IO ()

peek :: Ptr Word256 -> IO Word256

poke :: Ptr Word256 -> Word256 -> IO ()

Storable IPv4 
Instance details

Defined in Net.IPv4

Methods

sizeOf :: IPv4 -> Int

alignment :: IPv4 -> Int

peekElemOff :: Ptr IPv4 -> Int -> IO IPv4

pokeElemOff :: Ptr IPv4 -> Int -> IPv4 -> IO ()

peekByteOff :: Ptr b -> Int -> IO IPv4

pokeByteOff :: Ptr b -> Int -> IPv4 -> IO ()

peek :: Ptr IPv4 -> IO IPv4

poke :: Ptr IPv4 -> IPv4 -> IO ()

Storable IPv6 
Instance details

Defined in Net.IPv6

Methods

sizeOf :: IPv6 -> Int

alignment :: IPv6 -> Int

peekElemOff :: Ptr IPv6 -> Int -> IO IPv6

pokeElemOff :: Ptr IPv6 -> Int -> IPv6 -> IO ()

peekByteOff :: Ptr b -> Int -> IO IPv6

pokeByteOff :: Ptr b -> Int -> IPv6 -> IO ()

peek :: Ptr IPv6 -> IO IPv6

poke :: Ptr IPv6 -> IPv6 -> 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 HostEntry 
Instance details

Defined in Network.BSD

Methods

sizeOf :: HostEntry -> Int

alignment :: HostEntry -> Int

peekElemOff :: Ptr HostEntry -> Int -> IO HostEntry

pokeElemOff :: Ptr HostEntry -> Int -> HostEntry -> IO ()

peekByteOff :: Ptr b -> Int -> IO HostEntry

pokeByteOff :: Ptr b -> Int -> HostEntry -> IO ()

peek :: Ptr HostEntry -> IO HostEntry

poke :: Ptr HostEntry -> HostEntry -> IO ()

Storable NetworkEntry 
Instance details

Defined in Network.BSD

Methods

sizeOf :: NetworkEntry -> Int

alignment :: NetworkEntry -> Int

peekElemOff :: Ptr NetworkEntry -> Int -> IO NetworkEntry

pokeElemOff :: Ptr NetworkEntry -> Int -> NetworkEntry -> IO ()

peekByteOff :: Ptr b -> Int -> IO NetworkEntry

pokeByteOff :: Ptr b -> Int -> NetworkEntry -> IO ()

peek :: Ptr NetworkEntry -> IO NetworkEntry

poke :: Ptr NetworkEntry -> NetworkEntry -> IO ()

Storable ProtocolEntry 
Instance details

Defined in Network.BSD

Methods

sizeOf :: ProtocolEntry -> Int

alignment :: ProtocolEntry -> Int

peekElemOff :: Ptr ProtocolEntry -> Int -> IO ProtocolEntry

pokeElemOff :: Ptr ProtocolEntry -> Int -> ProtocolEntry -> IO ()

peekByteOff :: Ptr b -> Int -> IO ProtocolEntry

pokeByteOff :: Ptr b -> Int -> ProtocolEntry -> IO ()

peek :: Ptr ProtocolEntry -> IO ProtocolEntry

poke :: Ptr ProtocolEntry -> ProtocolEntry -> IO ()

Storable ServiceEntry 
Instance details

Defined in Network.BSD

Methods

sizeOf :: ServiceEntry -> Int

alignment :: ServiceEntry -> Int

peekElemOff :: Ptr ServiceEntry -> Int -> IO ServiceEntry

pokeElemOff :: Ptr ServiceEntry -> Int -> ServiceEntry -> IO ()

peekByteOff :: Ptr b -> Int -> IO ServiceEntry

pokeByteOff :: Ptr b -> Int -> ServiceEntry -> IO ()

peek :: Ptr ServiceEntry -> IO ServiceEntry

poke :: Ptr ServiceEntry -> ServiceEntry -> IO ()

Storable IPv4 
Instance details

Defined in Network.Info

Methods

sizeOf :: IPv4 -> Int

alignment :: IPv4 -> Int

peekElemOff :: Ptr IPv4 -> Int -> IO IPv4

pokeElemOff :: Ptr IPv4 -> Int -> IPv4 -> IO ()

peekByteOff :: Ptr b -> Int -> IO IPv4

pokeByteOff :: Ptr b -> Int -> IPv4 -> IO ()

peek :: Ptr IPv4 -> IO IPv4

poke :: Ptr IPv4 -> IPv4 -> IO ()

Storable IPv6 
Instance details

Defined in Network.Info

Methods

sizeOf :: IPv6 -> Int

alignment :: IPv6 -> Int

peekElemOff :: Ptr IPv6 -> Int -> IO IPv6

pokeElemOff :: Ptr IPv6 -> Int -> IPv6 -> IO ()

peekByteOff :: Ptr b -> Int -> IO IPv6

pokeByteOff :: Ptr b -> Int -> IPv6 -> IO ()

peek :: Ptr IPv6 -> IO IPv6

poke :: Ptr IPv6 -> IPv6 -> IO ()

Storable MAC 
Instance details

Defined in Network.Info

Methods

sizeOf :: MAC -> Int

alignment :: MAC -> Int

peekElemOff :: Ptr MAC -> Int -> IO MAC

pokeElemOff :: Ptr MAC -> Int -> MAC -> IO ()

peekByteOff :: Ptr b -> Int -> IO MAC

pokeByteOff :: Ptr b -> Int -> MAC -> IO ()

peek :: Ptr MAC -> IO MAC

poke :: Ptr MAC -> MAC -> IO ()

Storable NetworkInterface 
Instance details

Defined in Network.Info

Methods

sizeOf :: NetworkInterface -> Int

alignment :: NetworkInterface -> Int

peekElemOff :: Ptr NetworkInterface -> Int -> IO NetworkInterface

pokeElemOff :: Ptr NetworkInterface -> Int -> NetworkInterface -> IO ()

peekByteOff :: Ptr b -> Int -> IO NetworkInterface

pokeByteOff :: Ptr b -> Int -> NetworkInterface -> IO ()

peek :: Ptr NetworkInterface -> IO NetworkInterface

poke :: Ptr NetworkInterface -> NetworkInterface -> IO ()

Storable Oid 
Instance details

Defined in Database.PostgreSQL.LibPQ.Oid

Methods

sizeOf :: Oid -> Int

alignment :: Oid -> Int

peekElemOff :: Ptr Oid -> Int -> IO Oid

pokeElemOff :: Ptr Oid -> Int -> Oid -> IO ()

peekByteOff :: Ptr b -> Int -> IO Oid

pokeByteOff :: Ptr b -> Int -> Oid -> IO ()

peek :: Ptr Oid -> IO Oid

poke :: Ptr Oid -> Oid -> IO ()

Storable Skein1024Ctx 
Instance details

Defined in Crypto.Skein.Internal

Methods

sizeOf :: Skein1024Ctx -> Int

alignment :: Skein1024Ctx -> Int

peekElemOff :: Ptr Skein1024Ctx -> Int -> IO Skein1024Ctx

pokeElemOff :: Ptr Skein1024Ctx -> Int -> Skein1024Ctx -> IO ()

peekByteOff :: Ptr b -> Int -> IO Skein1024Ctx

pokeByteOff :: Ptr b -> Int -> Skein1024Ctx -> IO ()

peek :: Ptr Skein1024Ctx -> IO Skein1024Ctx

poke :: Ptr Skein1024Ctx -> Skein1024Ctx -> IO ()

Storable Skein256Ctx 
Instance details

Defined in Crypto.Skein.Internal

Methods

sizeOf :: Skein256Ctx -> Int

alignment :: Skein256Ctx -> Int

peekElemOff :: Ptr Skein256Ctx -> Int -> IO Skein256Ctx

pokeElemOff :: Ptr Skein256Ctx -> Int -> Skein256Ctx -> IO ()

peekByteOff :: Ptr b -> Int -> IO Skein256Ctx

pokeByteOff :: Ptr b -> Int -> Skein256Ctx -> IO ()

peek :: Ptr Skein256Ctx -> IO Skein256Ctx

poke :: Ptr Skein256Ctx -> Skein256Ctx -> IO ()

Storable Skein512Ctx 
Instance details

Defined in Crypto.Skein.Internal

Methods

sizeOf :: Skein512Ctx -> Int

alignment :: Skein512Ctx -> Int

peekElemOff :: Ptr Skein512Ctx -> Int -> IO Skein512Ctx

pokeElemOff :: Ptr Skein512Ctx -> Int -> Skein512Ctx -> IO ()

peekByteOff :: Ptr b -> Int -> IO Skein512Ctx

pokeByteOff :: Ptr b -> Int -> Skein512Ctx -> IO ()

peek :: Ptr Skein512Ctx -> IO Skein512Ctx

poke :: Ptr Skein512Ctx -> Skein512Ctx -> IO ()

Storable CodePoint 
Instance details

Defined in Data.Streaming.Text

Methods

sizeOf :: CodePoint -> Int

alignment :: CodePoint -> Int

peekElemOff :: Ptr CodePoint -> Int -> IO CodePoint

pokeElemOff :: Ptr CodePoint -> Int -> CodePoint -> IO ()

peekByteOff :: Ptr b -> Int -> IO CodePoint

pokeByteOff :: Ptr b -> Int -> CodePoint -> IO ()

peek :: Ptr CodePoint -> IO CodePoint

poke :: Ptr CodePoint -> CodePoint -> IO ()

Storable DecoderState 
Instance details

Defined in Data.Streaming.Text

Methods

sizeOf :: DecoderState -> Int

alignment :: DecoderState -> Int

peekElemOff :: Ptr DecoderState -> Int -> IO DecoderState

pokeElemOff :: Ptr DecoderState -> Int -> DecoderState -> IO ()

peekByteOff :: Ptr b -> Int -> IO DecoderState

pokeByteOff :: Ptr b -> Int -> DecoderState -> IO ()

peek :: Ptr DecoderState -> IO DecoderState

poke :: Ptr DecoderState -> DecoderState -> 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 Int128 
Instance details

Defined in Data.WideWord.Int128

Methods

sizeOf :: Int128 -> Int

alignment :: Int128 -> Int

peekElemOff :: Ptr Int128 -> Int -> IO Int128

pokeElemOff :: Ptr Int128 -> Int -> Int128 -> IO ()

peekByteOff :: Ptr b -> Int -> IO Int128

pokeByteOff :: Ptr b -> Int -> Int128 -> IO ()

peek :: Ptr Int128 -> IO Int128

poke :: Ptr Int128 -> Int128 -> IO ()

Storable Word128 
Instance details

Defined in Data.WideWord.Word128

Methods

sizeOf :: Word128 -> Int

alignment :: Word128 -> Int

peekElemOff :: Ptr Word128 -> Int -> IO Word128

pokeElemOff :: Ptr Word128 -> Int -> Word128 -> IO ()

peekByteOff :: Ptr b -> Int -> IO Word128

pokeByteOff :: Ptr b -> Int -> Word128 -> IO ()

peek :: Ptr Word128 -> IO Word128

poke :: Ptr Word128 -> Word128 -> IO ()

Storable Word256 
Instance details

Defined in Data.WideWord.Word256

Methods

sizeOf :: Word256 -> Int

alignment :: Word256 -> Int

peekElemOff :: Ptr Word256 -> Int -> IO Word256

pokeElemOff :: Ptr Word256 -> Int -> Word256 -> IO ()

peekByteOff :: Ptr b -> Int -> IO Word256

pokeByteOff :: Ptr b -> Int -> Word256 -> IO ()

peek :: Ptr Word256 -> IO Word256

poke :: Ptr Word256 -> Word256 -> 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 ()

Prim a => Storable (PrimStorable a) 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf :: PrimStorable a -> Int

alignment :: PrimStorable a -> Int

peekElemOff :: Ptr (PrimStorable a) -> Int -> IO (PrimStorable a)

pokeElemOff :: Ptr (PrimStorable a) -> Int -> PrimStorable a -> IO ()

peekByteOff :: Ptr b -> Int -> IO (PrimStorable a)

pokeByteOff :: Ptr b -> Int -> PrimStorable a -> IO ()

peek :: Ptr (PrimStorable a) -> IO (PrimStorable a)

poke :: Ptr (PrimStorable a) -> PrimStorable 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 ()

(<|>) :: Alternative f => f a -> f a -> f 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 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 Only 
Instance details

Defined in Data.Tuple.Only

Methods

fmap :: (a -> b) -> Only a -> Only b #

(<$) :: a -> Only b -> Only a #

Functor Gen 
Instance details

Defined in Test.QuickCheck.Gen

Methods

fmap :: (a -> b) -> Gen a -> Gen b #

(<$) :: a -> Gen b -> Gen a #

Functor Blind 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> Blind a -> Blind b #

(<$) :: a -> Blind b -> Blind a #

Functor Fixed 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> Fixed a -> Fixed b #

(<$) :: a -> Fixed b -> Fixed a #

Functor Large 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> Large a -> Large b #

(<$) :: a -> Large b -> Large a #

Functor Negative 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> Negative a -> Negative b #

(<$) :: a -> Negative b -> Negative a #

Functor NonEmptyList 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> NonEmptyList a -> NonEmptyList b #

(<$) :: a -> NonEmptyList b -> NonEmptyList a #

Functor NonNegative 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> NonNegative a -> NonNegative b #

(<$) :: a -> NonNegative b -> NonNegative a #

Functor NonPositive 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> NonPositive a -> NonPositive b #

(<$) :: a -> NonPositive b -> NonPositive a #

Functor NonZero 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> NonZero a -> NonZero b #

(<$) :: a -> NonZero b -> NonZero a #

Functor OrderedList 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> OrderedList a -> OrderedList b #

(<$) :: a -> OrderedList b -> OrderedList a #

Functor Positive 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> Positive a -> Positive b #

(<$) :: a -> Positive b -> Positive a #

Functor Shrink2 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> Shrink2 a -> Shrink2 b #

(<$) :: a -> Shrink2 b -> Shrink2 a #

Functor Small 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> Small a -> Small b #

(<$) :: a -> Small b -> Small a #

Functor Smart 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> Smart a -> Smart b #

(<$) :: a -> Smart b -> Smart a #

Functor SortedList 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> SortedList a -> SortedList b #

(<$) :: a -> SortedList b -> SortedList a #

Functor Rose 
Instance details

Defined in Test.QuickCheck.Property

Methods

fmap :: (a -> b) -> Rose a -> Rose b #

(<$) :: a -> Rose b -> Rose 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

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 ParseASN1 
Instance details

Defined in Data.ASN1.Parse

Methods

fmap :: (a -> b) -> ParseASN1 a -> ParseASN1 b #

(<$) :: a -> ParseASN1 b -> ParseASN1 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 Array 
Instance details

Defined in Basement.BoxedArray

Methods

fmap :: (a -> b) -> Array a -> Array b #

(<$) :: a -> Array b -> Array a #

Functor Decoder 
Instance details

Defined in Data.Binary.Get.Internal

Methods

fmap :: (a -> b) -> Decoder a -> Decoder b #

(<$) :: a -> Decoder b -> Decoder a #

Functor Get 
Instance details

Defined in Data.Binary.Get.Internal

Methods

fmap :: (a -> b) -> Get a -> Get b #

(<$) :: a -> Get b -> Get a #

Functor PutM 
Instance details

Defined in Data.Binary.Put

Methods

fmap :: (a -> b) -> PutM a -> PutM b #

(<$) :: a -> PutM b -> PutM a #

Functor MarkupM 
Instance details

Defined in Text.Blaze.Internal

Methods

fmap :: (a -> b) -> MarkupM a -> MarkupM b #

(<$) :: a -> MarkupM b -> MarkupM 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 Get 
Instance details

Defined in Data.Serialize.Get

Methods

fmap :: (a -> b) -> Get a -> Get b #

(<$) :: a -> Get b -> Get a #

Functor Result 
Instance details

Defined in Data.Serialize.Get

Methods

fmap :: (a -> b) -> Result a -> Result b #

(<$) :: a -> Result b -> Result a #

Functor PutM 
Instance details

Defined in Data.Serialize.Put

Methods

fmap :: (a -> b) -> PutM a -> PutM b #

(<$) :: a -> PutM b -> PutM 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 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 UniqueMap 
Instance details

Defined in GHC.Cmm.Dataflow.Collections

Methods

fmap :: (a -> b) -> UniqueMap a -> UniqueMap b #

(<$) :: a -> UniqueMap b -> UniqueMap a #

Functor LabelMap 
Instance details

Defined in GHC.Cmm.Dataflow.Label

Methods

fmap :: (a -> b) -> LabelMap a -> LabelMap b #

(<$) :: a -> LabelMap b -> LabelMap a #

Functor NormM 
Instance details

Defined in GHC.Core.FamInstEnv

Methods

fmap :: (a -> b) -> NormM a -> NormM b #

(<$) :: a -> NormM b -> NormM a #

Functor AltMap 
Instance details

Defined in GHC.Core.Map.Expr

Methods

fmap :: (a -> b) -> AltMap a -> AltMap b #

(<$) :: a -> AltMap b -> AltMap a #

Functor CoreMap 
Instance details

Defined in GHC.Core.Map.Expr

Methods

fmap :: (a -> b) -> CoreMap a -> CoreMap b #

(<$) :: a -> CoreMap b -> CoreMap a #

Functor CoreMapX 
Instance details

Defined in GHC.Core.Map.Expr

Methods

fmap :: (a -> b) -> CoreMapX a -> CoreMapX b #

(<$) :: a -> CoreMapX b -> CoreMapX a #

Functor BndrMap 
Instance details

Defined in GHC.Core.Map.Type

Methods

fmap :: (a -> b) -> BndrMap a -> BndrMap b #

(<$) :: a -> BndrMap b -> BndrMap a #

Functor CoercionMap 
Instance details

Defined in GHC.Core.Map.Type

Methods

fmap :: (a -> b) -> CoercionMap a -> CoercionMap b #

(<$) :: a -> CoercionMap b -> CoercionMap a #

Functor CoercionMapX 
Instance details

Defined in GHC.Core.Map.Type

Methods

fmap :: (a -> b) -> CoercionMapX a -> CoercionMapX b #

(<$) :: a -> CoercionMapX b -> CoercionMapX a #

Functor LooseTypeMap 
Instance details

Defined in GHC.Core.Map.Type

Methods

fmap :: (a -> b) -> LooseTypeMap a -> LooseTypeMap b #

(<$) :: a -> LooseTypeMap b -> LooseTypeMap a #

Functor TyLitMap 
Instance details

Defined in GHC.Core.Map.Type

Methods

fmap :: (a -> b) -> TyLitMap a -> TyLitMap b #

(<$) :: a -> TyLitMap b -> TyLitMap a #

Functor TypeMap 
Instance details

Defined in GHC.Core.Map.Type

Methods

fmap :: (a -> b) -> TypeMap a -> TypeMap b #

(<$) :: a -> TypeMap b -> TypeMap a #

Functor TypeMapX 
Instance details

Defined in GHC.Core.Map.Type

Methods

fmap :: (a -> b) -> TypeMapX a -> TypeMapX b #

(<$) :: a -> TypeMapX b -> TypeMapX a #

Functor VarMap 
Instance details

Defined in GHC.Core.Map.Type

Methods

fmap :: (a -> b) -> VarMap a -> VarMap b #

(<$) :: a -> VarMap b -> VarMap a #

Functor Bag 
Instance details

Defined in GHC.Data.Bag

Methods

fmap :: (a -> b) -> Bag a -> Bag b #

(<$) :: a -> Bag b -> Bag a #

Functor MatchResult 
Instance details

Defined in GHC.HsToCore.Monad

Methods

fmap :: (a -> b) -> MatchResult a -> MatchResult b #

(<$) :: a -> MatchResult b -> MatchResult a #

Functor IdentSupply 
Instance details

Defined in GHC.JS.Unsat.Syntax

Methods

fmap :: (a -> b) -> IdentSupply a -> IdentSupply b #

(<$) :: a -> IdentSupply b -> IdentSupply a #

Functor EpAnn 
Instance details

Defined in GHC.Parser.Annotation

Methods

fmap :: (a -> b) -> EpAnn a -> EpAnn b #

(<$) :: a -> EpAnn b -> EpAnn a #

Functor PV 
Instance details

Defined in GHC.Parser.PostProcess

Methods

fmap :: (a -> b) -> PV a -> PV b #

(<$) :: a -> PV b -> PV a #

Functor PV_Result 
Instance details

Defined in GHC.Parser.PostProcess

Methods

fmap :: (a -> b) -> PV_Result a -> PV_Result b #

(<$) :: a -> PV_Result b -> PV_Result a #

Functor ConAppMap 
Instance details

Defined in GHC.Stg.CSE

Methods

fmap :: (a -> b) -> ConAppMap a -> ConAppMap b #

(<$) :: a -> ConAppMap b -> ConAppMap a #

Functor StgArgMap 
Instance details

Defined in GHC.Stg.CSE

Methods

fmap :: (a -> b) -> StgArgMap a -> StgArgMap b #

(<$) :: a -> StgArgMap b -> StgArgMap a #

Functor SolverStage 
Instance details

Defined in GHC.Tc.Solver.Monad

Methods

fmap :: (a -> b) -> SolverStage a -> SolverStage b #

(<$) :: a -> SolverStage b -> SolverStage a #

Functor StopOrContinue 
Instance details

Defined in GHC.Tc.Solver.Monad

Methods

fmap :: (a -> b) -> StopOrContinue a -> StopOrContinue b #

(<$) :: a -> StopOrContinue b -> StopOrContinue a #

Functor TcS 
Instance details

Defined in GHC.Tc.Solver.Monad

Methods

fmap :: (a -> b) -> TcS a -> TcS b #

(<$) :: a -> TcS b -> TcS a #

Functor TyConFlavour 
Instance details

Defined in GHC.Types.Basic

Methods

fmap :: (a -> b) -> TyConFlavour a -> TyConFlavour b #

(<$) :: a -> TyConFlavour b -> TyConFlavour a #

Functor Messages 
Instance details

Defined in GHC.Types.Error

Methods

fmap :: (a -> b) -> Messages a -> Messages b #

(<$) :: a -> Messages b -> Messages a #

Functor MsgEnvelope 
Instance details

Defined in GHC.Types.Error

Methods

fmap :: (a -> b) -> MsgEnvelope a -> MsgEnvelope b #

(<$) :: a -> MsgEnvelope b -> MsgEnvelope a #

Functor OccEnv 
Instance details

Defined in GHC.Types.Name.Occurrence

Methods

fmap :: (a -> b) -> OccEnv a -> OccEnv b #

(<$) :: a -> OccEnv b -> OccEnv a #

Functor Definite 
Instance details

Defined in GHC.Unit.Types

Methods

fmap :: (a -> b) -> Definite a -> Definite b #

(<$) :: a -> Definite b -> Definite a #

Functor GenModule 
Instance details

Defined in GHC.Unit.Types

Methods

fmap :: (a -> b) -> GenModule a -> GenModule b #

(<$) :: a -> GenModule b -> GenModule a #

Functor GenWithIsBoot 
Instance details

Defined in GHC.Unit.Types

Methods

fmap :: (a -> b) -> GenWithIsBoot a -> GenWithIsBoot b #

(<$) :: a -> GenWithIsBoot b -> GenWithIsBoot a #

Functor DataDefnCons 
Instance details

Defined in Language.Haskell.Syntax.Decls

Methods

fmap :: (a -> b) -> DataDefnCons a -> DataDefnCons b #

(<$) :: a -> DataDefnCons b -> DataDefnCons a #

Functor SizedSeq 
Instance details

Defined in GHC.Data.SizedSeq

Methods

fmap :: (a -> b) -> SizedSeq a -> SizedSeq b #

(<$) :: a -> SizedSeq b -> SizedSeq a #

Functor GenClosure 
Instance details

Defined in GHC.Exts.Heap.Closures

Methods

fmap :: (a -> b) -> GenClosure a -> GenClosure b #

(<$) :: a -> GenClosure b -> GenClosure a #

Functor IO 
Instance details

Defined in GHC.Base

Methods

fmap :: (a -> b) -> IO a -> IO b #

(<$) :: a -> IO b -> IO a #

Functor GHCiQ 
Instance details

Defined in GHCi.TH

Methods

fmap :: (a -> b) -> GHCiQ a -> GHCiQ b #

(<$) :: a -> GHCiQ b -> GHCiQ a #

Functor EP 
Instance details

Defined in Language.Haskell.Exts.ExactPrint

Methods

fmap :: (a -> b) -> EP a -> EP b #

(<$) :: a -> EP b -> EP a #

Functor GuardedAlt 
Instance details

Defined in Language.Haskell.Exts.ExactPrint

Methods

fmap :: (a -> b) -> GuardedAlt a -> GuardedAlt b #

(<$) :: a -> GuardedAlt b -> GuardedAlt a #

Functor GuardedAlts 
Instance details

Defined in Language.Haskell.Exts.ExactPrint

Methods

fmap :: (a -> b) -> GuardedAlts a -> GuardedAlts b #

(<$) :: a -> GuardedAlts b -> GuardedAlts a #

Functor ListOf 
Instance details

Defined in Language.Haskell.Exts.Parser

Methods

fmap :: (a -> b) -> ListOf a -> ListOf b #

(<$) :: a -> ListOf b -> ListOf a #

Functor NonGreedy 
Instance details

Defined in Language.Haskell.Exts.Parser

Methods

fmap :: (a -> b) -> NonGreedy a -> NonGreedy b #

(<$) :: a -> NonGreedy b -> NonGreedy a #

Functor Activation 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Activation a -> Activation b #

(<$) :: a -> Activation b -> Activation a #

Functor Alt 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Alt a -> Alt b #

(<$) :: a -> Alt b -> Alt a #

Functor Annotation 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Annotation a -> Annotation b #

(<$) :: a -> Annotation b -> Annotation a #

Functor Assoc 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Assoc a -> Assoc b #

(<$) :: a -> Assoc b -> Assoc a #

Functor Asst 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Asst a -> Asst b #

(<$) :: a -> Asst b -> Asst a #

Functor BangType 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> BangType a -> BangType b #

(<$) :: a -> BangType b -> BangType a #

Functor Binds 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Binds a -> Binds b #

(<$) :: a -> Binds b -> Binds a #

Functor BooleanFormula 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> BooleanFormula a -> BooleanFormula b #

(<$) :: a -> BooleanFormula b -> BooleanFormula a #

Functor Bracket 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Bracket a -> Bracket b #

(<$) :: a -> Bracket b -> Bracket a #

Functor CName 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> CName a -> CName b #

(<$) :: a -> CName b -> CName a #

Functor CallConv 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> CallConv a -> CallConv b #

(<$) :: a -> CallConv b -> CallConv a #

Functor ClassDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> ClassDecl a -> ClassDecl b #

(<$) :: a -> ClassDecl b -> ClassDecl a #

Functor ConDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> ConDecl a -> ConDecl b #

(<$) :: a -> ConDecl b -> ConDecl a #

Functor Context 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Context a -> Context b #

(<$) :: a -> Context b -> Context a #

Functor DataOrNew 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> DataOrNew a -> DataOrNew b #

(<$) :: a -> DataOrNew b -> DataOrNew a #

Functor Decl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Decl a -> Decl b #

(<$) :: a -> Decl b -> Decl a #

Functor DeclHead 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> DeclHead a -> DeclHead b #

(<$) :: a -> DeclHead b -> DeclHead a #

Functor DerivStrategy 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> DerivStrategy a -> DerivStrategy b #

(<$) :: a -> DerivStrategy b -> DerivStrategy a #

Functor Deriving 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Deriving a -> Deriving b #

(<$) :: a -> Deriving b -> Deriving a #

Functor EWildcard 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> EWildcard a -> EWildcard b #

(<$) :: a -> EWildcard b -> EWildcard a #

Functor Exp 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Exp a -> Exp b #

(<$) :: a -> Exp b -> Exp a #

Functor ExportSpec 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> ExportSpec a -> ExportSpec b #

(<$) :: a -> ExportSpec b -> ExportSpec a #

Functor ExportSpecList 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> ExportSpecList a -> ExportSpecList b #

(<$) :: a -> ExportSpecList b -> ExportSpecList a #

Functor FieldDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> FieldDecl a -> FieldDecl b #

(<$) :: a -> FieldDecl b -> FieldDecl a #

Functor FieldUpdate 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> FieldUpdate a -> FieldUpdate b #

(<$) :: a -> FieldUpdate b -> FieldUpdate a #

Functor FunDep 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> FunDep a -> FunDep b #

(<$) :: a -> FunDep b -> FunDep a #

Functor GadtDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> GadtDecl a -> GadtDecl b #

(<$) :: a -> GadtDecl b -> GadtDecl a #

Functor GuardedRhs 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> GuardedRhs a -> GuardedRhs b #

(<$) :: a -> GuardedRhs b -> GuardedRhs a #

Functor IPBind 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> IPBind a -> IPBind b #

(<$) :: a -> IPBind b -> IPBind a #

Functor IPName 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> IPName a -> IPName b #

(<$) :: a -> IPName b -> IPName a #

Functor ImportDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> ImportDecl a -> ImportDecl b #

(<$) :: a -> ImportDecl b -> ImportDecl a #

Functor ImportSpec 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> ImportSpec a -> ImportSpec b #

(<$) :: a -> ImportSpec b -> ImportSpec a #

Functor ImportSpecList 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> ImportSpecList a -> ImportSpecList b #

(<$) :: a -> ImportSpecList b -> ImportSpecList a #

Functor InjectivityInfo 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> InjectivityInfo a -> InjectivityInfo b #

(<$) :: a -> InjectivityInfo b -> InjectivityInfo a #

Functor InstDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> InstDecl a -> InstDecl b #

(<$) :: a -> InstDecl b -> InstDecl a #

Functor InstHead 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> InstHead a -> InstHead b #

(<$) :: a -> InstHead b -> InstHead a #

Functor InstRule 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> InstRule a -> InstRule b #

(<$) :: a -> InstRule b -> InstRule a #

Functor Literal 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Literal a -> Literal b #

(<$) :: a -> Literal b -> Literal a #

Functor Match 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Match a -> Match b #

(<$) :: a -> Match b -> Match a #

Functor MaybePromotedName 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> MaybePromotedName a -> MaybePromotedName b #

(<$) :: a -> MaybePromotedName b -> MaybePromotedName a #

Functor Module 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Module a -> Module b #

(<$) :: a -> Module b -> Module a #

Functor ModuleHead 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> ModuleHead a -> ModuleHead b #

(<$) :: a -> ModuleHead b -> ModuleHead a #

Functor ModuleName 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> ModuleName a -> ModuleName b #

(<$) :: a -> ModuleName b -> ModuleName a #

Functor ModulePragma 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> ModulePragma a -> ModulePragma b #

(<$) :: a -> ModulePragma b -> ModulePragma a #

Functor Name 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Name a -> Name b #

(<$) :: a -> Name b -> Name a #

Functor Namespace 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Namespace a -> Namespace b #

(<$) :: a -> Namespace b -> Namespace a #

Functor Op 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Op a -> Op b #

(<$) :: a -> Op b -> Op a #

Functor Overlap 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Overlap a -> Overlap b #

(<$) :: a -> Overlap b -> Overlap a #

Functor PXAttr 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> PXAttr a -> PXAttr b #

(<$) :: a -> PXAttr b -> PXAttr a #

Functor Pat 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Pat a -> Pat b #

(<$) :: a -> Pat b -> Pat a #

Functor PatField 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> PatField a -> PatField b #

(<$) :: a -> PatField b -> PatField a #

Functor PatternSynDirection 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> PatternSynDirection a -> PatternSynDirection b #

(<$) :: a -> PatternSynDirection b -> PatternSynDirection a #

Functor Promoted 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Promoted a -> Promoted b #

(<$) :: a -> Promoted b -> Promoted a #

Functor QName 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> QName a -> QName b #

(<$) :: a -> QName b -> QName a #

Functor QOp 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> QOp a -> QOp b #

(<$) :: a -> QOp b -> QOp a #

Functor QualConDecl 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> QualConDecl a -> QualConDecl b #

(<$) :: a -> QualConDecl b -> QualConDecl a #

Functor QualStmt 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> QualStmt a -> QualStmt b #

(<$) :: a -> QualStmt b -> QualStmt a #

Functor RPat 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> RPat a -> RPat b #

(<$) :: a -> RPat b -> RPat a #

Functor RPatOp 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> RPatOp a -> RPatOp b #

(<$) :: a -> RPatOp b -> RPatOp a #

Functor ResultSig 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> ResultSig a -> ResultSig b #

(<$) :: a -> ResultSig b -> ResultSig a #

Functor Rhs 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Rhs a -> Rhs b #

(<$) :: a -> Rhs b -> Rhs a #

Functor Role 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Role a -> Role b #

(<$) :: a -> Role b -> Role a #

Functor Rule 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Rule a -> Rule b #

(<$) :: a -> Rule b -> Rule a #

Functor RuleVar 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> RuleVar a -> RuleVar b #

(<$) :: a -> RuleVar b -> RuleVar a #

Functor Safety 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Safety a -> Safety b #

(<$) :: a -> Safety b -> Safety a #

Functor Sign 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Sign a -> Sign b #

(<$) :: a -> Sign b -> Sign a #

Functor SpecialCon 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> SpecialCon a -> SpecialCon b #

(<$) :: a -> SpecialCon b -> SpecialCon a #

Functor Splice 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Splice a -> Splice b #

(<$) :: a -> Splice b -> Splice a #

Functor Stmt 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Stmt a -> Stmt b #

(<$) :: a -> Stmt b -> Stmt a #

Functor TyVarBind 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> TyVarBind a -> TyVarBind b #

(<$) :: a -> TyVarBind b -> TyVarBind a #

Functor Type 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Type a -> Type b #

(<$) :: a -> Type b -> Type a #

Functor TypeEqn 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> TypeEqn a -> TypeEqn b #

(<$) :: a -> TypeEqn b -> TypeEqn a #

Functor Unpackedness 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> Unpackedness a -> Unpackedness b #

(<$) :: a -> Unpackedness b -> Unpackedness a #

Functor WarningText 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> WarningText a -> WarningText b #

(<$) :: a -> WarningText b -> WarningText a #

Functor XAttr 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> XAttr a -> XAttr b #

(<$) :: a -> XAttr b -> XAttr a #

Functor XName 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

fmap :: (a -> b) -> XName a -> XName b #

(<$) :: a -> XName b -> XName a #

Functor HistoriedResponse 
Instance details

Defined in Network.HTTP.Client

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 Deque 
Instance details

Defined in Control.Lens.Internal.Deque

Methods

fmap :: (a -> b) -> Deque a -> Deque b #

(<$) :: a -> Deque b -> Deque a #

Functor ErrorFancy 
Instance details

Defined in Text.Megaparsec.Error

Methods

fmap :: (a -> b) -> ErrorFancy a -> ErrorFancy b #

(<$) :: a -> ErrorFancy b -> ErrorFancy a #

Functor ErrorItem 
Instance details

Defined in Text.Megaparsec.Error

Methods

fmap :: (a -> b) -> ErrorItem a -> ErrorItem b #

(<$) :: a -> ErrorItem b -> ErrorItem a #

Functor Minio 
Instance details

Defined in Network.Minio.Data

Methods

fmap :: (a -> b) -> Minio a -> Minio b #

(<$) :: a -> Minio b -> Minio 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 Eval 
Instance details

Defined in Control.Parallel.Strategies

Methods

fmap :: (a -> b) -> Eval a -> Eval b #

(<$) :: a -> Eval b -> Eval a #

Functor Consumed 
Instance details

Defined in Text.Parsec.Prim

Methods

fmap :: (a -> b) -> Consumed a -> Consumed b #

(<$) :: a -> Consumed b -> Consumed a #

Functor RegexpSplit 
Instance details

Defined in Text.Regex.PCRE.ByteString.Utils

Methods

fmap :: (a -> b) -> RegexpSplit a -> RegexpSplit b #

(<$) :: a -> RegexpSplit b -> RegexpSplit a #

Functor Conversion 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Methods

fmap :: (a -> b) -> Conversion a -> Conversion b #

(<$) :: a -> Conversion b -> Conversion a #

Functor RowParser 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Methods

fmap :: (a -> b) -> RowParser a -> RowParser b #

(<$) :: a -> RowParser b -> RowParser a #

Functor Aeson 
Instance details

Defined in Database.PostgreSQL.Simple.Newtypes

Methods

fmap :: (a -> b) -> Aeson a -> Aeson b #

(<$) :: a -> Aeson b -> Aeson a #

Functor Ok 
Instance details

Defined in Database.PostgreSQL.Simple.Ok

Methods

fmap :: (a -> b) -> Ok a -> Ok b #

(<$) :: a -> Ok b -> Ok a #

Functor PGRange 
Instance details

Defined in Database.PostgreSQL.Simple.Range

Methods

fmap :: (a -> b) -> PGRange a -> PGRange b #

(<$) :: a -> PGRange b -> PGRange a #

Functor RangeBound 
Instance details

Defined in Database.PostgreSQL.Simple.Range

Methods

fmap :: (a -> b) -> RangeBound a -> RangeBound b #

(<$) :: a -> RangeBound b -> RangeBound a #

Functor Binary 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

fmap :: (a -> b) -> Binary a -> Binary b #

(<$) :: a -> Binary b -> Binary a #

Functor In 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

fmap :: (a -> b) -> In a -> In b #

(<$) :: a -> In b -> In a #

Functor PGArray 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

fmap :: (a -> b) -> PGArray a -> PGArray b #

(<$) :: a -> PGArray b -> PGArray 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 SimpleDocTree 
Instance details

Defined in Prettyprinter.Render.Util.SimpleDocTree

Methods

fmap :: (a -> b) -> SimpleDocTree a -> SimpleDocTree b #

(<$) :: a -> SimpleDocTree b -> SimpleDocTree 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 CharMap 
Instance details

Defined in Data.IntMap.CharMap2

Methods

fmap :: (a -> b) -> CharMap a -> CharMap b #

(<$) :: a -> CharMap b -> CharMap a #

Functor Acquire 
Instance details

Defined in Data.Acquire.Internal

Methods

fmap :: (a -> b) -> Acquire a -> Acquire b #

(<$) :: a -> Acquire b -> Acquire 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 Capability 
Instance details

Defined in System.Console.Terminfo.Base

Methods

fmap :: (a -> b) -> Capability a -> Capability b #

(<$) :: a -> Capability b -> Capability 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 Box 
Instance details

Defined in Data.Stream.Monadic

Methods

fmap :: (a -> b) -> Box a -> Box b #

(<$) :: a -> Box b -> Box a #

Functor UrlMap' 
Instance details

Defined in Network.Wai.UrlMap

Methods

fmap :: (a -> b) -> UrlMap' a -> UrlMap' b #

(<$) :: a -> UrlMap' b -> UrlMap' a #

Functor BoolPair 
Instance details

Defined in Witherable

Methods

fmap :: (a -> b) -> BoolPair a -> BoolPair b #

(<$) :: a -> BoolPair b -> BoolPair a #

Functor CacheResponse 
Instance details

Defined in Network.Wreq.Cache

Methods

fmap :: (a -> b) -> CacheResponse a -> CacheResponse b #

(<$) :: a -> CacheResponse b -> CacheResponse a #

Functor AttrParser 
Instance details

Defined in Text.XML.Stream.Parse

Methods

fmap :: (a -> b) -> AttrParser a -> AttrParser b #

(<$) :: a -> AttrParser b -> AttrParser a #

Functor NameMatcher 
Instance details

Defined in Text.XML.Stream.Parse

Methods

fmap :: (a -> b) -> NameMatcher a -> NameMatcher b #

(<$) :: a -> NameMatcher b -> NameMatcher 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 ((:->) a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

fmap :: (a0 -> b) -> (a :-> a0) -> a :-> b #

(<$) :: a0 -> (a :-> b) -> a :-> a0 #

Functor (Fun a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

fmap :: (a0 -> b) -> Fun a a0 -> Fun a b #

(<$) :: a0 -> Fun a b -> Fun a a0 #

Functor (Shrinking s) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

fmap :: (a -> b) -> Shrinking s a -> Shrinking s b #

(<$) :: a -> Shrinking s b -> Shrinking s a #

Functor (PropertyM m) 
Instance details

Defined in Test.QuickCheck.Monadic

Methods

fmap :: (a -> b) -> PropertyM m a -> PropertyM m b #

(<$) :: a -> PropertyM m b -> PropertyM m a #

Functor f => Functor (Co f) 
Instance details

Defined in Data.Functor.Rep

Methods

fmap :: (a -> b) -> Co f a -> Co f b #

(<$) :: a -> Co f b -> Co f a #

Functor (TkArray k) 
Instance details

Defined in Data.Aeson.Decoding.Tokens

Methods

fmap :: (a -> b) -> TkArray k a -> TkArray k b #

(<$) :: a -> TkArray k b -> TkArray k a #

Functor (TkRecord k) 
Instance details

Defined in Data.Aeson.Decoding.Tokens

Methods

fmap :: (a -> b) -> TkRecord k a -> TkRecord k b #

(<$) :: a -> TkRecord k b -> TkRecord k a #

Functor (Tokens k) 
Instance details

Defined in Data.Aeson.Decoding.Tokens

Methods

fmap :: (a -> b) -> Tokens k a -> Tokens k b #

(<$) :: a -> Tokens k b -> Tokens k a #

Functor (Tagged2 s) 
Instance details

Defined in Data.Aeson.Types.Generic

Methods

fmap :: (a -> b) -> Tagged2 s a -> Tagged2 s b #

(<$) :: a -> Tagged2 s b -> Tagged2 s 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 (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 #

Functor (Vect n) 
Instance details

Defined in Basement.Sized.Vect

Methods

fmap :: (a -> b) -> Vect n a -> Vect n b #

(<$) :: a -> Vect n b -> Vect n 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 #

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 #

Functor (EitherR r) 
Instance details

Defined in Data.EitherR

Methods

fmap :: (a -> b) -> EitherR r a -> EitherR r b #

(<$) :: a -> EitherR r b -> EitherR r 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 (Alt f) 
Instance details

Defined in Control.Alternative.Free

Methods

fmap :: (a -> b) -> Alt f a -> Alt f b #

(<$) :: a -> Alt f b -> Alt f a #

Functor (AltF f) 
Instance details

Defined in Control.Alternative.Free

Methods

fmap :: (a -> b) -> AltF f a -> AltF f b #

(<$) :: a -> AltF f b -> AltF f a #

Functor (Alt f) 
Instance details

Defined in Control.Alternative.Free.Final

Methods

fmap :: (a -> b) -> Alt f a -> Alt f b #

(<$) :: a -> Alt f b -> Alt f a #

Functor (Ap f) 
Instance details

Defined in Control.Applicative.Free

Methods

fmap :: (a -> b) -> Ap f a -> Ap f b #

(<$) :: a -> Ap f b -> Ap f a #

Functor (Ap f) 
Instance details

Defined in Control.Applicative.Free.Fast

Methods

fmap :: (a -> b) -> Ap f a -> Ap f b #

(<$) :: a -> Ap f b -> Ap f a #

Functor (Ap f) 
Instance details

Defined in Control.Applicative.Free.Final

Methods

fmap :: (a -> b) -> Ap f a -> Ap f b #

(<$) :: a -> Ap f b -> Ap f a #

Functor f => Functor (Cofree f) 
Instance details

Defined in Control.Comonad.Cofree

Methods

fmap :: (a -> b) -> Cofree f a -> Cofree f b #

(<$) :: a -> Cofree f b -> Cofree f a #

Functor w => Functor (CoiterT w) 
Instance details

Defined in Control.Comonad.Trans.Coiter

Methods

fmap :: (a -> b) -> CoiterT w a -> CoiterT w b #

(<$) :: a -> CoiterT w b -> CoiterT w a #

Functor f => Functor (Free f) 
Instance details

Defined in Control.Monad.Free

Methods

fmap :: (a -> b) -> Free f a -> Free f b #

(<$) :: a -> Free f b -> Free f a #

Functor f => Functor (Free f) 
Instance details

Defined in Control.Monad.Free.Ap

Methods

fmap :: (a -> b) -> Free f a -> Free f b #

(<$) :: a -> Free f b -> Free f a #

Functor (F f) 
Instance details

Defined in Control.Monad.Free.Church

Methods

fmap :: (a -> b) -> F f a -> F f b #

(<$) :: a -> F f b -> F f a #

Monad m => Functor (IterT m) 
Instance details

Defined in Control.Monad.Trans.Iter

Methods

fmap :: (a -> b) -> IterT m a -> IterT m b #

(<$) :: a -> IterT m b -> IterT m a #

Functor (MaybeO ex) 
Instance details

Defined in GHC.Cmm.Dataflow.Block

Methods

fmap :: (a -> b) -> MaybeO ex a -> MaybeO ex b #

(<$) :: a -> MaybeO ex b -> MaybeO ex a #

Functor (Gr a) 
Instance details

Defined in GHC.Data.Graph.Inductive.PatriciaTree

Methods

fmap :: (a0 -> b) -> Gr a a0 -> Gr a b #

(<$) :: a0 -> Gr a b -> Gr a a0 #

Functor m => Functor (GenMap m) 
Instance details

Defined in GHC.Data.TrieMap

Methods

fmap :: (a -> b) -> GenMap m a -> GenMap m b #

(<$) :: a -> GenMap m b -> GenMap m a #

Functor m => Functor (ListMap m) 
Instance details

Defined in GHC.Data.TrieMap

Methods

fmap :: (a -> b) -> ListMap m a -> ListMap m b #

(<$) :: a -> ListMap m b -> ListMap m a #

Functor m => Functor (MaybeMap m) 
Instance details

Defined in GHC.Data.TrieMap

Methods

fmap :: (a -> b) -> MaybeMap m a -> MaybeMap m b #

(<$) :: a -> MaybeMap m b -> MaybeMap m a #

Functor (GenLocated l) 
Instance details

Defined in GHC.Types.SrcLoc

Methods

fmap :: (a -> b) -> GenLocated l a -> GenLocated l b #

(<$) :: a -> GenLocated l b -> GenLocated l a #

Functor (UniqMap k) 
Instance details

Defined in GHC.Types.Unique.Map

Methods

fmap :: (a -> b) -> UniqMap k a -> UniqMap k b #

(<$) :: a -> UniqMap k b -> UniqMap k a #

Functor (HsFieldBind lhs) 
Instance details

Defined in Language.Haskell.Syntax.Pat

Methods

fmap :: (a -> b) -> HsFieldBind lhs a -> HsFieldBind lhs b #

(<$) :: a -> HsFieldBind lhs b -> HsFieldBind lhs a #

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 (DocM s) 
Instance details

Defined in Language.Haskell.Exts.Pretty

Methods

fmap :: (a -> b) -> DocM s a -> DocM s b #

(<$) :: a -> DocM s b -> DocM s a #

Functor (IPRTable k) 
Instance details

Defined in Data.IP.RouteTable.Internal

Methods

fmap :: (a -> b) -> IPRTable k a -> IPRTable k b #

(<$) :: a -> IPRTable k b -> IPRTable k a #

Functor (Coyoneda f) 
Instance details

Defined in Data.Functor.Coyoneda

Methods

fmap :: (a -> b) -> Coyoneda f a -> Coyoneda f b #

(<$) :: a -> Coyoneda f b -> Coyoneda f a #

Functor (Yoneda f) 
Instance details

Defined in Data.Functor.Yoneda

Methods

fmap :: (a -> b) -> Yoneda f a -> Yoneda f b #

(<$) :: a -> Yoneda f b -> Yoneda f a #

Functor f => Functor (Act f) 
Instance details

Defined in Data.Key

Methods

fmap :: (a -> b) -> Act f a -> Act f b #

(<$) :: a -> Act f b -> Act f a #

Functor (StateL s) 
Instance details

Defined in Data.Key

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.Key

Methods

fmap :: (a -> b) -> StateR s a -> StateR s b #

(<$) :: a -> StateR s b -> StateR s a #

Functor f => Functor (Indexing f) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

fmap :: (a -> b) -> Indexing f a -> Indexing f b #

(<$) :: a -> Indexing f b -> Indexing f a #

Functor f => Functor (Indexing64 f) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

fmap :: (a -> b) -> Indexing64 f a -> Indexing64 f b #

(<$) :: a -> Indexing64 f b -> Indexing64 f a #

Functor (Level i) 
Instance details

Defined in Control.Lens.Internal.Level

Methods

fmap :: (a -> b) -> Level i a -> Level i b #

(<$) :: a -> Level i b -> Level i a #

Functor f => Functor (First1 f) 
Instance details

Defined in Control.Lens.Lens

Methods

fmap :: (a -> b) -> First1 f a -> First1 f b #

(<$) :: a -> First1 f b -> First1 f a #

Functor (ReifiedFold s) 
Instance details

Defined in Control.Lens.Reified

Methods

fmap :: (a -> b) -> ReifiedFold s a -> ReifiedFold s b #

(<$) :: a -> ReifiedFold s b -> ReifiedFold s a #

Functor (ReifiedGetter s) 
Instance details

Defined in Control.Lens.Reified

Methods

fmap :: (a -> b) -> ReifiedGetter s a -> ReifiedGetter s b #

(<$) :: a -> ReifiedGetter s b -> ReifiedGetter s a #

Functor (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 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 p => Functor (Branch p) 
Instance details

Defined in Control.Applicative.Permutations

Methods

fmap :: (a -> b) -> Branch p a -> Branch p b #

(<$) :: a -> Branch p b -> Branch p a #

Functor m => Functor (Permutation m) 
Instance details

Defined in Control.Applicative.Permutations

Methods

fmap :: (a -> b) -> Permutation m a -> Permutation m b #

(<$) :: a -> Permutation m b -> Permutation m a #

Functor m => Functor (Permutation m) 
Instance details

Defined in Control.Monad.Permutations

Methods

fmap :: (a -> b) -> Permutation m a -> Permutation m b #

(<$) :: a -> Permutation m b -> Permutation m a #

Functor (UniqueParser s) 
Instance details

Defined in Prettyprinter.Render.Util.SimpleDocTree

Methods

fmap :: (a -> b) -> UniqueParser s a -> UniqueParser s b #

(<$) :: a -> UniqueParser s b -> UniqueParser s a #

Ord k => Functor (EnumMap k) 
Instance details

Defined in Data.IntMap.EnumMap2

Methods

fmap :: (a -> b) -> EnumMap k a -> EnumMap k b #

(<$) :: a -> EnumMap k b -> EnumMap k 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 f => Functor (Zippy f) 
Instance details

Defined in Data.Zip

Methods

fmap :: (a -> b) -> Zippy f a -> Zippy f b #

(<$) :: a -> Zippy f b -> Zippy f a #

Functor f => Functor (MaybeApply f) 
Instance details

Defined in Data.Functor.Bind.Class

Methods

fmap :: (a -> b) -> MaybeApply f a -> MaybeApply f b #

(<$) :: a -> MaybeApply f b -> MaybeApply f a #

Functor f => Functor (WrappedApplicative f) 
Instance details

Defined in Data.Functor.Bind.Class

Methods

fmap :: (a -> b) -> WrappedApplicative f a -> WrappedApplicative f b #

(<$) :: a -> WrappedApplicative f b -> WrappedApplicative f a #

Functor f => Functor (Act f) 
Instance details

Defined in Data.Semigroup.Bifoldable

Methods

fmap :: (a -> b) -> Act f a -> Act f b #

(<$) :: a -> Act f b -> Act f a #

Functor f => Functor (Act f) 
Instance details

Defined in Data.Semigroup.Foldable

Methods

fmap :: (a -> b) -> Act f a -> Act f b #

(<$) :: a -> Act f b -> Act f 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 (Step s) 
Instance details

Defined in Data.Stream.Monadic

Methods

fmap :: (a -> b) -> Step s a -> Step s b #

(<$) :: a -> Step s b -> Step s a #

Monad m => Functor (Stream m) 
Instance details

Defined in Data.Stream.Monadic

Methods

fmap :: (a -> b) -> Stream m a -> Stream m b #

(<$) :: a -> Stream m b -> Stream m a #

Functor f => Functor (WrappedFoldable f) 
Instance details

Defined in Witherable

Methods

fmap :: (a -> b) -> WrappedFoldable f a -> WrappedFoldable f b #

(<$) :: a -> WrappedFoldable f b -> WrappedFoldable f 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 #

(Functor w, Functor g) => Functor (StoreT g w) 
Instance details

Defined in Control.Comonad.Representable.Store

Methods

fmap :: (a -> b) -> StoreT g w a -> StoreT g w b #

(<$) :: a -> StoreT g w b -> StoreT g w a #

(Functor f, Functor m) => Functor (ReaderT f m) 
Instance details

Defined in Control.Monad.Representable.Reader

Methods

fmap :: (a -> b) -> ReaderT f m a -> ReaderT f m b #

(<$) :: a -> ReaderT f m b -> ReaderT f m a #

(Functor g, Functor m) => Functor (StateT g m) 
Instance details

Defined in Control.Monad.Representable.State

Methods

fmap :: (a -> b) -> StateT g m a -> StateT g m b #

(<$) :: a -> StateT g m b -> StateT g m 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 #

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 (Reader r m) 
Instance details

Defined in Basement.Compat.MonadTrans

Methods

fmap :: (a -> b) -> Reader r m a -> Reader r m b #

(<$) :: a -> Reader r m b -> Reader r m a #

Monad m => Functor (State s m) 
Instance details

Defined in Basement.Compat.MonadTrans

Methods

fmap :: (a -> b) -> State s m a -> State s m b #

(<$) :: a -> State s m b -> State s m a #

Functor (Mag a b) 
Instance details

Defined in Data.Biapplicative

Methods

fmap :: (a0 -> b0) -> Mag a b a0 -> Mag a b b0 #

(<$) :: a0 -> Mag a b b0 -> Mag a b a0 #

Functor (bi a) => Functor (Biap bi a) 
Instance details

Defined in Data.Bifunctor.Biap

Methods

fmap :: (a0 -> b) -> Biap bi a a0 -> Biap bi a b #

(<$) :: a0 -> Biap bi a b -> Biap bi a a0 #

Bifunctor p => Functor (Fix p) 
Instance details

Defined in Data.Bifunctor.Fix

Methods

fmap :: (a -> b) -> Fix p a -> Fix p b #

(<$) :: a -> Fix p b -> Fix p a #

Bifunctor p => Functor (Join p) 
Instance details

Defined in Data.Bifunctor.Join

Methods

fmap :: (a -> b) -> Join p a -> Join p b #

(<$) :: a -> Join p b -> Join p a #

Functor w => Functor (EnvT e w) 
Instance details

Defined in Control.Comonad.Trans.Env

Methods

fmap :: (a -> b) -> EnvT e w a -> EnvT e w b #

(<$) :: a -> EnvT e w b -> EnvT e w a #

Functor w => Functor (StoreT s w) 
Instance details

Defined in Control.Comonad.Trans.Store

Methods

fmap :: (a -> b) -> StoreT s w a -> StoreT s w b #

(<$) :: a -> StoreT s w b -> StoreT s w a #

Functor w => Functor (TracedT m w) 
Instance details

Defined in Control.Comonad.Trans.Traced

Methods

fmap :: (a -> b) -> TracedT m w a -> TracedT m w b #

(<$) :: a -> TracedT m w b -> TracedT m w 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 #

(Contravariant f, Contravariant g) => Functor (Compose f g) 
Instance details

Defined in Data.Functor.Contravariant.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 (ComposeCF f g) 
Instance details

Defined in Data.Functor.Contravariant.Compose

Methods

fmap :: (a -> b) -> ComposeCF f g a -> ComposeCF f g b #

(<$) :: a -> ComposeCF f g b -> ComposeCF f g a #

(Functor f, Functor g) => Functor (ComposeFC f g) 
Instance details

Defined in Data.Functor.Contravariant.Compose

Methods

fmap :: (a -> b) -> ComposeFC f g a -> ComposeFC f g b #

(<$) :: a -> ComposeFC f g b -> ComposeFC f g a #

Monad m => Functor (ExceptRT r m) 
Instance details

Defined in Data.EitherR

Methods

fmap :: (a -> b) -> ExceptRT r m a -> ExceptRT r m b #

(<$) :: a -> ExceptRT r m b -> ExceptRT r m a #

Functor g => Functor (ApF f g) 
Instance details

Defined in Control.Applicative.Trans.Free

Methods

fmap :: (a -> b) -> ApF f g a -> ApF f g b #

(<$) :: a -> ApF f g b -> ApF f g a #

Functor g => Functor (ApT f g) 
Instance details

Defined in Control.Applicative.Trans.Free

Methods

fmap :: (a -> b) -> ApT f g a -> ApT f g b #

(<$) :: a -> ApT f g b -> ApT f g a #

Functor f => Functor (CofreeF f a) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

fmap :: (a0 -> b) -> CofreeF f a a0 -> CofreeF f a b #

(<$) :: a0 -> CofreeF f a b -> CofreeF f a a0 #

(Functor f, Functor w) => Functor (CofreeT f w) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

fmap :: (a -> b) -> CofreeT f w a -> CofreeT f w b #

(<$) :: a -> CofreeT f w b -> CofreeT f w a #

Functor f => Functor (FreeF f a) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

fmap :: (a0 -> b) -> FreeF f a a0 -> FreeF f a b #

(<$) :: a0 -> FreeF f a b -> FreeF f a a0 #

(Functor f, Functor m) => Functor (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

fmap :: (a -> b) -> FreeT f m a -> FreeT f m b #

(<$) :: a -> FreeT f m b -> FreeT f m a #

Functor f => Functor (FreeF f a) 
Instance details

Defined in Control.Monad.Trans.Free.Ap

Methods

fmap :: (a0 -> b) -> FreeF f a a0 -> FreeF f a b #

(<$) :: a0 -> FreeF f a b -> FreeF f a a0 #

(Functor f, Functor m) => Functor (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free.Ap

Methods

fmap :: (a -> b) -> FreeT f m a -> FreeT f m b #

(<$) :: a -> FreeT f m b -> FreeT f m a #

Functor (FT f m) 
Instance details

Defined in Control.Monad.Trans.Free.Church

Methods

fmap :: (a -> b) -> FT f m a -> FT f m b #

(<$) :: a -> FT f m b -> FT f m a #

Functor f => Functor (WrappedFunctor f) 
Instance details

Defined in Data.Functor.Invariant

Methods

fmap :: (a -> b) -> WrappedFunctor f a -> WrappedFunctor f b #

(<$) :: a -> WrappedFunctor f b -> WrappedFunctor f a #

Functor (Density f) 
Instance details

Defined in Control.Comonad.Density

Methods

fmap :: (a -> b) -> Density f a -> Density f b #

(<$) :: a -> Density f b -> Density f a #

Functor (Day f g) 
Instance details

Defined in Data.Functor.Day

Methods

fmap :: (a -> b) -> Day f g a -> Day f g b #

(<$) :: a -> Day f g b -> Day f g a #

Functor g => Functor (Curried g h) 
Instance details

Defined in Data.Functor.Day.Curried

Methods

fmap :: (a -> b) -> Curried g h a -> Curried g h b #

(<$) :: a -> Curried g h b -> Curried g h a #

Functor (Context a b) 
Instance details

Defined in Control.Lens.Internal.Context

Methods

fmap :: (a0 -> b0) -> Context a b a0 -> Context a b b0 #

(<$) :: a0 -> Context a b b0 -> Context a b a0 #

Functor f => Functor (AlongsideLeft f b) 
Instance details

Defined in Control.Lens.Internal.Getter

Methods

fmap :: (a -> b0) -> AlongsideLeft f b a -> AlongsideLeft f b b0 #

(<$) :: a -> AlongsideLeft f b b0 -> AlongsideLeft f b a #

Functor f => Functor (AlongsideRight f a) 
Instance details

Defined in Control.Lens.Internal.Getter

Methods

fmap :: (a0 -> b) -> AlongsideRight f a a0 -> AlongsideRight f a b #

(<$) :: a0 -> AlongsideRight f a b -> AlongsideRight f a a0 #

Functor (Indexed i a) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

fmap :: (a0 -> b) -> Indexed i a a0 -> Indexed i a b #

(<$) :: a0 -> Indexed i a b -> Indexed i a a0 #

Functor (Flows i b) 
Instance details

Defined in Control.Lens.Internal.Level

Methods

fmap :: (a -> b0) -> Flows i b a -> Flows i b b0 #

(<$) :: a -> Flows i b b0 -> Flows i b a #

Functor (Mafic a b) 
Instance details

Defined in Control.Lens.Internal.Magma

Methods

fmap :: (a0 -> b0) -> Mafic a b a0 -> Mafic a b b0 #

(<$) :: a0 -> Mafic a b b0 -> Mafic a b a0 #

Functor (Effect m r) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

fmap :: (a -> b) -> Effect m r a -> Effect m r b #

(<$) :: a -> Effect m r b -> Effect m r a #

Monad m => Functor (Focusing m s) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

fmap :: (a -> b) -> Focusing m s a -> Focusing m s b #

(<$) :: a -> Focusing m s b -> Focusing m s a #

Functor (k (May s)) => Functor (FocusingMay k s) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

fmap :: (a -> b) -> FocusingMay k s a -> FocusingMay k s b #

(<$) :: a -> FocusingMay k s b -> FocusingMay k s a #

Functor (ReifiedIndexedFold i s) 
Instance details

Defined in Control.Lens.Reified

Methods

fmap :: (a -> b) -> ReifiedIndexedFold i s a -> ReifiedIndexedFold i s b #

(<$) :: a -> ReifiedIndexedFold i s b -> ReifiedIndexedFold i s a #

Functor (ReifiedIndexedGetter i s) 
Instance details

Defined in Control.Lens.Reified

Methods

fmap :: (a -> b) -> ReifiedIndexedGetter i s a -> ReifiedIndexedGetter i s b #

(<$) :: a -> ReifiedIndexedGetter i s b -> ReifiedIndexedGetter i s a #

Functor (Holes t m) 
Instance details

Defined in Control.Lens.Traversal

Methods

fmap :: (a -> b) -> Holes t m a -> Holes t m b #

(<$) :: a -> Holes t m b -> Holes t m a #

Monad m => Functor (Handler e m) 
Instance details

Defined in Control.Monad.Error.Lens

Methods

fmap :: (a -> b) -> Handler e m a -> Handler e m b #

(<$) :: a -> Handler e m b -> Handler e m a #

Functor (Reply e s) 
Instance details

Defined in Text.Megaparsec.Internal

Methods

fmap :: (a -> b) -> Reply e s a -> Reply e s b #

(<$) :: a -> Reply e s b -> Reply e s a #

Functor (Result s e) 
Instance details

Defined in Text.Megaparsec.Internal

Methods

fmap :: (a -> b) -> Result s e a -> Result s e b #

(<$) :: a -> Result s e b -> Result s e 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 (Reply s u) 
Instance details

Defined in Text.Parsec.Prim

Methods

fmap :: (a -> b) -> Reply s u a -> Reply s u b #

(<$) :: a -> Reply s u b -> Reply s u a #

Functor (StackMachine output style) 
Instance details

Defined in Prettyprinter.Render.Util.StackMachine

Methods

fmap :: (a -> b) -> StackMachine output style a -> StackMachine output style b #

(<$) :: a -> StackMachine output style b -> StackMachine output style a #

Functor (CopastroSum p a) 
Instance details

Defined in Data.Profunctor.Choice

Methods

fmap :: (a0 -> b) -> CopastroSum p a a0 -> CopastroSum p a b #

(<$) :: a0 -> CopastroSum p a b -> CopastroSum p a a0 #

Functor (CotambaraSum p a) 
Instance details

Defined in Data.Profunctor.Choice

Methods

fmap :: (a0 -> b) -> CotambaraSum p a a0 -> CotambaraSum p a b #

(<$) :: a0 -> CotambaraSum p a b -> CotambaraSum p a a0 #

Functor (PastroSum p a) 
Instance details

Defined in Data.Profunctor.Choice

Methods

fmap :: (a0 -> b) -> PastroSum p a a0 -> PastroSum p a b #

(<$) :: a0 -> PastroSum p a b -> PastroSum p a a0 #

Profunctor p => Functor (TambaraSum p a) 
Instance details

Defined in Data.Profunctor.Choice

Methods

fmap :: (a0 -> b) -> TambaraSum p a a0 -> TambaraSum p a b #

(<$) :: a0 -> TambaraSum p a b -> TambaraSum p a a0 #

Profunctor p => Functor (Closure p a) 
Instance details

Defined in Data.Profunctor.Closed

Methods

fmap :: (a0 -> b) -> Closure p a a0 -> Closure p a b #

(<$) :: a0 -> Closure p a b -> Closure p a a0 #

Functor (Environment p a) 
Instance details

Defined in Data.Profunctor.Closed

Methods

fmap :: (a0 -> b) -> Environment p a a0 -> Environment p a b #

(<$) :: a0 -> Environment p a b -> Environment p a a0 #

Functor (Bar t b) 
Instance details

Defined in Data.Profunctor.Mapping

Methods

fmap :: (a -> b0) -> Bar t b a -> Bar t b b0 #

(<$) :: a -> Bar t b b0 -> Bar t b a #

Functor (FreeMapping p a) 
Instance details

Defined in Data.Profunctor.Mapping

Methods

fmap :: (a0 -> b) -> FreeMapping p a a0 -> FreeMapping p a b #

(<$) :: a0 -> FreeMapping p a b -> FreeMapping p a a0 #

Profunctor p => Functor (Coprep p) 
Instance details

Defined in Data.Profunctor.Rep

Methods

fmap :: (a -> b) -> Coprep p a -> Coprep p b #

(<$) :: a -> Coprep p b -> Coprep p a #

Profunctor p => Functor (Prep p) 
Instance details

Defined in Data.Profunctor.Rep

Methods

fmap :: (a -> b) -> Prep p a -> Prep p b #

(<$) :: a -> Prep p b -> Prep p a #

Functor (Copastro p a) 
Instance details

Defined in Data.Profunctor.Strong

Methods

fmap :: (a0 -> b) -> Copastro p a a0 -> Copastro p a b #

(<$) :: a0 -> Copastro p a b -> Copastro p a a0 #

Functor (Cotambara p a) 
Instance details

Defined in Data.Profunctor.Strong

Methods

fmap :: (a0 -> b) -> Cotambara p a a0 -> Cotambara p a b #

(<$) :: a0 -> Cotambara p a b -> Cotambara p a a0 #

Functor (Pastro p a) 
Instance details

Defined in Data.Profunctor.Strong

Methods

fmap :: (a0 -> b) -> Pastro p a a0 -> Pastro p a b #

(<$) :: a0 -> Pastro p a b -> Pastro p a a0 #

Profunctor p => Functor (Tambara p a) 
Instance details

Defined in Data.Profunctor.Strong

Methods

fmap :: (a0 -> b) -> Tambara p a a0 -> Tambara p a b #

(<$) :: a0 -> Tambara p a b -> Tambara p a a0 #

Functor (Baz t b) 
Instance details

Defined in Data.Profunctor.Traversing

Methods

fmap :: (a -> b0) -> Baz t b a -> Baz t b b0 #

(<$) :: a -> Baz t b b0 -> Baz t b a #

Functor (Bazaar a b) 
Instance details

Defined in Data.Profunctor.Traversing

Methods

fmap :: (a0 -> b0) -> Bazaar a b a0 -> Bazaar a b b0 #

(<$) :: a0 -> Bazaar a b b0 -> Bazaar a b a0 #

Functor (FreeTraversing p a) 
Instance details

Defined in Data.Profunctor.Traversing

Methods

fmap :: (a0 -> b) -> FreeTraversing p a a0 -> FreeTraversing p a b #

(<$) :: a0 -> FreeTraversing p a b -> FreeTraversing p a a0 #

Functor (Coyoneda p a) 
Instance details

Defined in Data.Profunctor.Yoneda

Methods

fmap :: (a0 -> b) -> Coyoneda p a a0 -> Coyoneda p a b #

(<$) :: a0 -> Coyoneda p a b -> Coyoneda p a a0 #

Functor (Yoneda p a) 
Instance details

Defined in Data.Profunctor.Yoneda

Methods

fmap :: (a0 -> b) -> Yoneda p a a0 -> Yoneda p a b #

(<$) :: a0 -> Yoneda p a b -> Yoneda p a a0 #

Functor f => Functor (Static f a) 
Instance details

Defined in Data.Semigroupoid.Static

Methods

fmap :: (a0 -> b) -> Static f a a0 -> Static f a b #

(<$) :: a0 -> Static f a b -> Static f a a0 #

Functor (Tagged s) 
Instance details

Defined in Data.Tagged

Methods

fmap :: (a -> b) -> Tagged s a -> Tagged s b #

(<$) :: a -> Tagged s b -> Tagged s a #

(Functor f, Functor g) => Functor (These1 f g) 
Instance details

Defined in Data.Functor.These

Methods

fmap :: (a -> b) -> These1 f g a -> These1 f g b #

(<$) :: a -> These1 f g b -> These1 f g a #

Functor f => Functor (Backwards f) 
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 (Peat a b) 
Instance details

Defined in Data.Witherable

Methods

fmap :: (a0 -> b0) -> Peat a b a0 -> Peat a b b0 #

(<$) :: a0 -> Peat a b b0 -> Peat a b a0 #

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) #

(Adjunction f g, Functor w) => Functor (AdjointT f g w) 
Instance details

Defined in Control.Comonad.Trans.Adjoint

Methods

fmap :: (a -> b) -> AdjointT f g w a -> AdjointT f g w b #

(<$) :: a -> AdjointT f g w b -> AdjointT f g w a #

(Adjunction f g, Monad m) => Functor (AdjointT f g m) 
Instance details

Defined in Control.Monad.Trans.Adjoint

Methods

fmap :: (a -> b) -> AdjointT f g m a -> AdjointT f g m b #

(<$) :: a -> AdjointT f g m b -> AdjointT f g m a #

(Adjunction f g, Functor w) => Functor (AdjointT f g w) 
Instance details

Defined in Control.Monad.Trans.Contravariant.Adjoint

Methods

fmap :: (a -> b) -> AdjointT f g w a -> AdjointT f g w b #

(<$) :: a -> AdjointT f g w b -> AdjointT f g w a #

Functor w => Functor (ContsT r w m) 
Instance details

Defined in Control.Monad.Trans.Conts

Methods

fmap :: (a -> b) -> ContsT r w m a -> ContsT r w m b #

(<$) :: a -> ContsT r w m b -> ContsT r w m a #

(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 (Cokleisli w a) 
Instance details

Defined in Control.Comonad

Methods

fmap :: (a0 -> b) -> Cokleisli w a a0 -> Cokleisli w a b #

(<$) :: a0 -> Cokleisli w a b -> Cokleisli w a a0 #

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 w => Functor (CoT w m) 
Instance details

Defined in Control.Monad.Co

Methods

fmap :: (a -> b) -> CoT w m a -> CoT w m b #

(<$) :: a -> CoT w m b -> CoT w m a #

Functor (Codensity k) 
Instance details

Defined in Control.Monad.Codensity

Methods

fmap :: (a -> b) -> Codensity k a -> Codensity k b #

(<$) :: a -> Codensity k b -> Codensity k a #

Functor (Lan f g) 
Instance details

Defined in Data.Functor.Kan.Lan

Methods

fmap :: (a -> b) -> Lan f g a -> Lan f g b #

(<$) :: a -> Lan f g b -> Lan f g a #

Functor (Ran g h) 
Instance details

Defined in Data.Functor.Kan.Ran

Methods

fmap :: (a -> b) -> Ran g h a -> Ran g h b #

(<$) :: a -> Ran g h b -> Ran g h a #

Functor (Bazaar p a b) 
Instance details

Defined in Control.Lens.Internal.Bazaar

Methods

fmap :: (a0 -> b0) -> Bazaar p a b a0 -> Bazaar p a b b0 #

(<$) :: a0 -> Bazaar p a b b0 -> Bazaar p a b a0 #

Functor (Bazaar1 p a b) 
Instance details

Defined in Control.Lens.Internal.Bazaar

Methods

fmap :: (a0 -> b0) -> Bazaar1 p a b a0 -> Bazaar1 p a b b0 #

(<$) :: a0 -> Bazaar1 p a b b0 -> Bazaar1 p a b a0 #

Functor (Pretext p a b) 
Instance details

Defined in Control.Lens.Internal.Context

Methods

fmap :: (a0 -> b0) -> Pretext p a b a0 -> Pretext p a b b0 #

(<$) :: a0 -> Pretext p a b b0 -> Pretext p a b a0 #

Functor (Exchange a b s) 
Instance details

Defined in Control.Lens.Internal.Iso

Methods

fmap :: (a0 -> b0) -> Exchange a b s a0 -> Exchange a b s b0 #

(<$) :: a0 -> Exchange a b s b0 -> Exchange a b s a0 #

Functor (Magma i t b) 
Instance details

Defined in Control.Lens.Internal.Magma

Methods

fmap :: (a -> b0) -> Magma i t b a -> Magma i t b b0 #

(<$) :: a -> Magma i t b b0 -> Magma i t b a #

Functor (Molten i a b) 
Instance details

Defined in Control.Lens.Internal.Magma

Methods

fmap :: (a0 -> b0) -> Molten i a b a0 -> Molten i a b b0 #

(<$) :: a0 -> Molten i a b b0 -> Molten i a b a0 #

Functor (Market a b s) 
Instance details

Defined in Control.Lens.Internal.Prism

Methods

fmap :: (a0 -> b0) -> Market a b s a0 -> Market a b s b0 #

(<$) :: a0 -> Market a b s b0 -> Market a b s a0 #

Functor (k (Err e s)) => Functor (FocusingErr e k s) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

fmap :: (a -> b) -> FocusingErr e k s a -> FocusingErr e k s b #

(<$) :: a -> FocusingErr e k s b -> FocusingErr e k s a #

Functor (k (f s)) => Functor (FocusingOn f k s) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

fmap :: (a -> b) -> FocusingOn f k s a -> FocusingOn f k s b #

(<$) :: a -> FocusingOn f k s b -> FocusingOn f k s a #

Functor (k (s, w)) => Functor (FocusingPlus w k s) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

fmap :: (a -> b) -> FocusingPlus w k s a -> FocusingPlus w k s b #

(<$) :: a -> FocusingPlus w k s b -> FocusingPlus w k s a #

Monad m => Functor (FocusingWith w m s) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

fmap :: (a -> b) -> FocusingWith w m s a -> FocusingWith w m s b #

(<$) :: a -> FocusingWith w m s b -> FocusingWith w m s a #

Functor (ParsecT e s m) 
Instance details

Defined in Text.Megaparsec.Internal

Methods

fmap :: (a -> b) -> ParsecT e s m a -> ParsecT e s m b #

(<$) :: a -> ParsecT e s m b -> ParsecT e s m a #

Functor (ParsecT s u m) 
Instance details

Defined in Text.Parsec.Prim

Methods

fmap :: (a -> b) -> ParsecT s u m a -> ParsecT s u m b #

(<$) :: a -> ParsecT s u m b -> ParsecT s u m a #

Functor (Costar f a) 
Instance details

Defined in Data.Profunctor.Types

Methods

fmap :: (a0 -> b) -> Costar f a a0 -> Costar f a b #

(<$) :: a0 -> Costar f a b -> Costar f a a0 #

Functor (Forget r a :: Type -> Type) 
Instance details

Defined in Data.Profunctor.Types

Methods

fmap :: (a0 -> b) -> Forget r a a0 -> Forget r a b #

(<$) :: a0 -> Forget r a b -> Forget r a a0 #

Functor f => Functor (Star f a) 
Instance details

Defined in Data.Profunctor.Types

Methods

fmap :: (a0 -> b) -> Star f a a0 -> Star f a b #

(<$) :: a0 -> Star f a b -> Star f a a0 #

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 (Clown f a :: Type -> Type) 
Instance details

Defined in Data.Bifunctor.Clown

Methods

fmap :: (a0 -> b) -> Clown f a a0 -> Clown f a b #

(<$) :: a0 -> Clown f a b -> Clown f a a0 #

Bifunctor p => Functor (Flip p a) 
Instance details

Defined in Data.Bifunctor.Flip

Methods

fmap :: (a0 -> b) -> Flip p a a0 -> Flip p a b #

(<$) :: a0 -> Flip p a b -> Flip p a a0 #

Functor g => Functor (Joker g a) 
Instance details

Defined in Data.Bifunctor.Joker

Methods

fmap :: (a0 -> b) -> Joker g a a0 -> Joker g a b #

(<$) :: a0 -> Joker g a b -> Joker g a a0 #

Bifunctor p => Functor (WrappedBifunctor p a) 
Instance details

Defined in Data.Bifunctor.Wrapped

Methods

fmap :: (a0 -> b) -> WrappedBifunctor p a a0 -> WrappedBifunctor p a b #

(<$) :: a0 -> WrappedBifunctor p a b -> WrappedBifunctor p a a0 #

Functor f => Functor (WhenMatched f k x y) 
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 (BazaarT p g a b) 
Instance details

Defined in Control.Lens.Internal.Bazaar

Methods

fmap :: (a0 -> b0) -> BazaarT p g a b a0 -> BazaarT p g a b b0 #

(<$) :: a0 -> BazaarT p g a b b0 -> BazaarT p g a b a0 #

Functor (BazaarT1 p g a b) 
Instance details

Defined in Control.Lens.Internal.Bazaar

Methods

fmap :: (a0 -> b0) -> BazaarT1 p g a b a0 -> BazaarT1 p g a b b0 #

(<$) :: a0 -> BazaarT1 p g a b b0 -> BazaarT1 p g a b a0 #

Functor (PretextT p g a b) 
Instance details

Defined in Control.Lens.Internal.Context

Methods

fmap :: (a0 -> b0) -> PretextT p g a b a0 -> PretextT p g a b b0 #

(<$) :: a0 -> PretextT p g a b b0 -> PretextT p g a b a0 #

Functor (TakingWhile p f a b) 
Instance details

Defined in Control.Lens.Internal.Magma

Methods

fmap :: (a0 -> b0) -> TakingWhile p f a b a0 -> TakingWhile p f a b b0 #

(<$) :: a0 -> TakingWhile p f a b b0 -> TakingWhile p f a b a0 #

Functor (EffectRWS w st m s) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

fmap :: (a -> b) -> EffectRWS w st m s a -> EffectRWS w st m s b #

(<$) :: a -> EffectRWS w st m s b -> EffectRWS w st m s a #

Functor (k (Freed f m s)) => Functor (FocusingFree f m k s) 
Instance details

Defined in Control.Lens.Internal.Zoom

Methods

fmap :: (a -> b) -> FocusingFree f m k s a -> FocusingFree f m k s b #

(<$) :: a -> FocusingFree f m k s b -> FocusingFree f m k s a #

Profunctor p => Functor (Codensity p a) 
Instance details

Defined in Data.Profunctor.Ran

Methods

fmap :: (a0 -> b) -> Codensity p a a0 -> Codensity p a b #

(<$) :: a0 -> Codensity p a b -> Codensity p a a0 #

Reifies s (ReifiedApplicative f) => Functor (ReflectedApplicative f s) 
Instance details

Defined in Data.Reflection

Methods

fmap :: (a -> b) -> ReflectedApplicative f s a -> ReflectedApplicative f s b #

(<$) :: a -> ReflectedApplicative f s b -> ReflectedApplicative f s a #

Functor 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 #

(Functor (f a), Functor (g a)) => Functor (Product f g a) 
Instance details

Defined in Data.Bifunctor.Product

Methods

fmap :: (a0 -> b) -> Product f g a a0 -> Product f g a b #

(<$) :: a0 -> Product f g a b -> Product f g a a0 #

(Functor (f a), Functor (g a)) => Functor (Sum f g a) 
Instance details

Defined in Data.Bifunctor.Sum

Methods

fmap :: (a0 -> b) -> Sum f g a a0 -> Sum f g a b #

(<$) :: a0 -> Sum f g a b -> Sum f g a a0 #

Monad m => Functor (Pipe l i o u m) 
Instance details

Defined in Data.Conduit.Internal.Pipe

Methods

fmap :: (a -> b) -> Pipe l i o u m a -> Pipe l i o u m b #

(<$) :: a -> Pipe l i o u m b -> Pipe l i o u m a #

Functor ((,,,,,) a b c d e) 
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 f, Bifunctor p) => Functor (Tannen f p a) 
Instance details

Defined in Data.Bifunctor.Tannen

Methods

fmap :: (a0 -> b) -> Tannen f p a a0 -> Tannen f p a b #

(<$) :: a0 -> Tannen f p a b -> Tannen f p a a0 #

Profunctor p => Functor (Procompose p q a) 
Instance details

Defined in Data.Profunctor.Composition

Methods

fmap :: (a0 -> b) -> Procompose p q a a0 -> Procompose p q a b #

(<$) :: a0 -> Procompose p q a b -> Procompose p q a a0 #

Profunctor p => Functor (Rift p q a) 
Instance details

Defined in Data.Profunctor.Composition

Methods

fmap :: (a0 -> b) -> Rift p q a a0 -> Rift p q a b #

(<$) :: a0 -> Rift p q a b -> Rift p q a a0 #

Profunctor q => Functor (Ran p q a) 
Instance details

Defined in Data.Profunctor.Ran

Methods

fmap :: (a0 -> b) -> Ran p q a a0 -> Ran p q a b #

(<$) :: a0 -> Ran p q a b -> Ran p q a 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) #

(Bifunctor p, Functor g) => Functor (Biff p f g a) 
Instance details

Defined in Data.Bifunctor.Biff

Methods

fmap :: (a0 -> b) -> Biff p f g a a0 -> Biff p f g a b #

(<$) :: a0 -> Biff p f g a b -> Biff p f g a a0 #

class 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

Methods

minBound :: Int16 #

maxBound :: Int16 #

Bounded Int32 
Instance details

Defined in GHC.Int

Bounded Int64 
Instance details

Defined in GHC.Int

Bounded Int8 
Instance details

Defined in GHC.Int

Methods

minBound :: Int8 #

maxBound :: Int8 #

Bounded GeneralCategory 
Instance details

Defined in GHC.Unicode

Methods

minBound :: GeneralCategory #

maxBound :: GeneralCategory #

Bounded Word16 
Instance details

Defined in GHC.Word

Methods

minBound :: Word16 #

maxBound :: Word16 #

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 Word128 
Instance details

Defined in Basement.Types.Word128

Methods

minBound :: Word128 #

maxBound :: Word128 #

Bounded Word256 
Instance details

Defined in Basement.Types.Word256

Methods

minBound :: Word256 #

maxBound :: Word256 #

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 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 Extension 
Instance details

Defined in GHC.LanguageExtensions.Type

Methods

minBound :: Extension #

maxBound :: Extension #

Bounded Ordering 
Instance details

Defined in GHC.Enum

Bounded KnownExtension 
Instance details

Defined in Language.Haskell.Exts.Extension

Methods

minBound :: KnownExtension #

maxBound :: KnownExtension #

Bounded Month 
Instance details

Defined in Time.Types

Methods

minBound :: Month #

maxBound :: Month #

Bounded WeekDay 
Instance details

Defined in Time.Types

Methods

minBound :: WeekDay #

maxBound :: WeekDay #

Bounded StdMethod 
Instance details

Defined in Network.HTTP.Types.Method

Bounded Status 
Instance details

Defined in Network.HTTP.Types.Status

Methods

minBound :: Status #

maxBound :: Status #

Bounded IPv4 
Instance details

Defined in Net.IPv4

Methods

minBound :: IPv4 #

maxBound :: IPv4 #

Bounded IPv6 
Instance details

Defined in Net.IPv6

Methods

minBound :: IPv6 #

maxBound :: IPv6 #

Bounded Mac 
Instance details

Defined in Net.Mac

Methods

minBound :: Mac #

maxBound :: Mac #

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 PortNumber 
Instance details

Defined in Network.Socket.Types

Methods

minBound :: PortNumber #

maxBound :: PortNumber #

Bounded IPv4 
Instance details

Defined in Network.Info

Methods

minBound :: IPv4 #

maxBound :: IPv4 #

Bounded IPv6 
Instance details

Defined in Network.Info

Methods

minBound :: IPv6 #

maxBound :: IPv6 #

Bounded MAC 
Instance details

Defined in Network.Info

Methods

minBound :: MAC #

maxBound :: MAC #

Bounded Day 
Instance details

Defined in System.Time

Methods

minBound :: Day #

maxBound :: Day #

Bounded Month 
Instance details

Defined in System.Time

Methods

minBound :: Month #

maxBound :: Month #

Bounded IsolationLevel 
Instance details

Defined in Database.PostgreSQL.Simple.Transaction

Methods

minBound :: IsolationLevel #

maxBound :: IsolationLevel #

Bounded ReadWriteMode 
Instance details

Defined in Database.PostgreSQL.Simple.Transaction

Methods

minBound :: ReadWriteMode #

maxBound :: ReadWriteMode #

Bounded Undefined 
Instance details

Defined in Relude.Debug

Methods

minBound :: Undefined #

maxBound :: Undefined #

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 Int128 
Instance details

Defined in Data.WideWord.Int128

Methods

minBound :: Int128 #

maxBound :: Int128 #

Bounded Word128 
Instance details

Defined in Data.WideWord.Word128

Methods

minBound :: Word128 #

maxBound :: Word128 #

Bounded Word256 
Instance details

Defined in Data.WideWord.Word256

Methods

minBound :: Word256 #

maxBound :: Word256 #

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

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 #

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 #

(Biapplicative bi, Bounded a, Bounded b) => Bounded (Biap bi a b) 
Instance details

Defined in Data.Bifunctor.Biap

Methods

minBound :: Biap bi a b #

maxBound :: Biap bi 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) #

data SomeException #

Instances

Instances details
Exception SomeException 
Instance details

Defined in GHC.Exception.Type

Show SomeException 
Instance details

Defined in GHC.Exception.Type

Methods

showsPrec :: Int -> SomeException -> ShowS #

show :: SomeException -> String

showList :: [SomeException] -> ShowS #

AsAllocationLimitExceeded SomeException 
Instance details

Defined in Control.Exception.Lens

Methods

__AllocationLimitExceeded :: Prism' SomeException AllocationLimitExceeded

_AllocationLimitExceeded :: Prism' SomeException ()

AsArithException SomeException 
Instance details

Defined in Control.Exception.Lens

Methods

_ArithException :: Prism' SomeException ArithException

AsArrayException SomeException 
Instance details

Defined in Control.Exception.Lens

Methods

_ArrayException :: Prism' SomeException ArrayException

AsAssertionFailed SomeException 
Instance details

Defined in Control.Exception.Lens

Methods

__AssertionFailed :: Prism' SomeException AssertionFailed

_AssertionFailed :: Prism' SomeException String

AsAsyncException SomeException 
Instance details

Defined in Control.Exception.Lens

Methods

_AsyncException :: Prism' SomeException AsyncException

AsBlockedIndefinitelyOnMVar SomeException 
Instance details

Defined in Control.Exception.Lens

Methods

__BlockedIndefinitelyOnMVar :: Prism' SomeException BlockedIndefinitelyOnMVar

_BlockedIndefinitelyOnMVar :: Prism' SomeException ()

AsBlockedIndefinitelyOnSTM SomeException 
Instance details

Defined in Control.Exception.Lens

Methods

__BlockedIndefinitelyOnSTM :: Prism' SomeException BlockedIndefinitelyOnSTM

_BlockedIndefinitelyOnSTM :: Prism' SomeException ()

AsCompactionFailed SomeException 
Instance details

Defined in Control.Exception.Lens

Methods

__CompactionFailed :: Prism' SomeException CompactionFailed

_CompactionFailed :: Prism' SomeException String

AsDeadlock SomeException 
Instance details

Defined in Control.Exception.Lens

Methods

__Deadlock :: Prism' SomeException Deadlock

_Deadlock :: Prism' SomeException ()

AsErrorCall SomeException 
Instance details

Defined in Control.Exception.Lens

Methods

__ErrorCall :: Prism' SomeException ErrorCall

_ErrorCall :: Prism' SomeException String

AsHandlingException SomeException 
Instance details

Defined in Control.Exception.Lens

Methods

__HandlingException :: Prism' SomeException HandlingException

_HandlingException :: Prism' SomeException ()

AsIOException SomeException 
Instance details

Defined in Control.Exception.Lens

AsNestedAtomically SomeException 
Instance details

Defined in Control.Exception.Lens

Methods

__NestedAtomically :: Prism' SomeException NestedAtomically

_NestedAtomically :: Prism' SomeException ()

AsNoMethodError SomeException 
Instance details

Defined in Control.Exception.Lens

Methods

__NoMethodError :: Prism' SomeException NoMethodError

_NoMethodError :: Prism' SomeException String

AsNonTermination SomeException 
Instance details

Defined in Control.Exception.Lens

Methods

__NonTermination :: Prism' SomeException NonTermination

_NonTermination :: Prism' SomeException ()

AsPatternMatchFail SomeException 
Instance details

Defined in Control.Exception.Lens

Methods

__PatternMatchFail :: Prism' SomeException PatternMatchFail

_PatternMatchFail :: Prism' SomeException String

AsRecConError SomeException 
Instance details

Defined in Control.Exception.Lens

Methods

__RecConError :: Prism' SomeException RecConError

_RecConError :: Prism' SomeException String

AsRecSelError SomeException 
Instance details

Defined in Control.Exception.Lens

Methods

__RecSelError :: Prism' SomeException RecSelError

_RecSelError :: Prism' SomeException String

AsRecUpdError SomeException 
Instance details

Defined in Control.Exception.Lens

Methods

__RecUpdError :: Prism' SomeException RecUpdError

_RecUpdError :: Prism' SomeException String

AsTypeError SomeException 
Instance details

Defined in Control.Exception.Lens

Methods

__TypeError :: Prism' SomeException TypeError

_TypeError :: Prism' SomeException String

AsDynamic SomeException 
Instance details

Defined in Data.Dynamic.Lens

Methods

_Dynamic :: Typeable a => Prism' SomeException a

AsExitCode SomeException 
Instance details

Defined in System.Exit.Lens

Methods

_ExitCode :: Prism' SomeException ExitCode

Handleable SomeException IO Handler 
Instance details

Defined in Control.Lens.Internal.Exception

Methods

handler :: Typeable a => Getting (First a) SomeException a -> (a -> IO r) -> Handler r

handler_ :: Typeable a => Getting (First a) SomeException a -> IO r -> Handler r

Typeable m => Handleable SomeException m (Handler m) 
Instance details

Defined in Control.Lens.Internal.Exception

Methods

handler :: Typeable a => Getting (First a) SomeException a -> (a -> m r) -> Handler m r

handler_ :: Typeable a => Getting (First a) SomeException a -> m r -> Handler m r

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 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 IOErrorType #

Instances

Instances details
Show IOErrorType 
Instance details

Defined in GHC.IO.Exception

Methods

showsPrec :: Int -> IOErrorType -> ShowS #

show :: IOErrorType -> String

showList :: [IOErrorType] -> ShowS #

Eq IOErrorType 
Instance details

Defined in GHC.IO.Exception

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 #

Eq IOException 
Instance details

Defined in GHC.IO.Exception

AsIOException IOException 
Instance details

Defined in Control.Exception.Lens

MonadError IOException IO 
Instance details

Defined in Control.Monad.Error.Class

Methods

throwError :: IOException -> IO a

catchError :: IO a -> (IOException -> IO a) -> IO a

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

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 SaneDouble 
Instance details

Defined in GHC.Types.SaneDouble

Methods

(/) :: SaneDouble -> SaneDouble -> SaneDouble #

recip :: SaneDouble -> SaneDouble #

fromRational :: Rational -> SaneDouble #

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

Fractional NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.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, 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 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

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 #

type LText = Text #

type SVector = Vector #

type UVector = Vector #

unzip :: [(a, b)] -> ([a], [b]) #

zip :: [a] -> [b] -> [(a, b)] #

zipWith :: (a -> b -> c) -> [a] -> [b] -> [c] #

unzip3 :: [(a, b, c)] -> ([a], [b], [c]) #

zip3 :: [a] -> [b] -> [c] -> [(a, b, c)] #

zipWith3 :: (a -> b -> c -> d) -> [a] -> [b] -> [c] -> [d] #

unzip4 :: [(a, b, c, d)] -> ([a], [b], [c], [d]) #

zip4 :: [a] -> [b] -> [c] -> [d] -> [(a, b, c, d)] #

zipWith4 :: (a -> b -> c -> d -> e) -> [a] -> [b] -> [c] -> [d] -> [e] #

unzip5 :: [(a, b, c, d, e)] -> ([a], [b], [c], [d], [e]) #

zip5 :: [a] -> [b] -> [c] -> [d] -> [e] -> [(a, b, c, d, e)] #

zipWith5 :: (a -> b -> c -> d -> e -> f) -> [a] -> [b] -> [c] -> [d] -> [e] -> [f] #

unzip6 :: [(a, b, c, d, e, f)] -> ([a], [b], [c], [d], [e], [f]) #

zip6 :: [a] -> [b] -> [c] -> [d] -> [e] -> [f] -> [(a, b, c, d, e, f)] #

zipWith6 :: (a -> b -> c -> d -> e -> f -> g) -> [a] -> [b] -> [c] -> [d] -> [e] -> [f] -> [g] #

unzip7 :: [(a, b, c, d, e, f, g)] -> ([a], [b], [c], [d], [e], [f], [g]) #

zip7 :: [a] -> [b] -> [c] -> [d] -> [e] -> [f] -> [g] -> [(a, b, c, d, e, f, g)] #

zipWith7 :: (a -> b -> c -> d -> e -> f -> g -> h) -> [a] -> [b] -> [c] -> [d] -> [e] -> [f] -> [g] -> [h] #

data IntMap a #

Instances

Instances details
Arbitrary1 IntMap 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitrary :: Gen a -> Gen (IntMap a)

liftShrink :: (a -> [a]) -> IntMap a -> [IntMap a]

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 #

Zip IntMap 
Instance details

Defined in Data.ChunkedZip

Methods

zipWith :: (a -> b -> c) -> IntMap a -> IntMap b -> IntMap c #

zip :: IntMap a -> IntMap b -> IntMap (a, b) #

zap :: IntMap (a -> b) -> IntMap a -> IntMap b

unzip :: IntMap (a, b) -> (IntMap a, IntMap b) #

TrieMap IntMap 
Instance details

Defined in GHC.Data.TrieMap

Associated Types

type Key IntMap 
Instance details

Defined in GHC.Data.TrieMap

type Key IntMap = Int

Methods

emptyTM :: IntMap a

lookupTM :: Key IntMap -> IntMap b -> Maybe b

alterTM :: Key IntMap -> XT b -> IntMap b -> IntMap b

filterTM :: (a -> Bool) -> IntMap a -> IntMap a

foldTM :: (a -> b -> b) -> IntMap a -> b -> b

Hashable1 IntMap 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> IntMap a -> Int

Invariant IntMap 
Instance details

Defined in Data.Functor.Invariant

Methods

invmap :: (a -> b) -> (b -> a) -> IntMap a -> IntMap b

Adjustable IntMap 
Instance details

Defined in Data.Key

Methods

adjust :: (a -> a) -> Key IntMap -> IntMap a -> IntMap a

replace :: Key IntMap -> a -> IntMap a -> IntMap a

FoldableWithKey IntMap 
Instance details

Defined in Data.Key

Methods

toKeyedList :: IntMap a -> [(Key IntMap, a)]

foldMapWithKey :: Monoid m => (Key IntMap -> a -> m) -> IntMap a -> m

foldrWithKey :: (Key IntMap -> a -> b -> b) -> b -> IntMap a -> b

foldlWithKey :: (b -> Key IntMap -> a -> b) -> b -> IntMap a -> b

Indexable IntMap 
Instance details

Defined in Data.Key

Methods

index :: IntMap a -> Key IntMap -> a

Keyed IntMap 
Instance details

Defined in Data.Key

Methods

mapWithKey :: (Key IntMap -> a -> b) -> IntMap a -> IntMap b

Lookup IntMap 
Instance details

Defined in Data.Key

Methods

lookup :: Key IntMap -> IntMap a -> Maybe a

TraversableWithKey IntMap 
Instance details

Defined in Data.Key

Methods

traverseWithKey :: Applicative f => (Key IntMap -> a -> f b) -> IntMap a -> f (IntMap b)

mapWithKeyM :: Monad m => (Key IntMap -> a -> m b) -> IntMap a -> m (IntMap b)

Zip IntMap 
Instance details

Defined in Data.Key

Methods

zipWith :: (a -> b -> c) -> IntMap a -> IntMap b -> IntMap c

zip :: IntMap a -> IntMap b -> IntMap (a, b)

zap :: IntMap (a -> b) -> IntMap a -> IntMap b

ZipWithKey IntMap 
Instance details

Defined in Data.Key

Methods

zipWithKey :: (Key IntMap -> a -> b -> c) -> IntMap a -> IntMap b -> IntMap c

zapWithKey :: IntMap (Key IntMap -> a -> b) -> IntMap a -> IntMap b

PolyMap IntMap 
Instance details

Defined in Data.Containers

Methods

differenceMap :: IntMap value1 -> IntMap value2 -> IntMap value1 #

intersectionMap :: IntMap value1 -> IntMap value2 -> IntMap value1 #

intersectionWithMap :: (value1 -> value2 -> value3) -> IntMap value1 -> IntMap value2 -> IntMap value3 #

Alt IntMap 
Instance details

Defined in Data.Functor.Alt

Methods

(<!>) :: IntMap a -> IntMap a -> IntMap a

some :: Applicative IntMap => IntMap a -> IntMap [a]

many :: Applicative IntMap => IntMap a -> IntMap [a]

Apply IntMap 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(<.>) :: IntMap (a -> b) -> IntMap a -> IntMap b

(.>) :: IntMap a -> IntMap b -> IntMap b

(<.) :: IntMap a -> IntMap b -> IntMap a

liftF2 :: (a -> b -> c) -> IntMap a -> IntMap b -> IntMap c

Bind IntMap 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(>>-) :: IntMap a -> (a -> IntMap b) -> IntMap b

join :: IntMap (IntMap a) -> IntMap a

Plus IntMap 
Instance details

Defined in Data.Functor.Plus

Methods

zero :: IntMap a

Filterable IntMap 
Instance details

Defined in Witherable

Methods

mapMaybe :: (a -> Maybe b) -> IntMap a -> IntMap b

catMaybes :: IntMap (Maybe a) -> IntMap a

filter :: (a -> Bool) -> IntMap a -> IntMap a

Witherable IntMap 
Instance details

Defined in Witherable

Methods

wither :: Applicative f => (a -> f (Maybe b)) -> IntMap a -> f (IntMap b)

witherM :: Monad m => (a -> m (Maybe b)) -> IntMap a -> m (IntMap b)

filterA :: Applicative f => (a -> f Bool) -> IntMap a -> f (IntMap a)

witherMap :: Applicative m => (IntMap b -> r) -> (a -> m (Maybe b)) -> IntMap a -> m r

TraverseMax Int IntMap 
Instance details

Defined in Control.Lens.Traversal

Methods

traverseMax :: IndexedTraversal' Int (IntMap v) v

TraverseMin Int IntMap 
Instance details

Defined in Control.Lens.Traversal

Methods

traverseMin :: IndexedTraversal' Int (IntMap v) v

FilterableWithIndex Int IntMap 
Instance details

Defined in Witherable

Methods

imapMaybe :: (Int -> a -> Maybe b) -> IntMap a -> IntMap b

ifilter :: (Int -> a -> Bool) -> IntMap a -> IntMap a

WitherableWithIndex Int IntMap 
Instance details

Defined in Witherable

Methods

iwither :: Applicative f => (Int -> a -> f (Maybe b)) -> IntMap a -> f (IntMap b)

iwitherM :: Monad m => (Int -> a -> m (Maybe b)) -> IntMap a -> m (IntMap b)

ifilterA :: Applicative f => (Int -> a -> f Bool) -> IntMap a -> f (IntMap a)

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

Arbitrary a => Arbitrary (IntMap a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (IntMap a)

shrink :: IntMap a -> [IntMap a]

CoArbitrary a => CoArbitrary (IntMap a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: IntMap a -> Gen b -> Gen b

Function a => Function (IntMap a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (IntMap a -> b) -> IntMap a :-> b

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

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 #

Serialize e => Serialize (IntMap e) 
Instance details

Defined in Data.Serialize

Methods

put :: Putter (IntMap e)

get :: Get (IntMap e)

NFData a => NFData (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

rnf :: IntMap a -> () #

Outputable elt => Outputable (IntMap elt) 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: IntMap elt -> SDoc

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 #

At (IntMap a) 
Instance details

Defined in Control.Lens.At

Methods

at :: Index (IntMap a) -> Lens' (IntMap a) (Maybe (IxValue (IntMap a)))

Ixed (IntMap a) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (IntMap a) -> Traversal' (IntMap a) (IxValue (IntMap a))

AsEmpty (IntMap a) 
Instance details

Defined in Control.Lens.Empty

Methods

_Empty :: Prism' (IntMap a) ()

Wrapped (IntMap a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (IntMap a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (IntMap a) = [(Int, a)]

Methods

_Wrapped' :: Iso' (IntMap a) (Unwrapped (IntMap a))

HasKeysSet (IntMap v) 
Instance details

Defined in Data.Containers

Associated Types

type KeySet (IntMap v) 
Instance details

Defined in Data.Containers

type KeySet (IntMap v) = IntSet

Methods

keysSet :: IntMap v -> KeySet (IntMap v) #

IsMap (IntMap value) 
Instance details

Defined in Data.Containers

Associated Types

type MapValue (IntMap value) 
Instance details

Defined in Data.Containers

type MapValue (IntMap value) = value

Methods

lookup :: ContainerKey (IntMap value) -> IntMap value -> Maybe (MapValue (IntMap value)) #

insertMap :: ContainerKey (IntMap value) -> MapValue (IntMap value) -> IntMap value -> IntMap value #

deleteMap :: ContainerKey (IntMap value) -> IntMap value -> IntMap value #

singletonMap :: ContainerKey (IntMap value) -> MapValue (IntMap value) -> IntMap value #

mapFromList :: [(ContainerKey (IntMap value), MapValue (IntMap value))] -> IntMap value #

mapToList :: IntMap value -> [(ContainerKey (IntMap value), MapValue (IntMap value))] #

findWithDefault :: MapValue (IntMap value) -> ContainerKey (IntMap value) -> IntMap value -> MapValue (IntMap value) #

insertWith :: (MapValue (IntMap value) -> MapValue (IntMap value) -> MapValue (IntMap value)) -> ContainerKey (IntMap value) -> MapValue (IntMap value) -> IntMap value -> IntMap value #

insertWithKey :: (ContainerKey (IntMap value) -> MapValue (IntMap value) -> MapValue (IntMap value) -> MapValue (IntMap value)) -> ContainerKey (IntMap value) -> MapValue (IntMap value) -> IntMap value -> IntMap value #

insertLookupWithKey :: (ContainerKey (IntMap value) -> MapValue (IntMap value) -> MapValue (IntMap value) -> MapValue (IntMap value)) -> ContainerKey (IntMap value) -> MapValue (IntMap value) -> IntMap value -> (Maybe (MapValue (IntMap value)), IntMap value) #

adjustMap :: (MapValue (IntMap value) -> MapValue (IntMap value)) -> ContainerKey (IntMap value) -> IntMap value -> IntMap value #

adjustWithKey :: (ContainerKey (IntMap value) -> MapValue (IntMap value) -> MapValue (IntMap value)) -> ContainerKey (IntMap value) -> IntMap value -> IntMap value #

updateMap :: (MapValue (IntMap value) -> Maybe (MapValue (IntMap value))) -> ContainerKey (IntMap value) -> IntMap value -> IntMap value #

updateWithKey :: (ContainerKey (IntMap value) -> MapValue (IntMap value) -> Maybe (MapValue (IntMap value))) -> ContainerKey (IntMap value) -> IntMap value -> IntMap value #

updateLookupWithKey :: (ContainerKey (IntMap value) -> MapValue (IntMap value) -> Maybe (MapValue (IntMap value))) -> ContainerKey (IntMap value) -> IntMap value -> (Maybe (MapValue (IntMap value)), IntMap value) #

alterMap :: (Maybe (MapValue (IntMap value)) -> Maybe (MapValue (IntMap value))) -> ContainerKey (IntMap value) -> IntMap value -> IntMap value #

unionWith :: (MapValue (IntMap value) -> MapValue (IntMap value) -> MapValue (IntMap value)) -> IntMap value -> IntMap value -> IntMap value #

unionWithKey :: (ContainerKey (IntMap value) -> MapValue (IntMap value) -> MapValue (IntMap value) -> MapValue (IntMap value)) -> IntMap value -> IntMap value -> IntMap value #

unionsWith :: (MapValue (IntMap value) -> MapValue (IntMap value) -> MapValue (IntMap value)) -> [IntMap value] -> IntMap value #

mapWithKey :: (ContainerKey (IntMap value) -> MapValue (IntMap value) -> MapValue (IntMap value)) -> IntMap value -> IntMap value #

omapKeysWith :: (MapValue (IntMap value) -> MapValue (IntMap value) -> MapValue (IntMap value)) -> (ContainerKey (IntMap value) -> ContainerKey (IntMap value)) -> IntMap value -> IntMap value #

filterMap :: (MapValue (IntMap value) -> Bool) -> IntMap value -> IntMap value #

SetContainer (IntMap value) 
Instance details

Defined in Data.Containers

Associated Types

type ContainerKey (IntMap value) 
Instance details

Defined in Data.Containers

type ContainerKey (IntMap value) = Int

Methods

member :: ContainerKey (IntMap value) -> IntMap value -> Bool #

notMember :: ContainerKey (IntMap value) -> IntMap value -> Bool #

union :: IntMap value -> IntMap value -> IntMap value #

unions :: (MonoFoldable mono, Element mono ~ IntMap value) => mono -> IntMap value #

difference :: IntMap value -> IntMap value -> IntMap value #

intersection :: IntMap value -> IntMap value -> IntMap value #

keys :: IntMap value -> [ContainerKey (IntMap value)] #

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) #

One (IntMap v) 
Instance details

Defined in Relude.Container.One

Associated Types

type OneItem (IntMap v) 
Instance details

Defined in Relude.Container.One

type OneItem (IntMap v) = (Int, v)

Methods

one :: OneItem (IntMap v) -> IntMap v

DynamicMap (IntMap v) 
Instance details

Defined in Relude.Extra.Map

Methods

insert :: Key (IntMap v) -> Val (IntMap v) -> IntMap v -> IntMap v

insertWith :: (Val (IntMap v) -> Val (IntMap v) -> Val (IntMap v)) -> Key (IntMap v) -> Val (IntMap v) -> IntMap v -> IntMap v

delete :: Key (IntMap v) -> IntMap v -> IntMap v

alter :: (Maybe (Val (IntMap v)) -> Maybe (Val (IntMap v))) -> Key (IntMap v) -> IntMap v -> IntMap v

StaticMap (IntMap v) 
Instance details

Defined in Relude.Extra.Map

Associated Types

type Key (IntMap v) 
Instance details

Defined in Relude.Extra.Map

type Key (IntMap v) = Int
type Val (IntMap v) 
Instance details

Defined in Relude.Extra.Map

type Val (IntMap v) = v

Methods

size :: IntMap v -> Int

lookup :: Key (IntMap v) -> IntMap v -> Maybe (Val (IntMap v))

member :: Key (IntMap v) -> IntMap v -> Bool

t ~ IntMap a' => Rewrapped (IntMap a) t 
Instance details

Defined in Control.Lens.Wrapped

Each (IntMap a) (IntMap b) a b 
Instance details

Defined in Control.Lens.Each

Methods

each :: Traversal (IntMap a) (IntMap b) a b

type Key IntMap 
Instance details

Defined in GHC.Data.TrieMap

type Key IntMap = Int
type Key IntMap 
Instance details

Defined in Data.Key

type Key IntMap = Int
type Item (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

type Item (IntMap a) = (Key, a)
type Index (IntMap a) 
Instance details

Defined in Control.Lens.At

type Index (IntMap a) = Int
type IxValue (IntMap a) 
Instance details

Defined in Control.Lens.At

type IxValue (IntMap a) = a
type Unwrapped (IntMap a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (IntMap a) = [(Int, a)]
type ContainerKey (IntMap value) 
Instance details

Defined in Data.Containers

type ContainerKey (IntMap value) = Int
type KeySet (IntMap v) 
Instance details

Defined in Data.Containers

type KeySet (IntMap v) = IntSet
type MapValue (IntMap value) 
Instance details

Defined in Data.Containers

type MapValue (IntMap value) = value
type Element (IntMap a) 
Instance details

Defined in Data.MonoTraversable

type Element (IntMap a) = a
type OneItem (IntMap v) 
Instance details

Defined in Relude.Container.One

type OneItem (IntMap v) = (Int, v)
type Key (IntMap v) 
Instance details

Defined in Relude.Extra.Map

type Key (IntMap v) = Int
type Val (IntMap v) 
Instance details

Defined in Relude.Extra.Map

type Val (IntMap v) = v

data IntSet #

Instances

Instances details
Structured IntSet 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy IntSet -> Structure

structureHash' :: Tagged IntSet MD5

Arbitrary IntSet 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen IntSet

shrink :: IntSet -> [IntSet]

CoArbitrary IntSet 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: IntSet -> Gen b -> Gen b

Function IntSet 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (IntSet -> b) -> IntSet :-> b

FromJSON IntSet 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser IntSet #

parseJSONList :: Value -> Parser [IntSet] #

omittedField :: Maybe IntSet #

ToJSON IntSet 
Instance details

Defined in Data.Aeson.Types.ToJSON

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

Methods

(<>) :: IntSet -> IntSet -> IntSet #

sconcat :: NonEmpty IntSet -> IntSet #

stimes :: Integral b => b -> IntSet -> IntSet #

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 #

Serialize IntSet 
Instance details

Defined in Data.Serialize

Methods

put :: Putter IntSet

get :: Get IntSet

NFData IntSet 
Instance details

Defined in Data.IntSet.Internal

Methods

rnf :: IntSet -> () #

Outputable IntSet 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: IntSet -> SDoc

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 #

At IntSet 
Instance details

Defined in Control.Lens.At

Methods

at :: Index IntSet -> Lens' IntSet (Maybe (IxValue IntSet))

Contains IntSet 
Instance details

Defined in Control.Lens.At

Methods

contains :: Index IntSet -> Lens' IntSet Bool

Ixed IntSet 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index IntSet -> Traversal' IntSet (IxValue IntSet)

AsEmpty IntSet 
Instance details

Defined in Control.Lens.Empty

Methods

_Empty :: Prism' IntSet ()

Wrapped IntSet 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped IntSet 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped IntSet = [Int]

Methods

_Wrapped' :: Iso' IntSet (Unwrapped IntSet)

IsSet IntSet 
Instance details

Defined in Data.Containers

SetContainer IntSet 
Instance details

Defined in Data.Containers

Associated Types

type ContainerKey IntSet 
Instance details

Defined in Data.Containers

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

One IntSet 
Instance details

Defined in Relude.Container.One

Associated Types

type OneItem IntSet 
Instance details

Defined in Relude.Container.One

type OneItem IntSet = Int

Methods

one :: OneItem IntSet -> IntSet

StaticMap IntSet 
Instance details

Defined in Relude.Extra.Map

Associated Types

type Key IntSet 
Instance details

Defined in Relude.Extra.Map

type Key IntSet = Int
type Val IntSet 
Instance details

Defined in Relude.Extra.Map

type Val IntSet = Int

Methods

size :: IntSet -> Int

lookup :: Key IntSet -> IntSet -> Maybe (Val IntSet)

member :: Key IntSet -> IntSet -> Bool

t ~ IntSet => Rewrapped IntSet t 
Instance details

Defined in Control.Lens.Wrapped

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 Index IntSet 
Instance details

Defined in Control.Lens.At

type Index IntSet = Int
type IxValue IntSet 
Instance details

Defined in Control.Lens.At

type IxValue IntSet = ()
type Unwrapped IntSet 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped IntSet = [Int]
type ContainerKey IntSet 
Instance details

Defined in Data.Containers

type Element IntSet 
Instance details

Defined in Data.MonoTraversable

type OneItem IntSet 
Instance details

Defined in Relude.Container.One

type OneItem IntSet = Int
type Key IntSet 
Instance details

Defined in Relude.Extra.Map

type Key IntSet = Int
type Val IntSet 
Instance details

Defined in Relude.Extra.Map

type Val IntSet = Int

data Seq a #

Instances

Instances details
Arbitrary1 Seq 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

liftArbitrary :: Gen a -> Gen (Seq a)

liftShrink :: (a -> [a]) -> Seq a -> [Seq a]

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 #

Zip Seq 
Instance details

Defined in Data.ChunkedZip

Methods

zipWith :: (a -> b -> c) -> Seq a -> Seq b -> Seq c #

zip :: Seq a -> Seq b -> Seq (a, b) #

zap :: Seq (a -> b) -> Seq a -> Seq b

unzip :: Seq (a, b) -> (Seq a, Seq b) #

Zip3 Seq 
Instance details

Defined in Data.ChunkedZip

Methods

zipWith3 :: (a -> b -> c -> d) -> Seq a -> Seq b -> Seq c -> Seq d #

zip3 :: Seq a -> Seq b -> Seq c -> Seq (a, b, c) #

zap3 :: Seq (a -> b -> c) -> Seq a -> Seq b -> Seq c

unzip3 :: Seq (a, b, c) -> (Seq a, Seq b, Seq c) #

Zip4 Seq 
Instance details

Defined in Data.ChunkedZip

Methods

zipWith4 :: (a -> b -> c -> d -> e) -> Seq a -> Seq b -> Seq c -> Seq d -> Seq e #

zip4 :: Seq a -> Seq b -> Seq c -> Seq d -> Seq (a, b, c, d) #

zap4 :: Seq (a -> b -> c -> d) -> Seq a -> Seq b -> Seq c -> Seq d

unzip4 :: Seq (a, b, c, d) -> (Seq a, Seq b, Seq c, Seq d) #

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

Invariant Seq 
Instance details

Defined in Data.Functor.Invariant

Methods

invmap :: (a -> b) -> (b -> a) -> Seq a -> Seq b

Adjustable Seq 
Instance details

Defined in Data.Key

Methods

adjust :: (a -> a) -> Key Seq -> Seq a -> Seq a

replace :: Key Seq -> a -> Seq a -> Seq a

FoldableWithKey Seq 
Instance details

Defined in Data.Key

Methods

toKeyedList :: Seq a -> [(Key Seq, a)]

foldMapWithKey :: Monoid m => (Key Seq -> a -> m) -> Seq a -> m

foldrWithKey :: (Key Seq -> a -> b -> b) -> b -> Seq a -> b

foldlWithKey :: (b -> Key Seq -> a -> b) -> b -> Seq a -> b

Indexable Seq 
Instance details

Defined in Data.Key

Methods

index :: Seq a -> Key Seq -> a

Keyed Seq 
Instance details

Defined in Data.Key

Methods

mapWithKey :: (Key Seq -> a -> b) -> Seq a -> Seq b

Lookup Seq 
Instance details

Defined in Data.Key

Methods

lookup :: Key Seq -> Seq a -> Maybe a

TraversableWithKey Seq 
Instance details

Defined in Data.Key

Methods

traverseWithKey :: Applicative f => (Key Seq -> a -> f b) -> Seq a -> f (Seq b)

mapWithKeyM :: Monad m => (Key Seq -> a -> m b) -> Seq a -> m (Seq b)

Zip Seq 
Instance details

Defined in Data.Key

Methods

zipWith :: (a -> b -> c) -> Seq a -> Seq b -> Seq c

zip :: Seq a -> Seq b -> Seq (a, b)

zap :: Seq (a -> b) -> Seq a -> Seq b

ZipWithKey Seq 
Instance details

Defined in Data.Key

Methods

zipWithKey :: (Key Seq -> a -> b -> c) -> Seq a -> Seq b -> Seq c

zapWithKey :: Seq (Key Seq -> a -> b) -> Seq a -> Seq b

Pointed Seq 
Instance details

Defined in Data.Pointed

Methods

point :: a -> Seq a

Crosswalk Seq 
Instance details

Defined in Data.Crosswalk

Methods

crosswalk :: Align f => (a -> f b) -> Seq a -> f (Seq b)

sequenceL :: Align f => Seq (f a) -> f (Seq a)

Alt Seq 
Instance details

Defined in Data.Functor.Alt

Methods

(<!>) :: Seq a -> Seq a -> Seq a

some :: Applicative Seq => Seq a -> Seq [a]

many :: Applicative Seq => Seq a -> Seq [a]

Apply Seq 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(<.>) :: Seq (a -> b) -> Seq a -> Seq b

(.>) :: Seq a -> Seq b -> Seq b

(<.) :: Seq a -> Seq b -> Seq a

liftF2 :: (a -> b -> c) -> Seq a -> Seq b -> Seq c

Bind Seq 
Instance details

Defined in Data.Functor.Bind.Class

Methods

(>>-) :: Seq a -> (a -> Seq b) -> Seq b

join :: Seq (Seq a) -> Seq a

Extend Seq 
Instance details

Defined in Data.Functor.Extend

Methods

duplicated :: Seq a -> Seq (Seq a)

extended :: (Seq a -> b) -> Seq a -> Seq b

Plus Seq 
Instance details

Defined in Data.Functor.Plus

Methods

zero :: Seq a

Filterable Seq 
Instance details

Defined in Witherable

Methods

mapMaybe :: (a -> Maybe b) -> Seq a -> Seq b

catMaybes :: Seq (Maybe a) -> Seq a

filter :: (a -> Bool) -> Seq a -> Seq a

Witherable Seq 
Instance details

Defined in Witherable

Methods

wither :: Applicative f => (a -> f (Maybe b)) -> Seq a -> f (Seq b)

witherM :: Monad m => (a -> m (Maybe b)) -> Seq a -> m (Seq b)

filterA :: Applicative f => (a -> f Bool) -> Seq a -> f (Seq a)

witherMap :: Applicative m => (Seq b -> r) -> (a -> m (Maybe b)) -> Seq a -> m r

FilterableWithIndex Int Seq 
Instance details

Defined in Witherable

Methods

imapMaybe :: (Int -> a -> Maybe b) -> Seq a -> Seq b

ifilter :: (Int -> a -> Bool) -> Seq a -> Seq a

WitherableWithIndex Int Seq 
Instance details

Defined in Witherable

Methods

iwither :: Applicative f => (Int -> a -> f (Maybe b)) -> Seq a -> f (Seq b)

iwitherM :: Monad m => (Int -> a -> m (Maybe b)) -> Seq a -> m (Seq b)

ifilterA :: Applicative f => (Int -> a -> f Bool) -> Seq a -> f (Seq a)

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

Arbitrary a => Arbitrary (Seq a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen (Seq a)

shrink :: Seq a -> [Seq a]

CoArbitrary a => CoArbitrary (Seq a) 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Seq a -> Gen b -> Gen b

Function a => Function (Seq a) 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Seq a -> b) -> Seq a :-> b

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 #

Serialize e => Serialize (Seq e) 
Instance details

Defined in Data.Serialize

Methods

put :: Putter (Seq e)

get :: Get (Seq e)

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 #

Ixed (Seq a) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (Seq a) -> Traversal' (Seq a) (IxValue (Seq a))

AsEmpty (Seq a) 
Instance details

Defined in Control.Lens.Empty

Methods

_Empty :: Prism' (Seq a) ()

Reversing (Seq a) 
Instance details

Defined in Control.Lens.Internal.Iso

Methods

reversing :: Seq a -> Seq a

Wrapped (Seq a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Seq a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (Seq a) = [a]

Methods

_Wrapped' :: Iso' (Seq a) (Unwrapped (Seq a))

Ord a => Stream (Seq a) 
Instance details

Defined in Text.Megaparsec.Stream

Associated Types

type Token (Seq a) 
Instance details

Defined in Text.Megaparsec.Stream

type Token (Seq a) = a
type Tokens (Seq a) 
Instance details

Defined in Text.Megaparsec.Stream

type Tokens (Seq a) = Seq a

Methods

tokenToChunk :: Proxy (Seq a) -> Token (Seq a) -> Tokens (Seq a)

tokensToChunk :: Proxy (Seq a) -> [Token (Seq a)] -> Tokens (Seq a)

chunkToTokens :: Proxy (Seq a) -> Tokens (Seq a) -> [Token (Seq a)]

chunkLength :: Proxy (Seq a) -> Tokens (Seq a) -> Int

chunkEmpty :: Proxy (Seq a) -> Tokens (Seq a) -> Bool

take1_ :: Seq a -> Maybe (Token (Seq a), Seq a)

takeN_ :: Int -> Seq a -> Maybe (Tokens (Seq a), Seq a)

takeWhile_ :: (Token (Seq a) -> Bool) -> Seq a -> (Tokens (Seq a), Seq a)

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 #

Extract (Seq a) 
Instance details

Defined in Text.Regex.Base.RegexLike

Methods

before :: Int -> Seq a -> Seq a

after :: Int -> Seq a -> Seq a

empty :: Seq a

extract :: (Int, Int) -> Seq a -> Seq a

Uncons (Seq Char) 
Instance details

Defined in Text.Regex.TDFA.NewDFA.Uncons

Methods

uncons :: Seq Char -> Maybe (Char, Seq Char)

One (Seq a) 
Instance details

Defined in Relude.Container.One

Associated Types

type OneItem (Seq a) 
Instance details

Defined in Relude.Container.One

type OneItem (Seq a) = a

Methods

one :: OneItem (Seq a) -> Seq a

t ~ Seq a' => Rewrapped (Seq a) t 
Instance details

Defined in Control.Lens.Wrapped

Cons (Seq a) (Seq b) a b 
Instance details

Defined in Control.Lens.Cons

Methods

_Cons :: Prism (Seq a) (Seq b) (a, Seq a) (b, Seq b)

Snoc (Seq a) (Seq b) a b 
Instance details

Defined in Control.Lens.Cons

Methods

_Snoc :: Prism (Seq a) (Seq b) (Seq a, a) (Seq b, b)

Each (Seq a) (Seq b) a b 
Instance details

Defined in Control.Lens.Each

Methods

each :: Traversal (Seq a) (Seq b) a b

type Key Seq 
Instance details

Defined in Data.Key

type Key Seq = Int
type Item (Seq a) 
Instance details

Defined in Data.Sequence.Internal

type Item (Seq a) = a
type Index (Seq a) 
Instance details

Defined in Control.Lens.At

type Index (Seq a) = Int
type IxValue (Seq a) 
Instance details

Defined in Control.Lens.At

type IxValue (Seq a) = a
type Unwrapped (Seq a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (Seq a) = [a]
type Token (Seq a) 
Instance details

Defined in Text.Megaparsec.Stream

type Token (Seq a) = a
type Tokens (Seq a) 
Instance details

Defined in Text.Megaparsec.Stream

type Tokens (Seq a) = Seq 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
type OneItem (Seq a) 
Instance details

Defined in Relude.Container.One

type OneItem (Seq a) = a

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

Methods

compare :: ModuleName -> ModuleName -> Ordering #

(<) :: ModuleName -> ModuleName -> Bool #

(<=) :: ModuleName -> ModuleName -> Bool #

(>) :: ModuleName -> ModuleName -> Bool #

(>=) :: ModuleName -> ModuleName -> Bool #

max :: ModuleName -> ModuleName -> ModuleName #

min :: ModuleName -> ModuleName -> 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

Methods

compare :: FlagName -> FlagName -> Ordering #

(<) :: FlagName -> FlagName -> Bool #

(<=) :: FlagName -> FlagName -> Bool #

(>) :: FlagName -> FlagName -> Bool #

(>=) :: FlagName -> FlagName -> Bool #

max :: FlagName -> FlagName -> FlagName #

min :: FlagName -> FlagName -> FlagName #

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

Methods

compare :: LibraryName -> LibraryName -> Ordering #

(<) :: LibraryName -> LibraryName -> Bool #

(<=) :: LibraryName -> LibraryName -> Bool #

(>) :: LibraryName -> LibraryName -> Bool #

(>=) :: LibraryName -> LibraryName -> Bool #

max :: LibraryName -> LibraryName -> LibraryName #

min :: LibraryName -> LibraryName -> 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

Methods

compare :: MungedPackageId -> MungedPackageId -> Ordering #

(<) :: MungedPackageId -> MungedPackageId -> Bool #

(<=) :: MungedPackageId -> MungedPackageId -> Bool #

(>) :: MungedPackageId -> MungedPackageId -> Bool #

(>=) :: MungedPackageId -> MungedPackageId -> Bool #

max :: MungedPackageId -> MungedPackageId -> MungedPackageId #

min :: MungedPackageId -> MungedPackageId -> MungedPackageId #

Ord MungedPackageName 
Instance details

Defined in Distribution.Types.MungedPackageName

Methods

compare :: MungedPackageName -> MungedPackageName -> Ordering #

(<) :: MungedPackageName -> MungedPackageName -> Bool #

(<=) :: MungedPackageName -> MungedPackageName -> Bool #

(>) :: MungedPackageName -> MungedPackageName -> Bool #

(>=) :: MungedPackageName -> MungedPackageName -> Bool #

max :: MungedPackageName -> MungedPackageName -> MungedPackageName #

min :: MungedPackageName -> MungedPackageName -> 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

Methods

compare :: PackageIdentifier -> PackageIdentifier -> Ordering #

(<) :: PackageIdentifier -> PackageIdentifier -> Bool #

(<=) :: PackageIdentifier -> PackageIdentifier -> Bool #

(>) :: PackageIdentifier -> PackageIdentifier -> Bool #

(>=) :: PackageIdentifier -> PackageIdentifier -> Bool #

max :: PackageIdentifier -> PackageIdentifier -> PackageIdentifier #

min :: PackageIdentifier -> PackageIdentifier -> PackageIdentifier #

Ord PackageName 
Instance details

Defined in Distribution.Types.PackageName

Methods

compare :: PackageName -> PackageName -> Ordering #

(<) :: PackageName -> PackageName -> Bool #

(<=) :: PackageName -> PackageName -> Bool #

(>) :: PackageName -> PackageName -> Bool #

(>=) :: PackageName -> PackageName -> Bool #

max :: PackageName -> PackageName -> PackageName #

min :: PackageName -> PackageName -> 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

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 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

Methods

compare :: VersionRange -> VersionRange -> Ordering #

(<) :: VersionRange -> VersionRange -> Bool #

(<=) :: VersionRange -> VersionRange -> Bool #

(>) :: VersionRange -> VersionRange -> Bool #

(>=) :: VersionRange -> VersionRange -> Bool #

max :: VersionRange -> VersionRange -> VersionRange #

min :: VersionRange -> VersionRange -> VersionRange #

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 ASCIIString 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

compare :: ASCIIString -> ASCIIString -> Ordering #

(<) :: ASCIIString -> ASCIIString -> Bool #

(<=) :: ASCIIString -> ASCIIString -> Bool #

(>) :: ASCIIString -> ASCIIString -> Bool #

(>=) :: ASCIIString -> ASCIIString -> Bool #

max :: ASCIIString -> ASCIIString -> ASCIIString #

min :: ASCIIString -> ASCIIString -> ASCIIString #

Ord PrintableString 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

compare :: PrintableString -> PrintableString -> Ordering #

(<) :: PrintableString -> PrintableString -> Bool #

(<=) :: PrintableString -> PrintableString -> Bool #

(>) :: PrintableString -> PrintableString -> Bool #

(>=) :: PrintableString -> PrintableString -> Bool #

max :: PrintableString -> PrintableString -> PrintableString #

min :: PrintableString -> PrintableString -> PrintableString #

Ord UnicodeString 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

compare :: UnicodeString -> UnicodeString -> Ordering #

(<) :: UnicodeString -> UnicodeString -> Bool #

(<=) :: UnicodeString -> UnicodeString -> Bool #

(>) :: UnicodeString -> UnicodeString -> Bool #

(>=) :: UnicodeString -> UnicodeString -> Bool #

max :: UnicodeString -> UnicodeString -> UnicodeString #

min :: UnicodeString -> UnicodeString -> UnicodeString #

Ord OrdA 
Instance details

Defined in Test.QuickCheck.Poly

Methods

compare :: OrdA -> OrdA -> Ordering #

(<) :: OrdA -> OrdA -> Bool #

(<=) :: OrdA -> OrdA -> Bool #

(>) :: OrdA -> OrdA -> Bool #

(>=) :: OrdA -> OrdA -> Bool #

max :: OrdA -> OrdA -> OrdA #

min :: OrdA -> OrdA -> OrdA #

Ord OrdB 
Instance details

Defined in Test.QuickCheck.Poly

Methods

compare :: OrdB -> OrdB -> Ordering #

(<) :: OrdB -> OrdB -> Bool #

(<=) :: OrdB -> OrdB -> Bool #

(>) :: OrdB -> OrdB -> Bool #

(>=) :: OrdB -> OrdB -> Bool #

max :: OrdB -> OrdB -> OrdB #

min :: OrdB -> OrdB -> OrdB #

Ord OrdC 
Instance details

Defined in Test.QuickCheck.Poly

Methods

compare :: OrdC -> OrdC -> Ordering #

(<) :: OrdC -> OrdC -> Bool #

(<=) :: OrdC -> OrdC -> Bool #

(>) :: OrdC -> OrdC -> Bool #

(>=) :: OrdC -> OrdC -> Bool #

max :: OrdC -> OrdC -> OrdC #

min :: OrdC -> OrdC -> OrdC #

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

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 ASN1TimeType 
Instance details

Defined in Data.ASN1.Types

Methods

compare :: ASN1TimeType -> ASN1TimeType -> Ordering #

(<) :: ASN1TimeType -> ASN1TimeType -> Bool #

(<=) :: ASN1TimeType -> ASN1TimeType -> Bool #

(>) :: ASN1TimeType -> ASN1TimeType -> Bool #

(>=) :: ASN1TimeType -> ASN1TimeType -> Bool #

max :: ASN1TimeType -> ASN1TimeType -> ASN1TimeType #

min :: ASN1TimeType -> ASN1TimeType -> ASN1TimeType #

Ord ASN1Class 
Instance details

Defined in Data.ASN1.Types.Lowlevel

Methods

compare :: ASN1Class -> ASN1Class -> Ordering #

(<) :: ASN1Class -> ASN1Class -> Bool #

(<=) :: ASN1Class -> ASN1Class -> Bool #

(>) :: ASN1Class -> ASN1Class -> Bool #

(>=) :: ASN1Class -> ASN1Class -> Bool #

max :: ASN1Class -> ASN1Class -> ASN1Class #

min :: ASN1Class -> ASN1Class -> ASN1Class #

Ord ASN1CharacterString 
Instance details

Defined in Data.ASN1.Types.String

Methods

compare :: ASN1CharacterString -> ASN1CharacterString -> Ordering #

(<) :: ASN1CharacterString -> ASN1CharacterString -> Bool #

(<=) :: ASN1CharacterString -> ASN1CharacterString -> Bool #

(>) :: ASN1CharacterString -> ASN1CharacterString -> Bool #

(>=) :: ASN1CharacterString -> ASN1CharacterString -> Bool #

max :: ASN1CharacterString -> ASN1CharacterString -> ASN1CharacterString #

min :: ASN1CharacterString -> ASN1CharacterString -> ASN1CharacterString #

Ord ASN1StringEncoding 
Instance details

Defined in Data.ASN1.Types.String

Methods

compare :: ASN1StringEncoding -> ASN1StringEncoding -> Ordering #

(<) :: ASN1StringEncoding -> ASN1StringEncoding -> Bool #

(<=) :: ASN1StringEncoding -> ASN1StringEncoding -> Bool #

(>) :: ASN1StringEncoding -> ASN1StringEncoding -> Bool #

(>=) :: ASN1StringEncoding -> ASN1StringEncoding -> Bool #

max :: ASN1StringEncoding -> ASN1StringEncoding -> ASN1StringEncoding #

min :: ASN1StringEncoding -> ASN1StringEncoding -> ASN1StringEncoding #

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

Ord Credential 
Instance details

Defined in Web.Authenticate.OAuth

Methods

compare :: Credential -> Credential -> Ordering #

(<) :: Credential -> Credential -> Bool #

(<=) :: Credential -> Credential -> Bool #

(>) :: Credential -> Credential -> Bool #

(>=) :: Credential -> Credential -> Bool #

max :: Credential -> Credential -> Credential #

min :: Credential -> Credential -> Credential #

Ord OAuthVersion 
Instance details

Defined in Web.Authenticate.OAuth

Methods

compare :: OAuthVersion -> OAuthVersion -> Ordering #

(<) :: OAuthVersion -> OAuthVersion -> Bool #

(<=) :: OAuthVersion -> OAuthVersion -> Bool #

(>) :: OAuthVersion -> OAuthVersion -> Bool #

(>=) :: OAuthVersion -> OAuthVersion -> Bool #

max :: OAuthVersion -> OAuthVersion -> OAuthVersion #

min :: OAuthVersion -> OAuthVersion -> OAuthVersion #

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

Methods

compare :: ThreadId -> ThreadId -> Ordering #

(<) :: ThreadId -> ThreadId -> Bool #

(<=) :: ThreadId -> ThreadId -> Bool #

(>) :: ThreadId -> ThreadId -> Bool #

(>=) :: ThreadId -> ThreadId -> Bool #

max :: ThreadId -> ThreadId -> ThreadId #

min :: ThreadId -> ThreadId -> ThreadId #

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

Methods

compare :: ExitCode -> ExitCode -> Ordering #

(<) :: ExitCode -> ExitCode -> Bool #

(<=) :: ExitCode -> ExitCode -> Bool #

(>) :: ExitCode -> ExitCode -> Bool #

(>=) :: ExitCode -> ExitCode -> Bool #

max :: ExitCode -> ExitCode -> ExitCode #

min :: ExitCode -> ExitCode -> ExitCode #

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

Methods

compare :: Word16 -> Word16 -> Ordering #

(<) :: Word16 -> Word16 -> Bool #

(<=) :: Word16 -> Word16 -> Bool #

(>) :: Word16 -> Word16 -> Bool #

(>=) :: Word16 -> Word16 -> Bool #

max :: Word16 -> Word16 -> Word16 #

min :: Word16 -> Word16 -> Word16 #

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 AsciiString 
Instance details

Defined in Basement.Types.AsciiString

Methods

compare :: AsciiString -> AsciiString -> Ordering #

(<) :: AsciiString -> AsciiString -> Bool #

(<=) :: AsciiString -> AsciiString -> Bool #

(>) :: AsciiString -> AsciiString -> Bool #

(>=) :: AsciiString -> AsciiString -> Bool #

max :: AsciiString -> AsciiString -> AsciiString #

min :: AsciiString -> AsciiString -> AsciiString #

Ord Char7 
Instance details

Defined in Basement.Types.Char7

Methods

compare :: Char7 -> Char7 -> Ordering #

(<) :: Char7 -> Char7 -> Bool #

(<=) :: Char7 -> Char7 -> Bool #

(>) :: Char7 -> Char7 -> Bool #

(>=) :: Char7 -> Char7 -> Bool #

max :: Char7 -> Char7 -> Char7 #

min :: Char7 -> Char7 -> Char7 #

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 Addr 
Instance details

Defined in Basement.Types.Ptr

Methods

compare :: Addr -> Addr -> Ordering #

(<) :: Addr -> Addr -> Bool #

(<=) :: Addr -> Addr -> Bool #

(>) :: Addr -> Addr -> Bool #

(>=) :: Addr -> Addr -> Bool #

max :: Addr -> Addr -> Addr #

min :: Addr -> Addr -> Addr #

Ord Word128 
Instance details

Defined in Basement.Types.Word128

Methods

compare :: Word128 -> Word128 -> Ordering #

(<) :: Word128 -> Word128 -> Bool #

(<=) :: Word128 -> Word128 -> Bool #

(>) :: Word128 -> Word128 -> Bool #

(>=) :: Word128 -> Word128 -> Bool #

max :: Word128 -> Word128 -> Word128 #

min :: Word128 -> Word128 -> Word128 #

Ord Word256 
Instance details

Defined in Basement.Types.Word256

Methods

compare :: Word256 -> Word256 -> Ordering #

(<) :: Word256 -> Word256 -> Bool #

(<=) :: Word256 -> Word256 -> Bool #

(>) :: Word256 -> Word256 -> Bool #

(>=) :: Word256 -> Word256 -> Bool #

max :: Word256 -> Word256 -> Word256 #

min :: Word256 -> Word256 -> Word256 #

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 Options 
Instance details

Defined in Data.Bifunctor.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 ByteOrder 
Instance details

Defined in System.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 Bytes 
Instance details

Defined in Data.Bytes.Internal

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 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

Methods

compare :: ShortByteString -> ShortByteString -> Ordering #

(<) :: ShortByteString -> ShortByteString -> Bool #

(<=) :: ShortByteString -> ShortByteString -> Bool #

(>) :: ShortByteString -> ShortByteString -> Bool #

(>=) :: ShortByteString -> ShortByteString -> Bool #

max :: ShortByteString -> ShortByteString -> ShortByteString #

min :: ShortByteString -> ShortByteString -> ShortByteString #

Ord IV 
Instance details

Defined in Web.ClientSession

Methods

compare :: IV -> IV -> Ordering #

(<) :: IV -> IV -> Bool #

(<=) :: IV -> IV -> Bool #

(>) :: IV -> IV -> Bool #

(>=) :: IV -> IV -> Bool #

max :: IV -> IV -> IV #

min :: IV -> IV -> IV #

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 CipherError 
Instance details

Defined in Crypto.Classes.Exceptions

Methods

compare :: CipherError -> CipherError -> Ordering #

(<) :: CipherError -> CipherError -> Bool #

(<=) :: CipherError -> CipherError -> Bool #

(>) :: CipherError -> CipherError -> Bool #

(>=) :: CipherError -> CipherError -> Bool #

max :: CipherError -> CipherError -> CipherError #

min :: CipherError -> CipherError -> CipherError #

Ord GenError 
Instance details

Defined in Crypto.Random

Methods

compare :: GenError -> GenError -> Ordering #

(<) :: GenError -> GenError -> Bool #

(<=) :: GenError -> GenError -> Bool #

(>) :: GenError -> GenError -> Bool #

(>=) :: GenError -> GenError -> Bool #

max :: GenError -> GenError -> GenError #

min :: GenError -> GenError -> GenError #

Ord ReseedInfo 
Instance details

Defined in Crypto.Random

Methods

compare :: ReseedInfo -> ReseedInfo -> Ordering #

(<) :: ReseedInfo -> ReseedInfo -> Bool #

(<=) :: ReseedInfo -> ReseedInfo -> Bool #

(>) :: ReseedInfo -> ReseedInfo -> Bool #

(>=) :: ReseedInfo -> ReseedInfo -> Bool #

max :: ReseedInfo -> ReseedInfo -> ReseedInfo #

min :: ReseedInfo -> ReseedInfo -> ReseedInfo #

Ord BlockCipherError 
Instance details

Defined in Crypto.Types

Methods

compare :: BlockCipherError -> BlockCipherError -> Ordering #

(<) :: BlockCipherError -> BlockCipherError -> Bool #

(<=) :: BlockCipherError -> BlockCipherError -> Bool #

(>) :: BlockCipherError -> BlockCipherError -> Bool #

(>=) :: BlockCipherError -> BlockCipherError -> Bool #

max :: BlockCipherError -> BlockCipherError -> BlockCipherError #

min :: BlockCipherError -> BlockCipherError -> BlockCipherError #

Ord PrivateNumber 
Instance details

Defined in Crypto.Types.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.Types.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 SharedKey 
Instance details

Defined in Crypto.Types.PubKey.DH

Methods

compare :: SharedKey -> SharedKey -> Ordering #

(<) :: SharedKey -> SharedKey -> Bool #

(<=) :: SharedKey -> SharedKey -> Bool #

(>) :: SharedKey -> SharedKey -> Bool #

(>=) :: SharedKey -> SharedKey -> Bool #

max :: SharedKey -> SharedKey -> SharedKey #

min :: SharedKey -> SharedKey -> SharedKey #

Ord CurveName 
Instance details

Defined in Crypto.Types.PubKey.ECC

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 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 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 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 UniqueSet 
Instance details

Defined in GHC.Cmm.Dataflow.Collections

Methods

compare :: UniqueSet -> UniqueSet -> Ordering #

(<) :: UniqueSet -> UniqueSet -> Bool #

(<=) :: UniqueSet -> UniqueSet -> Bool #

(>) :: UniqueSet -> UniqueSet -> Bool #

(>=) :: UniqueSet -> UniqueSet -> Bool #

max :: UniqueSet -> UniqueSet -> UniqueSet #

min :: UniqueSet -> UniqueSet -> UniqueSet #

Ord Label 
Instance details

Defined in GHC.Cmm.Dataflow.Label

Methods

compare :: Label -> Label -> Ordering #

(<) :: Label -> Label -> Bool #

(<=) :: Label -> Label -> Bool #

(>) :: Label -> Label -> Bool #

(>=) :: Label -> Label -> Bool #

max :: Label -> Label -> Label #

min :: Label -> Label -> Label #

Ord LabelSet 
Instance details

Defined in GHC.Cmm.Dataflow.Label

Methods

compare :: LabelSet -> LabelSet -> Ordering #

(<) :: LabelSet -> LabelSet -> Bool #

(<=) :: LabelSet -> LabelSet -> Bool #

(>) :: LabelSet -> LabelSet -> Bool #

(>=) :: LabelSet -> LabelSet -> Bool #

max :: LabelSet -> LabelSet -> LabelSet #

min :: LabelSet -> LabelSet -> LabelSet #

Ord Target 
Instance details

Defined in GHC.CmmToAsm.AArch64.Instr

Methods

compare :: Target -> Target -> Ordering #

(<) :: Target -> Target -> Bool #

(<=) :: Target -> Target -> Bool #

(>) :: Target -> Target -> Bool #

(>=) :: Target -> Target -> Bool #

max :: Target -> Target -> Target #

min :: Target -> Target -> Target #

Ord AltCon 
Instance details

Defined in GHC.Core

Methods

compare :: AltCon -> AltCon -> Ordering #

(<) :: AltCon -> AltCon -> Bool #

(<=) :: AltCon -> AltCon -> Bool #

(>) :: AltCon -> AltCon -> Bool #

(>=) :: AltCon -> AltCon -> Bool #

max :: AltCon -> AltCon -> AltCon #

min :: AltCon -> AltCon -> AltCon #

Ord CoAxiomRule 
Instance details

Defined in GHC.Core.Coercion.Axiom

Methods

compare :: CoAxiomRule -> CoAxiomRule -> Ordering #

(<) :: CoAxiomRule -> CoAxiomRule -> Bool #

(<=) :: CoAxiomRule -> CoAxiomRule -> Bool #

(>) :: CoAxiomRule -> CoAxiomRule -> Bool #

(>=) :: CoAxiomRule -> CoAxiomRule -> Bool #

max :: CoAxiomRule -> CoAxiomRule -> CoAxiomRule #

min :: CoAxiomRule -> CoAxiomRule -> CoAxiomRule #

Ord PrimElemRep 
Instance details

Defined in GHC.Core.TyCon

Methods

compare :: PrimElemRep -> PrimElemRep -> Ordering #

(<) :: PrimElemRep -> PrimElemRep -> Bool #

(<=) :: PrimElemRep -> PrimElemRep -> Bool #

(>) :: PrimElemRep -> PrimElemRep -> Bool #

(>=) :: PrimElemRep -> PrimElemRep -> Bool #

max :: PrimElemRep -> PrimElemRep -> PrimElemRep #

min :: PrimElemRep -> PrimElemRep -> PrimElemRep #

Ord PrimRep 
Instance details

Defined in GHC.Core.TyCon

Methods

compare :: PrimRep -> PrimRep -> Ordering #

(<) :: PrimRep -> PrimRep -> Bool #

(<=) :: PrimRep -> PrimRep -> Bool #

(>) :: PrimRep -> PrimRep -> Bool #

(>=) :: PrimRep -> PrimRep -> Bool #

max :: PrimRep -> PrimRep -> PrimRep #

min :: PrimRep -> PrimRep -> PrimRep #

Ord LexicalFastString 
Instance details

Defined in GHC.Data.FastString

Methods

compare :: LexicalFastString -> LexicalFastString -> Ordering #

(<) :: LexicalFastString -> LexicalFastString -> Bool #

(<=) :: LexicalFastString -> LexicalFastString -> Bool #

(>) :: LexicalFastString -> LexicalFastString -> Bool #

(>=) :: LexicalFastString -> LexicalFastString -> Bool #

max :: LexicalFastString -> LexicalFastString -> LexicalFastString #

min :: LexicalFastString -> LexicalFastString -> LexicalFastString #

Ord NonDetFastString 
Instance details

Defined in GHC.Data.FastString

Methods

compare :: NonDetFastString -> NonDetFastString -> Ordering #

(<) :: NonDetFastString -> NonDetFastString -> Bool #

(<=) :: NonDetFastString -> NonDetFastString -> Bool #

(>) :: NonDetFastString -> NonDetFastString -> Bool #

(>=) :: NonDetFastString -> NonDetFastString -> Bool #

max :: NonDetFastString -> NonDetFastString -> NonDetFastString #

min :: NonDetFastString -> NonDetFastString -> NonDetFastString #

Ord DynamicTooState 
Instance details

Defined in GHC.Driver.DynFlags

Methods

compare :: DynamicTooState -> DynamicTooState -> Ordering #

(<) :: DynamicTooState -> DynamicTooState -> Bool #

(<=) :: DynamicTooState -> DynamicTooState -> Bool #

(>) :: DynamicTooState -> DynamicTooState -> Bool #

(>=) :: DynamicTooState -> DynamicTooState -> Bool #

max :: DynamicTooState -> DynamicTooState -> DynamicTooState #

min :: DynamicTooState -> DynamicTooState -> DynamicTooState #

Ord AOp 
Instance details

Defined in GHC.JS.Syntax

Methods

compare :: AOp -> AOp -> Ordering #

(<) :: AOp -> AOp -> Bool #

(<=) :: AOp -> AOp -> Bool #

(>) :: AOp -> AOp -> Bool #

(>=) :: AOp -> AOp -> Bool #

max :: AOp -> AOp -> AOp #

min :: AOp -> AOp -> AOp #

Ord Op 
Instance details

Defined in GHC.JS.Syntax

Methods

compare :: Op -> Op -> Ordering #

(<) :: Op -> Op -> Bool #

(<=) :: Op -> Op -> Bool #

(>) :: Op -> Op -> Bool #

(>=) :: Op -> Op -> Bool #

max :: Op -> Op -> Op #

min :: Op -> Op -> Op #

Ord UOp 
Instance details

Defined in GHC.JS.Syntax

Methods

compare :: UOp -> UOp -> Ordering #

(<) :: UOp -> UOp -> Bool #

(<=) :: UOp -> UOp -> Bool #

(>) :: UOp -> UOp -> Bool #

(>=) :: UOp -> UOp -> Bool #

max :: UOp -> UOp -> UOp #

min :: UOp -> UOp -> UOp #

Ord JOp 
Instance details

Defined in GHC.JS.Unsat.Syntax

Methods

compare :: JOp -> JOp -> Ordering #

(<) :: JOp -> JOp -> Bool #

(<=) :: JOp -> JOp -> Bool #

(>) :: JOp -> JOp -> Bool #

(>=) :: JOp -> JOp -> Bool #

max :: JOp -> JOp -> JOp #

min :: JOp -> JOp -> JOp #

Ord JUOp 
Instance details

Defined in GHC.JS.Unsat.Syntax

Methods

compare :: JUOp -> JUOp -> Ordering #

(<) :: JUOp -> JUOp -> Bool #

(<=) :: JUOp -> JUOp -> Bool #

(>) :: JUOp -> JUOp -> Bool #

(>=) :: JUOp -> JUOp -> Bool #

max :: JUOp -> JUOp -> JUOp #

min :: JUOp -> JUOp -> JUOp #

Ord Anchor 
Instance details

Defined in GHC.Parser.Annotation

Methods

compare :: Anchor -> Anchor -> Ordering #

(<) :: Anchor -> Anchor -> Bool #

(<=) :: Anchor -> Anchor -> Bool #

(>) :: Anchor -> Anchor -> Bool #

(>=) :: Anchor -> Anchor -> Bool #

max :: Anchor -> Anchor -> Anchor #

min :: Anchor -> Anchor -> Anchor #

Ord AnnKeywordId 
Instance details

Defined in GHC.Parser.Annotation

Methods

compare :: AnnKeywordId -> AnnKeywordId -> Ordering #

(<) :: AnnKeywordId -> AnnKeywordId -> Bool #

(<=) :: AnnKeywordId -> AnnKeywordId -> Bool #

(>) :: AnnKeywordId -> AnnKeywordId -> Bool #

(>=) :: AnnKeywordId -> AnnKeywordId -> Bool #

max :: AnnKeywordId -> AnnKeywordId -> AnnKeywordId #

min :: AnnKeywordId -> AnnKeywordId -> AnnKeywordId #

Ord DeltaPos 
Instance details

Defined in GHC.Parser.Annotation

Methods

compare :: DeltaPos -> DeltaPos -> Ordering #

(<) :: DeltaPos -> DeltaPos -> Bool #

(<=) :: DeltaPos -> DeltaPos -> Bool #

(>) :: DeltaPos -> DeltaPos -> Bool #

(>=) :: DeltaPos -> DeltaPos -> Bool #

max :: DeltaPos -> DeltaPos -> DeltaPos #

min :: DeltaPos -> DeltaPos -> DeltaPos #

Ord HasE 
Instance details

Defined in GHC.Parser.Annotation

Methods

compare :: HasE -> HasE -> Ordering #

(<) :: HasE -> HasE -> Bool #

(<=) :: HasE -> HasE -> Bool #

(>) :: HasE -> HasE -> Bool #

(>=) :: HasE -> HasE -> Bool #

max :: HasE -> HasE -> HasE #

min :: HasE -> HasE -> HasE #

Ord IsUnicodeSyntax 
Instance details

Defined in GHC.Parser.Annotation

Methods

compare :: IsUnicodeSyntax -> IsUnicodeSyntax -> Ordering #

(<) :: IsUnicodeSyntax -> IsUnicodeSyntax -> Bool #

(<=) :: IsUnicodeSyntax -> IsUnicodeSyntax -> Bool #

(>) :: IsUnicodeSyntax -> IsUnicodeSyntax -> Bool #

(>=) :: IsUnicodeSyntax -> IsUnicodeSyntax -> Bool #

max :: IsUnicodeSyntax -> IsUnicodeSyntax -> IsUnicodeSyntax #

min :: IsUnicodeSyntax -> IsUnicodeSyntax -> IsUnicodeSyntax #

Ord NameAdornment 
Instance details

Defined in GHC.Parser.Annotation

Methods

compare :: NameAdornment -> NameAdornment -> Ordering #

(<) :: NameAdornment -> NameAdornment -> Bool #

(<=) :: NameAdornment -> NameAdornment -> Bool #

(>) :: NameAdornment -> NameAdornment -> Bool #

(>=) :: NameAdornment -> NameAdornment -> Bool #

max :: NameAdornment -> NameAdornment -> NameAdornment #

min :: NameAdornment -> NameAdornment -> NameAdornment #

Ord NoEpAnns 
Instance details

Defined in GHC.Parser.Annotation

Methods

compare :: NoEpAnns -> NoEpAnns -> Ordering #

(<) :: NoEpAnns -> NoEpAnns -> Bool #

(<=) :: NoEpAnns -> NoEpAnns -> Bool #

(>) :: NoEpAnns -> NoEpAnns -> Bool #

(>=) :: NoEpAnns -> NoEpAnns -> Bool #

max :: NoEpAnns -> NoEpAnns -> NoEpAnns #

min :: NoEpAnns -> NoEpAnns -> NoEpAnns #

Ord ParenType 
Instance details

Defined in GHC.Parser.Annotation

Methods

compare :: ParenType -> ParenType -> Ordering #

(<) :: ParenType -> ParenType -> Bool #

(<=) :: ParenType -> ParenType -> Bool #

(>) :: ParenType -> ParenType -> Bool #

(>=) :: ParenType -> ParenType -> Bool #

max :: ParenType -> ParenType -> ParenType #

min :: ParenType -> ParenType -> ParenType #

Ord LexErrKind 
Instance details

Defined in GHC.Parser.Errors.Types

Methods

compare :: LexErrKind -> LexErrKind -> Ordering #

(<) :: LexErrKind -> LexErrKind -> Bool #

(<=) :: LexErrKind -> LexErrKind -> Bool #

(>) :: LexErrKind -> LexErrKind -> Bool #

(>=) :: LexErrKind -> LexErrKind -> Bool #

max :: LexErrKind -> LexErrKind -> LexErrKind #

min :: LexErrKind -> LexErrKind -> LexErrKind #

Ord NumUnderscoreReason 
Instance details

Defined in GHC.Parser.Errors.Types

Methods

compare :: NumUnderscoreReason -> NumUnderscoreReason -> Ordering #

(<) :: NumUnderscoreReason -> NumUnderscoreReason -> Bool #

(<=) :: NumUnderscoreReason -> NumUnderscoreReason -> Bool #

(>) :: NumUnderscoreReason -> NumUnderscoreReason -> Bool #

(>=) :: NumUnderscoreReason -> NumUnderscoreReason -> Bool #

max :: NumUnderscoreReason -> NumUnderscoreReason -> NumUnderscoreReason #

min :: NumUnderscoreReason -> NumUnderscoreReason -> NumUnderscoreReason #

Ord NoExtFieldSilent 
Instance details

Defined in GHC.Stg.Syntax

Methods

compare :: NoExtFieldSilent -> NoExtFieldSilent -> Ordering #

(<) :: NoExtFieldSilent -> NoExtFieldSilent -> Bool #

(<=) :: NoExtFieldSilent -> NoExtFieldSilent -> Bool #

(>) :: NoExtFieldSilent -> NoExtFieldSilent -> Bool #

(>=) :: NoExtFieldSilent -> NoExtFieldSilent -> Bool #

max :: NoExtFieldSilent -> NoExtFieldSilent -> NoExtFieldSilent #

min :: NoExtFieldSilent -> NoExtFieldSilent -> NoExtFieldSilent #

Ord BlockRef 
Instance details

Defined in GHC.StgToJS.Object

Methods

compare :: BlockRef -> BlockRef -> Ordering #

(<) :: BlockRef -> BlockRef -> Bool #

(<=) :: BlockRef -> BlockRef -> Bool #

(>) :: BlockRef -> BlockRef -> Bool #

(>=) :: BlockRef -> BlockRef -> Bool #

max :: BlockRef -> BlockRef -> BlockRef #

min :: BlockRef -> BlockRef -> BlockRef #

Ord ExportedFun 
Instance details

Defined in GHC.StgToJS.Object

Methods

compare :: ExportedFun -> ExportedFun -> Ordering #

(<) :: ExportedFun -> ExportedFun -> Bool #

(<=) :: ExportedFun -> ExportedFun -> Bool #

(>) :: ExportedFun -> ExportedFun -> Bool #

(>=) :: ExportedFun -> ExportedFun -> Bool #

max :: ExportedFun -> ExportedFun -> ExportedFun #

min :: ExportedFun -> ExportedFun -> ExportedFun #

Ord SubGoalDepth 
Instance details

Defined in GHC.Tc.Types.Constraint

Methods

compare :: SubGoalDepth -> SubGoalDepth -> Ordering #

(<) :: SubGoalDepth -> SubGoalDepth -> Bool #

(<=) :: SubGoalDepth -> SubGoalDepth -> Bool #

(>) :: SubGoalDepth -> SubGoalDepth -> Bool #

(>=) :: SubGoalDepth -> SubGoalDepth -> Bool #

max :: SubGoalDepth -> SubGoalDepth -> SubGoalDepth #

min :: SubGoalDepth -> SubGoalDepth -> SubGoalDepth #

Ord TcLevel 
Instance details

Defined in GHC.Tc.Utils.TcType

Methods

compare :: TcLevel -> TcLevel -> Ordering #

(<) :: TcLevel -> TcLevel -> Bool #

(<=) :: TcLevel -> TcLevel -> Bool #

(>) :: TcLevel -> TcLevel -> Bool #

(>=) :: TcLevel -> TcLevel -> Bool #

max :: TcLevel -> TcLevel -> TcLevel #

min :: TcLevel -> TcLevel -> TcLevel #

Ord Alignment 
Instance details

Defined in GHC.Types.Basic

Methods

compare :: Alignment -> Alignment -> Ordering #

(<) :: Alignment -> Alignment -> Bool #

(<=) :: Alignment -> Alignment -> Bool #

(>) :: Alignment -> Alignment -> Bool #

(>=) :: Alignment -> Alignment -> Bool #

max :: Alignment -> Alignment -> Alignment #

min :: Alignment -> Alignment -> Alignment #

Ord FunctionOrData 
Instance details

Defined in GHC.Types.Basic

Methods

compare :: FunctionOrData -> FunctionOrData -> Ordering #

(<) :: FunctionOrData -> FunctionOrData -> Bool #

(<=) :: FunctionOrData -> FunctionOrData -> Bool #

(>) :: FunctionOrData -> FunctionOrData -> Bool #

(>=) :: FunctionOrData -> FunctionOrData -> Bool #

max :: FunctionOrData -> FunctionOrData -> FunctionOrData #

min :: FunctionOrData -> FunctionOrData -> FunctionOrData #

Ord IntWithInf 
Instance details

Defined in GHC.Types.Basic

Methods

compare :: IntWithInf -> IntWithInf -> Ordering #

(<) :: IntWithInf -> IntWithInf -> Bool #

(<=) :: IntWithInf -> IntWithInf -> Bool #

(>) :: IntWithInf -> IntWithInf -> Bool #

(>=) :: IntWithInf -> IntWithInf -> Bool #

max :: IntWithInf -> IntWithInf -> IntWithInf #

min :: IntWithInf -> IntWithInf -> IntWithInf #

Ord Levity 
Instance details

Defined in GHC.Types.Basic

Methods

compare :: Levity -> Levity -> Ordering #

(<) :: Levity -> Levity -> Bool #

(<=) :: Levity -> Levity -> Bool #

(>) :: Levity -> Levity -> Bool #

(>=) :: Levity -> Levity -> Bool #

max :: Levity -> Levity -> Levity #

min :: Levity -> Levity -> Levity #

Ord PprPrec 
Instance details

Defined in GHC.Types.Basic

Methods

compare :: PprPrec -> PprPrec -> Ordering #

(<) :: PprPrec -> PprPrec -> Bool #

(<=) :: PprPrec -> PprPrec -> Bool #

(>) :: PprPrec -> PprPrec -> Bool #

(>=) :: PprPrec -> PprPrec -> Bool #

max :: PprPrec -> PprPrec -> PprPrec #

min :: PprPrec -> PprPrec -> PprPrec #

Ord TypeOrConstraint 
Instance details

Defined in GHC.Types.Basic

Methods

compare :: TypeOrConstraint -> TypeOrConstraint -> Ordering #

(<) :: TypeOrConstraint -> TypeOrConstraint -> Bool #

(<=) :: TypeOrConstraint -> TypeOrConstraint -> Bool #

(>) :: TypeOrConstraint -> TypeOrConstraint -> Bool #

(>=) :: TypeOrConstraint -> TypeOrConstraint -> Bool #

max :: TypeOrConstraint -> TypeOrConstraint -> TypeOrConstraint #

min :: TypeOrConstraint -> TypeOrConstraint -> TypeOrConstraint #

Ord Severity 
Instance details

Defined in GHC.Types.Error

Methods

compare :: Severity -> Severity -> Ordering #

(<) :: Severity -> Severity -> Bool #

(<=) :: Severity -> Severity -> Bool #

(>) :: Severity -> Severity -> Bool #

(>=) :: Severity -> Severity -> Bool #

max :: Severity -> Severity -> Severity #

min :: Severity -> Severity -> Severity #

Ord CafInfo 
Instance details

Defined in GHC.Types.Id.Info

Methods

compare :: CafInfo -> CafInfo -> Ordering #

(<) :: CafInfo -> CafInfo -> Bool #

(<=) :: CafInfo -> CafInfo -> Bool #

(>) :: CafInfo -> CafInfo -> Bool #

(>=) :: CafInfo -> CafInfo -> Bool #

max :: CafInfo -> CafInfo -> CafInfo #

min :: CafInfo -> CafInfo -> CafInfo #

Ord Name 
Instance details

Defined in GHC.Types.Name

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 NameSpace 
Instance details

Defined in GHC.Types.Name.Occurrence

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 GHC.Types.Name.Occurrence

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 RdrName 
Instance details

Defined in GHC.Types.Name.Reader

Methods

compare :: RdrName -> RdrName -> Ordering #

(<) :: RdrName -> RdrName -> Bool #

(<=) :: RdrName -> RdrName -> Bool #

(>) :: RdrName -> RdrName -> Bool #

(>=) :: RdrName -> RdrName -> Bool #

max :: RdrName -> RdrName -> RdrName #

min :: RdrName -> RdrName -> RdrName #

Ord SaneDouble 
Instance details

Defined in GHC.Types.SaneDouble

Methods

compare :: SaneDouble -> SaneDouble -> Ordering #

(<) :: SaneDouble -> SaneDouble -> Bool #

(<=) :: SaneDouble -> SaneDouble -> Bool #

(>) :: SaneDouble -> SaneDouble -> Bool #

(>=) :: SaneDouble -> SaneDouble -> Bool #

max :: SaneDouble -> SaneDouble -> SaneDouble #

min :: SaneDouble -> SaneDouble -> SaneDouble #

Ord HsBootOrSig 
Instance details

Defined in GHC.Types.SourceFile

Methods

compare :: HsBootOrSig -> HsBootOrSig -> Ordering #

(<) :: HsBootOrSig -> HsBootOrSig -> Bool #

(<=) :: HsBootOrSig -> HsBootOrSig -> Bool #

(>) :: HsBootOrSig -> HsBootOrSig -> Bool #

(>=) :: HsBootOrSig -> HsBootOrSig -> Bool #

max :: HsBootOrSig -> HsBootOrSig -> HsBootOrSig #

min :: HsBootOrSig -> HsBootOrSig -> HsBootOrSig #

Ord HscSource 
Instance details

Defined in GHC.Types.SourceFile

Methods

compare :: HscSource -> HscSource -> Ordering #

(<) :: HscSource -> HscSource -> Bool #

(<=) :: HscSource -> HscSource -> Bool #

(>) :: HscSource -> HscSource -> Bool #

(>=) :: HscSource -> HscSource -> Bool #

max :: HscSource -> HscSource -> HscSource #

min :: HscSource -> HscSource -> HscSource #

Ord FractionalExponentBase 
Instance details

Defined in GHC.Types.SourceText

Methods

compare :: FractionalExponentBase -> FractionalExponentBase -> Ordering #

(<) :: FractionalExponentBase -> FractionalExponentBase -> Bool #

(<=) :: FractionalExponentBase -> FractionalExponentBase -> Bool #

(>) :: FractionalExponentBase -> FractionalExponentBase -> Bool #

(>=) :: FractionalExponentBase -> FractionalExponentBase -> Bool #

max :: FractionalExponentBase -> FractionalExponentBase -> FractionalExponentBase #

min :: FractionalExponentBase -> FractionalExponentBase -> FractionalExponentBase #

Ord FractionalLit 
Instance details

Defined in GHC.Types.SourceText

Methods

compare :: FractionalLit -> FractionalLit -> Ordering #

(<) :: FractionalLit -> FractionalLit -> Bool #

(<=) :: FractionalLit -> FractionalLit -> Bool #

(>) :: FractionalLit -> FractionalLit -> Bool #

(>=) :: FractionalLit -> FractionalLit -> Bool #

max :: FractionalLit -> FractionalLit -> FractionalLit #

min :: FractionalLit -> FractionalLit -> FractionalLit #

Ord IntegralLit 
Instance details

Defined in GHC.Types.SourceText

Methods

compare :: IntegralLit -> IntegralLit -> Ordering #

(<) :: IntegralLit -> IntegralLit -> Bool #

(<=) :: IntegralLit -> IntegralLit -> Bool #

(>) :: IntegralLit -> IntegralLit -> Bool #

(>=) :: IntegralLit -> IntegralLit -> Bool #

max :: IntegralLit -> IntegralLit -> IntegralLit #

min :: IntegralLit -> IntegralLit -> IntegralLit #

Ord BufPos 
Instance details

Defined in GHC.Types.SrcLoc

Methods

compare :: BufPos -> BufPos -> Ordering #

(<) :: BufPos -> BufPos -> Bool #

(<=) :: BufPos -> BufPos -> Bool #

(>) :: BufPos -> BufPos -> Bool #

(>=) :: BufPos -> BufPos -> Bool #

max :: BufPos -> BufPos -> BufPos #

min :: BufPos -> BufPos -> BufPos #

Ord BufSpan 
Instance details

Defined in GHC.Types.SrcLoc

Methods

compare :: BufSpan -> BufSpan -> Ordering #

(<) :: BufSpan -> BufSpan -> Bool #

(<=) :: BufSpan -> BufSpan -> Bool #

(>) :: BufSpan -> BufSpan -> Bool #

(>=) :: BufSpan -> BufSpan -> Bool #

max :: BufSpan -> BufSpan -> BufSpan #

min :: BufSpan -> BufSpan -> BufSpan #

Ord PsLoc 
Instance details

Defined in GHC.Types.SrcLoc

Methods

compare :: PsLoc -> PsLoc -> Ordering #

(<) :: PsLoc -> PsLoc -> Bool #

(<=) :: PsLoc -> PsLoc -> Bool #

(>) :: PsLoc -> PsLoc -> Bool #

(>=) :: PsLoc -> PsLoc -> Bool #

max :: PsLoc -> PsLoc -> PsLoc #

min :: PsLoc -> PsLoc -> PsLoc #

Ord PsSpan 
Instance details

Defined in GHC.Types.SrcLoc

Methods

compare :: PsSpan -> PsSpan -> Ordering #

(<) :: PsSpan -> PsSpan -> Bool #

(<=) :: PsSpan -> PsSpan -> Bool #

(>) :: PsSpan -> PsSpan -> Bool #

(>=) :: PsSpan -> PsSpan -> Bool #

max :: PsSpan -> PsSpan -> PsSpan #

min :: PsSpan -> PsSpan -> PsSpan #

Ord RealSrcLoc 
Instance details

Defined in GHC.Types.SrcLoc

Methods

compare :: RealSrcLoc -> RealSrcLoc -> Ordering #

(<) :: RealSrcLoc -> RealSrcLoc -> Bool #

(<=) :: RealSrcLoc -> RealSrcLoc -> Bool #

(>) :: RealSrcLoc -> RealSrcLoc -> Bool #

(>=) :: RealSrcLoc -> RealSrcLoc -> Bool #

max :: RealSrcLoc -> RealSrcLoc -> RealSrcLoc #

min :: RealSrcLoc -> RealSrcLoc -> RealSrcLoc #

Ord RealSrcSpan 
Instance details

Defined in GHC.Types.SrcLoc

Methods

compare :: RealSrcSpan -> RealSrcSpan -> Ordering #

(<) :: RealSrcSpan -> RealSrcSpan -> Bool #

(<=) :: RealSrcSpan -> RealSrcSpan -> Bool #

(>) :: RealSrcSpan -> RealSrcSpan -> Bool #

(>=) :: RealSrcSpan -> RealSrcSpan -> Bool #

max :: RealSrcSpan -> RealSrcSpan -> RealSrcSpan #

min :: RealSrcSpan -> RealSrcSpan -> RealSrcSpan #

Ord ForAllTyFlag 
Instance details

Defined in GHC.Types.Var

Methods

compare :: ForAllTyFlag -> ForAllTyFlag -> Ordering #

(<) :: ForAllTyFlag -> ForAllTyFlag -> Bool #

(<=) :: ForAllTyFlag -> ForAllTyFlag -> Bool #

(>) :: ForAllTyFlag -> ForAllTyFlag -> Bool #

(>=) :: ForAllTyFlag -> ForAllTyFlag -> Bool #

max :: ForAllTyFlag -> ForAllTyFlag -> ForAllTyFlag #

min :: ForAllTyFlag -> ForAllTyFlag -> ForAllTyFlag #

Ord FunTyFlag 
Instance details

Defined in GHC.Types.Var

Methods

compare :: FunTyFlag -> FunTyFlag -> Ordering #

(<) :: FunTyFlag -> FunTyFlag -> Bool #

(<=) :: FunTyFlag -> FunTyFlag -> Bool #

(>) :: FunTyFlag -> FunTyFlag -> Bool #

(>=) :: FunTyFlag -> FunTyFlag -> Bool #

max :: FunTyFlag -> FunTyFlag -> FunTyFlag #

min :: FunTyFlag -> FunTyFlag -> FunTyFlag #

Ord Specificity 
Instance details

Defined in GHC.Types.Var

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 Var 
Instance details

Defined in GHC.Types.Var

Methods

compare :: Var -> Var -> Ordering #

(<) :: Var -> Var -> Bool #

(<=) :: Var -> Var -> Bool #

(>) :: Var -> Var -> Bool #

(>=) :: Var -> Var -> Bool #

max :: Var -> Var -> Var #

min :: Var -> Var -> Var #

Ord Unit 
Instance details

Defined in GHC.Unit.Types

Methods

compare :: Unit -> Unit -> Ordering #

(<) :: Unit -> Unit -> Bool #

(<=) :: Unit -> Unit -> Bool #

(>) :: Unit -> Unit -> Bool #

(>=) :: Unit -> Unit -> Bool #

max :: Unit -> Unit -> Unit #

min :: Unit -> Unit -> Unit #

Ord UnitId 
Instance details

Defined in GHC.Unit.Types

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 Role 
Instance details

Defined in Language.Haskell.Syntax.Basic

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 DataConCantHappen 
Instance details

Defined in Language.Haskell.Syntax.Extension

Methods

compare :: DataConCantHappen -> DataConCantHappen -> Ordering #

(<) :: DataConCantHappen -> DataConCantHappen -> Bool #

(<=) :: DataConCantHappen -> DataConCantHappen -> Bool #

(>) :: DataConCantHappen -> DataConCantHappen -> Bool #

(>=) :: DataConCantHappen -> DataConCantHappen -> Bool #

max :: DataConCantHappen -> DataConCantHappen -> DataConCantHappen #

min :: DataConCantHappen -> DataConCantHappen -> DataConCantHappen #

Ord NoExtField 
Instance details

Defined in Language.Haskell.Syntax.Extension

Methods

compare :: NoExtField -> NoExtField -> Ordering #

(<) :: NoExtField -> NoExtField -> Bool #

(<=) :: NoExtField -> NoExtField -> Bool #

(>) :: NoExtField -> NoExtField -> Bool #

(>=) :: NoExtField -> NoExtField -> Bool #

max :: NoExtField -> NoExtField -> NoExtField #

min :: NoExtField -> NoExtField -> NoExtField #

Ord IsBootInterface 
Instance details

Defined in Language.Haskell.Syntax.ImpExp

Methods

compare :: IsBootInterface -> IsBootInterface -> Ordering #

(<) :: IsBootInterface -> IsBootInterface -> Bool #

(<=) :: IsBootInterface -> IsBootInterface -> Bool #

(>) :: IsBootInterface -> IsBootInterface -> Bool #

(>=) :: IsBootInterface -> IsBootInterface -> Bool #

max :: IsBootInterface -> IsBootInterface -> IsBootInterface #

min :: IsBootInterface -> IsBootInterface -> IsBootInterface #

Ord OverLitVal 
Instance details

Defined in Language.Haskell.Syntax.Lit

Methods

compare :: OverLitVal -> OverLitVal -> Ordering #

(<) :: OverLitVal -> OverLitVal -> Bool #

(<=) :: OverLitVal -> OverLitVal -> Bool #

(>) :: OverLitVal -> OverLitVal -> Bool #

(>=) :: OverLitVal -> OverLitVal -> Bool #

max :: OverLitVal -> OverLitVal -> OverLitVal #

min :: OverLitVal -> OverLitVal -> OverLitVal #

Ord ModuleName 
Instance details

Defined in Language.Haskell.Syntax.Module.Name

Methods

compare :: ModuleName -> ModuleName -> Ordering #

(<) :: ModuleName -> ModuleName -> Bool #

(<=) :: ModuleName -> ModuleName -> Bool #

(>) :: ModuleName -> ModuleName -> Bool #

(>=) :: ModuleName -> ModuleName -> Bool #

max :: ModuleName -> ModuleName -> ModuleName #

min :: ModuleName -> ModuleName -> ModuleName #

Ord RecFieldsDotDot 
Instance details

Defined in Language.Haskell.Syntax.Pat

Methods

compare :: RecFieldsDotDot -> RecFieldsDotDot -> Ordering #

(<) :: RecFieldsDotDot -> RecFieldsDotDot -> Bool #

(<=) :: RecFieldsDotDot -> RecFieldsDotDot -> Bool #

(>) :: RecFieldsDotDot -> RecFieldsDotDot -> Bool #

(>=) :: RecFieldsDotDot -> RecFieldsDotDot -> Bool #

max :: RecFieldsDotDot -> RecFieldsDotDot -> RecFieldsDotDot #

min :: RecFieldsDotDot -> RecFieldsDotDot -> RecFieldsDotDot #

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 ClosureType 
Instance details

Defined in GHC.Exts.Heap.ClosureTypes

Methods

compare :: ClosureType -> ClosureType -> Ordering #

(<) :: ClosureType -> ClosureType -> Bool #

(<=) :: ClosureType -> ClosureType -> Bool #

(>) :: ClosureType -> ClosureType -> Bool #

(>=) :: ClosureType -> ClosureType -> Bool #

max :: ClosureType -> ClosureType -> ClosureType #

min :: ClosureType -> ClosureType -> ClosureType #

Ord PrimType 
Instance details

Defined in GHC.Exts.Heap.Closures

Methods

compare :: PrimType -> PrimType -> Ordering #

(<) :: PrimType -> PrimType -> Bool #

(<=) :: PrimType -> PrimType -> Bool #

(>) :: PrimType -> PrimType -> Bool #

(>=) :: PrimType -> PrimType -> Bool #

max :: PrimType -> PrimType -> PrimType #

min :: PrimType -> PrimType -> PrimType #

Ord TsoFlags 
Instance details

Defined in GHC.Exts.Heap.Closures

Methods

compare :: TsoFlags -> TsoFlags -> Ordering #

(<) :: TsoFlags -> TsoFlags -> Bool #

(<=) :: TsoFlags -> TsoFlags -> Bool #

(>) :: TsoFlags -> TsoFlags -> Bool #

(>=) :: TsoFlags -> TsoFlags -> Bool #

max :: TsoFlags -> TsoFlags -> TsoFlags #

min :: TsoFlags -> TsoFlags -> TsoFlags #

Ord WhatNext 
Instance details

Defined in GHC.Exts.Heap.Closures

Methods

compare :: WhatNext -> WhatNext -> Ordering #

(<) :: WhatNext -> WhatNext -> Bool #

(<=) :: WhatNext -> WhatNext -> Bool #

(>) :: WhatNext -> WhatNext -> Bool #

(>=) :: WhatNext -> WhatNext -> Bool #

max :: WhatNext -> WhatNext -> WhatNext #

min :: WhatNext -> WhatNext -> WhatNext #

Ord WhyBlocked 
Instance details

Defined in GHC.Exts.Heap.Closures

Methods

compare :: WhyBlocked -> WhyBlocked -> Ordering #

(<) :: WhyBlocked -> WhyBlocked -> Bool #

(<=) :: WhyBlocked -> WhyBlocked -> Bool #

(>) :: WhyBlocked -> WhyBlocked -> Bool #

(>=) :: WhyBlocked -> WhyBlocked -> Bool #

max :: WhyBlocked -> WhyBlocked -> WhyBlocked #

min :: WhyBlocked -> WhyBlocked -> WhyBlocked #

Ord CostCentre 
Instance details

Defined in GHC.Exts.Heap.ProfInfo.Types

Methods

compare :: CostCentre -> CostCentre -> Ordering #

(<) :: CostCentre -> CostCentre -> Bool #

(<=) :: CostCentre -> CostCentre -> Bool #

(>) :: CostCentre -> CostCentre -> Bool #

(>=) :: CostCentre -> CostCentre -> Bool #

max :: CostCentre -> CostCentre -> CostCentre #

min :: CostCentre -> CostCentre -> CostCentre #

Ord CostCentreStack 
Instance details

Defined in GHC.Exts.Heap.ProfInfo.Types

Methods

compare :: CostCentreStack -> CostCentreStack -> Ordering #

(<) :: CostCentreStack -> CostCentreStack -> Bool #

(<=) :: CostCentreStack -> CostCentreStack -> Bool #

(>) :: CostCentreStack -> CostCentreStack -> Bool #

(>=) :: CostCentreStack -> CostCentreStack -> Bool #

max :: CostCentreStack -> CostCentreStack -> CostCentreStack #

min :: CostCentreStack -> CostCentreStack -> CostCentreStack #

Ord IndexTable 
Instance details

Defined in GHC.Exts.Heap.ProfInfo.Types

Methods

compare :: IndexTable -> IndexTable -> Ordering #

(<) :: IndexTable -> IndexTable -> Bool #

(<=) :: IndexTable -> IndexTable -> Bool #

(>) :: IndexTable -> IndexTable -> Bool #

(>=) :: IndexTable -> IndexTable -> Bool #

max :: IndexTable -> IndexTable -> IndexTable #

min :: IndexTable -> IndexTable -> IndexTable #

Ord StgTSOProfInfo 
Instance details

Defined in GHC.Exts.Heap.ProfInfo.Types

Methods

compare :: StgTSOProfInfo -> StgTSOProfInfo -> Ordering #

(<) :: StgTSOProfInfo -> StgTSOProfInfo -> Bool #

(<=) :: StgTSOProfInfo -> StgTSOProfInfo -> Bool #

(>) :: StgTSOProfInfo -> StgTSOProfInfo -> Bool #

(>=) :: StgTSOProfInfo -> StgTSOProfInfo -> Bool #

max :: StgTSOProfInfo -> StgTSOProfInfo -> StgTSOProfInfo #

min :: StgTSOProfInfo -> StgTSOProfInfo -> StgTSOProfInfo #

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 Completion 
Instance details

Defined in System.Console.Haskeline.Completion

Methods

compare :: Completion -> Completion -> Ordering #

(<) :: Completion -> Completion -> Bool #

(<=) :: Completion -> Completion -> Bool #

(>) :: Completion -> Completion -> Bool #

(>=) :: Completion -> Completion -> Bool #

max :: Completion -> Completion -> Completion #

min :: Completion -> Completion -> Completion #

Ord Extension 
Instance details

Defined in Language.Haskell.Exts.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.Exts.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.Exts.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 Fixity 
Instance details

Defined in Language.Haskell.Exts.Fixity

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 SrcLoc 
Instance details

Defined in Language.Haskell.Exts.SrcLoc

Methods

compare :: SrcLoc -> SrcLoc -> Ordering #

(<) :: SrcLoc -> SrcLoc -> Bool #

(<=) :: SrcLoc -> SrcLoc -> Bool #

(>) :: SrcLoc -> SrcLoc -> Bool #

(>=) :: SrcLoc -> SrcLoc -> Bool #

max :: SrcLoc -> SrcLoc -> SrcLoc #

min :: SrcLoc -> SrcLoc -> SrcLoc #

Ord SrcSpan 
Instance details

Defined in Language.Haskell.Exts.SrcLoc

Methods

compare :: SrcSpan -> SrcSpan -> Ordering #

(<) :: SrcSpan -> SrcSpan -> Bool #

(<=) :: SrcSpan -> SrcSpan -> Bool #

(>) :: SrcSpan -> SrcSpan -> Bool #

(>=) :: SrcSpan -> SrcSpan -> Bool #

max :: SrcSpan -> SrcSpan -> SrcSpan #

min :: SrcSpan -> SrcSpan -> SrcSpan #

Ord SrcSpanInfo 
Instance details

Defined in Language.Haskell.Exts.SrcLoc

Methods

compare :: SrcSpanInfo -> SrcSpanInfo -> Ordering #

(<) :: SrcSpanInfo -> SrcSpanInfo -> Bool #

(<=) :: SrcSpanInfo -> SrcSpanInfo -> Bool #

(>) :: SrcSpanInfo -> SrcSpanInfo -> Bool #

(>=) :: SrcSpanInfo -> SrcSpanInfo -> Bool #

max :: SrcSpanInfo -> SrcSpanInfo -> SrcSpanInfo #

min :: SrcSpanInfo -> SrcSpanInfo -> SrcSpanInfo #

Ord Boxed 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Boxed -> Boxed -> Ordering #

(<) :: Boxed -> Boxed -> Bool #

(<=) :: Boxed -> Boxed -> Bool #

(>) :: Boxed -> Boxed -> Bool #

(>=) :: Boxed -> Boxed -> Bool #

max :: Boxed -> Boxed -> Boxed #

min :: Boxed -> Boxed -> Boxed #

Ord Tool 
Instance details

Defined in Language.Haskell.Exts.Syntax

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 Cookie 
Instance details

Defined in System.INotify

Methods

compare :: Cookie -> Cookie -> Ordering #

(<) :: Cookie -> Cookie -> Bool #

(<=) :: Cookie -> Cookie -> Bool #

(>) :: Cookie -> Cookie -> Bool #

(>=) :: Cookie -> Cookie -> Bool #

max :: Cookie -> Cookie -> Cookie #

min :: Cookie -> Cookie -> Cookie #

Ord Date 
Instance details

Defined in Time.Types

Methods

compare :: Date -> Date -> Ordering #

(<) :: Date -> Date -> Bool #

(<=) :: Date -> Date -> Bool #

(>) :: Date -> Date -> Bool #

(>=) :: Date -> Date -> Bool #

max :: Date -> Date -> Date #

min :: Date -> Date -> Date #

Ord DateTime 
Instance details

Defined in Time.Types

Methods

compare :: DateTime -> DateTime -> Ordering #

(<) :: DateTime -> DateTime -> Bool #

(<=) :: DateTime -> DateTime -> Bool #

(>) :: DateTime -> DateTime -> Bool #

(>=) :: DateTime -> DateTime -> Bool #

max :: DateTime -> DateTime -> DateTime #

min :: DateTime -> DateTime -> DateTime #

Ord Elapsed 
Instance details

Defined in Time.Types

Methods

compare :: Elapsed -> Elapsed -> Ordering #

(<) :: Elapsed -> Elapsed -> Bool #

(<=) :: Elapsed -> Elapsed -> Bool #

(>) :: Elapsed -> Elapsed -> Bool #

(>=) :: Elapsed -> Elapsed -> Bool #

max :: Elapsed -> Elapsed -> Elapsed #

min :: Elapsed -> Elapsed -> Elapsed #

Ord ElapsedP 
Instance details

Defined in Time.Types

Methods

compare :: ElapsedP -> ElapsedP -> Ordering #

(<) :: ElapsedP -> ElapsedP -> Bool #

(<=) :: ElapsedP -> ElapsedP -> Bool #

(>) :: ElapsedP -> ElapsedP -> Bool #

(>=) :: ElapsedP -> ElapsedP -> Bool #

max :: ElapsedP -> ElapsedP -> ElapsedP #

min :: ElapsedP -> ElapsedP -> ElapsedP #

Ord Hours 
Instance details

Defined in Time.Types

Methods

compare :: Hours -> Hours -> Ordering #

(<) :: Hours -> Hours -> Bool #

(<=) :: Hours -> Hours -> Bool #

(>) :: Hours -> Hours -> Bool #

(>=) :: Hours -> Hours -> Bool #

max :: Hours -> Hours -> Hours #

min :: Hours -> Hours -> Hours #

Ord Minutes 
Instance details

Defined in Time.Types

Methods

compare :: Minutes -> Minutes -> Ordering #

(<) :: Minutes -> Minutes -> Bool #

(<=) :: Minutes -> Minutes -> Bool #

(>) :: Minutes -> Minutes -> Bool #

(>=) :: Minutes -> Minutes -> Bool #

max :: Minutes -> Minutes -> Minutes #

min :: Minutes -> Minutes -> Minutes #

Ord Month 
Instance details

Defined in Time.Types

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 NanoSeconds 
Instance details

Defined in Time.Types

Methods

compare :: NanoSeconds -> NanoSeconds -> Ordering #

(<) :: NanoSeconds -> NanoSeconds -> Bool #

(<=) :: NanoSeconds -> NanoSeconds -> Bool #

(>) :: NanoSeconds -> NanoSeconds -> Bool #

(>=) :: NanoSeconds -> NanoSeconds -> Bool #

max :: NanoSeconds -> NanoSeconds -> NanoSeconds #

min :: NanoSeconds -> NanoSeconds -> NanoSeconds #

Ord Seconds 
Instance details

Defined in Time.Types

Methods

compare :: Seconds -> Seconds -> Ordering #

(<) :: Seconds -> Seconds -> Bool #

(<=) :: Seconds -> Seconds -> Bool #

(>) :: Seconds -> Seconds -> Bool #

(>=) :: Seconds -> Seconds -> Bool #

max :: Seconds -> Seconds -> Seconds #

min :: Seconds -> Seconds -> Seconds #

Ord TimeOfDay 
Instance details

Defined in Time.Types

Methods

compare :: TimeOfDay -> TimeOfDay -> Ordering #

(<) :: TimeOfDay -> TimeOfDay -> Bool #

(<=) :: TimeOfDay -> TimeOfDay -> Bool #

(>) :: TimeOfDay -> TimeOfDay -> Bool #

(>=) :: TimeOfDay -> TimeOfDay -> Bool #

max :: TimeOfDay -> TimeOfDay -> TimeOfDay #

min :: TimeOfDay -> TimeOfDay -> TimeOfDay #

Ord TimezoneOffset 
Instance details

Defined in Time.Types

Methods

compare :: TimezoneOffset -> TimezoneOffset -> Ordering #

(<) :: TimezoneOffset -> TimezoneOffset -> Bool #

(<=) :: TimezoneOffset -> TimezoneOffset -> Bool #

(>) :: TimezoneOffset -> TimezoneOffset -> Bool #

(>=) :: TimezoneOffset -> TimezoneOffset -> Bool #

max :: TimezoneOffset -> TimezoneOffset -> TimezoneOffset #

min :: TimezoneOffset -> TimezoneOffset -> TimezoneOffset #

Ord WeekDay 
Instance details

Defined in Time.Types

Methods

compare :: WeekDay -> WeekDay -> Ordering #

(<) :: WeekDay -> WeekDay -> Bool #

(<=) :: WeekDay -> WeekDay -> Bool #

(>) :: WeekDay -> WeekDay -> Bool #

(>=) :: WeekDay -> WeekDay -> Bool #

max :: WeekDay -> WeekDay -> WeekDay #

min :: WeekDay -> WeekDay -> WeekDay #

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 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 MediaType 
Instance details

Defined in Network.HTTP.Media.MediaType.Internal

Methods

compare :: MediaType -> MediaType -> Ordering #

(<) :: MediaType -> MediaType -> Bool #

(<=) :: MediaType -> MediaType -> Bool #

(>) :: MediaType -> MediaType -> Bool #

(>=) :: MediaType -> MediaType -> Bool #

max :: MediaType -> MediaType -> MediaType #

min :: MediaType -> MediaType -> MediaType #

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

Ord Status 
Instance details

Defined in Network.HTTP.Types.Status

Methods

compare :: Status -> Status -> Ordering #

(<) :: Status -> Status -> Bool #

(<=) :: Status -> Status -> Bool #

(>) :: Status -> Status -> Bool #

(>=) :: Status -> Status -> Bool #

max :: Status -> Status -> Status #

min :: Status -> Status -> 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 Point 
Instance details

Defined in IHP.Postgres.Point

Methods

compare :: Point -> Point -> Ordering #

(<) :: Point -> Point -> Bool #

(<=) :: Point -> Point -> Bool #

(>) :: Point -> Point -> Bool #

(>=) :: Point -> Point -> Bool #

max :: Point -> Point -> Point #

min :: Point -> Point -> Point #

Ord Polygon 
Instance details

Defined in IHP.Postgres.Polygon

Ord Lexeme 
Instance details

Defined in IHP.Postgres.TSVector

Ord LexemeRanking 
Instance details

Defined in IHP.Postgres.TSVector

Ord TSVector 
Instance details

Defined in IHP.Postgres.TSVector

Ord Options 
Instance details

Defined in Data.Functor.Invariant.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 IP 
Instance details

Defined in Net.IP

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 Net.IPv4

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 IPv4Range 
Instance details

Defined in Net.IPv4

Methods

compare :: IPv4Range -> IPv4Range -> Ordering #

(<) :: IPv4Range -> IPv4Range -> Bool #

(<=) :: IPv4Range -> IPv4Range -> Bool #

(>) :: IPv4Range -> IPv4Range -> Bool #

(>=) :: IPv4Range -> IPv4Range -> Bool #

max :: IPv4Range -> IPv4Range -> IPv4Range #

min :: IPv4Range -> IPv4Range -> IPv4Range #

Ord IPv6 
Instance details

Defined in Net.IPv6

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 IPv6Range 
Instance details

Defined in Net.IPv6

Methods

compare :: IPv6Range -> IPv6Range -> Ordering #

(<) :: IPv6Range -> IPv6Range -> Bool #

(<=) :: IPv6Range -> IPv6Range -> Bool #

(>) :: IPv6Range -> IPv6Range -> Bool #

(>=) :: IPv6Range -> IPv6Range -> Bool #

max :: IPv6Range -> IPv6Range -> IPv6Range #

min :: IPv6Range -> IPv6Range -> IPv6Range #

Ord Mac 
Instance details

Defined in Net.Mac

Methods

compare :: Mac -> Mac -> Ordering #

(<) :: Mac -> Mac -> Bool #

(<=) :: Mac -> Mac -> Bool #

(>) :: Mac -> Mac -> Bool #

(>=) :: Mac -> Mac -> Bool #

max :: Mac -> Mac -> Mac #

min :: Mac -> Mac -> Mac #

Ord MacCodec 
Instance details

Defined in Net.Mac

Methods

compare :: MacCodec -> MacCodec -> Ordering #

(<) :: MacCodec -> MacCodec -> Bool #

(<=) :: MacCodec -> MacCodec -> Bool #

(>) :: MacCodec -> MacCodec -> Bool #

(>=) :: MacCodec -> MacCodec -> Bool #

max :: MacCodec -> MacCodec -> MacCodec #

min :: MacCodec -> MacCodec -> MacCodec #

Ord MacGrouping 
Instance details

Defined in Net.Mac

Methods

compare :: MacGrouping -> MacGrouping -> Ordering #

(<) :: MacGrouping -> MacGrouping -> Bool #

(<=) :: MacGrouping -> MacGrouping -> Bool #

(>) :: MacGrouping -> MacGrouping -> Bool #

(>=) :: MacGrouping -> MacGrouping -> Bool #

max :: MacGrouping -> MacGrouping -> MacGrouping #

min :: MacGrouping -> MacGrouping -> MacGrouping #

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 DefName 
Instance details

Defined in Control.Lens.Internal.FieldTH

Methods

compare :: DefName -> DefName -> Ordering #

(<) :: DefName -> DefName -> Bool #

(<=) :: DefName -> DefName -> Bool #

(>) :: DefName -> DefName -> Bool #

(>=) :: DefName -> DefName -> Bool #

max :: DefName -> DefName -> DefName #

min :: DefName -> DefName -> DefName #

Ord TableWithRLS Source # 
Instance details

Defined in IHP.DataSync.RowLevelSecurity

Ord LogLevel Source # 
Instance details

Defined in IHP.Log.Types

Ord Pos 
Instance details

Defined in Text.Megaparsec.Pos

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 SourcePos 
Instance details

Defined in Text.Megaparsec.Pos

Methods

compare :: SourcePos -> SourcePos -> Ordering #

(<) :: SourcePos -> SourcePos -> Bool #

(<=) :: SourcePos -> SourcePos -> Bool #

(>) :: SourcePos -> SourcePos -> Bool #

(>=) :: SourcePos -> SourcePos -> Bool #

max :: SourcePos -> SourcePos -> SourcePos #

min :: SourcePos -> SourcePos -> SourcePos #

Ord ScrubbedBytes 
Instance details

Defined in Data.ByteArray.ScrubbedBytes

Methods

compare :: ScrubbedBytes -> ScrubbedBytes -> Ordering #

(<) :: ScrubbedBytes -> ScrubbedBytes -> Bool #

(<=) :: ScrubbedBytes -> ScrubbedBytes -> Bool #

(>) :: ScrubbedBytes -> ScrubbedBytes -> Bool #

(>=) :: ScrubbedBytes -> ScrubbedBytes -> Bool #

max :: ScrubbedBytes -> ScrubbedBytes -> ScrubbedBytes #

min :: ScrubbedBytes -> ScrubbedBytes -> ScrubbedBytes #

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 IPv4 
Instance details

Defined in Network.Info

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 Network.Info

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 MAC 
Instance details

Defined in Network.Info

Methods

compare :: MAC -> MAC -> Ordering #

(<) :: MAC -> MAC -> Bool #

(<=) :: MAC -> MAC -> Bool #

(>) :: MAC -> MAC -> Bool #

(>=) :: MAC -> MAC -> Bool #

max :: MAC -> MAC -> MAC #

min :: MAC -> MAC -> MAC #

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 TimeLocale 
Instance details

Defined in System.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 CalendarTime 
Instance details

Defined in System.Time

Methods

compare :: CalendarTime -> CalendarTime -> Ordering #

(<) :: CalendarTime -> CalendarTime -> Bool #

(<=) :: CalendarTime -> CalendarTime -> Bool #

(>) :: CalendarTime -> CalendarTime -> Bool #

(>=) :: CalendarTime -> CalendarTime -> Bool #

max :: CalendarTime -> CalendarTime -> CalendarTime #

min :: CalendarTime -> CalendarTime -> CalendarTime #

Ord ClockTime 
Instance details

Defined in System.Time

Methods

compare :: ClockTime -> ClockTime -> Ordering #

(<) :: ClockTime -> ClockTime -> Bool #

(<=) :: ClockTime -> ClockTime -> Bool #

(>) :: ClockTime -> ClockTime -> Bool #

(>=) :: ClockTime -> ClockTime -> Bool #

max :: ClockTime -> ClockTime -> ClockTime #

min :: ClockTime -> ClockTime -> ClockTime #

Ord Day 
Instance details

Defined in System.Time

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 System.Time

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 TimeDiff 
Instance details

Defined in System.Time

Methods

compare :: TimeDiff -> TimeDiff -> Ordering #

(<) :: TimeDiff -> TimeDiff -> Bool #

(<=) :: TimeDiff -> TimeDiff -> Bool #

(>) :: TimeDiff -> TimeDiff -> Bool #

(>=) :: TimeDiff -> TimeDiff -> Bool #

max :: TimeDiff -> TimeDiff -> TimeDiff #

min :: TimeDiff -> TimeDiff -> TimeDiff #

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 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 SourcePos 
Instance details

Defined in Text.Parsec.Pos

Methods

compare :: SourcePos -> SourcePos -> Ordering #

(<) :: SourcePos -> SourcePos -> Bool #

(<=) :: SourcePos -> SourcePos -> Bool #

(>) :: SourcePos -> SourcePos -> Bool #

(>=) :: SourcePos -> SourcePos -> Bool #

max :: SourcePos -> SourcePos -> SourcePos #

min :: SourcePos -> SourcePos -> SourcePos #

Ord Column 
Instance details

Defined in Database.PostgreSQL.LibPQ

Methods

compare :: Column -> Column -> Ordering #

(<) :: Column -> Column -> Bool #

(<=) :: Column -> Column -> Bool #

(>) :: Column -> Column -> Bool #

(>=) :: Column -> Column -> Bool #

max :: Column -> Column -> Column #

min :: Column -> Column -> Column #

Ord LoFd 
Instance details

Defined in Database.PostgreSQL.LibPQ

Methods

compare :: LoFd -> LoFd -> Ordering #

(<) :: LoFd -> LoFd -> Bool #

(<=) :: LoFd -> LoFd -> Bool #

(>) :: LoFd -> LoFd -> Bool #

(>=) :: LoFd -> LoFd -> Bool #

max :: LoFd -> LoFd -> LoFd #

min :: LoFd -> LoFd -> LoFd #

Ord Row 
Instance details

Defined in Database.PostgreSQL.LibPQ

Methods

compare :: Row -> Row -> Ordering #

(<) :: Row -> Row -> Bool #

(<=) :: Row -> Row -> Bool #

(>) :: Row -> Row -> Bool #

(>=) :: Row -> Row -> Bool #

max :: Row -> Row -> Row #

min :: Row -> Row -> Row #

Ord Format 
Instance details

Defined in Database.PostgreSQL.LibPQ.Enums

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 Oid 
Instance details

Defined in Database.PostgreSQL.LibPQ.Oid

Methods

compare :: Oid -> Oid -> Ordering #

(<) :: Oid -> Oid -> Bool #

(<=) :: Oid -> Oid -> Bool #

(>) :: Oid -> Oid -> Bool #

(>=) :: Oid -> Oid -> Bool #

max :: Oid -> Oid -> Oid #

min :: Oid -> Oid -> Oid #

Ord ArrayFormat 
Instance details

Defined in Database.PostgreSQL.Simple.Arrays

Methods

compare :: ArrayFormat -> ArrayFormat -> Ordering #

(<) :: ArrayFormat -> ArrayFormat -> Bool #

(<=) :: ArrayFormat -> ArrayFormat -> Bool #

(>) :: ArrayFormat -> ArrayFormat -> Bool #

(>=) :: ArrayFormat -> ArrayFormat -> Bool #

max :: ArrayFormat -> ArrayFormat -> ArrayFormat #

min :: ArrayFormat -> ArrayFormat -> ArrayFormat #

Ord ConstraintViolation 
Instance details

Defined in Database.PostgreSQL.Simple.Errors

Methods

compare :: ConstraintViolation -> ConstraintViolation -> Ordering #

(<) :: ConstraintViolation -> ConstraintViolation -> Bool #

(<=) :: ConstraintViolation -> ConstraintViolation -> Bool #

(>) :: ConstraintViolation -> ConstraintViolation -> Bool #

(>=) :: ConstraintViolation -> ConstraintViolation -> Bool #

max :: ConstraintViolation -> ConstraintViolation -> ConstraintViolation #

min :: ConstraintViolation -> ConstraintViolation -> ConstraintViolation #

Ord IsolationLevel 
Instance details

Defined in Database.PostgreSQL.Simple.Transaction

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 ReadWriteMode 
Instance details

Defined in Database.PostgreSQL.Simple.Transaction

Methods

compare :: ReadWriteMode -> ReadWriteMode -> Ordering #

(<) :: ReadWriteMode -> ReadWriteMode -> Bool #

(<=) :: ReadWriteMode -> ReadWriteMode -> Bool #

(>) :: ReadWriteMode -> ReadWriteMode -> Bool #

(>=) :: ReadWriteMode -> ReadWriteMode -> Bool #

max :: ReadWriteMode -> ReadWriteMode -> ReadWriteMode #

min :: ReadWriteMode -> ReadWriteMode -> ReadWriteMode #

Ord Identifier 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

compare :: Identifier -> Identifier -> Ordering #

(<) :: Identifier -> Identifier -> Bool #

(<=) :: Identifier -> Identifier -> Bool #

(>) :: Identifier -> Identifier -> Bool #

(>=) :: Identifier -> Identifier -> Bool #

max :: Identifier -> Identifier -> Identifier #

min :: Identifier -> Identifier -> Identifier #

Ord QualifiedIdentifier 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

compare :: QualifiedIdentifier -> QualifiedIdentifier -> Ordering #

(<) :: QualifiedIdentifier -> QualifiedIdentifier -> Bool #

(<=) :: QualifiedIdentifier -> QualifiedIdentifier -> Bool #

(>) :: QualifiedIdentifier -> QualifiedIdentifier -> Bool #

(>=) :: QualifiedIdentifier -> QualifiedIdentifier -> Bool #

max :: QualifiedIdentifier -> QualifiedIdentifier -> QualifiedIdentifier #

min :: QualifiedIdentifier -> QualifiedIdentifier -> QualifiedIdentifier #

Ord Query 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

compare :: Query -> Query -> Ordering #

(<) :: Query -> Query -> Bool #

(<=) :: Query -> Query -> Bool #

(>) :: Query -> Query -> Bool #

(>=) :: Query -> Query -> Bool #

max :: Query -> Query -> Query #

min :: Query -> Query -> Query #

Ord Savepoint 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

compare :: Savepoint -> Savepoint -> Ordering #

(<) :: Savepoint -> Savepoint -> Bool #

(<=) :: Savepoint -> Savepoint -> Bool #

(>) :: Savepoint -> Savepoint -> Bool #

(>=) :: Savepoint -> Savepoint -> Bool #

max :: Savepoint -> Savepoint -> Savepoint #

min :: Savepoint -> Savepoint -> Savepoint #

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 Addr 
Instance details

Defined in Data.Primitive.Addr

Methods

compare :: Addr -> Addr -> Ordering #

(<) :: Addr -> Addr -> Bool #

(<=) :: Addr -> Addr -> Bool #

(>) :: Addr -> Addr -> Bool #

(>=) :: Addr -> Addr -> Bool #

max :: Addr -> Addr -> Addr #

min :: Addr -> Addr -> Addr #

Ord Salt 
Instance details

Defined in Crypto.PasswordStore

Methods

compare :: Salt -> Salt -> Ordering #

(<) :: Salt -> Salt -> Bool #

(<=) :: Salt -> Salt -> Bool #

(>) :: Salt -> Salt -> Bool #

(>=) :: Salt -> Salt -> Bool #

max :: Salt -> Salt -> Salt #

min :: Salt -> Salt -> Salt #

Ord DoPa 
Instance details

Defined in Text.Regex.TDFA.Common

Methods

compare :: DoPa -> DoPa -> Ordering #

(<) :: DoPa -> DoPa -> Bool #

(<=) :: DoPa -> DoPa -> Bool #

(>) :: DoPa -> DoPa -> Bool #

(>=) :: DoPa -> DoPa -> Bool #

max :: DoPa -> DoPa -> DoPa #

min :: DoPa -> DoPa -> DoPa #

Ord WhichTest 
Instance details

Defined in Text.Regex.TDFA.Common

Methods

compare :: WhichTest -> WhichTest -> Ordering #

(<) :: WhichTest -> WhichTest -> Bool #

(<=) :: WhichTest -> WhichTest -> Bool #

(>) :: WhichTest -> WhichTest -> Bool #

(>=) :: WhichTest -> WhichTest -> Bool #

max :: WhichTest -> WhichTest -> WhichTest #

min :: WhichTest -> WhichTest -> WhichTest #

Ord PatternSetCharacterClass 
Instance details

Defined in Text.Regex.TDFA.Pattern

Methods

compare :: PatternSetCharacterClass -> PatternSetCharacterClass -> Ordering #

(<) :: PatternSetCharacterClass -> PatternSetCharacterClass -> Bool #

(<=) :: PatternSetCharacterClass -> PatternSetCharacterClass -> Bool #

(>) :: PatternSetCharacterClass -> PatternSetCharacterClass -> Bool #

(>=) :: PatternSetCharacterClass -> PatternSetCharacterClass -> Bool #

max :: PatternSetCharacterClass -> PatternSetCharacterClass -> PatternSetCharacterClass #

min :: PatternSetCharacterClass -> PatternSetCharacterClass -> PatternSetCharacterClass #

Ord PatternSetCollatingElement 
Instance details

Defined in Text.Regex.TDFA.Pattern

Methods

compare :: PatternSetCollatingElement -> PatternSetCollatingElement -> Ordering #

(<) :: PatternSetCollatingElement -> PatternSetCollatingElement -> Bool #

(<=) :: PatternSetCollatingElement -> PatternSetCollatingElement -> Bool #

(>) :: PatternSetCollatingElement -> PatternSetCollatingElement -> Bool #

(>=) :: PatternSetCollatingElement -> PatternSetCollatingElement -> Bool #

max :: PatternSetCollatingElement -> PatternSetCollatingElement -> PatternSetCollatingElement #

min :: PatternSetCollatingElement -> PatternSetCollatingElement -> PatternSetCollatingElement #

Ord PatternSetEquivalenceClass 
Instance details

Defined in Text.Regex.TDFA.Pattern

Methods

compare :: PatternSetEquivalenceClass -> PatternSetEquivalenceClass -> Ordering #

(<) :: PatternSetEquivalenceClass -> PatternSetEquivalenceClass -> Bool #

(<=) :: PatternSetEquivalenceClass -> PatternSetEquivalenceClass -> Bool #

(>) :: PatternSetEquivalenceClass -> PatternSetEquivalenceClass -> Bool #

(>=) :: PatternSetEquivalenceClass -> PatternSetEquivalenceClass -> Bool #

max :: PatternSetEquivalenceClass -> PatternSetEquivalenceClass -> PatternSetEquivalenceClass #

min :: PatternSetEquivalenceClass -> PatternSetEquivalenceClass -> PatternSetEquivalenceClass #

Ord Undefined 
Instance details

Defined in Relude.Debug

Methods

compare :: Undefined -> Undefined -> Ordering #

(<) :: Undefined -> Undefined -> Bool #

(<=) :: Undefined -> Undefined -> Bool #

(>) :: Undefined -> Undefined -> Bool #

(>=) :: Undefined -> Undefined -> Bool #

max :: Undefined -> Undefined -> Undefined #

min :: Undefined -> Undefined -> Undefined #

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 Skein_1024_1024 
Instance details

Defined in Crypto.Skein

Methods

compare :: Skein_1024_1024 -> Skein_1024_1024 -> Ordering #

(<) :: Skein_1024_1024 -> Skein_1024_1024 -> Bool #

(<=) :: Skein_1024_1024 -> Skein_1024_1024 -> Bool #

(>) :: Skein_1024_1024 -> Skein_1024_1024 -> Bool #

(>=) :: Skein_1024_1024 -> Skein_1024_1024 -> Bool #

max :: Skein_1024_1024 -> Skein_1024_1024 -> Skein_1024_1024 #

min :: Skein_1024_1024 -> Skein_1024_1024 -> Skein_1024_1024 #

Ord Skein_1024_384 
Instance details

Defined in Crypto.Skein

Methods

compare :: Skein_1024_384 -> Skein_1024_384 -> Ordering #

(<) :: Skein_1024_384 -> Skein_1024_384 -> Bool #

(<=) :: Skein_1024_384 -> Skein_1024_384 -> Bool #

(>) :: Skein_1024_384 -> Skein_1024_384 -> Bool #

(>=) :: Skein_1024_384 -> Skein_1024_384 -> Bool #

max :: Skein_1024_384 -> Skein_1024_384 -> Skein_1024_384 #

min :: Skein_1024_384 -> Skein_1024_384 -> Skein_1024_384 #

Ord Skein_1024_512 
Instance details

Defined in Crypto.Skein

Methods

compare :: Skein_1024_512 -> Skein_1024_512 -> Ordering #

(<) :: Skein_1024_512 -> Skein_1024_512 -> Bool #

(<=) :: Skein_1024_512 -> Skein_1024_512 -> Bool #

(>) :: Skein_1024_512 -> Skein_1024_512 -> Bool #

(>=) :: Skein_1024_512 -> Skein_1024_512 -> Bool #

max :: Skein_1024_512 -> Skein_1024_512 -> Skein_1024_512 #

min :: Skein_1024_512 -> Skein_1024_512 -> Skein_1024_512 #

Ord Skein_256_128 
Instance details

Defined in Crypto.Skein

Methods

compare :: Skein_256_128 -> Skein_256_128 -> Ordering #

(<) :: Skein_256_128 -> Skein_256_128 -> Bool #

(<=) :: Skein_256_128 -> Skein_256_128 -> Bool #

(>) :: Skein_256_128 -> Skein_256_128 -> Bool #

(>=) :: Skein_256_128 -> Skein_256_128 -> Bool #

max :: Skein_256_128 -> Skein_256_128 -> Skein_256_128 #

min :: Skein_256_128 -> Skein_256_128 -> Skein_256_128 #

Ord Skein_256_160 
Instance details

Defined in Crypto.Skein

Methods

compare :: Skein_256_160 -> Skein_256_160 -> Ordering #

(<) :: Skein_256_160 -> Skein_256_160 -> Bool #

(<=) :: Skein_256_160 -> Skein_256_160 -> Bool #

(>) :: Skein_256_160 -> Skein_256_160 -> Bool #

(>=) :: Skein_256_160 -> Skein_256_160 -> Bool #

max :: Skein_256_160 -> Skein_256_160 -> Skein_256_160 #

min :: Skein_256_160 -> Skein_256_160 -> Skein_256_160 #

Ord Skein_256_224 
Instance details

Defined in Crypto.Skein

Methods

compare :: Skein_256_224 -> Skein_256_224 -> Ordering #

(<) :: Skein_256_224 -> Skein_256_224 -> Bool #

(<=) :: Skein_256_224 -> Skein_256_224 -> Bool #

(>) :: Skein_256_224 -> Skein_256_224 -> Bool #

(>=) :: Skein_256_224 -> Skein_256_224 -> Bool #

max :: Skein_256_224 -> Skein_256_224 -> Skein_256_224 #

min :: Skein_256_224 -> Skein_256_224 -> Skein_256_224 #

Ord Skein_256_256 
Instance details

Defined in Crypto.Skein

Methods

compare :: Skein_256_256 -> Skein_256_256 -> Ordering #

(<) :: Skein_256_256 -> Skein_256_256 -> Bool #

(<=) :: Skein_256_256 -> Skein_256_256 -> Bool #

(>) :: Skein_256_256 -> Skein_256_256 -> Bool #

(>=) :: Skein_256_256 -> Skein_256_256 -> Bool #

max :: Skein_256_256 -> Skein_256_256 -> Skein_256_256 #

min :: Skein_256_256 -> Skein_256_256 -> Skein_256_256 #

Ord Skein_512_128 
Instance details

Defined in Crypto.Skein

Methods

compare :: Skein_512_128 -> Skein_512_128 -> Ordering #

(<) :: Skein_512_128 -> Skein_512_128 -> Bool #

(<=) :: Skein_512_128 -> Skein_512_128 -> Bool #

(>) :: Skein_512_128 -> Skein_512_128 -> Bool #

(>=) :: Skein_512_128 -> Skein_512_128 -> Bool #

max :: Skein_512_128 -> Skein_512_128 -> Skein_512_128 #

min :: Skein_512_128 -> Skein_512_128 -> Skein_512_128 #

Ord Skein_512_160 
Instance details

Defined in Crypto.Skein

Methods

compare :: Skein_512_160 -> Skein_512_160 -> Ordering #

(<) :: Skein_512_160 -> Skein_512_160 -> Bool #

(<=) :: Skein_512_160 -> Skein_512_160 -> Bool #

(>) :: Skein_512_160 -> Skein_512_160 -> Bool #

(>=) :: Skein_512_160 -> Skein_512_160 -> Bool #

max :: Skein_512_160 -> Skein_512_160 -> Skein_512_160 #

min :: Skein_512_160 -> Skein_512_160 -> Skein_512_160 #

Ord Skein_512_224 
Instance details

Defined in Crypto.Skein

Methods

compare :: Skein_512_224 -> Skein_512_224 -> Ordering #

(<) :: Skein_512_224 -> Skein_512_224 -> Bool #

(<=) :: Skein_512_224 -> Skein_512_224 -> Bool #

(>) :: Skein_512_224 -> Skein_512_224 -> Bool #

(>=) :: Skein_512_224 -> Skein_512_224 -> Bool #

max :: Skein_512_224 -> Skein_512_224 -> Skein_512_224 #

min :: Skein_512_224 -> Skein_512_224 -> Skein_512_224 #

Ord Skein_512_256 
Instance details

Defined in Crypto.Skein

Methods

compare :: Skein_512_256 -> Skein_512_256 -> Ordering #

(<) :: Skein_512_256 -> Skein_512_256 -> Bool #

(<=) :: Skein_512_256 -> Skein_512_256 -> Bool #

(>) :: Skein_512_256 -> Skein_512_256 -> Bool #

(>=) :: Skein_512_256 -> Skein_512_256 -> Bool #

max :: Skein_512_256 -> Skein_512_256 -> Skein_512_256 #

min :: Skein_512_256 -> Skein_512_256 -> Skein_512_256 #

Ord Skein_512_384 
Instance details

Defined in Crypto.Skein

Methods

compare :: Skein_512_384 -> Skein_512_384 -> Ordering #

(<) :: Skein_512_384 -> Skein_512_384 -> Bool #

(<=) :: Skein_512_384 -> Skein_512_384 -> Bool #

(>) :: Skein_512_384 -> Skein_512_384 -> Bool #

(>=) :: Skein_512_384 -> Skein_512_384 -> Bool #

max :: Skein_512_384 -> Skein_512_384 -> Skein_512_384 #

min :: Skein_512_384 -> Skein_512_384 -> Skein_512_384 #

Ord Skein_512_512 
Instance details

Defined in Crypto.Skein

Methods

compare :: Skein_512_512 -> Skein_512_512 -> Ordering #

(<) :: Skein_512_512 -> Skein_512_512 -> Bool #

(<=) :: Skein_512_512 -> Skein_512_512 -> Bool #

(>) :: Skein_512_512 -> Skein_512_512 -> Bool #

(>=) :: Skein_512_512 -> Skein_512_512 -> Bool #

max :: Skein_512_512 -> Skein_512_512 -> Skein_512_512 #

min :: Skein_512_512 -> Skein_512_512 -> Skein_512_512 #

Ord SocksAddress 
Instance details

Defined in Network.Socks5.Types

Methods

compare :: SocksAddress -> SocksAddress -> Ordering #

(<) :: SocksAddress -> SocksAddress -> Bool #

(<=) :: SocksAddress -> SocksAddress -> Bool #

(>) :: SocksAddress -> SocksAddress -> Bool #

(>=) :: SocksAddress -> SocksAddress -> Bool #

max :: SocksAddress -> SocksAddress -> SocksAddress #

min :: SocksAddress -> SocksAddress -> SocksAddress #

Ord SocksCommand 
Instance details

Defined in Network.Socks5.Types

Methods

compare :: SocksCommand -> SocksCommand -> Ordering #

(<) :: SocksCommand -> SocksCommand -> Bool #

(<=) :: SocksCommand -> SocksCommand -> Bool #

(>) :: SocksCommand -> SocksCommand -> Bool #

(>=) :: SocksCommand -> SocksCommand -> Bool #

max :: SocksCommand -> SocksCommand -> SocksCommand #

min :: SocksCommand -> SocksCommand -> SocksCommand #

Ord SocksError 
Instance details

Defined in Network.Socks5.Types

Methods

compare :: SocksError -> SocksError -> Ordering #

(<) :: SocksError -> SocksError -> Bool #

(<=) :: SocksError -> SocksError -> Bool #

(>) :: SocksError -> SocksError -> Bool #

(>=) :: SocksError -> SocksError -> Bool #

max :: SocksError -> SocksError -> SocksError #

min :: SocksError -> SocksError -> SocksError #

Ord SocksHostAddress 
Instance details

Defined in Network.Socks5.Types

Methods

compare :: SocksHostAddress -> SocksHostAddress -> Ordering #

(<) :: SocksHostAddress -> SocksHostAddress -> Bool #

(<=) :: SocksHostAddress -> SocksHostAddress -> Bool #

(>) :: SocksHostAddress -> SocksHostAddress -> Bool #

(>=) :: SocksHostAddress -> SocksHostAddress -> Bool #

max :: SocksHostAddress -> SocksHostAddress -> SocksHostAddress #

min :: SocksHostAddress -> SocksHostAddress -> SocksHostAddress #

Ord SocksMethod 
Instance details

Defined in Network.Socks5.Types

Methods

compare :: SocksMethod -> SocksMethod -> Ordering #

(<) :: SocksMethod -> SocksMethod -> Bool #

(<=) :: SocksMethod -> SocksMethod -> Bool #

(>) :: SocksMethod -> SocksMethod -> Bool #

(>=) :: SocksMethod -> SocksMethod -> Bool #

max :: SocksMethod -> SocksMethod -> SocksMethod #

min :: SocksMethod -> SocksMethod -> SocksMethod #

Ord SocksReply 
Instance details

Defined in Network.Socks5.Types

Methods

compare :: SocksReply -> SocksReply -> Ordering #

(<) :: SocksReply -> SocksReply -> Bool #

(<=) :: SocksReply -> SocksReply -> Bool #

(>) :: SocksReply -> SocksReply -> Bool #

(>=) :: SocksReply -> SocksReply -> Bool #

max :: SocksReply -> SocksReply -> SocksReply #

min :: SocksReply -> SocksReply -> SocksReply #

Ord SocksVersion 
Instance details

Defined in Network.Socks5.Types

Methods

compare :: SocksVersion -> SocksVersion -> Ordering #

(<) :: SocksVersion -> SocksVersion -> Bool #

(<=) :: SocksVersion -> SocksVersion -> Bool #

(>) :: SocksVersion -> SocksVersion -> Bool #

(>=) :: SocksVersion -> SocksVersion -> Bool #

max :: SocksVersion -> SocksVersion -> SocksVersion #

min :: SocksVersion -> SocksVersion -> SocksVersion #

Ord FileType 
Instance details

Defined in Data.Streaming.Filesystem

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 HostPreference 
Instance details

Defined in Data.Streaming.Network.Internal

Methods

compare :: HostPreference -> HostPreference -> Ordering #

(<) :: HostPreference -> HostPreference -> Bool #

(<=) :: HostPreference -> HostPreference -> Bool #

(>) :: HostPreference -> HostPreference -> Bool #

(>=) :: HostPreference -> HostPreference -> Bool #

max :: HostPreference -> HostPreference -> HostPreference #

min :: HostPreference -> HostPreference -> HostPreference #

Ord Strategy 
Instance details

Defined in Data.Streaming.Zlib.Lowlevel

Methods

compare :: Strategy -> Strategy -> Ordering #

(<) :: Strategy -> Strategy -> Bool #

(<=) :: Strategy -> Strategy -> Bool #

(>) :: Strategy -> Strategy -> Bool #

(>=) :: Strategy -> Strategy -> Bool #

max :: Strategy -> Strategy -> Strategy #

min :: Strategy -> Strategy -> Strategy #

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 Color 
Instance details

Defined in System.Console.Terminfo.Color

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 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 DayOfWeek 
Instance details

Defined in Data.Time.Calendar.Week

Ord DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Ord NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Ord SystemTime 
Instance details

Defined in Data.Time.Clock.Internal.SystemTime

Methods

compare :: SystemTime -> SystemTime -> Ordering #

(<) :: SystemTime -> SystemTime -> Bool #

(<=) :: SystemTime -> SystemTime -> Bool #

(>) :: SystemTime -> SystemTime -> Bool #

(>=) :: SystemTime -> SystemTime -> Bool #

max :: SystemTime -> SystemTime -> SystemTime #

min :: SystemTime -> SystemTime -> SystemTime #

Ord UTCTime 
Instance details

Defined in Data.Time.Clock.Internal.UTCTime

Ord UniversalTime 
Instance details

Defined in Data.Time.Clock.Internal.UniversalTime

Ord TimeLocale 
Instance details

Defined in Data.Time.Format.Locale

Ord LocalTime 
Instance details

Defined in Data.Time.LocalTime.Internal.LocalTime

Ord TimeOfDay 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeOfDay

Ord TimeZone 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeZone

Ord Attosecond 
Instance details

Defined in Data.Time.Units

Methods

compare :: Attosecond -> Attosecond -> Ordering #

(<) :: Attosecond -> Attosecond -> Bool #

(<=) :: Attosecond -> Attosecond -> Bool #

(>) :: Attosecond -> Attosecond -> Bool #

(>=) :: Attosecond -> Attosecond -> Bool #

max :: Attosecond -> Attosecond -> Attosecond #

min :: Attosecond -> Attosecond -> Attosecond #

Ord Day 
Instance details

Defined in Data.Time.Units

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 Femtosecond 
Instance details

Defined in Data.Time.Units

Methods

compare :: Femtosecond -> Femtosecond -> Ordering #

(<) :: Femtosecond -> Femtosecond -> Bool #

(<=) :: Femtosecond -> Femtosecond -> Bool #

(>) :: Femtosecond -> Femtosecond -> Bool #

(>=) :: Femtosecond -> Femtosecond -> Bool #

max :: Femtosecond -> Femtosecond -> Femtosecond #

min :: Femtosecond -> Femtosecond -> Femtosecond #

Ord Fortnight 
Instance details

Defined in Data.Time.Units

Methods

compare :: Fortnight -> Fortnight -> Ordering #

(<) :: Fortnight -> Fortnight -> Bool #

(<=) :: Fortnight -> Fortnight -> Bool #

(>) :: Fortnight -> Fortnight -> Bool #

(>=) :: Fortnight -> Fortnight -> Bool #

max :: Fortnight -> Fortnight -> Fortnight #

min :: Fortnight -> Fortnight -> Fortnight #

Ord Hour 
Instance details

Defined in Data.Time.Units

Methods

compare :: Hour -> Hour -> Ordering #

(<) :: Hour -> Hour -> Bool #

(<=) :: Hour -> Hour -> Bool #

(>) :: Hour -> Hour -> Bool #

(>=) :: Hour -> Hour -> Bool #

max :: Hour -> Hour -> Hour #

min :: Hour -> Hour -> Hour #

Ord Microsecond 
Instance details

Defined in Data.Time.Units

Methods

compare :: Microsecond -> Microsecond -> Ordering #

(<) :: Microsecond -> Microsecond -> Bool #

(<=) :: Microsecond -> Microsecond -> Bool #

(>) :: Microsecond -> Microsecond -> Bool #

(>=) :: Microsecond -> Microsecond -> Bool #

max :: Microsecond -> Microsecond -> Microsecond #

min :: Microsecond -> Microsecond -> Microsecond #

Ord Millisecond 
Instance details

Defined in Data.Time.Units

Methods

compare :: Millisecond -> Millisecond -> Ordering #

(<) :: Millisecond -> Millisecond -> Bool #

(<=) :: Millisecond -> Millisecond -> Bool #

(>) :: Millisecond -> Millisecond -> Bool #

(>=) :: Millisecond -> Millisecond -> Bool #

max :: Millisecond -> Millisecond -> Millisecond #

min :: Millisecond -> Millisecond -> Millisecond #

Ord Minute 
Instance details

Defined in Data.Time.Units

Methods

compare :: Minute -> Minute -> Ordering #

(<) :: Minute -> Minute -> Bool #

(<=) :: Minute -> Minute -> Bool #

(>) :: Minute -> Minute -> Bool #

(>=) :: Minute -> Minute -> Bool #

max :: Minute -> Minute -> Minute #

min :: Minute -> Minute -> Minute #

Ord Nanosecond 
Instance details

Defined in Data.Time.Units

Methods

compare :: Nanosecond -> Nanosecond -> Ordering #

(<) :: Nanosecond -> Nanosecond -> Bool #

(<=) :: Nanosecond -> Nanosecond -> Bool #

(>) :: Nanosecond -> Nanosecond -> Bool #

(>=) :: Nanosecond -> Nanosecond -> Bool #

max :: Nanosecond -> Nanosecond -> Nanosecond #

min :: Nanosecond -> Nanosecond -> Nanosecond #

Ord Picosecond 
Instance details

Defined in Data.Time.Units

Methods

compare :: Picosecond -> Picosecond -> Ordering #

(<) :: Picosecond -> Picosecond -> Bool #

(<=) :: Picosecond -> Picosecond -> Bool #

(>) :: Picosecond -> Picosecond -> Bool #

(>=) :: Picosecond -> Picosecond -> Bool #

max :: Picosecond -> Picosecond -> Picosecond #

min :: Picosecond -> Picosecond -> Picosecond #

Ord Second 
Instance details

Defined in Data.Time.Units

Methods

compare :: Second -> Second -> Ordering #

(<) :: Second -> Second -> Bool #

(<=) :: Second -> Second -> Bool #

(>) :: Second -> Second -> Bool #

(>=) :: Second -> Second -> Bool #

max :: Second -> Second -> Second #

min :: Second -> Second -> Second #

Ord Week 
Instance details

Defined in Data.Time.Units

Methods

compare :: Week -> Week -> Ordering #

(<) :: Week -> Week -> Bool #

(<=) :: Week -> Week -> Bool #

(>) :: Week -> Week -> Bool #

(>=) :: Week -> Week -> Bool #

max :: Week -> Week -> Week #

min :: Week -> Week -> Week #

Ord ByteArrayPair 
Instance details

Defined in Data.Tuple.Types

Methods

compare :: ByteArrayPair -> ByteArrayPair -> Ordering #

(<) :: ByteArrayPair -> ByteArrayPair -> Bool #

(<=) :: ByteArrayPair -> ByteArrayPair -> Bool #

(>) :: ByteArrayPair -> ByteArrayPair -> Bool #

(>=) :: ByteArrayPair -> ByteArrayPair -> Bool #

max :: ByteArrayPair -> ByteArrayPair -> ByteArrayPair #

min :: ByteArrayPair -> ByteArrayPair -> ByteArrayPair #

Ord ByteArrayTriple 
Instance details

Defined in Data.Tuple.Types

Methods

compare :: ByteArrayTriple -> ByteArrayTriple -> Ordering #

(<) :: ByteArrayTriple -> ByteArrayTriple -> Bool #

(<=) :: ByteArrayTriple -> ByteArrayTriple -> Bool #

(>) :: ByteArrayTriple -> ByteArrayTriple -> Bool #

(>=) :: ByteArrayTriple -> ByteArrayTriple -> Bool #

max :: ByteArrayTriple -> ByteArrayTriple -> ByteArrayTriple #

min :: ByteArrayTriple -> ByteArrayTriple -> ByteArrayTriple #

Ord DoublePair 
Instance details

Defined in Data.Tuple.Types

Methods

compare :: DoublePair -> DoublePair -> Ordering #

(<) :: DoublePair -> DoublePair -> Bool #

(<=) :: DoublePair -> DoublePair -> Bool #

(>) :: DoublePair -> DoublePair -> Bool #

(>=) :: DoublePair -> DoublePair -> Bool #

max :: DoublePair -> DoublePair -> DoublePair #

min :: DoublePair -> DoublePair -> DoublePair #

Ord DoubleTriple 
Instance details

Defined in Data.Tuple.Types

Methods

compare :: DoubleTriple -> DoubleTriple -> Ordering #

(<) :: DoubleTriple -> DoubleTriple -> Bool #

(<=) :: DoubleTriple -> DoubleTriple -> Bool #

(>) :: DoubleTriple -> DoubleTriple -> Bool #

(>=) :: DoubleTriple -> DoubleTriple -> Bool #

max :: DoubleTriple -> DoubleTriple -> DoubleTriple #

min :: DoubleTriple -> DoubleTriple -> DoubleTriple #

Ord IntPair 
Instance details

Defined in Data.Tuple.Types

Methods

compare :: IntPair -> IntPair -> Ordering #

(<) :: IntPair -> IntPair -> Bool #

(<=) :: IntPair -> IntPair -> Bool #

(>) :: IntPair -> IntPair -> Bool #

(>=) :: IntPair -> IntPair -> Bool #

max :: IntPair -> IntPair -> IntPair #

min :: IntPair -> IntPair -> IntPair #

Ord IntTriple 
Instance details

Defined in Data.Tuple.Types

Methods

compare :: IntTriple -> IntTriple -> Ordering #

(<) :: IntTriple -> IntTriple -> Bool #

(<=) :: IntTriple -> IntTriple -> Bool #

(>) :: IntTriple -> IntTriple -> Bool #

(>=) :: IntTriple -> IntTriple -> Bool #

max :: IntTriple -> IntTriple -> IntTriple #

min :: IntTriple -> IntTriple -> IntTriple #

Ord WordPair 
Instance details

Defined in Data.Tuple.Types

Methods

compare :: WordPair -> WordPair -> Ordering #

(<) :: WordPair -> WordPair -> Bool #

(<=) :: WordPair -> WordPair -> Bool #

(>) :: WordPair -> WordPair -> Bool #

(>=) :: WordPair -> WordPair -> Bool #

max :: WordPair -> WordPair -> WordPair #

min :: WordPair -> WordPair -> WordPair #

Ord WordTriple 
Instance details

Defined in Data.Tuple.Types

Methods

compare :: WordTriple -> WordTriple -> Ordering #

(<) :: WordTriple -> WordTriple -> Bool #

(<=) :: WordTriple -> WordTriple -> Bool #

(>) :: WordTriple -> WordTriple -> Bool #

(>=) :: WordTriple -> WordTriple -> Bool #

max :: WordTriple -> WordTriple -> WordTriple #

min :: WordTriple -> WordTriple -> WordTriple #

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 Piece 
Instance details

Defined in WaiAppStatic.Types

Methods

compare :: Piece -> Piece -> Ordering #

(<) :: Piece -> Piece -> Bool #

(<=) :: Piece -> Piece -> Bool #

(>) :: Piece -> Piece -> Bool #

(>=) :: Piece -> Piece -> Bool #

max :: Piece -> Piece -> Piece #

min :: Piece -> Piece -> Piece #

Ord CorsResourcePolicy 
Instance details

Defined in Network.Wai.Middleware.Cors

Methods

compare :: CorsResourcePolicy -> CorsResourcePolicy -> Ordering #

(<) :: CorsResourcePolicy -> CorsResourcePolicy -> Bool #

(<=) :: CorsResourcePolicy -> CorsResourcePolicy -> Bool #

(>) :: CorsResourcePolicy -> CorsResourcePolicy -> Bool #

(>=) :: CorsResourcePolicy -> CorsResourcePolicy -> Bool #

max :: CorsResourcePolicy -> CorsResourcePolicy -> CorsResourcePolicy #

min :: CorsResourcePolicy -> CorsResourcePolicy -> CorsResourcePolicy #

Ord RequestSizeException 
Instance details

Defined in Network.Wai.Request

Methods

compare :: RequestSizeException -> RequestSizeException -> Ordering #

(<) :: RequestSizeException -> RequestSizeException -> Bool #

(<=) :: RequestSizeException -> RequestSizeException -> Bool #

(>) :: RequestSizeException -> RequestSizeException -> Bool #

(>=) :: RequestSizeException -> RequestSizeException -> Bool #

max :: RequestSizeException -> RequestSizeException -> RequestSizeException #

min :: RequestSizeException -> RequestSizeException -> RequestSizeException #

Ord ConnectionType 
Instance details

Defined in Network.WebSockets.Types

Methods

compare :: ConnectionType -> ConnectionType -> Ordering #

(<) :: ConnectionType -> ConnectionType -> Bool #

(<=) :: ConnectionType -> ConnectionType -> Bool #

(>) :: ConnectionType -> ConnectionType -> Bool #

(>=) :: ConnectionType -> ConnectionType -> Bool #

max :: ConnectionType -> ConnectionType -> ConnectionType #

min :: ConnectionType -> ConnectionType -> ConnectionType #

Ord Int128 
Instance details

Defined in Data.WideWord.Int128

Methods

compare :: Int128 -> Int128 -> Ordering #

(<) :: Int128 -> Int128 -> Bool #

(<=) :: Int128 -> Int128 -> Bool #

(>) :: Int128 -> Int128 -> Bool #

(>=) :: Int128 -> Int128 -> Bool #

max :: Int128 -> Int128 -> Int128 #

min :: Int128 -> Int128 -> Int128 #

Ord Word128 
Instance details

Defined in Data.WideWord.Word128

Methods

compare :: Word128 -> Word128 -> Ordering #

(<) :: Word128 -> Word128 -> Bool #

(<=) :: Word128 -> Word128 -> Bool #

(>) :: Word128 -> Word128 -> Bool #

(>=) :: Word128 -> Word128 -> Bool #

max :: Word128 -> Word128 -> Word128 #

min :: Word128 -> Word128 -> Word128 #

Ord Word256 
Instance details

Defined in Data.WideWord.Word256

Methods

compare :: Word256 -> Word256 -> Ordering #

(<) :: Word256 -> Word256 -> Bool #

(<=) :: Word256 -> Word256 -> Bool #

(>) :: Word256 -> Word256 -> Bool #

(>=) :: Word256 -> Word256 -> Bool #

max :: Word256 -> Word256 -> Word256 #

min :: Word256 -> Word256 -> Word256 #

Ord Element 
Instance details

Defined in Text.XML

Methods

compare :: Element -> Element -> Ordering #

(<) :: Element -> Element -> Bool #

(<=) :: Element -> Element -> Bool #

(>) :: Element -> Element -> Bool #

(>=) :: Element -> Element -> Bool #

max :: Element -> Element -> Element #

min :: Element -> Element -> Element #

Ord Node 
Instance details

Defined in Text.XML

Methods

compare :: Node -> Node -> Ordering #

(<) :: Node -> Node -> Bool #

(<=) :: Node -> Node -> Bool #

(>) :: Node -> Node -> Bool #

(>=) :: Node -> Node -> Bool #

max :: Node -> Node -> Node #

min :: Node -> Node -> Node #

Ord Content 
Instance details

Defined in Data.XML.Types

Methods

compare :: Content -> Content -> Ordering #

(<) :: Content -> Content -> Bool #

(<=) :: Content -> Content -> Bool #

(>) :: Content -> Content -> Bool #

(>=) :: Content -> Content -> Bool #

max :: Content -> Content -> Content #

min :: Content -> Content -> Content #

Ord Doctype 
Instance details

Defined in Data.XML.Types

Methods

compare :: Doctype -> Doctype -> Ordering #

(<) :: Doctype -> Doctype -> Bool #

(<=) :: Doctype -> Doctype -> Bool #

(>) :: Doctype -> Doctype -> Bool #

(>=) :: Doctype -> Doctype -> Bool #

max :: Doctype -> Doctype -> Doctype #

min :: Doctype -> Doctype -> Doctype #

Ord Document 
Instance details

Defined in Data.XML.Types

Methods

compare :: Document -> Document -> Ordering #

(<) :: Document -> Document -> Bool #

(<=) :: Document -> Document -> Bool #

(>) :: Document -> Document -> Bool #

(>=) :: Document -> Document -> Bool #

max :: Document -> Document -> Document #

min :: Document -> Document -> Document #

Ord Element 
Instance details

Defined in Data.XML.Types

Methods

compare :: Element -> Element -> Ordering #

(<) :: Element -> Element -> Bool #

(<=) :: Element -> Element -> Bool #

(>) :: Element -> Element -> Bool #

(>=) :: Element -> Element -> Bool #

max :: Element -> Element -> Element #

min :: Element -> Element -> Element #

Ord Event 
Instance details

Defined in Data.XML.Types

Methods

compare :: Event -> Event -> Ordering #

(<) :: Event -> Event -> Bool #

(<=) :: Event -> Event -> Bool #

(>) :: Event -> Event -> Bool #

(>=) :: Event -> Event -> Bool #

max :: Event -> Event -> Event #

min :: Event -> Event -> Event #

Ord ExternalID 
Instance details

Defined in Data.XML.Types

Methods

compare :: ExternalID -> ExternalID -> Ordering #

(<) :: ExternalID -> ExternalID -> Bool #

(<=) :: ExternalID -> ExternalID -> Bool #

(>) :: ExternalID -> ExternalID -> Bool #

(>=) :: ExternalID -> ExternalID -> Bool #

max :: ExternalID -> ExternalID -> ExternalID #

min :: ExternalID -> ExternalID -> ExternalID #

Ord Instruction 
Instance details

Defined in Data.XML.Types

Methods

compare :: Instruction -> Instruction -> Ordering #

(<) :: Instruction -> Instruction -> Bool #

(<=) :: Instruction -> Instruction -> Bool #

(>) :: Instruction -> Instruction -> Bool #

(>=) :: Instruction -> Instruction -> Bool #

max :: Instruction -> Instruction -> Instruction #

min :: Instruction -> Instruction -> Instruction #

Ord Miscellaneous 
Instance details

Defined in Data.XML.Types

Methods

compare :: Miscellaneous -> Miscellaneous -> Ordering #

(<) :: Miscellaneous -> Miscellaneous -> Bool #

(<=) :: Miscellaneous -> Miscellaneous -> Bool #

(>) :: Miscellaneous -> Miscellaneous -> Bool #

(>=) :: Miscellaneous -> Miscellaneous -> Bool #

max :: Miscellaneous -> Miscellaneous -> Miscellaneous #

min :: Miscellaneous -> Miscellaneous -> Miscellaneous #

Ord Name 
Instance details

Defined in Data.XML.Types

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 Node 
Instance details

Defined in Data.XML.Types

Methods

compare :: Node -> Node -> Ordering #

(<) :: Node -> Node -> Bool #

(<=) :: Node -> Node -> Bool #

(>) :: Node -> Node -> Bool #

(>=) :: Node -> Node -> Bool #

max :: Node -> Node -> Node #

min :: Node -> Node -> Node #

Ord Prologue 
Instance details

Defined in Data.XML.Types

Methods

compare :: Prologue -> Prologue -> Ordering #

(<) :: Prologue -> Prologue -> Bool #

(<=) :: Prologue -> Prologue -> Bool #

(>) :: Prologue -> Prologue -> Bool #

(>=) :: Prologue -> Prologue -> Bool #

max :: Prologue -> Prologue -> Prologue #

min :: Prologue -> Prologue -> Prologue #

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 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

Methods

compare :: Natural -> Natural -> Ordering #

(<) :: Natural -> Natural -> Bool #

(<=) :: Natural -> Natural -> Bool #

(>) :: Natural -> Natural -> Bool #

(>=) :: Natural -> Natural -> Bool #

max :: Natural -> Natural -> Natural #

min :: Natural -> Natural -> 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 a => Ord (Only a) 
Instance details

Defined in Data.Tuple.Only

Methods

compare :: Only a -> Only a -> Ordering #

(<) :: Only a -> Only a -> Bool #

(<=) :: Only a -> Only a -> Bool #

(>) :: Only a -> Only a -> Bool #

(>=) :: Only a -> Only a -> Bool #

max :: Only a -> Only a -> Only a #

min :: Only a -> Only a -> Only a #

Ord a => Ord (Blind a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

compare :: Blind a -> Blind a -> Ordering #

(<) :: Blind a -> Blind a -> Bool #

(<=) :: Blind a -> Blind a -> Bool #

(>) :: Blind a -> Blind a -> Bool #

(>=) :: Blind a -> Blind a -> Bool #

max :: Blind a -> Blind a -> Blind a #

min :: Blind a -> Blind a -> Blind a #

Ord a => Ord (Fixed a) 
Instance details

Defined in Test.QuickCheck.Modifiers

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 a => Ord (Large a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

compare :: Large a -> Large a -> Ordering #

(<) :: Large a -> Large a -> Bool #

(<=) :: Large a -> Large a -> Bool #

(>) :: Large a -> Large a -> Bool #

(>=) :: Large a -> Large a -> Bool #

max :: Large a -> Large a -> Large a #

min :: Large a -> Large a -> Large a #

Ord a => Ord (Negative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

compare :: Negative a -> Negative a -> Ordering #

(<) :: Negative a -> Negative a -> Bool #

(<=) :: Negative a -> Negative a -> Bool #

(>) :: Negative a -> Negative a -> Bool #

(>=) :: Negative a -> Negative a -> Bool #

max :: Negative a -> Negative a -> Negative a #

min :: Negative a -> Negative a -> Negative a #

Ord a => Ord (NonEmptyList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

compare :: NonEmptyList a -> NonEmptyList a -> Ordering #

(<) :: NonEmptyList a -> NonEmptyList a -> Bool #

(<=) :: NonEmptyList a -> NonEmptyList a -> Bool #

(>) :: NonEmptyList a -> NonEmptyList a -> Bool #

(>=) :: NonEmptyList a -> NonEmptyList a -> Bool #

max :: NonEmptyList a -> NonEmptyList a -> NonEmptyList a #

min :: NonEmptyList a -> NonEmptyList a -> NonEmptyList a #

Ord a => Ord (NonNegative a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

compare :: NonNegative a -> NonNegative a -> Ordering #

(<) :: NonNegative a -> NonNegative a -> Bool #

(<=) :: NonNegative a -> NonNegative a -> Bool #

(>) :: NonNegative a -> NonNegative a -> Bool #

(>=) :: NonNegative a -> NonNegative a -> Bool #

max :: NonNegative a -> NonNegative a -> NonNegative a #

min :: NonNegative a -> NonNegative a -> NonNegative a #

Ord a => Ord (NonPositive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

compare :: NonPositive a -> NonPositive a -> Ordering #

(<) :: NonPositive a -> NonPositive a -> Bool #

(<=) :: NonPositive a -> NonPositive a -> Bool #

(>) :: NonPositive a -> NonPositive a -> Bool #

(>=) :: NonPositive a -> NonPositive a -> Bool #

max :: NonPositive a -> NonPositive a -> NonPositive a #

min :: NonPositive a -> NonPositive a -> NonPositive a #

Ord a => Ord (NonZero a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

compare :: NonZero a -> NonZero a -> Ordering #

(<) :: NonZero a -> NonZero a -> Bool #

(<=) :: NonZero a -> NonZero a -> Bool #

(>) :: NonZero a -> NonZero a -> Bool #

(>=) :: NonZero a -> NonZero a -> Bool #

max :: NonZero a -> NonZero a -> NonZero a #

min :: NonZero a -> NonZero a -> NonZero a #

Ord a => Ord (OrderedList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

compare :: OrderedList a -> OrderedList a -> Ordering #

(<) :: OrderedList a -> OrderedList a -> Bool #

(<=) :: OrderedList a -> OrderedList a -> Bool #

(>) :: OrderedList a -> OrderedList a -> Bool #

(>=) :: OrderedList a -> OrderedList a -> Bool #

max :: OrderedList a -> OrderedList a -> OrderedList a #

min :: OrderedList a -> OrderedList a -> OrderedList a #

Ord a => Ord (Positive a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

compare :: Positive a -> Positive a -> Ordering #

(<) :: Positive a -> Positive a -> Bool #

(<=) :: Positive a -> Positive a -> Bool #

(>) :: Positive a -> Positive a -> Bool #

(>=) :: Positive a -> Positive a -> Bool #

max :: Positive a -> Positive a -> Positive a #

min :: Positive a -> Positive a -> Positive a #

Ord a => Ord (Shrink2 a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

compare :: Shrink2 a -> Shrink2 a -> Ordering #

(<) :: Shrink2 a -> Shrink2 a -> Bool #

(<=) :: Shrink2 a -> Shrink2 a -> Bool #

(>) :: Shrink2 a -> Shrink2 a -> Bool #

(>=) :: Shrink2 a -> Shrink2 a -> Bool #

max :: Shrink2 a -> Shrink2 a -> Shrink2 a #

min :: Shrink2 a -> Shrink2 a -> Shrink2 a #

Ord a => Ord (Small a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

compare :: Small a -> Small a -> Ordering #

(<) :: Small a -> Small a -> Bool #

(<=) :: Small a -> Small a -> Bool #

(>) :: Small a -> Small a -> Bool #

(>=) :: Small a -> Small a -> Bool #

max :: Small a -> Small a -> Small a #

min :: Small a -> Small a -> Small a #

Ord a => Ord (SortedList a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

compare :: SortedList a -> SortedList a -> Ordering #

(<) :: SortedList a -> SortedList a -> Bool #

(<=) :: SortedList a -> SortedList a -> Bool #

(>) :: SortedList a -> SortedList a -> Bool #

(>=) :: SortedList a -> SortedList a -> Bool #

max :: SortedList a -> SortedList a -> SortedList a #

min :: SortedList a -> SortedList a -> SortedList a #

Ord (Digest t) 
Instance details

Defined in Data.Digest.Pure.SHA

Methods

compare :: Digest t -> Digest t -> Ordering #

(<) :: Digest t -> Digest t -> Bool #

(<=) :: Digest t -> Digest t -> Bool #

(>) :: Digest t -> Digest t -> Bool #

(>=) :: Digest t -> Digest t -> Bool #

max :: Digest t -> Digest t -> Digest t #

min :: Digest t -> Digest t -> Digest t #

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

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 a => Ord (Array a) 
Instance details

Defined in Basement.BoxedArray

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 #

(ByteSwap a, Ord a) => Ord (BE a) 
Instance details

Defined in Basement.Endianness

Methods

compare :: BE a -> BE a -> Ordering #

(<) :: BE a -> BE a -> Bool #

(<=) :: BE a -> BE a -> Bool #

(>) :: BE a -> BE a -> Bool #

(>=) :: BE a -> BE a -> Bool #

max :: BE a -> BE a -> BE a #

min :: BE a -> BE a -> BE a #

(ByteSwap a, Ord a) => Ord (LE a) 
Instance details

Defined in Basement.Endianness

Methods

compare :: LE a -> LE a -> Ordering #

(<) :: LE a -> LE a -> Bool #

(<=) :: LE a -> LE a -> Bool #

(>) :: LE a -> LE a -> Bool #

(>=) :: LE a -> LE a -> Bool #

max :: LE a -> LE a -> LE a #

min :: LE a -> LE a -> LE a #

Ord (FinalPtr a) 
Instance details

Defined in Basement.FinalPtr

Methods

compare :: FinalPtr a -> FinalPtr a -> Ordering #

(<) :: FinalPtr a -> FinalPtr a -> Bool #

(<=) :: FinalPtr a -> FinalPtr a -> Bool #

(>) :: FinalPtr a -> FinalPtr a -> Bool #

(>=) :: FinalPtr a -> FinalPtr a -> Bool #

max :: FinalPtr a -> FinalPtr a -> FinalPtr a #

min :: FinalPtr a -> FinalPtr a -> FinalPtr a #

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 (IV k) 
Instance details

Defined in Crypto.Types

Methods

compare :: IV k -> IV k -> Ordering #

(<) :: IV k -> IV k -> Bool #

(<=) :: IV k -> IV k -> Bool #

(>) :: IV k -> IV k -> Bool #

(>=) :: IV k -> IV k -> Bool #

max :: IV k -> IV k -> IV k #

min :: IV k -> IV k -> IV k #

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 #

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 #

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 v => Ord (UniqueMap v) 
Instance details

Defined in GHC.Cmm.Dataflow.Collections

Methods

compare :: UniqueMap v -> UniqueMap v -> Ordering #

(<) :: UniqueMap v -> UniqueMap v -> Bool #

(<=) :: UniqueMap v -> UniqueMap v -> Bool #

(>) :: UniqueMap v -> UniqueMap v -> Bool #

(>=) :: UniqueMap v -> UniqueMap v -> Bool #

max :: UniqueMap v -> UniqueMap v -> UniqueMap v #

min :: UniqueMap v -> UniqueMap v -> UniqueMap v #

Ord v => Ord (LabelMap v) 
Instance details

Defined in GHC.Cmm.Dataflow.Label

Methods

compare :: LabelMap v -> LabelMap v -> Ordering #

(<) :: LabelMap v -> LabelMap v -> Bool #

(<=) :: LabelMap v -> LabelMap v -> Bool #

(>) :: LabelMap v -> LabelMap v -> Bool #

(>=) :: LabelMap v -> LabelMap v -> Bool #

max :: LabelMap v -> LabelMap v -> LabelMap v #

min :: LabelMap v -> LabelMap v -> LabelMap v #

Ord a => Ord (IdentSupply a) 
Instance details

Defined in GHC.JS.Unsat.Syntax

Methods

compare :: IdentSupply a -> IdentSupply a -> Ordering #

(<) :: IdentSupply a -> IdentSupply a -> Bool #

(<=) :: IdentSupply a -> IdentSupply a -> Bool #

(>) :: IdentSupply a -> IdentSupply a -> Bool #

(>=) :: IdentSupply a -> IdentSupply a -> Bool #

max :: IdentSupply a -> IdentSupply a -> IdentSupply a #

min :: IdentSupply a -> IdentSupply a -> IdentSupply a #

Ord (GenTickish 'TickishPassCmm) 
Instance details

Defined in GHC.Types.Tickish

Methods

compare :: GenTickish 'TickishPassCmm -> GenTickish 'TickishPassCmm -> Ordering #

(<) :: GenTickish 'TickishPassCmm -> GenTickish 'TickishPassCmm -> Bool #

(<=) :: GenTickish 'TickishPassCmm -> GenTickish 'TickishPassCmm -> Bool #

(>) :: GenTickish 'TickishPassCmm -> GenTickish 'TickishPassCmm -> Bool #

(>=) :: GenTickish 'TickishPassCmm -> GenTickish 'TickishPassCmm -> Bool #

max :: GenTickish 'TickishPassCmm -> GenTickish 'TickishPassCmm -> GenTickish 'TickishPassCmm #

min :: GenTickish 'TickishPassCmm -> GenTickish 'TickishPassCmm -> GenTickish 'TickishPassCmm #

Ord (GenTickish 'TickishPassCore) 
Instance details

Defined in GHC.Types.Tickish

Methods

compare :: GenTickish 'TickishPassCore -> GenTickish 'TickishPassCore -> Ordering #

(<) :: GenTickish 'TickishPassCore -> GenTickish 'TickishPassCore -> Bool #

(<=) :: GenTickish 'TickishPassCore -> GenTickish 'TickishPassCore -> Bool #

(>) :: GenTickish 'TickishPassCore -> GenTickish 'TickishPassCore -> Bool #

(>=) :: GenTickish 'TickishPassCore -> GenTickish 'TickishPassCore -> Bool #

max :: GenTickish 'TickishPassCore -> GenTickish 'TickishPassCore -> GenTickish 'TickishPassCore #

min :: GenTickish 'TickishPassCore -> GenTickish 'TickishPassCore -> GenTickish 'TickishPassCore #

Ord unit => Ord (Definite unit) 
Instance details

Defined in GHC.Unit.Types

Methods

compare :: Definite unit -> Definite unit -> Ordering #

(<) :: Definite unit -> Definite unit -> Bool #

(<=) :: Definite unit -> Definite unit -> Bool #

(>) :: Definite unit -> Definite unit -> Bool #

(>=) :: Definite unit -> Definite unit -> Bool #

max :: Definite unit -> Definite unit -> Definite unit #

min :: Definite unit -> Definite unit -> Definite unit #

Ord (GenInstantiatedUnit unit) 
Instance details

Defined in GHC.Unit.Types

Methods

compare :: GenInstantiatedUnit unit -> GenInstantiatedUnit unit -> Ordering #

(<) :: GenInstantiatedUnit unit -> GenInstantiatedUnit unit -> Bool #

(<=) :: GenInstantiatedUnit unit -> GenInstantiatedUnit unit -> Bool #

(>) :: GenInstantiatedUnit unit -> GenInstantiatedUnit unit -> Bool #

(>=) :: GenInstantiatedUnit unit -> GenInstantiatedUnit unit -> Bool #

max :: GenInstantiatedUnit unit -> GenInstantiatedUnit unit -> GenInstantiatedUnit unit #

min :: GenInstantiatedUnit unit -> GenInstantiatedUnit unit -> GenInstantiatedUnit unit #

Ord unit => Ord (GenModule unit) 
Instance details

Defined in GHC.Unit.Types

Methods

compare :: GenModule unit -> GenModule unit -> Ordering #

(<) :: GenModule unit -> GenModule unit -> Bool #

(<=) :: GenModule unit -> GenModule unit -> Bool #

(>) :: GenModule unit -> GenModule unit -> Bool #

(>=) :: GenModule unit -> GenModule unit -> Bool #

max :: GenModule unit -> GenModule unit -> GenModule unit #

min :: GenModule unit -> GenModule unit -> GenModule unit #

Ord mod => Ord (GenWithIsBoot mod) 
Instance details

Defined in GHC.Unit.Types

Methods

compare :: GenWithIsBoot mod -> GenWithIsBoot mod -> Ordering #

(<) :: GenWithIsBoot mod -> GenWithIsBoot mod -> Bool #

(<=) :: GenWithIsBoot mod -> GenWithIsBoot mod -> Bool #

(>) :: GenWithIsBoot mod -> GenWithIsBoot mod -> Bool #

(>=) :: GenWithIsBoot mod -> GenWithIsBoot mod -> Bool #

max :: GenWithIsBoot mod -> GenWithIsBoot mod -> GenWithIsBoot mod #

min :: GenWithIsBoot mod -> GenWithIsBoot mod -> GenWithIsBoot mod #

Ord (XXOverLit p) => Ord (HsOverLit p) 
Instance details

Defined in Language.Haskell.Syntax.Lit

Methods

compare :: HsOverLit p -> HsOverLit p -> Ordering #

(<) :: HsOverLit p -> HsOverLit p -> Bool #

(<=) :: HsOverLit p -> HsOverLit p -> Bool #

(>) :: HsOverLit p -> HsOverLit p -> Bool #

(>=) :: HsOverLit p -> HsOverLit p -> Bool #

max :: HsOverLit p -> HsOverLit p -> HsOverLit p #

min :: HsOverLit p -> HsOverLit p -> HsOverLit p #

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 (ListOf a) 
Instance details

Defined in Language.Haskell.Exts.Parser

Methods

compare :: ListOf a -> ListOf a -> Ordering #

(<) :: ListOf a -> ListOf a -> Bool #

(<=) :: ListOf a -> ListOf a -> Bool #

(>) :: ListOf a -> ListOf a -> Bool #

(>=) :: ListOf a -> ListOf a -> Bool #

max :: ListOf a -> ListOf a -> ListOf a #

min :: ListOf a -> ListOf a -> ListOf a #

Ord l => Ord (ModuleHeadAndImports l) 
Instance details

Defined in Language.Haskell.Exts.Parser

Methods

compare :: ModuleHeadAndImports l -> ModuleHeadAndImports l -> Ordering #

(<) :: ModuleHeadAndImports l -> ModuleHeadAndImports l -> Bool #

(<=) :: ModuleHeadAndImports l -> ModuleHeadAndImports l -> Bool #

(>) :: ModuleHeadAndImports l -> ModuleHeadAndImports l -> Bool #

(>=) :: ModuleHeadAndImports l -> ModuleHeadAndImports l -> Bool #

max :: ModuleHeadAndImports l -> ModuleHeadAndImports l -> ModuleHeadAndImports l #

min :: ModuleHeadAndImports l -> ModuleHeadAndImports l -> ModuleHeadAndImports l #

Ord a => Ord (NonGreedy a) 
Instance details

Defined in Language.Haskell.Exts.Parser

Methods

compare :: NonGreedy a -> NonGreedy a -> Ordering #

(<) :: NonGreedy a -> NonGreedy a -> Bool #

(<=) :: NonGreedy a -> NonGreedy a -> Bool #

(>) :: NonGreedy a -> NonGreedy a -> Bool #

(>=) :: NonGreedy a -> NonGreedy a -> Bool #

max :: NonGreedy a -> NonGreedy a -> NonGreedy a #

min :: NonGreedy a -> NonGreedy a -> NonGreedy a #

Ord l => Ord (PragmasAndModuleHead l) 
Instance details

Defined in Language.Haskell.Exts.Parser

Methods

compare :: PragmasAndModuleHead l -> PragmasAndModuleHead l -> Ordering #

(<) :: PragmasAndModuleHead l -> PragmasAndModuleHead l -> Bool #

(<=) :: PragmasAndModuleHead l -> PragmasAndModuleHead l -> Bool #

(>) :: PragmasAndModuleHead l -> PragmasAndModuleHead l -> Bool #

(>=) :: PragmasAndModuleHead l -> PragmasAndModuleHead l -> Bool #

max :: PragmasAndModuleHead l -> PragmasAndModuleHead l -> PragmasAndModuleHead l #

min :: PragmasAndModuleHead l -> PragmasAndModuleHead l -> PragmasAndModuleHead l #

Ord l => Ord (PragmasAndModuleName l) 
Instance details

Defined in Language.Haskell.Exts.Parser

Methods

compare :: PragmasAndModuleName l -> PragmasAndModuleName l -> Ordering #

(<) :: PragmasAndModuleName l -> PragmasAndModuleName l -> Bool #

(<=) :: PragmasAndModuleName l -> PragmasAndModuleName l -> Bool #

(>) :: PragmasAndModuleName l -> PragmasAndModuleName l -> Bool #

(>=) :: PragmasAndModuleName l -> PragmasAndModuleName l -> Bool #

max :: PragmasAndModuleName l -> PragmasAndModuleName l -> PragmasAndModuleName l #

min :: PragmasAndModuleName l -> PragmasAndModuleName l -> PragmasAndModuleName l #

Ord a => Ord (Loc a) 
Instance details

Defined in Language.Haskell.Exts.SrcLoc

Methods

compare :: Loc a -> Loc a -> Ordering #

(<) :: Loc a -> Loc a -> Bool #

(<=) :: Loc a -> Loc a -> Bool #

(>) :: Loc a -> Loc a -> Bool #

(>=) :: Loc a -> Loc a -> Bool #

max :: Loc a -> Loc a -> Loc a #

min :: Loc a -> Loc a -> Loc a #

Ord l => Ord (Activation l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Activation l -> Activation l -> Ordering #

(<) :: Activation l -> Activation l -> Bool #

(<=) :: Activation l -> Activation l -> Bool #

(>) :: Activation l -> Activation l -> Bool #

(>=) :: Activation l -> Activation l -> Bool #

max :: Activation l -> Activation l -> Activation l #

min :: Activation l -> Activation l -> Activation l #

Ord l => Ord (Alt l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Alt l -> Alt l -> Ordering #

(<) :: Alt l -> Alt l -> Bool #

(<=) :: Alt l -> Alt l -> Bool #

(>) :: Alt l -> Alt l -> Bool #

(>=) :: Alt l -> Alt l -> Bool #

max :: Alt l -> Alt l -> Alt l #

min :: Alt l -> Alt l -> Alt l #

Ord l => Ord (Annotation l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Annotation l -> Annotation l -> Ordering #

(<) :: Annotation l -> Annotation l -> Bool #

(<=) :: Annotation l -> Annotation l -> Bool #

(>) :: Annotation l -> Annotation l -> Bool #

(>=) :: Annotation l -> Annotation l -> Bool #

max :: Annotation l -> Annotation l -> Annotation l #

min :: Annotation l -> Annotation l -> Annotation l #

Ord l => Ord (Assoc l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Assoc l -> Assoc l -> Ordering #

(<) :: Assoc l -> Assoc l -> Bool #

(<=) :: Assoc l -> Assoc l -> Bool #

(>) :: Assoc l -> Assoc l -> Bool #

(>=) :: Assoc l -> Assoc l -> Bool #

max :: Assoc l -> Assoc l -> Assoc l #

min :: Assoc l -> Assoc l -> Assoc l #

Ord l => Ord (Asst l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Asst l -> Asst l -> Ordering #

(<) :: Asst l -> Asst l -> Bool #

(<=) :: Asst l -> Asst l -> Bool #

(>) :: Asst l -> Asst l -> Bool #

(>=) :: Asst l -> Asst l -> Bool #

max :: Asst l -> Asst l -> Asst l #

min :: Asst l -> Asst l -> Asst l #

Ord l => Ord (BangType l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: BangType l -> BangType l -> Ordering #

(<) :: BangType l -> BangType l -> Bool #

(<=) :: BangType l -> BangType l -> Bool #

(>) :: BangType l -> BangType l -> Bool #

(>=) :: BangType l -> BangType l -> Bool #

max :: BangType l -> BangType l -> BangType l #

min :: BangType l -> BangType l -> BangType l #

Ord l => Ord (Binds l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Binds l -> Binds l -> Ordering #

(<) :: Binds l -> Binds l -> Bool #

(<=) :: Binds l -> Binds l -> Bool #

(>) :: Binds l -> Binds l -> Bool #

(>=) :: Binds l -> Binds l -> Bool #

max :: Binds l -> Binds l -> Binds l #

min :: Binds l -> Binds l -> Binds l #

Ord l => Ord (BooleanFormula l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: BooleanFormula l -> BooleanFormula l -> Ordering #

(<) :: BooleanFormula l -> BooleanFormula l -> Bool #

(<=) :: BooleanFormula l -> BooleanFormula l -> Bool #

(>) :: BooleanFormula l -> BooleanFormula l -> Bool #

(>=) :: BooleanFormula l -> BooleanFormula l -> Bool #

max :: BooleanFormula l -> BooleanFormula l -> BooleanFormula l #

min :: BooleanFormula l -> BooleanFormula l -> BooleanFormula l #

Ord l => Ord (Bracket l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Bracket l -> Bracket l -> Ordering #

(<) :: Bracket l -> Bracket l -> Bool #

(<=) :: Bracket l -> Bracket l -> Bool #

(>) :: Bracket l -> Bracket l -> Bool #

(>=) :: Bracket l -> Bracket l -> Bool #

max :: Bracket l -> Bracket l -> Bracket l #

min :: Bracket l -> Bracket l -> Bracket l #

Ord l => Ord (CName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: CName l -> CName l -> Ordering #

(<) :: CName l -> CName l -> Bool #

(<=) :: CName l -> CName l -> Bool #

(>) :: CName l -> CName l -> Bool #

(>=) :: CName l -> CName l -> Bool #

max :: CName l -> CName l -> CName l #

min :: CName l -> CName l -> CName l #

Ord l => Ord (CallConv l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: CallConv l -> CallConv l -> Ordering #

(<) :: CallConv l -> CallConv l -> Bool #

(<=) :: CallConv l -> CallConv l -> Bool #

(>) :: CallConv l -> CallConv l -> Bool #

(>=) :: CallConv l -> CallConv l -> Bool #

max :: CallConv l -> CallConv l -> CallConv l #

min :: CallConv l -> CallConv l -> CallConv l #

Ord l => Ord (ClassDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: ClassDecl l -> ClassDecl l -> Ordering #

(<) :: ClassDecl l -> ClassDecl l -> Bool #

(<=) :: ClassDecl l -> ClassDecl l -> Bool #

(>) :: ClassDecl l -> ClassDecl l -> Bool #

(>=) :: ClassDecl l -> ClassDecl l -> Bool #

max :: ClassDecl l -> ClassDecl l -> ClassDecl l #

min :: ClassDecl l -> ClassDecl l -> ClassDecl l #

Ord l => Ord (ConDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: ConDecl l -> ConDecl l -> Ordering #

(<) :: ConDecl l -> ConDecl l -> Bool #

(<=) :: ConDecl l -> ConDecl l -> Bool #

(>) :: ConDecl l -> ConDecl l -> Bool #

(>=) :: ConDecl l -> ConDecl l -> Bool #

max :: ConDecl l -> ConDecl l -> ConDecl l #

min :: ConDecl l -> ConDecl l -> ConDecl l #

Ord l => Ord (Context l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Context l -> Context l -> Ordering #

(<) :: Context l -> Context l -> Bool #

(<=) :: Context l -> Context l -> Bool #

(>) :: Context l -> Context l -> Bool #

(>=) :: Context l -> Context l -> Bool #

max :: Context l -> Context l -> Context l #

min :: Context l -> Context l -> Context l #

Ord l => Ord (DataOrNew l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: DataOrNew l -> DataOrNew l -> Ordering #

(<) :: DataOrNew l -> DataOrNew l -> Bool #

(<=) :: DataOrNew l -> DataOrNew l -> Bool #

(>) :: DataOrNew l -> DataOrNew l -> Bool #

(>=) :: DataOrNew l -> DataOrNew l -> Bool #

max :: DataOrNew l -> DataOrNew l -> DataOrNew l #

min :: DataOrNew l -> DataOrNew l -> DataOrNew l #

Ord l => Ord (Decl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Decl l -> Decl l -> Ordering #

(<) :: Decl l -> Decl l -> Bool #

(<=) :: Decl l -> Decl l -> Bool #

(>) :: Decl l -> Decl l -> Bool #

(>=) :: Decl l -> Decl l -> Bool #

max :: Decl l -> Decl l -> Decl l #

min :: Decl l -> Decl l -> Decl l #

Ord l => Ord (DeclHead l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: DeclHead l -> DeclHead l -> Ordering #

(<) :: DeclHead l -> DeclHead l -> Bool #

(<=) :: DeclHead l -> DeclHead l -> Bool #

(>) :: DeclHead l -> DeclHead l -> Bool #

(>=) :: DeclHead l -> DeclHead l -> Bool #

max :: DeclHead l -> DeclHead l -> DeclHead l #

min :: DeclHead l -> DeclHead l -> DeclHead l #

Ord l => Ord (DerivStrategy l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: DerivStrategy l -> DerivStrategy l -> Ordering #

(<) :: DerivStrategy l -> DerivStrategy l -> Bool #

(<=) :: DerivStrategy l -> DerivStrategy l -> Bool #

(>) :: DerivStrategy l -> DerivStrategy l -> Bool #

(>=) :: DerivStrategy l -> DerivStrategy l -> Bool #

max :: DerivStrategy l -> DerivStrategy l -> DerivStrategy l #

min :: DerivStrategy l -> DerivStrategy l -> DerivStrategy l #

Ord l => Ord (Deriving l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Deriving l -> Deriving l -> Ordering #

(<) :: Deriving l -> Deriving l -> Bool #

(<=) :: Deriving l -> Deriving l -> Bool #

(>) :: Deriving l -> Deriving l -> Bool #

(>=) :: Deriving l -> Deriving l -> Bool #

max :: Deriving l -> Deriving l -> Deriving l #

min :: Deriving l -> Deriving l -> Deriving l #

Ord l => Ord (EWildcard l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: EWildcard l -> EWildcard l -> Ordering #

(<) :: EWildcard l -> EWildcard l -> Bool #

(<=) :: EWildcard l -> EWildcard l -> Bool #

(>) :: EWildcard l -> EWildcard l -> Bool #

(>=) :: EWildcard l -> EWildcard l -> Bool #

max :: EWildcard l -> EWildcard l -> EWildcard l #

min :: EWildcard l -> EWildcard l -> EWildcard l #

Ord l => Ord (Exp l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Exp l -> Exp l -> Ordering #

(<) :: Exp l -> Exp l -> Bool #

(<=) :: Exp l -> Exp l -> Bool #

(>) :: Exp l -> Exp l -> Bool #

(>=) :: Exp l -> Exp l -> Bool #

max :: Exp l -> Exp l -> Exp l #

min :: Exp l -> Exp l -> Exp l #

Ord l => Ord (ExportSpec l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: ExportSpec l -> ExportSpec l -> Ordering #

(<) :: ExportSpec l -> ExportSpec l -> Bool #

(<=) :: ExportSpec l -> ExportSpec l -> Bool #

(>) :: ExportSpec l -> ExportSpec l -> Bool #

(>=) :: ExportSpec l -> ExportSpec l -> Bool #

max :: ExportSpec l -> ExportSpec l -> ExportSpec l #

min :: ExportSpec l -> ExportSpec l -> ExportSpec l #

Ord l => Ord (ExportSpecList l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: ExportSpecList l -> ExportSpecList l -> Ordering #

(<) :: ExportSpecList l -> ExportSpecList l -> Bool #

(<=) :: ExportSpecList l -> ExportSpecList l -> Bool #

(>) :: ExportSpecList l -> ExportSpecList l -> Bool #

(>=) :: ExportSpecList l -> ExportSpecList l -> Bool #

max :: ExportSpecList l -> ExportSpecList l -> ExportSpecList l #

min :: ExportSpecList l -> ExportSpecList l -> ExportSpecList l #

Ord l => Ord (FieldDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: FieldDecl l -> FieldDecl l -> Ordering #

(<) :: FieldDecl l -> FieldDecl l -> Bool #

(<=) :: FieldDecl l -> FieldDecl l -> Bool #

(>) :: FieldDecl l -> FieldDecl l -> Bool #

(>=) :: FieldDecl l -> FieldDecl l -> Bool #

max :: FieldDecl l -> FieldDecl l -> FieldDecl l #

min :: FieldDecl l -> FieldDecl l -> FieldDecl l #

Ord l => Ord (FieldUpdate l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: FieldUpdate l -> FieldUpdate l -> Ordering #

(<) :: FieldUpdate l -> FieldUpdate l -> Bool #

(<=) :: FieldUpdate l -> FieldUpdate l -> Bool #

(>) :: FieldUpdate l -> FieldUpdate l -> Bool #

(>=) :: FieldUpdate l -> FieldUpdate l -> Bool #

max :: FieldUpdate l -> FieldUpdate l -> FieldUpdate l #

min :: FieldUpdate l -> FieldUpdate l -> FieldUpdate l #

Ord l => Ord (FunDep l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: FunDep l -> FunDep l -> Ordering #

(<) :: FunDep l -> FunDep l -> Bool #

(<=) :: FunDep l -> FunDep l -> Bool #

(>) :: FunDep l -> FunDep l -> Bool #

(>=) :: FunDep l -> FunDep l -> Bool #

max :: FunDep l -> FunDep l -> FunDep l #

min :: FunDep l -> FunDep l -> FunDep l #

Ord l => Ord (GadtDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: GadtDecl l -> GadtDecl l -> Ordering #

(<) :: GadtDecl l -> GadtDecl l -> Bool #

(<=) :: GadtDecl l -> GadtDecl l -> Bool #

(>) :: GadtDecl l -> GadtDecl l -> Bool #

(>=) :: GadtDecl l -> GadtDecl l -> Bool #

max :: GadtDecl l -> GadtDecl l -> GadtDecl l #

min :: GadtDecl l -> GadtDecl l -> GadtDecl l #

Ord l => Ord (GuardedRhs l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: GuardedRhs l -> GuardedRhs l -> Ordering #

(<) :: GuardedRhs l -> GuardedRhs l -> Bool #

(<=) :: GuardedRhs l -> GuardedRhs l -> Bool #

(>) :: GuardedRhs l -> GuardedRhs l -> Bool #

(>=) :: GuardedRhs l -> GuardedRhs l -> Bool #

max :: GuardedRhs l -> GuardedRhs l -> GuardedRhs l #

min :: GuardedRhs l -> GuardedRhs l -> GuardedRhs l #

Ord l => Ord (IPBind l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: IPBind l -> IPBind l -> Ordering #

(<) :: IPBind l -> IPBind l -> Bool #

(<=) :: IPBind l -> IPBind l -> Bool #

(>) :: IPBind l -> IPBind l -> Bool #

(>=) :: IPBind l -> IPBind l -> Bool #

max :: IPBind l -> IPBind l -> IPBind l #

min :: IPBind l -> IPBind l -> IPBind l #

Ord l => Ord (IPName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: IPName l -> IPName l -> Ordering #

(<) :: IPName l -> IPName l -> Bool #

(<=) :: IPName l -> IPName l -> Bool #

(>) :: IPName l -> IPName l -> Bool #

(>=) :: IPName l -> IPName l -> Bool #

max :: IPName l -> IPName l -> IPName l #

min :: IPName l -> IPName l -> IPName l #

Ord l => Ord (ImportDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: ImportDecl l -> ImportDecl l -> Ordering #

(<) :: ImportDecl l -> ImportDecl l -> Bool #

(<=) :: ImportDecl l -> ImportDecl l -> Bool #

(>) :: ImportDecl l -> ImportDecl l -> Bool #

(>=) :: ImportDecl l -> ImportDecl l -> Bool #

max :: ImportDecl l -> ImportDecl l -> ImportDecl l #

min :: ImportDecl l -> ImportDecl l -> ImportDecl l #

Ord l => Ord (ImportSpec l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: ImportSpec l -> ImportSpec l -> Ordering #

(<) :: ImportSpec l -> ImportSpec l -> Bool #

(<=) :: ImportSpec l -> ImportSpec l -> Bool #

(>) :: ImportSpec l -> ImportSpec l -> Bool #

(>=) :: ImportSpec l -> ImportSpec l -> Bool #

max :: ImportSpec l -> ImportSpec l -> ImportSpec l #

min :: ImportSpec l -> ImportSpec l -> ImportSpec l #

Ord l => Ord (ImportSpecList l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: ImportSpecList l -> ImportSpecList l -> Ordering #

(<) :: ImportSpecList l -> ImportSpecList l -> Bool #

(<=) :: ImportSpecList l -> ImportSpecList l -> Bool #

(>) :: ImportSpecList l -> ImportSpecList l -> Bool #

(>=) :: ImportSpecList l -> ImportSpecList l -> Bool #

max :: ImportSpecList l -> ImportSpecList l -> ImportSpecList l #

min :: ImportSpecList l -> ImportSpecList l -> ImportSpecList l #

Ord l => Ord (InjectivityInfo l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: InjectivityInfo l -> InjectivityInfo l -> Ordering #

(<) :: InjectivityInfo l -> InjectivityInfo l -> Bool #

(<=) :: InjectivityInfo l -> InjectivityInfo l -> Bool #

(>) :: InjectivityInfo l -> InjectivityInfo l -> Bool #

(>=) :: InjectivityInfo l -> InjectivityInfo l -> Bool #

max :: InjectivityInfo l -> InjectivityInfo l -> InjectivityInfo l #

min :: InjectivityInfo l -> InjectivityInfo l -> InjectivityInfo l #

Ord l => Ord (InstDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: InstDecl l -> InstDecl l -> Ordering #

(<) :: InstDecl l -> InstDecl l -> Bool #

(<=) :: InstDecl l -> InstDecl l -> Bool #

(>) :: InstDecl l -> InstDecl l -> Bool #

(>=) :: InstDecl l -> InstDecl l -> Bool #

max :: InstDecl l -> InstDecl l -> InstDecl l #

min :: InstDecl l -> InstDecl l -> InstDecl l #

Ord l => Ord (InstHead l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: InstHead l -> InstHead l -> Ordering #

(<) :: InstHead l -> InstHead l -> Bool #

(<=) :: InstHead l -> InstHead l -> Bool #

(>) :: InstHead l -> InstHead l -> Bool #

(>=) :: InstHead l -> InstHead l -> Bool #

max :: InstHead l -> InstHead l -> InstHead l #

min :: InstHead l -> InstHead l -> InstHead l #

Ord l => Ord (InstRule l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: InstRule l -> InstRule l -> Ordering #

(<) :: InstRule l -> InstRule l -> Bool #

(<=) :: InstRule l -> InstRule l -> Bool #

(>) :: InstRule l -> InstRule l -> Bool #

(>=) :: InstRule l -> InstRule l -> Bool #

max :: InstRule l -> InstRule l -> InstRule l #

min :: InstRule l -> InstRule l -> InstRule l #

Ord l => Ord (Literal l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Literal l -> Literal l -> Ordering #

(<) :: Literal l -> Literal l -> Bool #

(<=) :: Literal l -> Literal l -> Bool #

(>) :: Literal l -> Literal l -> Bool #

(>=) :: Literal l -> Literal l -> Bool #

max :: Literal l -> Literal l -> Literal l #

min :: Literal l -> Literal l -> Literal l #

Ord l => Ord (Match l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Match l -> Match l -> Ordering #

(<) :: Match l -> Match l -> Bool #

(<=) :: Match l -> Match l -> Bool #

(>) :: Match l -> Match l -> Bool #

(>=) :: Match l -> Match l -> Bool #

max :: Match l -> Match l -> Match l #

min :: Match l -> Match l -> Match l #

Ord l => Ord (MaybePromotedName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: MaybePromotedName l -> MaybePromotedName l -> Ordering #

(<) :: MaybePromotedName l -> MaybePromotedName l -> Bool #

(<=) :: MaybePromotedName l -> MaybePromotedName l -> Bool #

(>) :: MaybePromotedName l -> MaybePromotedName l -> Bool #

(>=) :: MaybePromotedName l -> MaybePromotedName l -> Bool #

max :: MaybePromotedName l -> MaybePromotedName l -> MaybePromotedName l #

min :: MaybePromotedName l -> MaybePromotedName l -> MaybePromotedName l #

Ord l => Ord (Module l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Module l -> Module l -> Ordering #

(<) :: Module l -> Module l -> Bool #

(<=) :: Module l -> Module l -> Bool #

(>) :: Module l -> Module l -> Bool #

(>=) :: Module l -> Module l -> Bool #

max :: Module l -> Module l -> Module l #

min :: Module l -> Module l -> Module l #

Ord l => Ord (ModuleHead l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: ModuleHead l -> ModuleHead l -> Ordering #

(<) :: ModuleHead l -> ModuleHead l -> Bool #

(<=) :: ModuleHead l -> ModuleHead l -> Bool #

(>) :: ModuleHead l -> ModuleHead l -> Bool #

(>=) :: ModuleHead l -> ModuleHead l -> Bool #

max :: ModuleHead l -> ModuleHead l -> ModuleHead l #

min :: ModuleHead l -> ModuleHead l -> ModuleHead l #

Ord l => Ord (ModuleName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: ModuleName l -> ModuleName l -> Ordering #

(<) :: ModuleName l -> ModuleName l -> Bool #

(<=) :: ModuleName l -> ModuleName l -> Bool #

(>) :: ModuleName l -> ModuleName l -> Bool #

(>=) :: ModuleName l -> ModuleName l -> Bool #

max :: ModuleName l -> ModuleName l -> ModuleName l #

min :: ModuleName l -> ModuleName l -> ModuleName l #

Ord l => Ord (ModulePragma l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: ModulePragma l -> ModulePragma l -> Ordering #

(<) :: ModulePragma l -> ModulePragma l -> Bool #

(<=) :: ModulePragma l -> ModulePragma l -> Bool #

(>) :: ModulePragma l -> ModulePragma l -> Bool #

(>=) :: ModulePragma l -> ModulePragma l -> Bool #

max :: ModulePragma l -> ModulePragma l -> ModulePragma l #

min :: ModulePragma l -> ModulePragma l -> ModulePragma l #

Ord l => Ord (Name l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Name l -> Name l -> Ordering #

(<) :: Name l -> Name l -> Bool #

(<=) :: Name l -> Name l -> Bool #

(>) :: Name l -> Name l -> Bool #

(>=) :: Name l -> Name l -> Bool #

max :: Name l -> Name l -> Name l #

min :: Name l -> Name l -> Name l #

Ord l => Ord (Namespace l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Namespace l -> Namespace l -> Ordering #

(<) :: Namespace l -> Namespace l -> Bool #

(<=) :: Namespace l -> Namespace l -> Bool #

(>) :: Namespace l -> Namespace l -> Bool #

(>=) :: Namespace l -> Namespace l -> Bool #

max :: Namespace l -> Namespace l -> Namespace l #

min :: Namespace l -> Namespace l -> Namespace l #

Ord l => Ord (Op l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Op l -> Op l -> Ordering #

(<) :: Op l -> Op l -> Bool #

(<=) :: Op l -> Op l -> Bool #

(>) :: Op l -> Op l -> Bool #

(>=) :: Op l -> Op l -> Bool #

max :: Op l -> Op l -> Op l #

min :: Op l -> Op l -> Op l #

Ord l => Ord (Overlap l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Overlap l -> Overlap l -> Ordering #

(<) :: Overlap l -> Overlap l -> Bool #

(<=) :: Overlap l -> Overlap l -> Bool #

(>) :: Overlap l -> Overlap l -> Bool #

(>=) :: Overlap l -> Overlap l -> Bool #

max :: Overlap l -> Overlap l -> Overlap l #

min :: Overlap l -> Overlap l -> Overlap l #

Ord l => Ord (PXAttr l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: PXAttr l -> PXAttr l -> Ordering #

(<) :: PXAttr l -> PXAttr l -> Bool #

(<=) :: PXAttr l -> PXAttr l -> Bool #

(>) :: PXAttr l -> PXAttr l -> Bool #

(>=) :: PXAttr l -> PXAttr l -> Bool #

max :: PXAttr l -> PXAttr l -> PXAttr l #

min :: PXAttr l -> PXAttr l -> PXAttr l #

Ord l => Ord (Pat l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Pat l -> Pat l -> Ordering #

(<) :: Pat l -> Pat l -> Bool #

(<=) :: Pat l -> Pat l -> Bool #

(>) :: Pat l -> Pat l -> Bool #

(>=) :: Pat l -> Pat l -> Bool #

max :: Pat l -> Pat l -> Pat l #

min :: Pat l -> Pat l -> Pat l #

Ord l => Ord (PatField l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: PatField l -> PatField l -> Ordering #

(<) :: PatField l -> PatField l -> Bool #

(<=) :: PatField l -> PatField l -> Bool #

(>) :: PatField l -> PatField l -> Bool #

(>=) :: PatField l -> PatField l -> Bool #

max :: PatField l -> PatField l -> PatField l #

min :: PatField l -> PatField l -> PatField l #

Ord l => Ord (PatternSynDirection l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: PatternSynDirection l -> PatternSynDirection l -> Ordering #

(<) :: PatternSynDirection l -> PatternSynDirection l -> Bool #

(<=) :: PatternSynDirection l -> PatternSynDirection l -> Bool #

(>) :: PatternSynDirection l -> PatternSynDirection l -> Bool #

(>=) :: PatternSynDirection l -> PatternSynDirection l -> Bool #

max :: PatternSynDirection l -> PatternSynDirection l -> PatternSynDirection l #

min :: PatternSynDirection l -> PatternSynDirection l -> PatternSynDirection l #

Ord l => Ord (Promoted l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Promoted l -> Promoted l -> Ordering #

(<) :: Promoted l -> Promoted l -> Bool #

(<=) :: Promoted l -> Promoted l -> Bool #

(>) :: Promoted l -> Promoted l -> Bool #

(>=) :: Promoted l -> Promoted l -> Bool #

max :: Promoted l -> Promoted l -> Promoted l #

min :: Promoted l -> Promoted l -> Promoted l #

Ord l => Ord (QName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: QName l -> QName l -> Ordering #

(<) :: QName l -> QName l -> Bool #

(<=) :: QName l -> QName l -> Bool #

(>) :: QName l -> QName l -> Bool #

(>=) :: QName l -> QName l -> Bool #

max :: QName l -> QName l -> QName l #

min :: QName l -> QName l -> QName l #

Ord l => Ord (QOp l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: QOp l -> QOp l -> Ordering #

(<) :: QOp l -> QOp l -> Bool #

(<=) :: QOp l -> QOp l -> Bool #

(>) :: QOp l -> QOp l -> Bool #

(>=) :: QOp l -> QOp l -> Bool #

max :: QOp l -> QOp l -> QOp l #

min :: QOp l -> QOp l -> QOp l #

Ord l => Ord (QualConDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: QualConDecl l -> QualConDecl l -> Ordering #

(<) :: QualConDecl l -> QualConDecl l -> Bool #

(<=) :: QualConDecl l -> QualConDecl l -> Bool #

(>) :: QualConDecl l -> QualConDecl l -> Bool #

(>=) :: QualConDecl l -> QualConDecl l -> Bool #

max :: QualConDecl l -> QualConDecl l -> QualConDecl l #

min :: QualConDecl l -> QualConDecl l -> QualConDecl l #

Ord l => Ord (QualStmt l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: QualStmt l -> QualStmt l -> Ordering #

(<) :: QualStmt l -> QualStmt l -> Bool #

(<=) :: QualStmt l -> QualStmt l -> Bool #

(>) :: QualStmt l -> QualStmt l -> Bool #

(>=) :: QualStmt l -> QualStmt l -> Bool #

max :: QualStmt l -> QualStmt l -> QualStmt l #

min :: QualStmt l -> QualStmt l -> QualStmt l #

Ord l => Ord (RPat l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: RPat l -> RPat l -> Ordering #

(<) :: RPat l -> RPat l -> Bool #

(<=) :: RPat l -> RPat l -> Bool #

(>) :: RPat l -> RPat l -> Bool #

(>=) :: RPat l -> RPat l -> Bool #

max :: RPat l -> RPat l -> RPat l #

min :: RPat l -> RPat l -> RPat l #

Ord l => Ord (RPatOp l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: RPatOp l -> RPatOp l -> Ordering #

(<) :: RPatOp l -> RPatOp l -> Bool #

(<=) :: RPatOp l -> RPatOp l -> Bool #

(>) :: RPatOp l -> RPatOp l -> Bool #

(>=) :: RPatOp l -> RPatOp l -> Bool #

max :: RPatOp l -> RPatOp l -> RPatOp l #

min :: RPatOp l -> RPatOp l -> RPatOp l #

Ord l => Ord (ResultSig l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: ResultSig l -> ResultSig l -> Ordering #

(<) :: ResultSig l -> ResultSig l -> Bool #

(<=) :: ResultSig l -> ResultSig l -> Bool #

(>) :: ResultSig l -> ResultSig l -> Bool #

(>=) :: ResultSig l -> ResultSig l -> Bool #

max :: ResultSig l -> ResultSig l -> ResultSig l #

min :: ResultSig l -> ResultSig l -> ResultSig l #

Ord l => Ord (Rhs l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Rhs l -> Rhs l -> Ordering #

(<) :: Rhs l -> Rhs l -> Bool #

(<=) :: Rhs l -> Rhs l -> Bool #

(>) :: Rhs l -> Rhs l -> Bool #

(>=) :: Rhs l -> Rhs l -> Bool #

max :: Rhs l -> Rhs l -> Rhs l #

min :: Rhs l -> Rhs l -> Rhs l #

Ord l => Ord (Role l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Role l -> Role l -> Ordering #

(<) :: Role l -> Role l -> Bool #

(<=) :: Role l -> Role l -> Bool #

(>) :: Role l -> Role l -> Bool #

(>=) :: Role l -> Role l -> Bool #

max :: Role l -> Role l -> Role l #

min :: Role l -> Role l -> Role l #

Ord l => Ord (Rule l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Rule l -> Rule l -> Ordering #

(<) :: Rule l -> Rule l -> Bool #

(<=) :: Rule l -> Rule l -> Bool #

(>) :: Rule l -> Rule l -> Bool #

(>=) :: Rule l -> Rule l -> Bool #

max :: Rule l -> Rule l -> Rule l #

min :: Rule l -> Rule l -> Rule l #

Ord l => Ord (RuleVar l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: RuleVar l -> RuleVar l -> Ordering #

(<) :: RuleVar l -> RuleVar l -> Bool #

(<=) :: RuleVar l -> RuleVar l -> Bool #

(>) :: RuleVar l -> RuleVar l -> Bool #

(>=) :: RuleVar l -> RuleVar l -> Bool #

max :: RuleVar l -> RuleVar l -> RuleVar l #

min :: RuleVar l -> RuleVar l -> RuleVar l #

Ord l => Ord (Safety l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Safety l -> Safety l -> Ordering #

(<) :: Safety l -> Safety l -> Bool #

(<=) :: Safety l -> Safety l -> Bool #

(>) :: Safety l -> Safety l -> Bool #

(>=) :: Safety l -> Safety l -> Bool #

max :: Safety l -> Safety l -> Safety l #

min :: Safety l -> Safety l -> Safety l #

Ord l => Ord (Sign l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Sign l -> Sign l -> Ordering #

(<) :: Sign l -> Sign l -> Bool #

(<=) :: Sign l -> Sign l -> Bool #

(>) :: Sign l -> Sign l -> Bool #

(>=) :: Sign l -> Sign l -> Bool #

max :: Sign l -> Sign l -> Sign l #

min :: Sign l -> Sign l -> Sign l #

Ord l => Ord (SpecialCon l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: SpecialCon l -> SpecialCon l -> Ordering #

(<) :: SpecialCon l -> SpecialCon l -> Bool #

(<=) :: SpecialCon l -> SpecialCon l -> Bool #

(>) :: SpecialCon l -> SpecialCon l -> Bool #

(>=) :: SpecialCon l -> SpecialCon l -> Bool #

max :: SpecialCon l -> SpecialCon l -> SpecialCon l #

min :: SpecialCon l -> SpecialCon l -> SpecialCon l #

Ord l => Ord (Splice l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Splice l -> Splice l -> Ordering #

(<) :: Splice l -> Splice l -> Bool #

(<=) :: Splice l -> Splice l -> Bool #

(>) :: Splice l -> Splice l -> Bool #

(>=) :: Splice l -> Splice l -> Bool #

max :: Splice l -> Splice l -> Splice l #

min :: Splice l -> Splice l -> Splice l #

Ord l => Ord (Stmt l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Stmt l -> Stmt l -> Ordering #

(<) :: Stmt l -> Stmt l -> Bool #

(<=) :: Stmt l -> Stmt l -> Bool #

(>) :: Stmt l -> Stmt l -> Bool #

(>=) :: Stmt l -> Stmt l -> Bool #

max :: Stmt l -> Stmt l -> Stmt l #

min :: Stmt l -> Stmt l -> Stmt l #

Ord l => Ord (TyVarBind l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: TyVarBind l -> TyVarBind l -> Ordering #

(<) :: TyVarBind l -> TyVarBind l -> Bool #

(<=) :: TyVarBind l -> TyVarBind l -> Bool #

(>) :: TyVarBind l -> TyVarBind l -> Bool #

(>=) :: TyVarBind l -> TyVarBind l -> Bool #

max :: TyVarBind l -> TyVarBind l -> TyVarBind l #

min :: TyVarBind l -> TyVarBind l -> TyVarBind l #

Ord l => Ord (Type l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Type l -> Type l -> Ordering #

(<) :: Type l -> Type l -> Bool #

(<=) :: Type l -> Type l -> Bool #

(>) :: Type l -> Type l -> Bool #

(>=) :: Type l -> Type l -> Bool #

max :: Type l -> Type l -> Type l #

min :: Type l -> Type l -> Type l #

Ord l => Ord (TypeEqn l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: TypeEqn l -> TypeEqn l -> Ordering #

(<) :: TypeEqn l -> TypeEqn l -> Bool #

(<=) :: TypeEqn l -> TypeEqn l -> Bool #

(>) :: TypeEqn l -> TypeEqn l -> Bool #

(>=) :: TypeEqn l -> TypeEqn l -> Bool #

max :: TypeEqn l -> TypeEqn l -> TypeEqn l #

min :: TypeEqn l -> TypeEqn l -> TypeEqn l #

Ord l => Ord (Unpackedness l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: Unpackedness l -> Unpackedness l -> Ordering #

(<) :: Unpackedness l -> Unpackedness l -> Bool #

(<=) :: Unpackedness l -> Unpackedness l -> Bool #

(>) :: Unpackedness l -> Unpackedness l -> Bool #

(>=) :: Unpackedness l -> Unpackedness l -> Bool #

max :: Unpackedness l -> Unpackedness l -> Unpackedness l #

min :: Unpackedness l -> Unpackedness l -> Unpackedness l #

Ord l => Ord (WarningText l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: WarningText l -> WarningText l -> Ordering #

(<) :: WarningText l -> WarningText l -> Bool #

(<=) :: WarningText l -> WarningText l -> Bool #

(>) :: WarningText l -> WarningText l -> Bool #

(>=) :: WarningText l -> WarningText l -> Bool #

max :: WarningText l -> WarningText l -> WarningText l #

min :: WarningText l -> WarningText l -> WarningText l #

Ord l => Ord (XAttr l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: XAttr l -> XAttr l -> Ordering #

(<) :: XAttr l -> XAttr l -> Bool #

(<=) :: XAttr l -> XAttr l -> Bool #

(>) :: XAttr l -> XAttr l -> Bool #

(>=) :: XAttr l -> XAttr l -> Bool #

max :: XAttr l -> XAttr l -> XAttr l #

min :: XAttr l -> XAttr l -> XAttr l #

Ord l => Ord (XName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Methods

compare :: XName l -> XName l -> Ordering #

(<) :: XName l -> XName l -> Bool #

(<=) :: XName l -> XName l -> Bool #

(>) :: XName l -> XName l -> Bool #

(>=) :: XName l -> XName l -> Bool #

max :: XName l -> XName l -> XName l #

min :: XName l -> XName l -> XName l #

Ord (ElapsedSince epoch) 
Instance details

Defined in Data.Hourglass.Epoch

Methods

compare :: ElapsedSince epoch -> ElapsedSince epoch -> Ordering #

(<) :: ElapsedSince epoch -> ElapsedSince epoch -> Bool #

(<=) :: ElapsedSince epoch -> ElapsedSince epoch -> Bool #

(>) :: ElapsedSince epoch -> ElapsedSince epoch -> Bool #

(>=) :: ElapsedSince epoch -> ElapsedSince epoch -> Bool #

max :: ElapsedSince epoch -> ElapsedSince epoch -> ElapsedSince epoch #

min :: ElapsedSince epoch -> ElapsedSince epoch -> ElapsedSince epoch #

Ord (ElapsedSinceP epoch) 
Instance details

Defined in Data.Hourglass.Epoch

Methods

compare :: ElapsedSinceP epoch -> ElapsedSinceP epoch -> Ordering #

(<) :: ElapsedSinceP epoch -> ElapsedSinceP epoch -> Bool #

(<=) :: ElapsedSinceP epoch -> ElapsedSinceP epoch -> Bool #

(>) :: ElapsedSinceP epoch -> ElapsedSinceP epoch -> Bool #

(>=) :: ElapsedSinceP epoch -> ElapsedSinceP epoch -> Bool #

max :: ElapsedSinceP epoch -> ElapsedSinceP epoch -> ElapsedSinceP epoch #

min :: ElapsedSinceP epoch -> ElapsedSinceP epoch -> ElapsedSinceP epoch #

Ord (Word t) 
Instance details

Defined in Text.Inflections.Types

Methods

compare :: Word t -> Word t -> Ordering #

(<) :: Word t -> Word t -> Bool #

(<=) :: Word t -> Word t -> Bool #

(>) :: Word t -> Word t -> Bool #

(>=) :: Word t -> Word t -> Bool #

max :: Word t -> Word t -> Word t #

min :: Word t -> Word t -> Word t #

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 a => Ord (Deque a) 
Instance details

Defined in Control.Lens.Internal.Deque

Methods

compare :: Deque a -> Deque a -> Ordering #

(<) :: Deque a -> Deque a -> Bool #

(<=) :: Deque a -> Deque a -> Bool #

(>) :: Deque a -> Deque a -> Bool #

(>=) :: Deque a -> Deque a -> Bool #

max :: Deque a -> Deque a -> Deque a #

min :: Deque a -> Deque a -> Deque a #

Ord (PrimaryKey table) => Ord (Id' table) Source # 
Instance details

Defined in IHP.ModelSupport

Methods

compare :: Id' table -> Id' table -> Ordering #

(<) :: Id' table -> Id' table -> Bool #

(<=) :: Id' table -> Id' table -> Bool #

(>) :: Id' table -> Id' table -> Bool #

(>=) :: Id' table -> Id' table -> Bool #

max :: Id' table -> Id' table -> Id' table #

min :: Id' table -> Id' table -> Id' table #

Ord e => Ord (ErrorFancy e) 
Instance details

Defined in Text.Megaparsec.Error

Methods

compare :: ErrorFancy e -> ErrorFancy e -> Ordering #

(<) :: ErrorFancy e -> ErrorFancy e -> Bool #

(<=) :: ErrorFancy e -> ErrorFancy e -> Bool #

(>) :: ErrorFancy e -> ErrorFancy e -> Bool #

(>=) :: ErrorFancy e -> ErrorFancy e -> Bool #

max :: ErrorFancy e -> ErrorFancy e -> ErrorFancy e #

min :: ErrorFancy e -> ErrorFancy e -> ErrorFancy e #

Ord t => Ord (ErrorItem t) 
Instance details

Defined in Text.Megaparsec.Error

Methods

compare :: ErrorItem t -> ErrorItem t -> Ordering #

(<) :: ErrorItem t -> ErrorItem t -> Bool #

(<=) :: ErrorItem t -> ErrorItem t -> Bool #

(>) :: ErrorItem t -> ErrorItem t -> Bool #

(>=) :: ErrorItem t -> ErrorItem t -> Bool #

max :: ErrorItem t -> ErrorItem t -> ErrorItem t #

min :: ErrorItem t -> ErrorItem t -> ErrorItem t #

Ord e => Ord (EF e) 
Instance details

Defined in Text.Megaparsec.Error.Builder

Methods

compare :: EF e -> EF e -> Ordering #

(<) :: EF e -> EF e -> Bool #

(<=) :: EF e -> EF e -> Bool #

(>) :: EF e -> EF e -> Bool #

(>=) :: EF e -> EF e -> Bool #

max :: EF e -> EF e -> EF e #

min :: EF e -> EF e -> EF e #

Ord (Token s) => Ord (ET s) 
Instance details

Defined in Text.Megaparsec.Error.Builder

Methods

compare :: ET s -> ET s -> Ordering #

(<) :: ET s -> ET s -> Bool #

(<=) :: ET s -> ET s -> Bool #

(>) :: ET s -> ET s -> Bool #

(>=) :: ET s -> ET s -> Bool #

max :: ET s -> ET s -> ET s #

min :: ET s -> ET s -> ET s #

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 (Fin n) 
Instance details

Defined in Arithmetic.Types

Methods

compare :: Fin n -> Fin n -> Ordering #

(<) :: Fin n -> Fin n -> Bool #

(<=) :: Fin n -> Fin n -> Bool #

(>) :: Fin n -> Fin n -> Bool #

(>=) :: Fin n -> Fin n -> Bool #

max :: Fin n -> Fin n -> Fin n #

min :: Fin n -> Fin n -> Fin n #

Ord a => Ord (RegexpSplit a) 
Instance details

Defined in Text.Regex.PCRE.ByteString.Utils

Methods

compare :: RegexpSplit a -> RegexpSplit a -> Ordering #

(<) :: RegexpSplit a -> RegexpSplit a -> Bool #

(<=) :: RegexpSplit a -> RegexpSplit a -> Bool #

(>) :: RegexpSplit a -> RegexpSplit a -> Bool #

(>=) :: RegexpSplit a -> RegexpSplit a -> Bool #

max :: RegexpSplit a -> RegexpSplit a -> RegexpSplit a #

min :: RegexpSplit a -> RegexpSplit a -> RegexpSplit a #

Ord a => Ord (Binary a) 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

compare :: Binary a -> Binary a -> Ordering #

(<) :: Binary a -> Binary a -> Bool #

(<=) :: Binary a -> Binary a -> Bool #

(>) :: Binary a -> Binary a -> Bool #

(>=) :: Binary a -> Binary a -> Bool #

max :: Binary a -> Binary a -> Binary a #

min :: Binary a -> Binary a -> Binary a #

Ord a => Ord (In a) 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

compare :: In a -> In a -> Ordering #

(<) :: In a -> In a -> Bool #

(<=) :: In a -> In a -> Bool #

(>) :: In a -> In a -> Bool #

(>=) :: In a -> In a -> Bool #

max :: In a -> In a -> In a #

min :: In a -> In a -> In a #

Ord a => Ord (PGArray a) 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

compare :: PGArray a -> PGArray a -> Ordering #

(<) :: PGArray a -> PGArray a -> Bool #

(<=) :: PGArray a -> PGArray a -> Bool #

(>) :: PGArray a -> PGArray a -> Bool #

(>=) :: PGArray a -> PGArray a -> Bool #

max :: PGArray a -> PGArray a -> PGArray a #

min :: PGArray a -> PGArray a -> PGArray a #

Ord a => Ord (Values a) 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

compare :: Values a -> Values a -> Ordering #

(<) :: Values a -> Values a -> Bool #

(<=) :: Values a -> Values a -> Bool #

(>) :: Values a -> Values a -> Bool #

(>=) :: Values a -> Values a -> Bool #

max :: Values a -> Values a -> Values a #

min :: Values a -> Values a -> Values a #

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 ann => Ord (SimpleDocTok ann) 
Instance details

Defined in Prettyprinter.Render.Util.SimpleDocTree

Methods

compare :: SimpleDocTok ann -> SimpleDocTok ann -> Ordering #

(<) :: SimpleDocTok ann -> SimpleDocTok ann -> Bool #

(<=) :: SimpleDocTok ann -> SimpleDocTok ann -> Bool #

(>) :: SimpleDocTok ann -> SimpleDocTok ann -> Bool #

(>=) :: SimpleDocTok ann -> SimpleDocTok ann -> Bool #

max :: SimpleDocTok ann -> SimpleDocTok ann -> SimpleDocTok ann #

min :: SimpleDocTok ann -> SimpleDocTok ann -> SimpleDocTok ann #

Ord ann => Ord (SimpleDocTree ann) 
Instance details

Defined in Prettyprinter.Render.Util.SimpleDocTree

Methods

compare :: SimpleDocTree ann -> SimpleDocTree ann -> Ordering #

(<) :: SimpleDocTree ann -> SimpleDocTree ann -> Bool #

(<=) :: SimpleDocTree ann -> SimpleDocTree ann -> Bool #

(>) :: SimpleDocTree ann -> SimpleDocTree ann -> Bool #

(>=) :: SimpleDocTree ann -> SimpleDocTree ann -> Bool #

max :: SimpleDocTree ann -> SimpleDocTree ann -> SimpleDocTree ann #

min :: SimpleDocTree ann -> SimpleDocTree ann -> SimpleDocTree 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 (CharMap a) 
Instance details

Defined in Data.IntMap.CharMap2

Methods

compare :: CharMap a -> CharMap a -> Ordering #

(<) :: CharMap a -> CharMap a -> Bool #

(<=) :: CharMap a -> CharMap a -> Bool #

(>) :: CharMap a -> CharMap a -> Bool #

(>=) :: CharMap a -> CharMap a -> Bool #

max :: CharMap a -> CharMap a -> CharMap a #

min :: CharMap a -> CharMap a -> CharMap a #

Ord (EnumSet e) 
Instance details

Defined in Data.IntSet.EnumSet2

Methods

compare :: EnumSet e -> EnumSet e -> Ordering #

(<) :: EnumSet e -> EnumSet e -> Bool #

(<=) :: EnumSet e -> EnumSet e -> Bool #

(>) :: EnumSet e -> EnumSet e -> Bool #

(>=) :: EnumSet e -> EnumSet e -> Bool #

max :: EnumSet e -> EnumSet e -> EnumSet e #

min :: EnumSet e -> EnumSet e -> EnumSet e #

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 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 string => Ord (UTF8 string) 
Instance details

Defined in Data.String.UTF8

Methods

compare :: UTF8 string -> UTF8 string -> Ordering #

(<) :: UTF8 string -> UTF8 string -> Bool #

(<=) :: UTF8 string -> UTF8 string -> Bool #

(>) :: UTF8 string -> UTF8 string -> Bool #

(>=) :: UTF8 string -> UTF8 string -> Bool #

max :: UTF8 string -> UTF8 string -> UTF8 string #

min :: UTF8 string -> UTF8 string -> UTF8 string #

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 (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 #

(PrimType a, Ord a) => Ord (BlockN n a) 
Instance details

Defined in Basement.Sized.Block

Methods

compare :: BlockN n a -> BlockN n a -> Ordering #

(<) :: BlockN n a -> BlockN n a -> Bool #

(<=) :: BlockN n a -> BlockN n a -> Bool #

(>) :: BlockN n a -> BlockN n a -> Bool #

(>=) :: BlockN n a -> BlockN n a -> Bool #

max :: BlockN n a -> BlockN n a -> BlockN n a #

min :: BlockN n a -> BlockN n a -> BlockN n a #

Ord a => Ord (ListN n a) 
Instance details

Defined in Basement.Sized.List

Methods

compare :: ListN n a -> ListN n a -> Ordering #

(<) :: ListN n a -> ListN n a -> Bool #

(<=) :: ListN n a -> ListN n a -> Bool #

(>) :: ListN n a -> ListN n a -> Bool #

(>=) :: ListN n a -> ListN n a -> Bool #

max :: ListN n a -> ListN n a -> ListN n a #

min :: ListN n a -> ListN n a -> ListN n a #

(Ord a, Ord b) => Ord (These a b) 
Instance details

Defined in Basement.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 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 (MacKey c d) 
Instance details

Defined in Crypto.HMAC

Methods

compare :: MacKey c d -> MacKey c d -> Ordering #

(<) :: MacKey c d -> MacKey c d -> Bool #

(<=) :: MacKey c d -> MacKey c d -> Bool #

(>) :: MacKey c d -> MacKey c d -> Bool #

(>=) :: MacKey c d -> MacKey c d -> Bool #

max :: MacKey c d -> MacKey c d -> MacKey c d #

min :: MacKey c d -> MacKey c d -> MacKey c d #

(Ord1 f, Ord a) => Ord (Ap f a) 
Instance details

Defined in Control.Applicative.Free

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 #

(Ord1 f, Ord a) => Ord (Cofree f a) 
Instance details

Defined in Control.Comonad.Cofree

Methods

compare :: Cofree f a -> Cofree f a -> Ordering #

(<) :: Cofree f a -> Cofree f a -> Bool #

(<=) :: Cofree f a -> Cofree f a -> Bool #

(>) :: Cofree f a -> Cofree f a -> Bool #

(>=) :: Cofree f a -> Cofree f a -> Bool #

max :: Cofree f a -> Cofree f a -> Cofree f a #

min :: Cofree f a -> Cofree f a -> Cofree f a #

(Ord1 w, Ord a) => Ord (CoiterT w a) 
Instance details

Defined in Control.Comonad.Trans.Coiter

Methods

compare :: CoiterT w a -> CoiterT w a -> Ordering #

(<) :: CoiterT w a -> CoiterT w a -> Bool #

(<=) :: CoiterT w a -> CoiterT w a -> Bool #

(>) :: CoiterT w a -> CoiterT w a -> Bool #

(>=) :: CoiterT w a -> CoiterT w a -> Bool #

max :: CoiterT w a -> CoiterT w a -> CoiterT w a #

min :: CoiterT w a -> CoiterT w a -> CoiterT w a #

(Ord1 f, Ord a) => Ord (Free f a) 
Instance details

Defined in Control.Monad.Free

Methods

compare :: Free f a -> Free f a -> Ordering #

(<) :: Free f a -> Free f a -> Bool #

(<=) :: Free f a -> Free f a -> Bool #

(>) :: Free f a -> Free f a -> Bool #

(>=) :: Free f a -> Free f a -> Bool #

max :: Free f a -> Free f a -> Free f a #

min :: Free f a -> Free f a -> Free f a #

(Ord1 f, Ord a) => Ord (Free f a) 
Instance details

Defined in Control.Monad.Free.Ap

Methods

compare :: Free f a -> Free f a -> Ordering #

(<) :: Free f a -> Free f a -> Bool #

(<=) :: Free f a -> Free f a -> Bool #

(>) :: Free f a -> Free f a -> Bool #

(>=) :: Free f a -> Free f a -> Bool #

max :: Free f a -> Free f a -> Free f a #

min :: Free f a -> Free f a -> Free f a #

(Ord1 m, Ord a) => Ord (IterT m a) 
Instance details

Defined in Control.Monad.Trans.Iter

Methods

compare :: IterT m a -> IterT m a -> Ordering #

(<) :: IterT m a -> IterT m a -> Bool #

(<=) :: IterT m a -> IterT m a -> Bool #

(>) :: IterT m a -> IterT m a -> Bool #

(>=) :: IterT m a -> IterT m a -> Bool #

max :: IterT m a -> IterT m a -> IterT m a #

min :: IterT m a -> IterT m a -> IterT m a #

(Ord l, Ord e) => Ord (GenLocated l e) 
Instance details

Defined in GHC.Types.SrcLoc

Methods

compare :: GenLocated l e -> GenLocated l e -> Ordering #

(<) :: GenLocated l e -> GenLocated l e -> Bool #

(<=) :: GenLocated l e -> GenLocated l e -> Bool #

(>) :: GenLocated l e -> GenLocated l e -> Bool #

(>=) :: GenLocated l e -> GenLocated l e -> Bool #

max :: GenLocated l e -> GenLocated l e -> GenLocated l e #

min :: GenLocated l e -> GenLocated l e -> GenLocated l e #

(Ord1 f, Ord a) => Ord (Coyoneda f a) 
Instance details

Defined in Data.Functor.Coyoneda

Methods

compare :: Coyoneda f a -> Coyoneda f a -> Ordering #

(<) :: Coyoneda f a -> Coyoneda f a -> Bool #

(<=) :: Coyoneda f a -> Coyoneda f a -> Bool #

(>) :: Coyoneda f a -> Coyoneda f a -> Bool #

(>=) :: Coyoneda f a -> Coyoneda f a -> Bool #

max :: Coyoneda f a -> Coyoneda f a -> Coyoneda f a #

min :: Coyoneda f a -> Coyoneda f a -> Coyoneda f a #

(Ord1 f, Ord a) => Ord (Yoneda f a) 
Instance details

Defined in Data.Functor.Yoneda

Methods

compare :: Yoneda f a -> Yoneda f a -> Ordering #

(<) :: Yoneda f a -> Yoneda f a -> Bool #

(<=) :: Yoneda f a -> Yoneda f a -> Bool #

(>) :: Yoneda f a -> Yoneda f a -> Bool #

(>=) :: Yoneda f a -> Yoneda f a -> Bool #

max :: Yoneda f a -> Yoneda f a -> Yoneda f a #

min :: Yoneda f a -> Yoneda f a -> Yoneda f a #

(Ord i, Ord a) => Ord (Level i a) 
Instance details

Defined in Control.Lens.Internal.Level

Methods

compare :: Level i a -> Level i a -> Ordering #

(<) :: Level i a -> Level i a -> Bool #

(<=) :: Level i a -> Level i a -> Bool #

(>) :: Level i a -> Level i a -> Bool #

(>=) :: Level i a -> Level i a -> Bool #

max :: Level i a -> Level i a -> Level i a #

min :: Level i a -> Level i a -> Level i a #

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 h, Ord t) => Ord (h :. t) 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

compare :: (h :. t) -> (h :. t) -> Ordering #

(<) :: (h :. t) -> (h :. t) -> Bool #

(<=) :: (h :. t) -> (h :. t) -> Bool #

(>) :: (h :. t) -> (h :. t) -> Bool #

(>=) :: (h :. t) -> (h :. t) -> Bool #

max :: (h :. t) -> (h :. t) -> h :. t #

min :: (h :. t) -> (h :. t) -> h :. t #

Ord a => Ord (EnumMap k a) 
Instance details

Defined in Data.IntMap.EnumMap2

Methods

compare :: EnumMap k a -> EnumMap k a -> Ordering #

(<) :: EnumMap k a -> EnumMap k a -> Bool #

(<=) :: EnumMap k a -> EnumMap k a -> Bool #

(>) :: EnumMap k a -> EnumMap k a -> Bool #

(>=) :: EnumMap k a -> EnumMap k a -> Bool #

max :: EnumMap k a -> EnumMap k a -> EnumMap k a #

min :: EnumMap k a -> EnumMap k a -> EnumMap k a #

Ord (f a) => Ord (Zippy f a) 
Instance details

Defined in Data.Zip

Methods

compare :: Zippy f a -> Zippy f a -> Ordering #

(<) :: Zippy f a -> Zippy f a -> Bool #

(<=) :: Zippy f a -> Zippy f a -> Bool #

(>) :: Zippy f a -> Zippy f a -> Bool #

(>=) :: Zippy f a -> Zippy f a -> Bool #

max :: Zippy f a -> Zippy f a -> Zippy f a #

min :: Zippy f a -> Zippy f a -> Zippy f 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 #

(GOrd (Rep1 f a), Generic1 f) => Ord (FunctorClassesDefault f a) 
Instance details

Defined in Data.Functor.Classes.Generic.Internal

Methods

compare :: FunctorClassesDefault f a -> FunctorClassesDefault f a -> Ordering #

(<) :: FunctorClassesDefault f a -> FunctorClassesDefault f a -> Bool #

(<=) :: FunctorClassesDefault f a -> FunctorClassesDefault f a -> Bool #

(>) :: FunctorClassesDefault f a -> FunctorClassesDefault f a -> Bool #

(>=) :: FunctorClassesDefault f a -> FunctorClassesDefault f a -> Bool #

max :: FunctorClassesDefault f a -> FunctorClassesDefault f a -> FunctorClassesDefault f a #

min :: FunctorClassesDefault f a -> FunctorClassesDefault f a -> FunctorClassesDefault f 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 (bi a b) => Ord (Biap bi a b) 
Instance details

Defined in Data.Bifunctor.Biap

Methods

compare :: Biap bi a b -> Biap bi a b -> Ordering #

(<) :: Biap bi a b -> Biap bi a b -> Bool #

(<=) :: Biap bi a b -> Biap bi a b -> Bool #

(>) :: Biap bi a b -> Biap bi a b -> Bool #

(>=) :: Biap bi a b -> Biap bi a b -> Bool #

max :: Biap bi a b -> Biap bi a b -> Biap bi a b #

min :: Biap bi a b -> Biap bi a b -> Biap bi a b #

Ord (p (Fix p a) a) => Ord (Fix p a) 
Instance details

Defined in Data.Bifunctor.Fix

Methods

compare :: Fix p a -> Fix p a -> Ordering #

(<) :: Fix p a -> Fix p a -> Bool #

(<=) :: Fix p a -> Fix p a -> Bool #

(>) :: Fix p a -> Fix p a -> Bool #

(>=) :: Fix p a -> Fix p a -> Bool #

max :: Fix p a -> Fix p a -> Fix p a #

min :: Fix p a -> Fix p a -> Fix p a #

Ord (p a a) => Ord (Join p a) 
Instance details

Defined in Data.Bifunctor.Join

Methods

compare :: Join p a -> Join p a -> Ordering #

(<) :: Join p a -> Join p a -> Bool #

(<=) :: Join p a -> Join p a -> Bool #

(>) :: Join p a -> Join p a -> Bool #

(>=) :: Join p a -> Join p a -> Bool #

max :: Join p a -> Join p a -> Join p a #

min :: Join p a -> Join p a -> Join p a #

(Ord a, Ord (f b)) => Ord (CofreeF f a b) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

compare :: CofreeF f a b -> CofreeF f a b -> Ordering #

(<) :: CofreeF f a b -> CofreeF f a b -> Bool #

(<=) :: CofreeF f a b -> CofreeF f a b -> Bool #

(>) :: CofreeF f a b -> CofreeF f a b -> Bool #

(>=) :: CofreeF f a b -> CofreeF f a b -> Bool #

max :: CofreeF f a b -> CofreeF f a b -> CofreeF f a b #

min :: CofreeF f a b -> CofreeF f a b -> CofreeF f a b #

Ord (w (CofreeF f a (CofreeT f w a))) => Ord (CofreeT f w a) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

compare :: CofreeT f w a -> CofreeT f w a -> Ordering #

(<) :: CofreeT f w a -> CofreeT f w a -> Bool #

(<=) :: CofreeT f w a -> CofreeT f w a -> Bool #

(>) :: CofreeT f w a -> CofreeT f w a -> Bool #

(>=) :: CofreeT f w a -> CofreeT f w a -> Bool #

max :: CofreeT f w a -> CofreeT f w a -> CofreeT f w a #

min :: CofreeT f w a -> CofreeT f w a -> CofreeT f w a #

(Ord a, Ord (f b)) => Ord (FreeF f a b) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

compare :: FreeF f a b -> FreeF f a b -> Ordering #

(<) :: FreeF f a b -> FreeF f a b -> Bool #

(<=) :: FreeF f a b -> FreeF f a b -> Bool #

(>) :: FreeF f a b -> FreeF f a b -> Bool #

(>=) :: FreeF f a b -> FreeF f a b -> Bool #

max :: FreeF f a b -> FreeF f a b -> FreeF f a b #

min :: FreeF f a b -> FreeF f a b -> FreeF f a b #

(Ord1 f, Ord1 m, Ord a) => Ord (FreeT f m a) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

compare :: FreeT f m a -> FreeT f m a -> Ordering #

(<) :: FreeT f m a -> FreeT f m a -> Bool #

(<=) :: FreeT f m a -> FreeT f m a -> Bool #

(>) :: FreeT f m a -> FreeT f m a -> Bool #

(>=) :: FreeT f m a -> FreeT f m a -> Bool #

max :: FreeT f m a -> FreeT f m a -> FreeT f m a #

min :: FreeT f m a -> FreeT f m a -> FreeT f m a #

(Ord a, Ord (f b)) => Ord (FreeF f a b) 
Instance details

Defined in Control.Monad.Trans.Free.Ap

Methods

compare :: FreeF f a b -> FreeF f a b -> Ordering #

(<) :: FreeF f a b -> FreeF f a b -> Bool #

(<=) :: FreeF f a b -> FreeF f a b -> Bool #

(>) :: FreeF f a b -> FreeF f a b -> Bool #

(>=) :: FreeF f a b -> FreeF f a b -> Bool #

max :: FreeF f a b -> FreeF f a b -> FreeF f a b #

min :: FreeF f a b -> FreeF f a b -> FreeF f a b #

(Ord1 f, Ord1 m, Ord a) => Ord (FreeT f m a) 
Instance details

Defined in Control.Monad.Trans.Free.Ap

Methods

compare :: FreeT f m a -> FreeT f m a -> Ordering #

(<) :: FreeT f m a -> FreeT f m a -> Bool #

(<=) :: FreeT f m a -> FreeT f m a -> Bool #

(>) :: FreeT f m a -> FreeT f m a -> Bool #

(>=) :: FreeT f m a -> FreeT f m a -> Bool #

max :: FreeT f m a -> FreeT f m a -> FreeT f m a #

min :: FreeT f m a -> FreeT f m a -> FreeT f m a #

(Functor f, Monad m, Ord1 f, Ord1 m, Ord a) => Ord (FT f m a) 
Instance details

Defined in Control.Monad.Trans.Free.Church

Methods

compare :: FT f m a -> FT f m a -> Ordering #

(<) :: FT f m a -> FT f m a -> Bool #

(<=) :: FT f m a -> FT f m a -> Bool #

(>) :: FT f m a -> FT f m a -> Bool #

(>=) :: FT f m a -> FT f m a -> Bool #

max :: FT f m a -> FT f m a -> FT f m a #

min :: FT f m a -> FT f m a -> FT f m a #

Ord (f a) => Ord (WrappedContravariant f a) 
Instance details

Defined in Data.Functor.Invariant

Methods

compare :: WrappedContravariant f a -> WrappedContravariant f a -> Ordering #

(<) :: WrappedContravariant f a -> WrappedContravariant f a -> Bool #

(<=) :: WrappedContravariant f a -> WrappedContravariant f a -> Bool #

(>) :: WrappedContravariant f a -> WrappedContravariant f a -> Bool #

(>=) :: WrappedContravariant f a -> WrappedContravariant f a -> Bool #

max :: WrappedContravariant f a -> WrappedContravariant f a -> WrappedContravariant f a #

min :: WrappedContravariant f a -> WrappedContravariant f a -> WrappedContravariant f a #

Ord (f a) => Ord (WrappedFunctor f a) 
Instance details

Defined in Data.Functor.Invariant

Methods

compare :: WrappedFunctor f a -> WrappedFunctor f a -> Ordering #

(<) :: WrappedFunctor f a -> WrappedFunctor f a -> Bool #

(<=) :: WrappedFunctor f a -> WrappedFunctor f a -> Bool #

(>) :: WrappedFunctor f a -> WrappedFunctor f a -> Bool #

(>=) :: WrappedFunctor f a -> WrappedFunctor f a -> Bool #

max :: WrappedFunctor f a -> WrappedFunctor f a -> WrappedFunctor f a #

min :: WrappedFunctor f a -> WrappedFunctor f a -> WrappedFunctor f a #

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 (f a) => Ord (Clown f a b) 
Instance details

Defined in Data.Bifunctor.Clown

Methods

compare :: Clown f a b -> Clown f a b -> Ordering #

(<) :: Clown f a b -> Clown f a b -> Bool #

(<=) :: Clown f a b -> Clown f a b -> Bool #

(>) :: Clown f a b -> Clown f a b -> Bool #

(>=) :: Clown f a b -> Clown f a b -> Bool #

max :: Clown f a b -> Clown f a b -> Clown f a b #

min :: Clown f a b -> Clown f a b -> Clown f a b #

Ord (p b a) => Ord (Flip p a b) 
Instance details

Defined in Data.Bifunctor.Flip

Methods

compare :: Flip p a b -> Flip p a b -> Ordering #

(<) :: Flip p a b -> Flip p a b -> Bool #

(<=) :: Flip p a b -> Flip p a b -> Bool #

(>) :: Flip p a b -> Flip p a b -> Bool #

(>=) :: Flip p a b -> Flip p a b -> Bool #

max :: Flip p a b -> Flip p a b -> Flip p a b #

min :: Flip p a b -> Flip p a b -> Flip p a b #

Ord (g b) => Ord (Joker g a b) 
Instance details

Defined in Data.Bifunctor.Joker

Methods

compare :: Joker g a b -> Joker g a b -> Ordering #

(<) :: Joker g a b -> Joker g a b -> Bool #

(<=) :: Joker g a b -> Joker g a b -> Bool #

(>) :: Joker g a b -> Joker g a b -> Bool #

(>=) :: Joker g a b -> Joker g a b -> Bool #

max :: Joker g a b -> Joker g a b -> Joker g a b #

min :: Joker g a b -> Joker g a b -> Joker g a b #

Ord (p a b) => Ord (WrappedBifunctor p a b) 
Instance details

Defined in Data.Bifunctor.Wrapped

Methods

compare :: WrappedBifunctor p a b -> WrappedBifunctor p a b -> Ordering #

(<) :: WrappedBifunctor p a b -> WrappedBifunctor p a b -> Bool #

(<=) :: WrappedBifunctor p a b -> WrappedBifunctor p a b -> Bool #

(>) :: WrappedBifunctor p a b -> WrappedBifunctor p a b -> Bool #

(>=) :: WrappedBifunctor p a b -> WrappedBifunctor p a b -> Bool #

max :: WrappedBifunctor p a b -> WrappedBifunctor p a b -> WrappedBifunctor p a b #

min :: WrappedBifunctor p a b -> WrappedBifunctor p a b -> WrappedBifunctor p a b #

Ord (p a b) => Ord (WrappedProfunctor p a b) 
Instance details

Defined in Data.Functor.Invariant

Methods

compare :: WrappedProfunctor p a b -> WrappedProfunctor p a b -> Ordering #

(<) :: WrappedProfunctor p a b -> WrappedProfunctor p a b -> Bool #

(<=) :: WrappedProfunctor p a b -> WrappedProfunctor p a b -> Bool #

(>) :: WrappedProfunctor p a b -> WrappedProfunctor p a b -> Bool #

(>=) :: WrappedProfunctor p a b -> WrappedProfunctor p a b -> Bool #

max :: WrappedProfunctor p a b -> WrappedProfunctor p a b -> WrappedProfunctor p a b #

min :: WrappedProfunctor p a b -> WrappedProfunctor p a b -> WrappedProfunctor p a b #

(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 (f a b), Ord (g a b)) => Ord (Product f g a b) 
Instance details

Defined in Data.Bifunctor.Product

Methods

compare :: Product f g a b -> Product f g a b -> Ordering #

(<) :: Product f g a b -> Product f g a b -> Bool #

(<=) :: Product f g a b -> Product f g a b -> Bool #

(>) :: Product f g a b -> Product f g a b -> Bool #

(>=) :: Product f g a b -> Product f g a b -> Bool #

max :: Product f g a b -> Product f g a b -> Product f g a b #

min :: Product f g a b -> Product f g a b -> Product f g a b #

(Ord (p a b), Ord (q a b)) => Ord (Sum p q a b) 
Instance details

Defined in Data.Bifunctor.Sum

Methods

compare :: Sum p q a b -> Sum p q a b -> Ordering #

(<) :: Sum p q a b -> Sum p q a b -> Bool #

(<=) :: Sum p q a b -> Sum p q a b -> Bool #

(>) :: Sum p q a b -> Sum p q a b -> Bool #

(>=) :: Sum p q a b -> Sum p q a b -> Bool #

max :: Sum p q a b -> Sum p q a b -> Sum p q a b #

min :: Sum p q a b -> Sum p q a b -> Sum p q a b #

(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 (f (p a b)) => Ord (Tannen f p a b) 
Instance details

Defined in Data.Bifunctor.Tannen

Methods

compare :: Tannen f p a b -> Tannen f p a b -> Ordering #

(<) :: Tannen f p a b -> Tannen f p a b -> Bool #

(<=) :: Tannen f p a b -> Tannen f p a b -> Bool #

(>) :: Tannen f p a b -> Tannen f p a b -> Bool #

(>=) :: Tannen f p a b -> Tannen f p a b -> Bool #

max :: Tannen f p a b -> Tannen f p a b -> Tannen f p a b #

min :: Tannen f p a b -> Tannen f p a b -> Tannen f p a b #

(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 (p (f a) (g b)) => Ord (Biff p f g a b) 
Instance details

Defined in Data.Bifunctor.Biff

Methods

compare :: Biff p f g a b -> Biff p f g a b -> Ordering #

(<) :: Biff p f g a b -> Biff p f g a b -> Bool #

(<=) :: Biff p f g a b -> Biff p f g a b -> Bool #

(>) :: Biff p f g a b -> Biff p f g a b -> Bool #

(>=) :: Biff p f g a b -> Biff p f g a b -> Bool #

max :: Biff p f g a b -> Biff p f g a b -> Biff p f g a b #

min :: Biff p f g a b -> Biff p f g a b -> Biff p f g a b #

(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) #

class Eq a => Hashable a where #

Minimal complete definition

Nothing

Methods

hashWithSalt :: Int -> a -> Int #

hash :: a -> Int #

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

Methods

hashWithSalt :: Int -> ThreadId -> Int #

hash :: ThreadId -> Int #

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

Methods

hashWithSalt :: Int -> ShortByteString -> Int #

hash :: ShortByteString -> Int #

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

Methods

hashWithSalt :: Int -> Ordering -> Int #

hash :: Ordering -> Int #

Hashable IP 
Instance details

Defined in Net.IP

Methods

hashWithSalt :: Int -> IP -> Int #

hash :: IP -> Int #

Hashable IPv4 
Instance details

Defined in Net.IPv4

Methods

hashWithSalt :: Int -> IPv4 -> Int #

hash :: IPv4 -> Int #

Hashable IPv4Range 
Instance details

Defined in Net.IPv4

Methods

hashWithSalt :: Int -> IPv4Range -> Int #

hash :: IPv4Range -> Int #

Hashable IPv6 
Instance details

Defined in Net.IPv6

Methods

hashWithSalt :: Int -> IPv6 -> Int #

hash :: IPv6 -> Int #

Hashable Mac 
Instance details

Defined in Net.Mac

Methods

hashWithSalt :: Int -> Mac -> Int #

hash :: Mac -> 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 Identifier 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

hashWithSalt :: Int -> Identifier -> Int #

hash :: Identifier -> Int #

Hashable QualifiedIdentifier 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

hashWithSalt :: Int -> QualifiedIdentifier -> Int #

hash :: QualifiedIdentifier -> Int #

Hashable Scientific 
Instance details

Defined in Data.Scientific

Methods

hashWithSalt :: Int -> Scientific -> Int #

hash :: Scientific -> 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 Unique 
Instance details

Defined in Data.Unique.Really

Methods

hashWithSalt :: Int -> Unique -> Int #

hash :: Unique -> Int #

Hashable Int128 
Instance details

Defined in Data.WideWord.Int128

Methods

hashWithSalt :: Int -> Int128 -> Int #

hash :: Int128 -> Int #

Hashable Word128 
Instance details

Defined in Data.WideWord.Word128

Methods

hashWithSalt :: Int -> Word128 -> Int #

hash :: Word128 -> Int #

Hashable Word256 
Instance details

Defined in Data.WideWord.Word256

Methods

hashWithSalt :: Int -> Word256 -> Int #

hash :: Word256 -> 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

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 (PrimaryKey table) => Hashable (Id' table) Source # 
Instance details

Defined in IHP.ModelSupport

Methods

hashWithSalt :: Int -> Id' table -> Int #

hash :: Id' table -> 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 age => Hashable (CacheResponse age) 
Instance details

Defined in Network.Wreq.Cache

Methods

hashWithSalt :: Int -> CacheResponse age -> Int #

hash :: CacheResponse age -> 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 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 #

lookup :: Eq a => a -> [(a, b)] -> Maybe b #

union :: Eq a => [a] -> [a] -> [a] #

break :: (a -> Bool) -> [a] -> ([a], [a]) #

drop :: Int -> [a] -> [a] #

dropWhile :: (a -> Bool) -> [a] -> [a] #

filter :: (a -> Bool) -> [a] -> [a] #

groupBy :: (a -> a -> Bool) -> [a] -> [[a]] #

inits :: [a] -> [[a]] #

partition :: (a -> Bool) -> [a] -> ([a], [a]) #

permutations :: [a] -> [[a]] #

replicate :: Int -> a -> [a] #

span :: (a -> Bool) -> [a] -> ([a], [a]) #

subsequences :: [a] -> [[a]] #

tails :: [a] -> [[a]] #

uncons :: [a] -> Maybe (a, [a]) #

unsnoc :: [a] -> Maybe ([a], a) #

reverse :: [a] -> [a] #

sortBy :: (a -> a -> Ordering) -> [a] -> [a] #

lift :: (MonadTrans t, Monad m) => m a -> t m a #

newtype Concurrently a #

Constructors

Concurrently 

Fields

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

(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 k, Hashable k) => At (HashSet k) 
Instance details

Defined in Control.Lens.At

Methods

at :: Index (HashSet k) -> Lens' (HashSet k) (Maybe (IxValue (HashSet k)))

(Eq a, Hashable a) => Contains (HashSet a) 
Instance details

Defined in Control.Lens.At

Methods

contains :: Index (HashSet a) -> Lens' (HashSet a) Bool

(Eq k, Hashable k) => Ixed (HashSet k) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (HashSet k) -> Traversal' (HashSet k) (IxValue (HashSet k))

AsEmpty (HashSet a) 
Instance details

Defined in Control.Lens.Empty

Methods

_Empty :: Prism' (HashSet a) ()

(Hashable a, Eq a) => Wrapped (HashSet a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (HashSet a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (HashSet a) = [a]

Methods

_Wrapped' :: Iso' (HashSet a) (Unwrapped (HashSet a))

(Eq element, Hashable element) => IsSet (HashSet element) 
Instance details

Defined in Data.Containers

Methods

insertSet :: Element (HashSet element) -> HashSet element -> HashSet element #

deleteSet :: Element (HashSet element) -> HashSet element -> HashSet element #

singletonSet :: Element (HashSet element) -> HashSet element #

setFromList :: [Element (HashSet element)] -> HashSet element #

setToList :: HashSet element -> [Element (HashSet element)] #

filterSet :: (Element (HashSet element) -> Bool) -> HashSet element -> HashSet element #

(Eq element, Hashable element) => SetContainer (HashSet element) 
Instance details

Defined in Data.Containers

Associated Types

type ContainerKey (HashSet element) 
Instance details

Defined in Data.Containers

type ContainerKey (HashSet element) = element

Methods

member :: ContainerKey (HashSet element) -> HashSet element -> Bool #

notMember :: ContainerKey (HashSet element) -> HashSet element -> Bool #

union :: HashSet element -> HashSet element -> HashSet element #

unions :: (MonoFoldable mono, Element mono ~ HashSet element) => mono -> HashSet element #

difference :: HashSet element -> HashSet element -> HashSet element #

intersection :: HashSet element -> HashSet element -> HashSet element #

keys :: HashSet element -> [ContainerKey (HashSet element)] #

(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 #

Hashable a => One (HashSet a) 
Instance details

Defined in Relude.Container.One

Associated Types

type OneItem (HashSet a) 
Instance details

Defined in Relude.Container.One

type OneItem (HashSet a) = a

Methods

one :: OneItem (HashSet a) -> HashSet a

Hashable a => StaticMap (HashSet a) 
Instance details

Defined in Relude.Extra.Map

Associated Types

type Key (HashSet a) 
Instance details

Defined in Relude.Extra.Map

type Key (HashSet a) = a
type Val (HashSet a) 
Instance details

Defined in Relude.Extra.Map

type Val (HashSet a) = a

Methods

size :: HashSet a -> Int

lookup :: Key (HashSet a) -> HashSet a -> Maybe (Val (HashSet a))

member :: Key (HashSet a) -> HashSet a -> Bool

(t ~ HashSet a', Hashable a, Eq a) => Rewrapped (HashSet a) t 
Instance details

Defined in Control.Lens.Wrapped

type Item (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

type Item (HashSet a) = a
type Index (HashSet a) 
Instance details

Defined in Control.Lens.At

type Index (HashSet a) = a
type IxValue (HashSet k) 
Instance details

Defined in Control.Lens.At

type IxValue (HashSet k) = ()
type Unwrapped (HashSet a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (HashSet a) = [a]
type ContainerKey (HashSet element) 
Instance details

Defined in Data.Containers

type ContainerKey (HashSet element) = element
type Element (HashSet e) 
Instance details

Defined in Data.MonoTraversable

type Element (HashSet e) = e
type OneItem (HashSet a) 
Instance details

Defined in Relude.Container.One

type OneItem (HashSet a) = a
type Key (HashSet a) 
Instance details

Defined in Relude.Extra.Map

type Key (HashSet a) = a
type Val (HashSet a) 
Instance details

Defined in Relude.Extra.Map

type Val (HashSet a) = a

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 IPv4 
Instance details

Defined in Net.IPv4

Unbox IPv4Range 
Instance details

Defined in Net.IPv4

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 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

insert :: Ord a => a -> [a] -> [a] #

class ParseTime t #

Minimal complete definition

parseTimeSpecifier, buildTime

parseTimeMultipleM :: (MonadFail m, ParseTime t) => Bool -> TimeLocale -> [(String, String)] -> m t #

data Double #

Instances

Instances details
Structured Double 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy Double -> Structure

structureHash' :: Tagged Double MD5

Arbitrary Double 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen Double

shrink :: Double -> [Double]

CoArbitrary Double 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Double -> Gen b -> Gen b

Function Double 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Double -> b) -> Double :-> b

FromJSON Double 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Double #

parseJSONList :: Value -> Parser [Double] #

omittedField :: Maybe Double #

FromJSONKey Double 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Double 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Double 
Instance details

Defined in Data.Aeson.Types.ToJSON

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

Fractional Double 
Instance details

Defined in Basement.Compat.NumLiteral

HasNegation Double 
Instance details

Defined in Basement.Compat.NumLiteral

Methods

negate :: Double -> Double

Integral Double 
Instance details

Defined in Basement.Compat.NumLiteral

NormalForm Double 
Instance details

Defined in Basement.NormalForm

Methods

toNormalForm :: Double -> ()

Additive Double 
Instance details

Defined in Basement.Numerical.Additive

Methods

azero :: Double

(+) :: Double -> Double -> Double

scale :: IsNatural n => n -> Double -> Double

Divisible Double 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

(/) :: Double -> Double -> Double

Multiplicative Double 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

midentity :: Double

(*) :: Double -> Double -> Double

(^) :: (IsNatural n, Enum n, IDivisible n) => Double -> n -> Double

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 ()

ToMarkup Double 
Instance details

Defined in Text.Blaze

Methods

toMarkup :: Double -> Markup

preEscapedToMarkup :: Double -> Markup

ToValue Double 
Instance details

Defined in Text.Blaze

Methods

toValue :: Double -> AttributeValue

preEscapedToValue :: Double -> AttributeValue

ToBuilder Double 
Instance details

Defined in Data.Bytes.Builder.Class

Methods

toBuilder :: Double -> Builder

Serialize Double 
Instance details

Defined in Data.Serialize

Methods

put :: Putter Double

get :: Get Double

Default Double 
Instance details

Defined in Data.Default.Class

Methods

def :: Double #

NFData Double 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Double -> () #

ToLogStr Double 
Instance details

Defined in System.Log.FastLogger.LogStr

Methods

toLogStr :: Double -> LogStr #

ToJExpr Double 
Instance details

Defined in GHC.JS.Make

Methods

toJExpr :: Double -> JExpr

toJExprFromList :: [Double] -> JExpr

Outputable Double 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Double -> SDoc

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 #

ToLit Double 
Instance details

Defined in Language.Haskell.Meta.Syntax.Translate

Methods

toLit :: Double -> Lit

ParamReader Double Source # 
Instance details

Defined in IHP.Controller.Param

InputValue Double Source # 
Instance details

Defined in IHP.ModelSupport

FromField Double 
Instance details

Defined in Database.PostgreSQL.Simple.FromField

Methods

fromField :: FieldParser Double

ToField Double 
Instance details

Defined in Database.PostgreSQL.Simple.ToField

Methods

toField :: Double -> Action

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

Prim Double 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: Double -> Int#

alignment# :: Double -> Int#

indexByteArray# :: ByteArray# -> Int# -> Double

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, Double #)

writeByteArray# :: MutableByteArray# s -> Int# -> Double -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> Double -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> Double

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, Double #)

writeOffAddr# :: Addr# -> Int# -> Double -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> Double -> State# s -> State# s

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

Unbox Double 
Instance details

Defined in Data.Vector.Unboxed.Base

IArray UArray Double 
Instance details

Defined in Data.Array.Base

Methods

bounds :: Ix i => UArray i Double -> (i, i)

numElements :: Ix i => UArray i Double -> Int

unsafeArray :: Ix i => (i, i) -> [(Int, Double)] -> UArray i Double

unsafeAt :: Ix i => UArray i Double -> Int -> Double

unsafeReplace :: Ix i => UArray i Double -> [(Int, Double)] -> UArray i Double

unsafeAccum :: Ix i => (Double -> e' -> Double) -> UArray i Double -> [(Int, e')] -> UArray i Double

unsafeAccumArray :: Ix i => (Double -> e' -> Double) -> Double -> (i, i) -> [(Int, e')] -> UArray i Double

Lift Double 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Double -> m Exp

liftTyped :: forall (m :: Type -> Type). Quote m => Double -> Code m Double

Vector Vector Double 
Instance details

Defined in Data.Vector.Unboxed.Base

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 ()

GEq1 v (UDouble :: Type -> Type) 
Instance details

Defined in Data.Functor.Classes.Generic.Internal

Methods

gliftEq :: Eq1Args v a b -> UDouble a -> UDouble b -> Bool

GOrd1 v (UDouble :: Type -> Type) 
Instance details

Defined in Data.Functor.Classes.Generic.Internal

Methods

gliftCompare :: Ord1Args v a b -> UDouble a -> UDouble b -> Ordering

GShow1Con v (UDouble :: Type -> Type) 
Instance details

Defined in Data.Functor.Classes.Generic.Internal

Methods

gliftShowsPrecCon :: Options -> ConType -> Show1Args v a -> Int -> UDouble a -> ShowS

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) #

Invariant (UDouble :: Type -> Type) 
Instance details

Defined in Data.Functor.Invariant

Methods

invmap :: (a -> b) -> (b -> a) -> UDouble a -> UDouble b

ToField (PGRange Double) 
Instance details

Defined in Database.PostgreSQL.Simple.Range

Methods

toField :: PGRange Double -> Action

IsNullaryCon (UDouble :: Type -> Type) 
Instance details

Defined in Data.Functor.Classes.Generic.Internal

Methods

isNullaryCon :: UDouble a -> Bool

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 Data.Functor.Classes.Generic.Internal

Methods

geq :: UDouble p -> UDouble p -> Bool

GOrd (UDouble p) 
Instance details

Defined in Data.Functor.Classes.Generic.Internal

Methods

gcompare :: UDouble p -> UDouble p -> Ordering

GShowCon (UDouble p) 
Instance details

Defined in Data.Functor.Classes.Generic.Internal

Methods

gshowsPrecCon :: Options -> ConType -> Int -> 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 Word #

Instances

Instances details
Structured Word 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy Word -> Structure

structureHash' :: Tagged Word MD5

Arbitrary Word 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen Word

shrink :: Word -> [Word]

CoArbitrary Word 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Word -> Gen b -> Gen b

Function Word 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Word -> b) -> Word :-> b

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

ToJSON Word 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Word 
Instance details

Defined in Data.Aeson.Types.ToJSON

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

Methods

succ :: Word -> Word #

pred :: Word -> Word #

toEnum :: Int -> Word #

fromEnum :: Word -> Int #

enumFrom :: Word -> [Word] #

enumFromThen :: Word -> Word -> [Word] #

enumFromTo :: Word -> Word -> [Word] #

enumFromThenTo :: Word -> Word -> Word -> [Word] #

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

HasNegation Word 
Instance details

Defined in Basement.Compat.NumLiteral

Methods

negate :: Word -> Word

Integral Word 
Instance details

Defined in Basement.Compat.NumLiteral

Methods

fromInteger :: Integer -> Word

NormalForm Word 
Instance details

Defined in Basement.NormalForm

Methods

toNormalForm :: Word -> ()

Additive Word 
Instance details

Defined in Basement.Numerical.Additive

Methods

azero :: Word

(+) :: Word -> Word -> Word

scale :: IsNatural n => n -> Word -> Word

IDivisible Word 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

div :: Word -> Word -> Word

mod :: Word -> Word -> Word

divMod :: Word -> Word -> (Word, Word)

Multiplicative Word 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

midentity :: Word

(*) :: Word -> Word -> Word

(^) :: (IsNatural n, Enum n, IDivisible n) => Word -> n -> Word

IsIntegral Word 
Instance details

Defined in Basement.Numerical.Number

Methods

toInteger :: Word -> Integer

IsNatural Word 
Instance details

Defined in Basement.Numerical.Number

Methods

toNatural :: Word -> Natural

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 ()

ToMarkup Word 
Instance details

Defined in Text.Blaze

Methods

toMarkup :: Word -> Markup

preEscapedToMarkup :: Word -> Markup

ToValue Word 
Instance details

Defined in Text.Blaze

Methods

toValue :: Word -> AttributeValue

preEscapedToValue :: Word -> AttributeValue

ToBoundedBuilder Word 
Instance details

Defined in Data.Bytes.Builder.Bounded.Class

Associated Types

type BoundedBuilderLength Word 
Instance details

Defined in Data.Bytes.Builder.Bounded.Class

type BoundedBuilderLength Word = 19

Methods

toBuilder :: Word -> Builder (BoundedBuilderLength Word)

ToBuilder Word 
Instance details

Defined in Data.Bytes.Builder.Class

Methods

toBuilder :: Word -> Builder

Serialize Word 
Instance details

Defined in Data.Serialize

Methods

put :: Putter Word

get :: Get Word

Default Word 
Instance details

Defined in Data.Default.Class

Methods

def :: Word #

NFData Word 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word -> () #

ToLogStr Word 
Instance details

Defined in System.Log.FastLogger.LogStr

Methods

toLogStr :: Word -> LogStr #

Outputable Word 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Word -> SDoc

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 #

ToField Word 
Instance details

Defined in Database.PostgreSQL.Simple.ToField

Methods

toField :: Word -> Action

Pretty Word 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Word -> Doc ann

prettyList :: [Word] -> Doc ann

Prim Word 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: Word -> Int#

alignment# :: Word -> Int#

indexByteArray# :: ByteArray# -> Int# -> Word

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, Word #)

writeByteArray# :: MutableByteArray# s -> Int# -> Word -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> Word -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> Word

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, Word #)

writeOffAddr# :: Addr# -> Int# -> Word -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> Word -> State# s -> State# s

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

Unbox Word 
Instance details

Defined in Data.Vector.Unboxed.Base

Lexicographic Word 
Instance details

Defined in Data.Vector.Algorithms.AmericanFlag

Methods

extent :: Word -> Int

size :: Proxy Word -> Int

index :: Int -> Word -> Int

Radix Word 
Instance details

Defined in Data.Vector.Algorithms.Radix

Methods

passes :: Word -> Int

size :: Word -> Int

radix :: Int -> Word -> Int

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

Cast Int64 Word 
Instance details

Defined in Basement.Cast

Methods

cast :: Int64 -> Word

Cast Word64 Word 
Instance details

Defined in Basement.Cast

Methods

cast :: Word64 -> Word

Cast Int Word 
Instance details

Defined in Basement.Cast

Methods

cast :: Int -> Word

Cast Word Int64 
Instance details

Defined in Basement.Cast

Methods

cast :: Word -> Int64

Cast Word Word64 
Instance details

Defined in Basement.Cast

Methods

cast :: Word -> Word64

Cast Word Int 
Instance details

Defined in Basement.Cast

Methods

cast :: Word -> Int

From Word16 Word 
Instance details

Defined in Basement.From

Methods

from :: Word16 -> Word

From Word32 Word 
Instance details

Defined in Basement.From

Methods

from :: Word32 -> Word

From Word8 Word 
Instance details

Defined in Basement.From

Methods

from :: Word8 -> Word

From Word Word64 
Instance details

Defined in Basement.From

Methods

from :: Word -> Word64

IntegralDownsize Word Word16 
Instance details

Defined in Basement.IntegralConv

Methods

integralDownsize :: Word -> Word16

integralDownsizeCheck :: Word -> Maybe Word16

IntegralDownsize Word Word32 
Instance details

Defined in Basement.IntegralConv

IntegralDownsize Word Word8 
Instance details

Defined in Basement.IntegralConv

IntegralUpsize Word16 Word 
Instance details

Defined in Basement.IntegralConv

Methods

integralUpsize :: Word16 -> Word

IntegralUpsize Word32 Word 
Instance details

Defined in Basement.IntegralConv

IntegralUpsize Word8 Word 
Instance details

Defined in Basement.IntegralConv

IntegralUpsize Word Word64 
Instance details

Defined in Basement.IntegralConv

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 ()

From Word (CountOf ty) 
Instance details

Defined in Basement.From

Methods

from :: Word -> CountOf ty

From Word (Offset ty) 
Instance details

Defined in Basement.From

Methods

from :: Word -> Offset ty

GEq1 v (UWord :: Type -> Type) 
Instance details

Defined in Data.Functor.Classes.Generic.Internal

Methods

gliftEq :: Eq1Args v a b -> UWord a -> UWord b -> Bool

GOrd1 v (UWord :: Type -> Type) 
Instance details

Defined in Data.Functor.Classes.Generic.Internal

Methods

gliftCompare :: Ord1Args v a b -> UWord a -> UWord b -> Ordering

GShow1Con v (UWord :: Type -> Type) 
Instance details

Defined in Data.Functor.Classes.Generic.Internal

Methods

gliftShowsPrecCon :: Options -> ConType -> Show1Args v a -> Int -> UWord a -> ShowS

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) #

Invariant (UWord :: Type -> Type) 
Instance details

Defined in Data.Functor.Invariant

Methods

invmap :: (a -> b) -> (b -> a) -> UWord a -> UWord b

ToField (PGRange Word) 
Instance details

Defined in Database.PostgreSQL.Simple.Range

Methods

toField :: PGRange Word -> Action

IsNullaryCon (UWord :: Type -> Type) 
Instance details

Defined in Data.Functor.Classes.Generic.Internal

Methods

isNullaryCon :: UWord a -> Bool

From (CountOf ty) Word 
Instance details

Defined in Basement.From

Methods

from :: CountOf ty -> Word

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 Data.Functor.Classes.Generic.Internal

Methods

geq :: UWord p -> UWord p -> Bool

GOrd (UWord p) 
Instance details

Defined in Data.Functor.Classes.Generic.Internal

Methods

gcompare :: UWord p -> UWord p -> Ordering

GShowCon (UWord p) 
Instance details

Defined in Data.Functor.Classes.Generic.Internal

Methods

gshowsPrecCon :: Options -> ConType -> Int -> 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
type BoundedBuilderLength Word 
Instance details

Defined in Data.Bytes.Builder.Bounded.Class

type BoundedBuilderLength Word = 19
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

Arbitrary Ordering 
Instance details

Defined in Test.QuickCheck.Arbitrary

CoArbitrary Ordering 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Ordering -> Gen b -> Gen b

Function Ordering 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Ordering -> b) -> Ordering :-> b

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

Methods

(<>) :: Ordering -> Ordering -> Ordering #

sconcat :: NonEmpty Ordering -> Ordering #

stimes :: Integral b => b -> Ordering -> Ordering #

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 #

Serialize Ordering 
Instance details

Defined in Data.Serialize

Methods

put :: Putter Ordering

get :: Get Ordering

Default Ordering 
Instance details

Defined in Data.Default.Class

Methods

def :: Ordering #

NFData Ordering 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Ordering -> () #

Outputable Ordering 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Ordering -> SDoc

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

Methods

hashWithSalt :: Int -> Ordering -> Int #

hash :: Ordering -> Int #

AsEmpty Ordering 
Instance details

Defined in Control.Lens.Empty

Methods

_Empty :: Prism' Ordering ()

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 DataRep #

Instances

Instances details
Show DataRep 
Instance details

Defined in Data.Data

Methods

showsPrec :: Int -> DataRep -> ShowS #

show :: DataRep -> String

showList :: [DataRep] -> ShowS #

Eq DataRep 
Instance details

Defined in Data.Data

Methods

(==) :: DataRep -> DataRep -> Bool #

(/=) :: DataRep -> DataRep -> Bool #

realToFrac :: (Real a, Fractional b) => a -> b #

fromIntegral :: (Integral a, Num b) => a -> b #

class (Num a, Ord a) => Real a where #

Methods

toRational :: a -> Rational #

Instances

Instances details
Real Number 
Instance details

Defined in Data.Attoparsec.Number

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

Methods

toRational :: Word16 -> Rational #

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.Types.PubKey.DH

Methods

toRational :: PrivateNumber -> Rational #

Real PublicNumber 
Instance details

Defined in Crypto.Types.PubKey.DH

Methods

toRational :: PublicNumber -> Rational #

Real SharedKey 
Instance details

Defined in Crypto.Types.PubKey.DH

Methods

toRational :: SharedKey -> 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 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 ElapsedP 
Instance details

Defined in Time.Types

Methods

toRational :: ElapsedP -> Rational #

Real Hours 
Instance details

Defined in Time.Types

Methods

toRational :: Hours -> Rational #

Real Minutes 
Instance details

Defined in Time.Types

Methods

toRational :: Minutes -> Rational #

Real Seconds 
Instance details

Defined in Time.Types

Methods

toRational :: Seconds -> 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

Real NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Real Attosecond 
Instance details

Defined in Data.Time.Units

Methods

toRational :: Attosecond -> Rational #

Real Day 
Instance details

Defined in Data.Time.Units

Methods

toRational :: Day -> Rational #

Real Femtosecond 
Instance details

Defined in Data.Time.Units

Methods

toRational :: Femtosecond -> Rational #

Real Fortnight 
Instance details

Defined in Data.Time.Units

Methods

toRational :: Fortnight -> Rational #

Real Hour 
Instance details

Defined in Data.Time.Units

Methods

toRational :: Hour -> Rational #

Real Microsecond 
Instance details

Defined in Data.Time.Units

Methods

toRational :: Microsecond -> Rational #

Real Millisecond 
Instance details

Defined in Data.Time.Units

Methods

toRational :: Millisecond -> Rational #

Real Minute 
Instance details

Defined in Data.Time.Units

Methods

toRational :: Minute -> Rational #

Real Nanosecond 
Instance details

Defined in Data.Time.Units

Methods

toRational :: Nanosecond -> Rational #

Real Picosecond 
Instance details

Defined in Data.Time.Units

Methods

toRational :: Picosecond -> Rational #

Real Second 
Instance details

Defined in Data.Time.Units

Methods

toRational :: Second -> Rational #

Real Week 
Instance details

Defined in Data.Time.Units

Methods

toRational :: Week -> Rational #

Real Int128 
Instance details

Defined in Data.WideWord.Int128

Methods

toRational :: Int128 -> Rational #

Real Word128 
Instance details

Defined in Data.WideWord.Word128

Methods

toRational :: Word128 -> Rational #

Real Word256 
Instance details

Defined in Data.WideWord.Word256

Methods

toRational :: Word256 -> Rational #

Real Integer 
Instance details

Defined in GHC.Real

Real Natural 
Instance details

Defined in GHC.Real

Methods

toRational :: Natural -> Rational #

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 (Blind a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

toRational :: Blind a -> Rational #

Real a => Real (Fixed a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

toRational :: Fixed a -> Rational #

Real a => Real (Large a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

toRational :: Large a -> Rational #

Real a => Real (Shrink2 a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

toRational :: Shrink2 a -> Rational #

Real a => Real (Small a) 
Instance details

Defined in Test.QuickCheck.Modifiers

Methods

toRational :: Small a -> 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 #

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 #

type Rational = Ratio Integer #

data TyCon #

Instances

Instances details
Show TyCon 
Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> TyCon -> ShowS #

show :: TyCon -> String

showList :: [TyCon] -> ShowS #

NFData TyCon 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: TyCon -> () #

Eq TyCon 
Instance details

Defined in GHC.Classes

Methods

(==) :: TyCon -> TyCon -> Bool #

(/=) :: TyCon -> TyCon -> Bool #

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 #

data Lexeme #

Constructors

Lexeme 

Fields

Instances

Instances details
Show Lexeme 
Instance details

Defined in IHP.Postgres.TSVector

Methods

showsPrec :: Int -> Lexeme -> ShowS #

show :: Lexeme -> String

showList :: [Lexeme] -> ShowS #

Eq Lexeme 
Instance details

Defined in IHP.Postgres.TSVector

Methods

(==) :: Lexeme -> Lexeme -> Bool #

(/=) :: Lexeme -> Lexeme -> Bool #

Ord Lexeme 
Instance details

Defined in IHP.Postgres.TSVector

data CalendarDiffDays #

Constructors

CalendarDiffDays 

Instances

Instances details
FromJSON CalendarDiffDays 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON CalendarDiffDays 
Instance details

Defined in Data.Aeson.Types.ToJSON

Data CalendarDiffDays 
Instance details

Defined in Data.Time.Calendar.CalendarDiffDays

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CalendarDiffDays -> c CalendarDiffDays #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CalendarDiffDays #

toConstr :: CalendarDiffDays -> Constr #

dataTypeOf :: CalendarDiffDays -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CalendarDiffDays) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CalendarDiffDays) #

gmapT :: (forall b. Data b => b -> b) -> CalendarDiffDays -> CalendarDiffDays #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CalendarDiffDays -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CalendarDiffDays -> r #

gmapQ :: (forall d. Data d => d -> u) -> CalendarDiffDays -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CalendarDiffDays -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CalendarDiffDays -> m CalendarDiffDays #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CalendarDiffDays -> m CalendarDiffDays #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CalendarDiffDays -> m CalendarDiffDays #

Monoid CalendarDiffDays 
Instance details

Defined in Data.Time.Calendar.CalendarDiffDays

Semigroup CalendarDiffDays 
Instance details

Defined in Data.Time.Calendar.CalendarDiffDays

Show CalendarDiffDays 
Instance details

Defined in Data.Time.Calendar.CalendarDiffDays

NFData CalendarDiffDays 
Instance details

Defined in Data.Time.Calendar.CalendarDiffDays

Methods

rnf :: CalendarDiffDays -> () #

Eq CalendarDiffDays 
Instance details

Defined in Data.Time.Calendar.CalendarDiffDays

ISO8601 CalendarDiffDays 
Instance details

Defined in Data.Time.Format.ISO8601

class Ord p => DayPeriod p where #

Methods

periodFirstDay :: p -> Day #

periodLastDay :: p -> Day #

dayPeriod :: Day -> p #

Instances

Instances details
DayPeriod Day 
Instance details

Defined in Data.Time.Calendar.Days

DayPeriod Month 
Instance details

Defined in Data.Time.Calendar.Month

Methods

periodFirstDay :: Month -> Day #

periodLastDay :: Month -> Day #

dayPeriod :: Day -> Month #

DayPeriod Quarter 
Instance details

Defined in Data.Time.Calendar.Quarter

Methods

periodFirstDay :: Quarter -> Day #

periodLastDay :: Quarter -> Day #

dayPeriod :: Day -> Quarter #

periodAllDays :: DayPeriod p => p -> [Day] #

periodFromDay :: DayPeriod p => Day -> (p, Int) #

periodToDay :: DayPeriod p => p -> Int -> Day #

pattern April :: MonthOfYear #

pattern August :: MonthOfYear #

pattern CommonEra :: Integer -> Year #

pattern January :: MonthOfYear #

pattern July :: MonthOfYear #

pattern June :: MonthOfYear #

pattern March :: MonthOfYear #

pattern May :: MonthOfYear #

pattern October :: MonthOfYear #

type Year = Integer #

data DayOfWeek #

Instances

Instances details
FromJSON DayOfWeek 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey DayOfWeek 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON DayOfWeek 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey DayOfWeek 
Instance details

Defined in Data.Aeson.Types.ToJSON

Data DayOfWeek 
Instance details

Defined in Data.Time.Calendar.Week

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DayOfWeek -> c DayOfWeek #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DayOfWeek #

toConstr :: DayOfWeek -> Constr #

dataTypeOf :: DayOfWeek -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DayOfWeek) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DayOfWeek) #

gmapT :: (forall b. Data b => b -> b) -> DayOfWeek -> DayOfWeek #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DayOfWeek -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DayOfWeek -> r #

gmapQ :: (forall d. Data d => d -> u) -> DayOfWeek -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DayOfWeek -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DayOfWeek -> m DayOfWeek #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DayOfWeek -> m DayOfWeek #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DayOfWeek -> m DayOfWeek #

Enum DayOfWeek 
Instance details

Defined in Data.Time.Calendar.Week

Ix DayOfWeek 
Instance details

Defined in Data.Time.Calendar.Week

Read DayOfWeek 
Instance details

Defined in Data.Time.Calendar.Week

Methods

readsPrec :: Int -> ReadS DayOfWeek

readList :: ReadS [DayOfWeek]

readPrec :: ReadPrec DayOfWeek

readListPrec :: ReadPrec [DayOfWeek]

Show DayOfWeek 
Instance details

Defined in Data.Time.Calendar.Week

Methods

showsPrec :: Int -> DayOfWeek -> ShowS #

show :: DayOfWeek -> String

showList :: [DayOfWeek] -> ShowS #

NFData DayOfWeek 
Instance details

Defined in Data.Time.Calendar.Week

Methods

rnf :: DayOfWeek -> () #

Eq DayOfWeek 
Instance details

Defined in Data.Time.Calendar.Week

Ord DayOfWeek 
Instance details

Defined in Data.Time.Calendar.Week

data DiffTime #

Instances

Instances details
Structured DiffTime 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy DiffTime -> Structure

structureHash' :: Tagged DiffTime MD5

FromJSON DiffTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON DiffTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

Data DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DiffTime -> c DiffTime #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DiffTime #

toConstr :: DiffTime -> Constr #

dataTypeOf :: DiffTime -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DiffTime) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DiffTime) #

gmapT :: (forall b. Data b => b -> b) -> DiffTime -> DiffTime #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DiffTime -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DiffTime -> r #

gmapQ :: (forall d. Data d => d -> u) -> DiffTime -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DiffTime -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DiffTime -> m DiffTime #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DiffTime -> m DiffTime #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DiffTime -> m DiffTime #

Enum DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Num DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Read DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Methods

readsPrec :: Int -> ReadS DiffTime

readList :: ReadS [DiffTime]

readPrec :: ReadPrec DiffTime

readListPrec :: ReadPrec [DiffTime]

Fractional DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Real DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

RealFrac DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Methods

properFraction :: Integral b => DiffTime -> (b, DiffTime) #

truncate :: Integral b => DiffTime -> b #

round :: Integral b => DiffTime -> b #

ceiling :: Integral b => DiffTime -> b #

floor :: Integral b => DiffTime -> b #

Show DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Methods

showsPrec :: Int -> DiffTime -> ShowS #

show :: DiffTime -> String

showList :: [DiffTime] -> ShowS #

NFData DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Methods

rnf :: DiffTime -> () #

Eq DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Ord DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

data NominalDiffTime #

Instances

Instances details
Structured NominalDiffTime 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy NominalDiffTime -> Structure

structureHash' :: Tagged NominalDiffTime MD5

FromJSON NominalDiffTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON NominalDiffTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

Data NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NominalDiffTime -> c NominalDiffTime #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NominalDiffTime #

toConstr :: NominalDiffTime -> Constr #

dataTypeOf :: NominalDiffTime -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NominalDiffTime) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NominalDiffTime) #

gmapT :: (forall b. Data b => b -> b) -> NominalDiffTime -> NominalDiffTime #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NominalDiffTime -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NominalDiffTime -> r #

gmapQ :: (forall d. Data d => d -> u) -> NominalDiffTime -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> NominalDiffTime -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NominalDiffTime -> m NominalDiffTime #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NominalDiffTime -> m NominalDiffTime #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NominalDiffTime -> m NominalDiffTime #

Enum NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Num NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Read NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Fractional NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Real NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

RealFrac NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Show NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Default NominalDiffTime Source # 
Instance details

Defined in IHP.ModelSupport

NFData NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Methods

rnf :: NominalDiffTime -> () #

Eq NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Ord NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

ToField NominalDiffTime 
Instance details

Defined in Database.PostgreSQL.Simple.ToField

Methods

toField :: NominalDiffTime -> Action

ToField (PGRange NominalDiffTime) 
Instance details

Defined in Database.PostgreSQL.Simple.Range

Methods

toField :: PGRange NominalDiffTime -> Action

newtype UniversalTime #

Constructors

ModJulianDate 

Instances

Instances details
Structured UniversalTime 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy UniversalTime -> Structure

structureHash' :: Tagged UniversalTime MD5

Data UniversalTime 
Instance details

Defined in Data.Time.Clock.Internal.UniversalTime

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UniversalTime -> c UniversalTime #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UniversalTime #

toConstr :: UniversalTime -> Constr #

dataTypeOf :: UniversalTime -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UniversalTime) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UniversalTime) #

gmapT :: (forall b. Data b => b -> b) -> UniversalTime -> UniversalTime #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UniversalTime -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UniversalTime -> r #

gmapQ :: (forall d. Data d => d -> u) -> UniversalTime -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UniversalTime -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UniversalTime -> m UniversalTime #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UniversalTime -> m UniversalTime #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UniversalTime -> m UniversalTime #

NFData UniversalTime 
Instance details

Defined in Data.Time.Clock.Internal.UniversalTime

Methods

rnf :: UniversalTime -> () #

Eq UniversalTime 
Instance details

Defined in Data.Time.Clock.Internal.UniversalTime

Ord UniversalTime 
Instance details

Defined in Data.Time.Clock.Internal.UniversalTime

class FormatTime t #

Minimal complete definition

formatCharacter

Instances

Instances details
FormatTime DotNetTime 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

formatCharacter :: Bool -> Char -> Maybe (FormatOptions -> DotNetTime -> String)

readPTime :: ParseTime t => Bool -> TimeLocale -> String -> ReadP t #

readSTime :: ParseTime t => Bool -> TimeLocale -> String -> ReadS t #

data CalendarDiffTime #

Instances

Instances details
FromJSON CalendarDiffTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON CalendarDiffTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

Data CalendarDiffTime 
Instance details

Defined in Data.Time.LocalTime.Internal.CalendarDiffTime

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CalendarDiffTime -> c CalendarDiffTime #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CalendarDiffTime #

toConstr :: CalendarDiffTime -> Constr #

dataTypeOf :: CalendarDiffTime -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CalendarDiffTime) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CalendarDiffTime) #

gmapT :: (forall b. Data b => b -> b) -> CalendarDiffTime -> CalendarDiffTime #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CalendarDiffTime -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CalendarDiffTime -> r #

gmapQ :: (forall d. Data d => d -> u) -> CalendarDiffTime -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CalendarDiffTime -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CalendarDiffTime -> m CalendarDiffTime #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CalendarDiffTime -> m CalendarDiffTime #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CalendarDiffTime -> m CalendarDiffTime #

Monoid CalendarDiffTime 
Instance details

Defined in Data.Time.LocalTime.Internal.CalendarDiffTime

Semigroup CalendarDiffTime 
Instance details

Defined in Data.Time.LocalTime.Internal.CalendarDiffTime

Show CalendarDiffTime 
Instance details

Defined in Data.Time.LocalTime.Internal.CalendarDiffTime

NFData CalendarDiffTime 
Instance details

Defined in Data.Time.LocalTime.Internal.CalendarDiffTime

Methods

rnf :: CalendarDiffTime -> () #

Eq CalendarDiffTime 
Instance details

Defined in Data.Time.LocalTime.Internal.CalendarDiffTime

FromField CalendarDiffTime 
Instance details

Defined in Database.PostgreSQL.Simple.FromField

Methods

fromField :: FieldParser CalendarDiffTime

ToField CalendarDiffTime 
Instance details

Defined in Database.PostgreSQL.Simple.ToField

Methods

toField :: CalendarDiffTime -> Action

ISO8601 CalendarDiffTime 
Instance details

Defined in Data.Time.Format.ISO8601

data TimeOfDay #

Constructors

TimeOfDay 

Fields

Instances

Instances details
Structured TimeOfDay 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy TimeOfDay -> Structure

structureHash' :: Tagged TimeOfDay MD5

FromJSON TimeOfDay 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey TimeOfDay 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON TimeOfDay 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey TimeOfDay 
Instance details

Defined in Data.Aeson.Types.ToJSON

Data TimeOfDay 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeOfDay

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TimeOfDay -> c TimeOfDay #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TimeOfDay #

toConstr :: TimeOfDay -> Constr #

dataTypeOf :: TimeOfDay -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TimeOfDay) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TimeOfDay) #

gmapT :: (forall b. Data b => b -> b) -> TimeOfDay -> TimeOfDay #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TimeOfDay -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TimeOfDay -> r #

gmapQ :: (forall d. Data d => d -> u) -> TimeOfDay -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TimeOfDay -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TimeOfDay -> m TimeOfDay #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TimeOfDay -> m TimeOfDay #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TimeOfDay -> m TimeOfDay #

Show TimeOfDay 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeOfDay

Methods

showsPrec :: Int -> TimeOfDay -> ShowS #

show :: TimeOfDay -> String

showList :: [TimeOfDay] -> ShowS #

Default TimeOfDay Source # 
Instance details

Defined in IHP.ModelSupport

Methods

def :: TimeOfDay #

NFData TimeOfDay 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeOfDay

Methods

rnf :: TimeOfDay -> () #

Eq TimeOfDay 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeOfDay

Ord TimeOfDay 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeOfDay

ParamReader TimeOfDay Source # 
Instance details

Defined in IHP.Controller.Param

InputValue TimeOfDay Source # 
Instance details

Defined in IHP.ModelSupport

FromField TimeOfDay 
Instance details

Defined in Database.PostgreSQL.Simple.FromField

Methods

fromField :: FieldParser TimeOfDay

ToField TimeOfDay 
Instance details

Defined in Database.PostgreSQL.Simple.ToField

Methods

toField :: TimeOfDay -> Action

ISO8601 TimeOfDay 
Instance details

Defined in Data.Time.Format.ISO8601

Methods

iso8601Format :: Format TimeOfDay

ToField (PGRange TimeOfDay) 
Instance details

Defined in Database.PostgreSQL.Simple.Range

Methods

toField :: PGRange TimeOfDay -> Action

data TimeZone #

Instances

Instances details
Structured TimeZone 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy TimeZone -> Structure

structureHash' :: Tagged TimeZone MD5

Data TimeZone 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeZone

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TimeZone -> c TimeZone #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TimeZone #

toConstr :: TimeZone -> Constr #

dataTypeOf :: TimeZone -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TimeZone) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TimeZone) #

gmapT :: (forall b. Data b => b -> b) -> TimeZone -> TimeZone #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TimeZone -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TimeZone -> r #

gmapQ :: (forall d. Data d => d -> u) -> TimeZone -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TimeZone -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TimeZone -> m TimeZone #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TimeZone -> m TimeZone #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TimeZone -> m TimeZone #

Show TimeZone 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeZone

Methods

showsPrec :: Int -> TimeZone -> ShowS #

show :: TimeZone -> String

showList :: [TimeZone] -> ShowS #

NFData TimeZone 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeZone

Methods

rnf :: TimeZone -> () #

Eq TimeZone 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeZone

Ord TimeZone 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeZone

ISO8601 TimeZone 
Instance details

Defined in Data.Time.Format.ISO8601

Methods

iso8601Format :: Format TimeZone

data ZonedTime #

Instances

Instances details
FromJSON ZonedTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey ZonedTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON ZonedTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey ZonedTime 
Instance details

Defined in Data.Aeson.Types.ToJSON

Data ZonedTime 
Instance details

Defined in Data.Time.LocalTime.Internal.ZonedTime

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ZonedTime -> c ZonedTime #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ZonedTime #

toConstr :: ZonedTime -> Constr #

dataTypeOf :: ZonedTime -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ZonedTime) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ZonedTime) #

gmapT :: (forall b. Data b => b -> b) -> ZonedTime -> ZonedTime #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ZonedTime -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ZonedTime -> r #

gmapQ :: (forall d. Data d => d -> u) -> ZonedTime -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ZonedTime -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ZonedTime -> m ZonedTime #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ZonedTime -> m ZonedTime #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ZonedTime -> m ZonedTime #

Show ZonedTime 
Instance details

Defined in Data.Time.LocalTime.Internal.ZonedTime

Methods

showsPrec :: Int -> ZonedTime -> ShowS #

show :: ZonedTime -> String

showList :: [ZonedTime] -> ShowS #

NFData ZonedTime 
Instance details

Defined in Data.Time.LocalTime.Internal.ZonedTime

Methods

rnf :: ZonedTime -> () #

FromField ZonedTimestamp 
Instance details

Defined in Database.PostgreSQL.Simple.FromField

Methods

fromField :: FieldParser ZonedTimestamp

FromField ZonedTime 
Instance details

Defined in Database.PostgreSQL.Simple.FromField

Methods

fromField :: FieldParser ZonedTime

ToField ZonedTimestamp 
Instance details

Defined in Database.PostgreSQL.Simple.ToField

Methods

toField :: ZonedTimestamp -> Action

ToField ZonedTime 
Instance details

Defined in Database.PostgreSQL.Simple.ToField

Methods

toField :: ZonedTime -> Action

ISO8601 ZonedTime 
Instance details

Defined in Data.Time.Format.ISO8601

Methods

iso8601Format :: Format ZonedTime

ToField (PGRange ZonedTimestamp) 
Instance details

Defined in Database.PostgreSQL.Simple.Range

Methods

toField :: PGRange ZonedTimestamp -> Action

ToField (PGRange ZonedTime) 
Instance details

Defined in Database.PostgreSQL.Simple.Range

Methods

toField :: PGRange ZonedTime -> Action

data (a :: k) :~: (b :: k) where #

Constructors

Refl :: forall {k} (a :: k). a :~: a 

Instances

Instances details
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 #

Groupoid ((:~:) :: k -> k -> Type) 
Instance details

Defined in Data.Groupoid

Methods

inv :: forall (a :: k) (b :: k). (a :~: b) -> b :~: a

Semigroupoid ((:~:) :: k -> k -> Type) 
Instance details

Defined in Data.Semigroupoid

Methods

o :: forall (j :: k) (k1 :: k) (i :: k). (j :~: k1) -> (i :~: j) -> i :~: k1

TestCoercion ((:~:) a :: k -> Type) 
Instance details

Defined in Data.Type.Coercion

Methods

testCoercion :: forall (a0 :: k) (b :: k). (a :~: a0) -> (a :~: b) -> Maybe (Coercion a0 b)

TestEquality ((:~:) a :: k -> Type) 
Instance details

Defined in Data.Type.Equality

Methods

testEquality :: forall (a0 :: k) (b :: k). (a :~: a0) -> (a :~: b) -> Maybe (a0 :~: b)

NFData2 ((:~:) :: Type -> Type -> Type) 
Instance details

Defined in Control.DeepSeq

Methods

liftRnf2 :: (a -> ()) -> (b -> ()) -> (a :~: b) -> ()

NFData1 ((:~:) a) 
Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a0 -> ()) -> (a :~: a0) -> ()

(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) #

a ~ b => Bounded (a :~: b) 
Instance details

Defined in Data.Type.Equality

Methods

minBound :: a :~: b #

maxBound :: 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] #

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]

Show (a :~: b) 
Instance details

Defined in Data.Type.Equality

Methods

showsPrec :: Int -> (a :~: b) -> ShowS #

show :: (a :~: b) -> String

showList :: [a :~: b] -> ShowS #

NFData (a :~: b) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a :~: b) -> () #

Eq (a :~: b) 
Instance details

Defined in Data.Type.Equality

Methods

(==) :: (a :~: b) -> (a :~: b) -> Bool #

(/=) :: (a :~: b) -> (a :~: b) -> Bool #

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 #

option :: Typeable option => option -> StateT TMap IO () Source #

Puts an option into the current configuration

In case an option already exists with the same type, it will not be overriden:

option Production
option Development
findOption @Environment

This code will return Production as the second call to option is ignored to not override the existing option.

data Word64 #

Instances

Instances details
Structured Word64 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy Word64 -> Structure

structureHash' :: Tagged Word64 MD5

Arbitrary Word64 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen Word64

shrink :: Word64 -> [Word64]

CoArbitrary Word64 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Word64 -> Gen b -> Gen b

Function Word64 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Word64 -> b) -> Word64 :-> b

FromJSON Word64 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Word64 #

parseJSONList :: Value -> Parser [Word64] #

omittedField :: Maybe Word64 #

FromJSONKey Word64 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Word64 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Word64 
Instance details

Defined in Data.Aeson.Types.ToJSON

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

HasNegation Word64 
Instance details

Defined in Basement.Compat.NumLiteral

Methods

negate :: Word64 -> Word64

Integral Word64 
Instance details

Defined in Basement.Compat.NumLiteral

ByteSwap Word64 
Instance details

Defined in Basement.Endianness

Methods

byteSwap :: Word64 -> Word64

NormalForm Word64 
Instance details

Defined in Basement.NormalForm

Methods

toNormalForm :: Word64 -> ()

Additive Word64 
Instance details

Defined in Basement.Numerical.Additive

Methods

azero :: Word64

(+) :: Word64 -> Word64 -> Word64

scale :: IsNatural n => n -> Word64 -> Word64

IDivisible Word64 
Instance details

Defined in Basement.Numerical.Multiplicative

Multiplicative Word64 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

midentity :: Word64

(*) :: Word64 -> Word64 -> Word64

(^) :: (IsNatural n, Enum n, IDivisible n) => Word64 -> n -> Word64

IsIntegral Word64 
Instance details

Defined in Basement.Numerical.Number

Methods

toInteger :: Word64 -> Integer

IsNatural Word64 
Instance details

Defined in Basement.Numerical.Number

Methods

toNatural :: Word64 -> Natural

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 ()

ToMarkup Word64 
Instance details

Defined in Text.Blaze

Methods

toMarkup :: Word64 -> Markup

preEscapedToMarkup :: Word64 -> Markup

ToValue Word64 
Instance details

Defined in Text.Blaze

Methods

toValue :: Word64 -> AttributeValue

preEscapedToValue :: Word64 -> AttributeValue

ToBoundedBuilder Word64 
Instance details

Defined in Data.Bytes.Builder.Bounded.Class

Associated Types

type BoundedBuilderLength Word64 
Instance details

Defined in Data.Bytes.Builder.Bounded.Class

type BoundedBuilderLength Word64 = 19

Methods

toBuilder :: Word64 -> Builder (BoundedBuilderLength Word64)

ToBuilder Word64 
Instance details

Defined in Data.Bytes.Builder.Class

Methods

toBuilder :: Word64 -> Builder

Serialize Word64 
Instance details

Defined in Data.Serialize

Methods

put :: Putter Word64

get :: Get Word64

Default Word64 
Instance details

Defined in Data.Default.Class

Methods

def :: Word64 #

NFData Word64 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word64 -> () #

ToLogStr Word64 
Instance details

Defined in System.Log.FastLogger.LogStr

Methods

toLogStr :: Word64 -> LogStr #

Outputable Word64 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Word64 -> SDoc

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 #

ByteSwap Word64 
Instance details

Defined in Data.Memory.Endian

Methods

byteSwap :: Word64 -> Word64

ToField Word64 
Instance details

Defined in Database.PostgreSQL.Simple.ToField

Methods

toField :: Word64 -> Action

Pretty Word64 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Word64 -> Doc ann

prettyList :: [Word64] -> Doc ann

Prim Word64 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: Word64 -> Int#

alignment# :: Word64 -> Int#

indexByteArray# :: ByteArray# -> Int# -> Word64

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, Word64 #)

writeByteArray# :: MutableByteArray# s -> Int# -> Word64 -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> Word64 -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> Word64

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, Word64 #)

writeOffAddr# :: Addr# -> Int# -> Word64 -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> Word64 -> State# s -> State# s

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

Random Word64 
Instance details

Defined in System.Random.TF.Instances

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]

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

Lexicographic Word64 
Instance details

Defined in Data.Vector.Algorithms.AmericanFlag

Methods

extent :: Word64 -> Int

size :: Proxy Word64 -> Int

index :: Int -> Word64 -> Int

Radix Word64 
Instance details

Defined in Data.Vector.Algorithms.Radix

Methods

passes :: Word64 -> Int

size :: Word64 -> Int

radix :: Int -> Word64 -> Int

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

Cast Int64 Word64 
Instance details

Defined in Basement.Cast

Methods

cast :: Int64 -> Word64

Cast Word64 Int64 
Instance details

Defined in Basement.Cast

Methods

cast :: Word64 -> Int64

Cast Word64 Int 
Instance details

Defined in Basement.Cast

Methods

cast :: Word64 -> Int

Cast Word64 Word 
Instance details

Defined in Basement.Cast

Methods

cast :: Word64 -> Word

Cast Int Word64 
Instance details

Defined in Basement.Cast

Methods

cast :: Int -> Word64

Cast Word Word64 
Instance details

Defined in Basement.Cast

Methods

cast :: Word -> Word64

From Word16 Word64 
Instance details

Defined in Basement.From

Methods

from :: Word16 -> Word64

From Word32 Word64 
Instance details

Defined in Basement.From

Methods

from :: Word32 -> Word64

From Word64 Word128 
Instance details

Defined in Basement.From

Methods

from :: Word64 -> Word128

From Word64 Word256 
Instance details

Defined in Basement.From

Methods

from :: Word64 -> Word256

From Word8 Word64 
Instance details

Defined in Basement.From

Methods

from :: Word8 -> Word64

From Word Word64 
Instance details

Defined in Basement.From

Methods

from :: Word -> Word64

IntegralDownsize Word64 Word16 
Instance details

Defined in Basement.IntegralConv

Methods

integralDownsize :: Word64 -> Word16

integralDownsizeCheck :: Word64 -> Maybe Word16

IntegralDownsize Word64 Word32 
Instance details

Defined in Basement.IntegralConv

IntegralDownsize Word64 Word8 
Instance details

Defined in Basement.IntegralConv

IntegralDownsize Integer Word64 
Instance details

Defined in Basement.IntegralConv

IntegralDownsize Natural Word64 
Instance details

Defined in Basement.IntegralConv

Methods

integralDownsize :: Natural -> Word64

integralDownsizeCheck :: Natural -> Maybe Word64

IntegralUpsize Word16 Word64 
Instance details

Defined in Basement.IntegralConv

Methods

integralUpsize :: Word16 -> Word64

IntegralUpsize Word32 Word64 
Instance details

Defined in Basement.IntegralConv

IntegralUpsize Word8 Word64 
Instance details

Defined in Basement.IntegralConv

IntegralUpsize Word Word64 
Instance details

Defined in Basement.IntegralConv

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 ()

ToField (PGRange Word64) 
Instance details

Defined in Database.PostgreSQL.Simple.Range

Methods

toField :: PGRange Word64 -> Action

(KnownNat n, NatWithinBound Word64 n) => From (Zn n) Word64 
Instance details

Defined in Basement.From

Methods

from :: Zn n -> Word64

From (Zn64 n) Word64 
Instance details

Defined in Basement.From

Methods

from :: Zn64 n -> Word64

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
type BoundedBuilderLength Word64 
Instance details

Defined in Data.Bytes.Builder.Bounded.Class

type BoundedBuilderLength Word64 = 19
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 Word32 #

Instances

Instances details
Structured Word32 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy Word32 -> Structure

structureHash' :: Tagged Word32 MD5

Arbitrary Word32 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen Word32

shrink :: Word32 -> [Word32]

CoArbitrary Word32 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Word32 -> Gen b -> Gen b

Function Word32 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Word32 -> b) -> Word32 :-> b

FromJSON Word32 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Word32 #

parseJSONList :: Value -> Parser [Word32] #

omittedField :: Maybe Word32 #

FromJSONKey Word32 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Word32 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Word32 
Instance details

Defined in Data.Aeson.Types.ToJSON

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

HasNegation Word32 
Instance details

Defined in Basement.Compat.NumLiteral

Methods

negate :: Word32 -> Word32

Integral Word32 
Instance details

Defined in Basement.Compat.NumLiteral

ByteSwap Word32 
Instance details

Defined in Basement.Endianness

Methods

byteSwap :: Word32 -> Word32

NormalForm Word32 
Instance details

Defined in Basement.NormalForm

Methods

toNormalForm :: Word32 -> ()

Additive Word32 
Instance details

Defined in Basement.Numerical.Additive

Methods

azero :: Word32

(+) :: Word32 -> Word32 -> Word32

scale :: IsNatural n => n -> Word32 -> Word32

IDivisible Word32 
Instance details

Defined in Basement.Numerical.Multiplicative

Multiplicative Word32 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

midentity :: Word32

(*) :: Word32 -> Word32 -> Word32

(^) :: (IsNatural n, Enum n, IDivisible n) => Word32 -> n -> Word32

IsIntegral Word32 
Instance details

Defined in Basement.Numerical.Number

Methods

toInteger :: Word32 -> Integer

IsNatural Word32 
Instance details

Defined in Basement.Numerical.Number

Methods

toNatural :: Word32 -> Natural

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 ()

ToMarkup Word32 
Instance details

Defined in Text.Blaze

Methods

toMarkup :: Word32 -> Markup

preEscapedToMarkup :: Word32 -> Markup

ToValue Word32 
Instance details

Defined in Text.Blaze

Methods

toValue :: Word32 -> AttributeValue

preEscapedToValue :: Word32 -> AttributeValue

ToBoundedBuilder Word32 
Instance details

Defined in Data.Bytes.Builder.Bounded.Class

Associated Types

type BoundedBuilderLength Word32 
Instance details

Defined in Data.Bytes.Builder.Bounded.Class

type BoundedBuilderLength Word32 = 10

Methods

toBuilder :: Word32 -> Builder (BoundedBuilderLength Word32)

ToBuilder Word32 
Instance details

Defined in Data.Bytes.Builder.Class

Methods

toBuilder :: Word32 -> Builder

Serialize Word32 
Instance details

Defined in Data.Serialize

Methods

put :: Putter Word32

get :: Get Word32

Default Word32 
Instance details

Defined in Data.Default.Class

Methods

def :: Word32 #

NFData Word32 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word32 -> () #

ToLogStr Word32 
Instance details

Defined in System.Log.FastLogger.LogStr

Methods

toLogStr :: Word32 -> LogStr #

Outputable Word32 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Word32 -> SDoc

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 #

ByteSwap Word32 
Instance details

Defined in Data.Memory.Endian

Methods

byteSwap :: Word32 -> Word32

ToField Word32 
Instance details

Defined in Database.PostgreSQL.Simple.ToField

Methods

toField :: Word32 -> Action

Pretty Word32 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Word32 -> Doc ann

prettyList :: [Word32] -> Doc ann

Prim Word32 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: Word32 -> Int#

alignment# :: Word32 -> Int#

indexByteArray# :: ByteArray# -> Int# -> Word32

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, Word32 #)

writeByteArray# :: MutableByteArray# s -> Int# -> Word32 -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> Word32 -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> Word32

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, Word32 #)

writeOffAddr# :: Addr# -> Int# -> Word32 -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> Word32 -> State# s -> State# s

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

Random Word32 
Instance details

Defined in System.Random.TF.Instances

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]

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

Lexicographic Word32 
Instance details

Defined in Data.Vector.Algorithms.AmericanFlag

Methods

extent :: Word32 -> Int

size :: Proxy Word32 -> Int

index :: Int -> Word32 -> Int

Radix Word32 
Instance details

Defined in Data.Vector.Algorithms.Radix

Methods

passes :: Word32 -> Int

size :: Word32 -> Int

radix :: Int -> Word32 -> Int

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

Cast Int32 Word32 
Instance details

Defined in Basement.Cast

Methods

cast :: Int32 -> Word32

Cast Word32 Int32 
Instance details

Defined in Basement.Cast

Methods

cast :: Word32 -> Int32

From Word16 Word32 
Instance details

Defined in Basement.From

Methods

from :: Word16 -> Word32

From Word32 Int64 
Instance details

Defined in Basement.From

Methods

from :: Word32 -> Int64

From Word32 Word64 
Instance details

Defined in Basement.From

Methods

from :: Word32 -> Word64

From Word32 Word128 
Instance details

Defined in Basement.From

Methods

from :: Word32 -> Word128

From Word32 Word256 
Instance details

Defined in Basement.From

Methods

from :: Word32 -> Word256

From Word32 Int 
Instance details

Defined in Basement.From

Methods

from :: Word32 -> Int

From Word32 Word 
Instance details

Defined in Basement.From

Methods

from :: Word32 -> Word

From Word8 Word32 
Instance details

Defined in Basement.From

Methods

from :: Word8 -> Word32

IntegralDownsize Word32 Word16 
Instance details

Defined in Basement.IntegralConv

Methods

integralDownsize :: Word32 -> Word16

integralDownsizeCheck :: Word32 -> Maybe Word16

IntegralDownsize Word32 Word8 
Instance details

Defined in Basement.IntegralConv

IntegralDownsize Word64 Word32 
Instance details

Defined in Basement.IntegralConv

IntegralDownsize Integer Word32 
Instance details

Defined in Basement.IntegralConv

IntegralDownsize Natural Word32 
Instance details

Defined in Basement.IntegralConv

Methods

integralDownsize :: Natural -> Word32

integralDownsizeCheck :: Natural -> Maybe Word32

IntegralDownsize Word Word32 
Instance details

Defined in Basement.IntegralConv

IntegralUpsize Word16 Word32 
Instance details

Defined in Basement.IntegralConv

Methods

integralUpsize :: Word16 -> Word32

IntegralUpsize Word32 Word64 
Instance details

Defined in Basement.IntegralConv

IntegralUpsize Word32 Word 
Instance details

Defined in Basement.IntegralConv

IntegralUpsize Word8 Word32 
Instance details

Defined in Basement.IntegralConv

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 ()

ToField (PGRange Word32) 
Instance details

Defined in Database.PostgreSQL.Simple.Range

Methods

toField :: PGRange Word32 -> Action

(KnownNat n, NatWithinBound Word32 n) => From (Zn n) Word32 
Instance details

Defined in Basement.From

Methods

from :: Zn n -> Word32

(KnownNat n, NatWithinBound Word32 n) => From (Zn64 n) Word32 
Instance details

Defined in Basement.From

Methods

from :: Zn64 n -> Word32

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
type BoundedBuilderLength Word32 
Instance details

Defined in Data.Bytes.Builder.Bounded.Class

type BoundedBuilderLength Word32 = 10
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 Word8 #

Instances

Instances details
Structured Word8 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy Word8 -> Structure

structureHash' :: Tagged Word8 MD5

Arbitrary Word8 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen Word8

shrink :: Word8 -> [Word8]

CoArbitrary Word8 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Word8 -> Gen b -> Gen b

Function Word8 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Word8 -> b) -> Word8 :-> b

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

ToJSON Word8 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Word8 
Instance details

Defined in Data.Aeson.Types.ToJSON

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

HasNegation Word8 
Instance details

Defined in Basement.Compat.NumLiteral

Methods

negate :: Word8 -> Word8

Integral Word8 
Instance details

Defined in Basement.Compat.NumLiteral

NormalForm Word8 
Instance details

Defined in Basement.NormalForm

Methods

toNormalForm :: Word8 -> ()

Additive Word8 
Instance details

Defined in Basement.Numerical.Additive

Methods

azero :: Word8

(+) :: Word8 -> Word8 -> Word8

scale :: IsNatural n => n -> Word8 -> Word8

IDivisible Word8 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

div :: Word8 -> Word8 -> Word8

mod :: Word8 -> Word8 -> Word8

divMod :: Word8 -> Word8 -> (Word8, Word8)

Multiplicative Word8 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

midentity :: Word8

(*) :: Word8 -> Word8 -> Word8

(^) :: (IsNatural n, Enum n, IDivisible n) => Word8 -> n -> Word8

IsIntegral Word8 
Instance details

Defined in Basement.Numerical.Number

Methods

toInteger :: Word8 -> Integer

IsNatural Word8 
Instance details

Defined in Basement.Numerical.Number

Methods

toNatural :: Word8 -> Natural

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 ()

ToBoundedBuilder Word8 
Instance details

Defined in Data.Bytes.Builder.Bounded.Class

Associated Types

type BoundedBuilderLength Word8 
Instance details

Defined in Data.Bytes.Builder.Bounded.Class

type BoundedBuilderLength Word8 = 3

Methods

toBuilder :: Word8 -> Builder (BoundedBuilderLength Word8)

ToBuilder Word8 
Instance details

Defined in Data.Bytes.Builder.Class

Methods

toBuilder :: Word8 -> Builder

Serialize Word8 
Instance details

Defined in Data.Serialize

Methods

put :: Putter Word8

get :: Get Word8

Default Word8 
Instance details

Defined in Data.Default.Class

Methods

def :: Word8 #

NFData Word8 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word8 -> () #

ToLogStr Word8 
Instance details

Defined in System.Log.FastLogger.LogStr

Methods

toLogStr :: Word8 -> LogStr #

Outputable Word8 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Word8 -> SDoc

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 #

ToField Word8 
Instance details

Defined in Database.PostgreSQL.Simple.ToField

Methods

toField :: Word8 -> Action

Pretty Word8 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Word8 -> Doc ann

prettyList :: [Word8] -> Doc ann

Prim Word8 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: Word8 -> Int#

alignment# :: Word8 -> Int#

indexByteArray# :: ByteArray# -> Int# -> Word8

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, Word8 #)

writeByteArray# :: MutableByteArray# s -> Int# -> Word8 -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> Word8 -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> Word8

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, Word8 #)

writeOffAddr# :: Addr# -> Int# -> Word8 -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> Word8 -> State# s -> State# s

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

Random Word8 
Instance details

Defined in System.Random.TF.Instances

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]

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

Lexicographic Word8 
Instance details

Defined in Data.Vector.Algorithms.AmericanFlag

Methods

extent :: Word8 -> Int

size :: Proxy Word8 -> Int

index :: Int -> Word8 -> Int

Radix Word8 
Instance details

Defined in Data.Vector.Algorithms.Radix

Methods

passes :: Word8 -> Int

size :: Word8 -> Int

radix :: Int -> Word8 -> Int

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

Cast Int8 Word8 
Instance details

Defined in Basement.Cast

Methods

cast :: Int8 -> Word8

Cast Word8 Int8 
Instance details

Defined in Basement.Cast

Methods

cast :: Word8 -> Int8

From Word8 Int16 
Instance details

Defined in Basement.From

Methods

from :: Word8 -> Int16

From Word8 Int32 
Instance details

Defined in Basement.From

Methods

from :: Word8 -> Int32

From Word8 Int64 
Instance details

Defined in Basement.From

Methods

from :: Word8 -> Int64

From Word8 Word16 
Instance details

Defined in Basement.From

Methods

from :: Word8 -> Word16

From Word8 Word32 
Instance details

Defined in Basement.From

Methods

from :: Word8 -> Word32

From Word8 Word64 
Instance details

Defined in Basement.From

Methods

from :: Word8 -> Word64

From Word8 Word128 
Instance details

Defined in Basement.From

Methods

from :: Word8 -> Word128

From Word8 Word256 
Instance details

Defined in Basement.From

Methods

from :: Word8 -> Word256

From Word8 Int 
Instance details

Defined in Basement.From

Methods

from :: Word8 -> Int

From Word8 Word 
Instance details

Defined in Basement.From

Methods

from :: Word8 -> Word

IntegralDownsize Word16 Word8 
Instance details

Defined in Basement.IntegralConv

Methods

integralDownsize :: Word16 -> Word8

integralDownsizeCheck :: Word16 -> Maybe Word8

IntegralDownsize Word32 Word8 
Instance details

Defined in Basement.IntegralConv

IntegralDownsize Word64 Word8 
Instance details

Defined in Basement.IntegralConv

IntegralDownsize Integer Word8 
Instance details

Defined in Basement.IntegralConv

IntegralDownsize Natural Word8 
Instance details

Defined in Basement.IntegralConv

Methods

integralDownsize :: Natural -> Word8

integralDownsizeCheck :: Natural -> Maybe Word8

IntegralDownsize Word Word8 
Instance details

Defined in Basement.IntegralConv

IntegralUpsize Word8 Int16 
Instance details

Defined in Basement.IntegralConv

Methods

integralUpsize :: Word8 -> Int16

IntegralUpsize Word8 Int32 
Instance details

Defined in Basement.IntegralConv

IntegralUpsize Word8 Int64 
Instance details

Defined in Basement.IntegralConv

IntegralUpsize Word8 Word16 
Instance details

Defined in Basement.IntegralConv

Methods

integralUpsize :: Word8 -> Word16

IntegralUpsize Word8 Word32 
Instance details

Defined in Basement.IntegralConv

IntegralUpsize Word8 Word64 
Instance details

Defined in Basement.IntegralConv

IntegralUpsize Word8 Int 
Instance details

Defined in Basement.IntegralConv

Methods

integralUpsize :: Word8 -> Int

IntegralUpsize Word8 Word 
Instance details

Defined in Basement.IntegralConv

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 ()

Cons ByteString ByteString Word8 Word8 
Instance details

Defined in Control.Lens.Cons

Cons ByteString ByteString Word8 Word8 
Instance details

Defined in Control.Lens.Cons

Methods

_Cons :: Prism ByteString ByteString (Word8, ByteString) (Word8, ByteString)

Snoc ByteString ByteString Word8 Word8 
Instance details

Defined in Control.Lens.Cons

Snoc ByteString ByteString Word8 Word8 
Instance details

Defined in Control.Lens.Cons

Methods

_Snoc :: Prism ByteString ByteString (ByteString, Word8) (ByteString, Word8)

From AsciiString (UArray Word8) 
Instance details

Defined in Basement.From

Methods

from :: AsciiString -> UArray Word8

From String (UArray Word8) 
Instance details

Defined in Basement.From

Methods

from :: String -> UArray Word8

Adler32 [Word8] 
Instance details

Defined in Data.Digest.Adler32

CRC32 [Word8] 
Instance details

Defined in Data.Digest.CRC32

Methods

crc32 :: [Word8] -> Word32

crc32Update :: Word32 -> [Word8] -> Word32

CRC32C [Word8] 
Instance details

Defined in Data.Digest.CRC32C

Methods

crc32c :: [Word8] -> Word32

crc32cUpdate :: Word32 -> [Word8] -> Word32

ToField (PGRange Word8) 
Instance details

Defined in Database.PostgreSQL.Simple.Range

Methods

toField :: PGRange Word8 -> Action

(KnownNat n, NatWithinBound Word8 n) => From (Zn n) Word8 
Instance details

Defined in Basement.From

Methods

from :: Zn n -> Word8

(KnownNat n, NatWithinBound Word8 n) => From (Zn64 n) Word8 
Instance details

Defined in Basement.From

Methods

from :: Zn64 n -> Word8

TryFrom (UArray Word8) String 
Instance details

Defined in Basement.From

Methods

tryFrom :: UArray Word8 -> Maybe String

UTF8Bytes [Word8] Int 
Instance details

Defined in Codec.Binary.UTF8.Generic

Methods

bsplit :: Int -> [Word8] -> ([Word8], [Word8])

bdrop :: Int -> [Word8] -> [Word8]

buncons :: [Word8] -> Maybe (Word8, [Word8])

elemIndex :: Word8 -> [Word8] -> Maybe Int

empty :: [Word8]

null :: [Word8] -> Bool

pack :: [Word8] -> [Word8]

tail :: [Word8] -> [Word8]

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 ()

Cast (Block a) (Block Word8) 
Instance details

Defined in Basement.Cast

Methods

cast :: Block a -> Block Word8

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
type BoundedBuilderLength Word8 
Instance details

Defined in Data.Bytes.Builder.Bounded.Class

type BoundedBuilderLength Word8 = 3
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)

findIndex :: (a -> Bool) -> [a] -> Maybe Int #

foldl1' :: HasCallStack => (a -> a -> a) -> [a] -> a #

scanl :: (b -> a -> b) -> b -> [a] -> [b] #

unfoldr :: (b -> Maybe (a, b)) -> b -> [a] #

dropWhileEnd :: (a -> Bool) -> [a] -> [a] #

mapAccumL :: Traversable t => (s -> a -> (s, b)) -> s -> t a -> (s, t b) #

mapAccumR :: Traversable t => (s -> a -> (s, b)) -> s -> t a -> (s, t b) #

scanl1 :: (a -> a -> a) -> [a] -> [a] #

scanr :: (a -> b -> b) -> b -> [a] -> [b] #

scanr1 :: (a -> a -> a) -> [a] -> [a] #

transpose :: [[a]] -> [[a]] #

data (a :: k1) :~~: (b :: k2) where #

Constructors

HRefl :: forall {k1} (a :: k1). a :~~: a 

Instances

Instances details
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 #

Groupoid ((:~~:) :: k -> k -> Type) 
Instance details

Defined in Data.Groupoid

Methods

inv :: forall (a :: k) (b :: k). (a :~~: b) -> b :~~: a

Semigroupoid ((:~~:) :: k -> k -> Type) 
Instance details

Defined in Data.Semigroupoid

Methods

o :: forall (j :: k) (k1 :: k) (i :: k). (j :~~: k1) -> (i :~~: j) -> i :~~: k1

TestCoercion ((:~~:) a :: k -> Type) 
Instance details

Defined in Data.Type.Coercion

Methods

testCoercion :: forall (a0 :: k) (b :: k). (a :~~: a0) -> (a :~~: b) -> Maybe (Coercion a0 b)

TestEquality ((:~~:) a :: k -> Type) 
Instance details

Defined in Data.Type.Equality

Methods

testEquality :: forall (a0 :: k) (b :: k). (a :~~: a0) -> (a :~~: b) -> Maybe (a0 :~: b)

NFData2 ((:~~:) :: Type -> Type -> Type) 
Instance details

Defined in Control.DeepSeq

Methods

liftRnf2 :: (a -> ()) -> (b -> ()) -> (a :~~: b) -> ()

NFData1 ((:~~:) a :: Type -> Type) 
Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a0 -> ()) -> (a :~~: a0) -> ()

(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) #

a ~~ b => Bounded (a :~~: b) 
Instance details

Defined in Data.Type.Equality

Methods

minBound :: a :~~: b #

maxBound :: 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] #

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]

Show (a :~~: b) 
Instance details

Defined in Data.Type.Equality

Methods

showsPrec :: Int -> (a :~~: b) -> ShowS #

show :: (a :~~: b) -> String

showList :: [a :~~: b] -> ShowS #

NFData (a :~~: b) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a :~~: b) -> () #

Eq (a :~~: b) 
Instance details

Defined in Data.Type.Equality

Methods

(==) :: (a :~~: b) -> (a :~~: b) -> Bool #

(/=) :: (a :~~: b) -> (a :~~: b) -> Bool #

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 #

data Constr #

Instances

Instances details
Show Constr 
Instance details

Defined in Data.Data

Methods

showsPrec :: Int -> Constr -> ShowS #

show :: Constr -> String

showList :: [Constr] -> ShowS #

Eq Constr 
Instance details

Defined in Data.Data

Methods

(==) :: Constr -> Constr -> Bool #

(/=) :: Constr -> Constr -> Bool #

data DataType #

Instances

Instances details
Show DataType 
Instance details

Defined in Data.Data

Methods

showsPrec :: Int -> DataType -> ShowS #

show :: DataType -> String

showList :: [DataType] -> ShowS #

data ConstrRep #

Instances

Instances details
Show ConstrRep 
Instance details

Defined in Data.Data

Methods

showsPrec :: Int -> ConstrRep -> ShowS #

show :: ConstrRep -> String

showList :: [ConstrRep] -> ShowS #

Eq ConstrRep 
Instance details

Defined in Data.Data

type TypeRep = SomeTypeRep #

data Int64 #

Instances

Instances details
Structured Int64 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy Int64 -> Structure

structureHash' :: Tagged Int64 MD5

Arbitrary Int64 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen Int64

shrink :: Int64 -> [Int64]

CoArbitrary Int64 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Int64 -> Gen b -> Gen b

Function Int64 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Int64 -> b) -> Int64 :-> b

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

ToJSON Int64 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Int64 
Instance details

Defined in Data.Aeson.Types.ToJSON

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

HasNegation Int64 
Instance details

Defined in Basement.Compat.NumLiteral

Methods

negate :: Int64 -> Int64

Integral Int64 
Instance details

Defined in Basement.Compat.NumLiteral

NormalForm Int64 
Instance details

Defined in Basement.NormalForm

Methods

toNormalForm :: Int64 -> ()

Additive Int64 
Instance details

Defined in Basement.Numerical.Additive

Methods

azero :: Int64

(+) :: Int64 -> Int64 -> Int64

scale :: IsNatural n => n -> Int64 -> Int64

IDivisible Int64 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

div :: Int64 -> Int64 -> Int64

mod :: Int64 -> Int64 -> Int64

divMod :: Int64 -> Int64 -> (Int64, Int64)

Multiplicative Int64 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

midentity :: Int64

(*) :: Int64 -> Int64 -> Int64

(^) :: (IsNatural n, Enum n, IDivisible n) => Int64 -> n -> Int64

IsIntegral Int64 
Instance details

Defined in Basement.Numerical.Number

Methods

toInteger :: Int64 -> Integer

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 ()

ToMarkup Int64 
Instance details

Defined in Text.Blaze

Methods

toMarkup :: Int64 -> Markup

preEscapedToMarkup :: Int64 -> Markup

ToValue Int64 
Instance details

Defined in Text.Blaze

Methods

toValue :: Int64 -> AttributeValue

preEscapedToValue :: Int64 -> AttributeValue

ToBoundedBuilder Int64 
Instance details

Defined in Data.Bytes.Builder.Bounded.Class

Associated Types

type BoundedBuilderLength Int64 
Instance details

Defined in Data.Bytes.Builder.Bounded.Class

type BoundedBuilderLength Int64 = 20

Methods

toBuilder :: Int64 -> Builder (BoundedBuilderLength Int64)

ToBuilder Int64 
Instance details

Defined in Data.Bytes.Builder.Class

Methods

toBuilder :: Int64 -> Builder

Serialize Int64 
Instance details

Defined in Data.Serialize

Methods

put :: Putter Int64

get :: Get Int64

Default Int64 
Instance details

Defined in Data.Default.Class

Methods

def :: Int64 #

NFData Int64 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int64 -> () #

ToLogStr Int64 
Instance details

Defined in System.Log.FastLogger.LogStr

Methods

toLogStr :: Int64 -> LogStr #

Outputable Int64 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Int64 -> SDoc

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 #

FromField Int64 
Instance details

Defined in Database.PostgreSQL.Simple.FromField

Methods

fromField :: FieldParser Int64

ToField Int64 
Instance details

Defined in Database.PostgreSQL.Simple.ToField

Methods

toField :: Int64 -> Action

Pretty Int64 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Int64 -> Doc ann

prettyList :: [Int64] -> Doc ann

Prim Int64 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: Int64 -> Int#

alignment# :: Int64 -> Int#

indexByteArray# :: ByteArray# -> Int# -> Int64

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, Int64 #)

writeByteArray# :: MutableByteArray# s -> Int# -> Int64 -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> Int64 -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> Int64

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, Int64 #)

writeOffAddr# :: Addr# -> Int# -> Int64 -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> Int64 -> State# s -> State# s

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

Random Int64 
Instance details

Defined in System.Random.TF.Instances

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]

Unbox Int64 
Instance details

Defined in Data.Vector.Unboxed.Base

Lexicographic Int64 
Instance details

Defined in Data.Vector.Algorithms.AmericanFlag

Methods

extent :: Int64 -> Int

size :: Proxy Int64 -> Int

index :: Int -> Int64 -> Int

Radix Int64 
Instance details

Defined in Data.Vector.Algorithms.Radix

Methods

passes :: Int64 -> Int

size :: Int64 -> Int

radix :: Int -> Int64 -> Int

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

Cast Int64 Word64 
Instance details

Defined in Basement.Cast

Methods

cast :: Int64 -> Word64

Cast Int64 Int 
Instance details

Defined in Basement.Cast

Methods

cast :: Int64 -> Int

Cast Int64 Word 
Instance details

Defined in Basement.Cast

Methods

cast :: Int64 -> Word

Cast Word64 Int64 
Instance details

Defined in Basement.Cast

Methods

cast :: Word64 -> Int64

Cast Int Int64 
Instance details

Defined in Basement.Cast

Methods

cast :: Int -> Int64

Cast Word Int64 
Instance details

Defined in Basement.Cast

Methods

cast :: Word -> Int64

From Int16 Int64 
Instance details

Defined in Basement.From

Methods

from :: Int16 -> Int64

From Int32 Int64 
Instance details

Defined in Basement.From

Methods

from :: Int32 -> Int64

From Int8 Int64 
Instance details

Defined in Basement.From

Methods

from :: Int8 -> Int64

From Word16 Int64 
Instance details

Defined in Basement.From

Methods

from :: Word16 -> Int64

From Word32 Int64 
Instance details

Defined in Basement.From

Methods

from :: Word32 -> Int64

From Word8 Int64 
Instance details

Defined in Basement.From

Methods

from :: Word8 -> Int64

From Int Int64 
Instance details

Defined in Basement.From

Methods

from :: Int -> Int64

IntegralDownsize Int64 Int16 
Instance details

Defined in Basement.IntegralConv

IntegralDownsize Int64 Int32 
Instance details

Defined in Basement.IntegralConv

IntegralDownsize Int64 Int8 
Instance details

Defined in Basement.IntegralConv

IntegralDownsize Int64 Int 
Instance details

Defined in Basement.IntegralConv

IntegralDownsize Integer Int64 
Instance details

Defined in Basement.IntegralConv

IntegralUpsize Int16 Int64 
Instance details

Defined in Basement.IntegralConv

Methods

integralUpsize :: Int16 -> Int64

IntegralUpsize Int32 Int64 
Instance details

Defined in Basement.IntegralConv

IntegralUpsize Int8 Int64 
Instance details

Defined in Basement.IntegralConv

Methods

integralUpsize :: Int8 -> Int64

IntegralUpsize Word8 Int64 
Instance details

Defined in Basement.IntegralConv

IntegralUpsize Int Int64 
Instance details

Defined in Basement.IntegralConv

Methods

integralUpsize :: Int -> 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

UTF8Bytes ByteString Int64 
Instance details

Defined in Codec.Binary.UTF8.Generic

Methods

bsplit :: Int64 -> ByteString -> (ByteString, ByteString)

bdrop :: Int64 -> ByteString -> ByteString

buncons :: ByteString -> Maybe (Word8, ByteString)

elemIndex :: Word8 -> ByteString -> Maybe Int64

empty :: ByteString

null :: ByteString -> Bool

pack :: [Word8] -> ByteString

tail :: ByteString -> ByteString

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 ()

ToField (PGRange Int64) 
Instance details

Defined in Database.PostgreSQL.Simple.Range

Methods

toField :: PGRange Int64 -> Action

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
type BoundedBuilderLength Int64 
Instance details

Defined in Data.Bytes.Builder.Bounded.Class

type BoundedBuilderLength Int64 = 20
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 Int32 #

Instances

Instances details
Structured Int32 
Instance details

Defined in Distribution.Utils.Structured

Methods

structure :: Proxy Int32 -> Structure

structureHash' :: Tagged Int32 MD5

Arbitrary Int32 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

arbitrary :: Gen Int32

shrink :: Int32 -> [Int32]

CoArbitrary Int32 
Instance details

Defined in Test.QuickCheck.Arbitrary

Methods

coarbitrary :: Int32 -> Gen b -> Gen b

Function Int32 
Instance details

Defined in Test.QuickCheck.Function

Methods

function :: (Int32 -> b) -> Int32 :-> b

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

ToJSON Int32 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Int32 
Instance details

Defined in Data.Aeson.Types.ToJSON

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

HasNegation Int32 
Instance details

Defined in Basement.Compat.NumLiteral

Methods

negate :: Int32 -> Int32

Integral Int32 
Instance details

Defined in Basement.Compat.NumLiteral

NormalForm Int32 
Instance details

Defined in Basement.NormalForm

Methods

toNormalForm :: Int32 -> ()

Additive Int32 
Instance details

Defined in Basement.Numerical.Additive

Methods

azero :: Int32

(+) :: Int32 -> Int32 -> Int32

scale :: IsNatural n => n -> Int32 -> Int32

IDivisible Int32 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

div :: Int32 -> Int32 -> Int32

mod :: Int32 -> Int32 -> Int32

divMod :: Int32 -> Int32 -> (Int32, Int32)

Multiplicative Int32 
Instance details

Defined in Basement.Numerical.Multiplicative

Methods

midentity :: Int32

(*) :: Int32 -> Int32 -> Int32

(^) :: (IsNatural n, Enum n, IDivisible n) => Int32 -> n -> Int32

IsIntegral Int32 
Instance details

Defined in Basement.Numerical.Number

Methods

toInteger :: Int32 -> Integer

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 ()

ToMarkup Int32 
Instance details

Defined in Text.Blaze

Methods

toMarkup :: Int32 -> Markup

preEscapedToMarkup :: Int32 -> Markup

ToValue Int32 
Instance details

Defined in Text.Blaze

Methods

toValue :: Int32 -> AttributeValue

preEscapedToValue :: Int32 -> AttributeValue

ToBoundedBuilder Int32 
Instance details

Defined in Data.Bytes.Builder.Bounded.Class

Associated Types

type BoundedBuilderLength Int32 
Instance details

Defined in Data.Bytes.Builder.Bounded.Class

type BoundedBuilderLength Int32 = 11

Methods

toBuilder :: Int32 -> Builder (BoundedBuilderLength Int32)

ToBuilder Int32 
Instance details

Defined in Data.Bytes.Builder.Class

Methods

toBuilder :: Int32 -> Builder

Serialize Int32 
Instance details

Defined in Data.Serialize

Methods

put :: Putter Int32

get :: Get Int32

Default Int32 
Instance details

Defined in Data.Default.Class

Methods

def :: Int32 #

NFData Int32 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int32 -> () #

ToLogStr Int32 
Instance details

Defined in System.Log.FastLogger.LogStr

Methods

toLogStr :: Int32 -> LogStr #

Outputable Int32 
Instance details

Defined in GHC.Utils.Outputable

Methods

ppr :: Int32 -> SDoc

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 #

FromField Int32 
Instance details

Defined in Database.PostgreSQL.Simple.FromField

Methods

fromField :: FieldParser Int32

ToField Int32 
Instance details

Defined in Database.PostgreSQL.Simple.ToField

Methods

toField :: Int32 -> Action

Pretty Int32 
Instance details

Defined in Prettyprinter.Internal

Methods

pretty :: Int32 -> Doc ann

prettyList :: [Int32] -> Doc ann

Prim Int32 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: Int32 -> Int#

alignment# :: Int32 -> Int#

indexByteArray# :: ByteArray# -> Int# -> Int32

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, Int32 #)

writeByteArray# :: MutableByteArray# s -> Int# -> Int32 -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> Int32 -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> Int32

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, Int32 #)

writeOffAddr# :: Addr# -> Int# -> Int32 -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> Int32 -> State# s -> State# s

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

Random Int32 
Instance details

Defined in System.Random.TF.Instances

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]

Unbox Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

Lexicographic Int32 
Instance details

Defined in Data.Vector.Algorithms.AmericanFlag

Methods

extent :: Int32 -> Int

size :: Proxy Int32 -> Int

index :: Int -> Int32 -> Int

Radix Int32 
Instance details

Defined in Data.Vector.Algorithms.Radix

Methods

passes :: Int32 -> Int

size :: Int32 -> Int

radix :: Int -> Int32 -> Int

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

Cast Int32 Word32 
Instance details

Defined in Basement.Cast

Methods

cast :: Int32 -> Word32

Cast Word32 Int32 
Instance details

Defined in Basement.Cast

Methods

cast :: Word32 -> Int32

From Int16 Int32 
Instance details

Defined in Basement.From

Methods

from :: Int16 -> Int32

From Int32 Int64 
Instance details

Defined in Basement.From

Methods

from :: Int32 -> Int64

From Int32 Int 
Instance details

Defined in Basement.From

Methods

from :: Int32 -> Int

From Int8 Int32 
Instance details

Defined in Basement.From

Methods

from :: Int8 -> Int32

From Word16 Int32 
Instance details

Defined in Basement.From

Methods

from :: Word16 -> Int32

From Word8 Int32 
Instance details

Defined in Basement.From

Methods

from :: Word8 -> Int32

IntegralDownsize Int64 Int32 
Instance details

Defined in Basement.IntegralConv

IntegralDownsize Integer Int32 
Instance details

Defined in Basement.IntegralConv

IntegralDownsize Int Int32 
Instance details

Defined in Basement.IntegralConv

IntegralUpsize Int16 Int32 
Instance details

Defined in Basement.IntegralConv

Methods

integralUpsize :: Int16 -> Int32

IntegralUpsize Int32 Int64 
Instance details

Defined in Basement.IntegralConv

IntegralUpsize Int32 Int 
Instance details

Defined in Basement.IntegralConv

Methods

integralUpsize :: Int32 -> Int

IntegralUpsize Int8 Int32 
Instance details

Defined in Basement.IntegralConv

Methods

integralUpsize :: Int8 -> Int32

IntegralUpsize Word8 Int32 
Instance details

Defined in Basement.IntegralConv

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 ()

ToField (PGRange Int32) 
Instance details

Defined in Database.PostgreSQL.Simple.Range

Methods

toField :: PGRange Int32 -> Action

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
type BoundedBuilderLength Int32 
Instance details

Defined in Data.Bytes.Builder.Bounded.Class

type BoundedBuilderLength Int32 = 11
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)

(!?) :: [a] -> Int -> Maybe a #

elemIndex :: Eq a => a -> [a] -> Maybe Int #

elemIndices :: Eq a => a -> [a] -> [Int] #

findIndices :: (a -> Bool) -> [a] -> [Int] #

genericSplitAt :: Integral i => i -> [a] -> ([a], [a]) #

scanl' :: (b -> a -> b) -> b -> [a] -> [b] #

class CanCreate a where Source #

Minimal complete definition

create, createMany

Methods

create :: a -> IO a Source #

createMany :: [a] -> IO [a] Source #

createRecordDiscardResult :: a -> IO () Source #

Like createRecord but doesn't return the created record

freeze :: ControllerContext -> IO ControllerContext Source #

After freezing a container you can access its values from pure non-IO code by using fromFronzenContext

Calls to putContext will throw an exception after it's frozen.

cycle :: HasCallStack => [a] -> [a] #

iterate :: (a -> a) -> a -> [a] #

genericTake :: Integral i => i -> [a] -> [a] #

data Fixity #

Constructors

Prefix 
Infix 

Instances

Instances details
Show Fixity 
Instance details

Defined in Data.Data

Methods

showsPrec :: Int -> Fixity -> ShowS #

show :: Fixity -> String

showList :: [Fixity] -> ShowS #

Eq Fixity 
Instance details

Defined in Data.Data

Methods

(==) :: Fixity -> Fixity -> Bool #

(/=) :: Fixity -> Fixity -> Bool #

intersectBy :: (a -> a -> Bool) -> [a] -> [a] -> [a] #

unionBy :: (a -> a -> Bool) -> [a] -> [a] -> [a] #

seq :: a -> b -> b #

nonEmpty :: IsEmpty value => value -> ValidatorResult Source #

Validates that value is not empty

>>> nonEmpty "hello world"
Success
>>> nonEmpty ""
Failure "This field cannot be empty"
>>> nonEmpty (Just "hello")
Success
>>> nonEmpty Nothing
Failure "This field cannot be empty"

isEmptyValue :: IsEmpty value => value -> ValidatorResult Source #

Validates that value is empty

>>> isEmptyValue "hello world"
Failure "This field must be empty"
>>> ieEmptyValue ""
Success
>>> isEmptyValue (Just "hello")
Failure "This field must be empty"
>>> isEmptyValue Nothing
Success

catchIOError :: IO a -> (IOError -> IO a) -> IO a #

cast :: (Typeable a, Typeable b) => a -> Maybe b #

iterate' :: (a -> a) -> a -> [a] #

deleteFirstsBy :: (a -> a -> Bool) -> [a] -> [a] -> [a] #

genericDrop :: Integral i => i -> [a] -> [a] #

genericIndex :: Integral i => [a] -> i -> a #

genericLength :: Num i => [a] -> i #

genericReplicate :: Integral i => i -> a -> [a] #

insertBy :: (a -> a -> Ordering) -> a -> [a] -> [a] #

nub :: Eq a => [a] -> [a] #

nubBy :: (a -> a -> Bool) -> [a] -> [a] #

isSubsequenceOf :: Eq a => [a] -> [a] -> Bool #

data RowLevelSecurityContext Source #

When row level security is enabled at runtime, this keeps track of the current logged in user and the postgresql role to switch to.

Constructors

RowLevelSecurityContext 

Fields

  • rlsAuthenticatedRole :: Text

    Default is ihp_authenticated. This value comes from the IHP_RLS_AUTHENTICATED_ROLE env var.

  • rlsUserId :: Action

    The user id of the current logged in user

notConnectedModelContext :: Logger -> ModelContext Source #

Provides a mock ModelContext to be used when a database connection is not available

type family GetModelById id where ... Source #

Equations

GetModelById (Maybe (Id' tableName)) = Maybe (GetModelByTableName tableName) 
GetModelById (Id' tableName) = GetModelByTableName tableName 

newtype PGInterval #

Constructors

PGInterval ByteString 

Instances

Instances details
Show PGInterval 
Instance details

Defined in IHP.Postgres.TimeParser

Methods

showsPrec :: Int -> PGInterval -> ShowS #

show :: PGInterval -> String

showList :: [PGInterval] -> ShowS #

Default PGInterval Source # 
Instance details

Defined in IHP.ModelSupport

Methods

def :: PGInterval #

Eq PGInterval 
Instance details

Defined in IHP.Postgres.TimeParser

ParamReader PGInterval Source # 
Instance details

Defined in IHP.Controller.Param

InputValue PGInterval Source # 
Instance details

Defined in IHP.ModelSupport

unpackId :: forall (model :: Symbol). Id' model -> PrimaryKey model Source #

Unwraps a Id value into an UUID

>>> unpackId ("296e5a50-b237-4ee9-83b0-17fb1e6f208f" :: Id User)
"296e5a50-b237-4ee9-83b0-17fb1e6f208f" :: UUID

recordToInputValue :: (HasField "id" entity (Id entity), Show (PrimaryKey (GetTableName entity))) => entity -> Text Source #

packId :: forall (model :: Symbol). PrimaryKey model -> Id' model Source #

Turns an UUID into a Id type

let uuid :: UUID = "5240e79c-97ff-4a5f-8567-84112541aaba"
let userId :: Id User = packId uuid

data LabeledData a b Source #

Record type for objects of model types labeled with values from different database tables. (e.g. comments labeled with the IDs of the posts they belong to).

Constructors

LabeledData 

Fields

Instances

Instances details
(Show a, Show b) => Show (LabeledData a b) Source # 
Instance details

Defined in IHP.ModelSupport

Methods

showsPrec :: Int -> LabeledData a b -> ShowS #

show :: LabeledData a b -> String

showList :: [LabeledData a b] -> ShowS #

(FromField label, FromRow a) => FromRow (LabeledData label a) Source # 
Instance details

Defined in IHP.ModelSupport

Methods

fromRow :: RowParser (LabeledData label a)

class ParsePrimaryKey primaryKey where Source #

Methods

parsePrimaryKey :: Text -> Maybe primaryKey Source #

Instances

Instances details
ParsePrimaryKey Text Source # 
Instance details

Defined in IHP.ModelSupport

ParsePrimaryKey UUID Source # 
Instance details

Defined in IHP.ModelSupport

textToId :: forall (model :: Symbol) text. (HasCallStack, ParsePrimaryKey (PrimaryKey model), ConvertibleStrings text Text) => text -> Id' model Source #

Transforms a text, bytestring or string into an Id. Throws an exception if the input is invalid.

Example:

let projectIdText = "7cbc76e2-1c4f-49b6-a7d9-5015e7575a9b" :: Text
let projectId = (textToId projectIdText) :: Id Project

In case your UUID value is hardcoded, there is also an IsString instance, so you can just write it like:

let projectId = "ca63aace-af4b-4e6c-bcfa-76ca061dbdc6" :: Id Project

measureTimeIfLogging :: (?modelContext :: ModelContext, ToRow q) => IO a -> Query -> q -> IO a Source #

Measure and log the query time for a given query action if the log level is Debug. If the log level is greater than debug, just perform the query action without measuring time.

logQuery :: (?modelContext :: ModelContext, ToRow parameters) => Query -> parameters -> NominalDiffTime -> IO () Source #

withDatabaseConnection :: (?modelContext :: ModelContext) => (Connection -> IO a) -> IO a Source #

enhanceSqlError :: ToRow parameters => Query -> parameters -> IO a -> IO a Source #

Catches SqlError and wraps them in EnhancedSqlError

withRLSParams :: (?modelContext :: ModelContext, ToRow params) => (Query -> [Action] -> result) -> Query -> params -> result Source #

Wraps the query with Row level security boilerplate, if a row level security context was provided

Example:

If a row level security context is given, this will turn a query like the following

withRLSParams runQuery "SELECT * FROM projects WHERE id = ?" (Only "..")

Into the following equivalent:

runQuery "SET LOCAL ROLE ?; SET LOCAL rls.ihp_user_id = ?; SELECT * FROM projects WHERE id = ?" ["ihp_authenticated", "<user id>", .."]

sqlQuerySingleRow :: (?modelContext :: ModelContext, ToRow query, FromRow record) => Query -> query -> IO record Source #

Runs a raw sql query, that is expected to return a single result row

Like sqlQuery, but useful when you expect only a single row as the result

Example:

user <- sqlQuerySingleRow "SELECT id, firstname, lastname FROM users WHERE id = ?" (Only user.id)

Take a look at IHP.QueryBuilder for a typesafe approach on building simple queries.

  • AutoRefresh:* When using sqlQuerySingleRow with AutoRefresh, you need to use trackTableRead to let AutoRefresh know that you have accessed a certain table. Otherwise AutoRefresh will not watch table of your custom sql query.

sqlExec :: (?modelContext :: ModelContext, ToRow q) => Query -> q -> IO Int64 Source #

Runs a sql statement (like a CREATE statement)

Example:

sqlExec "CREATE TABLE users ()" ()

sqlExecDiscardResult :: (?modelContext :: ModelContext, ToRow q) => Query -> q -> IO () Source #

Runs a sql statement (like a CREATE statement), but doesn't return any result

Example:

sqlExecDiscardResult "CREATE TABLE users ()" ()

sqlQueryScalarOrNothing :: (?modelContext :: ModelContext, ToRow q, FromField value) => Query -> q -> IO (Maybe value) Source #

Runs a raw sql query which results in a single scalar value such as an integer or string, or nothing

Example:

usersCount <- sqlQueryScalarOrNothing "SELECT COUNT(*) FROM users"

Take a look at IHP.QueryBuilder for a typesafe approach on building simple queries.

withTransactionConnection :: (?modelContext :: ModelContext) => ((?modelContext :: ModelContext) => IO a) -> IO a Source #

withRowLevelSecurityDisabled :: (?modelContext :: ModelContext) => ((?modelContext :: ModelContext) => IO a) -> IO a Source #

Executes the given block with the main database role and temporarly sidesteps the row level security policies.

This is used e.g. by IHP AutoRefresh to be able to set up it's database triggers. When trying to set up a database trigger from the ihp_authenticated role, it typically fails because it's missing permissions. Using withRowLevelSecurityDisabled we switch to the main role which is allowed to set up database triggers.

SQL queries run from within the passed block are executed in their own transaction.

Example:

-- SQL code executed here might be run from the ihp_authenticated role
withRowLevelSecurityDisabled do
   -- SQL code executed here is run as the main IHP db role
   sqlExec "CREATE OR REPLACE FUNCTION .." ()

transactionConnectionOrError :: (?modelContext :: ModelContext) => Connection Source #

Returns the postgres connection when called within a withTransaction block

Throws an error if called from outside a withTransaction

commitTransaction :: (?modelContext :: ModelContext) => IO () Source #

rollbackTransaction :: (?modelContext :: ModelContext) => IO () Source #

primaryKeyConditionColumnSelector :: Table record => ByteString Source #

Returns ByteString, that represents the part of an SQL where clause, that matches on a tuple consisting of all the primary keys For table with simple primary keys this simply returns the name of the primary key column, without wrapping in a tuple >>> primaryKeyColumnSelector PostTag "(post_tags.post_id, post_tags.tag_id)" >>> primaryKeyColumnSelector Post "post_tags.post_id"

primaryKeyCondition :: (HasField "id" record (Id record), Table record) => record -> Action Source #

Returns WHERE conditions to match an entity by it's primary key

For tables with a simple primary key this returns a tuple with the id:

>>> primaryKeyCondition project
Plain "d619f3cf-f355-4614-8a4c-e9ea4f301e39"

If the table has a composite primary key, this returns multiple elements:

>>> primaryKeyCondition postTag
Many [Plain "(", Plain "0ace9270-568f-4188-b237-3789aa520588", Plain ",", Plain "0b58fdf5-4bbb-4e57-a5b7-aa1c57148e1c", Plain ")"]

deleteRecordById :: forall record (table :: Symbol). (?modelContext :: ModelContext, Table record, Show (PrimaryKey table), GetTableName record ~ table, record ~ GetModelByTableName table) => Id' table -> IO () Source #

Like deleteRecord but using an Id

>>> let project :: Id Project = ...
>>> delete projectId
DELETE FROM projects WHERE id = '..'

deleteRecords :: forall record (table :: Symbol). (?modelContext :: ModelContext, Show (PrimaryKey table), Table record, HasField "id" record (Id' table), GetTableName record ~ table, record ~ GetModelByTableName table) => [record] -> IO () Source #

Runs a DELETE query for a list of records.

>>> let projects :: [Project] = ...
>>> deleteRecords projects
DELETE FROM projects WHERE id IN (..)

deleteRecordByIds :: forall record (table :: Symbol). (?modelContext :: ModelContext, Show (PrimaryKey table), Table record, GetTableName record ~ table, record ~ GetModelByTableName table) => [Id' table] -> IO () Source #

Like deleteRecordById but for a list of Ids.

>>> let projectIds :: [ Id Project ] = ...
>>> delete projectIds
DELETE FROM projects WHERE id IN ('..')

ids :: HasField "id" record id => [record] -> [id] Source #

Returns the ids for a list of models

Shorthand for map (.id) records.

>>> users <- query @User |> fetch
>>> ids users
[227fbba3-0578-4eb8-807d-b9b692c3644f, 9d7874f2-5343-429b-bcc4-8ee62a5a6895, ...] :: [Id User]

deleteAll :: (?modelContext :: ModelContext, Table record) => IO () Source #

Runs a DELETE query to delete all rows in a table.

>>> deleteAll @Project
DELETE FROM projects

type family Include' (name :: [Symbol]) model where ... Source #

Equations

Include' ('[] :: [Symbol]) model = model 
Include' (x ': xs) model = Include' xs (Include x model) 

didChangeRecord :: HasField "meta" record MetaBag => record -> Bool Source #

Returns True if any fields of the record have unsaved changes

Example: Returns False for freshly fetched records

>>> let projectId = "227fbba3-0578-4eb8-807d-b9b692c3644f" :: Id Project
>>> project <- fetch projectId
>>> didChangeRecord project
False

Example: Returns True after setting a field

>>> let projectId = "227fbba3-0578-4eb8-807d-b9b692c3644f" :: Id Project
>>> project <- fetch projectId
>>> project |> set #name "New Name" |> didChangeRecord
True

didChange :: forall (fieldName :: Symbol) fieldValue record. (KnownSymbol fieldName, HasField fieldName record fieldValue, HasField "meta" record MetaBag, Eq fieldValue, Typeable record) => Proxy fieldName -> record -> Bool Source #

Returns True if the specific field of the record has unsaved changes

Example: Returns False for freshly fetched records

>>> let projectId = "227fbba3-0578-4eb8-807d-b9b692c3644f" :: Id Project
>>> project <- fetch projectId
>>> didChange #name project
False

Example: Returns True after setting a field

>>> let projectId = "227fbba3-0578-4eb8-807d-b9b692c3644f" :: Id Project
>>> project <- fetch projectId
>>> project |> set #name "New Name" |> didChange #name
True

Example: Setting a flash message after updating the profile picture

when (user |> didChange #profilePictureUrl) (setSuccessMessage "Your Profile Picture has been updated. It might take a few minutes until it shows up everywhere")

fieldWithDefault :: forall (name :: Symbol) model value. (KnownSymbol name, HasField name model value, HasField "meta" model MetaBag) => Proxy name -> model -> FieldWithDefault value Source #

Construct a FieldWithDefault

Use the default SQL value when the field hasn't been touched since the record was created. This information is stored in the touchedFields attribute of the meta field.

data FieldWithUpdate (name :: k) value Source #

Represents fields that may have been updated

The NoUpdate constructor represents the existing value in the database, while the Update constructor holds some new value for the field

Constructors

NoUpdate (Proxy name) 
Update value 

Instances

Instances details
Show value => Show (FieldWithUpdate name value) Source # 
Instance details

Defined in IHP.ModelSupport

Methods

showsPrec :: Int -> FieldWithUpdate name value -> ShowS #

show :: FieldWithUpdate name value -> String

showList :: [FieldWithUpdate name value] -> ShowS #

Eq value => Eq (FieldWithUpdate name value) Source # 
Instance details

Defined in IHP.ModelSupport

Methods

(==) :: FieldWithUpdate name value -> FieldWithUpdate name value -> Bool #

(/=) :: FieldWithUpdate name value -> FieldWithUpdate name value -> Bool #

(KnownSymbol name, ToField value) => ToField (FieldWithUpdate name value) Source # 
Instance details

Defined in IHP.ModelSupport

Methods

toField :: FieldWithUpdate name value -> Action

fieldWithUpdate :: forall (name :: Symbol) model value. (KnownSymbol name, HasField name model value, HasField "meta" model MetaBag) => Proxy name -> model -> FieldWithUpdate name value Source #

Construct a FieldWithUpdate

Use the current database value when the field hasn't been touched since the record was accessed. This information is stored in the touchedFields attribute of the meta field.

data EnhancedSqlError Source #

Whenever calls to query or execute raise an SqlError exception, we wrap that exception in this data structure. This allows us to show the actual database query that has triggered the error.

Constructors

EnhancedSqlError 

Fields

trackTableRead :: (?modelContext :: ModelContext) => ByteString -> IO () Source #

Useful to manually mark a table read when doing a custom sql query inside AutoRefresh or withTableReadTracker.

When using fetch on a query builder, this function is automatically called. That's why you only need to call it yourself when using sqlQuery to run a custom query.

Example:

action MyAction = autoRefresh do
    users <- sqlQuery "SELECT * FROM users WHERE .."
    trackTableRead "users"

    render MyView { .. }

withTableReadTracker :: (?modelContext :: ModelContext) => ((?modelContext :: ModelContext, ?touchedTables :: IORef (Set ByteString)) => IO ()) -> IO () Source #

Track all tables in SELECT queries executed within the given IO action.

You can read the touched tables by this function by accessing the variable ?touchedTables inside your given IO action.

Example:

withTableReadTracker do
    project <- query @Project |> fetchOne
    user <- query @User |> fetchOne

    tables <- readIORef ?touchedTables
    -- tables = Set.fromList ["projects", "users"]

onlyWhere :: forall record (fieldName :: Symbol) value. (KnownSymbol fieldName, HasField fieldName record value, Eq value) => Proxy fieldName -> value -> [record] -> [record] Source #

Shorthand filter function

In IHP code bases you often write filter functions such as these:

getUserPosts user posts =
    filter (\p -> p.userId == user.id) posts

This can be written in a shorter way using onlyWhere:

getUserPosts user posts =
    posts |> onlyWhere #userId user.id

Because the userId field is an Id, we can use onlyWhereReferences to make it even shorter:

getUserPosts user posts =
    posts |> onlyWhereReferences #userId user

If the Id field is nullable, we need to use onlyWhereReferencesMaybe:

getUserTasks user tasks =
    tasks |> onlyWhereReferencesMaybe #optionalUserId user

onlyWhereReferences :: forall record (fieldName :: Symbol) value referencedRecord. (KnownSymbol fieldName, HasField fieldName record value, Eq value, HasField "id" referencedRecord value) => Proxy fieldName -> referencedRecord -> [record] -> [record] Source #

Shorthand filter function for Id fields

In IHP code bases you often write filter functions such as these:

getUserPosts user posts =
    filter (\p -> p.userId == user.id) posts

This can be written in a shorter way using onlyWhereReferences:

getUserPosts user posts =
    posts |> onlyWhereReferences #userId user

If the Id field is nullable, we need to use onlyWhereReferencesMaybe:

getUserTasks user tasks =
    tasks |> onlyWhereReferencesMaybe #optionalUserId user

See onlyWhere for more details.

onlyWhereReferencesMaybe :: forall record (fieldName :: Symbol) value referencedRecord. (KnownSymbol fieldName, HasField fieldName record (Maybe value), Eq value, HasField "id" referencedRecord value) => Proxy fieldName -> referencedRecord -> [record] -> [record] Source #

Shorthand filter function for nullable Id fields

In IHP code bases you often write filter functions such as these:

getUserTasks user tasks =
    filter (\task -> task.optionalUserId == Just user.id) tasks

This can be written in a shorter way using onlyWhereReferencesMaybe:

getUserTasks user tasks =
    tasks |> onlyWhereReferencesMaybe #optionalUserId user

See onlyWhere for more details.

isValid :: HasField "meta" record MetaBag => record -> Bool Source #

Returns True when a record has no validation errors attached from a previous validation call

Example:

isValidProject :: Project -> Bool
isValidProject project =
    project
    |> validateField #name isNonEmpty
    |> isValid

copyRecord :: (Table record, SetField "id" record id, Default id, SetField "meta" record MetaBag) => record -> record Source #

Copies all the fields (except the id field) into a new record

Example: Duplicate a database record (except the primary key of course)

project <- fetch projectId
duplicatedProject <- createRecord (copyRecord project)

decT :: forall {k} (a :: k) (b :: k). (Typeable a, Typeable b) => Either ((a :~: b) -> Void) (a :~: b) #

eqT :: forall {k} (a :: k) (b :: k). (Typeable a, Typeable b) => Maybe (a :~: b) #

gcast :: forall {k} (a :: k) (b :: k) c. (Typeable a, Typeable b) => c a -> Maybe (c b) #

gcast1 :: forall {k1} {k2} c (t :: k2 -> k1) (t' :: k2 -> k1) (a :: k2). (Typeable t, Typeable t') => c (t a) -> Maybe (c (t' a)) #

gcast2 :: forall {k1} {k2} {k3} c (t :: k2 -> k3 -> k1) (t' :: k2 -> k3 -> k1) (a :: k2) (b :: k3). (Typeable t, Typeable t') => c (t a b) -> Maybe (c (t' a b)) #

hdecT :: forall {k1} {k2} (a :: k1) (b :: k2). (Typeable a, Typeable b) => Either ((a :~~: b) -> Void) (a :~~: b) #

heqT :: forall {k1} {k2} (a :: k1) (b :: k2). (Typeable a, Typeable b) => Maybe (a :~~: b) #

showsTypeRep :: TypeRep -> ShowS #

typeOf :: Typeable a => a -> TypeRep #

typeOf1 :: Typeable t => t a -> TypeRep #

typeOf2 :: Typeable t => t a b -> TypeRep #

typeOf3 :: Typeable t => t a b c -> TypeRep #

typeOf4 :: Typeable t => t a b c d -> TypeRep #

typeOf5 :: Typeable t => t a b c d e -> TypeRep #

typeOf6 :: Typeable t => t a b c d e f -> TypeRep #

typeOf7 :: Typeable t => t a b c d e f g -> TypeRep #

typeRep :: forall {k} proxy (a :: k). Typeable a => proxy a -> TypeRep #

typeRepFingerprint :: TypeRep -> Fingerprint #

rnfTyCon :: TyCon -> () #

trLiftedRep :: TypeRep LiftedRep #

tyConFingerprint :: TyCon -> Fingerprint #

fromConstr :: Data a => Constr -> a #

fromConstrB :: Data a => (forall d. Data d => d) -> Constr -> a #

fromConstrM :: (Monad m, Data a) => (forall d. Data d => m d) -> Constr -> m a #

mkRealConstr :: (Real a, Show a) => DataType -> a -> Constr #

type ConIndex = Int #

serializePoint :: Point -> Action #

data PGTimeInterval #

Instances

Instances details
Show PGTimeInterval 
Instance details

Defined in IHP.Postgres.TimeParser

Eq PGTimeInterval 
Instance details

Defined in IHP.Postgres.TimeParser

pClockTime :: Parser (Int, Int, Pico) #

seconds :: Parser Pico #

toPico :: Integer -> Pico #

newtype ConcurrentlyE e a #

Constructors

ConcurrentlyE 

Fields

Instances

Instances details
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 #

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 #

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 #

(Semigroup a, Monoid a) => Monoid (ConcurrentlyE e a) 
Instance details

Defined in Control.Concurrent.Async.Internal

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 #

cancelMany :: [Async a] -> IO () #

concurrentlyE :: IO (Either e a) -> IO (Either e b) -> IO (Either e (a, b)) #

link2Only :: (SomeException -> Bool) -> Async a -> Async b -> IO () #

linkOnly :: (SomeException -> Bool) -> Async a -> IO () #

data PageDotDot Source #

Constructors

Page Int 
DotDot Int 

passwordField :: forall (fieldName :: Symbol) model. (?formContext :: FormContext model, HasField fieldName model Text, HasField "meta" model MetaBag, KnownSymbol fieldName, KnownSymbol (GetModelName model)) => Proxy fieldName -> FormField Source #

Renders an password field

>>> {passwordField #password}
<div class="form-group" id="form-group-user_password">
    <label for="user_password">Password</label>
    <input type="password" name="password" id="user_password" class="form-control" />
</div>

See textField for examples of possible form control options.

attachValidatorResult :: forall (field :: Symbol) model. (KnownSymbol field, HasField "meta" model MetaBag, SetField "meta" model MetaBag) => Proxy field -> ValidatorResult -> model -> model Source #

attachFailure :: forall (field :: Symbol) model. (KnownSymbol field, HasField "meta" model MetaBag, SetField "meta" model MetaBag) => Proxy field -> Text -> model -> model Source #

Adds a plain-text validation error to a record

Example:

>>> record |> attachFailure #email "should be a valid email"
User { .., meta = MetaBag { .., annotations = [ ("email", TextViolation "should be a valid email") ] } }

You can use this together with getValidationFailure

user
    |> attachFailure #email "cannot be empty"
    |> getValidationFailure #email

--  Returns: Just "cannot be empty"

If your error message uses HTML code, use attachFailureHtml.

attachFailureHtml :: forall (field :: Symbol) model. (KnownSymbol field, HasField "meta" model MetaBag, SetField "meta" model MetaBag) => Proxy field -> Html -> model -> model Source #

Adds a validation error to a record. The error message can contain HTML code.

Example:

>>> record |> attachFailureHtml #email [hsx|should be a valid email. <a href="https://example.com/docs#email">Check out the documentation</a>|]
User { .., meta = MetaBag { .., annotations = [ ("email", HtmlViolation "should be a valid email. <a href="https://example.com/docs#email">Check out the documentation</a>") ] } }

You can use this together with getValidationViolation

user
    |> attachFailure #email "cannot be empty"
    |> getValidationViolation #email

--  Returns: Just (HtmlViolation "should be a valid email. <a href="https://example.com/docs#email">Check out the documentation</a>")

getValidationFailure :: forall (field :: Symbol) model. (KnownSymbol field, HasField "meta" model MetaBag) => Proxy field -> model -> Maybe Text Source #

Returns the validation failure for a field or Nothing

user
    |> attachFailure #email "cannot be empty"
    |> getValidationFailure #email

--  Returns: Just "cannot be empty"

When attachFailureHtml is used, this function will return HTML code:

user
    |> attachFailureHtml #url [hsx|Invalid value, check <a href="https://example.com">the documentation</a>|]
    |> getValidationFailure #url

--  Returns: Just "Invalid value, check <a href="https://example.com">the documentation</a>"

If you need to special-case validation errors with HTML code, use getValidationViolation

getValidationViolation :: forall (field :: Symbol) model. (KnownSymbol field, HasField "meta" model MetaBag) => Proxy field -> model -> Maybe Violation Source #

Similar to getValidationFailure, but exposes the information whether the error message contains HTML code

>>> user |> getValidationViolation #email
Just (TextViolation "cannot be empty")

type Validator valueType = valueType -> ValidatorResult Source #

A function taking some value and returning a ValidatorResult

>>> Validator Text
Text -> ValidatorResult
>>> Validator Int
Int -> ValidatorResult

validateField :: forall (field :: Symbol) fieldValue model. (KnownSymbol field, HasField field model fieldValue, HasField "meta" model MetaBag, SetField "meta" model MetaBag) => Proxy field -> Validator fieldValue -> model -> model Source #

Validates a record field using a given validator function.

When the validation fails, the validation error is saved inside the meta :: MetaBag field of the record. You can retrieve a possible validation error using getValidationFailure.

Example: nonEmpty validation for a record

let project :: Project = newRecord
project
    |> validateField #name nonEmpty
    |> getValidationFailure #name -- Just "This field cannot be empty"


project
    |> set #name "Hello World"
    |> validateField #name nonEmpty
    |> getValidationFailure #name -- Nothing

Example: Using ifValid for branching

let project :: Project = newRecord

project
    |> validateField #name nonEmpty
    |> ifValid \case
        Left project -> do
            putStrLn "Invalid project. Please try again"
        Right project -> do
            putStrLn "Project is valid. Saving to database."
            createRecord project

type ValidatorIO value = value -> IO ValidatorResult Source #

A function taking some value and returning a 'IO ValidatorResult'

>>> ValidatorIO Text
Text -> IO ValidatorResult
>>> ValidatorIO Int
Int -> IO ValidatorResult

validateFieldIO :: forall (field :: Symbol) model fieldValue. (?modelContext :: ModelContext, KnownSymbol field, HasField field model fieldValue, HasField "meta" model MetaBag, SetField "meta" model MetaBag) => Proxy field -> ValidatorIO fieldValue -> model -> IO model Source #

Validates a record field using a given validator function.

The same as validateField, but works with IO and can e.g. access the database.

When the validation fails, the validation error is saved inside the meta :: MetaBag field of the record. You can retrieve a possible validation error using getValidationFailure.

validateMaybe :: (val -> ValidatorResult) -> Maybe val -> ValidatorResult Source #

Validate a Maybe field.

Validate a Maybe field using a given validator function. >>> validateMaybe nonEmpty (Just "foo") Success

>>> validateMaybe nonEmpty (Just "")
Failure "This field cannot be empty"

If the value is Nothing, the validation will succeed. >>> validateMaybe nonEmpty Nothing Success

This function is useful when you want to validate a field that is optional. >>> buildPost :: Post -> Post >>> buildPost post = post >>> |> validateField #title nonEmpty >>> -- Assuming sourceUrl is optional. >>> |> validateField #sourceUrl (validateMaybe nonEmpty)

withCustomErrorMessage :: Text -> (value -> ValidatorResult) -> value -> ValidatorResult Source #

Overrides the error message of a given validator function.

>>> (nonEmpty |> withCustomErrorMessage "Custom error message") ""
Failure "Custom error message"
>>> (isEmail |> withCustomErrorMessage "We only accept valid email addresses") "not valid email"
Failure "We only accept valid email addresses"

validateAny :: [value -> ValidatorResult] -> value -> ValidatorResult Source #

Validates that value passes at least one of the given validators

>>> "ihp@example.com" |> validateAny([isEmptyValue, isEmail])
Success
>>> "" |> validateAny([isEmptyValue, isEmail])
Success
>>> "no spam plz" |> validateAny([empty, isEmail])
Failure "did not pass any validators"

validateAll :: [value -> ValidatorResult] -> value -> ValidatorResult Source #

Validates that value passes all of the given validators

In case of multiple failures, the first Failure is returned.

>>> 2016 |> validateAll([isGreaterThan(1900), isLessThan(2020)])
Success
>>> 1899 |> validateAll([isGreaterThan(1900), isLessThan(2020)])
Failure "has to be greater than 1900"

isPhoneNumber :: Text -> ValidatorResult Source #

Validates that value looks like a phone number

Values needs to start with + and has to have atleast 5 characters

>>> isPhoneNumber "1337"
Failure ".."
>>> isPhoneNumber "+49123456789"
Success

isEmail :: Text -> ValidatorResult Source #

Validates that value is an email address

The validation is not meant to be compliant with RFC 822. Its purpose is to reject obviously invalid values without false-negatives.

>>> isEmail "marc@digitallyinduced.com"
Success
>>> isEmail "marc@secret.digitallyinduced.com" -- subdomains are fine
Success
>>> isEmail "ॐ@मणिपद्मे.हूँ"
Success
>>> isEmail "marc@localhost" -- Although discouraged by ICANN, dotless TLDs are legal. See https://www.icann.org/news/announcement-2013-08-30-en
Success
>>> isEmail "loremipsum"
Failure "is not a valid email"
>>> isEmail "A@b@c@domain.com"
Failure "is not a valid email"

isInRange :: (Show value, Ord value) => (value, value) -> value -> ValidatorResult Source #

Validates that value is between min and max

>>> isInRange (0, 10) 5
Success
>>> isInRange (0, 10) 0
Success
>>> isInRange (0, 10) 1337
Failure "has to be between 0 and 10"
>>> let isHumanAge = isInRange (0, 100)
>>> isHumanAge 22
Success

isLessThan :: (Show value, Ord value) => value -> value -> ValidatorResult Source #

Validates that value is less than a max value

>>> isLessThan 10 5
Success
>>> isLessThan 10 20
Failure "has to be less than 10"

isGreaterThan :: (Show value, Ord value) => value -> value -> ValidatorResult Source #

Validates that value is greater than a min value

>>> isGreaterThan 10 20
Success
>>> isGreaterThan 10 5
Failure "has to be greater than 10"

isEqual :: (Show value, Eq value) => value -> value -> ValidatorResult Source #

Validates that value is equal to another value

>>> isEqual "foo" "foo"
Success
>>> isEqual "foo" "bar"
Failure "has to be equal to \"foo\""

hasMaxLength :: Int -> Text -> ValidatorResult Source #

Validates that value has a max length

>>> hasMaxLength 10 "IHP"
Success
>>> hasMaxLength 2 "IHP"
Failure "is longer than 2 characters"

hasMinLength :: Int -> Text -> ValidatorResult Source #

Validates that value has a min length

>>> hasMinLength 2 "IHP"
Success
>>> hasMinLength 10 "IHP"
Failure "is shorter than 10 characters"

isRgbHexColor :: Text -> ValidatorResult Source #

Validates that value is a hex-based rgb color string

>>> isRgbHexColor "#ffffff"
Success
>>> isRgbHexColor "#fff"
Success
>>> isRgbHexColor "rgb(0, 0, 0)"
Failure "is not a valid rgb hex color"

isRgbaHexColor :: Text -> ValidatorResult Source #

Validates that value is a hex-based rgb color string

>>> isRgbaHexColor "#ffffffff"
Success
>>> isRgbaHexColor "#ffff"
Success
>>> isRgbaHexColor "rgb(0, 0, 0, 1)"
Failure "is not a valid rgba hex color"

isHexColor :: Text -> ValidatorResult Source #

Validates that value is a hex-based rgb(a) color string

>>> isHexColor "#ffffff"
Success
>>> isHexColor "#ffffffff"
Success
>>> isHexColor "rgb(0, 0, 0)"
Failure "is not a valid hex color"

isRgbColor :: Text -> ValidatorResult Source #

Validates that value is a rgb() color string

>>> isRgbColor "rgb(255, 0, 0)"
Success
>>> isRgbColor "#f00"
Failure "is not a valid rgb() color"

isRgbaColor :: Text -> ValidatorResult Source #

Validates that value is a rgba() color string

>>> isRgbaColor "rgb(255, 0, 0, 1.0)"
Success
>>> isRgbaColor "#f00f"
Failure "is not a valid rgba() color"

isColor :: Text -> ValidatorResult Source #

Validates that value is a hex-based or rgb(a) color string

>>> isColor "#ffffff"
Success
>>> isColor "rgba(255, 0, 0, 0.5)"
Success
>>> isColor "rgb(0, 0, 0)"
Failure "is not a valid color"

isUrl :: Text -> ValidatorResult Source #

Validates string starts with http:// or https://

>>> isUrl "https://digitallyinduced.com"
Success
>>> isUrl "digitallyinduced.com"
Failure "URL must start with http:// or https://"

isInList :: (Eq value, Show value) => [value] -> value -> ValidatorResult Source #

isTrue :: Bool -> ValidatorResult Source #

Validates that value is True

>>> isTrue True
Success
>>> isTrue False
Failure "This field cannot be false"

isFalse :: Bool -> ValidatorResult Source #

Validates that value is False

>>> isFalse False
Success
>>> isFalse True
Failure "This field cannot be true"

matchesRegex :: Text -> Text -> ValidatorResult Source #

Validates that value is matched by the regular expression

>>> matchesRegex "^[0-9]{4}$" "2016"
Success
>>> matchesRegex "^[0-9]{4}$" "16"
Failure "This field does not match the regular expression \"^[0-9]{4}$\""
>>> matchesRegex "[0-9]{4}" "xx2016xx"
Success -- regex is missing ^ and $

isSlug :: Text -> ValidatorResult Source #

Validates that value is a valid slug

>>> isSlug "i-am-a-slug"
Success
>>> isSlug "I-AM-A-Slug (Copy)"
Failure "is not a valid slug (consisting of only letters, numbers, underscores or hyphens)"

validationResult :: forall (fieldName :: Symbol) model fieldType. (?formContext :: FormContext model, HasField fieldName model fieldType, HasField "meta" model MetaBag, KnownSymbol fieldName, InputValue fieldType, KnownSymbol (GetModelName model)) => Proxy fieldName -> Html Source #

Renders a validation failure for a field. If the field passed all validation, no error is shown.

>>> {validationResult #email}
<div class="invalid-feedback">is not a valid email</div>

newtype AppPort Source #

Constructors

AppPort Int 

Instances

Instances details
EnvVarReader AppPort Source # 
Instance details

Defined in IHP.FrameworkConfig

newtype BaseUrl Source #

Constructors

BaseUrl Text 

newtype RequestLoggerMiddleware Source #

Provides IHP with a middleware to log requests and responses.

By default this uses the RequestLogger middleware from wai-extra. Take a look at the wai-extra documentation when you want to customize the request logging.

See https://hackage.haskell.org/package/wai-extra-3.0.29.2/docs/Network-Wai-Middleware-RequestLogger.html

Set requestLoggerMiddleware = application -> application to disable request logging.

Constructors

RequestLoggerMiddleware Middleware 

newtype SessionCookie Source #

Provides the default settings for the session cookie.

  • Max Age: 30 days
  • Same Site Policy: Lax
  • HttpOnly (no access through JS)
  • secure, when baseUrl is a https url

Override this to set e.g. a custom max age or change the default same site policy.

Example: Set max age to 90 days > sessionCookie = defaultIHPSessionCookie { Cookie.setCookieMaxAge = Just (fromIntegral (60 * 60 * 24 * 90)) }

Constructors

SessionCookie SetCookie 

newtype DBPoolIdleTime Source #

How long db connection are kept alive inside the connecton pool when they're idle

newtype DBPoolMaxConnections Source #

Max number of db connections the connection pool can open to the database

newtype IdeBaseUrl Source #

Typically "http://localhost:8001", Url where the IDE is running

Constructors

IdeBaseUrl Text 

newtype RLSAuthenticatedRole Source #

Postgres role to be used for making queries with Row level security enabled

newtype CustomMiddleware Source #

Constructors

CustomMiddleware Middleware 

newtype Initializer Source #

Constructors

Initializer 

Fields

addInitializer :: ((?context :: FrameworkConfig, ?modelContext :: ModelContext) => IO ()) -> StateT TMap IO () Source #

Adds a callback to be run during startup of the app server

The follwoing example will print a hello world message on startup:

config = do
    addInitializer (putStrLn "Hello World!")

findOptionOrNothing :: Typeable option => StateT TMap IO (Maybe option) Source #

findOption :: Typeable option => StateT TMap IO option Source #

configIO :: (MonadIO monad, HasCallStack) => IO result -> monad result Source #

Runs IO inside the config process

It works like liftIO, but attaches a CallStack on error. Without this it would be hard to see where an error during the config setup comes from.

All call-sites of this function should also have a HasCallStack constraint to provide helpful information in the call stack.

See https://github.com/digitallyinduced/ihp/issues/1503

defaultCorsResourcePolicy :: Maybe CorsResourcePolicy Source #

defaultIHPSessionCookie :: Text -> SetCookie Source #

Returns the default IHP session cookie configuration. Useful when you want to override the default settings in sessionCookie

data RootApplication Source #

Constructors

RootApplication 

Instances

Instances details
Show RootApplication Source # 
Instance details

Defined in IHP.FrameworkConfig

Eq RootApplication Source # 
Instance details

Defined in IHP.FrameworkConfig

isEnvironment :: (?context :: context, ConfigProvider context) => Environment -> Bool Source #

isDevelopment :: (?context :: context, ConfigProvider context) => Bool Source #

Returns True when the application is running in Development mode

Development mode means that the Development option is configured in Config/Config.hs

isProduction :: (?context :: context, ConfigProvider context) => Bool Source #

Returns True when the application is running in Production mode

Production mode means that the Production option is configured in Config/Config.hs

withFrameworkConfig :: ConfigBuilder -> (FrameworkConfig -> IO result) -> IO result Source #

Builds a config and calls the provided callback.

Once the callback has returned the resources allocated by the config are closed. Specifcally this will close open log file handles.

Example:

import Config (config)

withFrameworkConfig config \frameworkConfig -> do
    -- Do something with the FrameworkConfig here

unfreeze :: ControllerContext -> IO ControllerContext Source #

Returns a unfrozen version of the controller context that can be modified again

This is used together with freeze by e.g. AutoRefresh to make a immutable copy of the current controller context state

fromContext :: (?context :: ControllerContext, Typeable value) => IO value Source #

Returns a value from the current controller context

Throws an exception if the there is no value with the type inside the context

Example: Read the current user from the context

>>> user <- fromContext @User

maybeFromContext :: (?context :: ControllerContext, Typeable value) => IO (Maybe value) Source #

fromFrozenContext :: (?context :: ControllerContext, Typeable value) => value Source #

Returns a value from the current controller context. Requires the context to be frozen.

Example: Read the current user from the context

>>> let user = fromFrozenContext @User

putContext :: (?context :: ControllerContext, Typeable value) => value -> IO () Source #

Puts a value into the context

Throws an exception if the context is already frozen.

newtype ActionType Source #

Constructors

ActionType TypeRep 

class ModelFormAction record where Source #

Returns the form's action attribute for a given record.

Methods

modelFormAction :: record -> Text Source #

Instances

Instances details
(HasField "id" record (Id' (GetTableName record)), HasField "meta" record MetaBag, KnownSymbol (GetModelName record), Show (Id' (GetTableName record))) => ModelFormAction record Source # 
Instance details

Defined in IHP.View.Form

Methods

modelFormAction :: record -> Text Source #

formForWithOptions :: (?context :: ControllerContext, ModelFormAction record, HasField "meta" record MetaBag) => record -> (FormContext record -> FormContext record) -> ((?context :: ControllerContext, ?formContext :: FormContext record) => Html) -> Html Source #

Like formFor but allows changing the underlying FormContext

This is how you can render a form with a id="post-form" id attribute and a custom data-post-id attribute:

renderForm :: Post -> Html
renderForm post = formForWithOptions formOptions post [hsx|
    {textField #title}
    {textareaField #body}
    {submitButton}
|]

formOptions :: FormContext Post -> FormContext Post
formOptions formContext = formContext
    |> set #formId "post-form"
    |> set #customFormAttributes [("data-post-id", show formContext.model.id)]

buildForm :: (?context :: ControllerContext) => FormContext model -> ((?context :: ControllerContext, ?formContext :: FormContext model) => Html) -> Html Source #

Used by formFor to render the form

createFormContext :: (?context :: ControllerContext, HasField "meta" record MetaBag) => record -> FormContext record Source #

Used by formFor to make a new form context

formForWithoutJavascript :: (?context :: ControllerContext, ModelFormAction record, HasField "meta" record MetaBag) => record -> ((?context :: ControllerContext, ?formContext :: FormContext record) => Html) -> Html Source #

Like formFor but disables the IHP javascript helpers.

Use it like this:

renderForm :: Post -> Html
renderForm post = formForWithoutJavascript post [hsx|
    {textField #title}
    {textareaField #body}
    {submitButton}
|]

If you want to use this with e.g. a custom form action, remember that formForWithoutJavascript is just a shortcut for formForWithOptions:

renderForm :: Post -> Html
renderForm post = formForWithOptions formOptions post [hsx|
    {textField #title}
    {textareaField #body}
    {submitButton}
|]

formOptions :: FormContext Post -> FormContext Post
formOptions formContext = formContext
    |> set #formAction (pathTo BespokeNewPostAction)
    |> set #disableJavascriptSubmission True

formFor' :: (?context :: ControllerContext, HasField "meta" record MetaBag) => record -> Text -> ((?context :: ControllerContext, ?formContext :: FormContext record) => Html) -> Html Source #

Allows a custom form action (form submission url) to be set

The URL where the form is going to be submitted to is specified in HTML using the form's action attribute. When using formFor the action attribute is automatically set to the expected path.

E.g. given the below formFor code, the action is set to /CreatePost or /UpdatePost:

renderForm :: Post -> Html
renderForm post = formFor post [hsx|
    {textField #title}
    {textareaField #body}
    {submitButton}
|]

To override the auto-generated action attribute use the 'formFor'' function:

renderForm :: Post -> Html
renderForm post = formFor' post "/my-custom-endpoint" [hsx||]

If you pass an action to that, you need to wrap it with pathTo:

renderForm :: Post -> Html
renderForm post = formFor' post (pathTo CreateDraftAction) [hsx||]

nestedFormFor :: forall (fieldName :: Symbol) childRecord parentRecord idType. (?context :: ControllerContext, ?formContext :: FormContext parentRecord, HasField fieldName parentRecord [childRecord], KnownSymbol fieldName, KnownSymbol (GetModelName childRecord), HasField "id" childRecord idType, InputValue idType, HasField "meta" childRecord MetaBag) => Proxy fieldName -> ((?context :: ControllerContext, ?formContext :: FormContext childRecord) => Html) -> Html Source #

submitButton :: (?formContext :: FormContext model, HasField "meta" model MetaBag, KnownSymbol (GetModelName model)) => SubmitButton Source #

Renders a submit button

<button class="btn btn-primary">Create Post</button>

Example:

renderForm :: Post -> Html
renderForm post = formFor post [hsx|
    {submitButton}
|]

This will generate code like this:

<form method="POST" action="/CreatePost" id="" class="new-form">
    <button class="btn btn-primary">Create Post</button>
</form>

Custom Text

renderForm :: Post -> Html
renderForm post = formFor post [hsx|
    {submitButton { label = "Create it!" } }
|]

This will generate code like this:

<form method="POST" action="/CreatePost" id="" class="new-form">
    <button class="btn btn-primary">Create it!</button>
</form>

Custom Class

renderForm :: Post -> Html
renderForm post = formFor post [hsx|
    {submitButton { buttonClass = "create-button" } }
|]

This will generate code like this:

<form method="POST" action="/CreatePost" id="" class="new-form">
    <button class="btn btn-primary create-button">Create Post</button>
</form>

Disabled button

renderForm :: Post -> Html
renderForm post = formFor post [hsx|
    {submitButton { buttonDisabled = True } }
|]

This will generate code like this:

<form method="POST" action="/CreatePost" id="" class="new-form">
    <button class="btn btn-primary create-button" disabled="disabled">Create Post</button>
</form>

textField :: forall (fieldName :: Symbol) model value. (?formContext :: FormContext model, HasField fieldName model value, HasField "meta" model MetaBag, KnownSymbol fieldName, InputValue value, KnownSymbol (GetModelName model)) => Proxy fieldName -> FormField Source #

Renders a text input field

>>> {textField #title}
<div class="form-group" id="form-group-post_title">
    <label for="post_title">Title</label>
    <input type="text" name="title" id="post_title" class="form-control" />
</div>

Example:

renderForm :: Post -> Html
renderForm post = formFor post [hsx|
    {textField #title}
|]

This will generate code like this:

<form method="POST" action="/CreatePost" id="" class="new-form">
    <div class="form-group" id="form-group-post_title">
        <label for="post_title">Title</label>
        <input type="text" name="title" id="post_title" class="form-control" />
    </div>
</form>

Help Texts:

You can add a help text below a form control like this:

{(textField #title) { helpText = "Max. 140 characters"} }

This will generate code like this:

<div class="form-group" id="form-group-post_title">
    <label for="post_title">Title</label>

    <input type="text" name="title" id="post_title" class="form-control" />
    <small class="form-text text-muted">Max. 140 characters</small>
</div>

Custom Field Label Text:

By default, the field name will be used as a label text. The camel case field name will be made more human-readable of course, so contactName will turn to Contact Name, etc. Sometimes you want to change this auto-generated input label to something custom. Use fieldLabel for that, like this:

{(textField #title) { fieldLabel = "Post Title"} }

This will generate code like this:

<div class="form-group" id="form-group-post_title">
    <label for="post_title">Post Title</label>
    <input type="text" name="title" id="post_title" class="form-control" />
</div>

Custom CSS Classes:

You can add custom CSS classes to the input and label for better styling. Set fieldClass for adding a class to the input element and labelClass for the label element:

{(textField #title) { fieldClass="title-input", labelClass = "title-label" } }

This will generate code like this:

<div class="form-group" id="form-group-post_title">
    <label class="title-label" for="post_title">Title</label>
    <input
        type="text"
        name="title"
        id="post_title"
        class="form-control title-input"
    />
</div>

Of course, the CSS classes for validation are still set as expected.

Placeholder:

{(textField #title) { placeholder = "Enter your title ..." } }

This will generate code like this:

<div class="form-group" id="form-group-post_title">
    <label for="post_title">Title</label>

    <input
        type="text"
        name="title"
        id="post_title"
        placeholder="Enter your title ..."
        class="form-control"
    />
</div>

Required Fields:

You can mark an input as required like this:

{(textField #title) { required = True } }

This will generate code like this:

<div class="form-group" id="form-group-post_title">
    <label for="post_title">Title</label>

    <input
        type="text"
        name="title"
        id="post_title"
        required="required"
        class="form-control"
    />
</div>

Autofocus:

You can mark an input with autofocus, to ensure it will be given the input focus on page load, like this:

{(textField #title) { autofocus = True } }

This will generate code like this:

<div class="form-group" id="form-group-post_title">
    <label for="post_title">Title</label>

    <input
        type="text"
        name="title"
        id="post_title"
        autofocus="autofocus"
        class="form-control"
    />
</div>

numberField :: forall (fieldName :: Symbol) model value. (?formContext :: FormContext model, HasField fieldName model value, HasField "meta" model MetaBag, KnownSymbol fieldName, InputValue value, KnownSymbol (GetModelName model)) => Proxy fieldName -> FormField Source #

Renders a number input field

>>> {numberField #maxUsers}
<div class="form-group" id="form-group-company_max_users">
    <label for="company_max_users">Max Users</label>
    <input type="number" name="maxUsers" id="company_maxUsers" class="form-control" />
</div>

See textField for examples of possible form control options.

urlField :: forall (fieldName :: Symbol) model value. (?formContext :: FormContext model, HasField fieldName model value, HasField "meta" model MetaBag, KnownSymbol fieldName, InputValue value, KnownSymbol (GetModelName model)) => Proxy fieldName -> FormField Source #

Renders a URL input field

>>> {urlField #url}
<div class="form-group" id="form-group-company_url">
    <label for="company_url">Url</label>
    <input type="url" name="url" id="company_url" class="form-control" />
</div>

See textField for examples of possible form control options.

textareaField :: forall (fieldName :: Symbol) model value. (?formContext :: FormContext model, HasField fieldName model value, HasField "meta" model MetaBag, KnownSymbol fieldName, InputValue value, KnownSymbol (GetModelName model)) => Proxy fieldName -> FormField Source #

Renders a textarea

>>> {textareaField #body}
<div class="form-group" id="form-group-post_body">
    <label for="post_body">Body</label>
    <textarea name="body" id="post_body" class="form-control" />
</div>

See textField for examples of possible form control options.

colorField :: forall (fieldName :: Symbol) model value. (?formContext :: FormContext model, HasField fieldName model value, HasField "meta" model MetaBag, KnownSymbol fieldName, InputValue value, KnownSymbol (GetModelName model)) => Proxy fieldName -> FormField Source #

Renders a color field

>>> {colorField #color}
<div class="form-group" id="form-group-post_color">
    <label for="post_color">Color</label>
    <input type="color" name="color" id="post_color" class="form-control" />
</div>

See textField for examples of possible form control options.

emailField :: forall (fieldName :: Symbol) model value. (?formContext :: FormContext model, HasField fieldName model value, HasField "meta" model MetaBag, KnownSymbol fieldName, KnownSymbol (GetModelName model), InputValue value) => Proxy fieldName -> FormField Source #

Renders an email field

>>> {emailField #email}
<div class="form-group" id="form-group-user_email">
    <label for="user_email">Email</label>
    <input type="email" name="email" id="user_email" class="form-control" />
</div>

See textField for examples of possible form control options.

dateField :: forall (fieldName :: Symbol) model value. (?formContext :: FormContext model, HasField fieldName model value, HasField "meta" model MetaBag, KnownSymbol fieldName, InputValue value, KnownSymbol (GetModelName model)) => Proxy fieldName -> FormField Source #

Renders an date field

>>> {dateField #createdAt}
<div class="form-group" id="form-group-user_created_at">
    <label for="user_createdAt">Created At</label>
    <input type="date" name="createdAt" id="user_createdAt" class="form-control" />
</div>

See textField for examples of possible form control options.

dateTimeField :: forall (fieldName :: Symbol) model value. (?formContext :: FormContext model, HasField fieldName model value, HasField "meta" model MetaBag, KnownSymbol fieldName, InputValue value, KnownSymbol (GetModelName model)) => Proxy fieldName -> FormField Source #

Renders an date-time field

>>> {dateTimeField #createdAt}
<div class="form-group" id="form-group-user_created_at">
    <label for="user_createdAt">Created At</label>
    <input type="datetime-local" name="createdAt" id="user_createdAt" class="form-control" />
</div>

See textField for examples of possible form control options.

hiddenField :: forall (fieldName :: Symbol) model value. (?formContext :: FormContext model, HasField fieldName model value, HasField "meta" model MetaBag, KnownSymbol fieldName, InputValue value, KnownSymbol (GetModelName model)) => Proxy fieldName -> FormField Source #

Renders an hidden field

>>> {hiddenField #projectId}
<input type="hidden" name="projectId" id="checkoutSession_projectId" class="form-control" />

The hidden field is by default rendered without a form group and without a label.

fileField :: forall (fieldName :: Symbol) model value. (?formContext :: FormContext model, HasField fieldName model value, HasField "meta" model MetaBag, KnownSymbol fieldName, InputValue value, KnownSymbol (GetModelName model)) => Proxy fieldName -> FormField Source #

Renders an file field

>>> {fileField #profilePicture}
<input type="file" name="profilePicture" id="user_profilePicture" class="form-control" />

See textField for examples of possible form control options.

checkboxField :: forall (fieldName :: Symbol) model. (?formContext :: FormContext model, HasField fieldName model Bool, HasField "meta" model MetaBag, KnownSymbol fieldName, KnownSymbol (GetModelName model)) => Proxy fieldName -> FormField Source #

Renders a checkbox field

>>> {checkboxField #active}
<div class="form-group" id="form-group-user_active">
    <label for="user_active">Active</label>
    <input type="checkbox" name="active" id="user_active" class="form-control" />
</div>

See textField for examples of possible form control options.

selectField :: forall (fieldName :: Symbol) model item. (?formContext :: FormContext model, HasField fieldName model (SelectValue item), HasField "meta" model MetaBag, KnownSymbol fieldName, KnownSymbol (GetModelName model), CanSelect item, InputValue (SelectValue item), Typeable model, Eq (SelectValue item)) => Proxy fieldName -> [item] -> FormField Source #

Select inputs require you to pass a list of possible values to select.

formFor project [hsx|
    {selectField #userId users}
|]

In the example above the variable users contains all the possible option values for the select.

You also need to define a instance CanSelect User:

instance CanSelect User where
    -- Here we specify that the <option> value should contain a `Id User`
    type SelectValue User = Id User
    -- Here we specify how to transform the model into <option>-value
    selectValue user = user.id
    -- And here we specify the <option>-text
    selectLabel user = user.name

Given the above example, the rendered form will look like this:

<!-- Assuming: users = [User { id = 1, name = "Marc" }, User { id = 2, name = "Andreas" }] -->
<form ...>
    <select name="user_id">
        <option value="1">Marc</option>
        <option value="2">Andreas</option>
    </select>
</form>

If you want a certain value to be preselected, set the value in the controller. For example, to have the first user be preselected in the above example:

action NewProjectAction = do
    users <- query @User |> fetch
    let userId = headMay users |> maybe def (.id)
    let target = newRecord @Project |> set #userId userId
    render NewView { .. }

class CanSelect model where Source #

Minimal complete definition

Nothing

Associated Types

type SelectValue model Source #

Here we specify the type of the option value, usually an Id model

Methods

selectLabel :: model -> Text Source #

Here we specify the option-text

default selectLabel :: Show model => model -> Text Source #

selectValue :: model -> SelectValue model Source #

Here we specify how to transform the model into option-value

default selectValue :: HasField "id" model (SelectValue model) => model -> SelectValue model Source #

type family SelectValue model Source #

Here we specify the type of the option value, usually an Id model

radioField :: forall (fieldName :: Symbol) model item. (?formContext :: FormContext model, HasField fieldName model (SelectValue item), HasField "meta" model MetaBag, KnownSymbol fieldName, KnownSymbol (GetModelName model), CanSelect item, InputValue (SelectValue item), Typeable model, Eq (SelectValue item)) => Proxy fieldName -> [item] -> FormField Source #

Radio require you to pass a list of possible values to select. We use the same mechanism as for for selectField.

formFor project [hsx|
    {radioField #userId users}
|]

In the example above the variable users contains all the possible option values for the radios.

You also need to define a instance CanSelect User:

instance CanSelect User where
    -- Here we specify that the <option> value should contain a `Id User`
    type SelectValue User = Id User
    -- Here we specify how to transform the model into <option>-value
    selectValue user = user.id
    -- And here we specify the <option>-text
    selectLabel user = user.name

Given the above example, the rendered form will look like this (omitting classes for brevity):

<!-- Assuming: users = [User { id = 1, name = "Marc" }, User { id = 2, name = "Andreas" }] -->
<form ...>
    <fieldset>
        <div>
          <input type="radio" id="option1" value="1"/>
          <label for="option1">Marc</label>
        </div>
        <div>
          <input type="radio" id="option2" value="2"/>
          <label for="option2">Andreas</label>
        </div>
    </fieldset>
</form>

If you want a certain value to be preselected, set the value in the controller. For example, to have the first user be preselected in the above example:

action NewProjectAction = do
    users <- query @User |> fetch
    let userId = headMay users |> maybe def (.id)
    let target = newRecord @Project |> set #userId userId
    render NewView { .. }

validationResultMaybe :: forall (fieldName :: Symbol) model fieldType. (?formContext :: FormContext model, HasField fieldName model fieldType, HasField "meta" model MetaBag, KnownSymbol fieldName, KnownSymbol (GetModelName model)) => Proxy fieldName -> Maybe Text Source #

Returns the validation failure for a field. If the field passed all validation, this returns Nothing.

>>> {validationResultMaybe #email}
Just "is not a valid email"