IHP Api Reference
Copyright(c) digitally induced GmbH 2020
Safe HaskellSafe-Inferred

IHP.RouterPrelude

Description

 
Synopsis

Documentation

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

Constructors

UnliftIO 

Fields

data UTCTime #

Constructors

UTCTime 

Instances

Instances details
FromJSON UTCTime 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser UTCTime #

parseJSONList :: Value -> Parser [UTCTime] #

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

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

data Set a #

Instances

Instances details
ToJSON1 Set 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Value) -> ([a] -> Value) -> Set a -> Value #

liftToJSONList :: (a -> Value) -> ([a] -> Value) -> [Set a] -> Value #

liftToEncoding :: (a -> Encoding) -> ([a] -> Encoding) -> Set a -> Encoding #

liftToEncodingList :: (a -> Encoding) -> ([a] -> Encoding) -> [Set a] -> Encoding #

Foldable Set 
Instance details

Defined in Data.Set.Internal

Methods

fold :: Monoid m => Set m -> m

foldMap :: Monoid m => (a -> m) -> Set a -> m

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

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

foldr' :: (a -> b -> b) -> b -> Set a -> b

foldl :: (b -> a -> b) -> b -> Set a -> b #

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

foldr1 :: (a -> a -> a) -> Set a -> a #

foldl1 :: (a -> a -> a) -> Set a -> a #

toList :: Set a -> [a]

null :: Set a -> Bool

length :: Set a -> Int #

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

maximum :: Ord a => Set a -> a #

minimum :: Ord a => Set a -> a #

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

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

Eq1 Set 
Instance details

Defined in Data.Set.Internal

Methods

liftEq :: (a -> b -> Bool) -> Set a -> Set b -> Bool

Ord1 Set 
Instance details

Defined in Data.Set.Internal

Methods

liftCompare :: (a -> b -> Ordering) -> Set a -> Set b -> Ordering

Show1 Set 
Instance details

Defined in Data.Set.Internal

Methods

liftShowsPrec :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> Set a -> ShowS

liftShowList :: (Int -> a -> ShowS) -> ([a] -> ShowS) -> [Set a] -> ShowS

Hashable1 Set 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> Set a -> Int

Lift a => Lift (Set a :: Type) 
Instance details

Defined in Data.Set.Internal

Methods

lift :: Quote m => Set a -> m Exp

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

(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] #

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 #

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

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

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)

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

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)

Methods

one :: OneItem (Set a) -> Set a

(t ~ Set a', Ord a) => Rewrapped (Set a) t 
Instance details

Defined in Control.Lens.Wrapped

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

data Text #

Instances

Instances details
FromJSON Text 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Text #

parseJSONList :: Value -> Parser [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

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]

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 #

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

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

type Tokens 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] #

SemiSequence Text 
Instance details

Defined in Data.Sequences

Associated Types

type Index Text #

Textual Text 
Instance details

Defined in Data.Sequences

Methods

words :: Text -> [Text] #

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

lines :: Text -> [Text] #

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

toLower :: Text -> Text #

toUpper :: Text -> Text #

toCaseFold :: Text -> Text #

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

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

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

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

One Text 
Instance details

Defined in Relude.Container.One

Associated Types

type OneItem Text

Methods

one :: OneItem 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 -> [Text0] #

fromChunks :: [Text0] -> Text #

toStrict :: Text -> Text0 #

fromStrict :: Text0 -> Text #

Utf8 Text ByteString 
Instance details

Defined in Data.Sequences

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 #

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)

type Tokens (NoShareInput 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)

type Tokens (ShareInput 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

class Read a #

Minimal complete definition

readsPrec | readPrec

Instances

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

Defined in Data.Void

Methods

readsPrec :: Int -> ReadS Void

readList :: ReadS [Void]

readPrec :: ReadPrec Void

readListPrec :: ReadPrec [Void]

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

Defined in GHC.ByteOrder

Methods

readsPrec :: Int -> ReadS ByteOrder

readList :: ReadS [ByteOrder]

readPrec :: ReadPrec ByteOrder

readListPrec :: ReadPrec [ByteOrder]

Read Associativity 
Instance details

Defined in GHC.Generics

Methods

readsPrec :: Int -> ReadS Associativity

readList :: ReadS [Associativity]

readPrec :: ReadPrec Associativity

readListPrec :: ReadPrec [Associativity]

Read DecidedStrictness 
Instance details

Defined in GHC.Generics

Methods

readsPrec :: Int -> ReadS DecidedStrictness

readList :: ReadS [DecidedStrictness]

readPrec :: ReadPrec DecidedStrictness

readListPrec :: ReadPrec [DecidedStrictness]

Read Fixity 
Instance details

Defined in GHC.Generics

Methods

readsPrec :: Int -> ReadS Fixity

readList :: ReadS [Fixity]

readPrec :: ReadPrec Fixity

readListPrec :: ReadPrec [Fixity]

Read SourceStrictness 
Instance details

Defined in GHC.Generics

Methods

readsPrec :: Int -> ReadS SourceStrictness

readList :: ReadS [SourceStrictness]

readPrec :: ReadPrec SourceStrictness

readListPrec :: ReadPrec [SourceStrictness]

Read SourceUnpackedness 
Instance details

Defined in GHC.Generics

Methods

readsPrec :: Int -> ReadS SourceUnpackedness

readList :: ReadS [SourceUnpackedness]

readPrec :: ReadPrec SourceUnpackedness

readListPrec :: ReadPrec [SourceUnpackedness]

Read SeekMode 
Instance details

Defined in GHC.IO.Device

Methods

readsPrec :: Int -> ReadS SeekMode

readList :: ReadS [SeekMode]

readPrec :: ReadPrec SeekMode

readListPrec :: ReadPrec [SeekMode]

Read ExitCode 
Instance details

Defined in GHC.IO.Exception

Methods

readsPrec :: Int -> ReadS ExitCode

readList :: ReadS [ExitCode]

readPrec :: ReadPrec ExitCode

readListPrec :: ReadPrec [ExitCode]

Read BufferMode 
Instance details

Defined in GHC.IO.Handle.Types

Methods

readsPrec :: Int -> ReadS BufferMode

readList :: ReadS [BufferMode]

readPrec :: ReadPrec BufferMode

readListPrec :: ReadPrec [BufferMode]

Read Newline 
Instance details

Defined in GHC.IO.Handle.Types

Methods

readsPrec :: Int -> ReadS Newline

readList :: ReadS [Newline]

readPrec :: ReadPrec Newline

readListPrec :: ReadPrec [Newline]

Read NewlineMode 
Instance details

Defined in GHC.IO.Handle.Types

Methods

readsPrec :: Int -> ReadS NewlineMode

readList :: ReadS [NewlineMode]

readPrec :: ReadPrec NewlineMode

readListPrec :: ReadPrec [NewlineMode]

Read IOMode 
Instance details

Defined in GHC.IO.IOMode

Methods

readsPrec :: Int -> ReadS IOMode

readList :: ReadS [IOMode]

readPrec :: ReadPrec IOMode

readListPrec :: ReadPrec [IOMode]

Read Int16 
Instance details

Defined in GHC.Int

Methods

readsPrec :: Int -> ReadS Int16

readList :: ReadS [Int16]

readPrec :: ReadPrec Int16

readListPrec :: ReadPrec [Int16]

Read Int32 
Instance details

Defined in GHC.Int

Methods

readsPrec :: Int -> ReadS Int32

readList :: ReadS [Int32]

readPrec :: ReadPrec Int32

readListPrec :: ReadPrec [Int32]

Read Int64 
Instance details

Defined in GHC.Int

Methods

readsPrec :: Int -> ReadS Int64

readList :: ReadS [Int64]

readPrec :: ReadPrec Int64

readListPrec :: ReadPrec [Int64]

Read Int8 
Instance details

Defined in GHC.Int

Methods

readsPrec :: Int -> ReadS Int8

readList :: ReadS [Int8]

readPrec :: ReadPrec Int8

readListPrec :: ReadPrec [Int8]

Read GCDetails 
Instance details

Defined in GHC.Stats

Methods

readsPrec :: Int -> ReadS GCDetails

readList :: ReadS [GCDetails]

readPrec :: ReadPrec GCDetails

readListPrec :: ReadPrec [GCDetails]

Read RTSStats 
Instance details

Defined in GHC.Stats

Methods

readsPrec :: Int -> ReadS RTSStats

readList :: ReadS [RTSStats]

readPrec :: ReadPrec RTSStats

readListPrec :: ReadPrec [RTSStats]

Read SomeChar 
Instance details

Defined in GHC.TypeLits

Methods

readsPrec :: Int -> ReadS SomeChar

readList :: ReadS [SomeChar]

readPrec :: ReadPrec SomeChar

readListPrec :: ReadPrec [SomeChar]

Read SomeSymbol 
Instance details

Defined in GHC.TypeLits

Methods

readsPrec :: Int -> ReadS SomeSymbol

readList :: ReadS [SomeSymbol]

readPrec :: ReadPrec SomeSymbol

readListPrec :: ReadPrec [SomeSymbol]

Read SomeNat 
Instance details

Defined in GHC.TypeNats

Methods

readsPrec :: Int -> ReadS SomeNat

readList :: ReadS [SomeNat]

readPrec :: ReadPrec SomeNat

readListPrec :: ReadPrec [SomeNat]

Read GeneralCategory 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS GeneralCategory

readList :: ReadS [GeneralCategory]

readPrec :: ReadPrec GeneralCategory

readListPrec :: ReadPrec [GeneralCategory]

Read Word16 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS Word16

readList :: ReadS [Word16]

readPrec :: ReadPrec Word16

readListPrec :: ReadPrec [Word16]

Read Word32 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS Word32

readList :: ReadS [Word32]

readPrec :: ReadPrec Word32

readListPrec :: ReadPrec [Word32]

Read Word64 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS Word64

readList :: ReadS [Word64]

readPrec :: ReadPrec Word64

readListPrec :: ReadPrec [Word64]

Read Word8 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS Word8

readList :: ReadS [Word8]

readPrec :: ReadPrec Word8

readListPrec :: ReadPrec [Word8]

Read CBlkCnt 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS CBlkCnt

readList :: ReadS [CBlkCnt]

readPrec :: ReadPrec CBlkCnt

readListPrec :: ReadPrec [CBlkCnt]

Read CBlkSize 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS CBlkSize

readList :: ReadS [CBlkSize]

readPrec :: ReadPrec CBlkSize

readListPrec :: ReadPrec [CBlkSize]

Read CCc 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS CCc

readList :: ReadS [CCc]

readPrec :: ReadPrec CCc

readListPrec :: ReadPrec [CCc]

Read CClockId 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS CClockId

readList :: ReadS [CClockId]

readPrec :: ReadPrec CClockId

readListPrec :: ReadPrec [CClockId]

Read CDev 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS CDev

readList :: ReadS [CDev]

readPrec :: ReadPrec CDev

readListPrec :: ReadPrec [CDev]

Read CFsBlkCnt 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS CFsBlkCnt

readList :: ReadS [CFsBlkCnt]

readPrec :: ReadPrec CFsBlkCnt

readListPrec :: ReadPrec [CFsBlkCnt]

Read CFsFilCnt 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS CFsFilCnt

readList :: ReadS [CFsFilCnt]

readPrec :: ReadPrec CFsFilCnt

readListPrec :: ReadPrec [CFsFilCnt]

Read CGid 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS CGid

readList :: ReadS [CGid]

readPrec :: ReadPrec CGid

readListPrec :: ReadPrec [CGid]

Read CId 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS CId

readList :: ReadS [CId]

readPrec :: ReadPrec CId

readListPrec :: ReadPrec [CId]

Read CIno 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS CIno

readList :: ReadS [CIno]

readPrec :: ReadPrec CIno

readListPrec :: ReadPrec [CIno]

Read CKey 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS CKey

readList :: ReadS [CKey]

readPrec :: ReadPrec CKey

readListPrec :: ReadPrec [CKey]

Read CMode 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS CMode

readList :: ReadS [CMode]

readPrec :: ReadPrec CMode

readListPrec :: ReadPrec [CMode]

Read CNfds 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS CNfds

readList :: ReadS [CNfds]

readPrec :: ReadPrec CNfds

readListPrec :: ReadPrec [CNfds]

Read CNlink 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS CNlink

readList :: ReadS [CNlink]

readPrec :: ReadPrec CNlink

readListPrec :: ReadPrec [CNlink]

Read COff 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS COff

readList :: ReadS [COff]

readPrec :: ReadPrec COff

readListPrec :: ReadPrec [COff]

Read CPid 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS CPid

readList :: ReadS [CPid]

readPrec :: ReadPrec CPid

readListPrec :: ReadPrec [CPid]

Read CRLim 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS CRLim

readList :: ReadS [CRLim]

readPrec :: ReadPrec CRLim

readListPrec :: ReadPrec [CRLim]

Read CSocklen 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS CSocklen

readList :: ReadS [CSocklen]

readPrec :: ReadPrec CSocklen

readListPrec :: ReadPrec [CSocklen]

Read CSpeed 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS CSpeed

readList :: ReadS [CSpeed]

readPrec :: ReadPrec CSpeed

readListPrec :: ReadPrec [CSpeed]

Read CSsize 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS CSsize

readList :: ReadS [CSsize]

readPrec :: ReadPrec CSsize

readListPrec :: ReadPrec [CSsize]

Read CTcflag 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS CTcflag

readList :: ReadS [CTcflag]

readPrec :: ReadPrec CTcflag

readListPrec :: ReadPrec [CTcflag]

Read CUid 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS CUid

readList :: ReadS [CUid]

readPrec :: ReadPrec CUid

readListPrec :: ReadPrec [CUid]

Read Fd 
Instance details

Defined in System.Posix.Types

Methods

readsPrec :: Int -> ReadS Fd

readList :: ReadS [Fd]

readPrec :: ReadPrec Fd

readListPrec :: ReadPrec [Fd]

Read Lexeme 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS Lexeme

readList :: ReadS [Lexeme]

readPrec :: ReadPrec Lexeme

readListPrec :: ReadPrec [Lexeme]

Read ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

Methods

readsPrec :: Int -> ReadS ByteString

readList :: ReadS [ByteString]

readPrec :: ReadPrec ByteString

readListPrec :: ReadPrec [ByteString]

Read ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Methods

readsPrec :: Int -> ReadS ByteString

readList :: ReadS [ByteString]

readPrec :: ReadPrec ByteString

readListPrec :: ReadPrec [ByteString]

Read ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Methods

readsPrec :: Int -> ReadS ShortByteString

readList :: ReadS [ShortByteString]

readPrec :: ReadPrec ShortByteString

readListPrec :: ReadPrec [ShortByteString]

Read Clock 
Instance details

Defined in System.Clock

Methods

readsPrec :: Int -> ReadS Clock

readList :: ReadS [Clock]

readPrec :: ReadPrec Clock

readListPrec :: ReadPrec [Clock]

Read TimeSpec 
Instance details

Defined in System.Clock

Methods

readsPrec :: Int -> ReadS TimeSpec

readList :: ReadS [TimeSpec]

readPrec :: ReadPrec TimeSpec

readListPrec :: ReadPrec [TimeSpec]

Read IntSet 
Instance details

Defined in Data.IntSet.Internal

Methods

readsPrec :: Int -> ReadS IntSet

readList :: ReadS [IntSet]

readPrec :: ReadPrec IntSet

readListPrec :: ReadPrec [IntSet]

Read FileType 
Instance details

Defined in System.Directory.Internal.Common

Methods

readsPrec :: Int -> ReadS FileType

readList :: ReadS [FileType]

readPrec :: ReadPrec FileType

readListPrec :: ReadPrec [FileType]

Read Permissions 
Instance details

Defined in System.Directory.Internal.Common

Methods

readsPrec :: Int -> ReadS Permissions

readList :: ReadS [Permissions]

readPrec :: ReadPrec Permissions

readListPrec :: ReadPrec [Permissions]

Read XdgDirectory 
Instance details

Defined in System.Directory.Internal.Common

Methods

readsPrec :: Int -> ReadS XdgDirectory

readList :: ReadS [XdgDirectory]

readPrec :: ReadPrec XdgDirectory

readListPrec :: ReadPrec [XdgDirectory]

Read XdgDirectoryList 
Instance details

Defined in System.Directory.Internal.Common

Methods

readsPrec :: Int -> ReadS XdgDirectoryList

readList :: ReadS [XdgDirectoryList]

readPrec :: ReadPrec XdgDirectoryList

readListPrec :: ReadPrec [XdgDirectoryList]

Read Ordering 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS Ordering

readList :: ReadS [Ordering]

readPrec :: ReadPrec Ordering

readListPrec :: ReadPrec [Ordering]

Read Cookie 
Instance details

Defined in Network.HTTP.Client.Types

Methods

readsPrec :: Int -> ReadS Cookie

readList :: ReadS [Cookie]

readPrec :: ReadPrec Cookie

readListPrec :: ReadPrec [Cookie]

Read CookieJar 
Instance details

Defined in Network.HTTP.Client.Types

Methods

readsPrec :: Int -> ReadS CookieJar

readList :: ReadS [CookieJar]

readPrec :: ReadPrec CookieJar

readListPrec :: ReadPrec [CookieJar]

Read Proxy 
Instance details

Defined in Network.HTTP.Client.Types

Methods

readsPrec :: Int -> ReadS Proxy

readList :: ReadS [Proxy]

readPrec :: ReadPrec Proxy

readListPrec :: ReadPrec [Proxy]

Read ProxySecureMode 
Instance details

Defined in Network.HTTP.Client.Types

Methods

readsPrec :: Int -> ReadS ProxySecureMode

readList :: ReadS [ProxySecureMode]

readPrec :: ReadPrec ProxySecureMode

readListPrec :: ReadPrec [ProxySecureMode]

Read DigestAuthExceptionDetails 
Instance details

Defined in Network.HTTP.Client.TLS

Methods

readsPrec :: Int -> ReadS DigestAuthExceptionDetails

readList :: ReadS [DigestAuthExceptionDetails]

readPrec :: ReadPrec DigestAuthExceptionDetails

readListPrec :: ReadPrec [DigestAuthExceptionDetails]

Read StdMethod 
Instance details

Defined in Network.HTTP.Types.Method

Methods

readsPrec :: Int -> ReadS StdMethod

readList :: ReadS [StdMethod]

readPrec :: ReadPrec StdMethod

readListPrec :: ReadPrec [StdMethod]

Read IP 
Instance details

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

Defined in Data.Text.Lazy.Builder.RealFloat

Methods

readsPrec :: Int -> ReadS FPFormat

readList :: ReadS [FPFormat]

readPrec :: ReadPrec FPFormat

readListPrec :: ReadPrec [FPFormat]

Read ShortText 
Instance details

Defined in Data.Text.Short.Internal

Methods

readsPrec :: Int -> ReadS ShortText

readList :: ReadS [ShortText]

readPrec :: ReadPrec ShortText

readListPrec :: ReadPrec [ShortText]

Read DatatypeVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

readsPrec :: Int -> ReadS DatatypeVariant

readList :: ReadS [DatatypeVariant]

readPrec :: ReadPrec DatatypeVariant

readListPrec :: ReadPrec [DatatypeVariant]

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

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a)

readList :: ReadS [(a)]

readPrec :: ReadPrec (a)

readListPrec :: ReadPrec [(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]]

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

(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 b) => Read (Either a b) 
Instance details

Defined in Data.Strict.Either

Methods

readsPrec :: Int -> ReadS (Either a b)

readList :: ReadS [Either a b]

readPrec :: ReadPrec (Either a b)

readListPrec :: ReadPrec [Either a b]

(Read a, Read b) => Read (These a b) 
Instance details

Defined in Data.Strict.These

Methods

readsPrec :: Int -> ReadS (These a b)

readList :: ReadS [These a b]

readPrec :: ReadPrec (These a b)

readListPrec :: ReadPrec [These a b]

(Read a, Read b) => Read (Pair a b) 
Instance details

Defined in Data.Strict.Tuple

Methods

readsPrec :: Int -> ReadS (Pair a b)

readList :: ReadS [Pair a b]

readPrec :: ReadPrec (Pair a b)

readListPrec :: ReadPrec [Pair a b]

(Read a, Read b) => Read (These a b) 
Instance details

Defined in Data.These

Methods

readsPrec :: Int -> ReadS (These a b)

readList :: ReadS [These a b]

readPrec :: ReadPrec (These a b)

readListPrec :: ReadPrec [These a b]

(Read1 f, Read a) => Read (Lift f a) 
Instance details

Defined in Control.Applicative.Lift

Methods

readsPrec :: Int -> ReadS (Lift f a)

readList :: ReadS [Lift f a]

readPrec :: ReadPrec (Lift f a)

readListPrec :: ReadPrec [Lift f a]

(Read1 m, Read a) => Read (MaybeT m a) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

readsPrec :: Int -> ReadS (MaybeT m a)

readList :: ReadS [MaybeT m a]

readPrec :: ReadPrec (MaybeT m a)

readListPrec :: ReadPrec [MaybeT m a]

(Eq k, Hashable k, Read k, Read e) => Read (HashMap k e) 
Instance details

Defined in Data.HashMap.Internal

Methods

readsPrec :: Int -> ReadS (HashMap k e)

readList :: ReadS [HashMap k e]

readPrec :: ReadPrec (HashMap k e)

readListPrec :: ReadPrec [HashMap k e]

(Read a, Read b) => Read (a, b) 
Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS (a, b)

readList :: ReadS [(a, b)]

readPrec :: ReadPrec (a, b)

readListPrec :: ReadPrec [(a, b)]

Read a => Read (Const a b) 
Instance details

Defined in Data.Functor.Const

Methods

readsPrec :: Int -> ReadS (Const a b)

readList :: ReadS [Const a b]

readPrec :: ReadPrec (Const a b)

readListPrec :: ReadPrec [Const a b]

Read (f a) => Read (Ap f a) 
Instance details

Defined in Data.Monoid

Methods

readsPrec :: Int -> ReadS (Ap f a)

readList :: ReadS [Ap f a]

readPrec :: ReadPrec (Ap f a)

readListPrec :: ReadPrec [Ap f a]

Read (f a) => Read (Alt f a) 
Instance details

Defined in Data.Semigroup.Internal

Methods

readsPrec :: Int -> ReadS (Alt f a)

readList :: ReadS [Alt f a]

readPrec :: ReadPrec (Alt f a)

readListPrec :: ReadPrec [Alt f a]

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 (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 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 (ErrorT e m a) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

readsPrec :: Int -> ReadS (ErrorT e m a)

readList :: ReadS [ErrorT e m a]

readPrec :: ReadPrec (ErrorT e m a)

readListPrec :: ReadPrec [ErrorT e m 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)]

(Read1 f, Read1 g, Read 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]

(Read1 f, Read1 g, Read 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)]

(Read1 f, Read1 g, Read 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 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)]

data Conc (m :: Type -> Type) a #

Instances

Instances details
MonadUnliftIO m => Alternative (Conc m) 
Instance details

Defined in UnliftIO.Internals.Async

Methods

empty :: Conc m a #

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

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

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

MonadUnliftIO m => Applicative (Conc m) 
Instance details

Defined in UnliftIO.Internals.Async

Methods

pure :: a -> Conc m a #

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

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

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

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

Functor m => Functor (Conc m) 
Instance details

Defined in UnliftIO.Internals.Async

Methods

fmap :: (a -> b) -> Conc m a -> Conc m b #

(<$) :: a -> Conc m b -> Conc m a #

(Monoid a, MonadUnliftIO m) => Monoid (Conc m a) 
Instance details

Defined in UnliftIO.Internals.Async

Methods

mempty :: Conc m a #

mappend :: Conc m a -> Conc m a -> Conc m a #

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

(MonadUnliftIO m, Semigroup a) => Semigroup (Conc m a) 
Instance details

Defined in UnliftIO.Internals.Async

Methods

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

sconcat :: NonEmpty (Conc m a) -> Conc m a #

stimes :: Integral b => b -> Conc m a -> Conc m a #

class Monoid builder => Builder builder lazy | builder -> lazy, lazy -> builder where #

Methods

builderToLazy :: builder -> lazy #

flushBuilder :: builder #

Instances

Instances details
Builder Builder ByteString 
Instance details

Defined in Data.Builder

Methods

builderToLazy :: Builder -> ByteString #

flushBuilder :: Builder #

Builder Builder Text 
Instance details

Defined in Data.Builder

Methods

builderToLazy :: Builder -> Text #

flushBuilder :: Builder #

type String = [Char] #

data Maybe a #

Constructors

Nothing 
Just a 

Instances

Instances details
FromJSON1 Maybe 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (Maybe a) #

liftParseJSONList :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [Maybe a] #

ToJSON1 Maybe 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Value) -> ([a] -> Value) -> Maybe a -> Value #

liftToJSONList :: (a -> Value) -> ([a] -> Value) -> [Maybe a] -> Value #

liftToEncoding :: (a -> Encoding) -> ([a] -> Encoding) -> Maybe a -> Encoding #

liftToEncodingList :: (a -> Encoding) -> ([a] -> Encoding) -> [Maybe a] -> Encoding #

MonadFail Maybe 
Instance details

Defined in Control.Monad.Fail

Methods

fail :: String -> Maybe 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 #

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

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 :: Exception e => e -> Maybe a

Hashable1 Maybe 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> Maybe a -> Int

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

Generic1 Maybe 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 Maybe :: k -> Type

Methods

from1 :: forall (a :: k). Maybe a -> Rep1 Maybe a

to1 :: forall (a :: k). Rep1 Maybe a -> Maybe a

FoldableWithIndex () Maybe 
Instance details

Defined in WithIndex

Methods

ifoldMap :: Monoid m => (() -> a -> m) -> Maybe a -> m

ifoldMap' :: Monoid m => (() -> a -> m) -> Maybe a -> m

ifoldr :: (() -> a -> b -> b) -> b -> Maybe a -> b

ifoldl :: (() -> b -> a -> b) -> b -> Maybe a -> b

ifoldr' :: (() -> a -> b -> b) -> b -> Maybe a -> b

ifoldl' :: (() -> b -> a -> b) -> b -> Maybe a -> b

FunctorWithIndex () Maybe 
Instance details

Defined in WithIndex

Methods

imap :: (() -> a -> b) -> Maybe a -> Maybe b

TraversableWithIndex () Maybe 
Instance details

Defined in WithIndex

Methods

itraverse :: Applicative f => (() -> a -> f b) -> Maybe a -> f (Maybe b)

(Selector s, GToJSON' enc arity (K1 i (Maybe a) :: Type -> Type), KeyValuePair enc pairs, Monoid pairs) => RecordToPairs enc pairs arity (S1 s (K1 i (Maybe a) :: Type -> Type)) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

recordToPairs :: Options -> ToArgs enc arity a0 -> S1 s (K1 i (Maybe a)) a0 -> pairs

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

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)

(Selector s, FromJSON a) => RecordFromJSON' arity (S1 s (K1 i (Maybe a) :: Type -> Type)) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

recordParseJSON' :: (ConName :* (TypeName :* (Options :* FromArgs arity a0))) -> Object -> Parser (S1 s (K1 i (Maybe a)) a0)

LookupField (Maybe a) 
Instance details

Defined in Data.Aeson.TH

Methods

lookupField :: (Value -> Parser (Maybe a)) -> String -> String -> Object -> Key -> Parser (Maybe 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] #

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) :: Type -> Type

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)

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 #

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

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 #

ApplyAttribute attribute => ApplyAttribute (Maybe attribute) 
Instance details

Defined in IHP.HSX.QQ

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

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

Methods

toEqOrIsOperator :: Maybe something -> FilterOperator

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) => FromRow (Maybe (a, b)) 
Instance details

Defined in Database.PostgreSQL.Simple.FromRow

Methods

fromRow :: RowParser (Maybe (a, b))

(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, 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, 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 => 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

(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 Source #

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

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)

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 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]

data ByteString #

Instances

Instances details
FromJSON ByteString Source # 
Instance details

Defined in IHP.DataSync.DynamicQuery

Methods

parseJSON :: Value -> Parser ByteString #

parseJSONList :: Value -> Parser [ByteString] #

Chunk ByteString 
Instance details

Defined in Data.Attoparsec.Internal.Types

Associated Types

type ChunkElem ByteString

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

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 #

FoldCase ByteString 
Instance details

Defined in Data.CaseInsensitive.Internal

Serialize ByteString 
Instance details

Defined in Data.Serialize

Methods

put :: Putter ByteString

get :: Get ByteString

NFData ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

Methods

rnf :: ByteString -> () #

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

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

ParamReader ByteString Source # 
Instance details

Defined in IHP.Controller.Param

EnvVarReader ByteString Source # 
Instance details

Defined in IHP.EnvVar

Stream ByteString 
Instance details

Defined in Text.Megaparsec.Stream

Associated Types

type Token ByteString

type Tokens 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] #

SemiSequence ByteString 
Instance details

Defined in Data.Sequences

Associated Types

type Index ByteString #

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

One ByteString 
Instance details

Defined in Relude.Container.One

Associated Types

type OneItem ByteString

Methods

one :: OneItem ByteString -> ByteString

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 :: ByteString0 -> ByteString

toLazyByteString :: ByteString -> ByteString0

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 -> [ByteString0] #

fromChunks :: [ByteString0] -> ByteString #

toStrict :: ByteString -> ByteString0 #

fromStrict :: ByteString0 -> ByteString #

Utf8 Text ByteString 
Instance details

Defined in Data.Sequences

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

SetField "selectFrom" SQLQuery ByteString Source # 
Instance details

Defined in IHP.QueryBuilder

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)

type Tokens (NoShareInput 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)

type Tokens (ShareInput 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 e, Show e) => Exception e where #

Minimal complete definition

Nothing

Instances

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

Exception AsyncCancelled 
Instance details

Defined in Control.Concurrent.Async

Exception ExceptionInLinkedThread 
Instance details

Defined in Control.Concurrent.Async

Exception NestedAtomically 
Instance details

Defined in Control.Exception.Base

Methods

toException :: NestedAtomically -> SomeException #

fromException :: SomeException -> Maybe NestedAtomically #

displayException :: NestedAtomically -> 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 Data.Void

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

Defined in GHC.IO.Handle.Lock.Common

Methods

toException :: FileLockingNotSupported -> SomeException #

fromException :: SomeException -> Maybe FileLockingNotSupported #

displayException :: FileLockingNotSupported -> String #

Exception Timeout 
Instance details

Defined in System.Timeout

Methods

toException :: Timeout -> SomeException #

fromException :: SomeException -> Maybe Timeout #

displayException :: Timeout -> String #

Exception ASCII7_Invalid 
Instance details

Defined in Basement.String.Encoding.ASCII7

Methods

toException :: ASCII7_Invalid -> SomeException #

fromException :: SomeException -> Maybe ASCII7_Invalid #

displayException :: ASCII7_Invalid -> String #

Exception ISO_8859_1_Invalid 
Instance details

Defined in Basement.String.Encoding.ISO_8859_1

Methods

toException :: ISO_8859_1_Invalid -> SomeException #

fromException :: SomeException -> Maybe ISO_8859_1_Invalid #

displayException :: ISO_8859_1_Invalid -> String #

Exception UTF16_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF16

Methods

toException :: UTF16_Invalid -> SomeException #

fromException :: SomeException -> Maybe UTF16_Invalid #

displayException :: UTF16_Invalid -> String #

Exception UTF32_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF32

Methods

toException :: UTF32_Invalid -> SomeException #

fromException :: SomeException -> Maybe UTF32_Invalid #

displayException :: UTF32_Invalid -> String #

Exception SinkStorableException 
Instance details

Defined in Data.Conduit.Binary

Methods

toException :: SinkStorableException -> SomeException #

fromException :: SomeException -> Maybe SinkStorableException #

displayException :: SinkStorableException -> String #

Exception CryptoError 
Instance details

Defined in Crypto.Error.Types

Methods

toException :: CryptoError -> SomeException #

fromException :: SomeException -> Maybe CryptoError #

displayException :: CryptoError -> 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 InflectionException 
Instance details

Defined in Text.Inflections.Types

Methods

toException :: InflectionException -> SomeException #

fromException :: SomeException -> Maybe InflectionException #

displayException :: InflectionException -> 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 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 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 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 StringException 
Instance details

Defined in UnliftIO.Exception

Exception ConcException 
Instance details

Defined in UnliftIO.Internals.Async

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.Server

Methods

toException :: PongTimeout -> SomeException #

fromException :: SomeException -> Maybe PongTimeout #

displayException :: PongTimeout -> String #

Exception ConnectionException 
Instance details

Defined in Network.WebSockets.Types

Methods

toException :: ConnectionException -> SomeException #

fromException :: SomeException -> Maybe ConnectionException #

displayException :: ConnectionException -> String #

Exception JSONError 
Instance details

Defined in Network.Wreq.Internal.Types

Methods

toException :: JSONError -> SomeException #

fromException :: SomeException -> Maybe JSONError #

displayException :: JSONError -> 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 #

class Typeable (a :: k) #

Minimal complete definition

typeRep#

data IO a #

Instances

Instances details
MonadFail IO 
Instance details

Defined in Control.Monad.Fail

Methods

fail :: String -> 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 #

PrimMonad IO 
Instance details

Defined in Basement.Monad

Associated Types

type PrimState IO

type PrimVar IO :: Type -> Type

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

MonadCatch IO 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => IO a -> (e -> IO a) -> IO a

MonadMask IO 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. IO a -> IO a) -> IO b) -> IO b

uninterruptibleMask :: ((forall a. IO a -> IO a) -> IO b) -> IO b

generalBracket :: IO a -> (a -> ExitCase b -> IO c) -> (a -> IO b) -> IO (b, c)

MonadThrow IO 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> IO a

Example Expectation 
Instance details

Defined in Test.Hspec.Core.Example

Associated Types

type Arg Expectation

Methods

evaluateExample :: Expectation -> Params -> (ActionWith (Arg Expectation) -> IO ()) -> ProgressCallback -> IO Result

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 #

Methods

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

Quasi IO 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

qNewName :: String -> IO Name

qReport :: Bool -> String -> IO ()

qRecover :: IO a -> IO a -> IO a

qLookupName :: Bool -> String -> IO (Maybe Name)

qReify :: Name -> IO Info

qReifyFixity :: Name -> IO (Maybe Fixity)

qReifyType :: Name -> IO Type

qReifyInstances :: Name -> [Type] -> IO [Dec]

qReifyRoles :: Name -> IO [Role]

qReifyAnnotations :: Data a => AnnLookup -> IO [a]

qReifyModule :: Module -> IO ModuleInfo

qReifyConStrictness :: Name -> IO [DecidedStrictness]

qLocation :: IO Loc

qRunIO :: IO a -> IO a

qGetPackageRoot :: IO FilePath

qAddDependentFile :: FilePath -> IO ()

qAddTempFile :: String -> IO FilePath

qAddTopDecls :: [Dec] -> IO ()

qAddForeignFilePath :: ForeignSrcLang -> String -> IO ()

qAddModFinalizer :: Q () -> IO ()

qAddCorePlugin :: String -> IO ()

qGetQ :: Typeable a => IO (Maybe a)

qPutQ :: Typeable a => a -> IO ()

qIsExtEnabled :: Extension -> IO Bool

qExtsEnabled :: IO [Extension]

qPutDoc :: DocLoc -> String -> IO ()

qGetDoc :: DocLoc -> IO (Maybe String)

Quote IO 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

newName :: String -> IO Name

MonadUnliftIO IO 
Instance details

Defined in Control.Monad.IO.Unlift

Methods

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

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

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 #

Default a => Default (IO a) 
Instance details

Defined in Data.Default.Class

Methods

def :: IO a #

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

Example (a -> Expectation) 
Instance details

Defined in Test.Hspec.Core.Example

Associated Types

type Arg (a -> Expectation)

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

data Char #

Instances

Instances details
FromJSON Char 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Char #

parseJSONList :: Value -> Parser [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] #

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 #

Subtractive Char 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Char

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 :: Nat

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

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 #

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 #

ToHtml String 
Instance details

Defined in IHP.HSX.ToHtml

Methods

toHtml :: String -> Html #

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

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

ErrorList Char 
Instance details

Defined in Control.Monad.Trans.Error

Methods

listMsg :: String -> [Char]

Unbox Char 
Instance details

Defined in Data.Vector.Unboxed.Base

IArray UArray Char 
Instance details

Defined in Data.Array.Base

Methods

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

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

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

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

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

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

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

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 #

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)

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)

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

Defined in GHC.Generics

Associated Types

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

Methods

from1 :: forall (a :: k0). URec Char a -> Rep1 (URec Char) a

to1 :: forall (a :: k0). Rep1 (URec Char) 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) #

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

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 #

Generic (URec Char p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Char p) :: 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 Async a #

Instances

Instances details
Functor Async 
Instance details

Defined in Control.Concurrent.Async

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

Show (Async ()) Source # 
Instance details

Defined in IHP.IDE.Types

Methods

showsPrec :: Int -> Async () -> ShowS #

show :: Async () -> String

showList :: [Async ()] -> ShowS #

Eq (Async a) 
Instance details

Defined in Control.Concurrent.Async

Methods

(==) :: Async a -> Async a -> Bool #

(/=) :: Async a -> Async a -> Bool #

Ord (Async a) 
Instance details

Defined in Control.Concurrent.Async

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

Methods

hashWithSalt :: Int -> Async a -> Int #

hash :: Async a -> Int #

class (Textual textual, IsSequence binary) => Utf8 textual binary | textual -> binary, binary -> textual where #

Methods

encodeUtf8 :: textual -> binary #

decodeUtf8 :: binary -> textual #

Instances

Instances details
Utf8 Text ByteString 
Instance details

Defined in Data.Sequences

Utf8 Text ByteString 
Instance details

Defined in Data.Sequences

Methods

encodeUtf8 :: Text -> ByteString #

decodeUtf8 :: ByteString -> Text #

(c ~ Char, w ~ Word8) => Utf8 [c] [w] 
Instance details

Defined in Data.Sequences

Methods

encodeUtf8 :: [c] -> [w] #

decodeUtf8 :: [w] -> [c] #

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

Defined in Data.Aeson.Types.Internal

Methods

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

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

return :: a -> IResult a #

Monad Parser 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

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

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

return :: a -> Parser a #

Monad Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

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

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

return :: a -> Result a #

Monad Complex 
Instance details

Defined in Data.Complex

Methods

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

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

return :: a -> Complex a #

Monad Identity 
Instance details

Defined in Data.Functor.Identity

Methods

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

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

return :: a -> Identity a #

Monad First 
Instance details

Defined in Data.Monoid

Methods

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

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

return :: a -> First a #

Monad Last 
Instance details

Defined in Data.Monoid

Methods

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

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

return :: a -> Last a #

Monad Down 
Instance details

Defined in Data.Ord

Methods

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

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

return :: a -> Down a #

Monad First 
Instance details

Defined in Data.Semigroup

Methods

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

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

return :: a -> First a #

Monad Last 
Instance details

Defined in Data.Semigroup

Methods

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

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

return :: a -> Last a #

Monad Max 
Instance details

Defined in Data.Semigroup

Methods

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

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

return :: a -> Max a #

Monad Min 
Instance details

Defined in Data.Semigroup

Methods

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

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

return :: a -> Min a #

Monad Dual 
Instance details

Defined in Data.Semigroup.Internal

Methods

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

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

return :: a -> Dual a #

Monad Product 
Instance details

Defined in Data.Semigroup.Internal

Methods

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

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

return :: a -> Product a #

Monad Sum 
Instance details

Defined in Data.Semigroup.Internal

Methods

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

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

return :: a -> Sum a #

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

Defined in Data.DList.DNonEmpty.Internal

Methods

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

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

return :: a -> DNonEmpty a #

Monad DList 
Instance details

Defined in Data.DList.Internal

Methods

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

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

return :: a -> DList a #

Monad PV 
Instance details

Defined in GHC.Parser.PostProcess

Methods

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

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

return :: a -> PV a #

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

Defined in Language.Haskell.TH.Syntax

Methods

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

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

return :: a -> Q a #

Monad Memoized 
Instance details

Defined in UnliftIO.Memoize

Methods

(>>=) :: Memoized a -> (a -> Memoized b) -> Memoized b #

(>>) :: Memoized a -> Memoized b -> Memoized b #

return :: a -> Memoized a #

Monad Vector 
Instance details

Defined in Data.Vector

Methods

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

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

return :: a -> Vector a #

Monad Id 
Instance details

Defined in Data.Vector.Fusion.Util

Methods

(>>=) :: Id a -> (a -> Id b) -> Id b #

(>>) :: Id a -> Id b -> Id b #

return :: a -> Id a #

Monad 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 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 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] #

Representable f => Monad (Co f) 
Instance details

Defined in Data.Functor.Rep

Methods

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

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

return :: a -> Co f a #

Monad (Parser i) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

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

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

return :: a -> Parser i a #

Monad m => Monad (WrappedMonad m) 
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 #

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 #

Monad (SpecM a) 
Instance details

Defined in Test.Hspec.Core.Spec.Monad

Methods

(>>=) :: SpecM a a0 -> (a0 -> SpecM a b) -> SpecM a b #

(>>) :: SpecM a a0 -> SpecM a b -> SpecM a b #

return :: a0 -> SpecM a a0 #

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

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

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

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

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 (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, Error e) => Monad (ErrorT e m) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

(>>=) :: ErrorT e m a -> (a -> ErrorT e m b) -> ErrorT e m b #

(>>) :: ErrorT e m a -> ErrorT e m b -> ErrorT e m b #

return :: a -> ErrorT e 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 #

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

Defined in Control.Monad.Trans.Writer.Lazy

Methods

(>>=) :: WriterT w m a -> (a -> WriterT w m b) -> WriterT w m b #

(>>) :: WriterT w m a -> WriterT w m b -> WriterT w m b #

return :: a -> WriterT w m a #

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

Defined in Control.Monad.Trans.Writer.Strict

Methods

(>>=) :: WriterT w m a -> (a -> WriterT w m b) -> WriterT w m b #

(>>) :: WriterT w m a -> WriterT w m b -> WriterT w m b #

return :: a -> WriterT w m a #

Monad m => Monad (Reverse m) 
Instance details

Defined in Data.Functor.Reverse

Methods

(>>=) :: Reverse m a -> (a -> Reverse m b) -> Reverse m b #

(>>) :: Reverse m a -> Reverse m b -> Reverse m b #

return :: a -> Reverse m a #

(Monoid a, Monoid b) => Monad ((,,) a b) 
Instance details

Defined in GHC.Base

Methods

(>>=) :: (a, b, a0) -> (a0 -> (a, b, b0)) -> (a, b, b0) #

(>>) :: (a, b, a0) -> (a, b, b0) -> (a, b, b0) #

return :: a0 -> (a, b, a0) #

(Monad f, Monad g) => Monad (Product f g) 
Instance details

Defined in Data.Functor.Product

Methods

(>>=) :: Product f g a -> (a -> Product f g b) -> Product f g b #

(>>) :: Product f g a -> Product f g b -> Product f g b #

return :: a -> Product f g a #

(Monad f, Monad g) => Monad (f :*: g) 
Instance details

Defined in GHC.Generics

Methods

(>>=) :: (f :*: g) a -> (a -> (f :*: g) b) -> (f :*: g) b #

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

return :: a -> (f :*: g) a #

Monad (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 #

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

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

data Handle #

Instances

Instances details
Show Handle 
Instance details

Defined in GHC.IO.Handle.Types

Methods

showsPrec :: Int -> Handle -> ShowS #

show :: Handle -> String

showList :: [Handle] -> ShowS #

Eq Handle 
Instance details

Defined in GHC.IO.Handle.Types

Methods

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

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

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

Error IOException 
Instance details

Defined in Control.Monad.Trans.Error

class (Integral (Index seq), GrowingAppend seq) => SemiSequence seq where #

Associated Types

type Index seq #

Methods

intersperse :: Element seq -> seq -> seq #

reverse :: seq -> seq #

find :: (Element seq -> Bool) -> seq -> Maybe (Element seq) #

sortBy :: (Element seq -> Element seq -> Ordering) -> seq -> seq #

cons :: Element seq -> seq -> seq #

snoc :: seq -> Element seq -> seq #

Instances

Instances details
SemiSequence ByteString 
Instance details

Defined in Data.Sequences

Associated Types

type Index ByteString #

SemiSequence ByteString 
Instance details

Defined in Data.Sequences

Associated Types

type Index ByteString #

Methods

intersperse :: Element ByteString -> ByteString -> ByteString #

reverse :: ByteString -> ByteString #

find :: (Element ByteString -> Bool) -> ByteString -> Maybe (Element ByteString) #

sortBy :: (Element ByteString -> Element ByteString -> Ordering) -> ByteString -> ByteString #

cons :: Element ByteString -> ByteString -> ByteString #

snoc :: ByteString -> Element ByteString -> ByteString #

SemiSequence Text 
Instance details

Defined in Data.Sequences

Associated Types

type Index Text #

SemiSequence Text 
Instance details

Defined in Data.Sequences

Associated Types

type Index Text #

Methods

intersperse :: Element Text -> Text -> Text #

reverse :: Text -> Text #

find :: (Element Text -> Bool) -> Text -> Maybe (Element Text) #

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

cons :: Element Text -> Text -> Text #

snoc :: Text -> Element Text -> Text #

SemiSequence (Seq a) 
Instance details

Defined in Data.Sequences

Associated Types

type Index (Seq a) #

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 #

SemiSequence seq => SemiSequence (NonNull seq) 
Instance details

Defined in Data.NonNull

Associated Types

type Index (NonNull seq) #

Methods

intersperse :: Element (NonNull seq) -> NonNull seq -> NonNull seq #

reverse :: NonNull seq -> NonNull seq #

find :: (Element (NonNull seq) -> Bool) -> NonNull seq -> Maybe (Element (NonNull seq)) #

sortBy :: (Element (NonNull seq) -> Element (NonNull seq) -> Ordering) -> NonNull seq -> NonNull seq #

cons :: Element (NonNull seq) -> NonNull seq -> NonNull seq #

snoc :: NonNull seq -> Element (NonNull seq) -> NonNull seq #

SemiSequence (Vector a) 
Instance details

Defined in Data.Sequences

Associated Types

type Index (Vector a) #

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 #

Storable a => SemiSequence (Vector a) 
Instance details

Defined in Data.Sequences

Associated Types

type Index (Vector a) #

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 #

Unbox a => SemiSequence (Vector a) 
Instance details

Defined in Data.Sequences

Associated Types

type Index (Vector a) #

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 #

SemiSequence (NonEmpty a) 
Instance details

Defined in Data.Sequences

Associated Types

type Index (NonEmpty a) #

Methods

intersperse :: Element (NonEmpty a) -> NonEmpty a -> NonEmpty a #

reverse :: NonEmpty a -> NonEmpty a #

find :: (Element (NonEmpty a) -> Bool) -> NonEmpty a -> Maybe (Element (NonEmpty a)) #

sortBy :: (Element (NonEmpty a) -> Element (NonEmpty a) -> Ordering) -> NonEmpty a -> NonEmpty a #

cons :: Element (NonEmpty a) -> NonEmpty a -> NonEmpty a #

snoc :: NonEmpty a -> Element (NonEmpty a) -> NonEmpty a #

SemiSequence [a] 
Instance details

Defined in Data.Sequences

Associated Types

type Index [a] #

Methods

intersperse :: Element [a] -> [a] -> [a] #

reverse :: [a] -> [a] #

find :: (Element [a] -> Bool) -> [a] -> Maybe (Element [a]) #

sortBy :: (Element [a] -> Element [a] -> Ordering) -> [a] -> [a] #

cons :: Element [a] -> [a] -> [a] #

snoc :: [a] -> Element [a] -> [a] #

type family Index seq #

Instances

Instances details
type Index ByteString 
Instance details

Defined in Data.Sequences

type Index ByteString 
Instance details

Defined in Data.Sequences

type Index ByteString = Int64
type Index Text 
Instance details

Defined in Data.Sequences

type Index Text = Int
type Index Text 
Instance details

Defined in Data.Sequences

type Index Text = Int64
type Index (Seq a) 
Instance details

Defined in Data.Sequences

type Index (Seq a) = Int
type Index (DList a) 
Instance details

Defined in Data.MonoTraversable.Instances

type Index (DList a) = Int
type Index (NonNull seq) 
Instance details

Defined in Data.NonNull

type Index (NonNull seq) = Index seq
type Index (Vector a) 
Instance details

Defined in Data.Sequences

type Index (Vector a) = Int
type Index (Vector a) 
Instance details

Defined in Data.Sequences

type Index (Vector a) = Int
type Index (Vector a) 
Instance details

Defined in Data.Sequences

type Index (Vector a) = Int
type Index (NonEmpty a) 
Instance details

Defined in Data.Sequences

type Index (NonEmpty a) = Int
type Index [a] 
Instance details

Defined in Data.Sequences

type Index [a] = Int

class Show a where #

Minimal complete definition

showsPrec | show

Methods

showsPrec :: Int -> a -> ShowS #

showList :: [a] -> ShowS #

Instances

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

Defined in Codec.Crypto.RSA.Pure

Methods

showsPrec :: Int -> RSAError -> ShowS #

show :: RSAError -> String

showList :: [RSAError] -> ShowS #

Show AesonException 
Instance details

Defined in Data.Aeson

Show Key 
Instance details

Defined in Data.Aeson.Key

Methods

showsPrec :: Int -> Key -> ShowS #

show :: Key -> String

showList :: [Key] -> ShowS #

Show DotNetTime 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

showsPrec :: Int -> DotNetTime -> ShowS #

show :: DotNetTime -> String

showList :: [DotNetTime] -> ShowS #

Show JSONPathElement 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

showsPrec :: Int -> JSONPathElement -> ShowS #

show :: JSONPathElement -> String

showList :: [JSONPathElement] -> ShowS #

Show Options 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

showsPrec :: Int -> Options -> ShowS #

show :: Options -> String

showList :: [Options] -> ShowS #

Show SumEncoding 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

showsPrec :: Int -> SumEncoding -> ShowS #

show :: SumEncoding -> String

showList :: [SumEncoding] -> ShowS #

Show Value 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

showsPrec :: Int -> Value -> ShowS #

show :: Value -> String

showList :: [Value] -> ShowS #

Show AsyncCancelled 
Instance details

Defined in Control.Concurrent.Async

Show ExceptionInLinkedThread 
Instance details

Defined in Control.Concurrent.Async

Show More 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

showsPrec :: Int -> More -> ShowS #

show :: More -> String

showList :: [More] -> ShowS #

Show Pos 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

showsPrec :: Int -> Pos -> ShowS #

show :: Pos -> String

showList :: [Pos] -> ShowS #

Show Number 
Instance details

Defined in Data.Attoparsec.Number

Methods

showsPrec :: Int -> Number -> ShowS #

show :: Number -> String

showList :: [Number] -> ShowS #

Show NestedAtomically 
Instance details

Defined in Control.Exception.Base

Methods

showsPrec :: Int -> NestedAtomically -> ShowS #

show :: NestedAtomically -> String

showList :: [NestedAtomically] -> ShowS #

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

Defined in Data.Void

Methods

showsPrec :: Int -> Void -> ShowS #

show :: Void -> String

showList :: [Void] -> 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 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 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 HandlePosn 
Instance details

Defined in GHC.IO.Handle

Methods

showsPrec :: Int -> HandlePosn -> ShowS #

show :: HandlePosn -> String

showList :: [HandlePosn] -> ShowS #

Show FileLockingNotSupported 
Instance details

Defined in GHC.IO.Handle.Lock.Common

Methods

showsPrec :: Int -> FileLockingNotSupported -> ShowS #

show :: FileLockingNotSupported -> String

showList :: [FileLockingNotSupported] -> 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 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 InfoProv 
Instance details

Defined in GHC.Stack.CCS

Methods

showsPrec :: Int -> InfoProv -> ShowS #

show :: InfoProv -> String

showList :: [InfoProv] -> 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 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 Encoding 
Instance details

Defined in Basement.String

Methods

showsPrec :: Int -> Encoding -> ShowS #

show :: Encoding -> String

showList :: [Encoding] -> ShowS #

Show ASCII7_Invalid 
Instance details

Defined in Basement.String.Encoding.ASCII7

Methods

showsPrec :: Int -> ASCII7_Invalid -> ShowS #

show :: ASCII7_Invalid -> String

showList :: [ASCII7_Invalid] -> ShowS #

Show ISO_8859_1_Invalid 
Instance details

Defined in Basement.String.Encoding.ISO_8859_1

Methods

showsPrec :: Int -> ISO_8859_1_Invalid -> ShowS #

show :: ISO_8859_1_Invalid -> String

showList :: [ISO_8859_1_Invalid] -> ShowS #

Show UTF16_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF16

Methods

showsPrec :: Int -> UTF16_Invalid -> ShowS #

show :: UTF16_Invalid -> String

showList :: [UTF16_Invalid] -> ShowS #

Show UTF32_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF32

Methods

showsPrec :: Int -> UTF32_Invalid -> ShowS #

show :: UTF32_Invalid -> String

showList :: [UTF32_Invalid] -> ShowS #

Show FileSize 
Instance details

Defined in Basement.Types.OffsetSize

Methods

showsPrec :: Int -> FileSize -> ShowS #

show :: FileSize -> String

showList :: [FileSize] -> ShowS #

Show String 
Instance details

Defined in Basement.UTF8.Base

Methods

showsPrec :: Int -> String -> ShowS #

show :: String -> String0

showList :: [String] -> ShowS #

Show Bytes 
Instance details

Defined in Data.Bytes.Internal

Methods

showsPrec :: Int -> Bytes -> ShowS #

show :: Bytes -> String

showList :: [Bytes] -> ShowS #

Show ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

Methods

showsPrec :: Int -> ByteString -> ShowS #

show :: ByteString -> String

showList :: [ByteString] -> 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 Clock 
Instance details

Defined in System.Clock

Methods

showsPrec :: Int -> Clock -> ShowS #

show :: Clock -> String

showList :: [Clock] -> ShowS #

Show TimeSpec 
Instance details

Defined in System.Clock

Methods

showsPrec :: Int -> TimeSpec -> ShowS #

show :: TimeSpec -> String

showList :: [TimeSpec] -> ShowS #

Show SinkStorableException 
Instance details

Defined in Data.Conduit.Binary

Methods

showsPrec :: Int -> SinkStorableException -> ShowS #

show :: SinkStorableException -> String

showList :: [SinkStorableException] -> ShowS #

Show IntSet 
Instance details

Defined in Data.IntSet.Internal

Methods

showsPrec :: Int -> IntSet -> ShowS #

show :: IntSet -> String

showList :: [IntSet] -> 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 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 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 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 FileType 
Instance details

Defined in System.Directory.Internal.Common

Methods

showsPrec :: Int -> FileType -> ShowS #

show :: FileType -> String

showList :: [FileType] -> ShowS #

Show Permissions 
Instance details

Defined in System.Directory.Internal.Common

Methods

showsPrec :: Int -> Permissions -> ShowS #

show :: Permissions -> String

showList :: [Permissions] -> ShowS #

Show XdgDirectory 
Instance details

Defined in System.Directory.Internal.Common

Methods

showsPrec :: Int -> XdgDirectory -> ShowS #

show :: XdgDirectory -> String

showList :: [XdgDirectory] -> ShowS #

Show XdgDirectoryList 
Instance details

Defined in System.Directory.Internal.Common

Methods

showsPrec :: Int -> XdgDirectoryList -> ShowS #

show :: XdgDirectoryList -> String

showList :: [XdgDirectoryList] -> ShowS #

Show LogStr 
Instance details

Defined in System.Log.FastLogger.LogStr

Methods

showsPrec :: Int -> LogStr -> ShowS #

show :: LogStr -> String

showList :: [LogStr] -> ShowS #

Show Event 
Instance details

Defined in System.FSNotify.Types

Methods

showsPrec :: Int -> Event -> ShowS #

show :: Event -> String

showList :: [Event] -> ShowS #

Show EventIsDirectory 
Instance details

Defined in System.FSNotify.Types

Methods

showsPrec :: Int -> EventIsDirectory -> ShowS #

show :: EventIsDirectory -> String

showList :: [EventIsDirectory] -> ShowS #

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

Defined in GHC.CmmToAsm.AArch64.Regs

Methods

showsPrec :: Int -> AddrMode -> ShowS #

show :: AddrMode -> String

showList :: [AddrMode] -> ShowS #

Show Imm 
Instance details

Defined in GHC.CmmToAsm.AArch64.Regs

Methods

showsPrec :: Int -> Imm -> ShowS #

show :: Imm -> String

showList :: [Imm] -> ShowS #

Show TickishPlacement 
Instance details

Defined in GHC.Types.Tickish

Methods

showsPrec :: Int -> TickishPlacement -> ShowS #

show :: TickishPlacement -> String

showList :: [TickishPlacement] -> 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 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 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 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 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 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 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 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 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 JobConfig Source # 
Instance details

Defined in IHP.IDE.CodeGen.JobGenerator

Methods

showsPrec :: Int -> JobConfig -> ShowS #

show :: JobConfig -> String

showList :: [JobConfig] -> ShowS #

Show MailConfig Source # 
Instance details

Defined in IHP.IDE.CodeGen.MailGenerator

Methods

showsPrec :: Int -> MailConfig -> ShowS #

show :: MailConfig -> String

showList :: [MailConfig] -> ShowS #

Show GeneratorAction Source # 
Instance details

Defined in IHP.IDE.CodeGen.Types

Show ViewConfig Source # 
Instance details

Defined in IHP.IDE.CodeGen.ViewGenerator

Methods

showsPrec :: Int -> ViewConfig -> ShowS #

show :: ViewConfig -> String

showList :: [ViewConfig] -> ShowS #

Show PortConfig Source # 
Instance details

Defined in IHP.IDE.PortConfig

Methods

showsPrec :: Int -> PortConfig -> ShowS #

show :: PortConfig -> String

showList :: [PortConfig] -> ShowS #

Show Column Source # 
Instance details

Defined in IHP.IDE.SchemaDesigner.Types

Methods

showsPrec :: Int -> Column -> ShowS #

show :: Column -> String

showList :: [Column] -> ShowS #

Show ColumnGenerator Source # 
Instance details

Defined in IHP.IDE.SchemaDesigner.Types

Show Constraint Source # 
Instance details

Defined in IHP.IDE.SchemaDesigner.Types

Methods

showsPrec :: Int -> Constraint -> ShowS #

show :: Constraint -> String

showList :: [Constraint] -> ShowS #

Show CreateTable Source # 
Instance details

Defined in IHP.IDE.SchemaDesigner.Types

Methods

showsPrec :: Int -> CreateTable -> ShowS #

show :: CreateTable -> String

showList :: [CreateTable] -> ShowS #

Show DeferrableType Source # 
Instance details

Defined in IHP.IDE.SchemaDesigner.Types

Show ExcludeConstraintElement Source # 
Instance details

Defined in IHP.IDE.SchemaDesigner.Types

Show Expression Source # 
Instance details

Defined in IHP.IDE.SchemaDesigner.Types

Methods

showsPrec :: Int -> Expression -> ShowS #

show :: Expression -> String

showList :: [Expression] -> ShowS #

Show IndexColumn Source # 
Instance details

Defined in IHP.IDE.SchemaDesigner.Types

Methods

showsPrec :: Int -> IndexColumn -> ShowS #

show :: IndexColumn -> String

showList :: [IndexColumn] -> ShowS #

Show IndexColumnOrder Source # 
Instance details

Defined in IHP.IDE.SchemaDesigner.Types

Show IndexType Source # 
Instance details

Defined in IHP.IDE.SchemaDesigner.Types

Methods

showsPrec :: Int -> IndexType -> ShowS #

show :: IndexType -> String

showList :: [IndexType] -> ShowS #

Show OnDelete Source # 
Instance details

Defined in IHP.IDE.SchemaDesigner.Types

Methods

showsPrec :: Int -> OnDelete -> ShowS #

show :: OnDelete -> String

showList :: [OnDelete] -> ShowS #

Show PolicyAction Source # 
Instance details

Defined in IHP.IDE.SchemaDesigner.Types

Methods

showsPrec :: Int -> PolicyAction -> ShowS #

show :: PolicyAction -> String

showList :: [PolicyAction] -> ShowS #

Show PostgresType Source # 
Instance details

Defined in IHP.IDE.SchemaDesigner.Types

Methods

showsPrec :: Int -> PostgresType -> ShowS #

show :: PostgresType -> String

showList :: [PostgresType] -> ShowS #

Show PrimaryKeyConstraint Source # 
Instance details

Defined in IHP.IDE.SchemaDesigner.Types

Show Select Source # 
Instance details

Defined in IHP.IDE.SchemaDesigner.Types

Methods

showsPrec :: Int -> Select -> ShowS #

show :: Select -> String

showList :: [Select] -> ShowS #

Show Statement Source # 
Instance details

Defined in IHP.IDE.SchemaDesigner.Types

Methods

showsPrec :: Int -> Statement -> ShowS #

show :: Statement -> String

showList :: [Statement] -> ShowS #

Show TriggerEvent Source # 
Instance details

Defined in IHP.IDE.SchemaDesigner.Types

Methods

showsPrec :: Int -> TriggerEvent -> ShowS #

show :: TriggerEvent -> String

showList :: [TriggerEvent] -> ShowS #

Show TriggerEventWhen Source # 
Instance details

Defined in IHP.IDE.SchemaDesigner.Types

Show TriggerFor Source # 
Instance details

Defined in IHP.IDE.SchemaDesigner.Types

Methods

showsPrec :: Int -> TriggerFor -> ShowS #

show :: TriggerFor -> String

showList :: [TriggerFor] -> ShowS #

Show CodeGenController Source # 
Instance details

Defined in IHP.IDE.ToolServer.Types

Show ColumnDefinition Source # 
Instance details

Defined in IHP.IDE.ToolServer.Types

Show ColumnsController Source # 
Instance details

Defined in IHP.IDE.ToolServer.Types

Show DataController Source # 
Instance details

Defined in IHP.IDE.ToolServer.Types

Show DynamicField Source # 
Instance details

Defined in IHP.IDE.ToolServer.Types

Methods

showsPrec :: Int -> DynamicField -> ShowS #

show :: DynamicField -> String

showList :: [DynamicField] -> ShowS #

Show EnumValuesController Source # 
Instance details

Defined in IHP.IDE.ToolServer.Types

Show EnumsController Source # 
Instance details

Defined in IHP.IDE.ToolServer.Types

Show IndexesController Source # 
Instance details

Defined in IHP.IDE.ToolServer.Types

Show LogsController Source # 
Instance details

Defined in IHP.IDE.ToolServer.Types

Show MigrationsController Source # 
Instance details

Defined in IHP.IDE.ToolServer.Types

Show PoliciesController Source # 
Instance details

Defined in IHP.IDE.ToolServer.Types

Show SchemaController Source # 
Instance details

Defined in IHP.IDE.ToolServer.Types

Show TablesController Source # 
Instance details

Defined in IHP.IDE.ToolServer.Types

Show Action Source # 
Instance details

Defined in IHP.IDE.Types

Methods

showsPrec :: Int -> Action -> ShowS #

show :: Action -> String

showList :: [Action] -> ShowS #

Show AppGHCIState Source # 
Instance details

Defined in IHP.IDE.Types

Methods

showsPrec :: Int -> AppGHCIState -> ShowS #

show :: AppGHCIState -> String

showList :: [AppGHCIState] -> ShowS #

Show AppState Source # 
Instance details

Defined in IHP.IDE.Types

Methods

showsPrec :: Int -> AppState -> ShowS #

show :: AppState -> String

showList :: [AppState] -> ShowS #

Show ManagedProcess Source # 
Instance details

Defined in IHP.IDE.Types

Show OutputLine Source # 
Instance details

Defined in IHP.IDE.Types

Methods

showsPrec :: Int -> OutputLine -> ShowS #

show :: OutputLine -> String

showList :: [OutputLine] -> ShowS #

Show PostgresState Source # 
Instance details

Defined in IHP.IDE.Types

Methods

showsPrec :: Int -> PostgresState -> ShowS #

show :: PostgresState -> String

showList :: [PostgresState] -> ShowS #

Show StatusServerState Source # 
Instance details

Defined in IHP.IDE.Types

Show BaseJob Source # 
Instance details

Defined in IHP.Job.Dashboard.Types

Methods

showsPrec :: Int -> BaseJob -> ShowS #

show :: BaseJob -> String

showList :: [BaseJob] -> ShowS #

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 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 AttributeOperation Source # 
Instance details

Defined in IHP.ServerSideComponent.HtmlDiff

Show NodeOperation Source # 
Instance details

Defined in IHP.ServerSideComponent.HtmlDiff

Methods

showsPrec :: Int -> NodeOperation -> ShowS #

show :: NodeOperation -> String

showList :: [NodeOperation] -> ShowS #

Show Attribute Source # 
Instance details

Defined in IHP.ServerSideComponent.HtmlParser

Methods

showsPrec :: Int -> Attribute -> ShowS #

show :: Attribute -> String

showList :: [Attribute] -> ShowS #

Show Node Source # 
Instance details

Defined in IHP.ServerSideComponent.HtmlParser

Methods

showsPrec :: Int -> Node -> ShowS #

show :: Node -> String

showList :: [Node] -> ShowS #

Show TelemetryInfo Source # 
Instance details

Defined in IHP.Telemetry

Methods

showsPrec :: Int -> TelemetryInfo -> ShowS #

show :: TelemetryInfo -> String

showList :: [TelemetryInfo] -> 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 ScrubbedBytes 
Instance details

Defined in Data.ByteArray.ScrubbedBytes

Methods

showsPrec :: Int -> ScrubbedBytes -> ShowS #

show :: ScrubbedBytes -> String

showList :: [ScrubbedBytes] -> 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 AssumeRoleCredentials 
Instance details

Defined in Network.Minio.Credentials.AssumeRole

Methods

showsPrec :: Int -> AssumeRoleCredentials -> ShowS #

show :: AssumeRoleCredentials -> String

showList :: [AssumeRoleCredentials] -> ShowS #

Show AssumeRoleResult 
Instance details

Defined in Network.Minio.Credentials.AssumeRole

Methods

showsPrec :: Int -> AssumeRoleResult -> ShowS #

show :: AssumeRoleResult -> String

showList :: [AssumeRoleResult] -> 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 ListItem 
Instance details

Defined in Network.Minio.ListOps

Methods

showsPrec :: Int -> ListItem -> ShowS #

show :: ListItem -> String

showList :: [ListItem] -> 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 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 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 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 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 Attribute 
Instance details

Defined in Database.PostgreSQL.Simple.TypeInfo.Types

Methods

showsPrec :: Int -> Attribute -> ShowS #

show :: Attribute -> String

showList :: [Attribute] -> ShowS #

Show TypeInfo 
Instance details

Defined in Database.PostgreSQL.Simple.TypeInfo.Types

Methods

showsPrec :: Int -> TypeInfo -> ShowS #

show :: TypeInfo -> String

showList :: [TypeInfo] -> 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 Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Methods

showsPrec :: Int -> Doc -> ShowS #

show :: Doc -> String

showList :: [Doc] -> 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 ProcessHandle Source # 
Instance details

Defined in IHP.IDE.Types

Methods

showsPrec :: Int -> ProcessHandle -> ShowS #

show :: ProcessHandle -> String

showList :: [ProcessHandle] -> 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 Undefined 
Instance details

Defined in Relude.Debug

Methods

showsPrec :: Int -> Undefined -> ShowS #

show :: Undefined -> String

showList :: [Undefined] -> ShowS #

Show InvalidAccess 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

showsPrec :: Int -> InvalidAccess -> ShowS #

show :: InvalidAccess -> String

showList :: [InvalidAccess] -> ShowS #

Show ResourceCleanupException 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

showsPrec :: Int -> ResourceCleanupException -> ShowS #

show :: ResourceCleanupException -> String

showList :: [ResourceCleanupException] -> ShowS #

Show RetryAction 
Instance details

Defined in Control.Retry

Methods

showsPrec :: Int -> RetryAction -> ShowS #

show :: RetryAction -> String

showList :: [RetryAction] -> ShowS #

Show RetryStatus 
Instance details

Defined in Control.Retry

Methods

showsPrec :: Int -> RetryStatus -> ShowS #

show :: RetryStatus -> String

showList :: [RetryStatus] -> ShowS #

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

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Body -> ShowS #

show :: Body -> String

showList :: [Body] -> ShowS #

Show Bytes 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Bytes -> ShowS #

show :: Bytes -> String

showList :: [Bytes] -> ShowS #

Show Callconv 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Callconv -> ShowS #

show :: Callconv -> String

showList :: [Callconv] -> ShowS #

Show Clause 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Clause -> ShowS #

show :: Clause -> String

showList :: [Clause] -> ShowS #

Show Con 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Con -> ShowS #

show :: Con -> String

showList :: [Con] -> ShowS #

Show Dec 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Dec -> ShowS #

show :: Dec -> String

showList :: [Dec] -> ShowS #

Show DecidedStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> DecidedStrictness -> ShowS #

show :: DecidedStrictness -> String

showList :: [DecidedStrictness] -> ShowS #

Show DerivClause 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> DerivClause -> ShowS #

show :: DerivClause -> String

showList :: [DerivClause] -> ShowS #

Show DerivStrategy 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> DerivStrategy -> ShowS #

show :: DerivStrategy -> String

showList :: [DerivStrategy] -> ShowS #

Show DocLoc 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> DocLoc -> ShowS #

show :: DocLoc -> String

showList :: [DocLoc] -> ShowS #

Show Exp 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Exp -> ShowS #

show :: Exp -> String

showList :: [Exp] -> ShowS #

Show FamilyResultSig 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> FamilyResultSig -> ShowS #

show :: FamilyResultSig -> String

showList :: [FamilyResultSig] -> ShowS #

Show Fixity 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Fixity -> ShowS #

show :: Fixity -> String

showList :: [Fixity] -> ShowS #

Show FixityDirection 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> FixityDirection -> ShowS #

show :: FixityDirection -> String

showList :: [FixityDirection] -> ShowS #

Show Foreign 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Foreign -> ShowS #

show :: Foreign -> String

showList :: [Foreign] -> ShowS #

Show FunDep 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> FunDep -> ShowS #

show :: FunDep -> String

showList :: [FunDep] -> ShowS #

Show Guard 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Guard -> ShowS #

show :: Guard -> String

showList :: [Guard] -> ShowS #

Show Info 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Info -> ShowS #

show :: Info -> String

showList :: [Info] -> ShowS #

Show InjectivityAnn 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> InjectivityAnn -> ShowS #

show :: InjectivityAnn -> String

showList :: [InjectivityAnn] -> ShowS #

Show Inline 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Inline -> ShowS #

show :: Inline -> String

showList :: [Inline] -> ShowS #

Show Lit 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Lit -> ShowS #

show :: Lit -> String

showList :: [Lit] -> ShowS #

Show Loc 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Loc -> ShowS #

show :: Loc -> String

showList :: [Loc] -> ShowS #

Show Match 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Match -> ShowS #

show :: Match -> String

showList :: [Match] -> ShowS #

Show ModName 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> ModName -> ShowS #

show :: ModName -> String

showList :: [ModName] -> ShowS #

Show Module 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Module -> ShowS #

show :: Module -> String

showList :: [Module] -> ShowS #

Show ModuleInfo 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> ModuleInfo -> ShowS #

show :: ModuleInfo -> String

showList :: [ModuleInfo] -> ShowS #

Show Name 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Name -> ShowS #

show :: Name -> String

showList :: [Name] -> ShowS #

Show NameFlavour 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> NameFlavour -> ShowS #

show :: NameFlavour -> String

showList :: [NameFlavour] -> ShowS #

Show NameSpace 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> NameSpace -> ShowS #

show :: NameSpace -> String

showList :: [NameSpace] -> ShowS #

Show OccName 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> OccName -> ShowS #

show :: OccName -> String

showList :: [OccName] -> ShowS #

Show Overlap 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Overlap -> ShowS #

show :: Overlap -> String

showList :: [Overlap] -> ShowS #

Show Pat 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Pat -> ShowS #

show :: Pat -> String

showList :: [Pat] -> ShowS #

Show PatSynArgs 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> PatSynArgs -> ShowS #

show :: PatSynArgs -> String

showList :: [PatSynArgs] -> ShowS #

Show PatSynDir 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> PatSynDir -> ShowS #

show :: PatSynDir -> String

showList :: [PatSynDir] -> ShowS #

Show Phases 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Phases -> ShowS #

show :: Phases -> String

showList :: [Phases] -> ShowS #

Show PkgName 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> PkgName -> ShowS #

show :: PkgName -> String

showList :: [PkgName] -> ShowS #

Show Pragma 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Pragma -> ShowS #

show :: Pragma -> String

showList :: [Pragma] -> ShowS #

Show Range 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Range -> ShowS #

show :: Range -> String

showList :: [Range] -> ShowS #

Show Role 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Role -> ShowS #

show :: Role -> String

showList :: [Role] -> ShowS #

Show RuleBndr 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> RuleBndr -> ShowS #

show :: RuleBndr -> String

showList :: [RuleBndr] -> ShowS #

Show RuleMatch 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> RuleMatch -> ShowS #

show :: RuleMatch -> String

showList :: [RuleMatch] -> ShowS #

Show Safety 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Safety -> ShowS #

show :: Safety -> String

showList :: [Safety] -> ShowS #

Show SourceStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> SourceStrictness -> ShowS #

show :: SourceStrictness -> String

showList :: [SourceStrictness] -> ShowS #

Show SourceUnpackedness 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> SourceUnpackedness -> ShowS #

show :: SourceUnpackedness -> String

showList :: [SourceUnpackedness] -> ShowS #

Show Specificity 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Specificity -> ShowS #

show :: Specificity -> String

showList :: [Specificity] -> ShowS #

Show Stmt 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Stmt -> ShowS #

show :: Stmt -> String

showList :: [Stmt] -> ShowS #

Show TyLit 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> TyLit -> ShowS #

show :: TyLit -> String

showList :: [TyLit] -> ShowS #

Show TySynEqn 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> TySynEqn -> ShowS #

show :: TySynEqn -> String

showList :: [TySynEqn] -> ShowS #

Show Type 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> Type -> ShowS #

show :: Type -> String

showList :: [Type] -> ShowS #

Show TypeFamilyHead 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

showsPrec :: Int -> TypeFamilyHead -> ShowS #

show :: TypeFamilyHead -> String

showList :: [TypeFamilyHead] -> ShowS #

Show Decoding 
Instance details

Defined in Data.Text.Encoding

Methods

showsPrec :: Int -> Decoding -> ShowS #

show :: Decoding -> String

showList :: [Decoding] -> ShowS #

Show FPFormat 
Instance details

Defined in Data.Text.Lazy.Builder.RealFloat

Methods

showsPrec :: Int -> FPFormat -> ShowS #

show :: FPFormat -> String

showList :: [FPFormat] -> ShowS #

Show ShortText 
Instance details

Defined in Data.Text.Short.Internal

Methods

showsPrec :: Int -> ShortText -> ShowS #

show :: ShortText -> String

showList :: [ShortText] -> ShowS #

Show ConstructorInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

showsPrec :: Int -> ConstructorInfo -> ShowS #

show :: ConstructorInfo -> String

showList :: [ConstructorInfo] -> ShowS #

Show ConstructorVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

showsPrec :: Int -> ConstructorVariant -> ShowS #

show :: ConstructorVariant -> String

showList :: [ConstructorVariant] -> ShowS #

Show DatatypeInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

showsPrec :: Int -> DatatypeInfo -> ShowS #

show :: DatatypeInfo -> String

showList :: [DatatypeInfo] -> ShowS #

Show DatatypeVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

showsPrec :: Int -> DatatypeVariant -> ShowS #

show :: DatatypeVariant -> String

showList :: [DatatypeVariant] -> ShowS #

Show FieldStrictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

showsPrec :: Int -> FieldStrictness -> ShowS #

show :: FieldStrictness -> String

showList :: [FieldStrictness] -> ShowS #

Show Strictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

showsPrec :: Int -> Strictness -> ShowS #

show :: Strictness -> String

showList :: [Strictness] -> ShowS #

Show Unpackedness 
Instance details

Defined in Language.Haskell.TH.Datatype

Methods

showsPrec :: Int -> Unpackedness -> ShowS #

show :: Unpackedness -> String

showList :: [Unpackedness] -> ShowS #

Show CalendarDiffDays 
Instance details

Defined in Data.Time.Calendar.CalendarDiffDays

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

Defined in Network.Wai.Parse

Methods

showsPrec :: Int -> Bound -> ShowS #

show :: Bound -> String

showList :: [Bound] -> 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 Protocol 
Instance details

Defined in Network.WebSockets.Protocol

Methods

showsPrec :: Int -> Protocol -> ShowS #

show :: Protocol -> String

showList :: [Protocol] -> ShowS #

Show PongTimeout 
Instance details

Defined in Network.WebSockets.Server

Methods

showsPrec :: Int -> PongTimeout -> ShowS #

show :: PongTimeout -> String

showList :: [PongTimeout] -> 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 AWSAuthVersion 
Instance details

Defined in Network.Wreq.Internal.Types

Methods

showsPrec :: Int -> AWSAuthVersion -> ShowS #

show :: AWSAuthVersion -> String

showList :: [AWSAuthVersion] -> ShowS #

Show Auth 
Instance details

Defined in Network.Wreq.Internal.Types

Methods

showsPrec :: Int -> Auth -> ShowS #

show :: Auth -> String

showList :: [Auth] -> ShowS #

Show FormParam 
Instance details

Defined in Network.Wreq.Internal.Types

Methods

showsPrec :: Int -> FormParam -> ShowS #

show :: FormParam -> String

showList :: [FormParam] -> ShowS #

Show JSONError 
Instance details

Defined in Network.Wreq.Internal.Types

Methods

showsPrec :: Int -> JSONError -> ShowS #

show :: JSONError -> String

showList :: [JSONError] -> ShowS #

Show Link 
Instance details

Defined in Network.Wreq.Internal.Types

Methods

showsPrec :: Int -> Link -> ShowS #

show :: Link -> String

showList :: [Link] -> ShowS #

Show Options 
Instance details

Defined in Network.Wreq.Internal.Types

Methods

showsPrec :: Int -> Options -> ShowS #

show :: Options -> String

showList :: [Options] -> ShowS #

Show Session 
Instance details

Defined in Network.Wreq.Internal.Types

Methods

showsPrec :: Int -> Session -> ShowS #

show :: Session -> String

showList :: [Session] -> 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 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 (Only a) 
Instance details

Defined in Data.Tuple.Only

Methods

showsPrec :: Int -> Only a -> ShowS #

show :: Only a -> String

showList :: [Only a] -> ShowS #

Show (Encoding' a) 
Instance details

Defined in Data.Aeson.Encoding.Internal

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 (Async ()) Source # 
Instance details

Defined in IHP.IDE.Types

Methods

showsPrec :: Int -> Async () -> ShowS #

show :: Async () -> String

showList :: [Async ()] -> 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 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 (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 (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 (IORef x) Source # 
Instance details

Defined in IHP.IDE.Types

Methods

showsPrec :: Int -> IORef x -> ShowS #

show :: IORef x -> String

showList :: [IORef x] -> 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 (Bits n) 
Instance details

Defined in Basement.Bits

Methods

showsPrec :: Int -> Bits n -> ShowS #

show :: Bits n -> String

showList :: [Bits n] -> ShowS #

(PrimType ty, Show ty) => Show (Block ty) 
Instance details

Defined in Basement.Block.Base

Methods

showsPrec :: Int -> Block ty -> ShowS #

show :: Block ty -> String

showList :: [Block ty] -> ShowS #

Show (Zn n) 
Instance details

Defined in Basement.Bounded

Methods

showsPrec :: Int -> Zn n -> ShowS #

show :: Zn n -> String

showList :: [Zn n] -> ShowS #

Show (Zn64 n) 
Instance details

Defined in Basement.Bounded

Methods

showsPrec :: Int -> Zn64 n -> ShowS #

show :: Zn64 n -> String

showList :: [Zn64 n] -> ShowS #

Show a => Show (NonEmpty a) 
Instance details

Defined in Basement.NonEmpty

Methods

showsPrec :: Int -> NonEmpty a -> ShowS #

show :: NonEmpty a -> String

showList :: [NonEmpty a] -> ShowS #

Show (CountOf ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

showsPrec :: Int -> CountOf ty -> ShowS #

show :: CountOf ty -> String

showList :: [CountOf ty] -> ShowS #

Show (Offset ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

showsPrec :: Int -> Offset ty -> ShowS #

show :: Offset ty -> String

showList :: [Offset ty] -> ShowS #

(PrimType ty, Show ty) => Show (UArray ty) 
Instance details

Defined in Basement.UArray.Base

Methods

showsPrec :: Int -> UArray ty -> ShowS #

show :: UArray ty -> String

showList :: [UArray ty] -> ShowS #

Show s => Show (CI s) 
Instance details

Defined in Data.CaseInsensitive.Internal

Methods

showsPrec :: Int -> CI s -> ShowS #

show :: CI s -> String

showList :: [CI s] -> ShowS #

Show 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 (Blake2b bitlen) 
Instance details

Defined in Crypto.Hash.Blake2

Methods

showsPrec :: Int -> Blake2b bitlen -> ShowS #

show :: Blake2b bitlen -> String

showList :: [Blake2b bitlen] -> ShowS #

Show (Blake2bp bitlen) 
Instance details

Defined in Crypto.Hash.Blake2

Methods

showsPrec :: Int -> Blake2bp bitlen -> ShowS #

show :: Blake2bp bitlen -> String

showList :: [Blake2bp bitlen] -> ShowS #

Show (Blake2s bitlen) 
Instance details

Defined in Crypto.Hash.Blake2

Methods

showsPrec :: Int -> Blake2s bitlen -> ShowS #

show :: Blake2s bitlen -> String

showList :: [Blake2s bitlen] -> ShowS #

Show (Blake2sp bitlen) 
Instance details

Defined in Crypto.Hash.Blake2

Methods

showsPrec :: Int -> Blake2sp bitlen -> ShowS #

show :: Blake2sp bitlen -> String

showList :: [Blake2sp bitlen] -> ShowS #

Show (SHAKE128 bitlen) 
Instance details

Defined in Crypto.Hash.SHAKE

Methods

showsPrec :: Int -> SHAKE128 bitlen -> ShowS #

show :: SHAKE128 bitlen -> String

showList :: [SHAKE128 bitlen] -> ShowS #

Show (SHAKE256 bitlen) 
Instance details

Defined in Crypto.Hash.SHAKE

Methods

showsPrec :: Int -> SHAKE256 bitlen -> ShowS #

show :: SHAKE256 bitlen -> String

showList :: [SHAKE256 bitlen] -> ShowS #

Show (Digest a) 
Instance details

Defined in Crypto.Hash.Types

Methods

showsPrec :: Int -> Digest a -> ShowS #

show :: Digest a -> String

showList :: [Digest a] -> ShowS #

Show a => Show (CryptoFailable a) 
Instance details

Defined in Crypto.Error.Types

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 #

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 (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 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 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 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 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 mono => Show (NonNull mono) 
Instance details

Defined in Data.NonNull

Methods

showsPrec :: Int -> NonNull mono -> ShowS #

show :: NonNull mono -> String

showList :: [NonNull mono] -> ShowS #

Show a => Show (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 (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 (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 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 a, PrimUnlifted a) => Show (UnliftedArray a) 
Instance details

Defined in Data.Primitive.Unlifted.Array

Methods

showsPrec :: Int -> UnliftedArray a -> ShowS #

show :: UnliftedArray a -> String

showList :: [UnliftedArray a] -> ShowS #

Show g => Show (StateGen g) 
Instance details

Defined in System.Random.Internal

Methods

showsPrec :: Int -> StateGen g -> ShowS #

show :: StateGen g -> String

showList :: [StateGen g] -> ShowS #

Show g => Show (AtomicGen g) 
Instance details

Defined in System.Random.Stateful

Methods

showsPrec :: Int -> AtomicGen g -> ShowS #

show :: AtomicGen g -> String

showList :: [AtomicGen g] -> ShowS #

Show g => Show (IOGen g) 
Instance details

Defined in System.Random.Stateful

Methods

showsPrec :: Int -> IOGen g -> ShowS #

show :: IOGen g -> String

showList :: [IOGen g] -> ShowS #

Show g => Show (STGen g) 
Instance details

Defined in System.Random.Stateful

Methods

showsPrec :: Int -> STGen g -> ShowS #

show :: STGen g -> String

showList :: [STGen g] -> ShowS #

Show g => Show (TGen g) 
Instance details

Defined in System.Random.Stateful

Methods

showsPrec :: Int -> TGen g -> ShowS #

show :: TGen g -> String

showList :: [TGen g] -> ShowS #

Show a => Show (Chunk a) 
Instance details

Defined in Data.List.Split.Internals

Methods

showsPrec :: Int -> Chunk a -> ShowS #

show :: Chunk a -> String

showList :: [Chunk a] -> ShowS #

Show 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 a => Show (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Methods

showsPrec :: Int -> HashSet a -> ShowS #

show :: HashSet a -> String

showList :: [HashSet a] -> ShowS #

Show a => Show (Vector a) 
Instance details

Defined in Data.Vector

Methods

showsPrec :: Int -> Vector a -> ShowS #

show :: Vector a -> String

showList :: [Vector a] -> ShowS #

(Show a, Prim a) => Show (Vector a) 
Instance details

Defined in Data.Vector.Primitive

Methods

showsPrec :: Int -> Vector a -> ShowS #

show :: Vector a -> String

showList :: [Vector a] -> ShowS #

(Show a, Storable a) => Show (Vector a) 
Instance details

Defined in Data.Vector.Storable

Methods

showsPrec :: Int -> Vector a -> ShowS #

show :: Vector a -> String

showList :: [Vector a] -> ShowS #

Show 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 (CacheEntry body) 
Instance details

Defined in Network.Wreq.Internal.Types

Methods

showsPrec :: Int -> CacheEntry body -> ShowS #

show :: CacheEntry body -> String

showList :: [CacheEntry body] -> 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 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 (a) 
Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a) -> ShowS #

show :: (a) -> String

showList :: [(a)] -> ShowS #

Show a => Show [a] 
Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> [a] -> ShowS #

show :: [a] -> String

showList :: [[a]] -> ShowS #

(Ix ix, Show ix, Show e, IArray UArray e) => Show (UArray ix e) 
Instance details

Defined in Data.Array.Base

Methods

showsPrec :: Int -> UArray ix e -> ShowS #

show :: UArray ix e -> String

showList :: [UArray ix e] -> ShowS #

(Show i, Show r) => Show (IResult i r) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

showsPrec :: Int -> IResult i r -> ShowS #

show :: IResult i r -> String

showList :: [IResult i r] -> ShowS #

(Show a, Show b) => Show (Either a b) 
Instance details

Defined in Data.Either

Methods

showsPrec :: Int -> Either a b -> ShowS #

show :: Either a b -> String

showList :: [Either a b] -> ShowS #

HasResolution a => Show (Fixed a) 
Instance details

Defined in Data.Fixed

Methods

showsPrec :: Int -> Fixed a -> ShowS #

show :: Fixed a -> String

showList :: [Fixed a] -> ShowS #

Show (Proxy s) 
Instance details

Defined in Data.Proxy

Methods

showsPrec :: Int -> Proxy s -> ShowS #

show :: Proxy s -> String

showList :: [Proxy s] -> ShowS #

(Show a, Show b) => Show (Arg a b) 
Instance details

Defined in Data.Semigroup

Methods

showsPrec :: Int -> Arg a b -> ShowS #

show :: Arg a b -> String

showList :: [Arg a b] -> ShowS #

Show (TypeRep a) 
Instance details

Defined in Data.Typeable.Internal

Methods

showsPrec :: Int -> TypeRep a -> ShowS #

show :: TypeRep a -> String

showList :: [TypeRep a] -> ShowS #

(Ix a, Show a, Show b) => Show (Array a b) 
Instance details

Defined in GHC.Arr

Methods

showsPrec :: Int -> Array a b -> ShowS #

show :: Array a b -> String

showList :: [Array a b] -> ShowS #

Show (U1 p) 
Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> U1 p -> ShowS #

show :: U1 p -> String

showList :: [U1 p] -> ShowS #

Show (V1 p) 
Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> V1 p -> ShowS #

show :: V1 p -> String

showList :: [V1 p] -> ShowS #

Show (ST s a) 
Instance details

Defined in GHC.ST

Methods

showsPrec :: Int -> ST s a -> ShowS #

show :: ST s a -> String

showList :: [ST s a] -> ShowS #

(Show k, Show a) => Show (Map k a) 
Instance details

Defined in Data.Map.Internal

Methods

showsPrec :: Int -> Map k a -> ShowS #

show :: Map k a -> String

showList :: [Map k a] -> ShowS #

(Show1 f, Show a) => Show (Cofree f a) 
Instance details

Defined in Control.Comonad.Cofree

Methods

showsPrec :: Int -> Cofree f a -> ShowS #

show :: Cofree f a -> String

showList :: [Cofree f a] -> ShowS #

(Show1 f, Show a) => Show (Free f a) 
Instance details

Defined in Control.Monad.Free

Methods

showsPrec :: Int -> Free f a -> ShowS #

show :: Free f a -> String

showList :: [Free f a] -> ShowS #

Show a => Show (EvalStatus_ a b) 
Instance details

Defined in GHCi.Message

Methods

showsPrec :: Int -> EvalStatus_ a b -> ShowS #

show :: EvalStatus_ a b -> String

showList :: [EvalStatus_ a b] -> ShowS #

Show (f a) => Show (Yoneda f a) 
Instance details

Defined in Data.Functor.Yoneda

Methods

showsPrec :: Int -> Yoneda f a -> ShowS #

show :: Yoneda f a -> String

showList :: [Yoneda f a] -> ShowS #

(Show i, Show a) => Show (Level i a) 
Instance details

Defined in Control.Lens.Internal.Level

Methods

showsPrec :: Int -> Level i a -> ShowS #

show :: Level i a -> String

showList :: [Level i a] -> ShowS #

(Show 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 (ComponentsController components) Source # 
Instance details

Defined in IHP.ServerSideComponent.Types

Methods

showsPrec :: Int -> ComponentsController components -> ShowS #

show :: ComponentsController components -> String

showList :: [ComponentsController components] -> 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 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, 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 #

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 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 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 (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 (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 (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 (ErrorT e m a) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

showsPrec :: Int -> ErrorT e m a -> ShowS #

show :: ErrorT e m a -> String

showList :: [ErrorT e m a] -> ShowS #

(Show e, Show1 m, Show a) => Show (ExceptT e m a) 
Instance details

Defined in Control.Monad.Trans.Except

Methods

showsPrec :: Int -> ExceptT e m a -> ShowS #

show :: ExceptT e m a -> String

showList :: [ExceptT e m a] -> ShowS #

(Show1 f, Show a) => Show (IdentityT f a) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

showsPrec :: Int -> IdentityT f a -> ShowS #

show :: IdentityT f a -> String

showList :: [IdentityT f a] -> ShowS #

(Show w, Show1 m, Show a) => Show (WriterT w m a) 
Instance details

Defined in Control.Monad.Trans.Writer.Lazy

Methods

showsPrec :: Int -> WriterT w m a -> ShowS #

show :: WriterT w m a -> String

showList :: [WriterT w m a] -> ShowS #

(Show w, Show1 m, Show a) => Show (WriterT w m a) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

showsPrec :: Int -> WriterT w m a -> ShowS #

show :: WriterT w m a -> String

showList :: [WriterT w m a] -> ShowS #

Show a => Show (Constant a b) 
Instance details

Defined in Data.Functor.Constant

Methods

showsPrec :: Int -> Constant a b -> ShowS #

show :: Constant a b -> String

showList :: [Constant a b] -> ShowS #

(Show1 f, Show a) => Show (Reverse f a) 
Instance details

Defined in Data.Functor.Reverse

Methods

showsPrec :: Int -> Reverse f a -> ShowS #

show :: Reverse f a -> String

showList :: [Reverse f a] -> ShowS #

(Show a, Show b, Show c) => Show (a, b, c) 
Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> (a, b, c) -> ShowS #

show :: (a, b, c) -> String

showList :: [(a, b, c)] -> ShowS #

(Show1 f, Show1 g, Show 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 #

(Show1 f, Show1 g, Show 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 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 #

(Show1 f, Show1 g, Show 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 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 #

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

Defined in Data.Tuple.Only

Methods

fmap :: (a -> b) -> Only a -> Only b #

(<$) :: a -> Only b -> Only a #

Functor KeyMap 
Instance details

Defined in Data.Aeson.KeyMap

Methods

fmap :: (a -> b) -> KeyMap a -> KeyMap b #

(<$) :: a -> KeyMap b -> KeyMap a #

Functor FromJSONKeyFunction 
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 Async 
Instance details

Defined in Control.Concurrent.Async

Methods

fmap :: (a -> b) -> Async a -> Async b #

(<$) :: a -> Async b -> Async a #

Functor Concurrently 
Instance details

Defined in Control.Concurrent.Async

Methods

fmap :: (a -> b) -> Concurrently a -> Concurrently b #

(<$) :: a -> Concurrently b -> Concurrently 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 STM 
Instance details

Defined in GHC.Conc.Sync

Methods

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

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

Functor Par1 
Instance details

Defined in GHC.Generics

Methods

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

(<$) :: a -> Par1 b -> Par1 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 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 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 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 PV 
Instance details

Defined in GHC.Parser.PostProcess

Methods

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

(<$) :: a -> PV b -> PV 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 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 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 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 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 Ok 
Instance details

Defined in Database.PostgreSQL.Simple.Ok

Methods

fmap :: (a -> b) -> Ok a -> Ok b #

(<$) :: a -> Ok b -> Ok 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 Array 
Instance details

Defined in Data.Primitive.Array

Methods

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

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

Functor SmallArray 
Instance details

Defined in Data.Primitive.SmallArray

Methods

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

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

Functor Maybe 
Instance details

Defined in Data.Strict.Maybe

Methods

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

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

Functor Q 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

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

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

Functor TyVarBndr 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

fmap :: (a -> b) -> TyVarBndr a -> TyVarBndr b #

(<$) :: a -> TyVarBndr b -> TyVarBndr a #

Functor Flat 
Instance details

Defined in UnliftIO.Internals.Async

Methods

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

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

Functor FlatApp 
Instance details

Defined in UnliftIO.Internals.Async

Methods

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

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

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

Defined in Network.Wreq.Internal.Types

Methods

fmap :: (a -> b) -> CacheEntry a -> CacheEntry b #

(<$) :: a -> CacheEntry b -> CacheEntry 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 NonEmpty 
Instance details

Defined in GHC.Base

Methods

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

(<$) :: a -> NonEmpty b -> NonEmpty 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 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 (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 (IResult i) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

fmap :: (a -> b) -> IResult i a -> IResult i b #

(<$) :: a -> IResult i b -> IResult i a #

Functor (Parser i) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

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

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

Monad m => Functor (WrappedMonad m) 
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 #

Monad m => Functor (ZipSource m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

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

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

Functor (SetM s) 
Instance details

Defined in Data.Graph

Methods

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

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

Functor (Map k) 
Instance details

Defined in Data.Map.Internal

Methods

fmap :: (a -> b) -> Map k a -> Map k b #

(<$) :: a -> Map k b -> Map k a #

Monad m => Functor (Handler m) 
Instance details

Defined in Control.Monad.Catch

Methods

fmap :: (a -> b) -> Handler m a -> Handler m b #

(<$) :: a -> Handler m b -> Handler m a #

Functor f => Functor (Cofree f) 
Instance details

Defined in Control.Comonad.Cofree

Methods

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

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

Functor f => Functor (Free f) 
Instance details

Defined in Control.Monad.Free

Methods

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

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

Functor (MaybeO ex) 
Instance details

Defined in GHC.Cmm.Dataflow.Block

Methods

fmap :: (a -> b) -> MaybeO ex a -> MaybeO ex b #

(<$) :: a -> MaybeO ex b -> MaybeO ex a #

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

Defined in Test.Hspec.Core.Spec.Monad

Methods

fmap :: (a0 -> b) -> SpecM a a0 -> SpecM a b #

(<$) :: a0 -> SpecM a b -> SpecM a a0 #

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 f => Functor (WrappedPoly f) 
Instance details

Defined in Data.MonoTraversable

Methods

fmap :: (a -> b) -> WrappedPoly f a -> WrappedPoly f b #

(<$) :: a -> WrappedPoly f b -> WrappedPoly f a #

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

Defined in Data.These

Methods

fmap :: (a0 -> b) -> These a a0 -> These a b #

(<$) :: a0 -> These a b -> These a a0 #

Functor f => Functor (Lift f) 
Instance details

Defined in Control.Applicative.Lift

Methods

fmap :: (a -> b) -> Lift f a -> Lift f b #

(<$) :: a -> Lift f b -> Lift f a #

Functor m => Functor (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

fmap :: (a -> b) -> MaybeT m a -> MaybeT m b #

(<$) :: a -> MaybeT m b -> MaybeT m a #

Functor m => Functor (Conc m) 
Instance details

Defined in UnliftIO.Internals.Async

Methods

fmap :: (a -> b) -> Conc m a -> Conc m b #

(<$) :: a -> Conc m b -> Conc m a #

Monad m => Functor (Concurrently m) 
Instance details

Defined in UnliftIO.Internals.Async

Methods

fmap :: (a -> b) -> Concurrently m a -> Concurrently m b #

(<$) :: a -> Concurrently m b -> Concurrently m a #

Functor (HashMap k) 
Instance details

Defined in Data.HashMap.Internal

Methods

fmap :: (a -> b) -> HashMap k a -> HashMap k b #

(<$) :: a -> HashMap k b -> HashMap k a #

Functor ((,) a) 
Instance details

Defined in GHC.Base

Methods

fmap :: (a0 -> b) -> (a, a0) -> (a, b) #

(<$) :: a0 -> (a, b) -> (a, a0) #

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 #

Bifunctor p => Functor (Fix p) 
Instance details

Defined in Data.Bifunctor.Fix

Methods

fmap :: (a -> b) -> Fix p a -> Fix p b #

(<$) :: a -> Fix p b -> Fix p a #

Bifunctor p => Functor (Join p) 
Instance details

Defined in Data.Bifunctor.Join

Methods

fmap :: (a -> b) -> Join p a -> Join p b #

(<$) :: a -> Join p b -> Join p a #

Monad m => Functor (ZipSink i m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

fmap :: (a -> b) -> ZipSink i m a -> ZipSink i m b #

(<$) :: a -> ZipSink i m b -> ZipSink i m a #

(Applicative f, Monad f) => Functor (WhenMissing f x) 
Instance details

Defined in Data.IntMap.Internal

Methods

fmap :: (a -> b) -> WhenMissing f x a -> WhenMissing f x b #

(<$) :: a -> WhenMissing f x b -> WhenMissing f x a #

Functor f => Functor (CofreeF f a) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

fmap :: (a0 -> b) -> CofreeF f a a0 -> CofreeF f a b #

(<$) :: a0 -> CofreeF f a b -> CofreeF f a a0 #

(Functor f, Functor w) => Functor (CofreeT f w) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

fmap :: (a -> b) -> CofreeT f w a -> CofreeT f w b #

(<$) :: a -> CofreeT f w b -> CofreeT f w a #

Functor f => Functor (FreeF f a) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

fmap :: (a0 -> b) -> FreeF f a a0 -> FreeF f a b #

(<$) :: a0 -> FreeF f a b -> FreeF f a a0 #

(Functor f, Monad 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 (Indexing f) 
Instance details

Defined in WithIndex

Methods

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

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

Functor (Day f g) 
Instance details

Defined in Data.Functor.Day

Methods

fmap :: (a -> b) -> Day f g a -> Day f g b #

(<$) :: a -> Day f g b -> Day f g a #

Functor (Context a b) 
Instance details

Defined in Control.Lens.Internal.Context

Methods

fmap :: (a0 -> b0) -> Context a b a0 -> Context a b b0 #

(<$) :: a0 -> Context a b b0 -> Context a b a0 #

Functor (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 (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 #

Functor (CopastroSum p a) 
Instance details

Defined in Data.Profunctor.Choice

Methods

fmap :: (a0 -> b) -> CopastroSum p a a0 -> CopastroSum p a b #

(<$) :: a0 -> CopastroSum p a b -> CopastroSum p a a0 #

Functor (CotambaraSum p a) 
Instance details

Defined in Data.Profunctor.Choice

Methods

fmap :: (a0 -> b) -> CotambaraSum p a a0 -> CotambaraSum p a b #

(<$) :: a0 -> CotambaraSum p a b -> CotambaraSum p a a0 #

Functor (PastroSum p a) 
Instance details

Defined in Data.Profunctor.Choice

Methods

fmap :: (a0 -> b) -> PastroSum p a a0 -> PastroSum p a b #

(<$) :: a0 -> PastroSum p a b -> PastroSum p a a0 #

Profunctor p => Functor (TambaraSum p a) 
Instance details

Defined in Data.Profunctor.Choice

Methods

fmap :: (a0 -> b) -> TambaraSum p a a0 -> TambaraSum p a b #

(<$) :: a0 -> TambaraSum p a b -> TambaraSum p a a0 #

Profunctor p => Functor (Coprep p) 
Instance details

Defined in Data.Profunctor.Rep

Methods

fmap :: (a -> b) -> Coprep p a -> Coprep p b #

(<$) :: a -> Coprep p b -> Coprep p a #

Profunctor p => Functor (Prep p) 
Instance details

Defined in Data.Profunctor.Rep

Methods

fmap :: (a -> b) -> Prep p a -> Prep p b #

(<$) :: a -> Prep p b -> Prep p a #

Functor (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 (ErrorT e m) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

fmap :: (a -> b) -> ErrorT e m a -> ErrorT e m b #

(<$) :: a -> ErrorT e m b -> ErrorT e 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.Lazy

Methods

fmap :: (a -> b) -> WriterT w m a -> WriterT w m b #

(<$) :: a -> WriterT w m b -> WriterT w m a #

Functor m => Functor (WriterT w m) 
Instance details

Defined in Control.Monad.Trans.Writer.Strict

Methods

fmap :: (a -> b) -> WriterT w m a -> WriterT w m b #

(<$) :: a -> WriterT w m b -> WriterT w m a #

Functor (Constant a :: Type -> Type) 
Instance details

Defined in Data.Functor.Constant

Methods

fmap :: (a0 -> b) -> Constant a a0 -> Constant a b #

(<$) :: a0 -> Constant a b -> Constant a a0 #

Functor f => Functor (Reverse f) 
Instance details

Defined in Data.Functor.Reverse

Methods

fmap :: (a -> b) -> Reverse f a -> Reverse f b #

(<$) :: a -> Reverse f b -> Reverse f a #

Monad m => Functor (Bundle m v) 
Instance details

Defined in Data.Vector.Fusion.Bundle.Monadic

Methods

fmap :: (a -> b) -> Bundle m v a -> Bundle m v b #

(<$) :: a -> Bundle m v b -> Bundle m v a #

Functor ((,,) a b) 
Instance details

Defined in GHC.Base

Methods

fmap :: (a0 -> b0) -> (a, b, a0) -> (a, b, b0) #

(<$) :: a0 -> (a, b, b0) -> (a, b, a0) #

(Functor f, Functor g) => Functor (Product f g) 
Instance details

Defined in Data.Functor.Product

Methods

fmap :: (a -> b) -> Product f g a -> Product f g b #

(<$) :: a -> Product f g b -> Product f g a #

(Functor f, Functor g) => Functor (Sum f g) 
Instance details

Defined in Data.Functor.Sum

Methods

fmap :: (a -> b) -> Sum f g a -> Sum f g b #

(<$) :: a -> Sum f g b -> Sum f g a #

(Functor f, Functor g) => Functor (f :*: g) 
Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> (f :*: g) a -> (f :*: g) b #

(<$) :: a -> (f :*: g) b -> (f :*: g) a #

(Functor f, Functor g) => Functor (f :+: g) 
Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> (f :+: g) a -> (f :+: g) b #

(<$) :: a -> (f :+: g) b -> (f :+: g) a #

Functor (K1 i c :: Type -> Type) 
Instance details

Defined in GHC.Generics

Methods

fmap :: (a -> b) -> K1 i c a -> K1 i c b #

(<$) :: a -> K1 i c b -> K1 i c a #

Functor (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 (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 (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 (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 #

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.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 #

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

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

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 #

Methods

mapKeysWith :: (BPMKeyConstraint Map k1, BPMKeyConstraint Map k2) => (v -> v -> v) -> (k1 -> k2) -> Map k1 v -> Map k2 v #

FoldableWithIndex k (Map k) 
Instance details

Defined in WithIndex

Methods

ifoldMap :: Monoid m => (k -> a -> m) -> Map k a -> m

ifoldMap' :: Monoid m => (k -> a -> m) -> Map k a -> m

ifoldr :: (k -> a -> b -> b) -> b -> Map k a -> b

ifoldl :: (k -> b -> a -> b) -> b -> Map k a -> b

ifoldr' :: (k -> a -> b -> b) -> b -> Map k a -> b

ifoldl' :: (k -> b -> a -> b) -> b -> Map k a -> b

FunctorWithIndex k (Map k) 
Instance details

Defined in WithIndex

Methods

imap :: (k -> a -> b) -> Map k a -> Map k b

TraversableWithIndex k (Map k) 
Instance details

Defined in WithIndex

Methods

itraverse :: Applicative f => (k -> a -> f b) -> Map k a -> f (Map k b)

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

(Lift k, Lift a) => Lift (Map k a :: Type) 
Instance details

Defined in Data.Map.Internal

Methods

lift :: Quote m => Map k a -> m Exp

liftTyped :: forall (m :: Type -> Type). Quote m => Map k a -> Code m (Map k a)

(FromJSONKey k, Ord k) => FromJSON1 (Map k) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (Map k a) #

liftParseJSONList :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [Map k a] #

ToJSONKey k => ToJSON1 (Map k) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Value) -> ([a] -> Value) -> Map k a -> Value #

liftToJSONList :: (a -> Value) -> ([a] -> Value) -> [Map k a] -> Value #

liftToEncoding :: (a -> Encoding) -> ([a] -> Encoding) -> Map k a -> Encoding #

liftToEncodingList :: (a -> Encoding) -> ([a] -> Encoding) -> [Map k a] -> Encoding #

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)

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

mapTM :: (a -> b) -> Map k a -> 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

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 #

(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] #

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

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

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

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

Methods

_Wrapped' :: Iso' (Map k a) (Unwrapped (Map k a))

Ord k => HasKeysSet (Map k v) 
Instance details

Defined in Data.Containers

Associated Types

type KeySet (Map k v) #

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

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

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)

Methods

one :: OneItem (Map k v) -> Map k v

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

data MVar a #

Instances

Instances details
NFData1 MVar 
Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> MVar a -> ()

SetField "subscriptions" DataSyncController (HashMap UUID (MVar ())) Source # 
Instance details

Defined in IHP.DataSync.ControllerImpl

NFData (MVar a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: MVar a -> () #

Eq (MVar a) 
Instance details

Defined in GHC.MVar

Methods

(==) :: MVar a -> MVar a -> Bool #

(/=) :: MVar a -> MVar a -> Bool #

FromField a => FromField (MVar a) 
Instance details

Defined in Database.PostgreSQL.Simple.FromField

Methods

fromField :: FieldParser (MVar a)

PrimUnlifted (MVar a) 
Instance details

Defined in Data.Primitive.Unlifted.Class

Associated Types

type Unlifted (MVar a) :: UnliftedType

Methods

toUnlifted# :: MVar a -> Unlifted (MVar a)

fromUnlifted# :: Unlifted (MVar a) -> MVar a

writeUnliftedArray# :: MutableArrayArray# s -> Int# -> MVar a -> State# s -> State# s

readUnliftedArray# :: MutableArrayArray# s -> Int# -> State# s -> (# State# s, MVar a #)

indexUnliftedArray# :: ArrayArray# -> Int# -> MVar a

type Unlifted (MVar a) 
Instance details

Defined in Data.Primitive.Unlifted.Class

type Unlifted (MVar a) = MVar# RealWorld a

data IORef a #

Instances

Instances details
NFData1 IORef 
Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> IORef a -> ()

Show (IORef x) Source # 
Instance details

Defined in IHP.IDE.Types

Methods

showsPrec :: Int -> IORef x -> ShowS #

show :: IORef x -> String

showList :: [IORef x] -> ShowS #

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

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

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

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) :: UnliftedType

Methods

toUnlifted# :: IORef a -> Unlifted (IORef a)

fromUnlifted# :: Unlifted (IORef a) -> IORef a

writeUnliftedArray# :: MutableArrayArray# s -> Int# -> IORef a -> State# s -> State# s

readUnliftedArray# :: MutableArrayArray# s -> Int# -> State# s -> (# State# s, IORef a #)

indexUnliftedArray# :: ArrayArray# -> Int# -> IORef a

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

class IsString a where #

Methods

fromString :: String -> a #

Instances

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

Defined in Basement.UTF8.Base

Methods

fromString :: String0 -> 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 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 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 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 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 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] #

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 #

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

data Either a b #

Constructors

Left a 
Right b 

Instances

Instances details
FromJSON2 Either 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON2 :: (Value -> Parser a) -> (Value -> Parser [a]) -> (Value -> Parser b) -> (Value -> Parser [b]) -> Value -> Parser (Either a b) #

liftParseJSONList2 :: (Value -> Parser a) -> (Value -> Parser [a]) -> (Value -> Parser b) -> (Value -> Parser [b]) -> Value -> Parser [Either a b] #

ToJSON2 Either 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON2 :: (a -> Value) -> ([a] -> Value) -> (b -> Value) -> ([b] -> Value) -> Either a b -> Value #

liftToJSONList2 :: (a -> Value) -> ([a] -> Value) -> (b -> Value) -> ([b] -> Value) -> [Either a b] -> Value #

liftToEncoding2 :: (a -> Encoding) -> ([a] -> Encoding) -> (b -> Encoding) -> ([b] -> Encoding) -> Either a b -> Encoding #

liftToEncodingList2 :: (a -> Encoding) -> ([a] -> Encoding) -> (b -> Encoding) -> ([b] -> Encoding) -> [Either a b] -> Encoding #

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 #

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

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) :: k -> Type

Methods

from1 :: forall (a0 :: k). Either a a0 -> Rep1 (Either a) a0

to1 :: forall (a0 :: k). Rep1 (Either a) a0 -> Either a a0

(Lift a, Lift b) => Lift (Either a b :: Type) 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Either a b -> m Exp

liftTyped :: forall (m :: Type -> Type). Quote m => Either a b -> Code m (Either a b)

FromJSON a => FromJSON1 (Either a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: (Value -> Parser a0) -> (Value -> Parser [a0]) -> Value -> Parser (Either a a0) #

liftParseJSONList :: (Value -> Parser a0) -> (Value -> Parser [a0]) -> Value -> Parser [Either a a0] #

ToJSON a => ToJSON1 (Either a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a0 -> Value) -> ([a0] -> Value) -> Either a a0 -> Value #

liftToJSONList :: (a0 -> Value) -> ([a0] -> Value) -> [Either a a0] -> Value #

liftToEncoding :: (a0 -> Encoding) -> ([a0] -> Encoding) -> Either a a0 -> Encoding #

liftToEncodingList :: (a0 -> Encoding) -> ([a0] -> Encoding) -> [Either a a0] -> Encoding #

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 #

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)

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 :: 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 :: ((forall a. Either e a -> Either e a) -> Either e b) -> Either e b

uninterruptibleMask :: ((forall a. Either e a -> Either e a) -> Either e b) -> Either e b

generalBracket :: 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 :: 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

(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] #

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

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

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 #

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

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

(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

(FoldableWithIndex i f, FoldableWithIndex j g) => FoldableWithIndex (Either i j) (Product f g) 
Instance details

Defined in WithIndex

Methods

ifoldMap :: Monoid m => (Either i j -> a -> m) -> Product f g a -> m

ifoldMap' :: Monoid m => (Either i j -> a -> m) -> Product f g a -> m

ifoldr :: (Either i j -> a -> b -> b) -> b -> Product f g a -> b

ifoldl :: (Either i j -> b -> a -> b) -> b -> Product f g a -> b

ifoldr' :: (Either i j -> a -> b -> b) -> b -> Product f g a -> b

ifoldl' :: (Either i j -> b -> a -> b) -> b -> Product f g a -> b

(FoldableWithIndex i f, FoldableWithIndex j g) => FoldableWithIndex (Either i j) (Sum f g) 
Instance details

Defined in WithIndex

Methods

ifoldMap :: Monoid m => (Either i j -> a -> m) -> Sum f g a -> m

ifoldMap' :: Monoid m => (Either i j -> a -> m) -> Sum f g a -> m

ifoldr :: (Either i j -> a -> b -> b) -> b -> Sum f g a -> b

ifoldl :: (Either i j -> b -> a -> b) -> b -> Sum f g a -> b

ifoldr' :: (Either i j -> a -> b -> b) -> b -> Sum f g a -> b

ifoldl' :: (Either i j -> b -> a -> b) -> b -> Sum f g a -> b

(FoldableWithIndex i f, FoldableWithIndex j g) => FoldableWithIndex (Either i j) (f :*: g) 
Instance details

Defined in WithIndex

Methods

ifoldMap :: Monoid m => (Either i j -> a -> m) -> (f :*: g) a -> m

ifoldMap' :: Monoid m => (Either i j -> a -> m) -> (f :*: g) a -> m

ifoldr :: (Either i j -> a -> b -> b) -> b -> (f :*: g) a -> b

ifoldl :: (Either i j -> b -> a -> b) -> b -> (f :*: g) a -> b

ifoldr' :: (Either i j -> a -> b -> b) -> b -> (f :*: g) a -> b

ifoldl' :: (Either i j -> b -> a -> b) -> b -> (f :*: g) a -> b

(FoldableWithIndex i f, FoldableWithIndex j g) => FoldableWithIndex (Either i j) (f :+: g) 
Instance details

Defined in WithIndex

Methods

ifoldMap :: Monoid m => (Either i j -> a -> m) -> (f :+: g) a -> m

ifoldMap' :: Monoid m => (Either i j -> a -> m) -> (f :+: g) a -> m

ifoldr :: (Either i j -> a -> b -> b) -> b -> (f :+: g) a -> b

ifoldl :: (Either i j -> b -> a -> b) -> b -> (f :+: g) a -> b

ifoldr' :: (Either i j -> a -> b -> b) -> b -> (f :+: g) a -> b

ifoldl' :: (Either i j -> b -> a -> b) -> b -> (f :+: g) a -> b

(FunctorWithIndex i f, FunctorWithIndex j g) => FunctorWithIndex (Either i j) (Product f g) 
Instance details

Defined in WithIndex

Methods

imap :: (Either i j -> a -> b) -> Product f g a -> Product f g b

(FunctorWithIndex i f, FunctorWithIndex j g) => FunctorWithIndex (Either i j) (Sum f g) 
Instance details

Defined in WithIndex

Methods

imap :: (Either i j -> a -> b) -> Sum f g a -> Sum f g b

(FunctorWithIndex i f, FunctorWithIndex j g) => FunctorWithIndex (Either i j) (f :*: g) 
Instance details

Defined in WithIndex

Methods

imap :: (Either i j -> a -> b) -> (f :*: g) a -> (f :*: g) b

(FunctorWithIndex i f, FunctorWithIndex j g) => FunctorWithIndex (Either i j) (f :+: g) 
Instance details

Defined in WithIndex

Methods

imap :: (Either i j -> a -> b) -> (f :+: g) a -> (f :+: g) b

(TraversableWithIndex i f, TraversableWithIndex j g) => TraversableWithIndex (Either i j) (Product f g) 
Instance details

Defined in WithIndex

Methods

itraverse :: Applicative f0 => (Either i j -> a -> f0 b) -> Product f g a -> f0 (Product f g b)

(TraversableWithIndex i f, TraversableWithIndex j g) => TraversableWithIndex (Either i j) (Sum f g) 
Instance details

Defined in WithIndex

Methods

itraverse :: Applicative f0 => (Either i j -> a -> f0 b) -> Sum f g a -> f0 (Sum f g b)

(TraversableWithIndex i f, TraversableWithIndex j g) => TraversableWithIndex (Either i j) (f :*: g) 
Instance details

Defined in WithIndex

Methods

itraverse :: Applicative f0 => (Either i j -> a -> f0 b) -> (f :*: g) a -> f0 ((f :*: g) b)

(TraversableWithIndex i f, TraversableWithIndex j g) => TraversableWithIndex (Either i j) (f :+: g) 
Instance details

Defined in WithIndex

Methods

itraverse :: Applicative f0 => (Either i j -> a -> f0 b) -> (f :+: g) a -> f0 ((f :+: g) b)

type Rep1 (Either a :: Type -> Type) 
Instance details

Defined in GHC.Generics

type Rep1 (Either a :: Type -> Type) = D1 ('MetaData "Either" "Data.Either" "base" 'False) (C1 ('MetaCons "Left" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)) :+: C1 ('MetaCons "Right" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1))
type Failure (Either a) 
Instance details

Defined in Basement.Monad

type Failure (Either a) = a
type 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
FromJSON Float 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Float #

parseJSONList :: Value -> Parser [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]

Subtractive Float 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Float

Methods

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

PrimType Float 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Float :: Nat

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 #

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 #

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

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)

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

Defined in GHC.Generics

Associated Types

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

Methods

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

to1 :: forall (a :: k0). Rep1 (URec Float) 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) #

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 #

Generic (URec Float p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Float p) :: 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 :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (Vector a) #

liftParseJSONList :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [Vector a] #

ToJSON1 Vector 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Value) -> ([a] -> Value) -> Vector a -> Value #

liftToJSONList :: (a -> Value) -> ([a] -> Value) -> [Vector a] -> Value #

liftToEncoding :: (a -> Encoding) -> ([a] -> Encoding) -> Vector a -> Encoding #

liftToEncodingList :: (a -> Encoding) -> ([a] -> Encoding) -> [Vector a] -> Encoding #

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

Vector Vector a 
Instance details

Defined in Data.Vector

Methods

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

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

basicLength :: Vector a -> Int

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

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

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

elemseq :: Vector a -> a -> b -> b

FromJSON a => FromJSON (Vector a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Vector a) #

parseJSONList :: Value -> Parser [Vector a] #

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)

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)

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] #

SemiSequence (Vector a) 
Instance details

Defined in Data.Sequences

Associated Types

type Index (Vector a) #

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

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 #

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

(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 :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (HashMap k a) #

liftParseJSONList :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [HashMap k a] #

ToJSONKey k => ToJSON1 (HashMap k) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Value) -> ([a] -> Value) -> HashMap k a -> Value #

liftToJSONList :: (a -> Value) -> ([a] -> Value) -> [HashMap k a] -> Value #

liftToEncoding :: (a -> Encoding) -> ([a] -> Encoding) -> HashMap k a -> Encoding #

liftToEncodingList :: (a -> Encoding) -> ([a] -> Encoding) -> [HashMap k a] -> Encoding #

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

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 #

(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] #

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

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)

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

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

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

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)

Methods

one :: OneItem (HashMap k v) -> HashMap k v

(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 LByteString = ByteString #

data Bool #

Constructors

False 
True 

Instances

Instances details
FromJSON Bool 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Bool #

parseJSONList :: Value -> Parser [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 ()

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

Methods

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

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

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

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 #

Example Bool 
Instance details

Defined in Test.Hspec.Core.Example

Associated Types

type Arg Bool

Methods

evaluateExample :: Bool -> Params -> (ActionWith (Arg Bool) -> IO ()) -> ProgressCallback -> IO Result

ApplyAttribute Bool 
Instance details

Defined in IHP.HSX.QQ

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

Random Bool 
Instance details

Defined in System.Random

Methods

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

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

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

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

Uniform Bool 
Instance details

Defined in System.Random.Internal

Methods

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

UniformRange Bool 
Instance details

Defined in System.Random.Internal

Methods

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

Unbox Bool 
Instance details

Defined in Data.Vector.Unboxed.Base

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)

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)

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 Semigroup a => Monoid a where #

Minimal complete definition

mempty

Methods

mempty :: a #

mappend :: a -> a -> a #

mconcat :: [a] -> a #

Instances

Instances details
Monoid Series 
Instance details

Defined in Data.Aeson.Encoding.Internal

Monoid Key 
Instance details

Defined in Data.Aeson.Key

Methods

mempty :: Key #

mappend :: Key -> Key -> Key #

mconcat :: [Key] -> Key #

Monoid More 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

mempty :: More #

mappend :: More -> More -> More #

mconcat :: [More] -> More #

Monoid ByteArray 
Instance details

Defined in Data.Array.Byte

Methods

mempty :: ByteArray #

mappend :: ByteArray -> ByteArray -> ByteArray #

mconcat :: [ByteArray] -> ByteArray #

Monoid All 
Instance details

Defined in Data.Semigroup.Internal

Methods

mempty :: All #

mappend :: All -> All -> All #

mconcat :: [All] -> All #

Monoid Any 
Instance details

Defined in Data.Semigroup.Internal

Methods

mempty :: Any #

mappend :: Any -> Any -> Any #

mconcat :: [Any] -> Any #

Monoid String 
Instance details

Defined in Basement.UTF8.Base

Methods

mempty :: String #

mappend :: String -> String -> String #

mconcat :: [String] -> String #

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

Defined in System.Log.FastLogger.LogStr

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

Defined in Data.Text.Short.Internal

Methods

mempty :: ShortText #

mappend :: ShortText -> ShortText -> ShortText #

mconcat :: [ShortText] -> ShortText #

Monoid CalendarDiffDays 
Instance details

Defined in Data.Time.Calendar.CalendarDiffDays

Monoid CalendarDiffTime 
Instance details

Defined in Data.Time.LocalTime.Internal.CalendarDiffTime

Monoid SizeLimit 
Instance details

Defined in Network.WebSockets.Connection.Options

Methods

mempty :: SizeLimit #

mappend :: SizeLimit -> SizeLimit -> SizeLimit #

mconcat :: [SizeLimit] -> SizeLimit #

Monoid () 
Instance details

Defined in GHC.Base

Methods

mempty :: () #

mappend :: () -> () -> () #

mconcat :: [()] -> () #

Monoid (KeyMap v) 
Instance details

Defined in Data.Aeson.KeyMap

Methods

mempty :: KeyMap v #

mappend :: KeyMap v -> KeyMap v -> KeyMap v #

mconcat :: [KeyMap v] -> KeyMap v #

Monoid (IResult a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

mempty :: IResult a #

mappend :: IResult a -> IResult a -> IResult a #

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

Monoid (Parser a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

mempty :: Parser a #

mappend :: Parser a -> Parser a -> Parser a #

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

Monoid (Result a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

mempty :: Result a #

mappend :: Result a -> Result a -> Result a #

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

(Semigroup a, Monoid a) => Monoid (Concurrently a) 
Instance details

Defined in Control.Concurrent.Async

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

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

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

PrimUnlifted a => Monoid (UnliftedArray a) 
Instance details

Defined in Data.Primitive.Unlifted.Array

Methods

mempty :: UnliftedArray a #

mappend :: UnliftedArray a -> UnliftedArray a -> UnliftedArray a #

mconcat :: [UnliftedArray a] -> UnliftedArray a #

Monad m => Monoid (RetryPolicyM m) 
Instance details

Defined in Control.Retry

Methods

mempty :: RetryPolicyM m #

mappend :: RetryPolicyM m -> RetryPolicyM m -> RetryPolicyM m #

mconcat :: [RetryPolicyM m] -> RetryPolicyM m #

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 #

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

Defined in GHC.Base

Methods

mempty :: (a) #

mappend :: (a) -> (a) -> (a) #

mconcat :: [(a)] -> (a) #

Monoid [a] 
Instance details

Defined in GHC.Base

Methods

mempty :: [a] #

mappend :: [a] -> [a] -> [a] #

mconcat :: [[a]] -> [a] #

Monoid (Parser i a) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

mempty :: Parser i a #

mappend :: Parser i a -> Parser i a -> Parser i a #

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

Monoid a => Monoid (Op a b) 
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 #

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

Defined in Control.Lens.Reified

Methods

mempty :: ReifiedFold s a #

mappend :: ReifiedFold s a -> ReifiedFold s a -> ReifiedFold s a #

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

(Stream s, Ord e) => Monoid (ParseError s e) 
Instance details

Defined in Text.Megaparsec.Error

Methods

mempty :: ParseError s e #

mappend :: ParseError s e -> ParseError s e -> ParseError s e #

mconcat :: [ParseError s e] -> ParseError s e #

(Monoid a, Monoid 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 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 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 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 #

Monad m => Monoid (Sequenced a m) 
Instance details

Defined in WithIndex

Methods

mempty :: Sequenced a m #

mappend :: Sequenced a m -> Sequenced a m -> Sequenced a m #

mconcat :: [Sequenced a m] -> Sequenced a m #

Applicative f => Monoid (Traversed a f) 
Instance details

Defined in WithIndex

Methods

mempty :: Traversed a f #

mappend :: Traversed a f -> Traversed a f -> Traversed a f #

mconcat :: [Traversed a f] -> Traversed a f #

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 #

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

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

Defined in Data.Aeson.Types.Internal

Methods

pure :: a -> IResult a #

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

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

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

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

Applicative Parser 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

pure :: a -> Parser a #

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

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

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

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

Applicative Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

pure :: a -> Result a #

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

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

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

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

Applicative Concurrently 
Instance details

Defined in Control.Concurrent.Async

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

Defined in Data.DList.DNonEmpty.Internal

Methods

pure :: a -> DNonEmpty a #

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

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

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

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

Applicative DList 
Instance details

Defined in Data.DList.Internal

Methods

pure :: a -> DList a #

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

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

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

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

Applicative MatchResult 
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 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 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 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 Q 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

pure :: a -> Q a #

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

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

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

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

Applicative Flat 
Instance details

Defined in UnliftIO.Internals.Async

Methods

pure :: a -> Flat a #

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

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

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

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

Applicative FlatApp 
Instance details

Defined in UnliftIO.Internals.Async

Methods

pure :: a -> FlatApp a #

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

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

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

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

Applicative 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 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 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 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] #

Representable f => Applicative (Co f) 
Instance details

Defined in Data.Functor.Rep

Methods

pure :: a -> Co f a #

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

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

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

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

Applicative (Parser i) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

pure :: a -> Parser i a #

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

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

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

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

Monad m => Applicative (WrappedMonad m) 
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 #

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

Defined in Test.Hspec.Core.Spec.Monad

Methods

pure :: a0 -> SpecM a a0 #

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

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

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

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

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 f => Applicative (WrappedPoly f) 
Instance details

Defined in Data.MonoTraversable

Methods

pure :: a -> WrappedPoly f a #

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

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

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

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

Applicative 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 #

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 #

Semigroup a => Applicative (These a) 
Instance details

Defined in Data.These

Methods

pure :: a0 -> These a a0 #

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

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

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

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

Applicative f => Applicative (Lift f) 
Instance details

Defined in Control.Applicative.Lift

Methods

pure :: a -> Lift f a #

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

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

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

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

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

Defined in Control.Monad.Trans.Maybe

Methods

pure :: a -> MaybeT m a #

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

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

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

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

MonadUnliftIO m => Applicative (Conc m) 
Instance details

Defined in UnliftIO.Internals.Async

Methods

pure :: a -> Conc m a #

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

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

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

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

MonadUnliftIO m => Applicative (Concurrently m) 
Instance details

Defined in UnliftIO.Internals.Async

Methods

pure :: a -> Concurrently m a #

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

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

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

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

Monoid a => Applicative ((,) a) 
Instance details

Defined in GHC.Base

Methods

pure :: a0 -> (a, a0) #

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

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

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

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

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 #

Biapplicative p => Applicative (Fix p) 
Instance details

Defined in Data.Bifunctor.Fix

Methods

pure :: a -> Fix p a #

(<*>) :: Fix p (a -> b) -> Fix p a -> Fix p b #

liftA2 :: (a -> b -> c) -> Fix p a -> Fix p b -> Fix p c #

(*>) :: Fix p a -> Fix p b -> Fix p b #

(<*) :: Fix p a -> Fix p b -> Fix p a #

Biapplicative p => Applicative (Join p) 
Instance details

Defined in Data.Bifunctor.Join

Methods

pure :: a -> Join p a #

(<*>) :: Join p (a -> b) -> Join p a -> Join p b #

liftA2 :: (a -> b -> c) -> Join p a -> Join p b -> Join p c #

(*>) :: Join p a -> Join p b -> Join p b #

(<*) :: Join p a -> Join p b -> Join p a #

Monad m => Applicative (ZipSink i m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

pure :: a -> ZipSink i m a #

(<*>) :: ZipSink i m (a -> b) -> ZipSink i m a -> ZipSink i m b #

liftA2 :: (a -> b -> c) -> ZipSink i m a -> ZipSink i m b -> ZipSink i m c #

(*>) :: ZipSink i m a -> ZipSink i m b -> ZipSink i m b #

(<*) :: ZipSink i m a -> ZipSink i m b -> ZipSink i m a #

(Applicative f, Monad f) => Applicative (WhenMissing f x) 
Instance details

Defined in Data.IntMap.Internal

Methods

pure :: a -> WhenMissing f x a #

(<*>) :: WhenMissing f x (a -> b) -> WhenMissing f x a -> WhenMissing f x b #

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

(*>) :: WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x b #

(<*) :: WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x a #

(Alternative f, Applicative w) => Applicative (CofreeT f w) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

pure :: a -> CofreeT f w a #

(<*>) :: CofreeT f w (a -> b) -> CofreeT f w a -> CofreeT f w b #

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

(*>) :: CofreeT f w a -> CofreeT f w b -> CofreeT f w b #

(<*) :: CofreeT f w a -> CofreeT f w b -> CofreeT f w a #

(Functor f, Monad m) => Applicative (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

pure :: a -> FreeT f m a #

(<*>) :: FreeT f m (a -> b) -> FreeT f m a -> FreeT f m b #

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

(*>) :: FreeT f m a -> FreeT f m b -> FreeT f m b #

(<*) :: FreeT f m a -> FreeT f m b -> FreeT f m a #

Applicative f => Applicative (Indexing f) 
Instance details

Defined in WithIndex

Methods

pure :: a -> Indexing f a #

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

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

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

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

(Applicative f, Applicative g) => Applicative (Day f g) 
Instance details

Defined in Data.Functor.Day

Methods

pure :: a -> Day f g a #

(<*>) :: Day f g (a -> b) -> Day f g a -> Day f g b #

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

(*>) :: Day f g a -> Day f g b -> Day f g b #

(<*) :: Day f g a -> Day f g b -> Day f g a #

Applicative (Indexed i a) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

pure :: a0 -> Indexed i a a0 #

(<*>) :: Indexed i a (a0 -> b) -> Indexed i a a0 -> Indexed i a b #

liftA2 :: (a0 -> b -> c) -> Indexed i a a0 -> Indexed i a b -> Indexed i a c #

(*>) :: Indexed i a a0 -> Indexed i a b -> Indexed i a b #

(<*) :: Indexed i a a0 -> Indexed i a b -> Indexed i a a0 #

Applicative (Flows i b) 
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 #

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

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 (ErrorT e m) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

pure :: a -> ErrorT e m a #

(<*>) :: ErrorT e m (a -> b) -> ErrorT e m a -> ErrorT e m b #

liftA2 :: (a -> b -> c) -> ErrorT e m a -> ErrorT e m b -> ErrorT e m c #

(*>) :: ErrorT e m a -> ErrorT e m b -> ErrorT e m b #

(<*) :: ErrorT e m a -> ErrorT e m b -> ErrorT e 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 #

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

Defined in Control.Monad.Trans.Writer.Lazy

Methods

pure :: a -> WriterT w m a #

(<*>) :: WriterT w m (a -> b) -> WriterT w m a -> WriterT w m b #

liftA2 :: (a -> b -> c) -> WriterT w m a -> WriterT w m b -> WriterT w m c #

(*>) :: WriterT w m a -> WriterT w m b -> WriterT w m b #

(<*) :: WriterT w m a -> WriterT w m b -> WriterT w m a #

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

Defined in Control.Monad.Trans.Writer.Strict

Methods

pure :: a -> WriterT w m a #

(<*>) :: WriterT w m (a -> b) -> WriterT w m a -> WriterT w m b #

liftA2 :: (a -> b -> c) -> WriterT w m a -> WriterT w m b -> WriterT w m c #

(*>) :: WriterT w m a -> WriterT w m b -> WriterT w m b #

(<*) :: WriterT w m a -> WriterT w m b -> WriterT w m a #

Monoid a => Applicative (Constant a :: Type -> Type) 
Instance details

Defined in Data.Functor.Constant

Methods

pure :: a0 -> Constant a a0 #

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

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

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

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

Applicative f => Applicative (Reverse f) 
Instance details

Defined in Data.Functor.Reverse

Methods

pure :: a -> Reverse f a #

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

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

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

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

(Monoid a, Monoid b) => Applicative ((,,) a b) 
Instance details

Defined in GHC.Base

Methods

pure :: a0 -> (a, b, a0) #

(<*>) :: (a, b, a0 -> b0) -> (a, b, a0) -> (a, b, b0) #

liftA2 :: (a0 -> b0 -> c) -> (a, b, a0) -> (a, b, b0) -> (a, b, c) #

(*>) :: (a, b, a0) -> (a, b, b0) -> (a, b, b0) #

(<*) :: (a, b, a0) -> (a, b, b0) -> (a, b, a0) #

(Applicative f, Applicative g) => Applicative (Product f g) 
Instance details

Defined in Data.Functor.Product

Methods

pure :: a -> Product f g a #

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

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

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

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

(Applicative f, Applicative g) => Applicative (f :*: g) 
Instance details

Defined in GHC.Generics

Methods

pure :: a -> (f :*: g) a #

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

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

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

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

Monoid c => Applicative (K1 i c :: Type -> Type) 
Instance details

Defined in GHC.Generics

Methods

pure :: a -> K1 i c a #

(<*>) :: K1 i c (a -> b) -> K1 i c a -> K1 i c b #

liftA2 :: (a -> b -> c0) -> K1 i c a -> K1 i c b -> K1 i c c0 #

(*>) :: K1 i c a -> K1 i c b -> K1 i c b #

(<*) :: K1 i c a -> K1 i c b -> K1 i c a #

Applicative (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 #

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 #

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

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 #

(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 MonoFoldable mono where #

Minimal complete definition

Nothing

Methods

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

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

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

otoList :: mono -> [Element mono] #

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

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

onull :: mono -> Bool #

olength :: mono -> Int #

olength64 :: mono -> Int64 #

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

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

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

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

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

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

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

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

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

headEx :: mono -> Element mono #

lastEx :: mono -> Element mono #

unsafeHead :: mono -> Element mono #

unsafeLast :: mono -> Element mono #

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

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

oelem :: Element mono -> mono -> Bool #

onotElem :: Element mono -> mono -> Bool #

Instances

Instances details
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 #

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 #

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 #

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 #

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 #

MonoFoldable (Identity a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (Identity a) -> m) -> Identity a -> m #

ofoldr :: (Element (Identity a) -> b -> b) -> b -> Identity a -> b #

ofoldl' :: (a0 -> Element (Identity a) -> a0) -> a0 -> Identity a -> a0 #

otoList :: Identity a -> [Element (Identity a)] #

oall :: (Element (Identity a) -> Bool) -> Identity a -> Bool #

oany :: (Element (Identity a) -> Bool) -> Identity a -> Bool #

onull :: Identity a -> Bool #

olength :: Identity a -> Int #

olength64 :: Identity a -> Int64 #

ocompareLength :: Integral i => Identity a -> i -> Ordering #

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

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

omapM_ :: Applicative m => (Element (Identity a) -> m ()) -> Identity a -> m () #

oforM_ :: Applicative m => Identity a -> (Element (Identity a) -> m ()) -> m () #

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

ofoldMap1Ex :: Semigroup m => (Element (Identity a) -> m) -> Identity a -> m #

ofoldr1Ex :: (Element (Identity a) -> Element (Identity a) -> Element (Identity a)) -> Identity a -> Element (Identity a) #

ofoldl1Ex' :: (Element (Identity a) -> Element (Identity a) -> Element (Identity a)) -> Identity a -> Element (Identity a) #

headEx :: Identity a -> Element (Identity a) #

lastEx :: Identity a -> Element (Identity a) #

unsafeHead :: Identity a -> Element (Identity a) #

unsafeLast :: Identity a -> Element (Identity a) #

maximumByEx :: (Element (Identity a) -> Element (Identity a) -> Ordering) -> Identity a -> Element (Identity a) #

minimumByEx :: (Element (Identity a) -> Element (Identity a) -> Ordering) -> Identity a -> Element (Identity a) #

oelem :: Element (Identity a) -> Identity a -> Bool #

onotElem :: Element (Identity a) -> Identity a -> Bool #

MonoFoldable (Par1 a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (Par1 a) -> m) -> Par1 a -> m #

ofoldr :: (Element (Par1 a) -> b -> b) -> b -> Par1 a -> b #

ofoldl' :: (a0 -> Element (Par1 a) -> a0) -> a0 -> Par1 a -> a0 #

otoList :: Par1 a -> [Element (Par1 a)] #

oall :: (Element (Par1 a) -> Bool) -> Par1 a -> Bool #

oany :: (Element (Par1 a) -> Bool) -> Par1 a -> Bool #

onull :: Par1 a -> Bool #

olength :: Par1 a -> Int #

olength64 :: Par1 a -> Int64 #

ocompareLength :: Integral i => Par1 a -> i -> Ordering #

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

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

omapM_ :: Applicative m => (Element (Par1 a) -> m ()) -> Par1 a -> m () #

oforM_ :: Applicative m => Par1 a -> (Element (Par1 a) -> m ()) -> m () #

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

ofoldMap1Ex :: Semigroup m => (Element (Par1 a) -> m) -> Par1 a -> m #

ofoldr1Ex :: (Element (Par1 a) -> Element (Par1 a) -> Element (Par1 a)) -> Par1 a -> Element (Par1 a) #

ofoldl1Ex' :: (Element (Par1 a) -> Element (Par1 a) -> Element (Par1 a)) -> Par1 a -> Element (Par1 a) #

headEx :: Par1 a -> Element (Par1 a) #

lastEx :: Par1 a -> Element (Par1 a) #

unsafeHead :: Par1 a -> Element (Par1 a) #

unsafeLast :: Par1 a -> Element (Par1 a) #

maximumByEx :: (Element (Par1 a) -> Element (Par1 a) -> Ordering) -> Par1 a -> Element (Par1 a) #

minimumByEx :: (Element (Par1 a) -> Element (Par1 a) -> Ordering) -> Par1 a -> Element (Par1 a) #

oelem :: Element (Par1 a) -> Par1 a -> Bool #

onotElem :: Element (Par1 a) -> Par1 a -> Bool #

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 #

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 #

MonoFoldable (ViewL a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (ViewL a) -> m) -> ViewL a -> m #

ofoldr :: (Element (ViewL a) -> b -> b) -> b -> ViewL a -> b #

ofoldl' :: (a0 -> Element (ViewL a) -> a0) -> a0 -> ViewL a -> a0 #

otoList :: ViewL a -> [Element (ViewL a)] #

oall :: (Element (ViewL a) -> Bool) -> ViewL a -> Bool #

oany :: (Element (ViewL a) -> Bool) -> ViewL a -> Bool #

onull :: ViewL a -> Bool #

olength :: ViewL a -> Int #

olength64 :: ViewL a -> Int64 #

ocompareLength :: Integral i => ViewL a -> i -> Ordering #

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

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

omapM_ :: Applicative m => (Element (ViewL a) -> m ()) -> ViewL a -> m () #

oforM_ :: Applicative m => ViewL a -> (Element (ViewL a) -> m ()) -> m () #

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

ofoldMap1Ex :: Semigroup m => (Element (ViewL a) -> m) -> ViewL a -> m #

ofoldr1Ex :: (Element (ViewL a) -> Element (ViewL a) -> Element (ViewL a)) -> ViewL a -> Element (ViewL a) #

ofoldl1Ex' :: (Element (ViewL a) -> Element (ViewL a) -> Element (ViewL a)) -> ViewL a -> Element (ViewL a) #

headEx :: ViewL a -> Element (ViewL a) #

lastEx :: ViewL a -> Element (ViewL a) #

unsafeHead :: ViewL a -> Element (ViewL a) #

unsafeLast :: ViewL a -> Element (ViewL a) #

maximumByEx :: (Element (ViewL a) -> Element (ViewL a) -> Ordering) -> ViewL a -> Element (ViewL a) #

minimumByEx :: (Element (ViewL a) -> Element (ViewL a) -> Ordering) -> ViewL a -> Element (ViewL a) #

oelem :: Element (ViewL a) -> ViewL a -> Bool #

onotElem :: Element (ViewL a) -> ViewL a -> Bool #

MonoFoldable (ViewR a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (ViewR a) -> m) -> ViewR a -> m #

ofoldr :: (Element (ViewR a) -> b -> b) -> b -> ViewR a -> b #

ofoldl' :: (a0 -> Element (ViewR a) -> a0) -> a0 -> ViewR a -> a0 #

otoList :: ViewR a -> [Element (ViewR a)] #

oall :: (Element (ViewR a) -> Bool) -> ViewR a -> Bool #

oany :: (Element (ViewR a) -> Bool) -> ViewR a -> Bool #

onull :: ViewR a -> Bool #

olength :: ViewR a -> Int #

olength64 :: ViewR a -> Int64 #

ocompareLength :: Integral i => ViewR a -> i -> Ordering #

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

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

omapM_ :: Applicative m => (Element (ViewR a) -> m ()) -> ViewR a -> m () #

oforM_ :: Applicative m => ViewR a -> (Element (ViewR a) -> m ()) -> m () #

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

ofoldMap1Ex :: Semigroup m => (Element (ViewR a) -> m) -> ViewR a -> m #

ofoldr1Ex :: (Element (ViewR a) -> Element (ViewR a) -> Element (ViewR a)) -> ViewR a -> Element (ViewR a) #

ofoldl1Ex' :: (Element (ViewR a) -> Element (ViewR a) -> Element (ViewR a)) -> ViewR a -> Element (ViewR a) #

headEx :: ViewR a -> Element (ViewR a) #

lastEx :: ViewR a -> Element (ViewR a) #

unsafeHead :: ViewR a -> Element (ViewR a) #

unsafeLast :: ViewR a -> Element (ViewR a) #

maximumByEx :: (Element (ViewR a) -> Element (ViewR a) -> Ordering) -> ViewR a -> Element (ViewR a) #

minimumByEx :: (Element (ViewR a) -> Element (ViewR a) -> Ordering) -> ViewR a -> Element (ViewR a) #

oelem :: Element (ViewR a) -> ViewR a -> Bool #

onotElem :: Element (ViewR a) -> ViewR a -> Bool #

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 #

MonoFoldable (Tree a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (Tree a) -> m) -> Tree a -> m #

ofoldr :: (Element (Tree a) -> b -> b) -> b -> Tree a -> b #

ofoldl' :: (a0 -> Element (Tree a) -> a0) -> a0 -> Tree a -> a0 #

otoList :: Tree a -> [Element (Tree a)] #

oall :: (Element (Tree a) -> Bool) -> Tree a -> Bool #

oany :: (Element (Tree a) -> Bool) -> Tree a -> Bool #

onull :: Tree a -> Bool #

olength :: Tree a -> Int #

olength64 :: Tree a -> Int64 #

ocompareLength :: Integral i => Tree a -> i -> Ordering #

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

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

omapM_ :: Applicative m => (Element (Tree a) -> m ()) -> Tree a -> m () #

oforM_ :: Applicative m => Tree a -> (Element (Tree a) -> m ()) -> m () #

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

ofoldMap1Ex :: Semigroup m => (Element (Tree a) -> m) -> Tree a -> m #

ofoldr1Ex :: (Element (Tree a) -> Element (Tree a) -> Element (Tree a)) -> Tree a -> Element (Tree a) #

ofoldl1Ex' :: (Element (Tree a) -> Element (Tree a) -> Element (Tree a)) -> Tree a -> Element (Tree a) #

headEx :: Tree a -> Element (Tree a) #

lastEx :: Tree a -> Element (Tree a) #

unsafeHead :: Tree a -> Element (Tree a) #

unsafeLast :: Tree a -> Element (Tree a) #

maximumByEx :: (Element (Tree a) -> Element (Tree a) -> Ordering) -> Tree a -> Element (Tree a) #

minimumByEx :: (Element (Tree a) -> Element (Tree a) -> Ordering) -> Tree a -> Element (Tree a) #

oelem :: Element (Tree a) -> Tree a -> Bool #

onotElem :: Element (Tree a) -> Tree a -> Bool #

MonoFoldable mono => MonoFoldable (NonNull mono) 
Instance details

Defined in Data.NonNull

Methods

ofoldMap :: Monoid m => (Element (NonNull mono) -> m) -> NonNull mono -> m #

ofoldr :: (Element (NonNull mono) -> b -> b) -> b -> NonNull mono -> b #

ofoldl' :: (a -> Element (NonNull mono) -> a) -> a -> NonNull mono -> a #

otoList :: NonNull mono -> [Element (NonNull mono)] #

oall :: (Element (NonNull mono) -> Bool) -> NonNull mono -> Bool #

oany :: (Element (NonNull mono) -> Bool) -> NonNull mono -> Bool #

onull :: NonNull mono -> Bool #

olength :: NonNull mono -> Int #

olength64 :: NonNull mono -> Int64 #

ocompareLength :: Integral i => NonNull mono -> i -> Ordering #

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

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

omapM_ :: Applicative m => (Element (NonNull mono) -> m ()) -> NonNull mono -> m () #

oforM_ :: Applicative m => NonNull mono -> (Element (NonNull mono) -> m ()) -> m () #

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

ofoldMap1Ex :: Semigroup m => (Element (NonNull mono) -> m) -> NonNull mono -> m #

ofoldr1Ex :: (Element (NonNull mono) -> Element (NonNull mono) -> Element (NonNull mono)) -> NonNull mono -> Element (NonNull mono) #

ofoldl1Ex' :: (Element (NonNull mono) -> Element (NonNull mono) -> Element (NonNull mono)) -> NonNull mono -> Element (NonNull mono) #

headEx :: NonNull mono -> Element (NonNull mono) #

lastEx :: NonNull mono -> Element (NonNull mono) #

unsafeHead :: NonNull mono -> Element (NonNull mono) #

unsafeLast :: NonNull mono -> Element (NonNull mono) #

maximumByEx :: (Element (NonNull mono) -> Element (NonNull mono) -> Ordering) -> NonNull mono -> Element (NonNull mono) #

minimumByEx :: (Element (NonNull mono) -> Element (NonNull mono) -> Ordering) -> NonNull mono -> Element (NonNull mono) #

oelem :: Element (NonNull mono) -> NonNull mono -> Bool #

onotElem :: Element (NonNull mono) -> NonNull mono -> Bool #

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 #

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 #

Storable a => 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 #

Unbox a => 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 #

MonoFoldable (NonEmpty a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (NonEmpty a) -> m) -> NonEmpty a -> m #

ofoldr :: (Element (NonEmpty a) -> b -> b) -> b -> NonEmpty a -> b #

ofoldl' :: (a0 -> Element (NonEmpty a) -> a0) -> a0 -> NonEmpty a -> a0 #

otoList :: NonEmpty a -> [Element (NonEmpty a)] #

oall :: (Element (NonEmpty a) -> Bool) -> NonEmpty a -> Bool #

oany :: (Element (NonEmpty a) -> Bool) -> NonEmpty a -> Bool #

onull :: NonEmpty a -> Bool #

olength :: NonEmpty a -> Int #

olength64 :: NonEmpty a -> Int64 #

ocompareLength :: Integral i => NonEmpty a -> i -> Ordering #

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

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

omapM_ :: Applicative m => (Element (NonEmpty a) -> m ()) -> NonEmpty a -> m () #

oforM_ :: Applicative m => NonEmpty a -> (Element (NonEmpty a) -> m ()) -> m () #

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

ofoldMap1Ex :: Semigroup m => (Element (NonEmpty a) -> m) -> NonEmpty a -> m #

ofoldr1Ex :: (Element (NonEmpty a) -> Element (NonEmpty a) -> Element (NonEmpty a)) -> NonEmpty a -> Element (NonEmpty a) #

ofoldl1Ex' :: (Element (NonEmpty a) -> Element (NonEmpty a) -> Element (NonEmpty a)) -> NonEmpty a -> Element (NonEmpty a) #

headEx :: NonEmpty a -> Element (NonEmpty a) #

lastEx :: NonEmpty a -> Element (NonEmpty a) #

unsafeHead :: NonEmpty a -> Element (NonEmpty a) #

unsafeLast :: NonEmpty a -> Element (NonEmpty a) #

maximumByEx :: (Element (NonEmpty a) -> Element (NonEmpty a) -> Ordering) -> NonEmpty a -> Element (NonEmpty a) #

minimumByEx :: (Element (NonEmpty a) -> Element (NonEmpty a) -> Ordering) -> NonEmpty a -> Element (NonEmpty a) #

oelem :: Element (NonEmpty a) -> NonEmpty a -> Bool #

onotElem :: Element (NonEmpty a) -> NonEmpty a -> Bool #

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 #

MonoFoldable [a] 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element [a] -> m) -> [a] -> m #

ofoldr :: (Element [a] -> b -> b) -> b -> [a] -> b #

ofoldl' :: (a0 -> Element [a] -> a0) -> a0 -> [a] -> a0 #

otoList :: [a] -> [Element [a]] #

oall :: (Element [a] -> Bool) -> [a] -> Bool #

oany :: (Element [a] -> Bool) -> [a] -> Bool #

onull :: [a] -> Bool #

olength :: [a] -> Int #

olength64 :: [a] -> Int64 #

ocompareLength :: Integral i => [a] -> i -> Ordering #

otraverse_ :: Applicative f => (Element [a] -> f b) -> [a] -> f () #

ofor_ :: Applicative f => [a] -> (Element [a] -> f b) -> f () #

omapM_ :: Applicative m => (Element [a] -> m ()) -> [a] -> m () #

oforM_ :: Applicative m => [a] -> (Element [a] -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element [a] -> m a0) -> a0 -> [a] -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element [a] -> m) -> [a] -> m #

ofoldr1Ex :: (Element [a] -> Element [a] -> Element [a]) -> [a] -> Element [a] #

ofoldl1Ex' :: (Element [a] -> Element [a] -> Element [a]) -> [a] -> Element [a] #

headEx :: [a] -> Element [a] #

lastEx :: [a] -> Element [a] #

unsafeHead :: [a] -> Element [a] #

unsafeLast :: [a] -> Element [a] #

maximumByEx :: (Element [a] -> Element [a] -> Ordering) -> [a] -> Element [a] #

minimumByEx :: (Element [a] -> Element [a] -> Ordering) -> [a] -> Element [a] #

oelem :: Element [a] -> [a] -> Bool #

onotElem :: Element [a] -> [a] -> Bool #

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 #

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 #

MonoFoldable (U1 a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (U1 a) -> m) -> U1 a -> m #

ofoldr :: (Element (U1 a) -> b -> b) -> b -> U1 a -> b #

ofoldl' :: (a0 -> Element (U1 a) -> a0) -> a0 -> U1 a -> a0 #

otoList :: U1 a -> [Element (U1 a)] #

oall :: (Element (U1 a) -> Bool) -> U1 a -> Bool #

oany :: (Element (U1 a) -> Bool) -> U1 a -> Bool #

onull :: U1 a -> Bool #

olength :: U1 a -> Int #

olength64 :: U1 a -> Int64 #

ocompareLength :: Integral i => U1 a -> i -> Ordering #

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

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

omapM_ :: Applicative m => (Element (U1 a) -> m ()) -> U1 a -> m () #

oforM_ :: Applicative m => U1 a -> (Element (U1 a) -> m ()) -> m () #

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

ofoldMap1Ex :: Semigroup m => (Element (U1 a) -> m) -> U1 a -> m #

ofoldr1Ex :: (Element (U1 a) -> Element (U1 a) -> Element (U1 a)) -> U1 a -> Element (U1 a) #

ofoldl1Ex' :: (Element (U1 a) -> Element (U1 a) -> Element (U1 a)) -> U1 a -> Element (U1 a) #

headEx :: U1 a -> Element (U1 a) #

lastEx :: U1 a -> Element (U1 a) #

unsafeHead :: U1 a -> Element (U1 a) #

unsafeLast :: U1 a -> Element (U1 a) #

maximumByEx :: (Element (U1 a) -> Element (U1 a) -> Ordering) -> U1 a -> Element (U1 a) #

minimumByEx :: (Element (U1 a) -> Element (U1 a) -> Ordering) -> U1 a -> Element (U1 a) #

oelem :: Element (U1 a) -> U1 a -> Bool #

onotElem :: Element (U1 a) -> U1 a -> Bool #

MonoFoldable (V1 a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (V1 a) -> m) -> V1 a -> m #

ofoldr :: (Element (V1 a) -> b -> b) -> b -> V1 a -> b #

ofoldl' :: (a0 -> Element (V1 a) -> a0) -> a0 -> V1 a -> a0 #

otoList :: V1 a -> [Element (V1 a)] #

oall :: (Element (V1 a) -> Bool) -> V1 a -> Bool #

oany :: (Element (V1 a) -> Bool) -> V1 a -> Bool #

onull :: V1 a -> Bool #

olength :: V1 a -> Int #

olength64 :: V1 a -> Int64 #

ocompareLength :: Integral i => V1 a -> i -> Ordering #

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

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

omapM_ :: Applicative m => (Element (V1 a) -> m ()) -> V1 a -> m () #

oforM_ :: Applicative m => V1 a -> (Element (V1 a) -> m ()) -> m () #

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

ofoldMap1Ex :: Semigroup m => (Element (V1 a) -> m) -> V1 a -> m #

ofoldr1Ex :: (Element (V1 a) -> Element (V1 a) -> Element (V1 a)) -> V1 a -> Element (V1 a) #

ofoldl1Ex' :: (Element (V1 a) -> Element (V1 a) -> Element (V1 a)) -> V1 a -> Element (V1 a) #

headEx :: V1 a -> Element (V1 a) #

lastEx :: V1 a -> Element (V1 a) #

unsafeHead :: V1 a -> Element (V1 a) #

unsafeLast :: V1 a -> Element (V1 a) #

maximumByEx :: (Element (V1 a) -> Element (V1 a) -> Ordering) -> V1 a -> Element (V1 a) #

minimumByEx :: (Element (V1 a) -> Element (V1 a) -> Ordering) -> V1 a -> Element (V1 a) #

oelem :: Element (V1 a) -> V1 a -> Bool #

onotElem :: Element (V1 a) -> V1 a -> Bool #

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 #

MonoFoldable mono => MonoFoldable (WrappedMono mono a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (WrappedMono mono a) -> m) -> WrappedMono mono a -> m #

ofoldr :: (Element (WrappedMono mono a) -> b -> b) -> b -> WrappedMono mono a -> b #

ofoldl' :: (a0 -> Element (WrappedMono mono a) -> a0) -> a0 -> WrappedMono mono a -> a0 #

otoList :: WrappedMono mono a -> [Element (WrappedMono mono a)] #

oall :: (Element (WrappedMono mono a) -> Bool) -> WrappedMono mono a -> Bool #

oany :: (Element (WrappedMono mono a) -> Bool) -> WrappedMono mono a -> Bool #

onull :: WrappedMono mono a -> Bool #

olength :: WrappedMono mono a -> Int #

olength64 :: WrappedMono mono a -> Int64 #

ocompareLength :: Integral i => WrappedMono mono a -> i -> Ordering #

otraverse_ :: Applicative f => (Element (WrappedMono mono a) -> f b) -> WrappedMono mono a -> f () #

ofor_ :: Applicative f => WrappedMono mono a -> (Element (WrappedMono mono a) -> f b) -> f () #

omapM_ :: Applicative m => (Element (WrappedMono mono a) -> m ()) -> WrappedMono mono a -> m () #

oforM_ :: Applicative m => WrappedMono mono a -> (Element (WrappedMono mono a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (WrappedMono mono a) -> m a0) -> a0 -> WrappedMono mono a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (WrappedMono mono a) -> m) -> WrappedMono mono a -> m #

ofoldr1Ex :: (Element (WrappedMono mono a) -> Element (WrappedMono mono a) -> Element (WrappedMono mono a)) -> WrappedMono mono a -> Element (WrappedMono mono a) #

ofoldl1Ex' :: (Element (WrappedMono mono a) -> Element (WrappedMono mono a) -> Element (WrappedMono mono a)) -> WrappedMono mono a -> Element (WrappedMono mono a) #

headEx :: WrappedMono mono a -> Element (WrappedMono mono a) #

lastEx :: WrappedMono mono a -> Element (WrappedMono mono a) #

unsafeHead :: WrappedMono mono a -> Element (WrappedMono mono a) #

unsafeLast :: WrappedMono mono a -> Element (WrappedMono mono a) #

maximumByEx :: (Element (WrappedMono mono a) -> Element (WrappedMono mono a) -> Ordering) -> WrappedMono mono a -> Element (WrappedMono mono a) #

minimumByEx :: (Element (WrappedMono mono a) -> Element (WrappedMono mono a) -> Ordering) -> WrappedMono mono a -> Element (WrappedMono mono a) #

oelem :: Element (WrappedMono mono a) -> WrappedMono mono a -> Bool #

onotElem :: Element (WrappedMono mono a) -> WrappedMono mono a -> Bool #

Foldable f => MonoFoldable (WrappedPoly f a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (WrappedPoly f a) -> m) -> WrappedPoly f a -> m #

ofoldr :: (Element (WrappedPoly f a) -> b -> b) -> b -> WrappedPoly f a -> b #

ofoldl' :: (a0 -> Element (WrappedPoly f a) -> a0) -> a0 -> WrappedPoly f a -> a0 #

otoList :: WrappedPoly f a -> [Element (WrappedPoly f a)] #

oall :: (Element (WrappedPoly f a) -> Bool) -> WrappedPoly f a -> Bool #

oany :: (Element (WrappedPoly f a) -> Bool) -> WrappedPoly f a -> Bool #

onull :: WrappedPoly f a -> Bool #

olength :: WrappedPoly f a -> Int #

olength64 :: WrappedPoly f a -> Int64 #

ocompareLength :: Integral i => WrappedPoly f a -> i -> Ordering #

otraverse_ :: Applicative f0 => (Element (WrappedPoly f a) -> f0 b) -> WrappedPoly f a -> f0 () #

ofor_ :: Applicative f0 => WrappedPoly f a -> (Element (WrappedPoly f a) -> f0 b) -> f0 () #

omapM_ :: Applicative m => (Element (WrappedPoly f a) -> m ()) -> WrappedPoly f a -> m () #

oforM_ :: Applicative m => WrappedPoly f a -> (Element (WrappedPoly f a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (WrappedPoly f a) -> m a0) -> a0 -> WrappedPoly f a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (WrappedPoly f a) -> m) -> WrappedPoly f a -> m #

ofoldr1Ex :: (Element (WrappedPoly f a) -> Element (WrappedPoly f a) -> Element (WrappedPoly f a)) -> WrappedPoly f a -> Element (WrappedPoly f a) #

ofoldl1Ex' :: (Element (WrappedPoly f a) -> Element (WrappedPoly f a) -> Element (WrappedPoly f a)) -> WrappedPoly f a -> Element (WrappedPoly f a) #

headEx :: WrappedPoly f a -> Element (WrappedPoly f a) #

lastEx :: WrappedPoly f a -> Element (WrappedPoly f a) #

unsafeHead :: WrappedPoly f a -> Element (WrappedPoly f a) #

unsafeLast :: WrappedPoly f a -> Element (WrappedPoly f a) #

maximumByEx :: (Element (WrappedPoly f a) -> Element (WrappedPoly f a) -> Ordering) -> WrappedPoly f a -> Element (WrappedPoly f a) #

minimumByEx :: (Element (WrappedPoly f a) -> Element (WrappedPoly f a) -> Ordering) -> WrappedPoly f a -> Element (WrappedPoly f a) #

oelem :: Element (WrappedPoly f a) -> WrappedPoly f a -> Bool #

onotElem :: Element (WrappedPoly f a) -> WrappedPoly f a -> Bool #

Foldable f => MonoFoldable (ListT f a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (ListT f a) -> m) -> ListT f a -> m #

ofoldr :: (Element (ListT f a) -> b -> b) -> b -> ListT f a -> b #

ofoldl' :: (a0 -> Element (ListT f a) -> a0) -> a0 -> ListT f a -> a0 #

otoList :: ListT f a -> [Element (ListT f a)] #

oall :: (Element (ListT f a) -> Bool) -> ListT f a -> Bool #

oany :: (Element (ListT f a) -> Bool) -> ListT f a -> Bool #

onull :: ListT f a -> Bool #

olength :: ListT f a -> Int #

olength64 :: ListT f a -> Int64 #

ocompareLength :: Integral i => ListT f a -> i -> Ordering #

otraverse_ :: Applicative f0 => (Element (ListT f a) -> f0 b) -> ListT f a -> f0 () #

ofor_ :: Applicative f0 => ListT f a -> (Element (ListT f a) -> f0 b) -> f0 () #

omapM_ :: Applicative m => (Element (ListT f a) -> m ()) -> ListT f a -> m () #

oforM_ :: Applicative m => ListT f a -> (Element (ListT f a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (ListT f a) -> m a0) -> a0 -> ListT f a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (ListT f a) -> m) -> ListT f a -> m #

ofoldr1Ex :: (Element (ListT f a) -> Element (ListT f a) -> Element (ListT f a)) -> ListT f a -> Element (ListT f a) #

ofoldl1Ex' :: (Element (ListT f a) -> Element (ListT f a) -> Element (ListT f a)) -> ListT f a -> Element (ListT f a) #

headEx :: ListT f a -> Element (ListT f a) #

lastEx :: ListT f a -> Element (ListT f a) #

unsafeHead :: ListT f a -> Element (ListT f a) #

unsafeLast :: ListT f a -> Element (ListT f a) #

maximumByEx :: (Element (ListT f a) -> Element (ListT f a) -> Ordering) -> ListT f a -> Element (ListT f a) #

minimumByEx :: (Element (ListT f a) -> Element (ListT f a) -> Ordering) -> ListT f a -> Element (ListT f a) #

oelem :: Element (ListT f a) -> ListT f a -> Bool #

onotElem :: Element (ListT f a) -> ListT f a -> Bool #

Foldable f => MonoFoldable (MaybeT f a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (MaybeT f a) -> m) -> MaybeT f a -> m #

ofoldr :: (Element (MaybeT f a) -> b -> b) -> b -> MaybeT f a -> b #

ofoldl' :: (a0 -> Element (MaybeT f a) -> a0) -> a0 -> MaybeT f a -> a0 #

otoList :: MaybeT f a -> [Element (MaybeT f a)] #

oall :: (Element (MaybeT f a) -> Bool) -> MaybeT f a -> Bool #

oany :: (Element (MaybeT f a) -> Bool) -> MaybeT f a -> Bool #

onull :: MaybeT f a -> Bool #

olength :: MaybeT f a -> Int #

olength64 :: MaybeT f a -> Int64 #

ocompareLength :: Integral i => MaybeT f a -> i -> Ordering #

otraverse_ :: Applicative f0 => (Element (MaybeT f a) -> f0 b) -> MaybeT f a -> f0 () #

ofor_ :: Applicative f0 => MaybeT f a -> (Element (MaybeT f a) -> f0 b) -> f0 () #

omapM_ :: Applicative m => (Element (MaybeT f a) -> m ()) -> MaybeT f a -> m () #

oforM_ :: Applicative m => MaybeT f a -> (Element (MaybeT f a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (MaybeT f a) -> m a0) -> a0 -> MaybeT f a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (MaybeT f a) -> m) -> MaybeT f a -> m #

ofoldr1Ex :: (Element (MaybeT f a) -> Element (MaybeT f a) -> Element (MaybeT f a)) -> MaybeT f a -> Element (MaybeT f a) #

ofoldl1Ex' :: (Element (MaybeT f a) -> Element (MaybeT f a) -> Element (MaybeT f a)) -> MaybeT f a -> Element (MaybeT f a) #

headEx :: MaybeT f a -> Element (MaybeT f a) #

lastEx :: MaybeT f a -> Element (MaybeT f a) #

unsafeHead :: MaybeT f a -> Element (MaybeT f a) #

unsafeLast :: MaybeT f a -> Element (MaybeT f a) #

maximumByEx :: (Element (MaybeT f a) -> Element (MaybeT f a) -> Ordering) -> MaybeT f a -> Element (MaybeT f a) #

minimumByEx :: (Element (MaybeT f a) -> Element (MaybeT f a) -> Ordering) -> MaybeT f a -> Element (MaybeT f a) #

oelem :: Element (MaybeT f a) -> MaybeT f a -> Bool #

onotElem :: Element (MaybeT f a) -> MaybeT f a -> Bool #

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 #

MonoFoldable (a, b) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (a, b) -> m) -> (a, b) -> m #

ofoldr :: (Element (a, b) -> b0 -> b0) -> b0 -> (a, b) -> b0 #

ofoldl' :: (a0 -> Element (a, b) -> a0) -> a0 -> (a, b) -> a0 #

otoList :: (a, b) -> [Element (a, b)] #

oall :: (Element (a, b) -> Bool) -> (a, b) -> Bool #

oany :: (Element (a, b) -> Bool) -> (a, b) -> Bool #

onull :: (a, b) -> Bool #

olength :: (a, b) -> Int #

olength64 :: (a, b) -> Int64 #

ocompareLength :: Integral i => (a, b) -> i -> Ordering #

otraverse_ :: Applicative f => (Element (a, b) -> f b0) -> (a, b) -> f () #

ofor_ :: Applicative f => (a, b) -> (Element (a, b) -> f b0) -> f () #

omapM_ :: Applicative m => (Element (a, b) -> m ()) -> (a, b) -> m () #

oforM_ :: Applicative m => (a, b) -> (Element (a, b) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (a, b) -> m a0) -> a0 -> (a, b) -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (a, b) -> m) -> (a, b) -> m #

ofoldr1Ex :: (Element (a, b) -> Element (a, b) -> Element (a, b)) -> (a, b) -> Element (a, b) #

ofoldl1Ex' :: (Element (a, b) -> Element (a, b) -> Element (a, b)) -> (a, b) -> Element (a, b) #

headEx :: (a, b) -> Element (a, b) #

lastEx :: (a, b) -> Element (a, b) #

unsafeHead :: (a, b) -> Element (a, b) #

unsafeLast :: (a, b) -> Element (a, b) #

maximumByEx :: (Element (a, b) -> Element (a, b) -> Ordering) -> (a, b) -> Element (a, b) #

minimumByEx :: (Element (a, b) -> Element (a, b) -> Ordering) -> (a, b) -> Element (a, b) #

oelem :: Element (a, b) -> (a, b) -> Bool #

onotElem :: Element (a, b) -> (a, b) -> Bool #

MonoFoldable (Const m a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m0 => (Element (Const m a) -> m0) -> Const m a -> m0 #

ofoldr :: (Element (Const m a) -> b -> b) -> b -> Const m a -> b #

ofoldl' :: (a0 -> Element (Const m a) -> a0) -> a0 -> Const m a -> a0 #

otoList :: Const m a -> [Element (Const m a)] #

oall :: (Element (Const m a) -> Bool) -> Const m a -> Bool #

oany :: (Element (Const m a) -> Bool) -> Const m a -> Bool #

onull :: Const m a -> Bool #

olength :: Const m a -> Int #

olength64 :: Const m a -> Int64 #

ocompareLength :: Integral i => Const m a -> i -> Ordering #

otraverse_ :: Applicative f => (Element (Const m a) -> f b) -> Const m a -> f () #

ofor_ :: Applicative f => Const m a -> (Element (Const m a) -> f b) -> f () #

omapM_ :: Applicative m0 => (Element (Const m a) -> m0 ()) -> Const m a -> m0 () #

oforM_ :: Applicative m0 => Const m a -> (Element (Const m a) -> m0 ()) -> m0 () #

ofoldlM :: Monad m0 => (a0 -> Element (Const m a) -> m0 a0) -> a0 -> Const m a -> m0 a0 #

ofoldMap1Ex :: Semigroup m0 => (Element (Const m a) -> m0) -> Const m a -> m0 #

ofoldr1Ex :: (Element (Const m a) -> Element (Const m a) -> Element (Const m a)) -> Const m a -> Element (Const m a) #

ofoldl1Ex' :: (Element (Const m a) -> Element (Const m a) -> Element (Const m a)) -> Const m a -> Element (Const m a) #

headEx :: Const m a -> Element (Const m a) #

lastEx :: Const m a -> Element (Const m a) #

unsafeHead :: Const m a -> Element (Const m a) #

unsafeLast :: Const m a -> Element (Const m a) #

maximumByEx :: (Element (Const m a) -> Element (Const m a) -> Ordering) -> Const m a -> Element (Const m a) #

minimumByEx :: (Element (Const m a) -> Element (Const m a) -> Ordering) -> Const m a -> Element (Const m a) #

oelem :: Element (Const m a) -> Const m a -> Bool #

onotElem :: Element (Const m a) -> Const m a -> Bool #

Foldable f => MonoFoldable (Rec1 f a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (Rec1 f a) -> m) -> Rec1 f a -> m #

ofoldr :: (Element (Rec1 f a) -> b -> b) -> b -> Rec1 f a -> b #

ofoldl' :: (a0 -> Element (Rec1 f a) -> a0) -> a0 -> Rec1 f a -> a0 #

otoList :: Rec1 f a -> [Element (Rec1 f a)] #

oall :: (Element (Rec1 f a) -> Bool) -> Rec1 f a -> Bool #

oany :: (Element (Rec1 f a) -> Bool) -> Rec1 f a -> Bool #

onull :: Rec1 f a -> Bool #

olength :: Rec1 f a -> Int #

olength64 :: Rec1 f a -> Int64 #

ocompareLength :: Integral i => Rec1 f a -> i -> Ordering #

otraverse_ :: Applicative f0 => (Element (Rec1 f a) -> f0 b) -> Rec1 f a -> f0 () #

ofor_ :: Applicative f0 => Rec1 f a -> (Element (Rec1 f a) -> f0 b) -> f0 () #

omapM_ :: Applicative m => (Element (Rec1 f a) -> m ()) -> Rec1 f a -> m () #

oforM_ :: Applicative m => Rec1 f a -> (Element (Rec1 f a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (Rec1 f a) -> m a0) -> a0 -> Rec1 f a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (Rec1 f a) -> m) -> Rec1 f a -> m #

ofoldr1Ex :: (Element (Rec1 f a) -> Element (Rec1 f a) -> Element (Rec1 f a)) -> Rec1 f a -> Element (Rec1 f a) #

ofoldl1Ex' :: (Element (Rec1 f a) -> Element (Rec1 f a) -> Element (Rec1 f a)) -> Rec1 f a -> Element (Rec1 f a) #

headEx :: Rec1 f a -> Element (Rec1 f a) #

lastEx :: Rec1 f a -> Element (Rec1 f a) #

unsafeHead :: Rec1 f a -> Element (Rec1 f a) #

unsafeLast :: Rec1 f a -> Element (Rec1 f a) #

maximumByEx :: (Element (Rec1 f a) -> Element (Rec1 f a) -> Ordering) -> Rec1 f a -> Element (Rec1 f a) #

minimumByEx :: (Element (Rec1 f a) -> Element (Rec1 f a) -> Ordering) -> Rec1 f a -> Element (Rec1 f a) #

oelem :: Element (Rec1 f a) -> Rec1 f a -> Bool #

onotElem :: Element (Rec1 f a) -> Rec1 f a -> Bool #

Foldable f => MonoFoldable (IdentityT f a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (IdentityT f a) -> m) -> IdentityT f a -> m #

ofoldr :: (Element (IdentityT f a) -> b -> b) -> b -> IdentityT f a -> b #

ofoldl' :: (a0 -> Element (IdentityT f a) -> a0) -> a0 -> IdentityT f a -> a0 #

otoList :: IdentityT f a -> [Element (IdentityT f a)] #

oall :: (Element (IdentityT f a) -> Bool) -> IdentityT f a -> Bool #

oany :: (Element (IdentityT f a) -> Bool) -> IdentityT f a -> Bool #

onull :: IdentityT f a -> Bool #

olength :: IdentityT f a -> Int #

olength64 :: IdentityT f a -> Int64 #

ocompareLength :: Integral i => IdentityT f a -> i -> Ordering #

otraverse_ :: Applicative f0 => (Element (IdentityT f a) -> f0 b) -> IdentityT f a -> f0 () #

ofor_ :: Applicative f0 => IdentityT f a -> (Element (IdentityT f a) -> f0 b) -> f0 () #

omapM_ :: Applicative m => (Element (IdentityT f a) -> m ()) -> IdentityT f a -> m () #

oforM_ :: Applicative m => IdentityT f a -> (Element (IdentityT f a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (IdentityT f a) -> m a0) -> a0 -> IdentityT f a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (IdentityT f a) -> m) -> IdentityT f a -> m #

ofoldr1Ex :: (Element (IdentityT f a) -> Element (IdentityT f a) -> Element (IdentityT f a)) -> IdentityT f a -> Element (IdentityT f a) #

ofoldl1Ex' :: (Element (IdentityT f a) -> Element (IdentityT f a) -> Element (IdentityT f a)) -> IdentityT f a -> Element (IdentityT f a) #

headEx :: IdentityT f a -> Element (IdentityT f a) #

lastEx :: IdentityT f a -> Element (IdentityT f a) #

unsafeHead :: IdentityT f a -> Element (IdentityT f a) #

unsafeLast :: IdentityT f a -> Element (IdentityT f a) #

maximumByEx :: (Element (IdentityT f a) -> Element (IdentityT f a) -> Ordering) -> IdentityT f a -> Element (IdentityT f a) #

minimumByEx :: (Element (IdentityT f a) -> Element (IdentityT f a) -> Ordering) -> IdentityT f a -> Element (IdentityT f a) #

oelem :: Element (IdentityT f a) -> IdentityT f a -> Bool #

onotElem :: Element (IdentityT f a) -> IdentityT f a -> Bool #

Foldable f => MonoFoldable (WriterT w f a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (WriterT w f a) -> m) -> WriterT w f a -> m #

ofoldr :: (Element (WriterT w f a) -> b -> b) -> b -> WriterT w f a -> b #

ofoldl' :: (a0 -> Element (WriterT w f a) -> a0) -> a0 -> WriterT w f a -> a0 #

otoList :: WriterT w f a -> [Element (WriterT w f a)] #

oall :: (Element (WriterT w f a) -> Bool) -> WriterT w f a -> Bool #

oany :: (Element (WriterT w f a) -> Bool) -> WriterT w f a -> Bool #

onull :: WriterT w f a -> Bool #

olength :: WriterT w f a -> Int #

olength64 :: WriterT w f a -> Int64 #

ocompareLength :: Integral i => WriterT w f a -> i -> Ordering #

otraverse_ :: Applicative f0 => (Element (WriterT w f a) -> f0 b) -> WriterT w f a -> f0 () #

ofor_ :: Applicative f0 => WriterT w f a -> (Element (WriterT w f a) -> f0 b) -> f0 () #

omapM_ :: Applicative m => (Element (WriterT w f a) -> m ()) -> WriterT w f a -> m () #

oforM_ :: Applicative m => WriterT w f a -> (Element (WriterT w f a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (WriterT w f a) -> m a0) -> a0 -> WriterT w f a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (WriterT w f a) -> m) -> WriterT w f a -> m #

ofoldr1Ex :: (Element (WriterT w f a) -> Element (WriterT w f a) -> Element (WriterT w f a)) -> WriterT w f a -> Element (WriterT w f a) #

ofoldl1Ex' :: (Element (WriterT w f a) -> Element (WriterT w f a) -> Element (WriterT w f a)) -> WriterT w f a -> Element (WriterT w f a) #

headEx :: WriterT w f a -> Element (WriterT w f a) #

lastEx :: WriterT w f a -> Element (WriterT w f a) #

unsafeHead :: WriterT w f a -> Element (WriterT w f a) #

unsafeLast :: WriterT w f a -> Element (WriterT w f a) #

maximumByEx :: (Element (WriterT w f a) -> Element (WriterT w f a) -> Ordering) -> WriterT w f a -> Element (WriterT w f a) #

minimumByEx :: (Element (WriterT w f a) -> Element (WriterT w f a) -> Ordering) -> WriterT w f a -> Element (WriterT w f a) #

oelem :: Element (WriterT w f a) -> WriterT w f a -> Bool #

onotElem :: Element (WriterT w f a) -> WriterT w f a -> Bool #

Foldable f => MonoFoldable (WriterT w f a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (WriterT w f a) -> m) -> WriterT w f a -> m #

ofoldr :: (Element (WriterT w f a) -> b -> b) -> b -> WriterT w f a -> b #

ofoldl' :: (a0 -> Element (WriterT w f a) -> a0) -> a0 -> WriterT w f a -> a0 #

otoList :: WriterT w f a -> [Element (WriterT w f a)] #

oall :: (Element (WriterT w f a) -> Bool) -> WriterT w f a -> Bool #

oany :: (Element (WriterT w f a) -> Bool) -> WriterT w f a -> Bool #

onull :: WriterT w f a -> Bool #

olength :: WriterT w f a -> Int #

olength64 :: WriterT w f a -> Int64 #

ocompareLength :: Integral i => WriterT w f a -> i -> Ordering #

otraverse_ :: Applicative f0 => (Element (WriterT w f a) -> f0 b) -> WriterT w f a -> f0 () #

ofor_ :: Applicative f0 => WriterT w f a -> (Element (WriterT w f a) -> f0 b) -> f0 () #

omapM_ :: Applicative m => (Element (WriterT w f a) -> m ()) -> WriterT w f a -> m () #

oforM_ :: Applicative m => WriterT w f a -> (Element (WriterT w f a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (WriterT w f a) -> m a0) -> a0 -> WriterT w f a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (WriterT w f a) -> m) -> WriterT w f a -> m #

ofoldr1Ex :: (Element (WriterT w f a) -> Element (WriterT w f a) -> Element (WriterT w f a)) -> WriterT w f a -> Element (WriterT w f a) #

ofoldl1Ex' :: (Element (WriterT w f a) -> Element (WriterT w f a) -> Element (WriterT w f a)) -> WriterT w f a -> Element (WriterT w f a) #

headEx :: WriterT w f a -> Element (WriterT w f a) #

lastEx :: WriterT w f a -> Element (WriterT w f a) #

unsafeHead :: WriterT w f a -> Element (WriterT w f a) #

unsafeLast :: WriterT w f a -> Element (WriterT w f a) #

maximumByEx :: (Element (WriterT w f a) -> Element (WriterT w f a) -> Ordering) -> WriterT w f a -> Element (WriterT w f a) #

minimumByEx :: (Element (WriterT w f a) -> Element (WriterT w f a) -> Ordering) -> WriterT w f a -> Element (WriterT w f a) #

oelem :: Element (WriterT w f a) -> WriterT w f a -> Bool #

onotElem :: Element (WriterT w f a) -> WriterT w f a -> Bool #

(Foldable f, Foldable g) => MonoFoldable (Product f g a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (Product f g a) -> m) -> Product f g a -> m #

ofoldr :: (Element (Product f g a) -> b -> b) -> b -> Product f g a -> b #

ofoldl' :: (a0 -> Element (Product f g a) -> a0) -> a0 -> Product f g a -> a0 #

otoList :: Product f g a -> [Element (Product f g a)] #

oall :: (Element (Product f g a) -> Bool) -> Product f g a -> Bool #

oany :: (Element (Product f g a) -> Bool) -> Product f g a -> Bool #

onull :: Product f g a -> Bool #

olength :: Product f g a -> Int #

olength64 :: Product f g a -> Int64 #

ocompareLength :: Integral i => Product f g a -> i -> Ordering #

otraverse_ :: Applicative f0 => (Element (Product f g a) -> f0 b) -> Product f g a -> f0 () #

ofor_ :: Applicative f0 => Product f g a -> (Element (Product f g a) -> f0 b) -> f0 () #

omapM_ :: Applicative m => (Element (Product f g a) -> m ()) -> Product f g a -> m () #

oforM_ :: Applicative m => Product f g a -> (Element (Product f g a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (Product f g a) -> m a0) -> a0 -> Product f g a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (Product f g a) -> m) -> Product f g a -> m #

ofoldr1Ex :: (Element (Product f g a) -> Element (Product f g a) -> Element (Product f g a)) -> Product f g a -> Element (Product f g a) #

ofoldl1Ex' :: (Element (Product f g a) -> Element (Product f g a) -> Element (Product f g a)) -> Product f g a -> Element (Product f g a) #

headEx :: Product f g a -> Element (Product f g a) #

lastEx :: Product f g a -> Element (Product f g a) #

unsafeHead :: Product f g a -> Element (Product f g a) #

unsafeLast :: Product f g a -> Element (Product f g a) #

maximumByEx :: (Element (Product f g a) -> Element (Product f g a) -> Ordering) -> Product f g a -> Element (Product f g a) #

minimumByEx :: (Element (Product f g a) -> Element (Product f g a) -> Ordering) -> Product f g a -> Element (Product f g a) #

oelem :: Element (Product f g a) -> Product f g a -> Bool #

onotElem :: Element (Product f g a) -> Product f g a -> Bool #

(Foldable f, Foldable g) => MonoFoldable ((f :*: g) a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element ((f :*: g) a) -> m) -> (f :*: g) a -> m #

ofoldr :: (Element ((f :*: g) a) -> b -> b) -> b -> (f :*: g) a -> b #

ofoldl' :: (a0 -> Element ((f :*: g) a) -> a0) -> a0 -> (f :*: g) a -> a0 #

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

oall :: (Element ((f :*: g) a) -> Bool) -> (f :*: g) a -> Bool #

oany :: (Element ((f :*: g) a) -> Bool) -> (f :*: g) a -> Bool #

onull :: (f :*: g) a -> Bool #

olength :: (f :*: g) a -> Int #

olength64 :: (f :*: g) a -> Int64 #

ocompareLength :: Integral i => (f :*: g) a -> i -> Ordering #

otraverse_ :: Applicative f0 => (Element ((f :*: g) a) -> f0 b) -> (f :*: g) a -> f0 () #

ofor_ :: Applicative f0 => (f :*: g) a -> (Element ((f :*: g) a) -> f0 b) -> f0 () #

omapM_ :: Applicative m => (Element ((f :*: g) a) -> m ()) -> (f :*: g) a -> m () #

oforM_ :: Applicative m => (f :*: g) a -> (Element ((f :*: g) a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element ((f :*: g) a) -> m a0) -> a0 -> (f :*: g) a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element ((f :*: g) a) -> m) -> (f :*: g) a -> m #

ofoldr1Ex :: (Element ((f :*: g) a) -> Element ((f :*: g) a) -> Element ((f :*: g) a)) -> (f :*: g) a -> Element ((f :*: g) a) #

ofoldl1Ex' :: (Element ((f :*: g) a) -> Element ((f :*: g) a) -> Element ((f :*: g) a)) -> (f :*: g) a -> Element ((f :*: g) a) #

headEx :: (f :*: g) a -> Element ((f :*: g) a) #

lastEx :: (f :*: g) a -> Element ((f :*: g) a) #

unsafeHead :: (f :*: g) a -> Element ((f :*: g) a) #

unsafeLast :: (f :*: g) a -> Element ((f :*: g) a) #

maximumByEx :: (Element ((f :*: g) a) -> Element ((f :*: g) a) -> Ordering) -> (f :*: g) a -> Element ((f :*: g) a) #

minimumByEx :: (Element ((f :*: g) a) -> Element ((f :*: g) a) -> Ordering) -> (f :*: g) a -> Element ((f :*: g) a) #

oelem :: Element ((f :*: g) a) -> (f :*: g) a -> Bool #

onotElem :: Element ((f :*: g) a) -> (f :*: g) a -> Bool #

(Foldable f, Foldable g) => MonoFoldable ((f :+: g) a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element ((f :+: g) a) -> m) -> (f :+: g) a -> m #

ofoldr :: (Element ((f :+: g) a) -> b -> b) -> b -> (f :+: g) a -> b #

ofoldl' :: (a0 -> Element ((f :+: g) a) -> a0) -> a0 -> (f :+: g) a -> a0 #

otoList :: (f :+: g) a -> [Element ((f :+: g) a)] #

oall :: (Element ((f :+: g) a) -> Bool) -> (f :+: g) a -> Bool #

oany :: (Element ((f :+: g) a) -> Bool) -> (f :+: g) a -> Bool #

onull :: (f :+: g) a -> Bool #

olength :: (f :+: g) a -> Int #

olength64 :: (f :+: g) a -> Int64 #

ocompareLength :: Integral i => (f :+: g) a -> i -> Ordering #

otraverse_ :: Applicative f0 => (Element ((f :+: g) a) -> f0 b) -> (f :+: g) a -> f0 () #

ofor_ :: Applicative f0 => (f :+: g) a -> (Element ((f :+: g) a) -> f0 b) -> f0 () #

omapM_ :: Applicative m => (Element ((f :+: g) a) -> m ()) -> (f :+: g) a -> m () #

oforM_ :: Applicative m => (f :+: g) a -> (Element ((f :+: g) a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element ((f :+: g) a) -> m a0) -> a0 -> (f :+: g) a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element ((f :+: g) a) -> m) -> (f :+: g) a -> m #

ofoldr1Ex :: (Element ((f :+: g) a) -> Element ((f :+: g) a) -> Element ((f :+: g) a)) -> (f :+: g) a -> Element ((f :+: g) a) #

ofoldl1Ex' :: (Element ((f :+: g) a) -> Element ((f :+: g) a) -> Element ((f :+: g) a)) -> (f :+: g) a -> Element ((f :+: g) a) #

headEx :: (f :+: g) a -> Element ((f :+: g) a) #

lastEx :: (f :+: g) a -> Element ((f :+: g) a) #

unsafeHead :: (f :+: g) a -> Element ((f :+: g) a) #

unsafeLast :: (f :+: g) a -> Element ((f :+: g) a) #

maximumByEx :: (Element ((f :+: g) a) -> Element ((f :+: g) a) -> Ordering) -> (f :+: g) a -> Element ((f :+: g) a) #

minimumByEx :: (Element ((f :+: g) a) -> Element ((f :+: g) a) -> Ordering) -> (f :+: g) a -> Element ((f :+: g) a) #

oelem :: Element ((f :+: g) a) -> (f :+: g) a -> Bool #

onotElem :: Element ((f :+: g) a) -> (f :+: g) a -> Bool #

MonoFoldable (K1 i c a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (K1 i c a) -> m) -> K1 i c a -> m #

ofoldr :: (Element (K1 i c a) -> b -> b) -> b -> K1 i c a -> b #

ofoldl' :: (a0 -> Element (K1 i c a) -> a0) -> a0 -> K1 i c a -> a0 #

otoList :: K1 i c a -> [Element (K1 i c a)] #

oall :: (Element (K1 i c a) -> Bool) -> K1 i c a -> Bool #

oany :: (Element (K1 i c a) -> Bool) -> K1 i c a -> Bool #

onull :: K1 i c a -> Bool #

olength :: K1 i c a -> Int #

olength64 :: K1 i c a -> Int64 #

ocompareLength :: Integral i0 => K1 i c a -> i0 -> Ordering #

otraverse_ :: Applicative f => (Element (K1 i c a) -> f b) -> K1 i c a -> f () #

ofor_ :: Applicative f => K1 i c a -> (Element (K1 i c a) -> f b) -> f () #

omapM_ :: Applicative m => (Element (K1 i c a) -> m ()) -> K1 i c a -> m () #

oforM_ :: Applicative m => K1 i c a -> (Element (K1 i c a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (K1 i c a) -> m a0) -> a0 -> K1 i c a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (K1 i c a) -> m) -> K1 i c a -> m #

ofoldr1Ex :: (Element (K1 i c a) -> Element (K1 i c a) -> Element (K1 i c a)) -> K1 i c a -> Element (K1 i c a) #

ofoldl1Ex' :: (Element (K1 i c a) -> Element (K1 i c a) -> Element (K1 i c a)) -> K1 i c a -> Element (K1 i c a) #

headEx :: K1 i c a -> Element (K1 i c a) #

lastEx :: K1 i c a -> Element (K1 i c a) #

unsafeHead :: K1 i c a -> Element (K1 i c a) #

unsafeLast :: K1 i c a -> Element (K1 i c a) #

maximumByEx :: (Element (K1 i c a) -> Element (K1 i c a) -> Ordering) -> K1 i c a -> Element (K1 i c a) #

minimumByEx :: (Element (K1 i c a) -> Element (K1 i c a) -> Ordering) -> K1 i c a -> Element (K1 i c a) #

oelem :: Element (K1 i c a) -> K1 i c a -> Bool #

onotElem :: Element (K1 i c a) -> K1 i c a -> Bool #

(Foldable f, Foldable g) => MonoFoldable (Compose f g a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (Compose f g a) -> m) -> Compose f g a -> m #

ofoldr :: (Element (Compose f g a) -> b -> b) -> b -> Compose f g a -> b #

ofoldl' :: (a0 -> Element (Compose f g a) -> a0) -> a0 -> Compose f g a -> a0 #

otoList :: Compose f g a -> [Element (Compose f g a)] #

oall :: (Element (Compose f g a) -> Bool) -> Compose f g a -> Bool #

oany :: (Element (Compose f g a) -> Bool) -> Compose f g a -> Bool #

onull :: Compose f g a -> Bool #

olength :: Compose f g a -> Int #

olength64 :: Compose f g a -> Int64 #

ocompareLength :: Integral i => Compose f g a -> i -> Ordering #

otraverse_ :: Applicative f0 => (Element (Compose f g a) -> f0 b) -> Compose f g a -> f0 () #

ofor_ :: Applicative f0 => Compose f g a -> (Element (Compose f g a) -> f0 b) -> f0 () #

omapM_ :: Applicative m => (Element (Compose f g a) -> m ()) -> Compose f g a -> m () #

oforM_ :: Applicative m => Compose f g a -> (Element (Compose f g a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (Compose f g a) -> m a0) -> a0 -> Compose f g a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (Compose f g a) -> m) -> Compose f g a -> m #

ofoldr1Ex :: (Element (Compose f g a) -> Element (Compose f g a) -> Element (Compose f g a)) -> Compose f g a -> Element (Compose f g a) #

ofoldl1Ex' :: (Element (Compose f g a) -> Element (Compose f g a) -> Element (Compose f g a)) -> Compose f g a -> Element (Compose f g a) #

headEx :: Compose f g a -> Element (Compose f g a) #

lastEx :: Compose f g a -> Element (Compose f g a) #

unsafeHead :: Compose f g a -> Element (Compose f g a) #

unsafeLast :: Compose f g a -> Element (Compose f g a) #

maximumByEx :: (Element (Compose f g a) -> Element (Compose f g a) -> Ordering) -> Compose f g a -> Element (Compose f g a) #

minimumByEx :: (Element (Compose f g a) -> Element (Compose f g a) -> Ordering) -> Compose f g a -> Element (Compose f g a) #

oelem :: Element (Compose f g a) -> Compose f g a -> Bool #

onotElem :: Element (Compose f g a) -> Compose f g a -> Bool #

(Foldable f, Foldable g) => MonoFoldable ((f :.: g) a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element ((f :.: g) a) -> m) -> (f :.: g) a -> m #

ofoldr :: (Element ((f :.: g) a) -> b -> b) -> b -> (f :.: g) a -> b #

ofoldl' :: (a0 -> Element ((f :.: g) a) -> a0) -> a0 -> (f :.: g) a -> a0 #

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

oall :: (Element ((f :.: g) a) -> Bool) -> (f :.: g) a -> Bool #

oany :: (Element ((f :.: g) a) -> Bool) -> (f :.: g) a -> Bool #

onull :: (f :.: g) a -> Bool #

olength :: (f :.: g) a -> Int #

olength64 :: (f :.: g) a -> Int64 #

ocompareLength :: Integral i => (f :.: g) a -> i -> Ordering #

otraverse_ :: Applicative f0 => (Element ((f :.: g) a) -> f0 b) -> (f :.: g) a -> f0 () #

ofor_ :: Applicative f0 => (f :.: g) a -> (Element ((f :.: g) a) -> f0 b) -> f0 () #

omapM_ :: Applicative m => (Element ((f :.: g) a) -> m ()) -> (f :.: g) a -> m () #

oforM_ :: Applicative m => (f :.: g) a -> (Element ((f :.: g) a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element ((f :.: g) a) -> m a0) -> a0 -> (f :.: g) a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element ((f :.: g) a) -> m) -> (f :.: g) a -> m #

ofoldr1Ex :: (Element ((f :.: g) a) -> Element ((f :.: g) a) -> Element ((f :.: g) a)) -> (f :.: g) a -> Element ((f :.: g) a) #

ofoldl1Ex' :: (Element ((f :.: g) a) -> Element ((f :.: g) a) -> Element ((f :.: g) a)) -> (f :.: g) a -> Element ((f :.: g) a) #

headEx :: (f :.: g) a -> Element ((f :.: g) a) #

lastEx :: (f :.: g) a -> Element ((f :.: g) a) #

unsafeHead :: (f :.: g) a -> Element ((f :.: g) a) #

unsafeLast :: (f :.: g) a -> Element ((f :.: g) a) #

maximumByEx :: (Element ((f :.: g) a) -> Element ((f :.: g) a) -> Ordering) -> (f :.: g) a -> Element ((f :.: g) a) #

minimumByEx :: (Element ((f :.: g) a) -> Element ((f :.: g) a) -> Ordering) -> (f :.: g) a -> Element ((f :.: g) a) #

oelem :: Element ((f :.: g) a) -> (f :.: g) a -> Bool #

onotElem :: Element ((f :.: g) a) -> (f :.: g) a -> Bool #

Foldable f => MonoFoldable (M1 i c f a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (M1 i c f a) -> m) -> M1 i c f a -> m #

ofoldr :: (Element (M1 i c f a) -> b -> b) -> b -> M1 i c f a -> b #

ofoldl' :: (a0 -> Element (M1 i c f a) -> a0) -> a0 -> M1 i c f a -> a0 #

otoList :: M1 i c f a -> [Element (M1 i c f a)] #

oall :: (Element (M1 i c f a) -> Bool) -> M1 i c f a -> Bool #

oany :: (Element (M1 i c f a) -> Bool) -> M1 i c f a -> Bool #

onull :: M1 i c f a -> Bool #

olength :: M1 i c f a -> Int #

olength64 :: M1 i c f a -> Int64 #

ocompareLength :: Integral i0 => M1 i c f a -> i0 -> Ordering #

otraverse_ :: Applicative f0 => (Element (M1 i c f a) -> f0 b) -> M1 i c f a -> f0 () #

ofor_ :: Applicative f0 => M1 i c f a -> (Element (M1 i c f a) -> f0 b) -> f0 () #

omapM_ :: Applicative m => (Element (M1 i c f a) -> m ()) -> M1 i c f a -> m () #

oforM_ :: Applicative m => M1 i c f a -> (Element (M1 i c f a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (M1 i c f a) -> m a0) -> a0 -> M1 i c f a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (M1 i c f a) -> m) -> M1 i c f a -> m #

ofoldr1Ex :: (Element (M1 i c f a) -> Element (M1 i c f a) -> Element (M1 i c f a)) -> M1 i c f a -> Element (M1 i c f a) #

ofoldl1Ex' :: (Element (M1 i c f a) -> Element (M1 i c f a) -> Element (M1 i c f a)) -> M1 i c f a -> Element (M1 i c f a) #

headEx :: M1 i c f a -> Element (M1 i c f a) #

lastEx :: M1 i c f a -> Element (M1 i c f a) #

unsafeHead :: M1 i c f a -> Element (M1 i c f a) #

unsafeLast :: M1 i c f a -> Element (M1 i c f a) #

maximumByEx :: (Element (M1 i c f a) -> Element (M1 i c f a) -> Ordering) -> M1 i c f a -> Element (M1 i c f a) #

minimumByEx :: (Element (M1 i c f a) -> Element (M1 i c f a) -> Ordering) -> M1 i c f a -> Element (M1 i c f a) #

oelem :: Element (M1 i c f a) -> M1 i c f a -> Bool #

onotElem :: Element (M1 i c f a) -> M1 i c f a -> Bool #

class Eq a where #

Minimal complete definition

(==) | (/=)

Methods

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

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

Instances

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

Defined in Codec.Crypto.RSA.Pure

Methods

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

(/=) :: RSAError -> RSAError -> 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 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 AsyncCancelled 
Instance details

Defined in Control.Concurrent.Async

Eq More 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

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

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

Eq Pos 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

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

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

Eq Number 
Instance details

Defined in Data.Attoparsec.Number

Methods

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

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

Eq ByteArray 
Instance details

Defined in Data.Array.Byte

Methods

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

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

Eq Constr 
Instance details

Defined in Data.Data

Methods

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

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

Eq ConstrRep 
Instance details

Defined in Data.Data

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

Defined in Data.Void

Methods

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

(/=) :: Void -> Void -> 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 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 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 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 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 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 InfoProv 
Instance details

Defined in GHC.Stack.CCS

Methods

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

(/=) :: InfoProv -> InfoProv -> 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 Encoding 
Instance details

Defined in Basement.String

Methods

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

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

Eq ASCII7_Invalid 
Instance details

Defined in Basement.String.Encoding.ASCII7

Methods

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

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

Eq ISO_8859_1_Invalid 
Instance details

Defined in Basement.String.Encoding.ISO_8859_1

Methods

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

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

Eq UTF16_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF16

Methods

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

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

Eq UTF32_Invalid 
Instance details

Defined in Basement.String.Encoding.UTF32

Methods

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

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

Eq FileSize 
Instance details

Defined in Basement.Types.OffsetSize

Methods

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

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

Eq String 
Instance details

Defined in Basement.UTF8.Base

Methods

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

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

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

Defined in System.Clock

Methods

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

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

Eq TimeSpec 
Instance details

Defined in System.Clock

Methods

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

(/=) :: TimeSpec -> TimeSpec -> 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 SharedSecret 
Instance details

Defined in Crypto.ECC

Methods

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

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

Eq CryptoError 
Instance details

Defined in Crypto.Error.Types

Methods

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

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

Eq FileType 
Instance details

Defined in System.Directory.Internal.Common

Methods

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

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

Eq Permissions 
Instance details

Defined in System.Directory.Internal.Common

Methods

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

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

Eq XdgDirectory 
Instance details

Defined in System.Directory.Internal.Common

Methods

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

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

Eq XdgDirectoryList 
Instance details

Defined in System.Directory.Internal.Common

Methods

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

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

Eq LogStr 
Instance details

Defined in System.Log.FastLogger.LogStr

Methods

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

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

Eq Event 
Instance details

Defined in System.FSNotify.Types

Methods

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

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

Eq EventIsDirectory 
Instance details

Defined in System.FSNotify.Types

Methods

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

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

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

Defined in GHC.CmmToAsm.AArch64.Regs

Methods

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

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

Eq Imm 
Instance details

Defined in GHC.CmmToAsm.AArch64.Regs

Methods

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

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

Eq HsRuleAnn 
Instance details

Defined in GHC.Hs.Decls

Methods

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

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

Eq IEWildcard 
Instance details

Defined in GHC.Hs.ImpExp

Methods

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

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

Eq ImportDeclQualifiedStyle 
Instance details

Defined in GHC.Hs.ImpExp

Methods

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

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

Eq NoExtFieldSilent 
Instance details

Defined in GHC.Stg.Syntax

Methods

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

(/=) :: NoExtFieldSilent -> NoExtFieldSilent -> 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 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 BigNat 
Instance details

Defined in GHC.Num.BigNat

Methods

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

(/=) :: BigNat -> BigNat -> 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 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 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 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 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 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 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 JobConfig Source # 
Instance details

Defined in IHP.IDE.CodeGen.JobGenerator

Eq MailConfig Source # 
Instance details

Defined in IHP.IDE.CodeGen.MailGenerator

Eq GeneratorAction Source # 
Instance details

Defined in IHP.IDE.CodeGen.Types

Eq ViewConfig Source # 
Instance details

Defined in IHP.IDE.CodeGen.ViewGenerator

Eq PortConfig Source # 
Instance details

Defined in IHP.IDE.PortConfig

Eq Column Source # 
Instance details

Defined in IHP.IDE.SchemaDesigner.Types

Methods

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

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

Eq ColumnGenerator Source # 
Instance details

Defined in IHP.IDE.SchemaDesigner.Types

Eq Constraint Source # 
Instance details

Defined in IHP.IDE.SchemaDesigner.Types

Eq CreateTable Source # 
Instance details

Defined in IHP.IDE.SchemaDesigner.Types

Eq DeferrableType Source # 
Instance details

Defined in IHP.IDE.SchemaDesigner.Types

Eq ExcludeConstraintElement Source # 
Instance details

Defined in IHP.IDE.SchemaDesigner.Types

Eq Expression Source # 
Instance details

Defined in IHP.IDE.SchemaDesigner.Types

Eq IndexColumn Source # 
Instance details

Defined in IHP.IDE.SchemaDesigner.Types

Eq IndexColumnOrder Source # 
Instance details

Defined in IHP.IDE.SchemaDesigner.Types

Eq IndexType Source # 
Instance details

Defined in IHP.IDE.SchemaDesigner.Types

Eq OnDelete Source # 
Instance details

Defined in IHP.IDE.SchemaDesigner.Types

Eq PolicyAction Source # 
Instance details

Defined in IHP.IDE.SchemaDesigner.Types

Eq PostgresType Source # 
Instance details

Defined in IHP.IDE.SchemaDesigner.Types

Eq PrimaryKeyConstraint Source # 
Instance details

Defined in IHP.IDE.SchemaDesigner.Types

Eq Select Source # 
Instance details

Defined in IHP.IDE.SchemaDesigner.Types

Methods

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

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

Eq Statement Source # 
Instance details

Defined in IHP.IDE.SchemaDesigner.Types

Eq TriggerEvent Source # 
Instance details

Defined in IHP.IDE.SchemaDesigner.Types

Eq TriggerEventWhen Source # 
Instance details

Defined in IHP.IDE.SchemaDesigner.Types

Eq TriggerFor Source # 
Instance details

Defined in IHP.IDE.SchemaDesigner.Types

Eq CodeGenController Source # 
Instance details

Defined in IHP.IDE.ToolServer.Types

Eq ColumnsController Source # 
Instance details

Defined in IHP.IDE.ToolServer.Types

Eq DataController Source # 
Instance details

Defined in IHP.IDE.ToolServer.Types

Eq EnumValuesController Source # 
Instance details

Defined in IHP.IDE.ToolServer.Types

Eq EnumsController Source # 
Instance details

Defined in IHP.IDE.ToolServer.Types

Eq IndexesController Source # 
Instance details

Defined in IHP.IDE.ToolServer.Types

Eq LogsController Source # 
Instance details

Defined in IHP.IDE.ToolServer.Types

Eq MigrationsController Source # 
Instance details

Defined in IHP.IDE.ToolServer.Types

Eq PoliciesController Source # 
Instance details

Defined in IHP.IDE.ToolServer.Types

Eq SchemaController Source # 
Instance details

Defined in IHP.IDE.ToolServer.Types

Eq TablesController Source # 
Instance details

Defined in IHP.IDE.ToolServer.Types

Eq OutputLine Source # 
Instance details

Defined in IHP.IDE.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 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 AttributeOperation Source # 
Instance details

Defined in IHP.ServerSideComponent.HtmlDiff

Eq NodeOperation Source # 
Instance details

Defined in IHP.ServerSideComponent.HtmlDiff

Eq Attribute Source # 
Instance details

Defined in IHP.ServerSideComponent.HtmlParser

Eq Node Source # 
Instance details

Defined in IHP.ServerSideComponent.HtmlParser

Methods

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

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

Eq TelemetryInfo Source # 
Instance details

Defined in IHP.Telemetry

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

Defined in Data.ByteArray.ScrubbedBytes

Methods

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

(/=) :: ScrubbedBytes -> ScrubbedBytes -> 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

Methods

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

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

Eq Disposition 
Instance details

Defined in Network.Mail.Mime

Methods

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

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

Eq Encoding 
Instance details

Defined in Network.Mail.Mime

Methods

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

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

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

Methods

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

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

Eq QPC 
Instance details

Defined in Network.Mail.Mime

Methods

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

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

Eq AssumeRoleCredentials 
Instance details

Defined in Network.Minio.Credentials.AssumeRole

Methods

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

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

Eq AssumeRoleResult 
Instance details

Defined in Network.Minio.Credentials.AssumeRole

Methods

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

(/=) :: AssumeRoleResult -> AssumeRoleResult -> 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 ListItem 
Instance details

Defined in Network.Minio.ListOps

Methods

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

(/=) :: ListItem -> ListItem -> 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 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 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 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 Null 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

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

(/=) :: Null -> Null -> 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 Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Methods

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

(/=) :: Doc -> Doc -> 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 Undefined 
Instance details

Defined in Relude.Debug

Methods

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

(/=) :: Undefined -> Undefined -> 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 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 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 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 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 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 DayOfWeek 
Instance details

Defined in Data.Time.Calendar.Week

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

Defined in UnliftIO.Exception

Eq ConcException 
Instance details

Defined in UnliftIO.Internals.Async

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

Defined in Network.Wai.Parse

Methods

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

(/=) :: Bound -> Bound -> 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 AWSAuthVersion 
Instance details

Defined in Network.Wreq.Internal.Types

Methods

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

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

Eq Auth 
Instance details

Defined in Network.Wreq.Internal.Types

Methods

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

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

Eq Link 
Instance details

Defined in Network.Wreq.Internal.Types

Methods

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

(/=) :: Link -> Link -> 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 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 (Only a) 
Instance details

Defined in Data.Tuple.Only

Methods

(==) :: Only a -> Only a -> Bool #

(/=) :: Only a -> Only a -> Bool #

Eq (Encoding' a) 
Instance details

Defined in Data.Aeson.Encoding.Internal

Methods

(==) :: Encoding' a -> Encoding' a -> Bool #

(/=) :: Encoding' a -> Encoding' a -> Bool #

Eq v => Eq (KeyMap v) 
Instance details

Defined in Data.Aeson.KeyMap

Methods

(==) :: KeyMap v -> KeyMap v -> Bool #

(/=) :: KeyMap v -> KeyMap v -> Bool #

Eq a => Eq (IResult a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

(==) :: IResult a -> IResult a -> Bool #

(/=) :: IResult a -> IResult a -> Bool #

Eq a => Eq (Result a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

(==) :: Result a -> Result a -> Bool #

(/=) :: Result a -> Result a -> Bool #

Eq (Async a) 
Instance details

Defined in Control.Concurrent.Async

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 (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 (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 (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 a => Eq (Ratio a) 
Instance details

Defined in GHC.Real

Methods

(==) :: Ratio a -> Ratio a -> Bool #

(/=) :: Ratio a -> Ratio a -> Bool #

Eq (StableName a) 
Instance details

Defined in GHC.StableName

Methods

(==) :: StableName a -> StableName a -> Bool #

(/=) :: StableName a -> StableName a -> Bool #

Eq (Bits n) 
Instance details

Defined in Basement.Bits

Methods

(==) :: Bits n -> Bits n -> Bool #

(/=) :: Bits n -> Bits n -> Bool #

(PrimType ty, Eq ty) => Eq (Block ty) 
Instance details

Defined in Basement.Block.Base

Methods

(==) :: Block ty -> Block ty -> Bool #

(/=) :: Block ty -> Block ty -> Bool #

Eq (Zn n) 
Instance details

Defined in Basement.Bounded

Methods

(==) :: Zn n -> Zn n -> Bool #

(/=) :: Zn n -> Zn n -> Bool #

Eq (Zn64 n) 
Instance details

Defined in Basement.Bounded

Methods

(==) :: Zn64 n -> Zn64 n -> Bool #

(/=) :: Zn64 n -> Zn64 n -> Bool #

Eq a => Eq (NonEmpty a) 
Instance details

Defined in Basement.NonEmpty

Methods

(==) :: NonEmpty a -> NonEmpty a -> Bool #

(/=) :: NonEmpty a -> NonEmpty a -> Bool #

Eq (CountOf ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

(==) :: CountOf ty -> CountOf ty -> Bool #

(/=) :: CountOf ty -> CountOf ty -> Bool #

Eq (Offset ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

(==) :: Offset ty -> Offset ty -> Bool #

(/=) :: Offset ty -> Offset ty -> Bool #

(PrimType ty, Eq ty) => Eq (UArray ty) 
Instance details

Defined in Basement.UArray.Base

Methods

(==) :: UArray ty -> UArray ty -> Bool #

(/=) :: UArray ty -> UArray ty -> Bool #

Eq s => Eq (CI s) 
Instance details

Defined in Data.CaseInsensitive.Internal

Methods

(==) :: CI s -> CI s -> Bool #

(/=) :: CI s -> CI s -> Bool #

Eq a => Eq (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 (Digest a) 
Instance details

Defined in Crypto.Hash.Types

Methods

(==) :: Digest a -> Digest a -> Bool #

(/=) :: Digest a -> Digest a -> Bool #

Eq a => Eq (CryptoFailable a) 
Instance details

Defined in Crypto.Error.Types

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 #

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 (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 name => Eq (IEWrappedName name) 
Instance details

Defined in GHC.Hs.ImpExp

Methods

(==) :: IEWrappedName name -> IEWrappedName name -> Bool #

(/=) :: IEWrappedName name -> IEWrappedName name -> 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 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 (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 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 s => Eq (PosState s) 
Instance details

Defined in Text.Megaparsec.State

Methods

(==) :: PosState s -> PosState s -> Bool #

(/=) :: PosState s -> PosState s -> Bool #

Eq mono => Eq (NonNull mono) 
Instance details

Defined in Data.NonNull

Methods

(==) :: NonNull mono -> NonNull mono -> Bool #

(/=) :: NonNull mono -> NonNull mono -> Bool #

Eq a => Eq (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 (Ok a) 
Instance details

Defined in Database.PostgreSQL.Simple.Ok

Methods

(==) :: Ok a -> Ok a -> Bool #

(/=) :: Ok a -> Ok 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 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 a, PrimUnlifted a) => Eq (UnliftedArray a) 
Instance details

Defined in Data.Primitive.Unlifted.Array

Methods

(==) :: UnliftedArray a -> UnliftedArray a -> Bool #

(/=) :: UnliftedArray a -> UnliftedArray a -> Bool #

Eq g => Eq (StateGen g) 
Instance details

Defined in System.Random.Internal

Methods

(==) :: StateGen g -> StateGen g -> Bool #

(/=) :: StateGen g -> StateGen g -> Bool #

Eq g => Eq (AtomicGen g) 
Instance details

Defined in System.Random.Stateful

Methods

(==) :: AtomicGen g -> AtomicGen g -> Bool #

(/=) :: AtomicGen g -> AtomicGen g -> Bool #

Eq g => Eq (IOGen g) 
Instance details

Defined in System.Random.Stateful

Methods

(==) :: IOGen g -> IOGen g -> Bool #

(/=) :: IOGen g -> IOGen g -> Bool #

Eq g => Eq (STGen g) 
Instance details

Defined in System.Random.Stateful

Methods

(==) :: STGen g -> STGen g -> Bool #

(/=) :: STGen g -> STGen g -> Bool #

Eq g => Eq (TGen g) 
Instance details

Defined in System.Random.Stateful

Methods

(==) :: TGen g -> TGen g -> Bool #

(/=) :: TGen g -> TGen g -> Bool #

Eq a => Eq (Chunk a) 
Instance details

Defined in Data.List.Split.Internals

Methods

(==) :: Chunk a -> Chunk a -> Bool #

(/=) :: Chunk a -> Chunk a -> Bool #

Eq (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 (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 a => Eq (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Methods

(==) :: HashSet a -> HashSet a -> Bool #

(/=) :: HashSet a -> HashSet a -> Bool #

Eq a => Eq (Vector a) 
Instance details

Defined in Data.Vector

Methods

(==) :: Vector a -> Vector a -> Bool #

(/=) :: Vector a -> Vector a -> Bool #

(Prim a, Eq a) => Eq (Vector a) 
Instance details

Defined in Data.Vector.Primitive

Methods

(==) :: Vector a -> Vector a -> Bool #

(/=) :: Vector a -> Vector a -> Bool #

(Storable a, Eq a) => Eq (Vector a) 
Instance details

Defined in Data.Vector.Storable

Methods

(==) :: Vector a -> Vector a -> Bool #

(/=) :: Vector a -> Vector a -> Bool #

Eq c => Eq (FileInfo c) 
Instance details

Defined in Network.Wai.Parse

Methods

(==) :: FileInfo c -> FileInfo c -> Bool #

(/=) :: FileInfo c -> FileInfo c -> Bool #

Eq a => Eq (NonEmpty a) 
Instance details

Defined in GHC.Base

Methods

(==) :: NonEmpty a -> NonEmpty a -> Bool #

(/=) :: NonEmpty a -> NonEmpty a -> Bool #

Eq a => Eq (Maybe a) 
Instance details

Defined in GHC.Maybe

Methods

(==) :: Maybe a -> Maybe a -> Bool #

(/=) :: Maybe a -> Maybe a -> Bool #

Eq a => Eq (a) 
Instance details

Defined in GHC.Classes

Methods

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

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

Eq a => Eq [a] 
Instance details

Defined in GHC.Classes

Methods

(==) :: [a] -> [a] -> Bool #

(/=) :: [a] -> [a] -> 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 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 (STRef s a) 
Instance details

Defined in GHC.STRef

Methods

(==) :: STRef s a -> STRef s a -> Bool #

(/=) :: STRef s a -> STRef s a -> Bool #

(Eq k, Eq a) => Eq (Map k a) 
Instance details

Defined in Data.Map.Internal

Methods

(==) :: Map k a -> Map k a -> Bool #

(/=) :: Map k a -> Map k a -> Bool #

(Eq1 f, Eq a) => Eq (Cofree f a) 
Instance details

Defined in Control.Comonad.Cofree

Methods

(==) :: Cofree f a -> Cofree f a -> Bool #

(/=) :: Cofree f a -> Cofree f a -> Bool #

(Eq1 f, Eq a) => Eq (Free f a) 
Instance details

Defined in Control.Monad.Free

Methods

(==) :: Free f a -> Free f a -> Bool #

(/=) :: Free f a -> Free f a -> Bool #

(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 (ComponentsController components) Source # 
Instance details

Defined in IHP.ServerSideComponent.Types

Methods

(==) :: ComponentsController components -> ComponentsController components -> Bool #

(/=) :: ComponentsController components -> ComponentsController components -> 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 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 (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 (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 (MutableUnliftedArray s a) 
Instance details

Defined in Data.Primitive.Unlifted.Array

Methods

(==) :: MutableUnliftedArray s a -> MutableUnliftedArray s a -> Bool #

(/=) :: MutableUnliftedArray s a -> MutableUnliftedArray s a -> Bool #

(Eq a, Eq b) => Eq (Either a b) 
Instance details

Defined in Data.Strict.Either

Methods

(==) :: Either a b -> Either a b -> Bool #

(/=) :: Either a b -> Either a b -> Bool #

(Eq a, Eq b) => Eq (These a b) 
Instance details

Defined in Data.Strict.These

Methods

(==) :: These a b -> These a b -> Bool #

(/=) :: These a b -> These a b -> Bool #

(Eq a, Eq b) => Eq (Pair a b) 
Instance details

Defined in Data.Strict.Tuple

Methods

(==) :: Pair a b -> Pair a b -> Bool #

(/=) :: Pair a b -> Pair a b -> Bool #

(Eq a, Eq b) => 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 #

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

(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 a, Eq b) => Eq (a, b) 
Instance details

Defined in GHC.Classes

Methods

(==) :: (a, b) -> (a, b) -> Bool #

(/=) :: (a, b) -> (a, b) -> Bool #

Eq (STUArray s i e) 
Instance details

Defined in Data.Array.Base

Methods

(==) :: STUArray s i e -> STUArray s i e -> Bool #

(/=) :: STUArray s i e -> STUArray s i e -> Bool #

Eq 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 (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 #

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

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 (ErrorT e m a) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

(==) :: ErrorT e m a -> ErrorT e m a -> Bool #

(/=) :: ErrorT e m a -> ErrorT e m 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 #

(Eq1 f, Eq1 g, Eq 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 #

(Eq1 f, Eq1 g, Eq 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 #

(Eq1 f, Eq1 g, Eq 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 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 #

type family Element mono #

Instances

Instances details
type Element ByteString 
Instance details

Defined in Data.MonoTraversable

type Element ByteString 
Instance details

Defined in Data.MonoTraversable

type Element ByteString = Word8
type Element IntSet 
Instance details

Defined in Data.MonoTraversable

type Element Text 
Instance details

Defined in Data.MonoTraversable

type Element Text 
Instance details

Defined in Data.MonoTraversable

type Element Text = Char
type Element (ZipList a) 
Instance details

Defined in Data.MonoTraversable

type Element (ZipList a) = a
type Element (Identity a) 
Instance details

Defined in Data.MonoTraversable

type Element (Identity a) = a
type Element (Par1 a) 
Instance details

Defined in Data.MonoTraversable

type Element (Par1 a) = a
type Element (IntMap a) 
Instance details

Defined in Data.MonoTraversable

type Element (IntMap a) = a
type Element (Seq a) 
Instance details

Defined in Data.MonoTraversable

type Element (Seq a) = a
type Element (ViewL a) 
Instance details

Defined in Data.MonoTraversable

type Element (ViewL a) = a
type Element (ViewR a) 
Instance details

Defined in Data.MonoTraversable

type Element (ViewR a) = a
type Element (Set e) 
Instance details

Defined in Data.MonoTraversable

type Element (Set e) = e
type Element (Tree a) 
Instance details

Defined in Data.MonoTraversable

type Element (Tree a) = a
type Element (DList a) 
Instance details

Defined in Data.MonoTraversable.Instances

type Element (DList a) = a
type Element (IO a) 
Instance details

Defined in Data.MonoTraversable

type Element (IO a) = a
type Element (NonNull mono) 
Instance details

Defined in Data.NonNull

type Element (NonNull mono) = Element mono
type Element (HashSet e) 
Instance details

Defined in Data.MonoTraversable

type Element (HashSet e) = e
type Element (Vector a) 
Instance details

Defined in Data.MonoTraversable

type Element (Vector a) = a
type Element (Vector a) 
Instance details

Defined in Data.MonoTraversable

type Element (Vector a) = a
type Element (Vector a) 
Instance details

Defined in Data.MonoTraversable

type Element (Vector a) = a
type Element (NonEmpty a) 
Instance details

Defined in Data.MonoTraversable

type Element (NonEmpty a) = a
type Element (Maybe a) 
Instance details

Defined in Data.MonoTraversable

type Element (Maybe a) = a
type Element [a] 
Instance details

Defined in Data.MonoTraversable

type Element [a] = a
type Element (WrappedMonad m a) 
Instance details

Defined in Data.MonoTraversable

type Element (WrappedMonad m a) = a
type Element (Either a b) 
Instance details

Defined in Data.MonoTraversable

type Element (Either a b) = b
type Element (Proxy a) 
Instance details

Defined in Data.MonoTraversable

type Element (Proxy a) = a
type Element (Arg a b) 
Instance details

Defined in Data.MonoTraversable

type Element (Arg a b) = b
type Element (U1 a) 
Instance details

Defined in Data.MonoTraversable

type Element (U1 a) = a
type Element (V1 a) 
Instance details

Defined in Data.MonoTraversable

type Element (V1 a) = a
type Element (Map k v) 
Instance details

Defined in Data.MonoTraversable

type Element (Map k v) = v
type Element (WrappedMono mono a) 
Instance details

Defined in Data.MonoTraversable

type Element (WrappedMono mono a) = Element mono
type Element (WrappedPoly f a) 
Instance details

Defined in Data.MonoTraversable

type Element (WrappedPoly f a) = a
type Element (MaybeApply f a) 
Instance details

Defined in Data.MonoTraversable.Instances

type Element (MaybeApply f a) = a
type Element (WrappedApplicative f a) 
Instance details

Defined in Data.MonoTraversable.Instances

type Element (WrappedApplicative f a) = a
type Element (ListT m a) 
Instance details

Defined in Data.MonoTraversable

type Element (ListT m a) = a
type Element (MaybeT m a) 
Instance details

Defined in Data.MonoTraversable

type Element (MaybeT m a) = a
type Element (HashMap k v) 
Instance details

Defined in Data.MonoTraversable

type Element (HashMap k v) = v
type Element (r -> a) 
Instance details

Defined in Data.MonoTraversable

type Element (r -> a) = a
type Element (a, b) 
Instance details

Defined in Data.MonoTraversable

type Element (a, b) = b
type Element (WrappedArrow a b c) 
Instance details

Defined in Data.MonoTraversable

type Element (WrappedArrow a b c) = c
type Element (Const m a) 
Instance details

Defined in Data.MonoTraversable

type Element (Const m a) = a
type Element (Rec1 f a) 
Instance details

Defined in Data.MonoTraversable

type Element (Rec1 f a) = a
type Element (EnvT e w a) 
Instance details

Defined in Data.MonoTraversable.Instances

type Element (EnvT e w a) = a
type Element (StoreT s w a) 
Instance details

Defined in Data.MonoTraversable.Instances

type Element (StoreT s w a) = a
type Element (TracedT m w a) 
Instance details

Defined in Data.MonoTraversable.Instances

type Element (TracedT m w a) = a
type Element (Static f a b) 
Instance details

Defined in Data.MonoTraversable.Instances

type Element (Static f a b) = b
type Element (IdentityT m a) 
Instance details

Defined in Data.MonoTraversable

type Element (IdentityT m a) = a
type Element (ReaderT r m a) 
Instance details

Defined in Data.MonoTraversable

type Element (ReaderT r m a) = a
type Element (StateT s m a) 
Instance details

Defined in Data.MonoTraversable

type Element (StateT s m a) = a
type Element (StateT s m a) 
Instance details

Defined in Data.MonoTraversable

type Element (StateT s m a) = a
type Element (WriterT w m a) 
Instance details

Defined in Data.MonoTraversable

type Element (WriterT w m a) = a
type Element (WriterT w m a) 
Instance details

Defined in Data.MonoTraversable

type Element (WriterT w m a) = a
type Element (Product f g a) 
Instance details

Defined in Data.MonoTraversable

type Element (Product f g a) = a
type Element ((f :*: g) a) 
Instance details

Defined in Data.MonoTraversable

type Element ((f :*: g) a) = a
type Element ((f :+: g) a) 
Instance details

Defined in Data.MonoTraversable

type Element ((f :+: g) a) = a
type Element (K1 i c a) 
Instance details

Defined in Data.MonoTraversable

type Element (K1 i c a) = a
type Element (Cokleisli w a b) 
Instance details

Defined in Data.MonoTraversable.Instances

type Element (Cokleisli w a b) = b
type Element (ContT r m a) 
Instance details

Defined in Data.MonoTraversable

type Element (ContT r m a) = a
type Element (Compose f g a) 
Instance details

Defined in Data.MonoTraversable

type Element (Compose f g a) = a
type Element ((f :.: g) a) 
Instance details

Defined in Data.MonoTraversable

type Element ((f :.: g) a) = a
type Element (M1 i c f a) 
Instance details

Defined in Data.MonoTraversable

type Element (M1 i c f a) = a
type Element (RWST r w s m a) 
Instance details

Defined in Data.MonoTraversable

type Element (RWST r w s m a) = a
type Element (RWST r w s m a) 
Instance details

Defined in Data.MonoTraversable

type Element (RWST r w s m a) = a

class Num a where #

Minimal complete definition

(+), (*), abs, signum, fromInteger, (negate | (-))

Methods

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

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

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

negate :: a -> a #

abs :: a -> a #

signum :: a -> a #

fromInteger :: Integer -> a #

Instances

Instances details
Num Pos 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

(+) :: Pos -> Pos -> Pos #

(-) :: Pos -> Pos -> Pos #

(*) :: Pos -> Pos -> Pos #

negate :: Pos -> Pos #

abs :: Pos -> Pos #

signum :: Pos -> Pos #

fromInteger :: Integer -> Pos #

Num Number 
Instance details

Defined in Data.Attoparsec.Number

Methods

(+) :: Number -> Number -> Number #

(-) :: Number -> Number -> Number #

(*) :: Number -> Number -> Number #

negate :: Number -> Number #

abs :: Number -> Number #

signum :: Number -> Number #

fromInteger :: Integer -> Number #

Num CBool 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CBool -> CBool -> CBool #

(-) :: CBool -> CBool -> CBool #

(*) :: CBool -> CBool -> CBool #

negate :: CBool -> CBool #

abs :: CBool -> CBool #

signum :: CBool -> CBool #

fromInteger :: Integer -> CBool #

Num CChar 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CChar -> CChar -> CChar #

(-) :: CChar -> CChar -> CChar #

(*) :: CChar -> CChar -> CChar #

negate :: CChar -> CChar #

abs :: CChar -> CChar #

signum :: CChar -> CChar #

fromInteger :: Integer -> CChar #

Num CClock 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CClock -> CClock -> CClock #

(-) :: CClock -> CClock -> CClock #

(*) :: CClock -> CClock -> CClock #

negate :: CClock -> CClock #

abs :: CClock -> CClock #

signum :: CClock -> CClock #

fromInteger :: Integer -> CClock #

Num CDouble 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CDouble -> CDouble -> CDouble #

(-) :: CDouble -> CDouble -> CDouble #

(*) :: CDouble -> CDouble -> CDouble #

negate :: CDouble -> CDouble #

abs :: CDouble -> CDouble #

signum :: CDouble -> CDouble #

fromInteger :: Integer -> CDouble #

Num CFloat 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CFloat -> CFloat -> CFloat #

(-) :: CFloat -> CFloat -> CFloat #

(*) :: CFloat -> CFloat -> CFloat #

negate :: CFloat -> CFloat #

abs :: CFloat -> CFloat #

signum :: CFloat -> CFloat #

fromInteger :: Integer -> CFloat #

Num CInt 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CInt -> CInt -> CInt #

(-) :: CInt -> CInt -> CInt #

(*) :: CInt -> CInt -> CInt #

negate :: CInt -> CInt #

abs :: CInt -> CInt #

signum :: CInt -> CInt #

fromInteger :: Integer -> CInt #

Num CIntMax 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CIntMax -> CIntMax -> CIntMax #

(-) :: CIntMax -> CIntMax -> CIntMax #

(*) :: CIntMax -> CIntMax -> CIntMax #

negate :: CIntMax -> CIntMax #

abs :: CIntMax -> CIntMax #

signum :: CIntMax -> CIntMax #

fromInteger :: Integer -> CIntMax #

Num CIntPtr 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CIntPtr -> CIntPtr -> CIntPtr #

(-) :: CIntPtr -> CIntPtr -> CIntPtr #

(*) :: CIntPtr -> CIntPtr -> CIntPtr #

negate :: CIntPtr -> CIntPtr #

abs :: CIntPtr -> CIntPtr #

signum :: CIntPtr -> CIntPtr #

fromInteger :: Integer -> CIntPtr #

Num CLLong 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CLLong -> CLLong -> CLLong #

(-) :: CLLong -> CLLong -> CLLong #

(*) :: CLLong -> CLLong -> CLLong #

negate :: CLLong -> CLLong #

abs :: CLLong -> CLLong #

signum :: CLLong -> CLLong #

fromInteger :: Integer -> CLLong #

Num CLong 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CLong -> CLong -> CLong #

(-) :: CLong -> CLong -> CLong #

(*) :: CLong -> CLong -> CLong #

negate :: CLong -> CLong #

abs :: CLong -> CLong #

signum :: CLong -> CLong #

fromInteger :: Integer -> CLong #

Num CPtrdiff 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CPtrdiff -> CPtrdiff -> CPtrdiff #

(-) :: CPtrdiff -> CPtrdiff -> CPtrdiff #

(*) :: CPtrdiff -> CPtrdiff -> CPtrdiff #

negate :: CPtrdiff -> CPtrdiff #

abs :: CPtrdiff -> CPtrdiff #

signum :: CPtrdiff -> CPtrdiff #

fromInteger :: Integer -> CPtrdiff #

Num CSChar 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CSChar -> CSChar -> CSChar #

(-) :: CSChar -> CSChar -> CSChar #

(*) :: CSChar -> CSChar -> CSChar #

negate :: CSChar -> CSChar #

abs :: CSChar -> CSChar #

signum :: CSChar -> CSChar #

fromInteger :: Integer -> CSChar #

Num CSUSeconds 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CSUSeconds -> CSUSeconds -> CSUSeconds #

(-) :: CSUSeconds -> CSUSeconds -> CSUSeconds #

(*) :: CSUSeconds -> CSUSeconds -> CSUSeconds #

negate :: CSUSeconds -> CSUSeconds #

abs :: CSUSeconds -> CSUSeconds #

signum :: CSUSeconds -> CSUSeconds #

fromInteger :: Integer -> CSUSeconds #

Num CShort 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CShort -> CShort -> CShort #

(-) :: CShort -> CShort -> CShort #

(*) :: CShort -> CShort -> CShort #

negate :: CShort -> CShort #

abs :: CShort -> CShort #

signum :: CShort -> CShort #

fromInteger :: Integer -> CShort #

Num CSigAtomic 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CSigAtomic -> CSigAtomic -> CSigAtomic #

(-) :: CSigAtomic -> CSigAtomic -> CSigAtomic #

(*) :: CSigAtomic -> CSigAtomic -> CSigAtomic #

negate :: CSigAtomic -> CSigAtomic #

abs :: CSigAtomic -> CSigAtomic #

signum :: CSigAtomic -> CSigAtomic #

fromInteger :: Integer -> CSigAtomic #

Num CSize 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CSize -> CSize -> CSize #

(-) :: CSize -> CSize -> CSize #

(*) :: CSize -> CSize -> CSize #

negate :: CSize -> CSize #

abs :: CSize -> CSize #

signum :: CSize -> CSize #

fromInteger :: Integer -> CSize #

Num CTime 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CTime -> CTime -> CTime #

(-) :: CTime -> CTime -> CTime #

(*) :: CTime -> CTime -> CTime #

negate :: CTime -> CTime #

abs :: CTime -> CTime #

signum :: CTime -> CTime #

fromInteger :: Integer -> CTime #

Num CUChar 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CUChar -> CUChar -> CUChar #

(-) :: CUChar -> CUChar -> CUChar #

(*) :: CUChar -> CUChar -> CUChar #

negate :: CUChar -> CUChar #

abs :: CUChar -> CUChar #

signum :: CUChar -> CUChar #

fromInteger :: Integer -> CUChar #

Num CUInt 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CUInt -> CUInt -> CUInt #

(-) :: CUInt -> CUInt -> CUInt #

(*) :: CUInt -> CUInt -> CUInt #

negate :: CUInt -> CUInt #

abs :: CUInt -> CUInt #

signum :: CUInt -> CUInt #

fromInteger :: Integer -> CUInt #

Num CUIntMax 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CUIntMax -> CUIntMax -> CUIntMax #

(-) :: CUIntMax -> CUIntMax -> CUIntMax #

(*) :: CUIntMax -> CUIntMax -> CUIntMax #

negate :: CUIntMax -> CUIntMax #

abs :: CUIntMax -> CUIntMax #

signum :: CUIntMax -> CUIntMax #

fromInteger :: Integer -> CUIntMax #

Num CUIntPtr 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CUIntPtr -> CUIntPtr -> CUIntPtr #

(-) :: CUIntPtr -> CUIntPtr -> CUIntPtr #

(*) :: CUIntPtr -> CUIntPtr -> CUIntPtr #

negate :: CUIntPtr -> CUIntPtr #

abs :: CUIntPtr -> CUIntPtr #

signum :: CUIntPtr -> CUIntPtr #

fromInteger :: Integer -> CUIntPtr #

Num CULLong 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CULLong -> CULLong -> CULLong #

(-) :: CULLong -> CULLong -> CULLong #

(*) :: CULLong -> CULLong -> CULLong #

negate :: CULLong -> CULLong #

abs :: CULLong -> CULLong #

signum :: CULLong -> CULLong #

fromInteger :: Integer -> CULLong #

Num CULong 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CULong -> CULong -> CULong #

(-) :: CULong -> CULong -> CULong #

(*) :: CULong -> CULong -> CULong #

negate :: CULong -> CULong #

abs :: CULong -> CULong #

signum :: CULong -> CULong #

fromInteger :: Integer -> CULong #

Num CUSeconds 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CUSeconds -> CUSeconds -> CUSeconds #

(-) :: CUSeconds -> CUSeconds -> CUSeconds #

(*) :: CUSeconds -> CUSeconds -> CUSeconds #

negate :: CUSeconds -> CUSeconds #

abs :: CUSeconds -> CUSeconds #

signum :: CUSeconds -> CUSeconds #

fromInteger :: Integer -> CUSeconds #

Num CUShort 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CUShort -> CUShort -> CUShort #

(-) :: CUShort -> CUShort -> CUShort #

(*) :: CUShort -> CUShort -> CUShort #

negate :: CUShort -> CUShort #

abs :: CUShort -> CUShort #

signum :: CUShort -> CUShort #

fromInteger :: Integer -> CUShort #

Num CWchar 
Instance details

Defined in Foreign.C.Types

Methods

(+) :: CWchar -> CWchar -> CWchar #

(-) :: CWchar -> CWchar -> CWchar #

(*) :: CWchar -> CWchar -> CWchar #

negate :: CWchar -> CWchar #

abs :: CWchar -> CWchar #

signum :: CWchar -> CWchar #

fromInteger :: Integer -> CWchar #

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

Defined in System.Clock

Methods

(+) :: TimeSpec -> TimeSpec -> TimeSpec #

(-) :: TimeSpec -> TimeSpec -> TimeSpec #

(*) :: TimeSpec -> TimeSpec -> TimeSpec #

negate :: TimeSpec -> TimeSpec #

abs :: TimeSpec -> TimeSpec #

signum :: TimeSpec -> TimeSpec #

fromInteger :: Integer -> TimeSpec #

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

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 #

HasResolution a => Num (Fixed a) 
Instance details

Defined in Data.Fixed

Methods

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

(-) :: Fixed a -> Fixed a -> Fixed a #

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

negate :: Fixed a -> Fixed a #

abs :: Fixed a -> Fixed a #

signum :: Fixed a -> Fixed a #

fromInteger :: Integer -> Fixed a #

Num a => Num (Op a b) 
Instance details

Defined in Data.Functor.Contravariant

Methods

(+) :: Op a b -> Op a b -> Op a b #

(-) :: Op a b -> Op a b -> Op a b #

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

negate :: Op a b -> Op a b #

abs :: Op a b -> Op a b #

signum :: Op a b -> Op a b #

fromInteger :: Integer -> Op a b #

Num a => Num (Const a b) 
Instance details

Defined in Data.Functor.Const

Methods

(+) :: Const a b -> Const a b -> Const a b #

(-) :: Const a b -> Const a b -> Const a b #

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

negate :: Const a b -> Const a b #

abs :: Const a b -> Const a b #

signum :: Const a b -> Const a b #

fromInteger :: Integer -> Const a b #

(Applicative f, Num a) => Num (Ap f a) 
Instance details

Defined in Data.Monoid

Methods

(+) :: Ap f a -> Ap f a -> Ap f a #

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

(*) :: Ap f a -> Ap f a -> Ap f a #

negate :: Ap f a -> Ap f a #

abs :: Ap f a -> Ap f a #

signum :: Ap f a -> Ap f a #

fromInteger :: Integer -> Ap f a #

Num (f a) => Num (Alt f a) 
Instance details

Defined in Data.Semigroup.Internal

Methods

(+) :: Alt f a -> Alt f a -> Alt f a #

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

(*) :: Alt f a -> Alt f a -> Alt f a #

negate :: Alt f a -> Alt f a #

abs :: Alt f a -> Alt f a #

signum :: Alt f a -> Alt f a #

fromInteger :: Integer -> Alt f a #

Num a => Num (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

(+) :: Tagged s a -> Tagged s a -> Tagged s a #

(-) :: Tagged s a -> Tagged s a -> Tagged s a #

(*) :: Tagged s a -> Tagged s a -> Tagged s a #

negate :: Tagged s a -> Tagged s a #

abs :: Tagged s a -> Tagged s a #

signum :: Tagged s a -> Tagged s a #

fromInteger :: Integer -> Tagged s a #

data Integer #

Instances

Instances details
FromJSON Integer 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Integer #

parseJSONList :: Value -> Parser [Integer] #

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 #

Enum Integer 
Instance details

Defined in GHC.Enum

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 #

Subtractive Integer 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference 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 #

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 #

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

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

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)

type Difference Integer 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Integer = Integer

data Int #

Instances

Instances details
FromJSON Int 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Int #

parseJSONList :: Value -> Parser [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 ()

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] #

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 #

Subtractive Int 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference 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 :: Nat

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

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 #

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 #

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

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

ByteSource Int 
Instance details

Defined in Data.UUID.Types.Internal.Builder

Methods

(/-/) :: ByteSink Int g -> Int -> g

Unbox Int 
Instance details

Defined in Data.Vector.Unboxed.Base

IArray UArray Int 
Instance details

Defined in Data.Array.Base

Methods

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

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

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

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

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

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

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

FoldableWithIndex Int ZipList 
Instance details

Defined in WithIndex

Methods

ifoldMap :: Monoid m => (Int -> a -> m) -> ZipList a -> m

ifoldMap' :: Monoid m => (Int -> a -> m) -> ZipList a -> m

ifoldr :: (Int -> a -> b -> b) -> b -> ZipList a -> b

ifoldl :: (Int -> b -> a -> b) -> b -> ZipList a -> b

ifoldr' :: (Int -> a -> b -> b) -> b -> ZipList a -> b

ifoldl' :: (Int -> b -> a -> b) -> b -> ZipList a -> b

FoldableWithIndex Int IntMap 
Instance details

Defined in WithIndex

Methods

ifoldMap :: Monoid m => (Int -> a -> m) -> IntMap a -> m

ifoldMap' :: Monoid m => (Int -> a -> m) -> IntMap a -> m

ifoldr :: (Int -> a -> b -> b) -> b -> IntMap a -> b

ifoldl :: (Int -> b -> a -> b) -> b -> IntMap a -> b

ifoldr' :: (Int -> a -> b -> b) -> b -> IntMap a -> b

ifoldl' :: (Int -> b -> a -> b) -> b -> IntMap a -> b

FoldableWithIndex Int Seq 
Instance details

Defined in WithIndex

Methods

ifoldMap :: Monoid m => (Int -> a -> m) -> Seq a -> m

ifoldMap' :: Monoid m => (Int -> a -> m) -> Seq a -> m

ifoldr :: (Int -> a -> b -> b) -> b -> Seq a -> b

ifoldl :: (Int -> b -> a -> b) -> b -> Seq a -> b

ifoldr' :: (Int -> a -> b -> b) -> b -> Seq a -> b

ifoldl' :: (Int -> b -> a -> b) -> b -> Seq a -> b

FoldableWithIndex Int NonEmpty 
Instance details

Defined in WithIndex

Methods

ifoldMap :: Monoid m => (Int -> a -> m) -> NonEmpty a -> m

ifoldMap' :: Monoid m => (Int -> a -> m) -> NonEmpty a -> m

ifoldr :: (Int -> a -> b -> b) -> b -> NonEmpty a -> b

ifoldl :: (Int -> b -> a -> b) -> b -> NonEmpty a -> b

ifoldr' :: (Int -> a -> b -> b) -> b -> NonEmpty a -> b

ifoldl' :: (Int -> b -> a -> b) -> b -> NonEmpty a -> b

FoldableWithIndex Int [] 
Instance details

Defined in WithIndex

Methods

ifoldMap :: Monoid m => (Int -> a -> m) -> [a] -> m

ifoldMap' :: Monoid m => (Int -> a -> m) -> [a] -> m

ifoldr :: (Int -> a -> b -> b) -> b -> [a] -> b

ifoldl :: (Int -> b -> a -> b) -> b -> [a] -> b

ifoldr' :: (Int -> a -> b -> b) -> b -> [a] -> b

ifoldl' :: (Int -> b -> a -> b) -> b -> [a] -> b

FunctorWithIndex Int ZipList 
Instance details

Defined in WithIndex

Methods

imap :: (Int -> a -> b) -> ZipList a -> ZipList b

FunctorWithIndex Int IntMap 
Instance details

Defined in WithIndex

Methods

imap :: (Int -> a -> b) -> IntMap a -> IntMap b

FunctorWithIndex Int Seq 
Instance details

Defined in WithIndex

Methods

imap :: (Int -> a -> b) -> Seq a -> Seq b

FunctorWithIndex Int NonEmpty 
Instance details

Defined in WithIndex

Methods

imap :: (Int -> a -> b) -> NonEmpty a -> NonEmpty b

FunctorWithIndex Int [] 
Instance details

Defined in WithIndex

Methods

imap :: (Int -> a -> b) -> [a] -> [b]

TraversableWithIndex Int ZipList 
Instance details

Defined in WithIndex

Methods

itraverse :: Applicative f => (Int -> a -> f b) -> ZipList a -> f (ZipList b)

TraversableWithIndex Int IntMap 
Instance details

Defined in WithIndex

Methods

itraverse :: Applicative f => (Int -> a -> f b) -> IntMap a -> f (IntMap b)

TraversableWithIndex Int Seq 
Instance details

Defined in WithIndex

Methods

itraverse :: Applicative f => (Int -> a -> f b) -> Seq a -> f (Seq b)

TraversableWithIndex Int NonEmpty 
Instance details

Defined in WithIndex

Methods

itraverse :: Applicative f => (Int -> a -> f b) -> NonEmpty a -> f (NonEmpty b)

TraversableWithIndex Int [] 
Instance details

Defined in WithIndex

Methods

itraverse :: Applicative f => (Int -> a -> f b) -> [a] -> f [b]

TraverseMax Int IntMap 
Instance details

Defined in Control.Lens.Traversal

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

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)

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

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

Methods

from1 :: forall (a :: k0). URec Int a -> Rep1 (URec Int) a

to1 :: forall (a :: k0). Rep1 (URec Int) 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) #

FoldableWithIndex [Int] Tree 
Instance details

Defined in WithIndex

Methods

ifoldMap :: Monoid m => ([Int] -> a -> m) -> Tree a -> m

ifoldMap' :: Monoid m => ([Int] -> a -> m) -> Tree a -> m

ifoldr :: ([Int] -> a -> b -> b) -> b -> Tree a -> b

ifoldl :: ([Int] -> b -> a -> b) -> b -> Tree a -> b

ifoldr' :: ([Int] -> a -> b -> b) -> b -> Tree a -> b

ifoldl' :: ([Int] -> b -> a -> b) -> b -> Tree a -> b

FunctorWithIndex [Int] Tree 
Instance details

Defined in WithIndex

Methods

imap :: ([Int] -> a -> b) -> Tree a -> Tree b

TraversableWithIndex [Int] Tree 
Instance details

Defined in WithIndex

Methods

itraverse :: Applicative f => ([Int] -> a -> f b) -> Tree a -> f (Tree b)

Bizarre (Indexed Int) Mafic 
Instance details

Defined in Control.Lens.Internal.Magma

Methods

bazaar :: Applicative f => Indexed Int a (f b) -> Mafic a b t -> f t

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

Defined in Data.Array.Base

Methods

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

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

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

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

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

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

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

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

Defined in GHC.Generics

Methods

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

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

Generic (URec Int p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Int p) :: Type -> Type

Methods

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

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

Show (URec Int p) 
Instance details

Defined in GHC.Generics

Methods

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

show :: URec Int p -> String

showList :: [URec Int p] -> ShowS #

Eq (URec Int p) 
Instance details

Defined in GHC.Generics

Methods

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

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

Ord (URec Int p) 
Instance details

Defined in GHC.Generics

Methods

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

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

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

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

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

max :: URec Int p -> URec Int p -> URec Int p #

min :: URec Int p -> URec Int p -> URec Int p #

type NatNumMaxBound Int 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Int = NatNumMaxBound Int64
type Difference Int 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Int = Int
type PrimSize Int 
Instance details

Defined in Basement.PrimType

type PrimSize Int = 8
newtype Vector Int 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector Int = V_Int (Vector Int)
data URec Int (p :: k) 
Instance details

Defined in GHC.Generics

data URec Int (p :: k) = UInt {}
type ByteSink Int g 
Instance details

Defined in Data.UUID.Types.Internal.Builder

type ByteSink Int g = Takes4Bytes g
newtype MVector s Int 
Instance details

Defined in Data.Vector.Unboxed.Base

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

Defined in GHC.Generics

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

Defined in GHC.Generics

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

newtype Day #

Instances

Instances details
FromJSON Day 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Day #

parseJSONList :: Value -> Parser [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

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

Defined in System.Clock

Methods

succ :: Clock -> Clock #

pred :: Clock -> Clock #

toEnum :: Int -> Clock #

fromEnum :: Clock -> Int #

enumFrom :: Clock -> [Clock] #

enumFromThen :: Clock -> Clock -> [Clock] #

enumFromTo :: Clock -> Clock -> [Clock] #

enumFromThenTo :: Clock -> Clock -> Clock -> [Clock] #

Enum TimeSpec 
Instance details

Defined in System.Clock

Methods

succ :: TimeSpec -> TimeSpec #

pred :: TimeSpec -> TimeSpec #

toEnum :: Int -> TimeSpec #

fromEnum :: TimeSpec -> Int #

enumFrom :: TimeSpec -> [TimeSpec] #

enumFromThen :: TimeSpec -> TimeSpec -> [TimeSpec] #

enumFromTo :: TimeSpec -> TimeSpec -> [TimeSpec] #

enumFromThenTo :: TimeSpec -> TimeSpec -> TimeSpec -> [TimeSpec] #

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

Defined in System.Directory.Internal.Common

Methods

succ :: FileType -> FileType #

pred :: FileType -> FileType #

toEnum :: Int -> FileType #

fromEnum :: FileType -> Int #

enumFrom :: FileType -> [FileType] #

enumFromThen :: FileType -> FileType -> [FileType] #

enumFromTo :: FileType -> FileType -> [FileType] #

enumFromThenTo :: FileType -> FileType -> FileType -> [FileType] #

Enum XdgDirectory 
Instance details

Defined in System.Directory.Internal.Common

Methods

succ :: XdgDirectory -> XdgDirectory #

pred :: XdgDirectory -> XdgDirectory #

toEnum :: Int -> XdgDirectory #

fromEnum :: XdgDirectory -> Int #

enumFrom :: XdgDirectory -> [XdgDirectory] #

enumFromThen :: XdgDirectory -> XdgDirectory -> [XdgDirectory] #

enumFromTo :: XdgDirectory -> XdgDirectory -> [XdgDirectory] #

enumFromThenTo :: XdgDirectory -> XdgDirectory -> XdgDirectory -> [XdgDirectory] #

Enum XdgDirectoryList 
Instance details

Defined in System.Directory.Internal.Common

Methods

succ :: XdgDirectoryList -> XdgDirectoryList #

pred :: XdgDirectoryList -> XdgDirectoryList #

toEnum :: Int -> XdgDirectoryList #

fromEnum :: XdgDirectoryList -> Int #

enumFrom :: XdgDirectoryList -> [XdgDirectoryList] #

enumFromThen :: XdgDirectoryList -> XdgDirectoryList -> [XdgDirectoryList] #

enumFromTo :: XdgDirectoryList -> XdgDirectoryList -> [XdgDirectoryList] #

enumFromThenTo :: XdgDirectoryList -> XdgDirectoryList -> XdgDirectoryList -> [XdgDirectoryList] #

Enum Extension 
Instance details

Defined in GHC.LanguageExtensions.Type

Methods

succ :: Extension -> Extension #

pred :: Extension -> Extension #

toEnum :: Int -> Extension #

fromEnum :: Extension -> Int #

enumFrom :: Extension -> [Extension] #

enumFromThen :: Extension -> Extension -> [Extension] #

enumFromTo :: Extension -> Extension -> [Extension] #

enumFromThenTo :: Extension -> Extension -> Extension -> [Extension] #

Enum 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 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 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 PortConfig Source # 
Instance details

Defined in IHP.IDE.PortConfig

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

Defined in Data.Functor.Identity

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

Defined in GHC.Enum

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)] #

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] #

a ~ b => Enum (a :~: b) 
Instance details

Defined in Data.Type.Equality

Methods

succ :: (a :~: b) -> a :~: b #

pred :: (a :~: b) -> a :~: b #

toEnum :: Int -> a :~: b #

fromEnum :: (a :~: b) -> Int #

enumFrom :: (a :~: b) -> [a :~: b] #

enumFromThen :: (a :~: b) -> (a :~: b) -> [a :~: b] #

enumFromTo :: (a :~: b) -> (a :~: b) -> [a :~: b] #

enumFromThenTo :: (a :~: b) -> (a :~: b) -> (a :~: b) -> [a :~: b] #

Enum a => Enum (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

succ :: Tagged s a -> Tagged s a #

pred :: Tagged s a -> Tagged s a #

toEnum :: Int -> Tagged s a #

fromEnum :: Tagged s a -> Int #

enumFrom :: Tagged s a -> [Tagged s a] #

enumFromThen :: Tagged s a -> Tagged s a -> [Tagged s a] #

enumFromTo :: Tagged s a -> Tagged s a -> [Tagged s a] #

enumFromThenTo :: Tagged s a -> Tagged s a -> Tagged s a -> [Tagged s a] #

a ~~ b => Enum (a :~~: b) 
Instance details

Defined in Data.Type.Equality

Methods

succ :: (a :~~: b) -> a :~~: b #

pred :: (a :~~: b) -> a :~~: b #

toEnum :: Int -> a :~~: b #

fromEnum :: (a :~~: b) -> Int #

enumFrom :: (a :~~: b) -> [a :~~: b] #

enumFromThen :: (a :~~: b) -> (a :~~: b) -> [a :~~: b] #

enumFromTo :: (a :~~: b) -> (a :~~: b) -> [a :~~: b] #

enumFromThenTo :: (a :~~: b) -> (a :~~: b) -> (a :~~: b) -> [a :~~: b] #

data Chan a #

Instances

Instances details
Eq (Chan a) 
Instance details

Defined in Control.Concurrent.Chan

Methods

(==) :: Chan a -> Chan a -> Bool #

(/=) :: Chan a -> Chan a -> Bool #

data QSem #

data QSemN #

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

Defined in Network.Minio.Data

Methods

liftIO :: IO a -> Minio a #

MonadIO Q 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

liftIO :: IO a -> Q a #

MonadIO m => MonadIO (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

liftIO :: IO a -> ResourceT m a #

MonadIO m => MonadIO (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

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

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

(Error e, MonadIO m) => MonadIO (ErrorT e m) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

liftIO :: IO a -> ErrorT e 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 #

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

(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 (ContT r m) 
Instance details

Defined in Control.Monad.Trans.Cont

Methods

liftIO :: IO a -> ContT r 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 #

class Bifunctor (p :: Type -> Type -> Type) where #

Minimal complete definition

bimap | first, second

Methods

bimap :: (a -> b) -> (c -> d) -> p a c -> p b d #

first :: (a -> b) -> p a c -> p b c #

second :: (b -> c) -> p a b -> p a c #

Instances

Instances details
Bifunctor Either 
Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> Either a c -> Either b d #

first :: (a -> b) -> Either a c -> Either b c #

second :: (b -> c) -> Either a b -> Either a c #

Bifunctor Arg 
Instance details

Defined in Data.Semigroup

Methods

bimap :: (a -> b) -> (c -> d) -> Arg a c -> Arg b d #

first :: (a -> b) -> Arg a c -> Arg b c #

second :: (b -> c) -> Arg a b -> Arg a c #

Bifunctor Either 
Instance details

Defined in Data.Strict.Either

Methods

bimap :: (a -> b) -> (c -> d) -> Either a c -> Either b d #

first :: (a -> b) -> Either a c -> Either b c #

second :: (b -> c) -> Either a b -> Either a c #

Bifunctor These 
Instance details

Defined in Data.Strict.These

Methods

bimap :: (a -> b) -> (c -> d) -> These a c -> These b d #

first :: (a -> b) -> These a c -> These b c #

second :: (b -> c) -> These a b -> These a c #

Bifunctor Pair 
Instance details

Defined in Data.Strict.Tuple

Methods

bimap :: (a -> b) -> (c -> d) -> Pair a c -> Pair b d #

first :: (a -> b) -> Pair a c -> Pair b c #

second :: (b -> c) -> Pair a b -> Pair a c #

Bifunctor These 
Instance details

Defined in Data.These

Methods

bimap :: (a -> b) -> (c -> d) -> These a c -> These b d #

first :: (a -> b) -> These a c -> These b c #

second :: (b -> c) -> These a b -> These a c #

Bifunctor (,) 
Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> (a, c) -> (b, d) #

first :: (a -> b) -> (a, c) -> (b, c) #

second :: (b -> c) -> (a, b) -> (a, c) #

Bifunctor (Const :: Type -> Type -> Type) 
Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> Const a c -> Const b d #

first :: (a -> b) -> Const a c -> Const b c #

second :: (b -> c) -> Const a b -> Const a c #

Functor f => Bifunctor (CofreeF f) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Methods

bimap :: (a -> b) -> (c -> d) -> CofreeF f a c -> CofreeF f b d #

first :: (a -> b) -> CofreeF f a c -> CofreeF f b c #

second :: (b -> c) -> CofreeF f a b -> CofreeF f a c #

Functor f => Bifunctor (FreeF f) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

bimap :: (a -> b) -> (c -> d) -> FreeF f a c -> FreeF f b d #

first :: (a -> b) -> FreeF f a c -> FreeF f b c #

second :: (b -> c) -> FreeF f a b -> FreeF f a c #

Bifunctor (Tagged :: Type -> Type -> Type) 
Instance details

Defined in Data.Tagged

Methods

bimap :: (a -> b) -> (c -> d) -> Tagged a c -> Tagged b d #

first :: (a -> b) -> Tagged a c -> Tagged b c #

second :: (b -> c) -> Tagged a b -> Tagged a c #

Bifunctor (Constant :: Type -> Type -> Type) 
Instance details

Defined in Data.Functor.Constant

Methods

bimap :: (a -> b) -> (c -> d) -> Constant a c -> Constant b d #

first :: (a -> b) -> Constant a c -> Constant b c #

second :: (b -> c) -> Constant a b -> Constant a c #

Bifunctor ((,,) x1) 
Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> (x1, a, c) -> (x1, b, d) #

first :: (a -> b) -> (x1, a, c) -> (x1, b, c) #

second :: (b -> c) -> (x1, a, b) -> (x1, a, c) #

Bifunctor (K1 i :: Type -> Type -> Type) 
Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> K1 i a c -> K1 i b d #

first :: (a -> b) -> K1 i a c -> K1 i b c #

second :: (b -> c) -> K1 i a b -> K1 i a c #

Bifunctor ((,,,) x1 x2) 
Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> (x1, x2, a, c) -> (x1, x2, b, d) #

first :: (a -> b) -> (x1, x2, a, c) -> (x1, x2, b, c) #

second :: (b -> c) -> (x1, x2, a, b) -> (x1, x2, a, c) #

Functor f => Bifunctor (Clown f :: Type -> Type -> Type) 
Instance details

Defined in Data.Bifunctor.Clown

Methods

bimap :: (a -> b) -> (c -> d) -> Clown f a c -> Clown f b d #

first :: (a -> b) -> Clown f a c -> Clown f b c #

second :: (b -> c) -> Clown f a b -> Clown f a c #

Bifunctor p => Bifunctor (Flip p) 
Instance details

Defined in Data.Bifunctor.Flip

Methods

bimap :: (a -> b) -> (c -> d) -> Flip p a c -> Flip p b d #

first :: (a -> b) -> Flip p a c -> Flip p b c #

second :: (b -> c) -> Flip p a b -> Flip p a c #

Functor g => Bifunctor (Joker g :: Type -> Type -> Type) 
Instance details

Defined in Data.Bifunctor.Joker

Methods

bimap :: (a -> b) -> (c -> d) -> Joker g a c -> Joker g b d #

first :: (a -> b) -> Joker g a c -> Joker g b c #

second :: (b -> c) -> Joker g a b -> Joker g a c #

Bifunctor p => Bifunctor (WrappedBifunctor p) 
Instance details

Defined in Data.Bifunctor.Wrapped

Methods

bimap :: (a -> b) -> (c -> d) -> WrappedBifunctor p a c -> WrappedBifunctor p b d #

first :: (a -> b) -> WrappedBifunctor p a c -> WrappedBifunctor p b c #

second :: (b -> c) -> WrappedBifunctor p a b -> WrappedBifunctor p a c #

Bifunctor ((,,,,) x1 x2 x3) 
Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> (x1, x2, x3, a, c) -> (x1, x2, x3, b, d) #

first :: (a -> b) -> (x1, x2, x3, a, c) -> (x1, x2, x3, b, c) #

second :: (b -> c) -> (x1, x2, x3, a, b) -> (x1, x2, x3, a, c) #

(Bifunctor f, Bifunctor g) => Bifunctor (Product f g) 
Instance details

Defined in Data.Bifunctor.Product

Methods

bimap :: (a -> b) -> (c -> d) -> Product f g a c -> Product f g b d #

first :: (a -> b) -> Product f g a c -> Product f g b c #

second :: (b -> c) -> Product f g a b -> Product f g a c #

(Bifunctor p, Bifunctor q) => Bifunctor (Sum p q) 
Instance details

Defined in Data.Bifunctor.Sum

Methods

bimap :: (a -> b) -> (c -> d) -> Sum p q a c -> Sum p q b d #

first :: (a -> b) -> Sum p q a c -> Sum p q b c #

second :: (b -> c) -> Sum p q a b -> Sum p q a c #

Bifunctor ((,,,,,) x1 x2 x3 x4) 
Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> (x1, x2, x3, x4, a, c) -> (x1, x2, x3, x4, b, d) #

first :: (a -> b) -> (x1, x2, x3, x4, a, c) -> (x1, x2, x3, x4, b, c) #

second :: (b -> c) -> (x1, x2, x3, x4, a, b) -> (x1, x2, x3, x4, a, c) #

(Functor f, Bifunctor p) => Bifunctor (Tannen f p) 
Instance details

Defined in Data.Bifunctor.Tannen

Methods

bimap :: (a -> b) -> (c -> d) -> Tannen f p a c -> Tannen f p b d #

first :: (a -> b) -> Tannen f p a c -> Tannen f p b c #

second :: (b -> c) -> Tannen f p a b -> Tannen f p a c #

Bifunctor ((,,,,,,) x1 x2 x3 x4 x5) 
Instance details

Defined in Data.Bifunctor

Methods

bimap :: (a -> b) -> (c -> d) -> (x1, x2, x3, x4, x5, a, c) -> (x1, x2, x3, x4, x5, b, d) #

first :: (a -> b) -> (x1, x2, x3, x4, x5, a, c) -> (x1, x2, x3, x4, x5, b, c) #

second :: (b -> c) -> (x1, x2, x3, x4, x5, a, b) -> (x1, x2, x3, x4, x5, a, c) #

(Bifunctor p, Functor f, Functor g) => Bifunctor (Biff p f g) 
Instance details

Defined in Data.Bifunctor.Biff

Methods

bimap :: (a -> b) -> (c -> d) -> Biff p f g a c -> Biff p f g b d #

first :: (a -> b) -> Biff p f g a c -> Biff p f g b c #

second :: (b -> c) -> Biff p f g a b -> Biff p f g a c #

newtype Identity a #

Constructors

Identity 

Fields

Instances

Instances details
Representable Identity 
Instance details

Defined in Data.Functor.Rep

Associated Types

type Rep Identity

Methods

tabulate :: (Rep Identity -> a) -> Identity a

index :: Identity a -> Rep Identity -> a

FromJSON1 Identity 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (Identity a) #

liftParseJSONList :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [Identity a] #

ToJSON1 Identity 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Value) -> ([a] -> Value) -> Identity a -> Value #

liftToJSONList :: (a -> Value) -> ([a] -> Value) -> [Identity a] -> Value #

liftToEncoding :: (a -> Encoding) -> ([a] -> Encoding) -> Identity a -> Encoding #

liftToEncodingList :: (a -> Encoding) -> ([a] -> Encoding) -> [Identity a] -> Encoding #

MonadFix Identity 
Instance details

Defined in Data.Functor.Identity

Methods

mfix :: (a -> Identity a) -> Identity 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 #

Traversable Identity 
Instance details

Defined in Data.Traversable

Methods

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

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

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

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

Applicative Identity 
Instance details

Defined in Data.Functor.Identity

Methods

pure :: a -> Identity a #

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

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

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

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

Functor Identity 
Instance details

Defined in Data.Functor.Identity

Methods

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

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

Monad Identity 
Instance details

Defined in Data.Functor.Identity

Methods

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

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

return :: a -> Identity a #

Comonad Identity 
Instance details

Defined in Control.Comonad

Methods

extract :: Identity a -> a

duplicate :: Identity a -> Identity (Identity a)

extend :: (Identity a -> b) -> Identity a -> Identity b

ComonadApply Identity 
Instance details

Defined in Control.Comonad

Methods

(<@>) :: Identity (a -> b) -> Identity a -> Identity b

(@>) :: Identity a -> Identity b -> Identity b

(<@) :: Identity a -> Identity b -> Identity a

NFData1 Identity 
Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> Identity a -> ()

Hashable1 Identity 
Instance details

Defined in Data.Hashable.Class

Methods

liftHashWithSalt :: (Int -> a -> Int) -> Int -> Identity a -> Int

Adjustable Identity 
Instance details

Defined in Data.Key

Methods

adjust :: (a -> a) -> Key Identity -> Identity a -> Identity a

replace :: Key Identity -> a -> Identity a -> Identity a

FoldableWithKey Identity 
Instance details

Defined in Data.Key

Methods

toKeyedList :: Identity a -> [(Key Identity, a)]

foldMapWithKey :: Monoid m => (Key Identity -> a -> m) -> Identity a -> m

foldrWithKey :: (Key Identity -> a -> b -> b) -> b -> Identity a -> b

foldlWithKey :: (b -> Key Identity -> a -> b) -> b -> Identity a -> b

FoldableWithKey1 Identity 
Instance details

Defined in Data.Key

Methods

foldMapWithKey1 :: Semigroup m => (Key Identity -> a -> m) -> Identity a -> m

Indexable Identity 
Instance details

Defined in Data.Key

Methods

index :: Identity a -> Key Identity -> a

Keyed Identity 
Instance details

Defined in Data.Key

Methods

mapWithKey :: (Key Identity -> a -> b) -> Identity a -> Identity b

Lookup Identity 
Instance details

Defined in Data.Key

Methods

lookup :: Key Identity -> Identity a -> Maybe a

TraversableWithKey Identity 
Instance details

Defined in Data.Key

Methods

traverseWithKey :: Applicative f => (Key Identity -> a -> f b) -> Identity a -> f (Identity b)

mapWithKeyM :: Monad m => (Key Identity -> a -> m b) -> Identity a -> m (Identity b)

TraversableWithKey1 Identity 
Instance details

Defined in Data.Key

Methods

traverseWithKey1 :: Apply f => (Key Identity -> a -> f b) -> Identity a -> f (Identity b)

Zip Identity 
Instance details

Defined in Data.Key

Methods

zipWith :: (a -> b -> c) -> Identity a -> Identity b -> Identity c

zip :: Identity a -> Identity b -> Identity (a, b)

zap :: Identity (a -> b) -> Identity a -> Identity b

ZipWithKey Identity 
Instance details

Defined in Data.Key

Methods

zipWithKey :: (Key Identity -> a -> b -> c) -> Identity a -> Identity b -> Identity c

zapWithKey :: Identity (Key Identity -> a -> b) -> Identity a -> Identity b

Settable Identity 
Instance details

Defined in Control.Lens.Internal.Setter

Methods

untainted :: Identity a -> a

untaintedDot :: Profunctor p => p a (Identity b) -> p a b

taintedDot :: Profunctor p => p a b -> p a (Identity b)

Traversable1 Identity 
Instance details

Defined in Data.Semigroup.Traversable.Class

Methods

traverse1 :: Apply f => (a -> f b) -> Identity a -> f (Identity b)

sequence1 :: Apply f => Identity (f b) -> f (Identity b)

Generic1 Identity 
Instance details

Defined in Data.Functor.Identity

Associated Types

type Rep1 Identity :: k -> Type

Methods

from1 :: forall (a :: k). Identity a -> Rep1 Identity a

to1 :: forall (a :: k). Rep1 Identity a -> Identity a

FoldableWithIndex () Identity 
Instance details

Defined in WithIndex

Methods

ifoldMap :: Monoid m => (() -> a -> m) -> Identity a -> m

ifoldMap' :: Monoid m => (() -> a -> m) -> Identity a -> m

ifoldr :: (() -> a -> b -> b) -> b -> Identity a -> b

ifoldl :: (() -> b -> a -> b) -> b -> Identity a -> b

ifoldr' :: (() -> a -> b -> b) -> b -> Identity a -> b

ifoldl' :: (() -> b -> a -> b) -> b -> Identity a -> b

FunctorWithIndex () Identity 
Instance details

Defined in WithIndex

Methods

imap :: (() -> a -> b) -> Identity a -> Identity b

TraversableWithIndex () Identity 
Instance details

Defined in WithIndex

Methods

itraverse :: Applicative f => (() -> a -> f b) -> Identity a -> f (Identity b)

Cosieve ReifiedGetter Identity 
Instance details

Defined in Control.Lens.Reified

Methods

cosieve :: ReifiedGetter a b -> Identity a -> b

Sieve ReifiedGetter Identity 
Instance details

Defined in Control.Lens.Reified

Methods

sieve :: ReifiedGetter a b -> a -> Identity b

Unbox a => Vector Vector (Identity a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: Mutable Vector s (Identity a) -> ST s (Vector (Identity a))

basicUnsafeThaw :: Vector (Identity a) -> ST s (Mutable Vector s (Identity a))

basicLength :: Vector (Identity a) -> Int

basicUnsafeSlice :: Int -> Int -> Vector (Identity a) -> Vector (Identity a)

basicUnsafeIndexM :: Vector (Identity a) -> Int -> Box (Identity a)

basicUnsafeCopy :: Mutable Vector s (Identity a) -> Vector (Identity a) -> ST s ()

elemseq :: Vector (Identity a) -> Identity a -> b -> b

Unbox a => MVector MVector (Identity a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s (Identity a) -> Int

basicUnsafeSlice :: Int -> Int -> MVector s (Identity a) -> MVector s (Identity a)

basicOverlaps :: MVector s (Identity a) -> MVector s (Identity a) -> Bool

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

basicInitialize :: MVector s (Identity a) -> ST s ()

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

basicUnsafeRead :: MVector s (Identity a) -> Int -> ST s (Identity a)

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

basicClear :: MVector s (Identity a) -> ST s ()

basicSet :: MVector s (Identity a) -> Identity a -> ST s ()

basicUnsafeCopy :: MVector s (Identity a) -> MVector s (Identity a) -> ST s ()

basicUnsafeMove :: MVector s (Identity a) -> MVector s (Identity a) -> ST s ()

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

FromJSON a => FromJSON (Identity a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Identity a) #

parseJSONList :: Value -> Parser [Identity a] #

FromJSONKey a => FromJSONKey (Identity a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON a => ToJSON (Identity a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey a => ToJSONKey (Identity a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Data a => Data (Identity a) 
Instance details

Defined in Data.Data

Methods

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

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

toConstr :: Identity a -> Constr #

dataTypeOf :: Identity a -> DataType #

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

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

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

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

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

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

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

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

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

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

IsString a => IsString (Identity a) 
Instance details

Defined in Data.String

Methods

fromString :: String -> Identity a #

Storable a => Storable (Identity a) 
Instance details

Defined in Data.Functor.Identity

Methods

sizeOf :: Identity a -> Int

alignment :: Identity a -> Int

peekElemOff :: Ptr (Identity a) -> Int -> IO (Identity a)

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

peekByteOff :: Ptr b -> Int -> IO (Identity a)

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

peek :: Ptr (Identity a) -> IO (Identity a)

poke :: Ptr (Identity a) -> Identity a -> IO ()

Monoid a => Monoid (Identity a) 
Instance details

Defined in Data.Functor.Identity

Methods

mempty :: Identity a #

mappend :: Identity a -> Identity a -> Identity a #

mconcat :: [Identity a] -> Identity a #

Semigroup a => Semigroup (Identity a) 
Instance details

Defined in Data.Functor.Identity

Methods

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

sconcat :: NonEmpty (Identity a) -> Identity a #

stimes :: Integral b => b -> Identity a -> Identity a #

Bits a => Bits (Identity a) 
Instance details

Defined in Data.Functor.Identity

FiniteBits a => FiniteBits (Identity a) 
Instance details

Defined in Data.Functor.Identity

Bounded a => Bounded (Identity a) 
Instance details

Defined in Data.Functor.Identity

Enum a => Enum (Identity a) 
Instance details

Defined in Data.Functor.Identity

Floating a => Floating (Identity a) 
Instance details

Defined in Data.Functor.Identity

RealFloat a => RealFloat (Identity a) 
Instance details

Defined in Data.Functor.Identity

Generic (Identity a) 
Instance details

Defined in Data.Functor.Identity

Associated Types

type Rep (Identity a) :: Type -> Type

Methods

from :: Identity a -> Rep (Identity a) x

to :: Rep (Identity a) x -> Identity a

Ix a => Ix (Identity a) 
Instance details

Defined in Data.Functor.Identity

Num a => Num (Identity a) 
Instance details

Defined in Data.Functor.Identity

Read a => Read (Identity a) 
Instance details

Defined in Data.Functor.Identity

Methods

readsPrec :: Int -> ReadS (Identity a)

readList :: ReadS [Identity a]

readPrec :: ReadPrec (Identity a)

readListPrec :: ReadPrec [Identity a]

Fractional a => Fractional (Identity a) 
Instance details

Defined in Data.Functor.Identity

Integral a => Integral (Identity a) 
Instance details

Defined in Data.Functor.Identity

Real a => Real (Identity a) 
Instance details

Defined in Data.Functor.Identity

Methods

toRational :: Identity a -> Rational #

RealFrac a => RealFrac (Identity a) 
Instance details

Defined in Data.Functor.Identity

Methods

properFraction :: Integral b => Identity a -> (b, Identity a) #

truncate :: Integral b => Identity a -> b #

round :: Integral b => Identity a -> b #

ceiling :: Integral b => Identity a -> b #

floor :: Integral b => Identity a -> b #

Show a => Show (Identity a) 
Instance details

Defined in Data.Functor.Identity

Methods

showsPrec :: Int -> Identity a -> ShowS #

show :: Identity a -> String

showList :: [Identity a] -> ShowS #

NFData a => NFData (Identity a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Identity a -> () #

Eq a => Eq (Identity a) 
Instance details

Defined in Data.Functor.Identity

Methods

(==) :: Identity a -> Identity a -> Bool #

(/=) :: Identity a -> Identity a -> Bool #

Ord a => Ord (Identity a) 
Instance details

Defined in Data.Functor.Identity

Methods

compare :: Identity a -> Identity a -> Ordering #

(<) :: Identity a -> Identity a -> Bool #

(<=) :: Identity a -> Identity a -> Bool #

(>) :: Identity a -> Identity a -> Bool #

(>=) :: Identity a -> Identity a -> Bool #

max :: Identity a -> Identity a -> Identity a #

min :: Identity a -> Identity a -> Identity a #

Hashable a => Hashable (Identity a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Identity a -> Int #

hash :: Identity a -> Int #

Ixed (Identity a) 
Instance details

Defined in Control.Lens.At

Methods

ix :: Index (Identity a) -> Traversal' (Identity a) (IxValue (Identity a))

Wrapped (Identity a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (Identity a)

Methods

_Wrapped' :: Iso' (Identity a) (Unwrapped (Identity a))

MonoFoldable (Identity a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (Identity a) -> m) -> Identity a -> m #

ofoldr :: (Element (Identity a) -> b -> b) -> b -> Identity a -> b #

ofoldl' :: (a0 -> Element (Identity a) -> a0) -> a0 -> Identity a -> a0 #

otoList :: Identity a -> [Element (Identity a)] #

oall :: (Element (Identity a) -> Bool) -> Identity a -> Bool #

oany :: (Element (Identity a) -> Bool) -> Identity a -> Bool #

onull :: Identity a -> Bool #

olength :: Identity a -> Int #

olength64 :: Identity a -> Int64 #

ocompareLength :: Integral i => Identity a -> i -> Ordering #

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

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

omapM_ :: Applicative m => (Element (Identity a) -> m ()) -> Identity a -> m () #

oforM_ :: Applicative m => Identity a -> (Element (Identity a) -> m ()) -> m () #

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

ofoldMap1Ex :: Semigroup m => (Element (Identity a) -> m) -> Identity a -> m #

ofoldr1Ex :: (Element (Identity a) -> Element (Identity a) -> Element (Identity a)) -> Identity a -> Element (Identity a) #

ofoldl1Ex' :: (Element (Identity a) -> Element (Identity a) -> Element (Identity a)) -> Identity a -> Element (Identity a) #

headEx :: Identity a -> Element (Identity a) #

lastEx :: Identity a -> Element (Identity a) #

unsafeHead :: Identity a -> Element (Identity a) #

unsafeLast :: Identity a -> Element (Identity a) #

maximumByEx :: (Element (Identity a) -> Element (Identity a) -> Ordering) -> Identity a -> Element (Identity a) #

minimumByEx :: (Element (Identity a) -> Element (Identity a) -> Ordering) -> Identity a -> Element (Identity a) #

oelem :: Element (Identity a) -> Identity a -> Bool #

onotElem :: Element (Identity a) -> Identity a -> Bool #

MonoFunctor (Identity a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Identity a) -> Element (Identity a)) -> Identity a -> Identity a #

MonoPointed (Identity a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Identity a) -> Identity a #

MonoTraversable (Identity a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (Identity a) -> f (Element (Identity a))) -> Identity a -> f (Identity a) #

omapM :: Applicative m => (Element (Identity a) -> m (Element (Identity a))) -> Identity a -> m (Identity a) #

FromField a => FromField (Identity a) 
Instance details

Defined in Database.PostgreSQL.Simple.FromField

Methods

fromField :: FieldParser (Identity a)

ToField a => ToField (Identity a) 
Instance details

Defined in Database.PostgreSQL.Simple.ToField

Methods

toField :: Identity a -> Action

Prim a => Prim (Identity a) 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: Identity a -> Int#

alignment# :: Identity a -> Int#

indexByteArray# :: ByteArray# -> Int# -> Identity a

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, Identity a #)

writeByteArray# :: MutableByteArray# s -> Int# -> Identity a -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> Identity a -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> Identity a

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, Identity a #)

writeOffAddr# :: Addr# -> Int# -> Identity a -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> Identity a -> State# s -> State# s

Unbox a => Unbox (Identity a) 
Instance details

Defined in Data.Vector.Unboxed.Base

t ~ Identity b => Rewrapped (Identity a) t 
Instance details

Defined in Control.Lens.Wrapped

Each (Identity a) (Identity b) a b 
Instance details

Defined in Control.Lens.Each

Methods

each :: Traversal (Identity a) (Identity b) a b

Field1 (Identity a) (Identity b) a b 
Instance details

Defined in Control.Lens.Tuple

Methods

_1 :: Lens (Identity a) (Identity b) a b

type Rep Identity 
Instance details

Defined in Data.Functor.Rep

type Rep Identity = ()
type Key Identity 
Instance details

Defined in Data.Key

type Key Identity = ()
type Rep1 Identity 
Instance details

Defined in Data.Functor.Identity

type Rep1 Identity = D1 ('MetaData "Identity" "Data.Functor.Identity" "base" 'True) (C1 ('MetaCons "Identity" 'PrefixI 'True) (S1 ('MetaSel ('Just "runIdentity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1))
newtype MVector s (Identity a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s (Identity a) = MV_Identity (MVector s a)
type Rep (Identity a) 
Instance details

Defined in Data.Functor.Identity

type Rep (Identity a) = D1 ('MetaData "Identity" "Data.Functor.Identity" "base" 'True) (C1 ('MetaCons "Identity" 'PrefixI 'True) (S1 ('MetaSel ('Just "runIdentity") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))
type Index (Identity a) 
Instance details

Defined in Control.Lens.At

type Index (Identity a) = ()
type IxValue (Identity a) 
Instance details

Defined in Control.Lens.At

type IxValue (Identity a) = a
type Unwrapped (Identity a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (Identity a) = a
type Element (Identity a) 
Instance details

Defined in Data.MonoTraversable

type Element (Identity a) = a
newtype Vector (Identity a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector (Identity a) = V_Identity (Vector a)

newtype Down a #

Constructors

Down 

Fields

Instances

Instances details
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 #

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

Generic1 Down 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 Down :: k -> Type

Methods

from1 :: forall (a :: k). Down a -> Rep1 Down a

to1 :: forall (a :: k). 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))

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 #

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) :: Type -> Type

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)

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)

data WrappedMonoid m #

Instances

Instances details
FromJSON1 WrappedMonoid 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (WrappedMonoid a) #

liftParseJSONList :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [WrappedMonoid a] #

ToJSON1 WrappedMonoid 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Value) -> ([a] -> Value) -> WrappedMonoid a -> Value #

liftToJSONList :: (a -> Value) -> ([a] -> Value) -> [WrappedMonoid a] -> Value #

liftToEncoding :: (a -> Encoding) -> ([a] -> Encoding) -> WrappedMonoid a -> Encoding #

liftToEncodingList :: (a -> Encoding) -> ([a] -> Encoding) -> [WrappedMonoid a] -> Encoding #

NFData1 WrappedMonoid 
Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> WrappedMonoid a -> ()

Generic1 WrappedMonoid 
Instance details

Defined in Data.Semigroup

Associated Types

type Rep1 WrappedMonoid :: k -> Type

Methods

from1 :: forall (a :: k). WrappedMonoid a -> Rep1 WrappedMonoid a

to1 :: forall (a :: k). Rep1 WrappedMonoid a -> WrappedMonoid a

Unbox a => Vector Vector (WrappedMonoid a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: Mutable Vector s (WrappedMonoid a) -> ST s (Vector (WrappedMonoid a))

basicUnsafeThaw :: Vector (WrappedMonoid a) -> ST s (Mutable Vector s (WrappedMonoid a))

basicLength :: Vector (WrappedMonoid a) -> Int

basicUnsafeSlice :: Int -> Int -> Vector (WrappedMonoid a) -> Vector (WrappedMonoid a)

basicUnsafeIndexM :: Vector (WrappedMonoid a) -> Int -> Box (WrappedMonoid a)

basicUnsafeCopy :: Mutable Vector s (WrappedMonoid a) -> Vector (WrappedMonoid a) -> ST s ()

elemseq :: Vector (WrappedMonoid a) -> WrappedMonoid a -> b -> b

Unbox a => MVector MVector (WrappedMonoid a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s (WrappedMonoid a) -> Int

basicUnsafeSlice :: Int -> Int -> MVector s (WrappedMonoid a) -> MVector s (WrappedMonoid a)

basicOverlaps :: MVector s (WrappedMonoid a) -> MVector s (WrappedMonoid a) -> Bool

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

basicInitialize :: MVector s (WrappedMonoid a) -> ST s ()

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

basicUnsafeRead :: MVector s (WrappedMonoid a) -> Int -> ST s (WrappedMonoid a)

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

basicClear :: MVector s (WrappedMonoid a) -> ST s ()

basicSet :: MVector s (WrappedMonoid a) -> WrappedMonoid a -> ST s ()

basicUnsafeCopy :: MVector s (WrappedMonoid a) -> MVector s (WrappedMonoid a) -> ST s ()

basicUnsafeMove :: MVector s (WrappedMonoid a) -> MVector s (WrappedMonoid a) -> ST s ()

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

FromJSON a => FromJSON (WrappedMonoid a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (WrappedMonoid a) #

parseJSONList :: Value -> Parser [WrappedMonoid a] #

ToJSON a => ToJSON (WrappedMonoid a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

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

Monoid m => Monoid (WrappedMonoid m) 
Instance details

Defined in Data.Semigroup

Monoid m => Semigroup (WrappedMonoid m) 
Instance details

Defined in Data.Semigroup

Bounded m => Bounded (WrappedMonoid m) 
Instance details

Defined in Data.Semigroup

Enum a => Enum (WrappedMonoid a) 
Instance details

Defined in Data.Semigroup

Generic (WrappedMonoid m) 
Instance details

Defined in Data.Semigroup

Associated Types

type Rep (WrappedMonoid m) :: Type -> Type

Methods

from :: WrappedMonoid m -> Rep (WrappedMonoid m) x

to :: Rep (WrappedMonoid m) x -> WrappedMonoid m

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]

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 #

NFData m => NFData (WrappedMonoid m) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: WrappedMonoid m -> () #

Eq m => Eq (WrappedMonoid m) 
Instance details

Defined in Data.Semigroup

Ord m => Ord (WrappedMonoid m) 
Instance details

Defined in Data.Semigroup

Hashable a => Hashable (WrappedMonoid a) 
Instance details

Defined in Data.Hashable.Class

Wrapped (WrappedMonoid a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (WrappedMonoid a)

Methods

_Wrapped' :: Iso' (WrappedMonoid a) (Unwrapped (WrappedMonoid a))

Unbox a => Unbox (WrappedMonoid a) 
Instance details

Defined in Data.Vector.Unboxed.Base

t ~ WrappedMonoid b => Rewrapped (WrappedMonoid a) t 
Instance details

Defined in Control.Lens.Wrapped

type Rep1 WrappedMonoid 
Instance details

Defined in Data.Semigroup

type Rep1 WrappedMonoid = D1 ('MetaData "WrappedMonoid" "Data.Semigroup" "base" 'True) (C1 ('MetaCons "WrapMonoid" 'PrefixI 'True) (S1 ('MetaSel ('Just "unwrapMonoid") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1))
newtype MVector s (WrappedMonoid a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s (WrappedMonoid a) = MV_WrappedMonoid (MVector s a)
type Rep (WrappedMonoid m) 
Instance details

Defined in Data.Semigroup

type Rep (WrappedMonoid m) = D1 ('MetaData "WrappedMonoid" "Data.Semigroup" "base" 'True) (C1 ('MetaCons "WrapMonoid" 'PrefixI 'True) (S1 ('MetaSel ('Just "unwrapMonoid") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 m)))
type Unwrapped (WrappedMonoid a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (WrappedMonoid a) = a
newtype Vector (WrappedMonoid a) 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector (WrappedMonoid a) = V_WrappedMonoid (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 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 TimeSpec 
Instance details

Defined in System.Clock

Methods

sizeOf :: TimeSpec -> Int

alignment :: TimeSpec -> Int

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

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

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

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

peek :: Ptr TimeSpec -> IO TimeSpec

poke :: Ptr TimeSpec -> TimeSpec -> 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 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 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 (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 ()

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

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

Minimal complete definition

empty, (<|>)

Methods

empty :: f a #

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

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

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

Instances

Instances details
Alternative IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

empty :: IResult a #

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

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

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

Alternative Parser 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

empty :: Parser a #

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

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

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

Alternative Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

empty :: Result a #

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

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

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

Alternative Concurrently 
Instance details

Defined in Control.Concurrent.Async

Alternative ZipList 
Instance details

Defined in Control.Applicative

Methods

empty :: ZipList a #

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

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

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

Alternative STM 
Instance details

Defined in GHC.Conc.Sync

Methods

empty :: STM a #

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

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

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

Alternative P 
Instance details

Defined in Text.ParserCombinators.ReadP

Methods

empty :: P a #

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

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

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

Alternative ReadP 
Instance details

Defined in Text.ParserCombinators.ReadP

Methods

empty :: ReadP a #

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

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

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

Alternative ReadPrec 
Instance details

Defined in Text.ParserCombinators.ReadPrec

Methods

empty :: ReadPrec a #

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

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

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

Alternative Get 
Instance details

Defined in Data.Serialize.Get

Methods

empty :: Get a #

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

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

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

Alternative Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

empty :: Seq a #

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

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

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

Alternative DList 
Instance details

Defined in Data.DList.Internal

Methods

empty :: DList a #

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

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

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

Alternative IO 
Instance details

Defined in GHC.Base

Methods

empty :: IO a #

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

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

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

Alternative Conversion 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Methods

empty :: Conversion a #

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

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

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

Alternative RowParser 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Methods

empty :: RowParser a #

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

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

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

Alternative Ok 
Instance details

Defined in Database.PostgreSQL.Simple.Ok

Methods

empty :: Ok a #

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

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

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

Alternative Array 
Instance details

Defined in Data.Primitive.Array

Methods

empty :: Array a #

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

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

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

Alternative SmallArray 
Instance details

Defined in Data.Primitive.SmallArray

Methods

empty :: SmallArray a #

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

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

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

Alternative Vector 
Instance details

Defined in Data.Vector

Methods

empty :: Vector a #

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

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

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

Alternative Maybe 
Instance details

Defined in GHC.Base

Methods

empty :: Maybe a #

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

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

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

Alternative [] 
Instance details

Defined in GHC.Base

Methods

empty :: [a] #

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

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

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

Alternative (Parser i) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

empty :: Parser i a #

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

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

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

MonadPlus m => Alternative (WrappedMonad m) 
Instance details

Defined in Control.Applicative

Methods

empty :: WrappedMonad m a #

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

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

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

ArrowPlus a => Alternative (ArrowMonad a) 
Instance details

Defined in Control.Arrow

Methods

empty :: ArrowMonad a a0 #

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

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

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

Alternative (Proxy :: Type -> Type) 
Instance details

Defined in Data.Proxy

Methods

empty :: Proxy a #

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

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

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

Alternative (U1 :: Type -> Type) 
Instance details

Defined in GHC.Generics

Methods

empty :: U1 a #

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

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

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

Alternative v => Alternative (Free v) 
Instance details

Defined in Control.Monad.Free

Methods

empty :: Free v a #

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

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

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

Alternative f => Alternative (Yoneda f) 
Instance details

Defined in Data.Functor.Yoneda

Methods

empty :: Yoneda f a #

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

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

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

Alternative (ReifiedFold s) 
Instance details

Defined in Control.Lens.Reified

Methods

empty :: ReifiedFold s a #

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

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

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

Alternative m => Alternative (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

empty :: ResourceT m a #

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

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

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

Alternative f => Alternative (Lift f) 
Instance details

Defined in Control.Applicative.Lift

Methods

empty :: Lift f a #

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

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

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

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

Defined in Control.Monad.Trans.Maybe

Methods

empty :: MaybeT m a #

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

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

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

MonadUnliftIO m => Alternative (Conc m) 
Instance details

Defined in UnliftIO.Internals.Async

Methods

empty :: Conc m a #

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

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

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

MonadUnliftIO m => Alternative (Concurrently m) 
Instance details

Defined in UnliftIO.Internals.Async

Methods

empty :: Concurrently m a #

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

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

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

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

Defined in Control.Applicative

Methods

empty :: WrappedArrow a b a0 #

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

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

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

Alternative m => Alternative (Kleisli m a) 
Instance details

Defined in Control.Arrow

Methods

empty :: Kleisli m a a0 #

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

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

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

Alternative f => Alternative (Ap f) 
Instance details

Defined in Data.Monoid

Methods

empty :: Ap f a #

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

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

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

Alternative f => Alternative (Alt f) 
Instance details

Defined in Data.Semigroup.Internal

Methods

empty :: Alt f a #

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

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

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

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

Defined in GHC.Generics

Methods

empty :: Generically1 f a #

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

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

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

Alternative f => Alternative (Rec1 f) 
Instance details

Defined in GHC.Generics

Methods

empty :: Rec1 f a #

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

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

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

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

Defined in Control.Monad.Trans.Free

Methods

empty :: FreeT f m a #

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

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

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

Alternative f => Alternative (Backwards f) 
Instance details

Defined in Control.Applicative.Backwards

Methods

empty :: Backwards f a #

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

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

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

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

Defined in Control.Monad.Trans.Accum

Methods

empty :: AccumT w m a #

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

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

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

(Functor m, Monad m, Error e) => Alternative (ErrorT e m) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

empty :: ErrorT e m a #

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

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

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

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

Defined in Control.Monad.Trans.Except

Methods

empty :: ExceptT e m a #

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

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

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

Alternative m => Alternative (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

empty :: IdentityT m a #

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

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

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

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

Defined in Control.Monad.Trans.Reader

Methods

empty :: ReaderT r m a #

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

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

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

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

Defined in Control.Monad.Trans.Select

Methods

empty :: SelectT r m a #

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

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

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

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

Defined in Control.Monad.Trans.State.Lazy

Methods

empty :: StateT s m a #

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

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

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

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

Defined in Control.Monad.Trans.State.Strict

Methods

empty :: StateT s m a #

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

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

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

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

Defined in Control.Monad.Trans.Writer.Lazy

Methods

empty :: WriterT w m a #

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

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

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

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

Defined in Control.Monad.Trans.Writer.Strict

Methods

empty :: WriterT w m a #

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

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

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

Alternative f => Alternative (Reverse f) 
Instance details

Defined in Data.Functor.Reverse

Methods

empty :: Reverse f a #

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

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

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

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

Defined in Data.Functor.Product

Methods

empty :: Product f g a #

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

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

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

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

Defined in GHC.Generics

Methods

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

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

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

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

(Ord e, Stream s) => Alternative (ParsecT e s m) 
Instance details

Defined in Text.Megaparsec.Internal

Methods

empty :: ParsecT e s m a #

(<|>) :: ParsecT e s m a -> ParsecT e s m a -> ParsecT e s m a #

some :: ParsecT e s m a -> ParsecT e s m [a] #

many :: ParsecT e s m a -> ParsecT e s m [a] #

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

Defined in Data.Functor.Compose

Methods

empty :: Compose f g a #

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

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

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

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

Defined in GHC.Generics

Methods

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

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

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

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

Alternative f => Alternative (M1 i c f) 
Instance details

Defined in GHC.Generics

Methods

empty :: M1 i c f a #

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

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

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

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

Defined in Control.Monad.Trans.RWS.Lazy

Methods

empty :: RWST r w s m a #

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

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

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

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

Defined in Control.Monad.Trans.RWS.Strict

Methods

empty :: RWST r w s m a #

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

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

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

class (Alternative m, Monad m) => MonadPlus (m :: Type -> Type) where #

Minimal complete definition

Nothing

Methods

mzero :: m a #

mplus :: m a -> m a -> m a #

Instances

Instances details
MonadPlus IResult 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

mzero :: IResult a #

mplus :: IResult a -> IResult a -> IResult a #

MonadPlus Parser 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

mzero :: Parser a #

mplus :: Parser a -> Parser a -> Parser a #

MonadPlus Result 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

mzero :: Result a #

mplus :: Result a -> Result a -> Result a #

MonadPlus STM 
Instance details

Defined in GHC.Conc.Sync

Methods

mzero :: STM a #

mplus :: STM a -> STM a -> STM a #

MonadPlus P 
Instance details

Defined in Text.ParserCombinators.ReadP

Methods

mzero :: P a #

mplus :: P a -> P a -> P a #

MonadPlus ReadP 
Instance details

Defined in Text.ParserCombinators.ReadP

Methods

mzero :: ReadP a #

mplus :: ReadP a -> ReadP a -> ReadP a #

MonadPlus ReadPrec 
Instance details

Defined in Text.ParserCombinators.ReadPrec

Methods

mzero :: ReadPrec a #

mplus :: ReadPrec a -> ReadPrec a -> ReadPrec a #

MonadPlus Get 
Instance details

Defined in Data.Serialize.Get

Methods

mzero :: Get a #

mplus :: Get a -> Get a -> Get a #

MonadPlus Seq 
Instance details

Defined in Data.Sequence.Internal

Methods

mzero :: Seq a #

mplus :: Seq a -> Seq a -> Seq a #

MonadPlus DList 
Instance details

Defined in Data.DList.Internal

Methods

mzero :: DList a #

mplus :: DList a -> DList a -> DList a #

MonadPlus IO 
Instance details

Defined in GHC.Base

Methods

mzero :: IO a #

mplus :: IO a -> IO a -> IO a #

MonadPlus Conversion 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Methods

mzero :: Conversion a #

mplus :: Conversion a -> Conversion a -> Conversion a #

MonadPlus Ok 
Instance details

Defined in Database.PostgreSQL.Simple.Ok

Methods

mzero :: Ok a #

mplus :: Ok a -> Ok a -> Ok a #

MonadPlus Array 
Instance details

Defined in Data.Primitive.Array

Methods

mzero :: Array a #

mplus :: Array a -> Array a -> Array a #

MonadPlus SmallArray 
Instance details

Defined in Data.Primitive.SmallArray

Methods

mzero :: SmallArray a #

mplus :: SmallArray a -> SmallArray a -> SmallArray a #

MonadPlus Vector 
Instance details

Defined in Data.Vector

Methods

mzero :: Vector a #

mplus :: Vector a -> Vector a -> Vector a #

MonadPlus Maybe 
Instance details

Defined in GHC.Base

Methods

mzero :: Maybe a #

mplus :: Maybe a -> Maybe a -> Maybe a #

MonadPlus [] 
Instance details

Defined in GHC.Base

Methods

mzero :: [a] #

mplus :: [a] -> [a] -> [a] #

MonadPlus (Parser i) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

mzero :: Parser i a #

mplus :: Parser i a -> Parser i a -> Parser i a #

(ArrowApply a, ArrowPlus a) => MonadPlus (ArrowMonad a) 
Instance details

Defined in Control.Arrow

Methods

mzero :: ArrowMonad a a0 #

mplus :: ArrowMonad a a0 -> ArrowMonad a a0 -> ArrowMonad a a0 #

MonadPlus (Proxy :: Type -> Type) 
Instance details

Defined in Data.Proxy

Methods

mzero :: Proxy a #

mplus :: Proxy a -> Proxy a -> Proxy a #

MonadPlus (U1 :: Type -> Type) 
Instance details

Defined in GHC.Generics

Methods

mzero :: U1 a #

mplus :: U1 a -> U1 a -> U1 a #

(Functor v, MonadPlus v) => MonadPlus (Free v) 
Instance details

Defined in Control.Monad.Free

Methods

mzero :: Free v a #

mplus :: Free v a -> Free v a -> Free v a #

MonadPlus m => MonadPlus (Yoneda m) 
Instance details

Defined in Data.Functor.Yoneda

Methods

mzero :: Yoneda m a #

mplus :: Yoneda m a -> Yoneda m a -> Yoneda m a #

MonadPlus (ReifiedFold s) 
Instance details

Defined in Control.Lens.Reified

Methods

mzero :: ReifiedFold s a #

mplus :: ReifiedFold s a -> ReifiedFold s a -> ReifiedFold s a #

MonadPlus m => MonadPlus (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

mzero :: ResourceT m a #

mplus :: ResourceT m a -> ResourceT m a -> ResourceT m a #

Monad m => MonadPlus (MaybeT m) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

mzero :: MaybeT m a #

mplus :: MaybeT m a -> MaybeT m a -> MaybeT m a #

MonadPlus m => MonadPlus (Kleisli m a) 
Instance details

Defined in Control.Arrow

Methods

mzero :: Kleisli m a a0 #

mplus :: Kleisli m a a0 -> Kleisli m a a0 -> Kleisli m a a0 #

MonadPlus f => MonadPlus (Ap f) 
Instance details

Defined in Data.Monoid

Methods

mzero :: Ap f a #

mplus :: Ap f a -> Ap f a -> Ap f a #

MonadPlus f => MonadPlus (Alt f) 
Instance details

Defined in Data.Semigroup.Internal

Methods

mzero :: Alt f a #

mplus :: Alt f a -> Alt f a -> Alt f a #

MonadPlus f => MonadPlus (Rec1 f) 
Instance details

Defined in GHC.Generics

Methods

mzero :: Rec1 f a #

mplus :: Rec1 f a -> Rec1 f a -> Rec1 f a #

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

Defined in Control.Monad.Trans.Free

Methods

mzero :: FreeT f m a #

mplus :: FreeT f m a -> FreeT f m a -> FreeT f m a #

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

Defined in Control.Monad.Trans.Accum

Methods

mzero :: AccumT w m a #

mplus :: AccumT w m a -> AccumT w m a -> AccumT w m a #

(Monad m, Error e) => MonadPlus (ErrorT e m) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

mzero :: ErrorT e m a #

mplus :: ErrorT e m a -> ErrorT e m a -> ErrorT e m a #

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

Defined in Control.Monad.Trans.Except

Methods

mzero :: ExceptT e m a #

mplus :: ExceptT e m a -> ExceptT e m a -> ExceptT e m a #

MonadPlus m => MonadPlus (IdentityT m) 
Instance details

Defined in Control.Monad.Trans.Identity

Methods

mzero :: IdentityT m a #

mplus :: IdentityT m a -> IdentityT m a -> IdentityT m a #

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

Defined in Control.Monad.Trans.Reader

Methods

mzero :: ReaderT r m a #

mplus :: ReaderT r m a -> ReaderT r m a -> ReaderT r m a #

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

Defined in Control.Monad.Trans.Select

Methods

mzero :: SelectT r m a #

mplus :: SelectT r m a -> SelectT r m a -> SelectT r m a #

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

Defined in Control.Monad.Trans.State.Lazy

Methods

mzero :: StateT s m a #

mplus :: StateT s m a -> StateT s m a -> StateT s m a #

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

Defined in Control.Monad.Trans.State.Strict

Methods

mzero :: StateT s m a #

mplus :: StateT s m a -> StateT s m a -> StateT s m a #

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

Defined in Control.Monad.Trans.Writer.Lazy

Methods

mzero :: WriterT w m a #

mplus :: WriterT w m a -> WriterT w m a -> WriterT w m a #

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

Defined in Control.Monad.Trans.Writer.Strict

Methods

mzero :: WriterT w m a #

mplus :: WriterT w m a -> WriterT w m a -> WriterT w m a #

MonadPlus m => MonadPlus (Reverse m) 
Instance details

Defined in Data.Functor.Reverse

Methods

mzero :: Reverse m a #

mplus :: Reverse m a -> Reverse m a -> Reverse m a #

(MonadPlus f, MonadPlus g) => MonadPlus (Product f g) 
Instance details

Defined in Data.Functor.Product

Methods

mzero :: Product f g a #

mplus :: Product f g a -> Product f g a -> Product f g a #

(MonadPlus f, MonadPlus g) => MonadPlus (f :*: g) 
Instance details

Defined in GHC.Generics

Methods

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

mplus :: (f :*: g) a -> (f :*: g) a -> (f :*: g) a #

(Ord e, Stream s) => MonadPlus (ParsecT e s m) 
Instance details

Defined in Text.Megaparsec.Internal

Methods

mzero :: ParsecT e s m a #

mplus :: ParsecT e s m a -> ParsecT e s m a -> ParsecT e s m a #

MonadPlus f => MonadPlus (M1 i c f) 
Instance details

Defined in GHC.Generics

Methods

mzero :: M1 i c f a #

mplus :: M1 i c f a -> M1 i c f a -> M1 i c f a #

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

Defined in Control.Monad.Trans.RWS.Lazy

Methods

mzero :: RWST r w s m a #

mplus :: RWST r w s m a -> RWST r w s m a -> RWST r w s m a #

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

Defined in Control.Monad.Trans.RWS.Strict

Methods

mzero :: RWST r w s m a #

mplus :: RWST r w s m a -> RWST r w s m a -> RWST r w s m a #

data STM a #

Instances

Instances details
Alternative STM 
Instance details

Defined in GHC.Conc.Sync

Methods

empty :: STM a #

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

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

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

Applicative STM 
Instance details

Defined in GHC.Conc.Sync

Methods

pure :: a -> STM a #

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

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

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

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

Functor STM 
Instance details

Defined in GHC.Conc.Sync

Methods

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

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

Monad STM 
Instance details

Defined in GHC.Conc.Sync

Methods

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

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

return :: a -> STM a #

MonadPlus STM 
Instance details

Defined in GHC.Conc.Sync

Methods

mzero :: STM a #

mplus :: STM a -> STM a -> STM a #

MonadCatch STM 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => STM a -> (e -> STM a) -> STM a

MonadThrow STM 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> STM 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 #

Semigroup a => Semigroup (STM a) 
Instance details

Defined in GHC.Conc.Sync

Methods

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

sconcat :: NonEmpty (STM a) -> STM a #

stimes :: Integral b => b -> STM a -> STM a #

RandomGen g => FrozenGen (TGen g) STM 
Instance details

Defined in System.Random.Stateful

Associated Types

type MutableGen (TGen g) STM = (g :: Type)

Methods

freezeGen :: MutableGen (TGen g) STM -> STM (TGen g)

thawGen :: TGen g -> STM (MutableGen (TGen g) STM)

RandomGen g => StatefulGen (TGenM g) STM 
Instance details

Defined in System.Random.Stateful

Methods

uniformWord32R :: Word32 -> TGenM g -> STM Word32

uniformWord64R :: Word64 -> TGenM g -> STM Word64

uniformWord8 :: TGenM g -> STM Word8

uniformWord16 :: TGenM g -> STM Word16

uniformWord32 :: TGenM g -> STM Word32

uniformWord64 :: TGenM g -> STM Word64

uniformShortByteString :: Int -> TGenM g -> STM ShortByteString

RandomGen r => RandomGenM (TGenM r) r STM 
Instance details

Defined in System.Random.Stateful

Methods

applyRandomGenM :: (r -> (a, r)) -> TGenM r -> STM a

type MutableGen (TGen g) STM 
Instance details

Defined in System.Random.Stateful

type MutableGen (TGen g) STM = TGenM g

data TVar a #

Instances

Instances details
Eq (TVar a) 
Instance details

Defined in GHC.Conc.Sync

Methods

(==) :: TVar a -> TVar a -> Bool #

(/=) :: TVar a -> TVar a -> Bool #

data SomeException #

Constructors

Exception e => SomeException e 

data SeekMode #

Instances

Instances details
Enum SeekMode 
Instance details

Defined in GHC.IO.Device

Ix SeekMode 
Instance details

Defined in GHC.IO.Device

Read SeekMode 
Instance details

Defined in GHC.IO.Device

Methods

readsPrec :: Int -> ReadS SeekMode

readList :: ReadS [SeekMode]

readPrec :: ReadPrec SeekMode

readListPrec :: ReadPrec [SeekMode]

Show SeekMode 
Instance details

Defined in GHC.IO.Device

Methods

showsPrec :: Int -> SeekMode -> ShowS #

show :: SeekMode -> String

showList :: [SeekMode] -> ShowS #

Eq SeekMode 
Instance details

Defined in GHC.IO.Device

Ord SeekMode 
Instance details

Defined in GHC.IO.Device

ToCInt SeekMode 
Instance details

Defined in Database.PostgreSQL.LibPQ.Enums

Methods

toCInt :: SeekMode -> CInt

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 BufferMode #

Instances

Instances details
Read BufferMode 
Instance details

Defined in GHC.IO.Handle.Types

Methods

readsPrec :: Int -> ReadS BufferMode

readList :: ReadS [BufferMode]

readPrec :: ReadPrec BufferMode

readListPrec :: ReadPrec [BufferMode]

Show BufferMode 
Instance details

Defined in GHC.IO.Handle.Types

Methods

showsPrec :: Int -> BufferMode -> ShowS #

show :: BufferMode -> String

showList :: [BufferMode] -> ShowS #

Eq BufferMode 
Instance details

Defined in GHC.IO.Handle.Types

Ord BufferMode 
Instance details

Defined in GHC.IO.Handle.Types

data IOMode #

Instances

Instances details
Enum IOMode 
Instance details

Defined in GHC.IO.IOMode

Ix IOMode 
Instance details

Defined in GHC.IO.IOMode

Read IOMode 
Instance details

Defined in GHC.IO.IOMode

Methods

readsPrec :: Int -> ReadS IOMode

readList :: ReadS [IOMode]

readPrec :: ReadPrec IOMode

readListPrec :: ReadPrec [IOMode]

Show IOMode 
Instance details

Defined in GHC.IO.IOMode

Methods

showsPrec :: Int -> IOMode -> ShowS #

show :: IOMode -> String

showList :: [IOMode] -> ShowS #

Eq IOMode 
Instance details

Defined in GHC.IO.IOMode

Methods

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

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

Ord IOMode 
Instance details

Defined in GHC.IO.IOMode

ToCInt IOMode 
Instance details

Defined in Database.PostgreSQL.LibPQ.Enums

Methods

toCInt :: IOMode -> CInt

data STRef s a #

Instances

Instances details
NFData2 STRef 
Instance details

Defined in Control.DeepSeq

Methods

liftRnf2 :: (a -> ()) -> (b -> ()) -> STRef a b -> ()

NFData1 (STRef s) 
Instance details

Defined in Control.DeepSeq

Methods

liftRnf :: (a -> ()) -> STRef s a -> ()

NFData (STRef s a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: STRef s a -> () #

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 #

Monoid w => MutableCollection (STRef s w) 
Instance details

Defined in Data.Mutable.Class

Associated Types

type CollElement (STRef s w) #

Methods

newColl :: (PrimMonad m, PrimState m ~ MCState (STRef s w)) => m (STRef s w) #

MutableContainer (STRef s a) 
Instance details

Defined in Data.Mutable.Class

Associated Types

type MCState (STRef s a) #

IsSequence a => MutablePopBack (STRef s a) 
Instance details

Defined in Data.Mutable.Class

Methods

popBack :: (PrimMonad m, PrimState m ~ MCState (STRef s a)) => STRef s a -> m (Maybe (CollElement (STRef s a))) #

IsSequence a => MutablePopFront (STRef s a) 
Instance details

Defined in Data.Mutable.Class

Methods

popFront :: (PrimMonad m, PrimState m ~ MCState (STRef s a)) => STRef s a -> m (Maybe (CollElement (STRef s a))) #

IsSequence a => MutablePushBack (STRef s a) 
Instance details

Defined in Data.Mutable.Class

Methods

pushBack :: (PrimMonad m, PrimState m ~ MCState (STRef s a)) => STRef s a -> CollElement (STRef s a) -> m () #

IsSequence a => MutablePushFront (STRef s a) 
Instance details

Defined in Data.Mutable.Class

Methods

pushFront :: (PrimMonad m, PrimState m ~ MCState (STRef s a)) => STRef s a -> CollElement (STRef s a) -> m () #

MutableRef (STRef s a) 
Instance details

Defined in Data.Mutable.Class

Associated Types

type RefElement (STRef s a) #

Methods

newRef :: (PrimMonad m, PrimState m ~ MCState (STRef s a)) => RefElement (STRef s a) -> m (STRef s a) #

readRef :: (PrimMonad m, PrimState m ~ MCState (STRef s a)) => STRef s a -> m (RefElement (STRef s a)) #

writeRef :: (PrimMonad m, PrimState m ~ MCState (STRef s a)) => STRef s a -> RefElement (STRef s a) -> m () #

modifyRef :: (PrimMonad m, PrimState m ~ MCState (STRef s a)) => STRef s a -> (RefElement (STRef s a) -> RefElement (STRef s a)) -> m () #

modifyRef' :: (PrimMonad m, PrimState m ~ MCState (STRef s a)) => STRef s a -> (RefElement (STRef s a) -> RefElement (STRef s a)) -> m () #

PrimUnlifted (STRef s a) 
Instance details

Defined in Data.Primitive.Unlifted.Class

Associated Types

type Unlifted (STRef s a) :: UnliftedType

Methods

toUnlifted# :: STRef s a -> Unlifted (STRef s a)

fromUnlifted# :: Unlifted (STRef s a) -> STRef s a

writeUnliftedArray# :: MutableArrayArray# s0 -> Int# -> STRef s a -> State# s0 -> State# s0

readUnliftedArray# :: MutableArrayArray# s0 -> Int# -> State# s0 -> (# State# s0, STRef s a #)

indexUnliftedArray# :: ArrayArray# -> Int# -> STRef s a

type CollElement (STRef s w) 
Instance details

Defined in Data.Mutable.Class

type CollElement (STRef s w) = Element w
type MCState (STRef s a) 
Instance details

Defined in Data.Mutable.Class

type MCState (STRef s a) = s
type RefElement (STRef s a) 
Instance details

Defined in Data.Mutable.Class

type RefElement (STRef s a) = a
type Unlifted (STRef s a) 
Instance details

Defined in Data.Primitive.Unlifted.Class

type Unlifted (STRef s a) = MutVar# s a

type LText = Text #

type SVector = Vector #

type UVector = Vector #

type BlazeBuilder = Builder #

type ByteStringBuilder = Builder #

type TextBuilder = Builder #

class ToBuilder value builder where #

Methods

toBuilder :: value -> builder #

Instances

Instances details
ToBuilder Builder Builder 
Instance details

Defined in Data.Builder

Methods

toBuilder :: Builder -> Builder #

ToBuilder ByteString Builder 
Instance details

Defined in Data.Builder

Methods

toBuilder :: ByteString -> Builder #

ToBuilder ByteString Builder 
Instance details

Defined in Data.Builder

Methods

toBuilder :: ByteString -> Builder #

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 #

ToBuilder Builder Builder 
Instance details

Defined in Data.Builder

Methods

toBuilder :: Builder -> Builder #

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 #

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 #

a ~ Char => ToBuilder [a] Builder 
Instance details

Defined in Data.Builder

Methods

toBuilder :: [a] -> Builder #

a ~ Char => ToBuilder [a] Builder 
Instance details

Defined in Data.Builder

Methods

toBuilder :: [a] -> Builder #

data IntMap a #

Instances

Instances details
FromJSON1 IntMap 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (IntMap a) #

liftParseJSONList :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [IntMap a] #

ToJSON1 IntMap 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Value) -> ([a] -> Value) -> IntMap a -> Value #

liftToJSONList :: (a -> Value) -> ([a] -> Value) -> [IntMap a] -> Value #

liftToEncoding :: (a -> Encoding) -> ([a] -> Encoding) -> IntMap a -> Encoding #

liftToEncodingList :: (a -> Encoding) -> ([a] -> Encoding) -> [IntMap a] -> Encoding #

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

Methods

emptyTM :: IntMap a

lookupTM :: Key IntMap -> IntMap b -> Maybe b

alterTM :: Key IntMap -> XT b -> IntMap b -> IntMap b

mapTM :: (a -> b) -> IntMap a -> 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

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 #

FoldableWithIndex Int IntMap 
Instance details

Defined in WithIndex

Methods

ifoldMap :: Monoid m => (Int -> a -> m) -> IntMap a -> m

ifoldMap' :: Monoid m => (Int -> a -> m) -> IntMap a -> m

ifoldr :: (Int -> a -> b -> b) -> b -> IntMap a -> b

ifoldl :: (Int -> b -> a -> b) -> b -> IntMap a -> b

ifoldr' :: (Int -> a -> b -> b) -> b -> IntMap a -> b

ifoldl' :: (Int -> b -> a -> b) -> b -> IntMap a -> b

FunctorWithIndex Int IntMap 
Instance details

Defined in WithIndex

Methods

imap :: (Int -> a -> b) -> IntMap a -> IntMap b

TraversableWithIndex Int IntMap 
Instance details

Defined in WithIndex

Methods

itraverse :: Applicative f => (Int -> a -> f b) -> IntMap a -> f (IntMap 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 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)

FromJSON a => FromJSON (IntMap a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (IntMap a) #

parseJSONList :: Value -> Parser [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)

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

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)

Methods

_Wrapped' :: Iso' (IntMap a) (Unwrapped (IntMap a))

HasKeysSet (IntMap v) 
Instance details

Defined in Data.Containers

Associated Types

type KeySet (IntMap v) #

Methods

keysSet :: IntMap v -> KeySet (IntMap v) #

IsMap (IntMap value) 
Instance details

Defined in Data.Containers

Associated Types

type MapValue (IntMap 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) #

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)

Methods

one :: OneItem (IntMap v) -> IntMap v

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)

data IntSet #

Instances

Instances details
FromJSON IntSet 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser IntSet #

parseJSONList :: Value -> Parser [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

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

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

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 #

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

Methods

one :: OneItem IntSet -> IntSet

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

data Seq a #

Instances

Instances details
FromJSON1 Seq 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (Seq a) #

liftParseJSONList :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [Seq a] #

ToJSON1 Seq 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Value) -> ([a] -> Value) -> Seq a -> Value #

liftToJSONList :: (a -> Value) -> ([a] -> Value) -> [Seq a] -> Value #

liftToEncoding :: (a -> Encoding) -> ([a] -> Encoding) -> Seq a -> Encoding #

liftToEncodingList :: (a -> Encoding) -> ([a] -> Encoding) -> [Seq a] -> Encoding #

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

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

FoldableWithIndex Int Seq 
Instance details

Defined in WithIndex

Methods

ifoldMap :: Monoid m => (Int -> a -> m) -> Seq a -> m

ifoldMap' :: Monoid m => (Int -> a -> m) -> Seq a -> m

ifoldr :: (Int -> a -> b -> b) -> b -> Seq a -> b

ifoldl :: (Int -> b -> a -> b) -> b -> Seq a -> b

ifoldr' :: (Int -> a -> b -> b) -> b -> Seq a -> b

ifoldl' :: (Int -> b -> a -> b) -> b -> Seq a -> b

FunctorWithIndex Int Seq 
Instance details

Defined in WithIndex

Methods

imap :: (Int -> a -> b) -> Seq a -> Seq b

TraversableWithIndex Int Seq 
Instance details

Defined in WithIndex

Methods

itraverse :: Applicative f => (Int -> a -> f b) -> Seq a -> f (Seq b)

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)

FromJSON a => FromJSON (Seq a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (Seq a) #

parseJSONList :: Value -> Parser [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 #

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)

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)

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)

type Tokens (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] #

SemiSequence (Seq a) 
Instance details

Defined in Data.Sequences

Associated Types

type Index (Seq a) #

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

One (Seq a) 
Instance details

Defined in Relude.Container.One

Associated Types

type OneItem (Seq 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 NFData a where #

Minimal complete definition

Nothing

Methods

rnf :: a -> () #

Instances

Instances details
NFData Key 
Instance details

Defined in Data.Aeson.Key

Methods

rnf :: Key -> () #

NFData JSONPathElement 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

rnf :: JSONPathElement -> () #

NFData Value 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

rnf :: Value -> () #

NFData Number 
Instance details

Defined in Data.Attoparsec.Number

Methods

rnf :: Number -> () #

NFData ByteArray 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: ByteArray -> () #

NFData All 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: All -> () #

NFData Any 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Any -> () #

NFData TypeRep 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: TypeRep -> () #

NFData Unique 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Unique -> () #

NFData Version 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Version -> () #

NFData Void 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Void -> () #

NFData CBool 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CBool -> () #

NFData CChar 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CChar -> () #

NFData CClock 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CClock -> () #

NFData CDouble 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CDouble -> () #

NFData CFile 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CFile -> () #

NFData CFloat 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CFloat -> () #

NFData CFpos 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CFpos -> () #

NFData CInt 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CInt -> () #

NFData CIntMax 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CIntMax -> () #

NFData CIntPtr 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CIntPtr -> () #

NFData CJmpBuf 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CJmpBuf -> () #

NFData CLLong 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CLLong -> () #

NFData CLong 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CLong -> () #

NFData CPtrdiff 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CPtrdiff -> () #

NFData CSChar 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CSChar -> () #

NFData CSUSeconds 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CSUSeconds -> () #

NFData CShort 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CShort -> () #

NFData CSigAtomic 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CSigAtomic -> () #

NFData CSize 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CSize -> () #

NFData CTime 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CTime -> () #

NFData CUChar 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CUChar -> () #

NFData CUInt 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CUInt -> () #

NFData CUIntMax 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CUIntMax -> () #

NFData CUIntPtr 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CUIntPtr -> () #

NFData CULLong 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CULLong -> () #

NFData CULong 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CULong -> () #

NFData CUSeconds 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CUSeconds -> () #

NFData CUShort 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CUShort -> () #

NFData CWchar 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CWchar -> () #

NFData ThreadId 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: ThreadId -> () #

NFData Fingerprint 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Fingerprint -> () #

NFData MaskingState 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: MaskingState -> () #

NFData ExitCode 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: ExitCode -> () #

NFData Int16 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int16 -> () #

NFData Int32 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int32 -> () #

NFData Int64 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int64 -> () #

NFData Int8 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int8 -> () #

NFData CallStack 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: CallStack -> () #

NFData SrcLoc 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: SrcLoc -> () #

NFData Word16 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word16 -> () #

NFData Word32 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word32 -> () #

NFData Word64 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word64 -> () #

NFData Word8 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word8 -> () #

NFData ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

Methods

rnf :: ByteString -> () #

NFData ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Methods

rnf :: ByteString -> () #

NFData ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Methods

rnf :: ShortByteString -> () #

NFData IntSet 
Instance details

Defined in Data.IntSet.Internal

Methods

rnf :: IntSet -> () #

NFData SameSiteOption 
Instance details

Defined in Web.Cookie

Methods

rnf :: SameSiteOption -> () #

NFData SetCookie 
Instance details

Defined in Web.Cookie

Methods

rnf :: SetCookie -> () #

NFData SharedSecret 
Instance details

Defined in Crypto.ECC

Methods

rnf :: SharedSecret -> () #

NFData Ordering 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Ordering -> () #

NFData TyCon 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: TyCon -> () #

NFData FailureReason 
Instance details

Defined in Test.Hspec.Core.Example

Methods

rnf :: FailureReason -> () #

NFData IP 
Instance details

Defined in Net.IP

Methods

rnf :: IP -> () #

NFData IPv4 
Instance details

Defined in Net.IPv4

Methods

rnf :: IPv4 -> () #

NFData IPv4Range 
Instance details

Defined in Net.IPv4

Methods

rnf :: IPv4Range -> () #

NFData IPv6 
Instance details

Defined in Net.IPv6

Methods

rnf :: IPv6 -> () #

NFData IPv6Range 
Instance details

Defined in Net.IPv6

Methods

rnf :: IPv6Range -> () #

NFData FunctionCall Source # 
Instance details

Defined in IHP.DataSync.DynamicQuery

Methods

rnf :: FunctionCall -> () #

NFData OrderByClause Source # 
Instance details

Defined in IHP.DataSync.DynamicQuery

Methods

rnf :: OrderByClause -> () #

NFData OrderByClause Source # 
Instance details

Defined in IHP.QueryBuilder

Methods

rnf :: OrderByClause -> () #

NFData OrderByDirection Source # 
Instance details

Defined in IHP.QueryBuilder

Methods

rnf :: OrderByDirection -> () #

NFData InvalidPosException 
Instance details

Defined in Text.Megaparsec.Pos

Methods

rnf :: InvalidPosException -> () #

NFData Pos 
Instance details

Defined in Text.Megaparsec.Pos

Methods

rnf :: Pos -> () #

NFData SourcePos 
Instance details

Defined in Text.Megaparsec.Pos

Methods

rnf :: SourcePos -> () #

NFData ScrubbedBytes 
Instance details

Defined in Data.ByteArray.ScrubbedBytes

Methods

rnf :: ScrubbedBytes -> () #

NFData SockAddr 
Instance details

Defined in Network.Socket.Types

Methods

rnf :: SockAddr -> () #

NFData URI 
Instance details

Defined in Network.URI

Methods

rnf :: URI -> () #

NFData URIAuth 
Instance details

Defined in Network.URI

Methods

rnf :: URIAuth -> () #

NFData TextDetails 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

rnf :: TextDetails -> () #

NFData Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Methods

rnf :: Doc -> () #

NFData StdGen 
Instance details

Defined in System.Random.Internal

Methods

rnf :: StdGen -> () #

NFData Scientific 
Instance details

Defined in Data.Scientific

Methods

rnf :: Scientific -> () #

NFData ShortText 
Instance details

Defined in Data.Text.Short.Internal

Methods

rnf :: ShortText -> () #

NFData CalendarDiffDays 
Instance details

Defined in Data.Time.Calendar.CalendarDiffDays

Methods

rnf :: CalendarDiffDays -> () #

NFData Day 
Instance details

Defined in Data.Time.Calendar.Days

Methods

rnf :: Day -> () #

NFData DayOfWeek 
Instance details

Defined in Data.Time.Calendar.Week

Methods

rnf :: DayOfWeek -> () #

NFData DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Methods

rnf :: DiffTime -> () #

NFData NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

Methods

rnf :: NominalDiffTime -> () #

NFData SystemTime 
Instance details

Defined in Data.Time.Clock.Internal.SystemTime

Methods

rnf :: SystemTime -> () #

NFData UTCTime 
Instance details

Defined in Data.Time.Clock.Internal.UTCTime

Methods

rnf :: UTCTime -> () #

NFData UniversalTime 
Instance details

Defined in Data.Time.Clock.Internal.UniversalTime

Methods

rnf :: UniversalTime -> () #

NFData CalendarDiffTime 
Instance details

Defined in Data.Time.LocalTime.Internal.CalendarDiffTime

Methods

rnf :: CalendarDiffTime -> () #

NFData LocalTime 
Instance details

Defined in Data.Time.LocalTime.Internal.LocalTime

Methods

rnf :: LocalTime -> () #

NFData TimeOfDay 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeOfDay

Methods

rnf :: TimeOfDay -> () #

NFData TimeZone 
Instance details

Defined in Data.Time.LocalTime.Internal.TimeZone

Methods

rnf :: TimeZone -> () #

NFData ZonedTime 
Instance details

Defined in Data.Time.LocalTime.Internal.ZonedTime

Methods

rnf :: ZonedTime -> () #

NFData UUID 
Instance details

Defined in Data.UUID.Types.Internal

Methods

rnf :: UUID -> () #

NFData Int128 
Instance details

Defined in Data.WideWord.Int128

Methods

rnf :: Int128 -> () #

NFData Word128 
Instance details

Defined in Data.WideWord.Word128

Methods

rnf :: Word128 -> () #

NFData Word256 
Instance details

Defined in Data.WideWord.Word256

Methods

rnf :: Word256 -> () #

NFData Content 
Instance details

Defined in Data.XML.Types

Methods

rnf :: Content -> () #

NFData Doctype 
Instance details

Defined in Data.XML.Types

Methods

rnf :: Doctype -> () #

NFData Document 
Instance details

Defined in Data.XML.Types

Methods

rnf :: Document -> () #

NFData Element 
Instance details

Defined in Data.XML.Types

Methods

rnf :: Element -> () #

NFData Event 
Instance details

Defined in Data.XML.Types

Methods

rnf :: Event -> () #

NFData ExternalID 
Instance details

Defined in Data.XML.Types

Methods

rnf :: ExternalID -> () #

NFData Instruction 
Instance details

Defined in Data.XML.Types

Methods

rnf :: Instruction -> () #

NFData Miscellaneous 
Instance details

Defined in Data.XML.Types

Methods

rnf :: Miscellaneous -> () #

NFData Name 
Instance details

Defined in Data.XML.Types

Methods

rnf :: Name -> () #

NFData Node 
Instance details

Defined in Data.XML.Types

Methods

rnf :: Node -> () #

NFData Prologue 
Instance details

Defined in Data.XML.Types

Methods

rnf :: Prologue -> () #

NFData Integer 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Integer -> () #

NFData Natural 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Natural -> () #

NFData () 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: () -> () #

NFData Bool 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Bool -> () #

NFData Char 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Char -> () #

NFData Double 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Double -> () #

NFData Float 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Float -> () #

NFData Int 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Int -> () #

NFData Word 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Word -> () #

NFData a => NFData (Only a) 
Instance details

Defined in Data.Tuple.Only

Methods

rnf :: Only a -> () #

NFData v => NFData (KeyMap v) 
Instance details

Defined in Data.Aeson.KeyMap

Methods

rnf :: KeyMap v -> () #

NFData a => NFData (IResult a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

rnf :: IResult a -> () #

NFData a => NFData (Result a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

rnf :: Result a -> () #

NFData a => NFData (ZipList a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: ZipList a -> () #

NFData (MutableByteArray s) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: MutableByteArray s -> () #

NFData a => NFData (Complex a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Complex a -> () #

NFData a => NFData (Identity a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Identity a -> () #

NFData a => NFData (First a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: First a -> () #

NFData a => NFData (Last a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Last a -> () #

NFData a => NFData (Down a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Down a -> () #

NFData a => NFData (First a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: First a -> () #

NFData a => NFData (Last a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Last a -> () #

NFData a => NFData (Max a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Max a -> () #

NFData a => NFData (Min a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Min a -> () #

NFData m => NFData (WrappedMonoid m) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: WrappedMonoid m -> () #

NFData a => NFData (Dual a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Dual a -> () #

NFData a => NFData (Product a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Product a -> () #

NFData a => NFData (Sum a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Sum a -> () #

NFData (IORef a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: IORef a -> () #

NFData (MVar a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: MVar a -> () #

NFData (FunPtr a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: FunPtr a -> () #

NFData (Ptr a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Ptr a -> () #

NFData a => NFData (Ratio a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Ratio a -> () #

NFData (StableName a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: StableName a -> () #

NFData s => NFData (CI s) 
Instance details

Defined in Data.CaseInsensitive.Internal

Methods

rnf :: CI s -> () #

NFData a => NFData (SCC a) 
Instance details

Defined in Data.Graph

Methods

rnf :: SCC a -> () #

NFData a => NFData (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

rnf :: IntMap a -> () #

NFData a => NFData (Digit a) 
Instance details

Defined in Data.Sequence.Internal

Methods

rnf :: Digit a -> () #

NFData a => NFData (Elem a) 
Instance details

Defined in Data.Sequence.Internal

Methods

rnf :: Elem a -> () #

NFData a => NFData (FingerTree a) 
Instance details

Defined in Data.Sequence.Internal

Methods

rnf :: FingerTree a -> () #

NFData a => NFData (Node a) 
Instance details

Defined in Data.Sequence.Internal

Methods

rnf :: Node a -> () #

NFData a => NFData (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

rnf :: Seq a -> () #

NFData a => NFData (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

rnf :: Set a -> () #

NFData a => NFData (Tree a) 
Instance details

Defined in Data.Tree

Methods

rnf :: Tree a -> () #

NFData (Context a) 
Instance details

Defined in Crypto.Hash.Types

Methods

rnf :: Context a -> () #

NFData (Digest a) 
Instance details

Defined in Crypto.Hash.Types

Methods

rnf :: Digest a -> () #

NFData (Context a) 
Instance details

Defined in Crypto.Hash.Types

Methods

rnf :: Context a -> () #

NFData (Digest a) 
Instance details

Defined in Crypto.Hash.Types

Methods

rnf :: Digest a -> () #

NFData1 f => NFData (Fix f) 
Instance details

Defined in Data.Fix

Methods

rnf :: Fix f -> () #

NFData a => NFData (DNonEmpty a) 
Instance details

Defined in Data.DList.DNonEmpty.Internal

Methods

rnf :: DNonEmpty a -> () #

NFData a => NFData (DList a) 
Instance details

Defined in Data.DList.Internal

Methods

rnf :: DList a -> () #

NFData a => NFData (SizedSeq a) 
Instance details

Defined in GHC.Data.SizedSeq

Methods

rnf :: SizedSeq a -> () #

NFData (ForeignRef a) 
Instance details

Defined in GHCi.RemoteTypes

Methods

rnf :: ForeignRef a -> () #

NFData (RemotePtr a) 
Instance details

Defined in GHCi.RemoteTypes

Methods

rnf :: RemotePtr a -> () #

NFData a => NFData (Hashed a) 
Instance details

Defined in Data.Hashable.Class

Methods

rnf :: Hashed a -> () #

(KnownSymbol table, NFData (PrimaryKey table)) => NFData (Id' table) Source # 
Instance details

Defined in IHP.ModelSupport

Methods

rnf :: Id' table -> () #

NFData a => NFData (ErrorFancy a) 
Instance details

Defined in Text.Megaparsec.Error

Methods

rnf :: ErrorFancy a -> () #

NFData t => NFData (ErrorItem t) 
Instance details

Defined in Text.Megaparsec.Error

Methods

rnf :: ErrorItem t -> () #

NFData s => NFData (PosState s) 
Instance details

Defined in Text.Megaparsec.State

Methods

rnf :: PosState s -> () #

NFData a => NFData (AnnotDetails a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

rnf :: AnnotDetails a -> () #

NFData a => NFData (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

rnf :: Doc a -> () #

NFData a => NFData (Array a) 
Instance details

Defined in Data.Primitive.Array

Methods

rnf :: Array a -> () #

NFData (PrimArray a) 
Instance details

Defined in Data.Primitive.PrimArray

Methods

rnf :: PrimArray a -> () #

NFData a => NFData (SmallArray a) 
Instance details

Defined in Data.Primitive.SmallArray

Methods

rnf :: SmallArray a -> () #

NFData g => NFData (StateGen g) 
Instance details

Defined in System.Random.Internal

Methods

rnf :: StateGen g -> () #

NFData g => NFData (AtomicGen g) 
Instance details

Defined in System.Random.Stateful

Methods

rnf :: AtomicGen g -> () #

NFData g => NFData (IOGen g) 
Instance details

Defined in System.Random.Stateful

Methods

rnf :: IOGen g -> () #

NFData g => NFData (STGen g) 
Instance details

Defined in System.Random.Stateful

Methods

rnf :: STGen g -> () #

NFData g => NFData (TGen g) 
Instance details

Defined in System.Random.Stateful

Methods

rnf :: TGen g -> () #

NFData a => NFData (Maybe a) 
Instance details

Defined in Data.Strict.Maybe

Methods

rnf :: Maybe a -> () #

NFData a => NFData (Array a) 
Instance details

Defined in Data.HashMap.Internal.Array

Methods

rnf :: Array a -> () #

NFData a => NFData (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Methods

rnf :: HashSet a -> () #

NFData a => NFData (Vector a) 
Instance details

Defined in Data.Vector

Methods

rnf :: Vector a -> () #

NFData (Vector a) 
Instance details

Defined in Data.Vector.Primitive

Methods

rnf :: Vector a -> () #

NFData (Vector a) 
Instance details

Defined in Data.Vector.Storable

Methods

rnf :: Vector a -> () #

NFData (Vector a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

rnf :: Vector a -> () #

NFData a => NFData (NonEmpty a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: NonEmpty a -> () #

NFData a => NFData (Maybe a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Maybe a -> () #

NFData a => NFData (a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a) -> () #

NFData a => NFData [a] 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: [a] -> () #

(NFData i, NFData r) => NFData (IResult i r) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

rnf :: IResult i r -> () #

(NFData a, NFData b) => NFData (Either a b) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Either a b -> () #

NFData (Fixed a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Fixed a -> () #

NFData (Proxy a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Proxy a -> () #

(NFData a, NFData b) => NFData (Arg a b) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Arg a b -> () #

(NFData a, NFData b) => NFData (Array a b) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Array a b -> () #

NFData (STRef s a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: STRef s a -> () #

(NFData k, NFData a) => NFData (Map k a) 
Instance details

Defined in Data.Map.Internal

Methods

rnf :: Map k a -> () #

(NFData (Token s), NFData e) => NFData (ParseError s e) 
Instance details

Defined in Text.Megaparsec.Error

Methods

rnf :: ParseError s e -> () #

(NFData s, NFData (Token s), NFData e) => NFData (ParseErrorBundle s e) 
Instance details

Defined in Text.Megaparsec.Error

Methods

rnf :: ParseErrorBundle s e -> () #

(NFData s, NFData (ParseError s e)) => NFData (State s e) 
Instance details

Defined in Text.Megaparsec.State

Methods

rnf :: State s e -> () #

NFData (MutablePrimArray s a) 
Instance details

Defined in Data.Primitive.PrimArray

Methods

rnf :: MutablePrimArray s a -> () #

(NFData a, NFData b) => NFData (Either a b) 
Instance details

Defined in Data.Strict.Either

Methods

rnf :: Either a b -> () #

(NFData a, NFData b) => NFData (These a b) 
Instance details

Defined in Data.Strict.These

Methods

rnf :: These a b -> () #

(NFData a, NFData b) => NFData (Pair a b) 
Instance details

Defined in Data.Strict.Tuple

Methods

rnf :: Pair a b -> () #

(NFData a, NFData b) => NFData (These a b) 
Instance details

Defined in Data.These

Methods

rnf :: These a b -> () #

NFData (TypeRepMap f) 
Instance details

Defined in Data.TypeRepMap.Internal

Methods

rnf :: TypeRepMap f -> () #

(NFData k, NFData v) => NFData (HashMap k v) 
Instance details

Defined in Data.HashMap.Internal

Methods

rnf :: HashMap k v -> () #

(NFData k, NFData v) => NFData (Leaf k v) 
Instance details

Defined in Data.HashMap.Internal

Methods

rnf :: Leaf k v -> () #

NFData (MVector s a) 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

rnf :: MVector s a -> () #

NFData (a -> b) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a -> b) -> () #

(NFData a, NFData b) => NFData (a, b) 
Instance details

Defined in Control.DeepSeq

Methods

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

NFData a => NFData (Const a b) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Const a b -> () #

NFData (a :~: b) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a :~: b) -> () #

NFData b => NFData (Tagged s b) 
Instance details

Defined in Data.Tagged

Methods

rnf :: Tagged s b -> () #

(NFData (f a), NFData (g a), NFData a) => NFData (These1 f g a) 
Instance details

Defined in Data.Functor.These

Methods

rnf :: These1 f g a -> () #

(NFData a1, NFData a2, NFData a3) => NFData (a1, a2, a3) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a1, a2, a3) -> () #

(NFData1 f, NFData1 g, NFData a) => NFData (Product f g a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Product f g a -> () #

(NFData1 f, NFData1 g, NFData a) => NFData (Sum f g a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Sum f g a -> () #

NFData (a :~~: b) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a :~~: b) -> () #

(NFData a1, NFData a2, NFData a3, NFData a4) => NFData (a1, a2, a3, a4) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a1, a2, a3, a4) -> () #

(NFData1 f, NFData1 g, NFData a) => NFData (Compose f g a) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: Compose f g a -> () #

(NFData a1, NFData a2, NFData a3, NFData a4, NFData a5) => NFData (a1, a2, a3, a4, a5) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a1, a2, a3, a4, a5) -> () #

(NFData a1, NFData a2, NFData a3, NFData a4, NFData a5, NFData a6) => NFData (a1, a2, a3, a4, a5, a6) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a1, a2, a3, a4, a5, a6) -> () #

(NFData a1, NFData a2, NFData a3, NFData a4, NFData a5, NFData a6, NFData a7) => NFData (a1, a2, a3, a4, a5, a6, a7) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a1, a2, a3, a4, a5, a6, a7) -> () #

(NFData a1, NFData a2, NFData a3, NFData a4, NFData a5, NFData a6, NFData a7, NFData a8) => NFData (a1, a2, a3, a4, a5, a6, a7, a8) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a1, a2, a3, a4, a5, a6, a7, a8) -> () #

(NFData a1, NFData a2, NFData a3, NFData a4, NFData a5, NFData a6, NFData a7, NFData a8, NFData a9) => NFData (a1, a2, a3, a4, a5, a6, a7, a8, a9) 
Instance details

Defined in Control.DeepSeq

Methods

rnf :: (a1, a2, a3, a4, a5, a6, a7, a8, a9) -> () #

data DList a #

Instances

Instances details
FromJSON1 DList 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

liftParseJSON :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser (DList a) #

liftParseJSONList :: (Value -> Parser a) -> (Value -> Parser [a]) -> Value -> Parser [DList a] #

ToJSON1 DList 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Value) -> ([a] -> Value) -> DList a -> Value #

liftToJSONList :: (a -> Value) -> ([a] -> Value) -> [DList a] -> Value #

liftToEncoding :: (a -> Encoding) -> ([a] -> Encoding) -> DList a -> Encoding #

liftToEncodingList :: (a -> Encoding) -> ([a] -> Encoding) -> [DList a] -> Encoding #

MonadFail DList 
Instance details

Defined in Data.DList.Internal

Methods

fail :: String -> DList 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 #

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

Alternative DList 
Instance details

Defined in Data.DList.Internal

Methods

empty :: DList a #

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

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

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

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 #

Functor DList 
Instance details

Defined in Data.DList.Internal

Methods

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

(<$) :: a -> DList b -> DList 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 #

MonadPlus DList 
Instance details

Defined in Data.DList.Internal

Methods

mzero :: DList a #

mplus :: DList a -> DList a -> DList a #

FromPairs Value (DList Pair) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

fromPairs :: DList Pair -> Value

v ~ Value => KeyValuePair v (DList Pair) 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

pair :: Key -> v -> DList Pair

FromJSON a => FromJSON (DList a) 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser (DList a) #

parseJSONList :: Value -> Parser [DList a] #

ToJSON a => ToJSON (DList a) 
Instance details

Defined in Data.Aeson.Types.ToJSON

a ~ Char => IsString (DList a) 
Instance details

Defined in Data.DList.Internal

Methods

fromString :: String -> DList 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 #

Semigroup (DList a) 
Instance details

Defined in Data.DList.Internal

Methods

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

sconcat :: NonEmpty (DList a) -> DList a #

stimes :: Integral b => b -> DList a -> DList a #

IsList (DList a) 
Instance details

Defined in Data.DList.Internal

Associated Types

type Item (DList a)

Methods

fromList :: [Item (DList a)] -> DList a

fromListN :: Int -> [Item (DList a)] -> DList a

toList :: DList a -> [Item (DList 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]

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 #

NFData a => NFData (DList a) 
Instance details

Defined in Data.DList.Internal

Methods

rnf :: DList a -> () #

Eq a => Eq (DList a) 
Instance details

Defined in Data.DList.Internal

Methods

(==) :: DList a -> DList a -> Bool #

(/=) :: DList a -> DList a -> Bool #

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 #

type Item (DList a) 
Instance details

Defined in Data.DList.Internal

type Item (DList a) = a
type Element (DList a) 
Instance details

Defined in Data.MonoTraversable.Instances

type Element (DList a) = a
type Index (DList a) 
Instance details

Defined in Data.MonoTraversable.Instances

type Index (DList a) = Int

data Handler (m :: Type -> Type) a #

Constructors

Exception e => Handler (e -> m a) 

Instances

Instances details
Monad m => Functor (Handler m) 
Instance details

Defined in Control.Monad.Catch

Methods

fmap :: (a -> b) -> Handler m a -> Handler m b #

(<$) :: a -> Handler m b -> Handler m a #

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

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Void -> Int #

hash :: Void -> 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 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 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 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

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 (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 a => Hashable (NonEmpty a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> NonEmpty a -> Int #

hash :: NonEmpty a -> Int #

Hashable a => Hashable (Maybe a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Maybe a -> Int #

hash :: Maybe a -> Int #

Hashable a => Hashable (a) 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> (a) -> Int #

hash :: (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 #

class BiPolyMap (map :: Type -> Type -> Type) where #

Associated Types

type BPMKeyConstraint (map :: Type -> Type -> Type) key #

Methods

mapKeysWith :: (BPMKeyConstraint map k1, BPMKeyConstraint map k2) => (v -> v -> v) -> (k1 -> k2) -> map k1 v -> map k2 v #

Instances

Instances details
BiPolyMap Map 
Instance details

Defined in Data.Containers

Associated Types

type BPMKeyConstraint Map key #

Methods

mapKeysWith :: (BPMKeyConstraint Map k1, BPMKeyConstraint Map k2) => (v -> v -> v) -> (k1 -> k2) -> Map k1 v -> Map k2 v #

BiPolyMap HashMap 
Instance details

Defined in Data.Containers

Associated Types

type BPMKeyConstraint HashMap key #

Methods

mapKeysWith :: (BPMKeyConstraint HashMap k1, BPMKeyConstraint HashMap k2) => (v -> v -> v) -> (k1 -> k2) -> HashMap k1 v -> HashMap k2 v #

type family BPMKeyConstraint (map :: Type -> Type -> Type) key #

Instances

Instances details
type BPMKeyConstraint Map key 
Instance details

Defined in Data.Containers

type BPMKeyConstraint Map key = Ord key
type BPMKeyConstraint HashMap key 
Instance details

Defined in Data.Containers

type BPMKeyConstraint HashMap key = (Hashable key, Eq key)

class (Monoid set, Semigroup set, MonoFoldable set, Eq (ContainerKey set), GrowingAppend set) => SetContainer set where #

Minimal complete definition

member, notMember, union, difference, intersection, keys

Associated Types

type ContainerKey set #

Methods

member :: ContainerKey set -> set -> Bool #

notMember :: ContainerKey set -> set -> Bool #

union :: set -> set -> set #

unions :: (MonoFoldable mono, Element mono ~ set) => mono -> set #

difference :: set -> set -> set #

intersection :: set -> set -> set #

keys :: set -> [ContainerKey set] #

Instances

Instances details
SetContainer IntSet 
Instance details

Defined in Data.Containers

Associated Types

type ContainerKey IntSet #

SetContainer (IntMap value) 
Instance details

Defined in Data.Containers

Associated Types

type ContainerKey (IntMap value) #

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)] #

Ord element => SetContainer (Set element) 
Instance details

Defined in Data.Containers

Associated Types

type ContainerKey (Set 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)] #

(Eq element, Hashable element) => SetContainer (HashSet element) 
Instance details

Defined in Data.Containers

Associated Types

type ContainerKey (HashSet 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 key => SetContainer [(key, value)] 
Instance details

Defined in Data.Containers

Associated Types

type ContainerKey [(key, value)] #

Methods

member :: ContainerKey [(key, value)] -> [(key, value)] -> Bool #

notMember :: ContainerKey [(key, value)] -> [(key, value)] -> Bool #

union :: [(key, value)] -> [(key, value)] -> [(key, value)] #

unions :: (MonoFoldable mono, Element mono ~ [(key, value)]) => mono -> [(key, value)] #

difference :: [(key, value)] -> [(key, value)] -> [(key, value)] #

intersection :: [(key, value)] -> [(key, value)] -> [(key, value)] #

keys :: [(key, value)] -> [ContainerKey [(key, value)]] #

Ord k => SetContainer (Map k v) 
Instance details

Defined in Data.Containers

Associated Types

type ContainerKey (Map k v) #

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)] #

(Eq key, Hashable key) => SetContainer (HashMap key value) 
Instance details

Defined in Data.Containers

Associated Types

type ContainerKey (HashMap key value) #

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)] #

type family ContainerKey set #

Instances

Instances details
type ContainerKey IntSet 
Instance details

Defined in Data.Containers

type ContainerKey (IntMap value) 
Instance details

Defined in Data.Containers

type ContainerKey (IntMap value) = Int
type ContainerKey (Set element) 
Instance details

Defined in Data.Containers

type ContainerKey (Set element) = element
type ContainerKey (HashSet element) 
Instance details

Defined in Data.Containers

type ContainerKey (HashSet element) = element
type ContainerKey [(key, value)] 
Instance details

Defined in Data.Containers

type ContainerKey [(key, value)] = key
type ContainerKey (Map k v) 
Instance details

Defined in Data.Containers

type ContainerKey (Map k v) = k
type ContainerKey (HashMap key value) 
Instance details

Defined in Data.Containers

type ContainerKey (HashMap key value) = key

class SetContainer set => HasKeysSet set where #

Associated Types

type KeySet set #

Methods

keysSet :: set -> KeySet set #

Instances

Instances details
HasKeysSet (IntMap v) 
Instance details

Defined in Data.Containers

Associated Types

type KeySet (IntMap v) #

Methods

keysSet :: IntMap v -> KeySet (IntMap v) #

Ord k => HasKeysSet (Map k v) 
Instance details

Defined in Data.Containers

Associated Types

type KeySet (Map k v) #

Methods

keysSet :: Map k v -> KeySet (Map k v) #

(Hashable k, Eq k) => HasKeysSet (HashMap k v) 
Instance details

Defined in Data.Containers

Associated Types

type KeySet (HashMap k v) #

Methods

keysSet :: HashMap k v -> KeySet (HashMap k v) #

type family KeySet set #

Instances

Instances details
type KeySet (IntMap v) 
Instance details

Defined in Data.Containers

type KeySet (IntMap v) = IntSet
type KeySet (Map k v) 
Instance details

Defined in Data.Containers

type KeySet (Map k v) = Set k
type KeySet (HashMap k v) 
Instance details

Defined in Data.Containers

type KeySet (HashMap k v) = HashSet k

class (MonoTraversable map, SetContainer map) => IsMap map where #

Associated Types

type MapValue map #

Methods

lookup :: ContainerKey map -> map -> Maybe (MapValue map) #

insertMap :: ContainerKey map -> MapValue map -> map -> map #

deleteMap :: ContainerKey map -> map -> map #

singletonMap :: ContainerKey map -> MapValue map -> map #

mapFromList :: [(ContainerKey map, MapValue map)] -> map #

mapToList :: map -> [(ContainerKey map, MapValue map)] #

findWithDefault :: MapValue map -> ContainerKey map -> map -> MapValue map #

insertWith :: (MapValue map -> MapValue map -> MapValue map) -> ContainerKey map -> MapValue map -> map -> map #

insertWithKey :: (ContainerKey map -> MapValue map -> MapValue map -> MapValue map) -> ContainerKey map -> MapValue map -> map -> map #

insertLookupWithKey :: (ContainerKey map -> MapValue map -> MapValue map -> MapValue map) -> ContainerKey map -> MapValue map -> map -> (Maybe (MapValue map), map) #

adjustMap :: (MapValue map -> MapValue map) -> ContainerKey map -> map -> map #

adjustWithKey :: (ContainerKey map -> MapValue map -> MapValue map) -> ContainerKey map -> map -> map #

updateMap :: (MapValue map -> Maybe (MapValue map)) -> ContainerKey map -> map -> map #

updateWithKey :: (ContainerKey map -> MapValue map -> Maybe (MapValue map)) -> ContainerKey map -> map -> map #

updateLookupWithKey :: (ContainerKey map -> MapValue map -> Maybe (MapValue map)) -> ContainerKey map -> map -> (Maybe (MapValue map), map) #

alterMap :: (Maybe (MapValue map) -> Maybe (MapValue map)) -> ContainerKey map -> map -> map #

unionWith :: (MapValue map -> MapValue map -> MapValue map) -> map -> map -> map #

unionWithKey :: (ContainerKey map -> MapValue map -> MapValue map -> MapValue map) -> map -> map -> map #

unionsWith :: (MapValue map -> MapValue map -> MapValue map) -> [map] -> map #

mapWithKey :: (ContainerKey map -> MapValue map -> MapValue map) -> map -> map #

omapKeysWith :: (MapValue map -> MapValue map -> MapValue map) -> (ContainerKey map -> ContainerKey map) -> map -> map #

filterMap :: (MapValue map -> Bool) -> map -> map #

Instances

Instances details
IsMap (IntMap value) 
Instance details

Defined in Data.Containers

Associated Types

type MapValue (IntMap 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 #

Eq key => IsMap [(key, value)] 
Instance details

Defined in Data.Containers

Associated Types

type MapValue [(key, value)] #

Methods

lookup :: ContainerKey [(key, value)] -> [(key, value)] -> Maybe (MapValue [(key, value)]) #

insertMap :: ContainerKey [(key, value)] -> MapValue [(key, value)] -> [(key, value)] -> [(key, value)] #

deleteMap :: ContainerKey [(key, value)] -> [(key, value)] -> [(key, value)] #

singletonMap :: ContainerKey [(key, value)] -> MapValue [(key, value)] -> [(key, value)] #

mapFromList :: [(ContainerKey [(key, value)], MapValue [(key, value)])] -> [(key, value)] #

mapToList :: [(key, value)] -> [(ContainerKey [(key, value)], MapValue [(key, value)])] #

findWithDefault :: MapValue [(key, value)] -> ContainerKey [(key, value)] -> [(key, value)] -> MapValue [(key, value)] #

insertWith :: (MapValue [(key, value)] -> MapValue [(key, value)] -> MapValue [(key, value)]) -> ContainerKey [(key, value)] -> MapValue [(key, value)] -> [(key, value)] -> [(key, value)] #

insertWithKey :: (ContainerKey [(key, value)] -> MapValue [(key, value)] -> MapValue [(key, value)] -> MapValue [(key, value)]) -> ContainerKey [(key, value)] -> MapValue [(key, value)] -> [(key, value)] -> [(key, value)] #

insertLookupWithKey :: (ContainerKey [(key, value)] -> MapValue [(key, value)] -> MapValue [(key, value)] -> MapValue [(key, value)]) -> ContainerKey [(key, value)] -> MapValue [(key, value)] -> [(key, value)] -> (Maybe (MapValue [(key, value)]), [(key, value)]) #

adjustMap :: (MapValue [(key, value)] -> MapValue [(key, value)]) -> ContainerKey [(key, value)] -> [(key, value)] -> [(key, value)] #

adjustWithKey :: (ContainerKey [(key, value)] -> MapValue [(key, value)] -> MapValue [(key, value)]) -> ContainerKey [(key, value)] -> [(key, value)] -> [(key, value)] #

updateMap :: (MapValue [(key, value)] -> Maybe (MapValue [(key, value)])) -> ContainerKey [(key, value)] -> [(key, value)] -> [(key, value)] #

updateWithKey :: (ContainerKey [(key, value)] -> MapValue [(key, value)] -> Maybe (MapValue [(key, value)])) -> ContainerKey [(key, value)] -> [(key, value)] -> [(key, value)] #

updateLookupWithKey :: (ContainerKey [(key, value)] -> MapValue [(key, value)] -> Maybe (MapValue [(key, value)])) -> ContainerKey [(key, value)] -> [(key, value)] -> (Maybe (MapValue [(key, value)]), [(key, value)]) #

alterMap :: (Maybe (MapValue [(key, value)]) -> Maybe (MapValue [(key, value)])) -> ContainerKey [(key, value)] -> [(key, value)] -> [(key, value)] #

unionWith :: (MapValue [(key, value)] -> MapValue [(key, value)] -> MapValue [(key, value)]) -> [(key, value)] -> [(key, value)] -> [(key, value)] #

unionWithKey :: (ContainerKey [(key, value)] -> MapValue [(key, value)] -> MapValue [(key, value)] -> MapValue [(key, value)]) -> [(key, value)] -> [(key, value)] -> [(key, value)] #

unionsWith :: (MapValue [(key, value)] -> MapValue [(key, value)] -> MapValue [(key, value)]) -> [[(key, value)]] -> [(key, value)] #

mapWithKey :: (ContainerKey [(key, value)] -> MapValue [(key, value)] -> MapValue [(key, value)]) -> [(key, value)] -> [(key, value)] #

omapKeysWith :: (MapValue [(key, value)] -> MapValue [(key, value)] -> MapValue [(key, value)]) -> (ContainerKey [(key, value)] -> ContainerKey [(key, value)]) -> [(key, value)] -> [(key, value)] #

filterMap :: (MapValue [(key, value)] -> Bool) -> [(key, value)] -> [(key, value)] #

Ord key => IsMap (Map key value) 
Instance details

Defined in Data.Containers

Associated Types

type MapValue (Map key 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 #

(Eq key, Hashable key) => IsMap (HashMap key value) 
Instance details

Defined in Data.Containers

Associated Types

type MapValue (HashMap key 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 #

type family MapValue map #

Instances

Instances details
type MapValue (IntMap value) 
Instance details

Defined in Data.Containers

type MapValue (IntMap value) = value
type MapValue [(key, value)] 
Instance details

Defined in Data.Containers

type MapValue [(key, value)] = value
type MapValue (Map key value) 
Instance details

Defined in Data.Containers

type MapValue (Map key value) = value
type MapValue (HashMap key value) 
Instance details

Defined in Data.Containers

type MapValue (HashMap key value) = value

class (SetContainer set, Element set ~ ContainerKey set) => IsSet set where #

Minimal complete definition

insertSet, deleteSet, singletonSet, setFromList, setToList

Methods

insertSet :: Element set -> set -> set #

deleteSet :: Element set -> set -> set #

singletonSet :: Element set -> set #

setFromList :: [Element set] -> set #

setToList :: set -> [Element set] #

filterSet :: (Element set -> Bool) -> set -> set #

Instances

Instances details
IsSet IntSet 
Instance details

Defined in Data.Containers

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 #

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

class MonoFunctor mono => MonoZip mono where #

Methods

ozipWith :: (Element mono -> Element mono -> Element mono) -> mono -> mono -> mono #

ozip :: mono -> mono -> [(Element mono, Element mono)] #

ounzip :: [(Element mono, Element mono)] -> (mono, mono) #

Instances

Instances details
MonoZip ByteString 
Instance details

Defined in Data.Containers

MonoZip ByteString 
Instance details

Defined in Data.Containers

Methods

ozipWith :: (Element ByteString -> Element ByteString -> Element ByteString) -> ByteString -> ByteString -> ByteString #

ozip :: ByteString -> ByteString -> [(Element ByteString, Element ByteString)] #

ounzip :: [(Element ByteString, Element ByteString)] -> (ByteString, ByteString) #

MonoZip Text 
Instance details

Defined in Data.Containers

MonoZip Text 
Instance details

Defined in Data.Containers

Methods

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

ozip :: Text -> Text -> [(Element Text, Element Text)] #

ounzip :: [(Element Text, Element Text)] -> (Text, Text) #

class PolyMap (map :: Type -> Type) where #

Methods

differenceMap :: map value1 -> map value2 -> map value1 #

intersectionMap :: map value1 -> map value2 -> map value1 #

intersectionWithMap :: (value1 -> value2 -> value3) -> map value1 -> map value2 -> map value3 #

Instances

Instances details
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 #

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 #

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

class MonoFoldable mono => GrowingAppend mono #

Instances

Instances details
GrowingAppend ByteString 
Instance details

Defined in Data.MonoTraversable

GrowingAppend ByteString 
Instance details

Defined in Data.MonoTraversable

GrowingAppend IntSet 
Instance details

Defined in Data.MonoTraversable

GrowingAppend Text 
Instance details

Defined in Data.MonoTraversable

GrowingAppend Text 
Instance details

Defined in Data.MonoTraversable

GrowingAppend (IntMap v) 
Instance details

Defined in Data.MonoTraversable

GrowingAppend (Seq a) 
Instance details

Defined in Data.MonoTraversable

Ord v => GrowingAppend (Set v) 
Instance details

Defined in Data.MonoTraversable

GrowingAppend mono => GrowingAppend (NonNull mono) 
Instance details

Defined in Data.NonNull

(Eq v, Hashable v) => GrowingAppend (HashSet v) 
Instance details

Defined in Data.MonoTraversable

GrowingAppend (Vector a) 
Instance details

Defined in Data.MonoTraversable

Storable a => GrowingAppend (Vector a) 
Instance details

Defined in Data.MonoTraversable

Unbox a => GrowingAppend (Vector a) 
Instance details

Defined in Data.MonoTraversable

GrowingAppend (NonEmpty a) 
Instance details

Defined in Data.MonoTraversable

GrowingAppend [a] 
Instance details

Defined in Data.MonoTraversable

Ord k => GrowingAppend (Map k v) 
Instance details

Defined in Data.MonoTraversable

(Eq k, Hashable k) => GrowingAppend (HashMap k v) 
Instance details

Defined in Data.MonoTraversable

class MonoFunctor mono => MonoComonad mono where #

Methods

oextract :: mono -> Element mono #

oextend :: (mono -> Element mono) -> mono -> mono #

Instances

Instances details
MonoComonad (ViewL a) 
Instance details

Defined in Data.MonoTraversable

Methods

oextract :: ViewL a -> Element (ViewL a) #

oextend :: (ViewL a -> Element (ViewL a)) -> ViewL a -> ViewL a #

MonoComonad (ViewR a) 
Instance details

Defined in Data.MonoTraversable

Methods

oextract :: ViewR a -> Element (ViewR a) #

oextend :: (ViewR a -> Element (ViewR a)) -> ViewR a -> ViewR a #

IsSequence mono => MonoComonad (NonNull mono) 
Instance details

Defined in Data.NonNull

Methods

oextract :: NonNull mono -> Element (NonNull mono) #

oextend :: (NonNull mono -> Element (NonNull mono)) -> NonNull mono -> NonNull mono #

class MonoFunctor mono where #

Minimal complete definition

Nothing

Methods

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

Instances

Instances details
MonoFunctor ByteString 
Instance details

Defined in Data.MonoTraversable

MonoFunctor ByteString 
Instance details

Defined in Data.MonoTraversable

Methods

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

MonoFunctor Text 
Instance details

Defined in Data.MonoTraversable

Methods

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

MonoFunctor Text 
Instance details

Defined in Data.MonoTraversable

Methods

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

MonoFunctor (ZipList a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (ZipList a) -> Element (ZipList a)) -> ZipList a -> ZipList a #

MonoFunctor (Identity a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Identity a) -> Element (Identity a)) -> Identity a -> Identity a #

MonoFunctor (Par1 a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Par1 a) -> Element (Par1 a)) -> Par1 a -> Par1 a #

MonoFunctor (IntMap a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (IntMap a) -> Element (IntMap a)) -> IntMap a -> IntMap a #

MonoFunctor (Seq a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Seq a) -> Element (Seq a)) -> Seq a -> Seq a #

MonoFunctor (ViewL a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (ViewL a) -> Element (ViewL a)) -> ViewL a -> ViewL a #

MonoFunctor (ViewR a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (ViewR a) -> Element (ViewR a)) -> ViewR a -> ViewR a #

MonoFunctor (Tree a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Tree a) -> Element (Tree a)) -> Tree a -> Tree a #

MonoFunctor (IO a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (IO a) -> Element (IO a)) -> IO a -> IO a #

MonoFunctor mono => MonoFunctor (NonNull mono) 
Instance details

Defined in Data.NonNull

Methods

omap :: (Element (NonNull mono) -> Element (NonNull mono)) -> NonNull mono -> NonNull mono #

MonoFunctor (Vector a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Vector a) -> Element (Vector a)) -> Vector a -> Vector a #

Storable a => MonoFunctor (Vector a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Vector a) -> Element (Vector a)) -> Vector a -> Vector a #

Unbox a => MonoFunctor (Vector a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Vector a) -> Element (Vector a)) -> Vector a -> Vector a #

MonoFunctor (NonEmpty a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (NonEmpty a) -> Element (NonEmpty a)) -> NonEmpty a -> NonEmpty a #

MonoFunctor (Maybe a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Maybe a) -> Element (Maybe a)) -> Maybe a -> Maybe a #

MonoFunctor [a] 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element [a] -> Element [a]) -> [a] -> [a] #

Monad m => MonoFunctor (WrappedMonad m a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (WrappedMonad m a) -> Element (WrappedMonad m a)) -> WrappedMonad m a -> WrappedMonad m a #

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 #

MonoFunctor (Proxy a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Proxy a) -> Element (Proxy a)) -> Proxy a -> Proxy a #

MonoFunctor (Arg a b) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Arg a b) -> Element (Arg a b)) -> Arg a b -> Arg a b #

MonoFunctor (U1 a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (U1 a) -> Element (U1 a)) -> U1 a -> U1 a #

MonoFunctor (V1 a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (V1 a) -> Element (V1 a)) -> V1 a -> V1 a #

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 #

MonoFunctor mono => MonoFunctor (WrappedMono mono a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (WrappedMono mono a) -> Element (WrappedMono mono a)) -> WrappedMono mono a -> WrappedMono mono a #

Functor f => MonoFunctor (WrappedPoly f a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (WrappedPoly f a) -> Element (WrappedPoly f a)) -> WrappedPoly f a -> WrappedPoly f a #

Functor m => MonoFunctor (ListT m a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (ListT m a) -> Element (ListT m a)) -> ListT m a -> ListT m a #

Functor m => MonoFunctor (MaybeT m a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (MaybeT m a) -> Element (MaybeT m a)) -> MaybeT m a -> MaybeT m a #

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 #

MonoFunctor (r -> a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (r -> a) -> Element (r -> a)) -> (r -> a) -> r -> a #

MonoFunctor (a, b) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (a, b) -> Element (a, b)) -> (a, b) -> (a, b) #

Arrow a => MonoFunctor (WrappedArrow a b c) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (WrappedArrow a b c) -> Element (WrappedArrow a b c)) -> WrappedArrow a b c -> WrappedArrow a b c #

MonoFunctor (Const m a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Const m a) -> Element (Const m a)) -> Const m a -> Const m a #

Functor f => MonoFunctor (Rec1 f a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Rec1 f a) -> Element (Rec1 f a)) -> Rec1 f a -> Rec1 f a #

Functor m => MonoFunctor (IdentityT m a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (IdentityT m a) -> Element (IdentityT m a)) -> IdentityT m a -> IdentityT m a #

Functor m => MonoFunctor (ReaderT r m a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (ReaderT r m a) -> Element (ReaderT r m a)) -> ReaderT r m a -> ReaderT r m a #

Functor m => MonoFunctor (StateT s m a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (StateT s m a) -> Element (StateT s m a)) -> StateT s m a -> StateT s m a #

Functor m => MonoFunctor (StateT s m a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (StateT s m a) -> Element (StateT s m a)) -> StateT s m a -> StateT s m a #

Functor m => MonoFunctor (WriterT w m a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (WriterT w m a) -> Element (WriterT w m a)) -> WriterT w m a -> WriterT w m a #

Functor m => MonoFunctor (WriterT w m a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (WriterT w m a) -> Element (WriterT w m a)) -> WriterT w m a -> WriterT w m a #

(Functor f, Functor g) => MonoFunctor (Product f g a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Product f g a) -> Element (Product f g a)) -> Product f g a -> Product f g a #

(Functor f, Functor g) => MonoFunctor ((f :*: g) a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element ((f :*: g) a) -> Element ((f :*: g) a)) -> (f :*: g) a -> (f :*: g) a #

(Functor f, Functor g) => MonoFunctor ((f :+: g) a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element ((f :+: g) a) -> Element ((f :+: g) a)) -> (f :+: g) a -> (f :+: g) a #

MonoFunctor (K1 i c a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (K1 i c a) -> Element (K1 i c a)) -> K1 i c a -> K1 i c a #

Functor m => MonoFunctor (ContT r m a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (ContT r m a) -> Element (ContT r m a)) -> ContT r m a -> ContT r m a #

(Functor f, Functor g) => MonoFunctor (Compose f g a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (Compose f g a) -> Element (Compose f g a)) -> Compose f g a -> Compose f g a #

(Functor f, Functor g) => MonoFunctor ((f :.: g) a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element ((f :.: g) a) -> Element ((f :.: g) a)) -> (f :.: g) a -> (f :.: g) a #

Functor f => MonoFunctor (M1 i c f a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (M1 i c f a) -> Element (M1 i c f a)) -> M1 i c f a -> M1 i c f a #

Functor m => MonoFunctor (RWST r w s m a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (RWST r w s m a) -> Element (RWST r w s m a)) -> RWST r w s m a -> RWST r w s m a #

Functor m => MonoFunctor (RWST r w s m a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (RWST r w s m a) -> Element (RWST r w s m a)) -> RWST r w s m a -> RWST r w s m a #

class MonoPointed mono where #

Minimal complete definition

Nothing

Methods

opoint :: Element mono -> mono #

Instances

Instances details
MonoPointed ByteString 
Instance details

Defined in Data.MonoTraversable

MonoPointed ByteString 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element ByteString -> ByteString #

MonoPointed IntSet 
Instance details

Defined in Data.MonoTraversable

MonoPointed Text 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element Text -> Text #

MonoPointed Text 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element Text -> Text #

MonoPointed (ZipList a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (ZipList a) -> ZipList a #

MonoPointed (Identity a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Identity a) -> Identity a #

MonoPointed (Par1 a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Par1 a) -> Par1 a #

MonoPointed (Seq a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Seq a) -> Seq a #

MonoPointed (ViewL a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (ViewL a) -> ViewL a #

MonoPointed (ViewR a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (ViewR a) -> ViewR a #

MonoPointed (Set a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Set a) -> Set a #

MonoPointed (Tree a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Tree a) -> Tree a #

MonoPointed (IO a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (IO a) -> IO a #

MonoPointed mono => MonoPointed (NonNull mono) 
Instance details

Defined in Data.NonNull

Methods

opoint :: Element (NonNull mono) -> NonNull mono #

Hashable a => MonoPointed (HashSet a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (HashSet a) -> HashSet a #

MonoPointed (Vector a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Vector a) -> Vector a #

Storable a => MonoPointed (Vector a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Vector a) -> Vector a #

Unbox a => MonoPointed (Vector a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Vector a) -> Vector a #

MonoPointed (NonEmpty a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (NonEmpty a) -> NonEmpty a #

MonoPointed (Maybe a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Maybe a) -> Maybe a #

MonoPointed [a] 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element [a] -> [a] #

Monad m => MonoPointed (WrappedMonad m a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (WrappedMonad m a) -> WrappedMonad m a #

MonoPointed (Either a b) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Either a b) -> Either a b #

MonoPointed (Proxy a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Proxy a) -> Proxy a #

MonoPointed (U1 a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (U1 a) -> U1 a #

(MonoPointed mono, Element mono ~ a) => MonoPointed (WrappedMono mono a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (WrappedMono mono a) -> WrappedMono mono a #

Applicative f => MonoPointed (WrappedPoly f a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (WrappedPoly f a) -> WrappedPoly f a #

Applicative m => MonoPointed (ListT m a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (ListT m a) -> ListT m a #

Applicative f => MonoPointed (MaybeT f a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (MaybeT f a) -> MaybeT f a #

MonoPointed (r -> a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (r -> a) -> r -> a #

Monoid a => MonoPointed (a, b) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (a, b) -> (a, b) #

Arrow a => MonoPointed (WrappedArrow a b c) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (WrappedArrow a b c) -> WrappedArrow a b c #

Monoid m => MonoPointed (Const m a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Const m a) -> Const m a #

Applicative f => MonoPointed (Rec1 f a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Rec1 f a) -> Rec1 f a #

Applicative m => MonoPointed (IdentityT m a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (IdentityT m a) -> IdentityT m a #

Applicative m => MonoPointed (ReaderT r m a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (ReaderT r m a) -> ReaderT r m a #

Applicative m => MonoPointed (StateT s m a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (StateT s m a) -> StateT s m a #

Applicative m => MonoPointed (StateT s m a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (StateT s m a) -> StateT s m a #

(Monoid w, Applicative m) => MonoPointed (WriterT w m a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (WriterT w m a) -> WriterT w m a #

(Monoid w, Applicative m) => MonoPointed (WriterT w m a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (WriterT w m a) -> WriterT w m a #

(Applicative f, Applicative g) => MonoPointed (Product f g a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Product f g a) -> Product f g a #

(Applicative f, Applicative g) => MonoPointed ((f :*: g) a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element ((f :*: g) a) -> (f :*: g) a #

(Applicative f, Applicative g) => MonoPointed ((f :+: g) a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element ((f :+: g) a) -> (f :+: g) a #

MonoPointed (ContT r m a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (ContT r m a) -> ContT r m a #

(Applicative f, Applicative g) => MonoPointed (Compose f g a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (Compose f g a) -> Compose f g a #

(Applicative f, Applicative g) => MonoPointed ((f :.: g) a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element ((f :.: g) a) -> (f :.: g) a #

Applicative f => MonoPointed (M1 i c f a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (M1 i c f a) -> M1 i c f a #

(Monoid w, Applicative m) => MonoPointed (RWST r w s m a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (RWST r w s m a) -> RWST r w s m a #

(Monoid w, Applicative m) => MonoPointed (RWST r w s m a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (RWST r w s m a) -> RWST r w s m a #

class (MonoFunctor mono, MonoFoldable mono) => MonoTraversable mono where #

Minimal complete definition

Nothing

Methods

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

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

Instances

Instances details
MonoTraversable ByteString 
Instance details

Defined in Data.MonoTraversable

MonoTraversable ByteString 
Instance details

Defined in Data.MonoTraversable

Methods

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

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

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 #

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 #

MonoTraversable (Identity a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (Identity a) -> f (Element (Identity a))) -> Identity a -> f (Identity a) #

omapM :: Applicative m => (Element (Identity a) -> m (Element (Identity a))) -> Identity a -> m (Identity a) #

MonoTraversable (Par1 a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (Par1 a) -> f (Element (Par1 a))) -> Par1 a -> f (Par1 a) #

omapM :: Applicative m => (Element (Par1 a) -> m (Element (Par1 a))) -> Par1 a -> m (Par1 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) #

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

MonoTraversable (ViewL a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (ViewL a) -> f (Element (ViewL a))) -> ViewL a -> f (ViewL a) #

omapM :: Applicative m => (Element (ViewL a) -> m (Element (ViewL a))) -> ViewL a -> m (ViewL a) #

MonoTraversable (ViewR a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (ViewR a) -> f (Element (ViewR a))) -> ViewR a -> f (ViewR a) #

omapM :: Applicative m => (Element (ViewR a) -> m (Element (ViewR a))) -> ViewR a -> m (ViewR a) #

MonoTraversable (Tree a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (Tree a) -> f (Element (Tree a))) -> Tree a -> f (Tree a) #

omapM :: Applicative m => (Element (Tree a) -> m (Element (Tree a))) -> Tree a -> m (Tree a) #

MonoTraversable mono => MonoTraversable (NonNull mono) 
Instance details

Defined in Data.NonNull

Methods

otraverse :: Applicative f => (Element (NonNull mono) -> f (Element (NonNull mono))) -> NonNull mono -> f (NonNull mono) #

omapM :: Applicative m => (Element (NonNull mono) -> m (Element (NonNull mono))) -> NonNull mono -> m (NonNull mono) #

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

Storable 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) #

Unbox 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) #

MonoTraversable (NonEmpty a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (NonEmpty a) -> f (Element (NonEmpty a))) -> NonEmpty a -> f (NonEmpty a) #

omapM :: Applicative m => (Element (NonEmpty a) -> m (Element (NonEmpty a))) -> NonEmpty a -> m (NonEmpty a) #

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

MonoTraversable [a] 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element [a] -> f (Element [a])) -> [a] -> f [a] #

omapM :: Applicative m => (Element [a] -> m (Element [a])) -> [a] -> m [a] #

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

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

MonoTraversable (U1 a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (U1 a) -> f (Element (U1 a))) -> U1 a -> f (U1 a) #

omapM :: Applicative m => (Element (U1 a) -> m (Element (U1 a))) -> U1 a -> m (U1 a) #

MonoTraversable (V1 a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (V1 a) -> f (Element (V1 a))) -> V1 a -> f (V1 a) #

omapM :: Applicative m => (Element (V1 a) -> m (Element (V1 a))) -> V1 a -> m (V1 a) #

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) #

Traversable f => MonoTraversable (ListT f a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f0 => (Element (ListT f a) -> f0 (Element (ListT f a))) -> ListT f a -> f0 (ListT f a) #

omapM :: Applicative m => (Element (ListT f a) -> m (Element (ListT f a))) -> ListT f a -> m (ListT f a) #

Traversable f => MonoTraversable (MaybeT f a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f0 => (Element (MaybeT f a) -> f0 (Element (MaybeT f a))) -> MaybeT f a -> f0 (MaybeT f a) #

omapM :: Applicative m => (Element (MaybeT f a) -> m (Element (MaybeT f a))) -> MaybeT f a -> m (MaybeT f a) #

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) #

MonoTraversable (a, b) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (a, b) -> f (Element (a, b))) -> (a, b) -> f (a, b) #

omapM :: Applicative m => (Element (a, b) -> m (Element (a, b))) -> (a, b) -> m (a, b) #

MonoTraversable (Const m a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (Const m a) -> f (Element (Const m a))) -> Const m a -> f (Const m a) #

omapM :: Applicative m0 => (Element (Const m a) -> m0 (Element (Const m a))) -> Const m a -> m0 (Const m a) #

Traversable f => MonoTraversable (Rec1 f a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f0 => (Element (Rec1 f a) -> f0 (Element (Rec1 f a))) -> Rec1 f a -> f0 (Rec1 f a) #

omapM :: Applicative m => (Element (Rec1 f a) -> m (Element (Rec1 f a))) -> Rec1 f a -> m (Rec1 f a) #

Traversable f => MonoTraversable (IdentityT f a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f0 => (Element (IdentityT f a) -> f0 (Element (IdentityT f a))) -> IdentityT f a -> f0 (IdentityT f a) #

omapM :: Applicative m => (Element (IdentityT f a) -> m (Element (IdentityT f a))) -> IdentityT f a -> m (IdentityT f a) #

Traversable f => MonoTraversable (WriterT w f a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f0 => (Element (WriterT w f a) -> f0 (Element (WriterT w f a))) -> WriterT w f a -> f0 (WriterT w f a) #

omapM :: Applicative m => (Element (WriterT w f a) -> m (Element (WriterT w f a))) -> WriterT w f a -> m (WriterT w f a) #

Traversable f => MonoTraversable (WriterT w f a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f0 => (Element (WriterT w f a) -> f0 (Element (WriterT w f a))) -> WriterT w f a -> f0 (WriterT w f a) #

omapM :: Applicative m => (Element (WriterT w f a) -> m (Element (WriterT w f a))) -> WriterT w f a -> m (WriterT w f a) #

(Traversable f, Traversable g) => MonoTraversable (Product f g a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f0 => (Element (Product f g a) -> f0 (Element (Product f g a))) -> Product f g a -> f0 (Product f g a) #

omapM :: Applicative m => (Element (Product f g a) -> m (Element (Product f g a))) -> Product f g a -> m (Product f g a) #

(Traversable f, Traversable g) => MonoTraversable ((f :*: g) a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f0 => (Element ((f :*: g) a) -> f0 (Element ((f :*: g) a))) -> (f :*: g) a -> f0 ((f :*: g) a) #

omapM :: Applicative m => (Element ((f :*: g) a) -> m (Element ((f :*: g) a))) -> (f :*: g) a -> m ((f :*: g) a) #

(Traversable f, Traversable g) => MonoTraversable ((f :+: g) a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f0 => (Element ((f :+: g) a) -> f0 (Element ((f :+: g) a))) -> (f :+: g) a -> f0 ((f :+: g) a) #

omapM :: Applicative m => (Element ((f :+: g) a) -> m (Element ((f :+: g) a))) -> (f :+: g) a -> m ((f :+: g) a) #

MonoTraversable (K1 i c a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element (K1 i c a) -> f (Element (K1 i c a))) -> K1 i c a -> f (K1 i c a) #

omapM :: Applicative m => (Element (K1 i c a) -> m (Element (K1 i c a))) -> K1 i c a -> m (K1 i c a) #

(Traversable f, Traversable g) => MonoTraversable (Compose f g a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f0 => (Element (Compose f g a) -> f0 (Element (Compose f g a))) -> Compose f g a -> f0 (Compose f g a) #

omapM :: Applicative m => (Element (Compose f g a) -> m (Element (Compose f g a))) -> Compose f g a -> m (Compose f g a) #

(Traversable f, Traversable g) => MonoTraversable ((f :.: g) a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f0 => (Element ((f :.: g) a) -> f0 (Element ((f :.: g) a))) -> (f :.: g) a -> f0 ((f :.: g) a) #

omapM :: Applicative m => (Element ((f :.: g) a) -> m (Element ((f :.: g) a))) -> (f :.: g) a -> m ((f :.: g) a) #

Traversable f => MonoTraversable (M1 i c f a) 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f0 => (Element (M1 i c f a) -> f0 (Element (M1 i c f a))) -> M1 i c f a -> f0 (M1 i c f a) #

omapM :: Applicative m => (Element (M1 i c f a) -> m (Element (M1 i c f a))) -> M1 i c f a -> m (M1 i c f a) #

data WrappedMono mono a where #

Constructors

WrappedMono :: forall mono a. Element mono ~ a => mono -> WrappedMono mono a 

Instances

Instances details
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 #

MonoFoldable mono => MonoFoldable (WrappedMono mono a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (WrappedMono mono a) -> m) -> WrappedMono mono a -> m #

ofoldr :: (Element (WrappedMono mono a) -> b -> b) -> b -> WrappedMono mono a -> b #

ofoldl' :: (a0 -> Element (WrappedMono mono a) -> a0) -> a0 -> WrappedMono mono a -> a0 #

otoList :: WrappedMono mono a -> [Element (WrappedMono mono a)] #

oall :: (Element (WrappedMono mono a) -> Bool) -> WrappedMono mono a -> Bool #

oany :: (Element (WrappedMono mono a) -> Bool) -> WrappedMono mono a -> Bool #

onull :: WrappedMono mono a -> Bool #

olength :: WrappedMono mono a -> Int #

olength64 :: WrappedMono mono a -> Int64 #

ocompareLength :: Integral i => WrappedMono mono a -> i -> Ordering #

otraverse_ :: Applicative f => (Element (WrappedMono mono a) -> f b) -> WrappedMono mono a -> f () #

ofor_ :: Applicative f => WrappedMono mono a -> (Element (WrappedMono mono a) -> f b) -> f () #

omapM_ :: Applicative m => (Element (WrappedMono mono a) -> m ()) -> WrappedMono mono a -> m () #

oforM_ :: Applicative m => WrappedMono mono a -> (Element (WrappedMono mono a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (WrappedMono mono a) -> m a0) -> a0 -> WrappedMono mono a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (WrappedMono mono a) -> m) -> WrappedMono mono a -> m #

ofoldr1Ex :: (Element (WrappedMono mono a) -> Element (WrappedMono mono a) -> Element (WrappedMono mono a)) -> WrappedMono mono a -> Element (WrappedMono mono a) #

ofoldl1Ex' :: (Element (WrappedMono mono a) -> Element (WrappedMono mono a) -> Element (WrappedMono mono a)) -> WrappedMono mono a -> Element (WrappedMono mono a) #

headEx :: WrappedMono mono a -> Element (WrappedMono mono a) #

lastEx :: WrappedMono mono a -> Element (WrappedMono mono a) #

unsafeHead :: WrappedMono mono a -> Element (WrappedMono mono a) #

unsafeLast :: WrappedMono mono a -> Element (WrappedMono mono a) #

maximumByEx :: (Element (WrappedMono mono a) -> Element (WrappedMono mono a) -> Ordering) -> WrappedMono mono a -> Element (WrappedMono mono a) #

minimumByEx :: (Element (WrappedMono mono a) -> Element (WrappedMono mono a) -> Ordering) -> WrappedMono mono a -> Element (WrappedMono mono a) #

oelem :: Element (WrappedMono mono a) -> WrappedMono mono a -> Bool #

onotElem :: Element (WrappedMono mono a) -> WrappedMono mono a -> Bool #

MonoFunctor mono => MonoFunctor (WrappedMono mono a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (WrappedMono mono a) -> Element (WrappedMono mono a)) -> WrappedMono mono a -> WrappedMono mono a #

(MonoPointed mono, Element mono ~ a) => MonoPointed (WrappedMono mono a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (WrappedMono mono a) -> WrappedMono mono a #

type Element (WrappedMono mono a) 
Instance details

Defined in Data.MonoTraversable

type Element (WrappedMono mono a) = Element mono

newtype WrappedPoly (f :: Type -> Type) a #

Constructors

WrappedPoly 

Fields

Instances

Instances details
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 #

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 #

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 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 #

Foldable f => MonoFoldable (WrappedPoly f a) 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element (WrappedPoly f a) -> m) -> WrappedPoly f a -> m #

ofoldr :: (Element (WrappedPoly f a) -> b -> b) -> b -> WrappedPoly f a -> b #

ofoldl' :: (a0 -> Element (WrappedPoly f a) -> a0) -> a0 -> WrappedPoly f a -> a0 #

otoList :: WrappedPoly f a -> [Element (WrappedPoly f a)] #

oall :: (Element (WrappedPoly f a) -> Bool) -> WrappedPoly f a -> Bool #

oany :: (Element (WrappedPoly f a) -> Bool) -> WrappedPoly f a -> Bool #

onull :: WrappedPoly f a -> Bool #

olength :: WrappedPoly f a -> Int #

olength64 :: WrappedPoly f a -> Int64 #

ocompareLength :: Integral i => WrappedPoly f a -> i -> Ordering #

otraverse_ :: Applicative f0 => (Element (WrappedPoly f a) -> f0 b) -> WrappedPoly f a -> f0 () #

ofor_ :: Applicative f0 => WrappedPoly f a -> (Element (WrappedPoly f a) -> f0 b) -> f0 () #

omapM_ :: Applicative m => (Element (WrappedPoly f a) -> m ()) -> WrappedPoly f a -> m () #

oforM_ :: Applicative m => WrappedPoly f a -> (Element (WrappedPoly f a) -> m ()) -> m () #

ofoldlM :: Monad m => (a0 -> Element (WrappedPoly f a) -> m a0) -> a0 -> WrappedPoly f a -> m a0 #

ofoldMap1Ex :: Semigroup m => (Element (WrappedPoly f a) -> m) -> WrappedPoly f a -> m #

ofoldr1Ex :: (Element (WrappedPoly f a) -> Element (WrappedPoly f a) -> Element (WrappedPoly f a)) -> WrappedPoly f a -> Element (WrappedPoly f a) #

ofoldl1Ex' :: (Element (WrappedPoly f a) -> Element (WrappedPoly f a) -> Element (WrappedPoly f a)) -> WrappedPoly f a -> Element (WrappedPoly f a) #

headEx :: WrappedPoly f a -> Element (WrappedPoly f a) #

lastEx :: WrappedPoly f a -> Element (WrappedPoly f a) #

unsafeHead :: WrappedPoly f a -> Element (WrappedPoly f a) #

unsafeLast :: WrappedPoly f a -> Element (WrappedPoly f a) #

maximumByEx :: (Element (WrappedPoly f a) -> Element (WrappedPoly f a) -> Ordering) -> WrappedPoly f a -> Element (WrappedPoly f a) #

minimumByEx :: (Element (WrappedPoly f a) -> Element (WrappedPoly f a) -> Ordering) -> WrappedPoly f a -> Element (WrappedPoly f a) #

oelem :: Element (WrappedPoly f a) -> WrappedPoly f a -> Bool #

onotElem :: Element (WrappedPoly f a) -> WrappedPoly f a -> Bool #

Functor f => MonoFunctor (WrappedPoly f a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (WrappedPoly f a) -> Element (WrappedPoly f a)) -> WrappedPoly f a -> WrappedPoly f a #

Applicative f => MonoPointed (WrappedPoly f a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (WrappedPoly f a) -> WrappedPoly f a #

type Element (WrappedPoly f a) 
Instance details

Defined in Data.MonoTraversable

type Element (WrappedPoly f a) = a

data NonNull mono #

Instances

Instances details
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) #

(Semigroup mono, GrowingAppend mono) => Semigroup (NonNull mono) 
Instance details

Defined in Data.NonNull

Methods

(<>) :: NonNull mono -> NonNull mono -> NonNull mono #

sconcat :: NonEmpty (NonNull mono) -> NonNull mono #

stimes :: Integral b => b -> NonNull mono -> NonNull mono #

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]

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 #

Eq mono => Eq (NonNull mono) 
Instance details

Defined in Data.NonNull

Methods

(==) :: NonNull mono -> NonNull mono -> Bool #

(/=) :: NonNull mono -> NonNull mono -> Bool #

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 #

GrowingAppend mono => GrowingAppend (NonNull mono) 
Instance details

Defined in Data.NonNull

IsSequence mono => MonoComonad (NonNull mono) 
Instance details

Defined in Data.NonNull

Methods

oextract :: NonNull mono -> Element (NonNull mono) #

oextend :: (NonNull mono -> Element (NonNull mono)) -> NonNull mono -> NonNull mono #

MonoFoldable mono => MonoFoldable (NonNull mono) 
Instance details

Defined in Data.NonNull

Methods

ofoldMap :: Monoid m => (Element (NonNull mono) -> m) -> NonNull mono -> m #

ofoldr :: (Element (NonNull mono) -> b -> b) -> b -> NonNull mono -> b #

ofoldl' :: (a -> Element (NonNull mono) -> a) -> a -> NonNull mono -> a #

otoList :: NonNull mono -> [Element (NonNull mono)] #

oall :: (Element (NonNull mono) -> Bool) -> NonNull mono -> Bool #

oany :: (Element (NonNull mono) -> Bool) -> NonNull mono -> Bool #

onull :: NonNull mono -> Bool #

olength :: NonNull mono -> Int #

olength64 :: NonNull mono -> Int64 #

ocompareLength :: Integral i => NonNull mono -> i -> Ordering #

otraverse_ :: Applicative f => (Element (NonNull mono) -> f b) -> NonNull mono -> f () #

ofor_ :: Applicative f => NonNull mono -> (Element (NonNull mono) -> f b) -> f () #

omapM_ :: Applicative m => (Element (NonNull mono) -> m ()) -> NonNull mono -> m () #

oforM_ :: Applicative m => NonNull mono -> (Element (NonNull mono) -> m ()) -> m () #

ofoldlM :: Monad m => (a -> Element (NonNull mono) -> m a) -> a -> NonNull mono -> m a #

ofoldMap1Ex :: Semigroup m => (Element (NonNull mono) -> m) -> NonNull mono -> m #

ofoldr1Ex :: (Element (NonNull mono) -> Element (NonNull mono) -> Element (NonNull mono)) -> NonNull mono -> Element (NonNull mono) #

ofoldl1Ex' :: (Element (NonNull mono) -> Element (NonNull mono) -> Element (NonNull mono)) -> NonNull mono -> Element (NonNull mono) #

headEx :: NonNull mono -> Element (NonNull mono) #

lastEx :: NonNull mono -> Element (NonNull mono) #

unsafeHead :: NonNull mono -> Element (NonNull mono) #

unsafeLast :: NonNull mono -> Element (NonNull mono) #

maximumByEx :: (Element (NonNull mono) -> Element (NonNull mono) -> Ordering) -> NonNull mono -> Element (NonNull mono) #

minimumByEx :: (Element (NonNull mono) -> Element (NonNull mono) -> Ordering) -> NonNull mono -> Element (NonNull mono) #

oelem :: Element (NonNull mono) -> NonNull mono -> Bool #

onotElem :: Element (NonNull mono) -> NonNull mono -> Bool #

MonoFunctor mono => MonoFunctor (NonNull mono) 
Instance details

Defined in Data.NonNull

Methods

omap :: (Element (NonNull mono) -> Element (NonNull mono)) -> NonNull mono -> NonNull mono #

MonoPointed mono => MonoPointed (NonNull mono) 
Instance details

Defined in Data.NonNull

Methods

opoint :: Element (NonNull mono) -> NonNull mono #

MonoTraversable mono => MonoTraversable (NonNull mono) 
Instance details

Defined in Data.NonNull

Methods

otraverse :: Applicative f => (Element (NonNull mono) -> f (Element (NonNull mono))) -> NonNull mono -> f (NonNull mono) #

omapM :: Applicative m => (Element (NonNull mono) -> m (Element (NonNull mono))) -> NonNull mono -> m (NonNull mono) #

SemiSequence seq => SemiSequence (NonNull seq) 
Instance details

Defined in Data.NonNull

Associated Types

type Index (NonNull seq) #

Methods

intersperse :: Element (NonNull seq) -> NonNull seq -> NonNull seq #

reverse :: NonNull seq -> NonNull seq #

find :: (Element (NonNull seq) -> Bool) -> NonNull seq -> Maybe (Element (NonNull seq)) #

sortBy :: (Element (NonNull seq) -> Element (NonNull seq) -> Ordering) -> NonNull seq -> NonNull seq #

cons :: Element (NonNull seq) -> NonNull seq -> NonNull seq #

snoc :: NonNull seq -> Element (NonNull seq) -> NonNull seq #

type Element (NonNull mono) 
Instance details

Defined in Data.NonNull

type Element (NonNull mono) = Element mono
type Index (NonNull seq) 
Instance details

Defined in Data.NonNull

type Index (NonNull seq) = Index seq

class (Monoid seq, MonoTraversable seq, SemiSequence seq, MonoPointed seq) => IsSequence seq where #

Minimal complete definition

Nothing

Methods

fromList :: [Element seq] -> seq #

lengthIndex :: seq -> Index seq #

break :: (Element seq -> Bool) -> seq -> (seq, seq) #

span :: (Element seq -> Bool) -> seq -> (seq, seq) #

dropWhile :: (Element seq -> Bool) -> seq -> seq #

splitAt :: Index seq -> seq -> (seq, seq) #

unsafeSplitAt :: Index seq -> seq -> (seq, seq) #

unsafeTake :: Index seq -> seq -> seq #

drop :: Index seq -> seq -> seq #

unsafeDrop :: Index seq -> seq -> seq #

dropEnd :: Index seq -> seq -> seq #

partition :: (Element seq -> Bool) -> seq -> (seq, seq) #

uncons :: seq -> Maybe (Element seq, seq) #

unsnoc :: seq -> Maybe (seq, Element seq) #

filter :: (Element seq -> Bool) -> seq -> seq #

filterM :: Monad m => (Element seq -> m Bool) -> seq -> m seq #

replicate :: Index seq -> Element seq -> seq #

replicateM :: Monad m => Index seq -> m (Element seq) -> m seq #

groupBy :: (Element seq -> Element seq -> Bool) -> seq -> [seq] #

groupAllOn :: Eq b => (Element seq -> b) -> seq -> [seq] #

subsequences :: seq -> [seq] #

permutations :: seq -> [seq] #

tailEx :: seq -> seq #

tailMay :: seq -> Maybe seq #

initEx :: seq -> seq #

initMay :: seq -> Maybe seq #

unsafeTail :: seq -> seq #

unsafeInit :: seq -> seq #

indexEx :: seq -> Index seq -> Element seq #

unsafeIndex :: seq -> Index seq -> Element seq #

splitWhen :: (Element seq -> Bool) -> seq -> [seq] #

Instances

Instances details
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] #

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] #

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] #

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] #

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] #

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] #

Storable 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] #

Unbox 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] #

IsSequence [a] 
Instance details

Defined in Data.Sequences

Methods

fromList :: [Element [a]] -> [a] #

lengthIndex :: [a] -> Index [a] #

break :: (Element [a] -> Bool) -> [a] -> ([a], [a]) #

span :: (Element [a] -> Bool) -> [a] -> ([a], [a]) #

dropWhile :: (Element [a] -> Bool) -> [a] -> [a] #

takeWhile :: (Element [a] -> Bool) -> [a] -> [a]

splitAt :: Index [a] -> [a] -> ([a], [a]) #

unsafeSplitAt :: Index [a] -> [a] -> ([a], [a]) #

take :: Index [a] -> [a] -> [a]

unsafeTake :: Index [a] -> [a] -> [a] #

drop :: Index [a] -> [a] -> [a] #

unsafeDrop :: Index [a] -> [a] -> [a] #

dropEnd :: Index [a] -> [a] -> [a] #

partition :: (Element [a] -> Bool) -> [a] -> ([a], [a]) #

uncons :: [a] -> Maybe (Element [a], [a]) #

unsnoc :: [a] -> Maybe ([a], Element [a]) #

filter :: (Element [a] -> Bool) -> [a] -> [a] #

filterM :: Monad m => (Element [a] -> m Bool) -> [a] -> m [a] #

replicate :: Index [a] -> Element [a] -> [a] #

replicateM :: Monad m => Index [a] -> m (Element [a]) -> m [a] #

groupBy :: (Element [a] -> Element [a] -> Bool) -> [a] -> [[a]] #

groupAllOn :: Eq b => (Element [a] -> b) -> [a] -> [[a]] #

subsequences :: [a] -> [[a]] #

permutations :: [a] -> [[a]] #

tailEx :: [a] -> [a] #

tailMay :: [a] -> Maybe [a] #

initEx :: [a] -> [a] #

initMay :: [a] -> Maybe [a] #

unsafeTail :: [a] -> [a] #

unsafeInit :: [a] -> [a] #

index :: [a] -> Index [a] -> Maybe (Element [a])

indexEx :: [a] -> Index [a] -> Element [a] #

unsafeIndex :: [a] -> Index [a] -> Element [a] #

splitWhen :: (Element [a] -> Bool) -> [a] -> [[a]] #

class (IsSequence lazy, IsSequence strict) => LazySequence lazy strict | lazy -> strict, strict -> lazy where #

Methods

toChunks :: lazy -> [strict] #

fromChunks :: [strict] -> lazy #

toStrict :: lazy -> strict #

fromStrict :: strict -> lazy #

Instances

Instances details
LazySequence ByteString ByteString 
Instance details

Defined in Data.Sequences

Methods

toChunks :: ByteString -> [ByteString0] #

fromChunks :: [ByteString0] -> ByteString #

toStrict :: ByteString -> ByteString0 #

fromStrict :: ByteString0 -> ByteString #

LazySequence Text Text 
Instance details

Defined in Data.Sequences

Methods

toChunks :: Text -> [Text0] #

fromChunks :: [Text0] -> Text #

toStrict :: Text -> Text0 #

fromStrict :: Text0 -> Text #

class (IsSequence t, IsString t, Element t ~ Char) => Textual t where #

Minimal complete definition

words, unwords, lines, unlines, toLower, toUpper, toCaseFold

Methods

words :: t -> [t] #

unwords :: (Element seq ~ t, MonoFoldable seq) => seq -> t #

lines :: t -> [t] #

unlines :: (Element seq ~ t, MonoFoldable seq) => seq -> t #

toLower :: t -> t #

toUpper :: t -> t #

toCaseFold :: t -> t #

breakWord :: t -> (t, t) #

breakLine :: t -> (t, t) #

Instances

Instances details
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) #

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) #

c ~ Char => Textual [c] 
Instance details

Defined in Data.Sequences

Methods

words :: [c] -> [[c]] #

unwords :: (Element seq ~ [c], MonoFoldable seq) => seq -> [c] #

lines :: [c] -> [[c]] #

unlines :: (Element seq ~ [c], MonoFoldable seq) => seq -> [c] #

toLower :: [c] -> [c] #

toUpper :: [c] -> [c] #

toCaseFold :: [c] -> [c] #

breakWord :: [c] -> ([c], [c]) #

breakLine :: [c] -> ([c], [c]) #

class Monad m => MonadReader r (m :: Type -> Type) | m -> r where #

Minimal complete definition

(ask | reader), local

Methods

ask :: m r #

Instances

Instances details
MonadReader MinioConn Minio 
Instance details

Defined in Network.Minio.Data

Methods

ask :: Minio MinioConn #

local :: (MinioConn -> MinioConn) -> Minio a -> Minio a

reader :: (MinioConn -> a) -> Minio a

(Representable f, Rep f ~ a) => MonadReader a (Co f) 
Instance details

Defined in Data.Functor.Rep

Methods

ask :: Co f a #

local :: (a -> a) -> Co f a0 -> Co f a0

reader :: (a -> a0) -> Co f a0

(Functor m, MonadReader e m) => MonadReader e (Free m) 
Instance details

Defined in Control.Monad.Free

Methods

ask :: Free m e #

local :: (e -> e) -> Free m a -> Free m a

reader :: (e -> a) -> Free m a

MonadReader r m => MonadReader r (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

ask :: ResourceT m r #

local :: (r -> r) -> ResourceT m a -> ResourceT m a

reader :: (r -> a) -> ResourceT m a

MonadReader r m => MonadReader r (ListT m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: ListT m r #

local :: (r -> r) -> ListT m a -> ListT m a

reader :: (r -> a) -> ListT m a

MonadReader r m => MonadReader r (MaybeT m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: MaybeT m r #

local :: (r -> r) -> MaybeT m a -> MaybeT m a

reader :: (r -> a) -> MaybeT m a

MonadReader s (ReifiedFold s) 
Instance details

Defined in Control.Lens.Reified

Methods

ask :: ReifiedFold s s #

local :: (s -> s) -> ReifiedFold s a -> ReifiedFold s a

reader :: (s -> a) -> ReifiedFold s a

MonadReader s (ReifiedGetter s) 
Instance details

Defined in Control.Lens.Reified

Methods

ask :: ReifiedGetter s s #

local :: (s -> s) -> ReifiedGetter s a -> ReifiedGetter s a

reader :: (s -> a) -> ReifiedGetter s a

(Functor f, Functor m, MonadReader r m) => MonadReader r (FreeT f m) 
Instance details

Defined in Control.Monad.Trans.Free

Methods

ask :: FreeT f m r #

local :: (r -> r) -> FreeT f m a -> FreeT f m a

reader :: (r -> a) -> FreeT f m a

(Error e, MonadReader r m) => MonadReader r (ErrorT e m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: ErrorT e m r #

local :: (r -> r) -> ErrorT e m a -> ErrorT e m a

reader :: (r -> a) -> ErrorT e m a

MonadReader r m => MonadReader r (ExceptT e m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: ExceptT e m r #

local :: (r -> r) -> ExceptT e m a -> ExceptT e m a

reader :: (r -> a) -> ExceptT e m a

MonadReader r m => MonadReader r (IdentityT m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: IdentityT m r #

local :: (r -> r) -> IdentityT m a -> IdentityT m a

reader :: (r -> a) -> IdentityT m a

Monad m => MonadReader r (ReaderT r m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: ReaderT r m r #

local :: (r -> r) -> ReaderT r m a -> ReaderT r m a

reader :: (r -> a) -> ReaderT r m a

MonadReader r m => MonadReader r (StateT s m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: StateT s m r #

local :: (r -> r) -> StateT s m a -> StateT s m a

reader :: (r -> a) -> StateT s m a

MonadReader r m => MonadReader r (StateT s m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: StateT s m r #

local :: (r -> r) -> StateT s m a -> StateT s m a

reader :: (r -> a) -> StateT s m a

(Monoid w, MonadReader r m) => MonadReader r (WriterT w m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: WriterT w m r #

local :: (r -> r) -> WriterT w m a -> WriterT w m a

reader :: (r -> a) -> WriterT w m a

(Monoid w, MonadReader r m) => MonadReader r (WriterT w m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: WriterT w m r #

local :: (r -> r) -> WriterT w m a -> WriterT w m a

reader :: (r -> a) -> WriterT w m a

MonadReader r m => MonadReader r (ConduitT i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

ask :: ConduitT i o m r #

local :: (r -> r) -> ConduitT i o m a -> ConduitT i o m a

reader :: (r -> a) -> ConduitT i o m a

(Stream s, MonadReader r m) => MonadReader r (ParsecT e s m) 
Instance details

Defined in Text.Megaparsec.Internal

Methods

ask :: ParsecT e s m r #

local :: (r -> r) -> ParsecT e s m a -> ParsecT e s m a

reader :: (r -> a) -> ParsecT e s m a

MonadReader r ((->) r) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: r -> r #

local :: (r -> r) -> (r -> a) -> r -> a

reader :: (r -> a) -> r -> a

MonadReader r' m => MonadReader r' (ContT r m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: ContT r m r' #

local :: (r' -> r') -> ContT r m a -> ContT r m a

reader :: (r' -> a) -> ContT r m a

(Monad m, Monoid w) => MonadReader r (RWST r w s m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: RWST r w s m r #

local :: (r -> r) -> RWST r w s m a -> RWST r w s m a

reader :: (r -> a) -> RWST r w s m a

(Monad m, Monoid w) => MonadReader r (RWST r w s m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: RWST r w s m r #

local :: (r -> r) -> RWST r w s m a -> RWST r w s m a

reader :: (r -> a) -> RWST r w s m a

MonadReader r m => MonadReader r (Pipe l i o u m) 
Instance details

Defined in Data.Conduit.Internal.Pipe

Methods

ask :: Pipe l i o u m r #

local :: (r -> r) -> Pipe l i o u m a -> Pipe l i o u m a

reader :: (r -> a) -> Pipe l i o u m a

data BRef s a #

Instances

Instances details
Monoid w => MutableCollection (BRef s w) 
Instance details

Defined in Data.Mutable.BRef

Associated Types

type CollElement (BRef s w) #

Methods

newColl :: (PrimMonad m, PrimState m ~ MCState (BRef s w)) => m (BRef s w) #

MutableContainer (BRef s a) 
Instance details

Defined in Data.Mutable.BRef

Associated Types

type MCState (BRef s a) #

IsSequence seq => MutablePopBack (BRef s seq) 
Instance details

Defined in Data.Mutable.BRef

Methods

popBack :: (PrimMonad m, PrimState m ~ MCState (BRef s seq)) => BRef s seq -> m (Maybe (CollElement (BRef s seq))) #

IsSequence seq => MutablePopFront (BRef s seq) 
Instance details

Defined in Data.Mutable.BRef

Methods

popFront :: (PrimMonad m, PrimState m ~ MCState (BRef s seq)) => BRef s seq -> m (Maybe (CollElement (BRef s seq))) #

IsSequence seq => MutablePushBack (BRef s seq) 
Instance details

Defined in Data.Mutable.BRef

Methods

pushBack :: (PrimMonad m, PrimState m ~ MCState (BRef s seq)) => BRef s seq -> CollElement (BRef s seq) -> m () #

IsSequence seq => MutablePushFront (BRef s seq) 
Instance details

Defined in Data.Mutable.BRef

Methods

pushFront :: (PrimMonad m, PrimState m ~ MCState (BRef s seq)) => BRef s seq -> CollElement (BRef s seq) -> m () #

MutableRef (BRef s a) 
Instance details

Defined in Data.Mutable.BRef

Associated Types

type RefElement (BRef s a) #

Methods

newRef :: (PrimMonad m, PrimState m ~ MCState (BRef s a)) => RefElement (BRef s a) -> m (BRef s a) #

readRef :: (PrimMonad m, PrimState m ~ MCState (BRef s a)) => BRef s a -> m (RefElement (BRef s a)) #

writeRef :: (PrimMonad m, PrimState m ~ MCState (BRef s a)) => BRef s a -> RefElement (BRef s a) -> m () #

modifyRef :: (PrimMonad m, PrimState m ~ MCState (BRef s a)) => BRef s a -> (RefElement (BRef s a) -> RefElement (BRef s a)) -> m () #

modifyRef' :: (PrimMonad m, PrimState m ~ MCState (BRef s a)) => BRef s a -> (RefElement (BRef s a) -> RefElement (BRef s a)) -> m () #

type CollElement (BRef s w) 
Instance details

Defined in Data.Mutable.BRef

type CollElement (BRef s w) = Element w
type MCState (BRef s a) 
Instance details

Defined in Data.Mutable.BRef

type MCState (BRef s a) = s
type RefElement (BRef s a) 
Instance details

Defined in Data.Mutable.BRef

type RefElement (BRef s a) = a

class MutableContainer c => MutableCollection c where #

Associated Types

type CollElement c #

Methods

newColl :: (PrimMonad m, PrimState m ~ MCState c) => m c #

Instances

Instances details
Monoid w => MutableCollection (IORef w) 
Instance details

Defined in Data.Mutable.Class

Associated Types

type CollElement (IORef w) #

Methods

newColl :: (PrimMonad m, PrimState m ~ MCState (IORef w)) => m (IORef w) #

Monoid w => MutableCollection (STRef s w) 
Instance details

Defined in Data.Mutable.Class

Associated Types

type CollElement (STRef s w) #

Methods

newColl :: (PrimMonad m, PrimState m ~ MCState (STRef s w)) => m (STRef s w) #

Monoid w => MutableCollection (BRef s w) 
Instance details

Defined in Data.Mutable.BRef

Associated Types

type CollElement (BRef s w) #

Methods

newColl :: (PrimMonad m, PrimState m ~ MCState (BRef s w)) => m (BRef s w) #

MutableCollection (DLList s a) 
Instance details

Defined in Data.Mutable.DLList

Associated Types

type CollElement (DLList s a) #

Methods

newColl :: (PrimMonad m, PrimState m ~ MCState (DLList s a)) => m (DLList s a) #

Monoid w => MutableCollection (MutVar s w) 
Instance details

Defined in Data.Mutable.Class

Associated Types

type CollElement (MutVar s w) #

Methods

newColl :: (PrimMonad m, PrimState m ~ MCState (MutVar s w)) => m (MutVar s w) #

MVector v a => MutableCollection (Deque v s a) 
Instance details

Defined in Data.Mutable.Deque

Associated Types

type CollElement (Deque v s a) #

Methods

newColl :: (PrimMonad m, PrimState m ~ MCState (Deque v s a)) => m (Deque v s a) #

type family CollElement c #

Instances

Instances details
type CollElement (IORef w) 
Instance details

Defined in Data.Mutable.Class

type CollElement (STRef s w) 
Instance details

Defined in Data.Mutable.Class

type CollElement (STRef s w) = Element w
type CollElement (BRef s w) 
Instance details

Defined in Data.Mutable.BRef

type CollElement (BRef s w) = Element w
type CollElement (DLList s a) 
Instance details

Defined in Data.Mutable.DLList

type CollElement (DLList s a) = a
type CollElement (MutVar s w) 
Instance details

Defined in Data.Mutable.Class

type CollElement (MutVar s w) = Element w
type CollElement (Deque v s a) 
Instance details

Defined in Data.Mutable.Deque

type CollElement (Deque v s a) = a

class MutableContainer c #

Associated Types

type MCState c #

Instances

Instances details
MutableContainer (IORef a) 
Instance details

Defined in Data.Mutable.Class

Associated Types

type MCState (IORef a) #

MutableContainer (STRef s a) 
Instance details

Defined in Data.Mutable.Class

Associated Types

type MCState (STRef s a) #

MutableContainer (BRef s a) 
Instance details

Defined in Data.Mutable.BRef

Associated Types

type MCState (BRef s a) #

MutableContainer (DLList s a) 
Instance details

Defined in Data.Mutable.DLList

Associated Types

type MCState (DLList s a) #

MutableContainer (PRef s a) 
Instance details

Defined in Data.Mutable.PRef

Associated Types

type MCState (PRef s a) #

MutableContainer (SRef s a) 
Instance details

Defined in Data.Mutable.SRef

Associated Types

type MCState (SRef s a) #

MutableContainer (URef s a) 
Instance details

Defined in Data.Mutable.URef

Associated Types

type MCState (URef s a) #

MutableContainer (MutVar s a) 
Instance details

Defined in Data.Mutable.Class

Associated Types

type MCState (MutVar s a) #

MutableContainer (Deque v s a) 
Instance details

Defined in Data.Mutable.Deque

Associated Types

type MCState (Deque v s a) #

type family MCState c #

Instances

Instances details
type MCState (IORef a) 
Instance details

Defined in Data.Mutable.Class

type MCState (STRef s a) 
Instance details

Defined in Data.Mutable.Class

type MCState (STRef s a) = s
type MCState (BRef s a) 
Instance details

Defined in Data.Mutable.BRef

type MCState (BRef s a) = s
type MCState (DLList s a) 
Instance details

Defined in Data.Mutable.DLList

type MCState (DLList s a) = s
type MCState (PRef s a) 
Instance details

Defined in Data.Mutable.PRef

type MCState (PRef s a) = s
type MCState (SRef s a) 
Instance details

Defined in Data.Mutable.SRef

type MCState (SRef s a) = s
type MCState (URef s a) 
Instance details

Defined in Data.Mutable.URef

type MCState (URef s a) = s
type MCState (MutVar s a) 
Instance details

Defined in Data.Mutable.Class

type MCState (MutVar s a) = s
type MCState (Deque v s a) 
Instance details

Defined in Data.Mutable.Deque

type MCState (Deque v s a) = s

class MutableRef c => MutableAtomicRef c where #

Methods

atomicModifyRef :: (PrimMonad m, PrimState m ~ MCState c) => c -> (RefElement c -> (RefElement c, a)) -> m a #

atomicModifyRef' :: (PrimMonad m, PrimState m ~ MCState c) => c -> (RefElement c -> (RefElement c, a)) -> m a #

Instances

Instances details
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 #

MutableAtomicRef (MutVar s a) 
Instance details

Defined in Data.Mutable.Class

Methods

atomicModifyRef :: (PrimMonad m, PrimState m ~ MCState (MutVar s a)) => MutVar s a -> (RefElement (MutVar s a) -> (RefElement (MutVar s a), a0)) -> m a0 #

atomicModifyRef' :: (PrimMonad m, PrimState m ~ MCState (MutVar s a)) => MutVar s a -> (RefElement (MutVar s a) -> (RefElement (MutVar s a), a0)) -> m a0 #

class MutableCollection c => MutablePopBack c where #

Methods

popBack :: (PrimMonad m, PrimState m ~ MCState c) => c -> m (Maybe (CollElement c)) #

Instances

Instances details
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 => MutablePopBack (STRef s a) 
Instance details

Defined in Data.Mutable.Class

Methods

popBack :: (PrimMonad m, PrimState m ~ MCState (STRef s a)) => STRef s a -> m (Maybe (CollElement (STRef s a))) #

IsSequence seq => MutablePopBack (BRef s seq) 
Instance details

Defined in Data.Mutable.BRef

Methods

popBack :: (PrimMonad m, PrimState m ~ MCState (BRef s seq)) => BRef s seq -> m (Maybe (CollElement (BRef s seq))) #

MutablePopBack (DLList s a) 
Instance details

Defined in Data.Mutable.DLList

Methods

popBack :: (PrimMonad m, PrimState m ~ MCState (DLList s a)) => DLList s a -> m (Maybe (CollElement (DLList s a))) #

IsSequence a => MutablePopBack (MutVar s a) 
Instance details

Defined in Data.Mutable.Class

Methods

popBack :: (PrimMonad m, PrimState m ~ MCState (MutVar s a)) => MutVar s a -> m (Maybe (CollElement (MutVar s a))) #

MVector v a => MutablePopBack (Deque v s a) 
Instance details

Defined in Data.Mutable.Deque

Methods

popBack :: (PrimMonad m, PrimState m ~ MCState (Deque v s a)) => Deque v s a -> m (Maybe (CollElement (Deque v s a))) #

class MutableCollection c => MutablePopFront c where #

Methods

popFront :: (PrimMonad m, PrimState m ~ MCState c) => c -> m (Maybe (CollElement c)) #

Instances

Instances details
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 => MutablePopFront (STRef s a) 
Instance details

Defined in Data.Mutable.Class

Methods

popFront :: (PrimMonad m, PrimState m ~ MCState (STRef s a)) => STRef s a -> m (Maybe (CollElement (STRef s a))) #

IsSequence seq => MutablePopFront (BRef s seq) 
Instance details

Defined in Data.Mutable.BRef

Methods

popFront :: (PrimMonad m, PrimState m ~ MCState (BRef s seq)) => BRef s seq -> m (Maybe (CollElement (BRef s seq))) #

MutablePopFront (DLList s a) 
Instance details

Defined in Data.Mutable.DLList

Methods

popFront :: (PrimMonad m, PrimState m ~ MCState (DLList s a)) => DLList s a -> m (Maybe (CollElement (DLList s a))) #

IsSequence a => MutablePopFront (MutVar s a) 
Instance details

Defined in Data.Mutable.Class

Methods

popFront :: (PrimMonad m, PrimState m ~ MCState (MutVar s a)) => MutVar s a -> m (Maybe (CollElement (MutVar s a))) #

MVector v a => MutablePopFront (Deque v s a) 
Instance details

Defined in Data.Mutable.Deque

Methods

popFront :: (PrimMonad m, PrimState m ~ MCState (Deque v s a)) => Deque v s a -> m (Maybe (CollElement (Deque v s a))) #

class MutableCollection c => MutablePushBack c where #

Methods

pushBack :: (PrimMonad m, PrimState m ~ MCState c) => c -> CollElement c -> m () #

Instances

Instances details
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 => MutablePushBack (STRef s a) 
Instance details

Defined in Data.Mutable.Class

Methods

pushBack :: (PrimMonad m, PrimState m ~ MCState (STRef s a)) => STRef s a -> CollElement (STRef s a) -> m () #

IsSequence seq => MutablePushBack (BRef s seq) 
Instance details

Defined in Data.Mutable.BRef

Methods

pushBack :: (PrimMonad m, PrimState m ~ MCState (BRef s seq)) => BRef s seq -> CollElement (BRef s seq) -> m () #

MutablePushBack (DLList s a) 
Instance details

Defined in Data.Mutable.DLList

Methods

pushBack :: (PrimMonad m, PrimState m ~ MCState (DLList s a)) => DLList s a -> CollElement (DLList s a) -> m () #

IsSequence a => MutablePushBack (MutVar s a) 
Instance details

Defined in Data.Mutable.Class

Methods

pushBack :: (PrimMonad m, PrimState m ~ MCState (MutVar s a)) => MutVar s a -> CollElement (MutVar s a) -> m () #

MVector v a => MutablePushBack (Deque v s a) 
Instance details

Defined in Data.Mutable.Deque

Methods

pushBack :: (PrimMonad m, PrimState m ~ MCState (Deque v s a)) => Deque v s a -> CollElement (Deque v s a) -> m () #

class MutableCollection c => MutablePushFront c where #

Methods

pushFront :: (PrimMonad m, PrimState m ~ MCState c) => c -> CollElement c -> m () #

Instances

Instances details
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 () #

IsSequence a => MutablePushFront (STRef s a) 
Instance details

Defined in Data.Mutable.Class

Methods

pushFront :: (PrimMonad m, PrimState m ~ MCState (STRef s a)) => STRef s a -> CollElement (STRef s a) -> m () #

IsSequence seq => MutablePushFront (BRef s seq) 
Instance details

Defined in Data.Mutable.BRef

Methods

pushFront :: (PrimMonad m, PrimState m ~ MCState (BRef s seq)) => BRef s seq -> CollElement (BRef s seq) -> m () #

MutablePushFront (DLList s a) 
Instance details

Defined in Data.Mutable.DLList

Methods

pushFront :: (PrimMonad m, PrimState m ~ MCState (DLList s a)) => DLList s a -> CollElement (DLList s a) -> m () #

IsSequence a => MutablePushFront (MutVar s a) 
Instance details

Defined in Data.Mutable.Class

Methods

pushFront :: (PrimMonad m, PrimState m ~ MCState (MutVar s a)) => MutVar s a -> CollElement (MutVar s a) -> m () #

MVector v a => MutablePushFront (Deque v s a) 
Instance details

Defined in Data.Mutable.Deque

Methods

pushFront :: (PrimMonad m, PrimState m ~ MCState (Deque v s a)) => Deque v s a -> CollElement (Deque v s a) -> m () #

class MutableContainer c => MutableRef c where #

Associated Types

type RefElement c #

Methods

newRef :: (PrimMonad m, PrimState m ~ MCState c) => RefElement c -> m c #

readRef :: (PrimMonad m, PrimState m ~ MCState c) => c -> m (RefElement c) #

writeRef :: (PrimMonad m, PrimState m ~ MCState c) => c -> RefElement c -> m () #

modifyRef :: (PrimMonad m, PrimState m ~ MCState c) => c -> (RefElement c -> RefElement c) -> m () #

modifyRef' :: (PrimMonad m, PrimState m ~ MCState c) => c -> (RefElement c -> RefElement c) -> m () #

Instances

Instances details
MutableRef (IORef a) 
Instance details

Defined in Data.Mutable.Class

Associated Types

type RefElement (IORef 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 () #

MutableRef (STRef s a) 
Instance details

Defined in Data.Mutable.Class

Associated Types

type RefElement (STRef s a) #

Methods

newRef :: (PrimMonad m, PrimState m ~ MCState (STRef s a)) => RefElement (STRef s a) -> m (STRef s a) #

readRef :: (PrimMonad m, PrimState m ~ MCState (STRef s a)) => STRef s a -> m (RefElement (STRef s a)) #

writeRef :: (PrimMonad m, PrimState m ~ MCState (STRef s a)) => STRef s a -> RefElement (STRef s a) -> m () #

modifyRef :: (PrimMonad m, PrimState m ~ MCState (STRef s a)) => STRef s a -> (RefElement (STRef s a) -> RefElement (STRef s a)) -> m () #

modifyRef' :: (PrimMonad m, PrimState m ~ MCState (STRef s a)) => STRef s a -> (RefElement (STRef s a) -> RefElement (STRef s a)) -> m () #

MutableRef (BRef s a) 
Instance details

Defined in Data.Mutable.BRef

Associated Types

type RefElement (BRef s a) #

Methods

newRef :: (PrimMonad m, PrimState m ~ MCState (BRef s a)) => RefElement (BRef s a) -> m (BRef s a) #

readRef :: (PrimMonad m, PrimState m ~ MCState (BRef s a)) => BRef s a -> m (RefElement (BRef s a)) #

writeRef :: (PrimMonad m, PrimState m ~ MCState (BRef s a)) => BRef s a -> RefElement (BRef s a) -> m () #

modifyRef :: (PrimMonad m, PrimState m ~ MCState (BRef s a)) => BRef s a -> (RefElement (BRef s a) -> RefElement (BRef s a)) -> m () #

modifyRef' :: (PrimMonad m, PrimState m ~ MCState (BRef s a)) => BRef s a -> (RefElement (BRef s a) -> RefElement (BRef s a)) -> m () #

Prim a => MutableRef (PRef s a) 
Instance details

Defined in Data.Mutable.PRef

Associated Types

type RefElement (PRef s a) #

Methods

newRef :: (PrimMonad m, PrimState m ~ MCState (PRef s a)) => RefElement (PRef s a) -> m (PRef s a) #

readRef :: (PrimMonad m, PrimState m ~ MCState (PRef s a)) => PRef s a -> m (RefElement (PRef s a)) #

writeRef :: (PrimMonad m, PrimState m ~ MCState (PRef s a)) => PRef s a -> RefElement (PRef s a) -> m () #

modifyRef :: (PrimMonad m, PrimState m ~ MCState (PRef s a)) => PRef s a -> (RefElement (PRef s a) -> RefElement (PRef s a)) -> m () #

modifyRef' :: (PrimMonad m, PrimState m ~ MCState (PRef s a)) => PRef s a -> (RefElement (PRef s a) -> RefElement (PRef s a)) -> m () #

Storable a => MutableRef (SRef s a) 
Instance details

Defined in Data.Mutable.SRef

Associated Types

type RefElement (SRef s a) #

Methods

newRef :: (PrimMonad m, PrimState m ~ MCState (SRef s a)) => RefElement (SRef s a) -> m (SRef s a) #

readRef :: (PrimMonad m, PrimState m ~ MCState (SRef s a)) => SRef s a -> m (RefElement (SRef s a)) #

writeRef :: (PrimMonad m, PrimState m ~ MCState (SRef s a)) => SRef s a -> RefElement (SRef s a) -> m () #

modifyRef :: (PrimMonad m, PrimState m ~ MCState (SRef s a)) => SRef s a -> (RefElement (SRef s a) -> RefElement (SRef s a)) -> m () #

modifyRef' :: (PrimMonad m, PrimState m ~ MCState (SRef s a)) => SRef s a -> (RefElement (SRef s a) -> RefElement (SRef s a)) -> m () #

Unbox a => MutableRef (URef s a) 
Instance details

Defined in Data.Mutable.URef

Associated Types

type RefElement (URef s a) #

Methods

newRef :: (PrimMonad m, PrimState m ~ MCState (URef s a)) => RefElement (URef s a) -> m (URef s a) #

readRef :: (PrimMonad m, PrimState m ~ MCState (URef s a)) => URef s a -> m (RefElement (URef s a)) #

writeRef :: (PrimMonad m, PrimState m ~ MCState (URef s a)) => URef s a -> RefElement (URef s a) -> m () #

modifyRef :: (PrimMonad m, PrimState m ~ MCState (URef s a)) => URef s a -> (RefElement (URef s a) -> RefElement (URef s a)) -> m () #

modifyRef' :: (PrimMonad m, PrimState m ~ MCState (URef s a)) => URef s a -> (RefElement (URef s a) -> RefElement (URef s a)) -> m () #

MutableRef (MutVar s a) 
Instance details

Defined in Data.Mutable.Class

Associated Types

type RefElement (MutVar s a) #

Methods

newRef :: (PrimMonad m, PrimState m ~ MCState (MutVar s a)) => RefElement (MutVar s a) -> m (MutVar s a) #

readRef :: (PrimMonad m, PrimState m ~ MCState (MutVar s a)) => MutVar s a -> m (RefElement (MutVar s a)) #

writeRef :: (PrimMonad m, PrimState m ~ MCState (MutVar s a)) => MutVar s a -> RefElement (MutVar s a) -> m () #

modifyRef :: (PrimMonad m, PrimState m ~ MCState (MutVar s a)) => MutVar s a -> (RefElement (MutVar s a) -> RefElement (MutVar s a)) -> m () #

modifyRef' :: (PrimMonad m, PrimState m ~ MCState (MutVar s a)) => MutVar s a -> (RefElement (MutVar s a) -> RefElement (MutVar s a)) -> m () #

type family RefElement c #

Instances

Instances details
type RefElement (IORef a) 
Instance details

Defined in Data.Mutable.Class

type RefElement (IORef a) = a
type RefElement (STRef s a) 
Instance details

Defined in Data.Mutable.Class

type RefElement (STRef s a) = a
type RefElement (BRef s a) 
Instance details

Defined in Data.Mutable.BRef

type RefElement (BRef s a) = a
type RefElement (PRef s a) 
Instance details

Defined in Data.Mutable.PRef

type RefElement (PRef s a) = a
type RefElement (SRef s a) 
Instance details

Defined in Data.Mutable.SRef

type RefElement (SRef s a) = a
type RefElement (URef s a) 
Instance details

Defined in Data.Mutable.URef

type RefElement (URef s a) = a
type RefElement (MutVar s a) 
Instance details

Defined in Data.Mutable.Class

type RefElement (MutVar s a) = a

data DLList s a #

Instances

Instances details
MutableCollection (DLList s a) 
Instance details

Defined in Data.Mutable.DLList

Associated Types

type CollElement (DLList s a) #

Methods

newColl :: (PrimMonad m, PrimState m ~ MCState (DLList s a)) => m (DLList s a) #

MutableContainer (DLList s a) 
Instance details

Defined in Data.Mutable.DLList

Associated Types

type MCState (DLList s a) #

MutablePopBack (DLList s a) 
Instance details

Defined in Data.Mutable.DLList

Methods

popBack :: (PrimMonad m, PrimState m ~ MCState (DLList s a)) => DLList s a -> m (Maybe (CollElement (DLList s a))) #

MutablePopFront (DLList s a) 
Instance details

Defined in Data.Mutable.DLList

Methods

popFront :: (PrimMonad m, PrimState m ~ MCState (DLList s a)) => DLList s a -> m (Maybe (CollElement (DLList s a))) #

MutablePushBack (DLList s a) 
Instance details

Defined in Data.Mutable.DLList

Methods

pushBack :: (PrimMonad m, PrimState m ~ MCState (DLList s a)) => DLList s a -> CollElement (DLList s a) -> m () #

MutablePushFront (DLList s a) 
Instance details

Defined in Data.Mutable.DLList

Methods

pushFront :: (PrimMonad m, PrimState m ~ MCState (DLList s a)) => DLList s a -> CollElement (DLList s a) -> m () #

type CollElement (DLList s a) 
Instance details

Defined in Data.Mutable.DLList

type CollElement (DLList s a) = a
type MCState (DLList s a) 
Instance details

Defined in Data.Mutable.DLList

type MCState (DLList s a) = s

type BDeque = Deque MVector #

data Deque (v :: Type -> Type -> Type) s a #

Instances

Instances details
MVector v a => MutableCollection (Deque v s a) 
Instance details

Defined in Data.Mutable.Deque

Associated Types

type CollElement (Deque v s a) #

Methods

newColl :: (PrimMonad m, PrimState m ~ MCState (Deque v s a)) => m (Deque v s a) #

MutableContainer (Deque v s a) 
Instance details

Defined in Data.Mutable.Deque

Associated Types

type MCState (Deque v s a) #

MVector v a => MutablePopBack (Deque v s a) 
Instance details

Defined in Data.Mutable.Deque

Methods

popBack :: (PrimMonad m, PrimState m ~ MCState (Deque v s a)) => Deque v s a -> m (Maybe (CollElement (Deque v s a))) #

MVector v a => MutablePopFront (Deque v s a) 
Instance details

Defined in Data.Mutable.Deque

Methods

popFront :: (PrimMonad m, PrimState m ~ MCState (Deque v s a)) => Deque v s a -> m (Maybe (CollElement (Deque v s a))) #

MVector v a => MutablePushBack (Deque v s a) 
Instance details

Defined in Data.Mutable.Deque

Methods

pushBack :: (PrimMonad m, PrimState m ~ MCState (Deque v s a)) => Deque v s a -> CollElement (Deque v s a) -> m () #

MVector v a => MutablePushFront (Deque v s a) 
Instance details

Defined in Data.Mutable.Deque

Methods

pushFront :: (PrimMonad m, PrimState m ~ MCState (Deque v s a)) => Deque v s a -> CollElement (Deque v s a) -> m () #

type CollElement (Deque v s a) 
Instance details

Defined in Data.Mutable.Deque

type CollElement (Deque v s a) = a
type MCState (Deque v s a) 
Instance details

Defined in Data.Mutable.Deque

type MCState (Deque v s a) = s

type SDeque = Deque MVector #

type UDeque = Deque MVector #

data PRef s a #

Instances

Instances details
MutableContainer (PRef s a) 
Instance details

Defined in Data.Mutable.PRef

Associated Types

type MCState (PRef s a) #

Prim a => MutableRef (PRef s a) 
Instance details

Defined in Data.Mutable.PRef

Associated Types

type RefElement (PRef s a) #

Methods

newRef :: (PrimMonad m, PrimState m ~ MCState (PRef s a)) => RefElement (PRef s a) -> m (PRef s a) #

readRef :: (PrimMonad m, PrimState m ~ MCState (PRef s a)) => PRef s a -> m (RefElement (PRef s a)) #

writeRef :: (PrimMonad m, PrimState m ~ MCState (PRef s a)) => PRef s a -> RefElement (PRef s a) -> m () #

modifyRef :: (PrimMonad m, PrimState m ~ MCState (PRef s a)) => PRef s a -> (RefElement (PRef s a) -> RefElement (PRef s a)) -> m () #

modifyRef' :: (PrimMonad m, PrimState m ~ MCState (PRef s a)) => PRef s a -> (RefElement (PRef s a) -> RefElement (PRef s a)) -> m () #

type MCState (PRef s a) 
Instance details

Defined in Data.Mutable.PRef

type MCState (PRef s a) = s
type RefElement (PRef s a) 
Instance details

Defined in Data.Mutable.PRef

type RefElement (PRef s a) = a

data SRef s a #

Instances

Instances details
MutableContainer (SRef s a) 
Instance details

Defined in Data.Mutable.SRef

Associated Types

type MCState (SRef s a) #

Storable a => MutableRef (SRef s a) 
Instance details

Defined in Data.Mutable.SRef

Associated Types

type RefElement (SRef s a) #

Methods

newRef :: (PrimMonad m, PrimState m ~ MCState (SRef s a)) => RefElement (SRef s a) -> m (SRef s a) #

readRef :: (PrimMonad m, PrimState m ~ MCState (SRef s a)) => SRef s a -> m (RefElement (SRef s a)) #

writeRef :: (PrimMonad m, PrimState m ~ MCState (SRef s a)) => SRef s a -> RefElement (SRef s a) -> m () #

modifyRef :: (PrimMonad m, PrimState m ~ MCState (SRef s a)) => SRef s a -> (RefElement (SRef s a) -> RefElement (SRef s a)) -> m () #

modifyRef' :: (PrimMonad m, PrimState m ~ MCState (SRef s a)) => SRef s a -> (RefElement (SRef s a) -> RefElement (SRef s a)) -> m () #

type MCState (SRef s a) 
Instance details

Defined in Data.Mutable.SRef

type MCState (SRef s a) = s
type RefElement (SRef s a) 
Instance details

Defined in Data.Mutable.SRef

type RefElement (SRef s a) = a

data URef s a #

Instances

Instances details
MutableContainer (URef s a) 
Instance details

Defined in Data.Mutable.URef

Associated Types

type MCState (URef s a) #

Unbox a => MutableRef (URef s a) 
Instance details

Defined in Data.Mutable.URef

Associated Types

type RefElement (URef s a) #

Methods

newRef :: (PrimMonad m, PrimState m ~ MCState (URef s a)) => RefElement (URef s a) -> m (URef s a) #

readRef :: (PrimMonad m, PrimState m ~ MCState (URef s a)) => URef s a -> m (RefElement (URef s a)) #

writeRef :: (PrimMonad m, PrimState m ~ MCState (URef s a)) => URef s a -> RefElement (URef s a) -> m () #

modifyRef :: (PrimMonad m, PrimState m ~ MCState (URef s a)) => URef s a -> (RefElement (URef s a) -> RefElement (URef s a)) -> m () #

modifyRef' :: (PrimMonad m, PrimState m ~ MCState (URef s a)) => URef s a -> (RefElement (URef s a) -> RefElement (URef s a)) -> m () #

type MCState (URef s a) 
Instance details

Defined in Data.Mutable.URef

type MCState (URef s a) = s
type RefElement (URef s a) 
Instance details

Defined in Data.Mutable.URef

type RefElement (URef s a) = a

class Monad m => PrimMonad (m :: Type -> Type) #

Minimal complete definition

primitive

Associated Types

type PrimState (m :: Type -> Type) #

Instances

Instances details
PrimMonad IO 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState IO #

Methods

primitive :: (State# (PrimState IO) -> (# State# (PrimState IO), a #)) -> IO a

PrimMonad (ST s) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (ST s) #

Methods

primitive :: (State# (PrimState (ST s)) -> (# State# (PrimState (ST s)), a #)) -> ST s a

PrimMonad (ST s) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (ST s) #

Methods

primitive :: (State# (PrimState (ST s)) -> (# State# (PrimState (ST s)), a #)) -> ST s a

PrimMonad m => PrimMonad (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Associated Types

type PrimState (ResourceT m) #

Methods

primitive :: (State# (PrimState (ResourceT m)) -> (# State# (PrimState (ResourceT m)), a #)) -> ResourceT m a

PrimMonad m => PrimMonad (ListT m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (ListT m) #

Methods

primitive :: (State# (PrimState (ListT m)) -> (# State# (PrimState (ListT m)), a #)) -> ListT m a

PrimMonad m => PrimMonad (MaybeT m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (MaybeT m) #

Methods

primitive :: (State# (PrimState (MaybeT m)) -> (# State# (PrimState (MaybeT m)), a #)) -> MaybeT m a

(Monoid w, PrimMonad m) => PrimMonad (AccumT w m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (AccumT w m) #

Methods

primitive :: (State# (PrimState (AccumT w m)) -> (# State# (PrimState (AccumT w m)), a #)) -> AccumT w m a

(Error e, PrimMonad m) => PrimMonad (ErrorT e m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (ErrorT e m) #

Methods

primitive :: (State# (PrimState (ErrorT e m)) -> (# State# (PrimState (ErrorT e m)), a #)) -> ErrorT e m a

PrimMonad m => PrimMonad (ExceptT e m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (ExceptT e m) #

Methods

primitive :: (State# (PrimState (ExceptT e m)) -> (# State# (PrimState (ExceptT e m)), a #)) -> ExceptT e m a

PrimMonad m => PrimMonad (IdentityT m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (IdentityT m) #

Methods

primitive :: (State# (PrimState (IdentityT m)) -> (# State# (PrimState (IdentityT m)), a #)) -> IdentityT m a

PrimMonad m => PrimMonad (ReaderT r m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (ReaderT r m) #

Methods

primitive :: (State# (PrimState (ReaderT r m)) -> (# State# (PrimState (ReaderT r m)), a #)) -> ReaderT r m a

PrimMonad m => PrimMonad (SelectT r m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (SelectT r m) #

Methods

primitive :: (State# (PrimState (SelectT r m)) -> (# State# (PrimState (SelectT r m)), a #)) -> SelectT r m a

PrimMonad m => PrimMonad (StateT s m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (StateT s m) #

Methods

primitive :: (State# (PrimState (StateT s m)) -> (# State# (PrimState (StateT s m)), a #)) -> StateT s m a

PrimMonad m => PrimMonad (StateT s m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (StateT s m) #

Methods

primitive :: (State# (PrimState (StateT s m)) -> (# State# (PrimState (StateT s m)), a #)) -> StateT s m a

(Monoid w, PrimMonad m) => PrimMonad (WriterT w m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (WriterT w m) #

Methods

primitive :: (State# (PrimState (WriterT w m)) -> (# State# (PrimState (WriterT w m)), a #)) -> WriterT w m a

(Monoid w, PrimMonad m) => PrimMonad (WriterT w m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (WriterT w m) #

Methods

primitive :: (State# (PrimState (WriterT w m)) -> (# State# (PrimState (WriterT w m)), a #)) -> WriterT w m a

(Monoid w, PrimMonad m) => PrimMonad (WriterT w m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (WriterT w m) #

Methods

primitive :: (State# (PrimState (WriterT w m)) -> (# State# (PrimState (WriterT w m)), a #)) -> WriterT w m a

PrimMonad m => PrimMonad (ConduitT i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Associated Types

type PrimState (ConduitT i o m) #

Methods

primitive :: (State# (PrimState (ConduitT i o m)) -> (# State# (PrimState (ConduitT i o m)), a #)) -> ConduitT i o m a

PrimMonad m => PrimMonad (ContT r m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (ContT r m) #

Methods

primitive :: (State# (PrimState (ContT r m)) -> (# State# (PrimState (ContT r m)), a #)) -> ContT r m a

(Monoid w, PrimMonad m) => PrimMonad (RWST r w s m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (RWST r w s m) #

Methods

primitive :: (State# (PrimState (RWST r w s m)) -> (# State# (PrimState (RWST r w s m)), a #)) -> RWST r w s m a

(Monoid w, PrimMonad m) => PrimMonad (RWST r w s m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (RWST r w s m) #

Methods

primitive :: (State# (PrimState (RWST r w s m)) -> (# State# (PrimState (RWST r w s m)), a #)) -> RWST r w s m a

(Monoid w, PrimMonad m) => PrimMonad (RWST r w s m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (RWST r w s m) #

Methods

primitive :: (State# (PrimState (RWST r w s m)) -> (# State# (PrimState (RWST r w s m)), a #)) -> RWST r w s m a

PrimMonad m => PrimMonad (Pipe l i o u m) 
Instance details

Defined in Data.Conduit.Internal.Pipe

Associated Types

type PrimState (Pipe l i o u m) #

Methods

primitive :: (State# (PrimState (Pipe l i o u m)) -> (# State# (PrimState (Pipe l i o u m)), a #)) -> Pipe l i o u m a

type family PrimState (m :: Type -> Type) #

Instances

Instances details
type PrimState IO 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ST s) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ST s) = s
type PrimState (ST s) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ST s) = s
type PrimState (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

type PrimState (ResourceT m) = PrimState m
type PrimState (ListT m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ListT m) = PrimState m
type PrimState (MaybeT m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (MaybeT m) = PrimState m
type PrimState (AccumT w m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (AccumT w m) = PrimState m
type PrimState (ErrorT e m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ErrorT e m) = PrimState m
type PrimState (ExceptT e m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ExceptT e m) = PrimState m
type PrimState (IdentityT m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (IdentityT m) = PrimState m
type PrimState (ReaderT r m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ReaderT r m) = PrimState m
type PrimState (SelectT r m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (SelectT r m) = PrimState m
type PrimState (StateT s m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (StateT s m) = PrimState m
type PrimState (StateT s m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (StateT s m) = PrimState m
type PrimState (WriterT w m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (WriterT w m) = PrimState m
type PrimState (WriterT w m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (WriterT w m) = PrimState m
type PrimState (WriterT w m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (WriterT w m) = PrimState m
type PrimState (ConduitT i o m) 
Instance details

Defined in Data.Conduit.Internal.Conduit

type PrimState (ConduitT i o m) = PrimState m
type PrimState (ContT r m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ContT r m) = PrimState m
type PrimState (RWST r w s m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (RWST r w s m) = PrimState m
type PrimState (RWST r w s m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (RWST r w s m) = PrimState m
type PrimState (RWST r w s m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (RWST r w s m) = PrimState m
type PrimState (Pipe l i o u m) 
Instance details

Defined in Data.Conduit.Internal.Pipe

type PrimState (Pipe l i o u m) = PrimState m

data MutVar s a #

Constructors

MutVar (MutVar# s a) 

Instances

Instances details
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 #

MutableAtomicRef (MutVar s a) 
Instance details

Defined in Data.Mutable.Class

Methods

atomicModifyRef :: (PrimMonad m, PrimState m ~ MCState (MutVar s a)) => MutVar s a -> (RefElement (MutVar s a) -> (RefElement (MutVar s a), a0)) -> m a0 #

atomicModifyRef' :: (PrimMonad m, PrimState m ~ MCState (MutVar s a)) => MutVar s a -> (RefElement (MutVar s a) -> (RefElement (MutVar s a), a0)) -> m a0 #

Monoid w => MutableCollection (MutVar s w) 
Instance details

Defined in Data.Mutable.Class

Associated Types

type CollElement (MutVar s w) #

Methods

newColl :: (PrimMonad m, PrimState m ~ MCState (MutVar s w)) => m (MutVar s w) #

MutableContainer (MutVar s a) 
Instance details

Defined in Data.Mutable.Class

Associated Types

type MCState (MutVar s a) #

IsSequence a => MutablePopBack (MutVar s a) 
Instance details

Defined in Data.Mutable.Class

Methods

popBack :: (PrimMonad m, PrimState m ~ MCState (MutVar s a)) => MutVar s a -> m (Maybe (CollElement (MutVar s a))) #

IsSequence a => MutablePopFront (MutVar s a) 
Instance details

Defined in Data.Mutable.Class

Methods

popFront :: (PrimMonad m, PrimState m ~ MCState (MutVar s a)) => MutVar s a -> m (Maybe (CollElement (MutVar s a))) #

IsSequence a => MutablePushBack (MutVar s a) 
Instance details

Defined in Data.Mutable.Class

Methods

pushBack :: (PrimMonad m, PrimState m ~ MCState (MutVar s a)) => MutVar s a -> CollElement (MutVar s a) -> m () #

IsSequence a => MutablePushFront (MutVar s a) 
Instance details

Defined in Data.Mutable.Class

Methods

pushFront :: (PrimMonad m, PrimState m ~ MCState (MutVar s a)) => MutVar s a -> CollElement (MutVar s a) -> m () #

MutableRef (MutVar s a) 
Instance details

Defined in Data.Mutable.Class

Associated Types

type RefElement (MutVar s a) #

Methods

newRef :: (PrimMonad m, PrimState m ~ MCState (MutVar s a)) => RefElement (MutVar s a) -> m (MutVar s a) #

readRef :: (PrimMonad m, PrimState m ~ MCState (MutVar s a)) => MutVar s a -> m (RefElement (MutVar s a)) #

writeRef :: (PrimMonad m, PrimState m ~ MCState (MutVar s a)) => MutVar s a -> RefElement (MutVar s a) -> m () #

modifyRef :: (PrimMonad m, PrimState m ~ MCState (MutVar s a)) => MutVar s a -> (RefElement (MutVar s a) -> RefElement (MutVar s a)) -> m () #

modifyRef' :: (PrimMonad m, PrimState m ~ MCState (MutVar s a)) => MutVar s a -> (RefElement (MutVar s a) -> RefElement (MutVar s a)) -> m () #

type CollElement (MutVar s w) 
Instance details

Defined in Data.Mutable.Class

type CollElement (MutVar s w) = Element w
type MCState (MutVar s a) 
Instance details

Defined in Data.Mutable.Class

type MCState (MutVar s a) = s
type RefElement (MutVar s a) 
Instance details

Defined in Data.Mutable.Class

type RefElement (MutVar s a) = a

class Prim a #

Minimal complete definition

sizeOf#, alignment#, indexByteArray#, readByteArray#, writeByteArray#, setByteArray#, indexOffAddr#, readOffAddr#, writeOffAddr#, setOffAddr#

Instances

Instances details
Prim CBool 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CBool -> Int#

alignment# :: CBool -> Int#

indexByteArray# :: ByteArray# -> Int# -> CBool

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CBool #)

writeByteArray# :: MutableByteArray# s -> Int# -> CBool -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CBool -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CBool

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CBool #)

writeOffAddr# :: Addr# -> Int# -> CBool -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CBool -> State# s -> State# s

Prim CChar 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CChar -> Int#

alignment# :: CChar -> Int#

indexByteArray# :: ByteArray# -> Int# -> CChar

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CChar #)

writeByteArray# :: MutableByteArray# s -> Int# -> CChar -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CChar -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CChar

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CChar #)

writeOffAddr# :: Addr# -> Int# -> CChar -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CChar -> State# s -> State# s

Prim CClock 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CClock -> Int#

alignment# :: CClock -> Int#

indexByteArray# :: ByteArray# -> Int# -> CClock

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CClock #)

writeByteArray# :: MutableByteArray# s -> Int# -> CClock -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CClock -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CClock

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CClock #)

writeOffAddr# :: Addr# -> Int# -> CClock -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CClock -> State# s -> State# s

Prim CDouble 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CDouble -> Int#

alignment# :: CDouble -> Int#

indexByteArray# :: ByteArray# -> Int# -> CDouble

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CDouble #)

writeByteArray# :: MutableByteArray# s -> Int# -> CDouble -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CDouble -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CDouble

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CDouble #)

writeOffAddr# :: Addr# -> Int# -> CDouble -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CDouble -> State# s -> State# s

Prim CFloat 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CFloat -> Int#

alignment# :: CFloat -> Int#

indexByteArray# :: ByteArray# -> Int# -> CFloat

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CFloat #)

writeByteArray# :: MutableByteArray# s -> Int# -> CFloat -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CFloat -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CFloat

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CFloat #)

writeOffAddr# :: Addr# -> Int# -> CFloat -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CFloat -> State# s -> State# s

Prim CInt 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CInt -> Int#

alignment# :: CInt -> Int#

indexByteArray# :: ByteArray# -> Int# -> CInt

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CInt #)

writeByteArray# :: MutableByteArray# s -> Int# -> CInt -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CInt -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CInt

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CInt #)

writeOffAddr# :: Addr# -> Int# -> CInt -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CInt -> State# s -> State# s

Prim CIntMax 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CIntMax -> Int#

alignment# :: CIntMax -> Int#

indexByteArray# :: ByteArray# -> Int# -> CIntMax

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CIntMax #)

writeByteArray# :: MutableByteArray# s -> Int# -> CIntMax -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CIntMax -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CIntMax

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CIntMax #)

writeOffAddr# :: Addr# -> Int# -> CIntMax -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CIntMax -> State# s -> State# s

Prim CIntPtr 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CIntPtr -> Int#

alignment# :: CIntPtr -> Int#

indexByteArray# :: ByteArray# -> Int# -> CIntPtr

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CIntPtr #)

writeByteArray# :: MutableByteArray# s -> Int# -> CIntPtr -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CIntPtr -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CIntPtr

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CIntPtr #)

writeOffAddr# :: Addr# -> Int# -> CIntPtr -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CIntPtr -> State# s -> State# s

Prim CLLong 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CLLong -> Int#

alignment# :: CLLong -> Int#

indexByteArray# :: ByteArray# -> Int# -> CLLong

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CLLong #)

writeByteArray# :: MutableByteArray# s -> Int# -> CLLong -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CLLong -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CLLong

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CLLong #)

writeOffAddr# :: Addr# -> Int# -> CLLong -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CLLong -> State# s -> State# s

Prim CLong 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CLong -> Int#

alignment# :: CLong -> Int#

indexByteArray# :: ByteArray# -> Int# -> CLong

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CLong #)

writeByteArray# :: MutableByteArray# s -> Int# -> CLong -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CLong -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CLong

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CLong #)

writeOffAddr# :: Addr# -> Int# -> CLong -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CLong -> State# s -> State# s

Prim CPtrdiff 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CPtrdiff -> Int#

alignment# :: CPtrdiff -> Int#

indexByteArray# :: ByteArray# -> Int# -> CPtrdiff

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CPtrdiff #)

writeByteArray# :: MutableByteArray# s -> Int# -> CPtrdiff -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CPtrdiff -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CPtrdiff

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CPtrdiff #)

writeOffAddr# :: Addr# -> Int# -> CPtrdiff -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CPtrdiff -> State# s -> State# s

Prim CSChar 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CSChar -> Int#

alignment# :: CSChar -> Int#

indexByteArray# :: ByteArray# -> Int# -> CSChar

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CSChar #)

writeByteArray# :: MutableByteArray# s -> Int# -> CSChar -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CSChar -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CSChar

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CSChar #)

writeOffAddr# :: Addr# -> Int# -> CSChar -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CSChar -> State# s -> State# s

Prim CSUSeconds 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CSUSeconds -> Int#

alignment# :: CSUSeconds -> Int#

indexByteArray# :: ByteArray# -> Int# -> CSUSeconds

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CSUSeconds #)

writeByteArray# :: MutableByteArray# s -> Int# -> CSUSeconds -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CSUSeconds -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CSUSeconds

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CSUSeconds #)

writeOffAddr# :: Addr# -> Int# -> CSUSeconds -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CSUSeconds -> State# s -> State# s

Prim CShort 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CShort -> Int#

alignment# :: CShort -> Int#

indexByteArray# :: ByteArray# -> Int# -> CShort

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CShort #)

writeByteArray# :: MutableByteArray# s -> Int# -> CShort -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CShort -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CShort

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CShort #)

writeOffAddr# :: Addr# -> Int# -> CShort -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CShort -> State# s -> State# s

Prim CSigAtomic 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CSigAtomic -> Int#

alignment# :: CSigAtomic -> Int#

indexByteArray# :: ByteArray# -> Int# -> CSigAtomic

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CSigAtomic #)

writeByteArray# :: MutableByteArray# s -> Int# -> CSigAtomic -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CSigAtomic -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CSigAtomic

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CSigAtomic #)

writeOffAddr# :: Addr# -> Int# -> CSigAtomic -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CSigAtomic -> State# s -> State# s

Prim CSize 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CSize -> Int#

alignment# :: CSize -> Int#

indexByteArray# :: ByteArray# -> Int# -> CSize

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CSize #)

writeByteArray# :: MutableByteArray# s -> Int# -> CSize -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CSize -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CSize

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CSize #)

writeOffAddr# :: Addr# -> Int# -> CSize -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CSize -> State# s -> State# s

Prim CTime 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CTime -> Int#

alignment# :: CTime -> Int#

indexByteArray# :: ByteArray# -> Int# -> CTime

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CTime #)

writeByteArray# :: MutableByteArray# s -> Int# -> CTime -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CTime -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CTime

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CTime #)

writeOffAddr# :: Addr# -> Int# -> CTime -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CTime -> State# s -> State# s

Prim CUChar 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CUChar -> Int#

alignment# :: CUChar -> Int#

indexByteArray# :: ByteArray# -> Int# -> CUChar

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CUChar #)

writeByteArray# :: MutableByteArray# s -> Int# -> CUChar -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CUChar -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CUChar

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CUChar #)

writeOffAddr# :: Addr# -> Int# -> CUChar -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CUChar -> State# s -> State# s

Prim CUInt 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CUInt -> Int#

alignment# :: CUInt -> Int#

indexByteArray# :: ByteArray# -> Int# -> CUInt

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CUInt #)

writeByteArray# :: MutableByteArray# s -> Int# -> CUInt -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CUInt -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CUInt

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CUInt #)

writeOffAddr# :: Addr# -> Int# -> CUInt -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CUInt -> State# s -> State# s

Prim CUIntMax 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CUIntMax -> Int#

alignment# :: CUIntMax -> Int#

indexByteArray# :: ByteArray# -> Int# -> CUIntMax

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CUIntMax #)

writeByteArray# :: MutableByteArray# s -> Int# -> CUIntMax -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CUIntMax -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CUIntMax

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CUIntMax #)

writeOffAddr# :: Addr# -> Int# -> CUIntMax -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CUIntMax -> State# s -> State# s

Prim CUIntPtr 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CUIntPtr -> Int#

alignment# :: CUIntPtr -> Int#

indexByteArray# :: ByteArray# -> Int# -> CUIntPtr

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CUIntPtr #)

writeByteArray# :: MutableByteArray# s -> Int# -> CUIntPtr -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CUIntPtr -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CUIntPtr

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CUIntPtr #)

writeOffAddr# :: Addr# -> Int# -> CUIntPtr -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CUIntPtr -> State# s -> State# s

Prim CULLong 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CULLong -> Int#

alignment# :: CULLong -> Int#

indexByteArray# :: ByteArray# -> Int# -> CULLong

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CULLong #)

writeByteArray# :: MutableByteArray# s -> Int# -> CULLong -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CULLong -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CULLong

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CULLong #)

writeOffAddr# :: Addr# -> Int# -> CULLong -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CULLong -> State# s -> State# s

Prim CULong 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CULong -> Int#

alignment# :: CULong -> Int#

indexByteArray# :: ByteArray# -> Int# -> CULong

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CULong #)

writeByteArray# :: MutableByteArray# s -> Int# -> CULong -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CULong -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CULong

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CULong #)

writeOffAddr# :: Addr# -> Int# -> CULong -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CULong -> State# s -> State# s

Prim CUSeconds 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CUSeconds -> Int#

alignment# :: CUSeconds -> Int#

indexByteArray# :: ByteArray# -> Int# -> CUSeconds

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CUSeconds #)

writeByteArray# :: MutableByteArray# s -> Int# -> CUSeconds -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CUSeconds -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CUSeconds

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CUSeconds #)

writeOffAddr# :: Addr# -> Int# -> CUSeconds -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CUSeconds -> State# s -> State# s

Prim CUShort 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CUShort -> Int#

alignment# :: CUShort -> Int#

indexByteArray# :: ByteArray# -> Int# -> CUShort

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CUShort #)

writeByteArray# :: MutableByteArray# s -> Int# -> CUShort -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CUShort -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CUShort

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CUShort #)

writeOffAddr# :: Addr# -> Int# -> CUShort -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CUShort -> State# s -> State# s

Prim CWchar 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CWchar -> Int#

alignment# :: CWchar -> Int#

indexByteArray# :: ByteArray# -> Int# -> CWchar

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CWchar #)

writeByteArray# :: MutableByteArray# s -> Int# -> CWchar -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CWchar -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CWchar

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CWchar #)

writeOffAddr# :: Addr# -> Int# -> CWchar -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CWchar -> State# s -> State# s

Prim IntPtr 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: IntPtr -> Int#

alignment# :: IntPtr -> Int#

indexByteArray# :: ByteArray# -> Int# -> IntPtr

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, IntPtr #)

writeByteArray# :: MutableByteArray# s -> Int# -> IntPtr -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> IntPtr -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> IntPtr

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, IntPtr #)

writeOffAddr# :: Addr# -> Int# -> IntPtr -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> IntPtr -> State# s -> State# s

Prim WordPtr 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: WordPtr -> Int#

alignment# :: WordPtr -> Int#

indexByteArray# :: ByteArray# -> Int# -> WordPtr

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, WordPtr #)

writeByteArray# :: MutableByteArray# s -> Int# -> WordPtr -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> WordPtr -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> WordPtr

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, WordPtr #)

writeOffAddr# :: Addr# -> Int# -> WordPtr -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> WordPtr -> State# s -> State# s

Prim Int16 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: Int16 -> Int#

alignment# :: Int16 -> Int#

indexByteArray# :: ByteArray# -> Int# -> Int16

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, Int16 #)

writeByteArray# :: MutableByteArray# s -> Int# -> Int16 -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> Int16 -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> Int16

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, Int16 #)

writeOffAddr# :: Addr# -> Int# -> Int16 -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> Int16 -> State# s -> State# s

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

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

Prim Int8 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: Int8 -> Int#

alignment# :: Int8 -> Int#

indexByteArray# :: ByteArray# -> Int# -> Int8

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, Int8 #)

writeByteArray# :: MutableByteArray# s -> Int# -> Int8 -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> Int8 -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> Int8

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, Int8 #)

writeOffAddr# :: Addr# -> Int# -> Int8 -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> Int8 -> State# s -> State# s

Prim Word16 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: Word16 -> Int#

alignment# :: Word16 -> Int#

indexByteArray# :: ByteArray# -> Int# -> Word16

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, Word16 #)

writeByteArray# :: MutableByteArray# s -> Int# -> Word16 -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> Word16 -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> Word16

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, Word16 #)

writeOffAddr# :: Addr# -> Int# -> Word16 -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> Word16 -> State# s -> State# s

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

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

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

Prim CBlkCnt 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CBlkCnt -> Int#

alignment# :: CBlkCnt -> Int#

indexByteArray# :: ByteArray# -> Int# -> CBlkCnt

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CBlkCnt #)

writeByteArray# :: MutableByteArray# s -> Int# -> CBlkCnt -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CBlkCnt -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CBlkCnt

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CBlkCnt #)

writeOffAddr# :: Addr# -> Int# -> CBlkCnt -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CBlkCnt -> State# s -> State# s

Prim CBlkSize 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CBlkSize -> Int#

alignment# :: CBlkSize -> Int#

indexByteArray# :: ByteArray# -> Int# -> CBlkSize

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CBlkSize #)

writeByteArray# :: MutableByteArray# s -> Int# -> CBlkSize -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CBlkSize -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CBlkSize

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CBlkSize #)

writeOffAddr# :: Addr# -> Int# -> CBlkSize -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CBlkSize -> State# s -> State# s

Prim CCc 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CCc -> Int#

alignment# :: CCc -> Int#

indexByteArray# :: ByteArray# -> Int# -> CCc

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CCc #)

writeByteArray# :: MutableByteArray# s -> Int# -> CCc -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CCc -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CCc

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CCc #)

writeOffAddr# :: Addr# -> Int# -> CCc -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CCc -> State# s -> State# s

Prim CClockId 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CClockId -> Int#

alignment# :: CClockId -> Int#

indexByteArray# :: ByteArray# -> Int# -> CClockId

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CClockId #)

writeByteArray# :: MutableByteArray# s -> Int# -> CClockId -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CClockId -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CClockId

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CClockId #)

writeOffAddr# :: Addr# -> Int# -> CClockId -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CClockId -> State# s -> State# s

Prim CDev 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CDev -> Int#

alignment# :: CDev -> Int#

indexByteArray# :: ByteArray# -> Int# -> CDev

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CDev #)

writeByteArray# :: MutableByteArray# s -> Int# -> CDev -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CDev -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CDev

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CDev #)

writeOffAddr# :: Addr# -> Int# -> CDev -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CDev -> State# s -> State# s

Prim CFsBlkCnt 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CFsBlkCnt -> Int#

alignment# :: CFsBlkCnt -> Int#

indexByteArray# :: ByteArray# -> Int# -> CFsBlkCnt

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CFsBlkCnt #)

writeByteArray# :: MutableByteArray# s -> Int# -> CFsBlkCnt -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CFsBlkCnt -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CFsBlkCnt

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CFsBlkCnt #)

writeOffAddr# :: Addr# -> Int# -> CFsBlkCnt -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CFsBlkCnt -> State# s -> State# s

Prim CFsFilCnt 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CFsFilCnt -> Int#

alignment# :: CFsFilCnt -> Int#

indexByteArray# :: ByteArray# -> Int# -> CFsFilCnt

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CFsFilCnt #)

writeByteArray# :: MutableByteArray# s -> Int# -> CFsFilCnt -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CFsFilCnt -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CFsFilCnt

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CFsFilCnt #)

writeOffAddr# :: Addr# -> Int# -> CFsFilCnt -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CFsFilCnt -> State# s -> State# s

Prim CGid 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CGid -> Int#

alignment# :: CGid -> Int#

indexByteArray# :: ByteArray# -> Int# -> CGid

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CGid #)

writeByteArray# :: MutableByteArray# s -> Int# -> CGid -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CGid -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CGid

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CGid #)

writeOffAddr# :: Addr# -> Int# -> CGid -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CGid -> State# s -> State# s

Prim CId 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CId -> Int#

alignment# :: CId -> Int#

indexByteArray# :: ByteArray# -> Int# -> CId

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CId #)

writeByteArray# :: MutableByteArray# s -> Int# -> CId -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CId -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CId

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CId #)

writeOffAddr# :: Addr# -> Int# -> CId -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CId -> State# s -> State# s

Prim CIno 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CIno -> Int#

alignment# :: CIno -> Int#

indexByteArray# :: ByteArray# -> Int# -> CIno

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CIno #)

writeByteArray# :: MutableByteArray# s -> Int# -> CIno -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CIno -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CIno

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CIno #)

writeOffAddr# :: Addr# -> Int# -> CIno -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CIno -> State# s -> State# s

Prim CKey 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CKey -> Int#

alignment# :: CKey -> Int#

indexByteArray# :: ByteArray# -> Int# -> CKey

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CKey #)

writeByteArray# :: MutableByteArray# s -> Int# -> CKey -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CKey -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CKey

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CKey #)

writeOffAddr# :: Addr# -> Int# -> CKey -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CKey -> State# s -> State# s

Prim CMode 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CMode -> Int#

alignment# :: CMode -> Int#

indexByteArray# :: ByteArray# -> Int# -> CMode

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CMode #)

writeByteArray# :: MutableByteArray# s -> Int# -> CMode -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CMode -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CMode

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CMode #)

writeOffAddr# :: Addr# -> Int# -> CMode -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CMode -> State# s -> State# s

Prim CNlink 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CNlink -> Int#

alignment# :: CNlink -> Int#

indexByteArray# :: ByteArray# -> Int# -> CNlink

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CNlink #)

writeByteArray# :: MutableByteArray# s -> Int# -> CNlink -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CNlink -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CNlink

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CNlink #)

writeOffAddr# :: Addr# -> Int# -> CNlink -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CNlink -> State# s -> State# s

Prim COff 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: COff -> Int#

alignment# :: COff -> Int#

indexByteArray# :: ByteArray# -> Int# -> COff

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, COff #)

writeByteArray# :: MutableByteArray# s -> Int# -> COff -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> COff -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> COff

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, COff #)

writeOffAddr# :: Addr# -> Int# -> COff -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> COff -> State# s -> State# s

Prim CPid 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CPid -> Int#

alignment# :: CPid -> Int#

indexByteArray# :: ByteArray# -> Int# -> CPid

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CPid #)

writeByteArray# :: MutableByteArray# s -> Int# -> CPid -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CPid -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CPid

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CPid #)

writeOffAddr# :: Addr# -> Int# -> CPid -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CPid -> State# s -> State# s

Prim CRLim 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CRLim -> Int#

alignment# :: CRLim -> Int#

indexByteArray# :: ByteArray# -> Int# -> CRLim

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CRLim #)

writeByteArray# :: MutableByteArray# s -> Int# -> CRLim -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CRLim -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CRLim

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CRLim #)

writeOffAddr# :: Addr# -> Int# -> CRLim -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CRLim -> State# s -> State# s

Prim CSpeed 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CSpeed -> Int#

alignment# :: CSpeed -> Int#

indexByteArray# :: ByteArray# -> Int# -> CSpeed

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CSpeed #)

writeByteArray# :: MutableByteArray# s -> Int# -> CSpeed -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CSpeed -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CSpeed

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CSpeed #)

writeOffAddr# :: Addr# -> Int# -> CSpeed -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CSpeed -> State# s -> State# s

Prim CSsize 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CSsize -> Int#

alignment# :: CSsize -> Int#

indexByteArray# :: ByteArray# -> Int# -> CSsize

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CSsize #)

writeByteArray# :: MutableByteArray# s -> Int# -> CSsize -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CSsize -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CSsize

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CSsize #)

writeOffAddr# :: Addr# -> Int# -> CSsize -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CSsize -> State# s -> State# s

Prim CTcflag 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CTcflag -> Int#

alignment# :: CTcflag -> Int#

indexByteArray# :: ByteArray# -> Int# -> CTcflag

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CTcflag #)

writeByteArray# :: MutableByteArray# s -> Int# -> CTcflag -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CTcflag -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CTcflag

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CTcflag #)

writeOffAddr# :: Addr# -> Int# -> CTcflag -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CTcflag -> State# s -> State# s

Prim CTimer 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CTimer -> Int#

alignment# :: CTimer -> Int#

indexByteArray# :: ByteArray# -> Int# -> CTimer

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CTimer #)

writeByteArray# :: MutableByteArray# s -> Int# -> CTimer -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CTimer -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CTimer

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CTimer #)

writeOffAddr# :: Addr# -> Int# -> CTimer -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CTimer -> State# s -> State# s

Prim CUid 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: CUid -> Int#

alignment# :: CUid -> Int#

indexByteArray# :: ByteArray# -> Int# -> CUid

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, CUid #)

writeByteArray# :: MutableByteArray# s -> Int# -> CUid -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> CUid -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> CUid

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, CUid #)

writeOffAddr# :: Addr# -> Int# -> CUid -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> CUid -> State# s -> State# s

Prim Fd 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: Fd -> Int#

alignment# :: Fd -> Int#

indexByteArray# :: ByteArray# -> Int# -> Fd

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, Fd #)

writeByteArray# :: MutableByteArray# s -> Int# -> Fd -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> Fd -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> Fd

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, Fd #)

writeOffAddr# :: Addr# -> Int# -> Fd -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> Fd -> State# s -> State# s

Prim IPv4 
Instance details

Defined in Net.IPv4

Methods

sizeOf# :: IPv4 -> Int#

alignment# :: IPv4 -> Int#

indexByteArray# :: ByteArray# -> Int# -> IPv4

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, IPv4 #)

writeByteArray# :: MutableByteArray# s -> Int# -> IPv4 -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> IPv4 -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> IPv4

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, IPv4 #)

writeOffAddr# :: Addr# -> Int# -> IPv4 -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> IPv4 -> State# s -> State# s

Prim IPv6 
Instance details

Defined in Net.IPv6

Methods

sizeOf# :: IPv6 -> Int#

alignment# :: IPv6 -> Int#

indexByteArray# :: ByteArray# -> Int# -> IPv6

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, IPv6 #)

writeByteArray# :: MutableByteArray# s -> Int# -> IPv6 -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> IPv6 -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> IPv6

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, IPv6 #)

writeOffAddr# :: Addr# -> Int# -> IPv6 -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> IPv6 -> State# s -> State# s

Prim Int128 
Instance details

Defined in Data.WideWord.Int128

Methods

sizeOf# :: Int128 -> Int#

alignment# :: Int128 -> Int#

indexByteArray# :: ByteArray# -> Int# -> Int128

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, Int128 #)

writeByteArray# :: MutableByteArray# s -> Int# -> Int128 -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> Int128 -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> Int128

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, Int128 #)

writeOffAddr# :: Addr# -> Int# -> Int128 -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> Int128 -> State# s -> State# s

Prim Word128 
Instance details

Defined in Data.WideWord.Word128

Methods

sizeOf# :: Word128 -> Int#

alignment# :: Word128 -> Int#

indexByteArray# :: ByteArray# -> Int# -> Word128

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, Word128 #)

writeByteArray# :: MutableByteArray# s -> Int# -> Word128 -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> Word128 -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> Word128

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, Word128 #)

writeOffAddr# :: Addr# -> Int# -> Word128 -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> Word128 -> State# s -> State# s

Prim Word256 
Instance details

Defined in Data.WideWord.Word256

Methods

sizeOf# :: Word256 -> Int#

alignment# :: Word256 -> Int#

indexByteArray# :: ByteArray# -> Int# -> Word256

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, Word256 #)

writeByteArray# :: MutableByteArray# s -> Int# -> Word256 -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> Word256 -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> Word256

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, Word256 #)

writeOffAddr# :: Addr# -> Int# -> Word256 -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> Word256 -> State# s -> State# s

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

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

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

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

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

Prim a => Prim (Identity a) 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: Identity a -> Int#

alignment# :: Identity a -> Int#

indexByteArray# :: ByteArray# -> Int# -> Identity a

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, Identity a #)

writeByteArray# :: MutableByteArray# s -> Int# -> Identity a -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> Identity a -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> Identity a

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, Identity a #)

writeOffAddr# :: Addr# -> Int# -> Identity a -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> Identity a -> State# s -> State# s

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

Prim a => Prim (First a) 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: First a -> Int#

alignment# :: First a -> Int#

indexByteArray# :: ByteArray# -> Int# -> First a

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, First a #)

writeByteArray# :: MutableByteArray# s -> Int# -> First a -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> First a -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> First a

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, First a #)

writeOffAddr# :: Addr# -> Int# -> First a -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> First a -> State# s -> State# s

Prim a => Prim (Last a) 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: Last a -> Int#

alignment# :: Last a -> Int#

indexByteArray# :: ByteArray# -> Int# -> Last a

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, Last a #)

writeByteArray# :: MutableByteArray# s -> Int# -> Last a -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> Last a -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> Last a

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, Last a #)

writeOffAddr# :: Addr# -> Int# -> Last a -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> Last a -> State# s -> State# s

Prim a => Prim (Max a) 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: Max a -> Int#

alignment# :: Max a -> Int#

indexByteArray# :: ByteArray# -> Int# -> Max a

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, Max a #)

writeByteArray# :: MutableByteArray# s -> Int# -> Max a -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> Max a -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> Max a

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, Max a #)

writeOffAddr# :: Addr# -> Int# -> Max a -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> Max a -> State# s -> State# s

Prim a => Prim (Min a) 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: Min a -> Int#

alignment# :: Min a -> Int#

indexByteArray# :: ByteArray# -> Int# -> Min a

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, Min a #)

writeByteArray# :: MutableByteArray# s -> Int# -> Min a -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> Min a -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> Min a

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, Min a #)

writeOffAddr# :: Addr# -> Int# -> Min a -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> Min a -> State# s -> State# s

Prim a => Prim (Dual a) 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: Dual a -> Int#

alignment# :: Dual a -> Int#

indexByteArray# :: ByteArray# -> Int# -> Dual a

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, Dual a #)

writeByteArray# :: MutableByteArray# s -> Int# -> Dual a -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> Dual a -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> Dual a

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, Dual a #)

writeOffAddr# :: Addr# -> Int# -> Dual a -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> Dual a -> State# s -> State# s

Prim a => Prim (Product a) 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: Product a -> Int#

alignment# :: Product a -> Int#

indexByteArray# :: ByteArray# -> Int# -> Product a

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, Product a #)

writeByteArray# :: MutableByteArray# s -> Int# -> Product a -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> Product a -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> Product a

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, Product a #)

writeOffAddr# :: Addr# -> Int# -> Product a -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> Product a -> State# s -> State# s

Prim a => Prim (Sum a) 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: Sum a -> Int#

alignment# :: Sum a -> Int#

indexByteArray# :: ByteArray# -> Int# -> Sum a

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, Sum a #)

writeByteArray# :: MutableByteArray# s -> Int# -> Sum a -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> Sum a -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> Sum a

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, Sum a #)

writeOffAddr# :: Addr# -> Int# -> Sum a -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> Sum a -> State# s -> State# s

Prim (FunPtr a) 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: FunPtr a -> Int#

alignment# :: FunPtr a -> Int#

indexByteArray# :: ByteArray# -> Int# -> FunPtr a

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, FunPtr a #)

writeByteArray# :: MutableByteArray# s -> Int# -> FunPtr a -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> FunPtr a -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> FunPtr a

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, FunPtr a #)

writeOffAddr# :: Addr# -> Int# -> FunPtr a -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> FunPtr a -> State# s -> State# s

Prim (Ptr a) 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: Ptr a -> Int#

alignment# :: Ptr a -> Int#

indexByteArray# :: ByteArray# -> Int# -> Ptr a

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, Ptr a #)

writeByteArray# :: MutableByteArray# s -> Int# -> Ptr a -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> Ptr a -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> Ptr a

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, Ptr a #)

writeOffAddr# :: Addr# -> Int# -> Ptr a -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> Ptr a -> State# s -> State# s

Prim (StablePtr a) 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: StablePtr a -> Int#

alignment# :: StablePtr a -> Int#

indexByteArray# :: ByteArray# -> Int# -> StablePtr a

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, StablePtr a #)

writeByteArray# :: MutableByteArray# s -> Int# -> StablePtr a -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> StablePtr a -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> StablePtr a

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, StablePtr a #)

writeOffAddr# :: Addr# -> Int# -> StablePtr a -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> StablePtr a -> State# s -> State# s

Prim a => Prim (Const a b) 
Instance details

Defined in Data.Primitive.Types

Methods

sizeOf# :: Const a b -> Int#

alignment# :: Const a b -> Int#

indexByteArray# :: ByteArray# -> Int# -> Const a b

readByteArray# :: MutableByteArray# s -> Int# -> State# s -> (# State# s, Const a b #)

writeByteArray# :: MutableByteArray# s -> Int# -> Const a b -> State# s -> State# s

setByteArray# :: MutableByteArray# s -> Int# -> Int# -> Const a b -> State# s -> State# s

indexOffAddr# :: Addr# -> Int# -> Const a b

readOffAddr# :: Addr# -> Int# -> State# s -> (# State# s, Const a b #)

writeOffAddr# :: Addr# -> Int# -> Const a b -> State# s -> State# s

setOffAddr# :: Addr# -> Int# -> Int# -> Const a b -> State# s -> State# s

data TBQueue a #

Instances

Instances details
Eq (TBQueue a) 
Instance details

Defined in Control.Concurrent.STM.TBQueue

Methods

(==) :: TBQueue a -> TBQueue a -> Bool #

(/=) :: TBQueue a -> TBQueue a -> Bool #

data TChan a #

Instances

Instances details
Eq (TChan a) 
Instance details

Defined in Control.Concurrent.STM.TChan

Methods

(==) :: TChan a -> TChan a -> Bool #

(/=) :: TChan a -> TChan a -> Bool #

data TMVar a #

Instances

Instances details
Eq (TMVar a) 
Instance details

Defined in Control.Concurrent.STM.TMVar

Methods

(==) :: TMVar a -> TMVar a -> Bool #

(/=) :: TMVar a -> TMVar a -> Bool #

data TQueue a #

Instances

Instances details
Eq (TQueue a) 
Instance details

Defined in Control.Concurrent.STM.TQueue

Methods

(==) :: TQueue a -> TQueue a -> Bool #

(/=) :: TQueue a -> TQueue a -> Bool #

data TBChan a #

data TBMChan a #

data TBMQueue a #

data TMChan a #

data TMQueue a #

newtype ReaderT r (m :: Type -> Type) a #

Constructors

ReaderT 

Fields

Instances

Instances details
MonadParsec e s m => MonadParsec e s (ReaderT r m) 
Instance details

Defined in Text.Megaparsec.Class

Methods

parseError :: ParseError s e -> ReaderT r m a

label :: String -> ReaderT r m a -> ReaderT r m a

hidden :: ReaderT r m a -> ReaderT r m a

try :: ReaderT r m a -> ReaderT r m a

lookAhead :: ReaderT r m a -> ReaderT r m a

notFollowedBy :: ReaderT r m a -> ReaderT r m ()

withRecovery :: (ParseError s e -> ReaderT r m a) -> ReaderT r m a -> ReaderT r m a

observing :: ReaderT r m a -> ReaderT r m (Either (ParseError s e) a)

eof :: ReaderT r m ()

token :: (Token s -> Maybe a) -> Set (ErrorItem (Token s)) -> ReaderT r m a

tokens :: (Tokens s -> Tokens s -> Bool) -> Tokens s -> ReaderT r m (Tokens s)

takeWhileP :: Maybe String -> (Token s -> Bool) -> ReaderT r m (Tokens s)

takeWhile1P :: Maybe String -> (Token s -> Bool) -> ReaderT r m (Tokens s)

takeP :: Maybe String -> Int -> ReaderT r m (Tokens s)

getParserState :: ReaderT r m (State s e)

updateParserState :: (State s e -> State s e) -> ReaderT r m ()

Monad m => MonadReader r (ReaderT r m) 
Instance details

Defined in Control.Monad.Reader.Class

Methods

ask :: ReaderT r m r #

local :: (r -> r) -> ReaderT r m a -> ReaderT r m a

reader :: (r -> a) -> ReaderT r m a

MonadState s m => MonadState s (ReaderT r m) 
Instance details

Defined in Control.Monad.State.Class

Methods

get :: ReaderT r m s

put :: s -> ReaderT r m ()

state :: (s -> (a, s)) -> ReaderT r m a

MonadTrans (ReaderT r) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

lift :: Monad m => m a -> ReaderT r m a #

Representable m => Representable (ReaderT e m) 
Instance details

Defined in Data.Functor.Rep

Associated Types

type Rep (ReaderT e m)

Methods

tabulate :: (Rep (ReaderT e m) -> a) -> ReaderT e m a

index :: ReaderT e m a -> Rep (ReaderT e m) -> a

MonadFail m => MonadFail (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

fail :: String -> ReaderT r m a #

MonadFix m => MonadFix (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

mfix :: (a -> ReaderT r m a) -> ReaderT r m a

MonadIO m => MonadIO (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

liftIO :: IO a -> ReaderT r m a #

MonadZip m => MonadZip (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

mzip :: ReaderT r m a -> ReaderT r m b -> ReaderT r m (a, b)

mzipWith :: (a -> b -> c) -> ReaderT r m a -> ReaderT r m b -> ReaderT r m c

munzip :: ReaderT r m (a, b) -> (ReaderT r m a, ReaderT r m b)

Contravariant m => Contravariant (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

contramap :: (a' -> a) -> ReaderT r m a -> ReaderT r m a'

(>$) :: b -> ReaderT r m b -> ReaderT r m a

Alternative m => Alternative (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

empty :: ReaderT r m a #

(<|>) :: ReaderT r m a -> ReaderT r m a -> ReaderT r m a #

some :: ReaderT r m a -> ReaderT r m [a] #

many :: ReaderT r m a -> ReaderT r m [a] #

Applicative m => Applicative (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

pure :: a -> ReaderT r m a #

(<*>) :: ReaderT r m (a -> b) -> ReaderT r m a -> ReaderT r m b #

liftA2 :: (a -> b -> c) -> ReaderT r m a -> ReaderT r m b -> ReaderT r m c #

(*>) :: ReaderT r m a -> ReaderT r m b -> ReaderT r m b #

(<*) :: ReaderT r m a -> ReaderT r m b -> ReaderT r m a #

Functor m => Functor (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

fmap :: (a -> b) -> ReaderT r m a -> ReaderT r m b #

(<$) :: a -> ReaderT r m b -> ReaderT r m a #

Monad m => Monad (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

(>>=) :: ReaderT r m a -> (a -> ReaderT r m b) -> ReaderT r m b #

(>>) :: ReaderT r m a -> ReaderT r m b -> ReaderT r m b #

return :: a -> ReaderT r m a #

MonadPlus m => MonadPlus (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Reader

Methods

mzero :: ReaderT r m a #

mplus :: ReaderT r m a -> ReaderT r m a -> ReaderT r m a #

Zip m => Zip (ReaderT e m) 
Instance details

Defined in Data.ChunkedZip

Methods

zipWith :: (a -> b -> c) -> ReaderT e m a -> ReaderT e m b -> ReaderT e m c #

zip :: ReaderT e m a -> ReaderT e m b -> ReaderT e m (a, b) #

zap :: ReaderT e m (a -> b) -> ReaderT e m a -> ReaderT e m b

unzip :: ReaderT e m (a, b) -> (ReaderT e m a, ReaderT e m b) #

MonadCatch m => MonadCatch (ReaderT r m) 
Instance details

Defined in Control.Monad.Catch

Methods

catch :: Exception e => ReaderT r m a -> (e -> ReaderT r m a) -> ReaderT r m a

MonadMask m => MonadMask (ReaderT r m) 
Instance details

Defined in Control.Monad.Catch

Methods

mask :: ((forall a. ReaderT r m a -> ReaderT r m a) -> ReaderT r m b) -> ReaderT r m b

uninterruptibleMask :: ((forall a. ReaderT r m a -> ReaderT r m a) -> ReaderT r m b) -> ReaderT r m b

generalBracket :: ReaderT r m a -> (a -> ExitCase b -> ReaderT r m c) -> (a -> ReaderT r m b) -> ReaderT r m (b, c)

MonadThrow m => MonadThrow (ReaderT r m) 
Instance details

Defined in Control.Monad.Catch

Methods

throwM :: Exception e => e -> ReaderT r m a

Indexable m => Indexable (ReaderT e m) 
Instance details

Defined in Data.Key

Methods

index :: ReaderT e m a -> Key (ReaderT e m) -> a

Keyed m => Keyed (ReaderT e m) 
Instance details

Defined in Data.Key

Methods

mapWithKey :: (Key (ReaderT e m) -> a -> b) -> ReaderT e m a -> ReaderT e m b

Lookup m => Lookup (ReaderT e m) 
Instance details

Defined in Data.Key

Methods

lookup :: Key (ReaderT e m) -> ReaderT e m a -> Maybe a

Zip m => Zip (ReaderT e m) 
Instance details

Defined in Data.Key

Methods

zipWith :: (a -> b -> c) -> ReaderT e m a -> ReaderT e m b -> ReaderT e m c

zip :: ReaderT e m a -> ReaderT e m b -> ReaderT e m (a, b)

zap :: ReaderT e m (a -> b) -> ReaderT e m a -> ReaderT e m b

ZipWithKey m => ZipWithKey (ReaderT e m) 
Instance details

Defined in Data.Key

Methods

zipWithKey :: (Key (ReaderT e m) -> a -> b -> c) -> ReaderT e m a -> ReaderT e m b -> ReaderT e m c

zapWithKey :: ReaderT e m (Key (ReaderT e m) -> a -> b) -> ReaderT e m a -> ReaderT e m b

PrimMonad m => PrimMonad (ReaderT r m) 
Instance details

Defined in Control.Monad.Primitive

Associated Types

type PrimState (ReaderT r m) #

Methods

primitive :: (State# (PrimState (ReaderT r m)) -> (# State# (PrimState (ReaderT r m)), a #)) -> ReaderT r m a

MonadResource m => MonadResource (ReaderT r m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

liftResourceT :: ResourceT IO a -> ReaderT r m a

MonadUnliftIO m => MonadUnliftIO (ReaderT r m) 
Instance details

Defined in Control.Monad.IO.Unlift

Methods

withRunInIO :: ((forall a. ReaderT r m a -> IO a) -> IO b) -> ReaderT r m b #

FunctorWithIndex i m => FunctorWithIndex (e, i) (ReaderT e m) 
Instance details

Defined in WithIndex

Methods

imap :: ((e, i) -> a -> b) -> ReaderT e m a -> ReaderT e m b

Monad m => Magnify (ReaderT b m) (ReaderT a m) b a 
Instance details

Defined in Control.Lens.Zoom

Methods

magnify :: ((Functor (Magnified (ReaderT b m) c), Contravariant (Magnified (ReaderT b m) c)) => LensLike' (Magnified (ReaderT b m) c) a b) -> ReaderT b m c -> ReaderT a m c

Zoom m n s t => Zoom (ReaderT e m) (ReaderT e n) s t 
Instance details

Defined in Control.Lens.Zoom

Methods

zoom :: LensLike' (Zoomed (ReaderT e m) c) t s -> ReaderT e m c -> ReaderT e n c

Wrapped (ReaderT r m a) 
Instance details

Defined in Control.Lens.Wrapped

Associated Types

type Unwrapped (ReaderT r m a)

Methods

_Wrapped' :: Iso' (ReaderT r m a) (Unwrapped (ReaderT r m a))

Functor m => MonoFunctor (ReaderT r m a) 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element (ReaderT r m a) -> Element (ReaderT r m a)) -> ReaderT r m a -> ReaderT r m a #

Applicative m => MonoPointed (ReaderT r m a) 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element (ReaderT r m a) -> ReaderT r m a #

t ~ ReaderT s n b => Rewrapped (ReaderT r m a) t 
Instance details

Defined in Control.Lens.Wrapped

type Rep1 (ReaderT r m :: Type -> Type) 
Instance details

Defined in Control.Monad.Trans.Instances

type Rep1 (ReaderT r m :: Type -> Type) = D1 ('MetaData "ReaderT" "Control.Monad.Trans.Reader" "transformers-0.5.6.2" 'True) (C1 ('MetaCons "ReaderT" 'PrefixI 'True) (S1 ('MetaSel ('Just "runReaderT") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) ((FUN 'Many r :: Type -> Type) :.: Rec1 m)))
type Rep (ReaderT e m) 
Instance details

Defined in Data.Functor.Rep

type Rep (ReaderT e m) = (e, Rep m)
type Key (ReaderT e m) 
Instance details

Defined in Data.Key

type Key (ReaderT e m) = (e, Key m)
type Magnified (ReaderT b m) 
Instance details

Defined in Control.Lens.Zoom

type Magnified (ReaderT b m) = Effect m
type Zoomed (ReaderT e m) 
Instance details

Defined in Control.Lens.Zoom

type Zoomed (ReaderT e m) = Zoomed m
type PrimState (ReaderT r m) 
Instance details

Defined in Control.Monad.Primitive

type PrimState (ReaderT r m) = PrimState m
type Rep (ReaderT r m a) 
Instance details

Defined in Control.Monad.Trans.Instances

type Rep (ReaderT r m a) = D1 ('MetaData "ReaderT" "Control.Monad.Trans.Reader" "transformers-0.5.6.2" 'True) (C1 ('MetaCons "ReaderT" 'PrefixI 'True) (S1 ('MetaSel ('Just "runReaderT") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (r -> m a))))
type Unwrapped (ReaderT r m a) 
Instance details

Defined in Control.Lens.Wrapped

type Unwrapped (ReaderT r m a) = r -> m a
type Element (ReaderT r m a) 
Instance details

Defined in Data.MonoTraversable

type Element (ReaderT r m a) = a

data ConcException #

Instances

Instances details
Exception ConcException 
Instance details

Defined in UnliftIO.Internals.Async

Generic ConcException 
Instance details

Defined in UnliftIO.Internals.Async

Associated Types

type Rep ConcException :: Type -> Type

Show ConcException 
Instance details

Defined in UnliftIO.Internals.Async

Methods

showsPrec :: Int -> ConcException -> ShowS #

show :: ConcException -> String

showList :: [ConcException] -> ShowS #

Eq ConcException 
Instance details

Defined in UnliftIO.Internals.Async

Ord ConcException 
Instance details

Defined in UnliftIO.Internals.Async

type Rep ConcException 
Instance details

Defined in UnliftIO.Internals.Async

type Rep ConcException = D1 ('MetaData "ConcException" "UnliftIO.Internals.Async" "unliftio-0.2.25.0-3z7NugumSP7HIM6jxIA4M7" 'False) (C1 ('MetaCons "EmptyWithNoAlternative" 'PrefixI 'False) (U1 :: Type -> Type))

newtype Concurrently (m :: Type -> Type) a #

Constructors

Concurrently 

Fields

Instances

Instances details
MonadUnliftIO m => Alternative (Concurrently m) 
Instance details

Defined in UnliftIO.Internals.Async

Methods

empty :: Concurrently m a #

(<|>) :: Concurrently m a -> Concurrently m a -> Concurrently m a #

some :: Concurrently m a -> Concurrently m [a] #

many :: Concurrently m a -> Concurrently m [a] #

MonadUnliftIO m => Applicative (Concurrently m) 
Instance details

Defined in UnliftIO.Internals.Async

Methods

pure :: a -> Concurrently m a #

(<*>) :: Concurrently m (a -> b) -> Concurrently m a -> Concurrently m b #

liftA2 :: (a -> b -> c) -> Concurrently m a -> Concurrently m b -> Concurrently m c #

(*>) :: Concurrently m a -> Concurrently m b -> Concurrently m b #

(<*) :: Concurrently m a -> Concurrently m b -> Concurrently m a #

Monad m => Functor (Concurrently m) 
Instance details

Defined in UnliftIO.Internals.Async

Methods

fmap :: (a -> b) -> Concurrently m a -> Concurrently m b #

(<$) :: a -> Concurrently m b -> Concurrently m a #

(Semigroup a, Monoid a, MonadUnliftIO m) => Monoid (Concurrently m a) 
Instance details

Defined in UnliftIO.Internals.Async

(MonadUnliftIO m, Semigroup a) => Semigroup (Concurrently m a) 
Instance details

Defined in UnliftIO.Internals.Async

Methods

(<>) :: Concurrently m a -> Concurrently m a -> Concurrently m a #

sconcat :: NonEmpty (Concurrently m a) -> Concurrently m a #

stimes :: Integral b => b -> Concurrently m a -> Concurrently m a #

data Memoized a #

Instances

Instances details
Applicative Memoized 
Instance details

Defined in UnliftIO.Memoize

Methods

pure :: a -> Memoized a #

(<*>) :: Memoized (a -> b) -> Memoized a -> Memoized b #

liftA2 :: (a -> b -> c) -> Memoized a -> Memoized b -> Memoized c #

(*>) :: Memoized a -> Memoized b -> Memoized b #

(<*) :: Memoized a -> Memoized b -> Memoized a #

Functor Memoized 
Instance details

Defined in UnliftIO.Memoize

Methods

fmap :: (a -> b) -> Memoized a -> Memoized b #

(<$) :: a -> Memoized b -> Memoized a #

Monad Memoized 
Instance details

Defined in UnliftIO.Memoize

Methods

(>>=) :: Memoized a -> (a -> Memoized b) -> Memoized b #

(>>) :: Memoized a -> Memoized b -> Memoized b #

return :: a -> Memoized a #

Show (Memoized a) 
Instance details

Defined in UnliftIO.Memoize

Methods

showsPrec :: Int -> Memoized a -> ShowS #

show :: Memoized a -> String

showList :: [Memoized a] -> ShowS #

class MonadIO m => MonadUnliftIO (m :: Type -> Type) where #

Methods

withRunInIO :: ((forall a. m a -> IO a) -> IO b) -> m b #

Instances

Instances details
MonadUnliftIO IO 
Instance details

Defined in Control.Monad.IO.Unlift

Methods

withRunInIO :: ((forall a. IO a -> IO a) -> IO b) -> IO b #

MonadUnliftIO Minio 
Instance details

Defined in Network.Minio.Data

Methods

withRunInIO :: ((forall a. Minio a -> IO a) -> IO b) -> Minio b #

MonadUnliftIO m => MonadUnliftIO (ResourceT m) 
Instance details

Defined in Control.Monad.Trans.Resource.Internal

Methods

withRunInIO :: ((forall a. ResourceT m a -> IO a) -> IO b) -> ResourceT m b #

MonadUnliftIO m => MonadUnliftIO (IdentityT m) 
Instance details

Defined in Control.Monad.IO.Unlift

Methods

withRunInIO :: ((forall a. IdentityT m a -> IO a) -> IO b) -> IdentityT m b #

MonadUnliftIO m => MonadUnliftIO (ReaderT r m) 
Instance details

Defined in Control.Monad.IO.Unlift

Methods

withRunInIO :: ((forall a. ReaderT r m a -> IO a) -> IO b) -> ReaderT r m b #

data HashSet a #

Instances

Instances details
ToJSON1 HashSet 
Instance details

Defined in Data.Aeson.Types.ToJSON

Methods

liftToJSON :: (a -> Value) -> ([a] -> Value) -> HashSet a -> Value #

liftToJSONList :: (a -> Value) -> ([a] -> Value) -> [HashSet a] -> Value #

liftToEncoding :: (a -> Encoding) -> ([a] -> Encoding) -> HashSet a -> Encoding #

liftToEncodingList :: (a -> Encoding) -> ([a] -> Encoding) -> [HashSet a] -> Encoding #

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] #

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)

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)

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) #

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)

Methods

one :: OneItem (HashSet a) -> HashSet a

(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

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

data RealWorld #

Instances

Instances details
(FromField a, Typeable a) => FromField (IOVector a) 
Instance details

Defined in Database.PostgreSQL.Simple.FromField

Methods

fromField :: FieldParser (IOVector a)

data Double #

Instances

Instances details
FromJSON Double 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Double #

parseJSONList :: Value -> Parser [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]

Subtractive Double 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Double

Methods

(-) :: Double -> Double -> Difference Double

PrimType Double 
Instance details

Defined in Basement.PrimType

Associated Types

type PrimSize Double :: Nat

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

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 #

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 #

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

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)

Generic1 (URec Double :: k -> Type) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 (URec Double) :: k -> Type

Methods

from1 :: forall (a :: k0). URec Double a -> Rep1 (URec Double) a

to1 :: forall (a :: k0). Rep1 (URec Double) 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) #

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 #

Generic (URec Double p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Double p) :: 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
FromJSON Word 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Word #

parseJSONList :: Value -> Parser [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 ()

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] #

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 #

BitOps Word 
Instance details

Defined in Basement.Bits

Methods

(.&.) :: Word -> Word -> Word

(.|.) :: Word -> Word -> Word

(.^.) :: Word -> Word -> Word

(.<<.) :: Word -> CountOf Bool -> Word

(.>>.) :: Word -> CountOf Bool -> Word

bit :: Offset Bool -> Word

isBitSet :: Word -> Offset Bool -> Bool

setBit :: Word -> Offset Bool -> Word

clearBit :: Word -> Offset Bool -> Word

FiniteBitsOps Word 
Instance details

Defined in Basement.Bits

Methods

numberOfBits :: Word -> CountOf Bool

rotateL :: Word -> CountOf Bool -> Word

rotateR :: Word -> CountOf Bool -> Word

popCount :: Word -> CountOf Bool

bitFlip :: Word -> Word

countLeadingZeros :: Word -> CountOf Bool

countTrailingZeros :: Word -> CountOf Bool

Subtractive Word 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Word

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 :: Nat

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

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 #

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

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

IArray UArray Word 
Instance details

Defined in Data.Array.Base

Methods

bounds :: Ix i => UArray i Word -> (i, i)

numElements :: Ix i => UArray i Word -> Int

unsafeArray :: Ix i => (i, i) -> [(Int, Word)] -> UArray i Word

unsafeAt :: Ix i => UArray i Word -> Int -> Word

unsafeReplace :: Ix i => UArray i Word -> [(Int, Word)] -> UArray i Word

unsafeAccum :: Ix i => (Word -> e' -> Word) -> UArray i Word -> [(Int, e')] -> UArray i Word

unsafeAccumArray :: Ix i => (Word -> e' -> Word) -> Word -> (i, i) -> [(Int, e')] -> UArray i Word

Lift Word 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Word -> m Exp

liftTyped :: forall (m :: Type -> Type). Quote m => Word -> Code m Word

Vector Vector Word 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: Mutable Vector s Word -> ST s (Vector Word)

basicUnsafeThaw :: Vector Word -> ST s (Mutable Vector s Word)

basicLength :: Vector Word -> Int

basicUnsafeSlice :: Int -> Int -> Vector Word -> Vector Word

basicUnsafeIndexM :: Vector Word -> Int -> Box Word

basicUnsafeCopy :: Mutable Vector s Word -> Vector Word -> ST s ()

elemseq :: Vector Word -> Word -> b -> b

MVector MVector Word 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s Word -> Int

basicUnsafeSlice :: Int -> Int -> MVector s Word -> MVector s Word

basicOverlaps :: MVector s Word -> MVector s Word -> Bool

basicUnsafeNew :: Int -> ST s (MVector s Word)

basicInitialize :: MVector s Word -> ST s ()

basicUnsafeReplicate :: Int -> Word -> ST s (MVector s Word)

basicUnsafeRead :: MVector s Word -> Int -> ST s Word

basicUnsafeWrite :: MVector s Word -> Int -> Word -> ST s ()

basicClear :: MVector s Word -> ST s ()

basicSet :: MVector s Word -> Word -> ST s ()

basicUnsafeCopy :: MVector s Word -> MVector s Word -> ST s ()

basicUnsafeMove :: MVector s Word -> MVector s Word -> ST s ()

basicUnsafeGrow :: MVector s Word -> Int -> ST s (MVector s Word)

Generic1 (URec Word :: k -> Type) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep1 (URec Word) :: k -> Type

Methods

from1 :: forall (a :: k0). URec Word a -> Rep1 (URec Word) a

to1 :: forall (a :: k0). Rep1 (URec Word) 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) #

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 #

Generic (URec Word p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Word p) :: Type -> Type

Methods

from :: URec Word p -> Rep (URec Word p) x

to :: Rep (URec Word p) x -> URec Word p

Show (URec Word p) 
Instance details

Defined in GHC.Generics

Methods

showsPrec :: Int -> URec Word p -> ShowS #

show :: URec Word p -> String

showList :: [URec Word p] -> ShowS #

Eq (URec Word p) 
Instance details

Defined in GHC.Generics

Methods

(==) :: URec Word p -> URec Word p -> Bool #

(/=) :: URec Word p -> URec Word p -> Bool #

Ord (URec Word p) 
Instance details

Defined in GHC.Generics

Methods

compare :: URec Word p -> URec Word p -> Ordering #

(<) :: URec Word p -> URec Word p -> Bool #

(<=) :: URec Word p -> URec Word p -> Bool #

(>) :: URec Word p -> URec Word p -> Bool #

(>=) :: URec Word p -> URec Word p -> Bool #

max :: URec Word p -> URec Word p -> URec Word p #

min :: URec Word p -> URec Word p -> URec Word p #

type NatNumMaxBound Word 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Word = NatNumMaxBound Word64
type Difference Word 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Word = Word
type PrimSize Word 
Instance details

Defined in Basement.PrimType

type PrimSize Word = 8
newtype Vector Word 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector Word = V_Word (Vector Word)
data URec Word (p :: k) 
Instance details

Defined in GHC.Generics

data URec Word (p :: k) = UWord {}
newtype MVector s Word 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Word = MV_Word (MVector s Word)
type Rep1 (URec Word :: k -> Type) 
Instance details

Defined in GHC.Generics

type Rep1 (URec Word :: k -> Type) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UWord" 'PrefixI 'True) (S1 ('MetaSel ('Just "uWord#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UWord :: k -> Type)))
type Rep (URec Word p) 
Instance details

Defined in GHC.Generics

type Rep (URec Word p) = D1 ('MetaData "URec" "GHC.Generics" "base" 'False) (C1 ('MetaCons "UWord" 'PrefixI 'True) (S1 ('MetaSel ('Just "uWord#") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (UWord :: Type -> Type)))

data Ordering #

Constructors

LT 
EQ 
GT 

Instances

Instances details
FromJSON Ordering 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Ordering #

parseJSONList :: Value -> Parser [Ordering] #

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 :: Type -> Type

Methods

from :: Ordering -> Rep Ordering x

to :: Rep Ordering x -> Ordering

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 -> () #

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 ()

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)))

class Foldable (t :: Type -> Type) #

Minimal complete definition

foldMap | foldr

Instances

Instances details
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 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 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 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 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 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 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 (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 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 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 #

(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 (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 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 #

Foldable (Either e) 
Instance details

Defined in Data.Strict.Either

Methods

fold :: Monoid m => Either e m -> m

foldMap :: Monoid m => (a -> m) -> Either e a -> m

foldMap' :: Monoid m => (a -> m) -> Either e a -> m

foldr :: (a -> b -> b) -> b -> Either e a -> b #

foldr' :: (a -> b -> b) -> b -> Either e a -> b

foldl :: (b -> a -> b) -> b -> Either e a -> b #

foldl' :: (b -> a -> b) -> b -> Either e a -> b #

foldr1 :: (a -> a -> a) -> Either e a -> a #

foldl1 :: (a -> a -> a) -> Either e a -> a #

toList :: Either e a -> [a]

null :: Either e a -> Bool

length :: Either e a -> Int #

elem :: Eq a => a -> Either e a -> Bool #

maximum :: Ord a => Either e a -> a #

minimum :: Ord a => Either e a -> a #

sum :: Num a => Either e a -> a #

product :: Num a => Either e a -> a #

Foldable (These a) 
Instance details

Defined in Data.Strict.These

Methods

fold :: Monoid m => These a m -> m

foldMap :: Monoid m => (a0 -> m) -> These a a0 -> m

foldMap' :: Monoid m => (a0 -> m) -> These a a0 -> m

foldr :: (a0 -> b -> b) -> b -> These a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> These a a0 -> b

foldl :: (b -> a0 -> b) -> b -> These a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> These a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> These a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> These a a0 -> a0 #

toList :: These a a0 -> [a0]

null :: These a a0 -> Bool

length :: These a a0 -> Int #

elem :: Eq a0 => a0 -> These a a0 -> Bool #

maximum :: Ord a0 => These a a0 -> a0 #

minimum :: Ord a0 => These a a0 -> a0 #

sum :: Num a0 => These a a0 -> a0 #

product :: Num a0 => These a a0 -> a0 #

Foldable (Pair e) 
Instance details

Defined in Data.Strict.Tuple

Methods

fold :: Monoid m => Pair e m -> m

foldMap :: Monoid m => (a -> m) -> Pair e a -> m

foldMap' :: Monoid m => (a -> m) -> Pair e a -> m

foldr :: (a -> b -> b) -> b -> Pair e a -> b #

foldr' :: (a -> b -> b) -> b -> Pair e a -> b

foldl :: (b -> a -> b) -> b -> Pair e a -> b #

foldl' :: (b -> a -> b) -> b -> Pair e a -> b #

foldr1 :: (a -> a -> a) -> Pair e a -> a #

foldl1 :: (a -> a -> a) -> Pair e a -> a #

toList :: Pair e a -> [a]

null :: Pair e a -> Bool

length :: Pair e a -> Int #

elem :: Eq a => a -> Pair e a -> Bool #

maximum :: Ord a => Pair e a -> a #

minimum :: Ord a => Pair e a -> a #

sum :: Num a => Pair e a -> a #

product :: Num a => Pair e a -> a #

Foldable (These a) 
Instance details

Defined in Data.These

Methods

fold :: Monoid m => These a m -> m

foldMap :: Monoid m => (a0 -> m) -> These a a0 -> m

foldMap' :: Monoid m => (a0 -> m) -> These a a0 -> m

foldr :: (a0 -> b -> b) -> b -> These a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> These a a0 -> b

foldl :: (b -> a0 -> b) -> b -> These a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> These a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> These a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> These a a0 -> a0 #

toList :: These a a0 -> [a0]

null :: These a a0 -> Bool

length :: These a a0 -> Int #

elem :: Eq a0 => a0 -> These a a0 -> Bool #

maximum :: Ord a0 => These a a0 -> a0 #

minimum :: Ord a0 => These a a0 -> a0 #

sum :: Num a0 => These a a0 -> a0 #

product :: Num a0 => These a a0 -> a0 #

Foldable f => Foldable (Lift f) 
Instance details

Defined in Control.Applicative.Lift

Methods

fold :: Monoid m => Lift f m -> m

foldMap :: Monoid m => (a -> m) -> Lift f a -> m

foldMap' :: Monoid m => (a -> m) -> Lift f a -> m

foldr :: (a -> b -> b) -> b -> Lift f a -> b #

foldr' :: (a -> b -> b) -> b -> Lift f a -> b

foldl :: (b -> a -> b) -> b -> Lift f a -> b #

foldl' :: (b -> a -> b) -> b -> Lift f a -> b #

foldr1 :: (a -> a -> a) -> Lift f a -> a #

foldl1 :: (a -> a -> a) -> Lift f a -> a #

toList :: Lift f a -> [a]

null :: Lift f a -> Bool

length :: Lift f a -> Int #

elem :: Eq a => a -> Lift f a -> Bool #

maximum :: Ord a => Lift f a -> a #

minimum :: Ord a => Lift f a -> a #

sum :: Num a => Lift f a -> a #

product :: Num a => Lift f a -> a #

Foldable f => Foldable (MaybeT f) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

fold :: Monoid m => MaybeT f m -> m

foldMap :: Monoid m => (a -> m) -> MaybeT f a -> m

foldMap' :: Monoid m => (a -> m) -> MaybeT f a -> m

foldr :: (a -> b -> b) -> b -> MaybeT f a -> b #

foldr' :: (a -> b -> b) -> b -> MaybeT f a -> b

foldl :: (b -> a -> b) -> b -> MaybeT f a -> b #

foldl' :: (b -> a -> b) -> b -> MaybeT f a -> b #

foldr1 :: (a -> a -> a) -> MaybeT f a -> a #

foldl1 :: (a -> a -> a) -> MaybeT f a -> a #

toList :: MaybeT f a -> [a]

null :: MaybeT f a -> Bool

length :: MaybeT f a -> Int #

elem :: Eq a => a -> MaybeT f a -> Bool #

maximum :: Ord a => MaybeT f a -> a #

minimum :: Ord a => MaybeT f a -> a #

sum :: Num a => MaybeT f a -> a #

product :: Num a => MaybeT f a -> a #

Foldable (HashMap k) 
Instance details

Defined in Data.HashMap.Internal

Methods

fold :: Monoid m => HashMap k m -> m

foldMap :: Monoid m => (a -> m) -> HashMap k a -> m

foldMap' :: Monoid m => (a -> m) -> HashMap k a -> m

foldr :: (a -> b -> b) -> b -> HashMap k a -> b #

foldr' :: (a -> b -> b) -> b -> HashMap k a -> b

foldl :: (b -> a -> b) -> b -> HashMap k a -> b #

foldl' :: (b -> a -> b) -> b -> HashMap k a -> b #

foldr1 :: (a -> a -> a) -> HashMap k a -> a #

foldl1 :: (a -> a -> a) -> HashMap k a -> a #

toList :: HashMap k a -> [a]

null :: HashMap k a -> Bool

length :: HashMap k a -> Int #

elem :: Eq a => a -> HashMap k a -> Bool #

maximum :: Ord a => HashMap k a -> a #

minimum :: Ord a => HashMap k a -> a #

sum :: Num a => HashMap k a -> a #

product :: Num a => HashMap k a -> a #

Foldable ((,) a) 
Instance details

Defined in Data.Foldable

Methods

fold :: Monoid m => (a, m) -> m

foldMap :: Monoid m => (a0 -> m) -> (a, a0) -> m

foldMap' :: Monoid m => (a0 -> m) -> (a, a0) -> m

foldr :: (a0 -> b -> b) -> b -> (a, a0) -> b #

foldr' :: (a0 -> b -> b) -> b -> (a, a0) -> b

foldl :: (b -> a0 -> b) -> b -> (a, a0) -> b #

foldl' :: (b -> a0 -> b) -> b -> (a, a0) -> b #

foldr1 :: (a0 -> a0 -> a0) -> (a, a0) -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> (a, a0) -> a0 #

toList :: (a, a0) -> [a0]

null :: (a, a0) -> Bool

length :: (a, a0) -> Int #

elem :: Eq a0 => a0 -> (a, a0) -> Bool #

maximum :: Ord a0 => (a, a0) -> a0 #

minimum :: Ord a0 => (a, a0) -> a0 #

sum :: Num a0 => (a, a0) -> a0 #

product :: Num a0 => (a, a0) -> a0 #

Foldable (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 #

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 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 (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 (ErrorT e f) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

fold :: Monoid m => ErrorT e f m -> m

foldMap :: Monoid m => (a -> m) -> ErrorT e f a -> m

foldMap' :: Monoid m => (a -> m) -> ErrorT e f a -> m

foldr :: (a -> b -> b) -> b -> ErrorT e f a -> b #

foldr' :: (a -> b -> b) -> b -> ErrorT e f a -> b

foldl :: (b -> a -> b) -> b -> ErrorT e f a -> b #

foldl' :: (b -> a -> b) -> b -> ErrorT e f a -> b #

foldr1 :: (a -> a -> a) -> ErrorT e f a -> a #

foldl1 :: (a -> a -> a) -> ErrorT e f a -> a #

toList :: ErrorT e f a -> [a]

null :: ErrorT e f a -> Bool

length :: ErrorT e f a -> Int #

elem :: Eq a => a -> ErrorT e f a -> Bool #

maximum :: Ord a => ErrorT e f a -> a #

minimum :: Ord a => ErrorT e f a -> a #

sum :: Num a => ErrorT e f a -> a #

product :: Num a => ErrorT e 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 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 #

class (Functor t, Foldable t) => Traversable (t :: Type -> Type) where #

Minimal complete definition

traverse | sequenceA

Methods

traverse :: Applicative f => (a -> f b) -> t a -> f (t b) #

sequenceA :: Applicative f => t (f a) -> f (t a) #

mapM :: Monad m => (a -> m b) -> t a -> m (t b) #

sequence :: Monad m => t (m a) -> m (t a) #

Instances

Instances details
Traversable 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 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 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 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 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 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 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 (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) #

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 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 (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 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 ((,) 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 (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) #

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 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 (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 (ErrorT e f) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

traverse :: Applicative f0 => (a -> f0 b) -> ErrorT e f a -> f0 (ErrorT e f b) #

sequenceA :: Applicative f0 => ErrorT e f (f0 a) -> f0 (ErrorT e f a) #

mapM :: Monad m => (a -> m b) -> ErrorT e f a -> m (ErrorT e f b) #

sequence :: Monad m => ErrorT e f (m a) -> m (ErrorT e 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 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) #

class Semigroup a where #

Minimal complete definition

(<>)

Methods

(<>) :: a -> a -> a #

sconcat :: NonEmpty a -> a #

stimes :: Integral b => b -> a -> a #

Instances

Instances details
Semigroup Series 
Instance details

Defined in Data.Aeson.Encoding.Internal

Methods

(<>) :: Series -> Series -> Series #

sconcat :: NonEmpty Series -> Series #

stimes :: Integral b => b -> Series -> Series #

Semigroup Key 
Instance details

Defined in Data.Aeson.Key

Methods

(<>) :: Key -> Key -> Key #

sconcat :: NonEmpty Key -> Key #

stimes :: Integral b => b -> Key -> Key #

Semigroup More 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

(<>) :: More -> More -> More #

sconcat :: NonEmpty More -> More #

stimes :: Integral b => b -> More -> More #

Semigroup ByteArray 
Instance details

Defined in Data.Array.Byte

Methods

(<>) :: ByteArray -> ByteArray -> ByteArray #

sconcat :: NonEmpty ByteArray -> ByteArray #

stimes :: Integral b => b -> ByteArray -> ByteArray #

Semigroup All 
Instance details

Defined in Data.Semigroup.Internal

Methods

(<>) :: All -> All -> All #

sconcat :: NonEmpty All -> All #

stimes :: Integral b => b -> All -> All #

Semigroup Any 
Instance details

Defined in Data.Semigroup.Internal

Methods

(<>) :: Any -> Any -> Any #

sconcat :: NonEmpty Any -> Any #

stimes :: Integral b => b -> Any -> Any #

Semigroup Void 
Instance details

Defined in Data.Void

Methods

(<>) :: Void -> Void -> Void #

sconcat :: NonEmpty Void -> Void #

stimes :: Integral b => b -> Void -> Void #

Semigroup String 
Instance details

Defined in Basement.UTF8.Base

Methods

(<>) :: String -> String -> String #

sconcat :: NonEmpty String -> String #

stimes :: Integral b => b -> String -> String #

Semigroup Attribute 
Instance details

Defined in Text.Blaze.Internal

Methods

(<>) :: Attribute -> Attribute -> Attribute #

sconcat :: NonEmpty Attribute -> Attribute #

stimes :: Integral b => b -> Attribute -> Attribute #

Semigroup AttributeValue 
Instance details

Defined in Text.Blaze.Internal

Methods

(<>) :: AttributeValue -> AttributeValue -> AttributeValue #

sconcat :: NonEmpty AttributeValue -> AttributeValue #

stimes :: Integral b => b -> AttributeValue -> AttributeValue #

Semigroup ChoiceString 
Instance details

Defined in Text.Blaze.Internal

Methods

(<>) :: ChoiceString -> ChoiceString -> ChoiceString #

sconcat :: NonEmpty ChoiceString -> ChoiceString #

stimes :: Integral b => b -> ChoiceString -> ChoiceString #

Semigroup Bytes 
Instance details

Defined in Data.Bytes.Internal

Methods

(<>) :: Bytes -> Bytes -> Bytes #

sconcat :: NonEmpty Bytes -> Bytes #

stimes :: Integral b => b -> Bytes -> Bytes #

Semigroup Builder 
Instance details

Defined in Data.ByteString.Builder.Internal

Methods

(<>) :: Builder -> Builder -> Builder #

sconcat :: NonEmpty Builder -> Builder #

stimes :: Integral b => b -> Builder -> Builder #

Semigroup ByteString 
Instance details

Defined in Data.ByteString.Internal.Type

Semigroup ByteString 
Instance details

Defined in Data.ByteString.Lazy.Internal

Methods

(<>) :: ByteString -> ByteString -> ByteString #

sconcat :: NonEmpty ByteString -> ByteString #

stimes :: Integral b => b -> ByteString -> ByteString #

Semigroup ShortByteString 
Instance details

Defined in Data.ByteString.Short.Internal

Methods

(<>) :: ShortByteString -> ShortByteString -> ShortByteString #

sconcat :: NonEmpty ShortByteString -> ShortByteString #

stimes :: Integral b => b -> ShortByteString -> ShortByteString #

Semigroup IntSet 
Instance details

Defined in Data.IntSet.Internal

Methods

(<>) :: IntSet -> IntSet -> IntSet #

sconcat :: NonEmpty IntSet -> IntSet #

stimes :: Integral b => b -> IntSet -> IntSet #

Semigroup LogStr 
Instance details

Defined in System.Log.FastLogger.LogStr

Methods

(<>) :: LogStr -> LogStr -> LogStr #

sconcat :: NonEmpty LogStr -> LogStr #

stimes :: Integral b => b -> LogStr -> LogStr #

Semigroup UniqueSet 
Instance details

Defined in GHC.Cmm.Dataflow.Collections

Methods

(<>) :: UniqueSet -> UniqueSet -> UniqueSet #

sconcat :: NonEmpty UniqueSet -> UniqueSet #

stimes :: Integral b => b -> UniqueSet -> UniqueSet #

Semigroup LabelSet 
Instance details

Defined in GHC.Cmm.Dataflow.Label

Methods

(<>) :: LabelSet -> LabelSet -> LabelSet #

sconcat :: NonEmpty LabelSet -> LabelSet #

stimes :: Integral b => b -> LabelSet -> LabelSet #

Semigroup Ordering 
Instance details

Defined in GHC.Base

Methods

(<>) :: Ordering -> Ordering -> Ordering #

sconcat :: NonEmpty Ordering -> Ordering #

stimes :: Integral b => b -> Ordering -> Ordering #

Semigroup CookieJar 
Instance details

Defined in Network.HTTP.Client.Types

Methods

(<>) :: CookieJar -> CookieJar -> CookieJar #

sconcat :: NonEmpty CookieJar -> CookieJar #

stimes :: Integral b => b -> CookieJar -> CookieJar #

Semigroup RequestBody 
Instance details

Defined in Network.HTTP.Client.Types

Methods

(<>) :: RequestBody -> RequestBody -> RequestBody #

sconcat :: NonEmpty RequestBody -> RequestBody #

stimes :: Integral b => b -> RequestBody -> RequestBody #

Semigroup Pos 
Instance details

Defined in Text.Megaparsec.Pos

Methods

(<>) :: Pos -> Pos -> Pos #

sconcat :: NonEmpty Pos -> Pos #

stimes :: Integral b => b -> Pos -> Pos #

Semigroup ScrubbedBytes 
Instance details

Defined in Data.ByteArray.ScrubbedBytes

Methods

(<>) :: ScrubbedBytes -> ScrubbedBytes -> ScrubbedBytes #

sconcat :: NonEmpty ScrubbedBytes -> ScrubbedBytes #

stimes :: Integral b => b -> ScrubbedBytes -> ScrubbedBytes #

Semigroup AccessKey 
Instance details

Defined in Network.Minio.Credentials.Types

Methods

(<>) :: AccessKey -> AccessKey -> AccessKey #

sconcat :: NonEmpty AccessKey -> AccessKey #

stimes :: Integral b => b -> AccessKey -> AccessKey #

Semigroup SecretKey 
Instance details

Defined in Network.Minio.Credentials.Types

Methods

(<>) :: SecretKey -> SecretKey -> SecretKey #

sconcat :: NonEmpty SecretKey -> SecretKey #

stimes :: Integral b => b -> SecretKey -> SecretKey #

Semigroup SessionToken 
Instance details

Defined in Network.Minio.Credentials.Types

Methods

(<>) :: SessionToken -> SessionToken -> SessionToken #

sconcat :: NonEmpty SessionToken -> SessionToken #

stimes :: Integral b => b -> SessionToken -> SessionToken #

Semigroup CSVProp 
Instance details

Defined in Network.Minio.Data

Methods

(<>) :: CSVProp -> CSVProp -> CSVProp #

sconcat :: NonEmpty CSVProp -> CSVProp #

stimes :: Integral b => b -> CSVProp -> CSVProp #

Semigroup Query 
Instance details

Defined in Database.PostgreSQL.Simple.Types

Methods

(<>) :: Query -> Query -> Query #

sconcat :: NonEmpty Query -> Query #

stimes :: Integral b => b -> Query -> Query #

Semigroup Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Methods

(<>) :: Doc -> Doc -> Doc #

sconcat :: NonEmpty Doc -> Doc #

stimes :: Integral b => b -> Doc -> Doc #

Semigroup ShortText 
Instance details

Defined in Data.Text.Short.Internal

Methods

(<>) :: ShortText -> ShortText -> ShortText #

sconcat :: NonEmpty ShortText -> ShortText #

stimes :: Integral b => b -> ShortText -> ShortText #

Semigroup CalendarDiffDays 
Instance details

Defined in Data.Time.Calendar.CalendarDiffDays

Semigroup CalendarDiffTime 
Instance details

Defined in Data.Time.LocalTime.Internal.CalendarDiffTime

Semigroup SizeLimit 
Instance details

Defined in Network.WebSockets.Connection.Options

Methods

(<>) :: SizeLimit -> SizeLimit -> SizeLimit #

sconcat :: NonEmpty SizeLimit -> SizeLimit #

stimes :: Integral b => b -> SizeLimit -> SizeLimit #

Semigroup () 
Instance details

Defined in GHC.Base

Methods

(<>) :: () -> () -> () #

sconcat :: NonEmpty () -> () #

stimes :: Integral b => b -> () -> () #

Semigroup (KeyMap v) 
Instance details

Defined in Data.Aeson.KeyMap

Methods

(<>) :: KeyMap v -> KeyMap v -> KeyMap v #

sconcat :: NonEmpty (KeyMap v) -> KeyMap v #

stimes :: Integral b => b -> KeyMap v -> KeyMap v #

Semigroup (IResult a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

(<>) :: IResult a -> IResult a -> IResult a #

sconcat :: NonEmpty (IResult a) -> IResult a #

stimes :: Integral b => b -> IResult a -> IResult a #

Semigroup (Parser a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

(<>) :: Parser a -> Parser a -> Parser a #

sconcat :: NonEmpty (Parser a) -> Parser a #

stimes :: Integral b => b -> Parser a -> Parser a #

Semigroup (Result a) 
Instance details

Defined in Data.Aeson.Types.Internal

Methods

(<>) :: Result a -> Result a -> Result a #

sconcat :: NonEmpty (Result a) -> Result a #

stimes :: Integral b => b -> Result a -> Result a #

Semigroup a => Semigroup (Concurrently a) 
Instance details

Defined in Control.Concurrent.Async

Semigroup (Comparison a) 
Instance details

Defined in Data.Functor.Contravariant

Methods

(<>) :: Comparison a -> Comparison a -> Comparison a #

sconcat :: NonEmpty (Comparison a) -> Comparison a #

stimes :: Integral b => b -> Comparison a -> Comparison a #

Semigroup (Equivalence a) 
Instance details

Defined in Data.Functor.Contravariant

Methods

(<>) :: Equivalence a -> Equivalence a -> Equivalence a #

sconcat :: NonEmpty (Equivalence a) -> Equivalence a #

stimes :: Integral b => b -> Equivalence a -> Equivalence a #

Semigroup (Predicate a) 
Instance details

Defined in Data.Functor.Contravariant

Methods

(<>) :: Predicate a -> Predicate a -> Predicate a #

sconcat :: NonEmpty (Predicate a) -> Predicate a #

stimes :: Integral b => b -> Predicate a -> Predicate a #

Semigroup a => Semigroup (Identity a) 
Instance details

Defined in Data.Functor.Identity

Methods

(<>) :: Identity a -> Identity a -> Identity a #

sconcat :: NonEmpty (Identity a) -> Identity a #

stimes :: Integral b => b -> Identity a -> Identity a #

Semigroup (First a) 
Instance details

Defined in Data.Monoid

Methods

(<>) :: First a -> First a -> First a #

sconcat :: NonEmpty (First a) -> First a #

stimes :: Integral b => b -> First a -> First a #

Semigroup (Last a) 
Instance details

Defined in Data.Monoid

Methods

(<>) :: Last a -> Last a -> Last a #

sconcat :: NonEmpty (Last a) -> Last a #

stimes :: Integral b => b -> Last a -> Last a #

Semigroup a => Semigroup (Down a) 
Instance details

Defined in Data.Ord

Methods

(<>) :: Down a -> Down a -> Down a #

sconcat :: NonEmpty (Down a) -> Down a #

stimes :: Integral b => b -> Down a -> Down a #

Semigroup (First a) 
Instance details

Defined in Data.Semigroup

Methods

(<>) :: First a -> First a -> First a #

sconcat :: NonEmpty (First a) -> First a #

stimes :: Integral b => b -> First a -> First a #

Semigroup (Last a) 
Instance details

Defined in Data.Semigroup

Methods

(<>) :: Last a -> Last a -> Last a #

sconcat :: NonEmpty (Last a) -> Last a #

stimes :: Integral b => b -> Last a -> Last a #

Ord a => Semigroup (Max a) 
Instance details

Defined in Data.Semigroup

Methods

(<>) :: Max a -> Max a -> Max a #

sconcat :: NonEmpty (Max a) -> Max a #

stimes :: Integral b => b -> Max a -> Max a #

Ord a => Semigroup (Min a) 
Instance details

Defined in Data.Semigroup

Methods

(<>) :: Min a -> Min a -> Min a #

sconcat :: NonEmpty (Min a) -> Min a #

stimes :: Integral b => b -> Min a -> Min a #

Monoid m => Semigroup (WrappedMonoid m) 
Instance details

Defined in Data.Semigroup

Semigroup a => Semigroup (Dual a) 
Instance details

Defined in Data.Semigroup.Internal

Methods

(<>) :: Dual a -> Dual a -> Dual a #

sconcat :: NonEmpty (Dual a) -> Dual a #

stimes :: Integral b => b -> Dual a -> Dual a #

Semigroup (Endo a) 
Instance details

Defined in Data.Semigroup.Internal

Methods

(<>) :: Endo a -> Endo a -> Endo a #

sconcat :: NonEmpty (Endo a) -> Endo a #

stimes :: Integral b => b -> Endo a -> Endo a #

Num a => Semigroup (Product a) 
Instance details

Defined in Data.Semigroup.Internal

Methods

(<>) :: Product a -> Product a -> Product a #

sconcat :: NonEmpty (Product a) -> Product a #

stimes :: Integral b => b -> Product a -> Product a #

Num a => Semigroup (Sum a) 
Instance details

Defined in Data.Semigroup.Internal

Methods

(<>) :: Sum a -> Sum a -> Sum a #

sconcat :: NonEmpty (Sum a) -> Sum a #

stimes :: Integral b => b -> Sum a -> Sum a #

Semigroup a => Semigroup (STM a) 
Instance details

Defined in GHC.Conc.Sync

Methods

(<>) :: STM a -> STM a -> STM a #

sconcat :: NonEmpty (STM a) -> STM a #

stimes :: Integral b => b -> STM a -> STM a #

(Generic a, Semigroup (Rep a ())) => Semigroup (Generically a) 
Instance details

Defined in GHC.Generics

Methods

(<>) :: Generically a -> Generically a -> Generically a #

sconcat :: NonEmpty (Generically a) -> Generically a #

stimes :: Integral b => b -> Generically a -> Generically a #

Semigroup p => Semigroup (Par1 p) 
Instance details

Defined in GHC.Generics

Methods

(<>) :: Par1 p -> Par1 p -> Par1 p #

sconcat :: NonEmpty (Par1 p) -> Par1 p #

stimes :: Integral b => b -> Par1 p -> Par1 p #

PrimType ty => Semigroup (Block ty) 
Instance details

Defined in Basement.Block.Base

Methods

(<>) :: Block ty -> Block ty -> Block ty #

sconcat :: NonEmpty (Block ty) -> Block ty #

stimes :: Integral b => b -> Block ty -> Block ty #

Semigroup (CountOf ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

(<>) :: CountOf ty -> CountOf ty -> CountOf ty #

sconcat :: NonEmpty (CountOf ty) -> CountOf ty #

stimes :: Integral b => b -> CountOf ty -> CountOf ty #

PrimType ty => Semigroup (UArray ty) 
Instance details

Defined in Basement.UArray.Base

Methods

(<>) :: UArray ty -> UArray ty -> UArray ty #

sconcat :: NonEmpty (UArray ty) -> UArray ty #

stimes :: Integral b => b -> UArray ty -> UArray ty #

Monoid a => Semigroup (MarkupM a) 
Instance details

Defined in Text.Blaze.Internal

Methods

(<>) :: MarkupM a -> MarkupM a -> MarkupM a #

sconcat :: NonEmpty (MarkupM a) -> MarkupM a #

stimes :: Integral b => b -> MarkupM a -> MarkupM a #

Semigroup s => Semigroup (CI s) 
Instance details

Defined in Data.CaseInsensitive.Internal

Methods

(<>) :: CI s -> CI s -> CI s #

sconcat :: NonEmpty (CI s) -> CI s #

stimes :: Integral b => b -> CI s -> CI s #

Semigroup (PutM ()) 
Instance details

Defined in Data.Serialize.Put

Methods

(<>) :: PutM () -> PutM () -> PutM () #

sconcat :: NonEmpty (PutM ()) -> PutM () #

stimes :: Integral b => b -> PutM () -> PutM () #

Semigroup (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

(<>) :: IntMap a -> IntMap a -> IntMap a #

sconcat :: NonEmpty (IntMap a) -> IntMap a #

stimes :: Integral b => b -> IntMap a -> IntMap a #

Semigroup (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

(<>) :: Seq a -> Seq a -> Seq a #

sconcat :: NonEmpty (Seq a) -> Seq a #

stimes :: Integral b => b -> Seq a -> Seq a #

Ord a => Semigroup (Intersection a) 
Instance details

Defined in Data.Set.Internal

Methods

(<>) :: Intersection a -> Intersection a -> Intersection a #

sconcat :: NonEmpty (Intersection a) -> Intersection a #

stimes :: Integral b => b -> Intersection a -> Intersection a #

Semigroup (MergeSet a) 
Instance details

Defined in Data.Set.Internal

Methods

(<>) :: MergeSet a -> MergeSet a -> MergeSet a #

sconcat :: NonEmpty (MergeSet a) -> MergeSet a #

stimes :: Integral b => b -> MergeSet a -> MergeSet a #

Ord a => Semigroup (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

(<>) :: Set a -> Set a -> Set a #

sconcat :: NonEmpty (Set a) -> Set a #

stimes :: Integral b => b -> Set a -> Set a #

Semigroup (DNonEmpty a) 
Instance details

Defined in Data.DList.DNonEmpty.Internal

Methods

(<>) :: DNonEmpty a -> DNonEmpty a -> DNonEmpty a #

sconcat :: NonEmpty (DNonEmpty a) -> DNonEmpty a #

stimes :: Integral b => b -> DNonEmpty a -> DNonEmpty a #

Semigroup (DList a) 
Instance details

Defined in Data.DList.Internal

Methods

(<>) :: DList a -> DList a -> DList a #

sconcat :: NonEmpty (DList a) -> DList a #

stimes :: Integral b => b -> DList a -> DList a #

Semigroup (Bag a) 
Instance details

Defined in GHC.Data.Bag

Methods

(<>) :: Bag a -> Bag a -> Bag a #

sconcat :: NonEmpty (Bag a) -> Bag a #

stimes :: Integral b => b -> Bag a -> Bag a #

Semigroup a => Semigroup (IO a) 
Instance details

Defined in GHC.Base

Methods

(<>) :: IO a -> IO a -> IO a #

sconcat :: NonEmpty (IO a) -> IO a #

stimes :: Integral b => b -> IO a -> IO a #

Semigroup (Leftmost a) 
Instance details

Defined in Control.Lens.Internal.Fold

Methods

(<>) :: Leftmost a -> Leftmost a -> Leftmost a #

sconcat :: NonEmpty (Leftmost a) -> Leftmost a #

stimes :: Integral b => b -> Leftmost a -> Leftmost a #

Semigroup (NonEmptyDList a) 
Instance details

Defined in Control.Lens.Internal.Fold

Methods

(<>) :: NonEmptyDList a -> NonEmptyDList a -> NonEmptyDList a #

sconcat :: NonEmpty (NonEmptyDList a) -> NonEmptyDList a #

stimes :: Integral b => b -> NonEmptyDList a -> NonEmptyDList a #

Semigroup (Rightmost a) 
Instance details

Defined in Control.Lens.Internal.Fold

Methods

(<>) :: Rightmost a -> Rightmost a -> Rightmost a #

sconcat :: NonEmpty (Rightmost a) -> Rightmost a #

stimes :: Integral b => b -> Rightmost a -> Rightmost a #

Ord t => Semigroup (Hints t) 
Instance details

Defined in Text.Megaparsec.Internal

Methods

(<>) :: Hints t -> Hints t -> Hints t #

sconcat :: NonEmpty (Hints t) -> Hints t #

stimes :: Integral b => b -> Hints t -> Hints t #

(Semigroup mono, GrowingAppend mono) => Semigroup (NonNull mono) 
Instance details

Defined in Data.NonNull

Methods

(<>) :: NonNull mono -> NonNull mono -> NonNull mono #

sconcat :: NonEmpty (NonNull mono) -> NonNull mono #

stimes :: Integral b => b -> NonNull mono -> NonNull mono #

Semigroup (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Methods

(<>) :: Doc a -> Doc a -> Doc a #

sconcat :: NonEmpty (Doc a) -> Doc a #

stimes :: Integral b => b -> Doc a -> Doc a #

Semigroup (Array a) 
Instance details

Defined in Data.Primitive.Array

Methods

(<>) :: Array a -> Array a -> Array a #

sconcat :: NonEmpty (Array a) -> Array a #

stimes :: Integral b => b -> Array a -> Array a #

Semigroup (PrimArray a) 
Instance details

Defined in Data.Primitive.PrimArray

Methods

(<>) :: PrimArray a -> PrimArray a -> PrimArray a #

sconcat :: NonEmpty (PrimArray a) -> PrimArray a #

stimes :: Integral b => b -> PrimArray a -> PrimArray a #

Semigroup (SmallArray a) 
Instance details

Defined in Data.Primitive.SmallArray

Methods

(<>) :: SmallArray a -> SmallArray a -> SmallArray a #

sconcat :: NonEmpty (SmallArray a) -> SmallArray a #

stimes :: Integral b => b -> SmallArray a -> SmallArray a #

PrimUnlifted a => Semigroup (UnliftedArray a) 
Instance details

Defined in Data.Primitive.Unlifted.Array

Methods

(<>) :: UnliftedArray a -> UnliftedArray a -> UnliftedArray a #

sconcat :: NonEmpty (UnliftedArray a) -> UnliftedArray a #

stimes :: Integral b => b -> UnliftedArray a -> UnliftedArray a #

Monad m => Semigroup (RetryPolicyM m) 
Instance details

Defined in Control.Retry

Methods

(<>) :: RetryPolicyM m -> RetryPolicyM m -> RetryPolicyM m #

sconcat :: NonEmpty (RetryPolicyM m) -> RetryPolicyM m #

stimes :: Integral b => b -> RetryPolicyM m -> RetryPolicyM m #

Semigroup a => Semigroup (Maybe a) 
Instance details

Defined in Data.Strict.Maybe

Methods

(<>) :: Maybe a -> Maybe a -> Maybe a #

sconcat :: NonEmpty (Maybe a) -> Maybe a #

stimes :: Integral b => b -> Maybe a -> Maybe a #

Semigroup a => Semigroup (Q a) 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

(<>) :: Q a -> Q a -> Q a #

sconcat :: NonEmpty (Q a) -> Q a #

stimes :: Integral b => b -> Q a -> Q a #

(Hashable a, Eq a) => Semigroup (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Methods

(<>) :: HashSet a -> HashSet a -> HashSet a #

sconcat :: NonEmpty (HashSet a) -> HashSet a #

stimes :: Integral b => b -> HashSet a -> HashSet a #

Semigroup (Vault s) 
Instance details

Defined in Data.Vault.ST.Lazy

Methods

(<>) :: Vault s -> Vault s -> Vault s #

sconcat :: NonEmpty (Vault s) -> Vault s #

stimes :: Integral b => b -> Vault s -> Vault s #

Semigroup (Vector a) 
Instance details

Defined in Data.Vector

Methods

(<>) :: Vector a -> Vector a -> Vector a #

sconcat :: NonEmpty (Vector a) -> Vector a #

stimes :: Integral b => b -> Vector a -> Vector a #

Prim a => Semigroup (Vector a) 
Instance details

Defined in Data.Vector.Primitive

Methods

(<>) :: Vector a -> Vector a -> Vector a #

sconcat :: NonEmpty (Vector a) -> Vector a #

stimes :: Integral b => b -> Vector a -> Vector a #

Storable a => Semigroup (Vector a) 
Instance details

Defined in Data.Vector.Storable

Methods

(<>) :: Vector a -> Vector a -> Vector a #

sconcat :: NonEmpty (Vector a) -> Vector a #

stimes :: Integral b => b -> Vector a -> Vector a #

Semigroup (NonEmpty a) 
Instance details

Defined in GHC.Base

Methods

(<>) :: NonEmpty a -> NonEmpty a -> NonEmpty a #

sconcat :: NonEmpty (NonEmpty a) -> NonEmpty a #

stimes :: Integral b => b -> NonEmpty a -> NonEmpty a #

Semigroup a => Semigroup (Maybe a) 
Instance details

Defined in GHC.Base

Methods

(<>) :: Maybe a -> Maybe a -> Maybe a #

sconcat :: NonEmpty (Maybe a) -> Maybe a #

stimes :: Integral b => b -> Maybe a -> Maybe a #

Semigroup a => Semigroup (a) 
Instance details

Defined in GHC.Base

Methods

(<>) :: (a) -> (a) -> (a) #

sconcat :: NonEmpty (a) -> (a) #

stimes :: Integral b => b -> (a) -> (a) #

Semigroup [a] 
Instance details

Defined in GHC.Base

Methods

(<>) :: [a] -> [a] -> [a] #

sconcat :: NonEmpty [a] -> [a] #

stimes :: Integral b => b -> [a] -> [a] #

Semigroup (Parser i a) 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

(<>) :: Parser i a -> Parser i a -> Parser i a #

sconcat :: NonEmpty (Parser i a) -> Parser i a #

stimes :: Integral b => b -> Parser i a -> Parser i a #

Semigroup (Either a b) 
Instance details

Defined in Data.Either

Methods

(<>) :: Either a b -> Either a b -> Either a b #

sconcat :: NonEmpty (Either a b) -> Either a b #

stimes :: Integral b0 => b0 -> Either a b -> Either a b #

Semigroup a => Semigroup (Op a b) 
Instance details

Defined in Data.Functor.Contravariant

Methods

(<>) :: Op a b -> Op a b -> Op a b #

sconcat :: NonEmpty (Op a b) -> Op a b #

stimes :: Integral b0 => b0 -> Op a b -> Op a b #

Semigroup (Proxy s) 
Instance details

Defined in Data.Proxy

Methods

(<>) :: Proxy s -> Proxy s -> Proxy s #

sconcat :: NonEmpty (Proxy s) -> Proxy s #

stimes :: Integral b => b -> Proxy s -> Proxy s #

Semigroup (U1 p) 
Instance details

Defined in GHC.Generics

Methods

(<>) :: U1 p -> U1 p -> U1 p #

sconcat :: NonEmpty (U1 p) -> U1 p #

stimes :: Integral b => b -> U1 p -> U1 p #

Semigroup (V1 p) 
Instance details

Defined in GHC.Generics

Methods

(<>) :: V1 p -> V1 p -> V1 p #

sconcat :: NonEmpty (V1 p) -> V1 p #

stimes :: Integral b => b -> V1 p -> V1 p #

Semigroup a => Semigroup (ST s a) 
Instance details

Defined in GHC.ST

Methods

(<>) :: ST s a -> ST s a -> ST s a #

sconcat :: NonEmpty (ST s a) -> ST s a #

stimes :: Integral b => b -> ST s a -> ST s a #

Ord k => Semigroup (Map k v) 
Instance details

Defined in Data.Map.Internal

Methods

(<>) :: Map k v -> Map k v -> Map k v #

sconcat :: NonEmpty (Map k v) -> Map k v #

stimes :: Integral b => b -> Map k v -> Map k v #

Apply f => Semigroup (Act f a) 
Instance details

Defined in Data.Key

Methods

(<>) :: Act f a -> Act f a -> Act f a #

sconcat :: NonEmpty (Act f a) -> Act f a #

stimes :: Integral b => b -> Act f a -> Act f a #

(Contravariant f, Applicative f) => Semigroup (Folding f a) 
Instance details

Defined in Control.Lens.Internal.Fold

Methods

(<>) :: Folding f a -> Folding f a -> Folding f a #

sconcat :: NonEmpty (Folding f a) -> Folding f a #

stimes :: Integral b => b -> Folding f a -> Folding f a #

Monad m => Semigroup (Sequenced a m) 
Instance details

Defined in Control.Lens.Internal.Fold

Methods

(<>) :: Sequenced a m -> Sequenced a m -> Sequenced a m #

sconcat :: NonEmpty (Sequenced a m) -> Sequenced a m #

stimes :: Integral b => b -> Sequenced a m -> Sequenced a m #

Applicative f => Semigroup (Traversed a f) 
Instance details

Defined in Control.Lens.Internal.Fold

Methods

(<>) :: Traversed a f -> Traversed a f -> Traversed a f #

sconcat :: NonEmpty (Traversed a f) -> Traversed a f #

stimes :: Integral b => b -> Traversed a f -> Traversed a f #

Apply f => Semigroup (TraversedF a f) 
Instance details

Defined in Control.Lens.Internal.Fold

Methods

(<>) :: TraversedF a f -> TraversedF a f -> TraversedF a f #

sconcat :: NonEmpty (TraversedF a f) -> TraversedF a f #

stimes :: Integral b => b -> TraversedF a f -> TraversedF a f #

Semigroup (f a) => Semigroup (Indexing f a) 
Instance details

Defined in Control.Lens.Internal.Indexed

Methods

(<>) :: Indexing f a -> Indexing f a -> Indexing f a #

sconcat :: NonEmpty (Indexing f a) -> Indexing f a #

stimes :: Integral b => b -> Indexing f a -> Indexing f a #

Semigroup (Deepening i a) 
Instance details

Defined in Control.Lens.Internal.Level

Methods

(<>) :: Deepening i a -> Deepening i a -> Deepening i a #

sconcat :: NonEmpty (Deepening i a) -> Deepening i a #

stimes :: Integral b => b -> Deepening i a -> Deepening i a #

Semigroup (ReifiedFold s a) 
Instance details

Defined in Control.Lens.Reified

Methods

(<>) :: ReifiedFold s a -> ReifiedFold s a -> ReifiedFold s a #

sconcat :: NonEmpty (ReifiedFold s a) -> ReifiedFold s a #

stimes :: Integral b => b -> ReifiedFold s a -> ReifiedFold s a #

(Stream s, Ord e) => Semigroup (ParseError s e) 
Instance details

Defined in Text.Megaparsec.Error

Methods

(<>) :: ParseError s e -> ParseError s e -> ParseError s e #

sconcat :: NonEmpty (ParseError s e) -> ParseError s e #

stimes :: Integral b => b -> ParseError s e -> ParseError s e #

Semigroup (Either a b) 
Instance details

Defined in Data.Strict.Either

Methods

(<>) :: Either a b -> Either a b -> Either a b #

sconcat :: NonEmpty (Either a b) -> Either a b #

stimes :: Integral b0 => b0 -> Either a b -> Either a b #

(Semigroup a, Semigroup b) => Semigroup (These a b) 
Instance details

Defined in Data.Strict.These

Methods

(<>) :: These a b -> These a b -> These a b #

sconcat :: NonEmpty (These a b) -> These a b #

stimes :: Integral b0 => b0 -> These a b -> These a b #

(Semigroup a, Semigroup b) => Semigroup (Pair a b) 
Instance details

Defined in Data.Strict.Tuple

Methods

(<>) :: Pair a b -> Pair a b -> Pair a b #

sconcat :: NonEmpty (Pair a b) -> Pair a b #

stimes :: Integral b0 => b0 -> Pair a b -> Pair a b #

(Semigroup a, Semigroup b) => Semigroup (These a b) 
Instance details

Defined in Data.These

Methods

(<>) :: These a b -> These a b -> These a b #

sconcat :: NonEmpty (These a b) -> These a b #

stimes :: Integral b0 => b0 -> These a b -> These a b #

Semigroup (TypeRepMap f) 
Instance details

Defined in Data.TypeRepMap.Internal

Methods

(<>) :: TypeRepMap f -> TypeRepMap f -> TypeRepMap f #

sconcat :: NonEmpty (TypeRepMap f) -> TypeRepMap f #

stimes :: Integral b => b -> TypeRepMap f -> TypeRepMap f #

(MonadUnliftIO m, Semigroup a) => Semigroup (Conc m a) 
Instance details

Defined in UnliftIO.Internals.Async

Methods

(<>) :: Conc m a -> Conc m a -> Conc m a #

sconcat :: NonEmpty (Conc m a) -> Conc m a #

stimes :: Integral b => b -> Conc m a -> Conc m a #

(MonadUnliftIO m, Semigroup a) => Semigroup (Concurrently m a) 
Instance details

Defined in UnliftIO.Internals.Async

Methods

(<>) :: Concurrently m a -> Concurrently m a -> Concurrently m a #

sconcat :: NonEmpty (Concurrently m a) -> Concurrently m a #

stimes :: Integral b => b -> Concurrently m a -> Concurrently m a #

(Eq k, Hashable k) => Semigroup (HashMap k v) 
Instance details

Defined in Data.HashMap.Internal

Methods

(<>) :: HashMap k v -> HashMap k v -> HashMap k v #

sconcat :: NonEmpty (HashMap k v) -> HashMap k v #

stimes :: Integral b => b -> HashMap k v -> HashMap k v #

Semigroup b => Semigroup (a -> b) 
Instance details

Defined in GHC.Base

Methods

(<>) :: (a -> b) -> (a -> b) -> a -> b #

sconcat :: NonEmpty (a -> b) -> a -> b #

stimes :: Integral b0 => b0 -> (a -> b) -> a -> b #

(Semigroup a, Semigroup b) => Semigroup (a, b) 
Instance details

Defined in GHC.Base

Methods

(<>) :: (a, b) -> (a, b) -> (a, b) #

sconcat :: NonEmpty (a, b) -> (a, b) #

stimes :: Integral b0 => b0 -> (a, b) -> (a, b) #

Semigroup a => Semigroup (Const a b) 
Instance details

Defined in Data.Functor.Const

Methods

(<>) :: Const a b -> Const a b -> Const a b #

sconcat :: NonEmpty (Const a b) -> Const a b #

stimes :: Integral b0 => b0 -> Const a b -> Const a b #

(Applicative f, Semigroup a) => Semigroup (Ap f a) 
Instance details

Defined in Data.Monoid

Methods

(<>) :: Ap f a -> Ap f a -> Ap f a #

sconcat :: NonEmpty (Ap f a) -> Ap f a #

stimes :: Integral b => b -> Ap f a -> Ap f a #

Alternative f => Semigroup (Alt f a) 
Instance details

Defined in Data.Semigroup.Internal

Methods

(<>) :: Alt f a -> Alt f a -> Alt f a #

sconcat :: NonEmpty (Alt f a) -> Alt f a #

stimes :: Integral b => b -> Alt f a -> Alt f a #

Semigroup (f p) => Semigroup (Rec1 f p) 
Instance details

Defined in GHC.Generics

Methods

(<>) :: Rec1 f p -> Rec1 f p -> Rec1 f p #

sconcat :: NonEmpty (Rec1 f p) -> Rec1 f p #

stimes :: Integral b => b -> Rec1 f p -> Rec1 f p #

Monad m => Semigroup (Sequenced a m) 
Instance details

Defined in WithIndex

Methods

(<>) :: Sequenced a m -> Sequenced a m -> Sequenced a m #

sconcat :: NonEmpty (Sequenced a m) -> Sequenced a m #

stimes :: Integral b => b -> Sequenced a m -> Sequenced a m #

Applicative f => Semigroup (Traversed a f) 
Instance details

Defined in WithIndex

Methods

(<>) :: Traversed a f -> Traversed a f -> Traversed a f #

sconcat :: NonEmpty (Traversed a f) -> Traversed a f #

stimes :: Integral b => b -> Traversed a f -> Traversed a f #

Semigroup (ReifiedIndexedFold i s a) 
Instance details

Defined in Control.Lens.Reified

Methods

(<>) :: ReifiedIndexedFold i s a -> ReifiedIndexedFold i s a -> ReifiedIndexedFold i s a #

sconcat :: NonEmpty (ReifiedIndexedFold i s a) -> ReifiedIndexedFold i s a #

stimes :: Integral b => b -> ReifiedIndexedFold i s a -> ReifiedIndexedFold i s a #

Reifies s (ReifiedMonoid a) => Semigroup (ReflectedMonoid a s) 
Instance details

Defined in Data.Reflection

Methods

(<>) :: ReflectedMonoid a s -> ReflectedMonoid a s -> ReflectedMonoid a s #

sconcat :: NonEmpty (ReflectedMonoid a s) -> ReflectedMonoid a s #

stimes :: Integral b => b -> ReflectedMonoid a s -> ReflectedMonoid a s #

Semigroup a => Semigroup (Tagged s a) 
Instance details

Defined in Data.Tagged

Methods

(<>) :: Tagged s a -> Tagged s a -> Tagged s a #

sconcat :: NonEmpty (Tagged s a) -> Tagged s a #

stimes :: Integral b => b -> Tagged s a -> Tagged s a #

Semigroup a => Semigroup (Constant a b) 
Instance details

Defined in Data.Functor.Constant

Methods

(<>) :: Constant a b -> Constant a b -> Constant a b #

sconcat :: NonEmpty (Constant a b) -> Constant a b #

stimes :: Integral b0 => b0 -> Constant a b -> Constant a b #

(Semigroup a, Semigroup b, Semigroup c) => Semigroup (a, b, c) 
Instance details

Defined in GHC.Base

Methods

(<>) :: (a, b, c) -> (a, b, c) -> (a, b, c) #

sconcat :: NonEmpty (a, b, c) -> (a, b, c) #

stimes :: Integral b0 => b0 -> (a, b, c) -> (a, b, c) #

(Semigroup (f a), Semigroup (g a)) => Semigroup (Product f g a) 
Instance details

Defined in Data.Functor.Product

Methods

(<>) :: Product f g a -> Product f g a -> Product f g a #

sconcat :: NonEmpty (Product f g a) -> Product f g a #

stimes :: Integral b => b -> Product f g a -> Product f g a #

(Semigroup (f p), Semigroup (g p)) => Semigroup ((f :*: g) p) 
Instance details

Defined in GHC.Generics

Methods

(<>) :: (f :*: g) p -> (f :*: g) p -> (f :*: g) p #

sconcat :: NonEmpty ((f :*: g) p) -> (f :*: g) p #

stimes :: Integral b => b -> (f :*: g) p -> (f :*: g) p #

Semigroup c => Semigroup (K1 i c p) 
Instance details

Defined in GHC.Generics

Methods

(<>) :: K1 i c p -> K1 i c p -> K1 i c p #

sconcat :: NonEmpty (K1 i c p) -> K1 i c p #

stimes :: Integral b => b -> K1 i c p -> K1 i c p #

Monad m => Semigroup (ConduitT i o m ()) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

(<>) :: ConduitT i o m () -> ConduitT i o m () -> ConduitT i o m () #

sconcat :: NonEmpty (ConduitT i o m ()) -> ConduitT i o m () #

stimes :: Integral b => b -> ConduitT i o m () -> ConduitT i o m () #

(Stream s, Semigroup a) => Semigroup (ParsecT e s m a) 
Instance details

Defined in Text.Megaparsec.Internal

Methods

(<>) :: ParsecT e s m a -> ParsecT e s m a -> ParsecT e s m a #

sconcat :: NonEmpty (ParsecT e s m a) -> ParsecT e s m a #

stimes :: Integral b => b -> ParsecT e s m a -> ParsecT e s m a #

(Semigroup a, Semigroup b, Semigroup c, Semigroup d) => Semigroup (a, b, c, d) 
Instance details

Defined in GHC.Base

Methods

(<>) :: (a, b, c, d) -> (a, b, c, d) -> (a, b, c, d) #

sconcat :: NonEmpty (a, b, c, d) -> (a, b, c, d) #

stimes :: Integral b0 => b0 -> (a, b, c, d) -> (a, b, c, d) #

Semigroup (f (g a)) => Semigroup (Compose f g a) 
Instance details

Defined in Data.Functor.Compose

Methods

(<>) :: Compose f g a -> Compose f g a -> Compose f g a #

sconcat :: NonEmpty (Compose f g a) -> Compose f g a #

stimes :: Integral b => b -> Compose f g a -> Compose f g a #

Semigroup (f (g p)) => Semigroup ((f :.: g) p) 
Instance details

Defined in GHC.Generics

Methods

(<>) :: (f :.: g) p -> (f :.: g) p -> (f :.: g) p #

sconcat :: NonEmpty ((f :.: g) p) -> (f :.: g) p #

stimes :: Integral b => b -> (f :.: g) p -> (f :.: g) p #

Semigroup (f p) => Semigroup (M1 i c f p) 
Instance details

Defined in GHC.Generics

Methods

(<>) :: M1 i c f p -> M1 i c f p -> M1 i c f p #

sconcat :: NonEmpty (M1 i c f p) -> M1 i c f p #

stimes :: Integral b => b -> M1 i c f p -> M1 i c f p #

Contravariant g => Semigroup (BazaarT p g a b t) 
Instance details

Defined in Control.Lens.Internal.Bazaar

Methods

(<>) :: BazaarT p g a b t -> BazaarT p g a b t -> BazaarT p g a b t #

sconcat :: NonEmpty (BazaarT p g a b t) -> BazaarT p g a b t #

stimes :: Integral b0 => b0 -> BazaarT p g a b t -> BazaarT p g a b t #

Contravariant g => Semigroup (BazaarT1 p g a b t) 
Instance details

Defined in Control.Lens.Internal.Bazaar

Methods

(<>) :: BazaarT1 p g a b t -> BazaarT1 p g a b t -> BazaarT1 p g a b t #

sconcat :: NonEmpty (BazaarT1 p g a b t) -> BazaarT1 p g a b t #

stimes :: Integral b0 => b0 -> BazaarT1 p g a b t -> BazaarT1 p g a b t #

(Semigroup a, Semigroup b, Semigroup c, Semigroup d, Semigroup e) => Semigroup (a, b, c, d, e) 
Instance details

Defined in GHC.Base

Methods

(<>) :: (a, b, c, d, e) -> (a, b, c, d, e) -> (a, b, c, d, e) #

sconcat :: NonEmpty (a, b, c, d, e) -> (a, b, c, d, e) #

stimes :: Integral b0 => b0 -> (a, b, c, d, e) -> (a, b, c, d, e) #

Monad m => Semigroup (Pipe l i o u m ()) 
Instance details

Defined in Data.Conduit.Internal.Pipe

Methods

(<>) :: Pipe l i o u m () -> Pipe l i o u m () -> Pipe l i o u m () #

sconcat :: NonEmpty (Pipe l i o u m ()) -> Pipe l i o u m () #

stimes :: Integral b => b -> Pipe l i o u m () -> Pipe l i o u m () #

type Rational = Ratio Integer #

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 #

class Num a => Fractional a where #

Minimal complete definition

fromRational, (recip | (/))

Methods

(/) :: a -> a -> a #

recip :: a -> a #

fromRational :: Rational -> a #

Instances

Instances details
Fractional Number 
Instance details

Defined in Data.Attoparsec.Number

Methods

(/) :: Number -> Number -> Number #

recip :: Number -> Number #

fromRational :: Rational -> Number #

Fractional CDouble 
Instance details

Defined in Foreign.C.Types

Methods

(/) :: CDouble -> CDouble -> CDouble #

recip :: CDouble -> CDouble #

fromRational :: Rational -> CDouble #

Fractional CFloat 
Instance details

Defined in Foreign.C.Types

Methods

(/) :: CFloat -> CFloat -> CFloat #

recip :: CFloat -> CFloat #

fromRational :: Rational -> CFloat #

Fractional 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, 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 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 TimeSpec 
Instance details

Defined in System.Clock

Methods

quot :: TimeSpec -> TimeSpec -> TimeSpec #

rem :: TimeSpec -> TimeSpec -> TimeSpec #

div :: TimeSpec -> TimeSpec -> TimeSpec #

mod :: TimeSpec -> TimeSpec -> TimeSpec #

quotRem :: TimeSpec -> TimeSpec -> (TimeSpec, TimeSpec) #

divMod :: TimeSpec -> TimeSpec -> (TimeSpec, TimeSpec) #

toInteger :: TimeSpec -> 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 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 (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 #

class (Num a, Ord a) => Real a where #

Methods

toRational :: a -> Rational #

Instances

Instances details
Real Number 
Instance details

Defined in Data.Attoparsec.Number

Methods

toRational :: Number -> Rational #

Real CBool 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CBool -> Rational #

Real CChar 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CChar -> Rational #

Real CClock 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CClock -> Rational #

Real CDouble 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CDouble -> Rational #

Real CFloat 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CFloat -> Rational #

Real CInt 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CInt -> Rational #

Real CIntMax 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CIntMax -> Rational #

Real CIntPtr 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CIntPtr -> Rational #

Real CLLong 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CLLong -> Rational #

Real CLong 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CLong -> Rational #

Real CPtrdiff 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CPtrdiff -> Rational #

Real CSChar 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CSChar -> Rational #

Real CSUSeconds 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CSUSeconds -> Rational #

Real CShort 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CShort -> Rational #

Real CSigAtomic 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CSigAtomic -> Rational #

Real CSize 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CSize -> Rational #

Real CTime 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CTime -> Rational #

Real CUChar 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CUChar -> Rational #

Real CUInt 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CUInt -> Rational #

Real CUIntMax 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CUIntMax -> Rational #

Real CUIntPtr 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CUIntPtr -> Rational #

Real CULLong 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CULLong -> Rational #

Real CULong 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CULong -> Rational #

Real CUSeconds 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CUSeconds -> Rational #

Real CUShort 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CUShort -> Rational #

Real CWchar 
Instance details

Defined in Foreign.C.Types

Methods

toRational :: CWchar -> Rational #

Real 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 TimeSpec 
Instance details

Defined in System.Clock

Methods

toRational :: TimeSpec -> 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 DiffTime 
Instance details

Defined in Data.Time.Clock.Internal.DiffTime

Real NominalDiffTime 
Instance details

Defined in Data.Time.Clock.Internal.NominalDiffTime

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 (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 #

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 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 Pos 
Instance details

Defined in Data.Attoparsec.Internal.Types

Methods

compare :: Pos -> Pos -> Ordering #

(<) :: Pos -> Pos -> Bool #

(<=) :: Pos -> Pos -> Bool #

(>) :: Pos -> Pos -> Bool #

(>=) :: Pos -> Pos -> Bool #

max :: Pos -> Pos -> Pos #

min :: Pos -> Pos -> Pos #

Ord Number 
Instance details

Defined in Data.Attoparsec.Number

Methods

compare :: Number -> Number -> Ordering #

(<) :: Number -> Number -> Bool #

(<=) :: Number -> Number -> Bool #

(>) :: Number -> Number -> Bool #

(>=) :: Number -> Number -> Bool #

max :: Number -> Number -> Number #

min :: Number -> Number -> Number #

Ord ByteArray 
Instance details

Defined in Data.Array.Byte

Methods

compare :: ByteArray -> ByteArray -> Ordering #

(<) :: ByteArray -> ByteArray -> Bool #

(<=) :: ByteArray -> ByteArray -> Bool #

(>) :: ByteArray -> ByteArray -> Bool #

(>=) :: ByteArray -> ByteArray -> Bool #

max :: ByteArray -> ByteArray -> ByteArray #

min :: ByteArray -> ByteArray -> ByteArray #

Ord All 
Instance details

Defined in Data.Semigroup.Internal

Methods

compare :: All -> All -> Ordering #

(<) :: All -> All -> Bool #

(<=) :: All -> All -> Bool #

(>) :: All -> All -> Bool #

(>=) :: All -> All -> Bool #

max :: All -> All -> All #

min :: All -> All -> All #

Ord Any 
Instance details

Defined in Data.Semigroup.Internal

Methods

compare :: Any -> Any -> Ordering #

(<) :: Any -> Any -> Bool #

(<=) :: Any -> Any -> Bool #

(>) :: Any -> Any -> Bool #

(>=) :: Any -> Any -> Bool #

max :: Any -> Any -> Any #

min :: Any -> Any -> Any #

Ord SomeTypeRep 
Instance details

Defined in Data.Typeable.Internal

Methods

compare :: SomeTypeRep -> SomeTypeRep -> Ordering #

(<) :: SomeTypeRep -> SomeTypeRep -> Bool #

(<=) :: SomeTypeRep -> SomeTypeRep -> Bool #

(>) :: SomeTypeRep -> SomeTypeRep -> Bool #

(>=) :: SomeTypeRep -> SomeTypeRep -> Bool #

max :: SomeTypeRep -> SomeTypeRep -> SomeTypeRep #

min :: SomeTypeRep -> SomeTypeRep -> SomeTypeRep #

Ord Unique 
Instance details

Defined in Data.Unique

Methods

compare :: Unique -> Unique -> Ordering #

(<) :: Unique -> Unique -> Bool #

(<=) :: Unique -> Unique -> Bool #

(>) :: Unique -> Unique -> Bool #

(>=) :: Unique -> Unique -> Bool #

max :: Unique -> Unique -> Unique #

min :: Unique -> Unique -> Unique #

Ord Version 
Instance details

Defined in Data.Version

Methods

compare :: Version -> Version -> Ordering #

(<) :: Version -> Version -> Bool #

(<=) :: Version -> Version -> Bool #

(>) :: Version -> Version -> Bool #

(>=) :: Version -> Version -> Bool #

max :: Version -> Version -> Version #

min :: Version -> Version -> Version #

Ord Void 
Instance details

Defined in Data.Void

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 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 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 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 FileSize 
Instance details

Defined in Basement.Types.OffsetSize

Methods

compare :: FileSize -> FileSize -> Ordering #

(<) :: FileSize -> FileSize -> Bool #

(<=) :: FileSize -> FileSize -> Bool #

(>) :: FileSize -> FileSize -> Bool #

(>=) :: FileSize -> FileSize -> Bool #

max :: FileSize -> FileSize -> FileSize #

min :: FileSize -> FileSize -> FileSize #

Ord String 
Instance details

Defined in Basement.UTF8.Base

Methods

compare :: String -> String -> Ordering #

(<) :: String -> String -> Bool #

(<=) :: String -> String -> Bool #

(>) :: String -> String -> Bool #

(>=) :: String -> String -> Bool #

max :: String -> String -> String #

min :: String -> String -> String #

Ord 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 TimeSpec 
Instance details

Defined in System.Clock

Methods

compare :: TimeSpec -> TimeSpec -> Ordering #

(<) :: TimeSpec -> TimeSpec -> Bool #

(<=) :: TimeSpec -> TimeSpec -> Bool #

(>) :: TimeSpec -> TimeSpec -> Bool #

(>=) :: TimeSpec -> TimeSpec -> Bool #

max :: TimeSpec -> TimeSpec -> TimeSpec #

min :: TimeSpec -> TimeSpec -> TimeSpec #

Ord IntSet 
Instance details

Defined in Data.IntSet.Internal

Ord FileType 
Instance details

Defined in System.Directory.Internal.Common

Methods

compare :: FileType -> FileType -> Ordering #

(<) :: FileType -> FileType -> Bool #

(<=) :: FileType -> FileType -> Bool #

(>) :: FileType -> FileType -> Bool #

(>=) :: FileType -> FileType -> Bool #

max :: FileType -> FileType -> FileType #

min :: FileType -> FileType -> FileType #

Ord Permissions 
Instance details

Defined in System.Directory.Internal.Common

Methods

compare :: Permissions -> Permissions -> Ordering #

(<) :: Permissions -> Permissions -> Bool #

(<=) :: Permissions -> Permissions -> Bool #

(>) :: Permissions -> Permissions -> Bool #

(>=) :: Permissions -> Permissions -> Bool #

max :: Permissions -> Permissions -> Permissions #

min :: Permissions -> Permissions -> Permissions #

Ord XdgDirectory 
Instance details

Defined in System.Directory.Internal.Common

Methods

compare :: XdgDirectory -> XdgDirectory -> Ordering #

(<) :: XdgDirectory -> XdgDirectory -> Bool #

(<=) :: XdgDirectory -> XdgDirectory -> Bool #

(>) :: XdgDirectory -> XdgDirectory -> Bool #

(>=) :: XdgDirectory -> XdgDirectory -> Bool #

max :: XdgDirectory -> XdgDirectory -> XdgDirectory #

min :: XdgDirectory -> XdgDirectory -> XdgDirectory #

Ord XdgDirectoryList 
Instance details

Defined in System.Directory.Internal.Common

Methods

compare :: XdgDirectoryList -> XdgDirectoryList -> Ordering #

(<) :: XdgDirectoryList -> XdgDirectoryList -> Bool #

(<=) :: XdgDirectoryList -> XdgDirectoryList -> Bool #

(>) :: XdgDirectoryList -> XdgDirectoryList -> Bool #

(>=) :: XdgDirectoryList -> XdgDirectoryList -> Bool #

max :: XdgDirectoryList -> XdgDirectoryList -> XdgDirectoryList #

min :: XdgDirectoryList -> XdgDirectoryList -> XdgDirectoryList #

Ord 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 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 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 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 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 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 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 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 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 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 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 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 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 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 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 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 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 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 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 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 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 (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 (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

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 (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 #

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 (Bits n) 
Instance details

Defined in Basement.Bits

Methods

compare :: Bits n -> Bits n -> Ordering #

(<) :: Bits n -> Bits n -> Bool #

(<=) :: Bits n -> Bits n -> Bool #

(>) :: Bits n -> Bits n -> Bool #

(>=) :: Bits n -> Bits n -> Bool #

max :: Bits n -> Bits n -> Bits n #

min :: Bits n -> Bits n -> Bits n #

(PrimType ty, Ord ty) => Ord (Block ty) 
Instance details

Defined in Basement.Block.Base

Methods

compare :: Block ty -> Block ty -> Ordering #

(<) :: Block ty -> Block ty -> Bool #

(<=) :: Block ty -> Block ty -> Bool #

(>) :: Block ty -> Block ty -> Bool #

(>=) :: Block ty -> Block ty -> Bool #

max :: Block ty -> Block ty -> Block ty #

min :: Block ty -> Block ty -> Block ty #

Ord (Zn n) 
Instance details

Defined in Basement.Bounded

Methods

compare :: Zn n -> Zn n -> Ordering #

(<) :: Zn n -> Zn n -> Bool #

(<=) :: Zn n -> Zn n -> Bool #

(>) :: Zn n -> Zn n -> Bool #

(>=) :: Zn n -> Zn n -> Bool #

max :: Zn n -> Zn n -> Zn n #

min :: Zn n -> Zn n -> Zn n #

Ord (Zn64 n) 
Instance details

Defined in Basement.Bounded

Methods

compare :: Zn64 n -> Zn64 n -> Ordering #

(<) :: Zn64 n -> Zn64 n -> Bool #

(<=) :: Zn64 n -> Zn64 n -> Bool #

(>) :: Zn64 n -> Zn64 n -> Bool #

(>=) :: Zn64 n -> Zn64 n -> Bool #

max :: Zn64 n -> Zn64 n -> Zn64 n #

min :: Zn64 n -> Zn64 n -> Zn64 n #

Ord (CountOf ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

compare :: CountOf ty -> CountOf ty -> Ordering #

(<) :: CountOf ty -> CountOf ty -> Bool #

(<=) :: CountOf ty -> CountOf ty -> Bool #

(>) :: CountOf ty -> CountOf ty -> Bool #

(>=) :: CountOf ty -> CountOf ty -> Bool #

max :: CountOf ty -> CountOf ty -> CountOf ty #

min :: CountOf ty -> CountOf ty -> CountOf ty #

Ord (Offset ty) 
Instance details

Defined in Basement.Types.OffsetSize

Methods

compare :: Offset ty -> Offset ty -> Ordering #

(<) :: Offset ty -> Offset ty -> Bool #

(<=) :: Offset ty -> Offset ty -> Bool #

(>) :: Offset ty -> Offset ty -> Bool #

(>=) :: Offset ty -> Offset ty -> Bool #

max :: Offset ty -> Offset ty -> Offset ty #

min :: Offset ty -> Offset ty -> Offset ty #

(PrimType ty, Ord ty) => Ord (UArray ty) 
Instance details

Defined in Basement.UArray.Base

Methods

compare :: UArray ty -> UArray ty -> Ordering #

(<) :: UArray ty -> UArray ty -> Bool #

(<=) :: UArray ty -> UArray ty -> Bool #

(>) :: UArray ty -> UArray ty -> Bool #

(>=) :: UArray ty -> UArray ty -> Bool #

max :: UArray ty -> UArray ty -> UArray ty #

min :: UArray ty -> UArray ty -> UArray ty #

Ord s => Ord (CI s) 
Instance details

Defined in Data.CaseInsensitive.Internal

Methods

compare :: CI s -> CI s -> Ordering #

(<) :: CI s -> CI s -> Bool #

(<=) :: CI s -> CI s -> Bool #

(>) :: CI s -> CI s -> Bool #

(>=) :: CI s -> CI s -> Bool #

max :: CI s -> CI s -> CI s #

min :: CI s -> CI s -> CI s #

Ord a => Ord (Flush a) 
Instance details

Defined in Data.Conduit.Internal.Conduit

Methods

compare :: Flush a -> Flush a -> Ordering #

(<) :: Flush a -> Flush a -> Bool #

(<=) :: Flush a -> Flush a -> Bool #

(>) :: Flush a -> Flush a -> Bool #

(>=) :: Flush a -> Flush a -> Bool #

max :: Flush a -> Flush a -> Flush a #

min :: Flush a -> Flush a -> Flush a #

Ord a => Ord (IntMap a) 
Instance details

Defined in Data.IntMap.Internal

Methods

compare :: IntMap a -> IntMap a -> Ordering #

(<) :: IntMap a -> IntMap a -> Bool #

(<=) :: IntMap a -> IntMap a -> Bool #

(>) :: IntMap a -> IntMap a -> Bool #

(>=) :: IntMap a -> IntMap a -> Bool #

max :: IntMap a -> IntMap a -> IntMap a #

min :: IntMap a -> IntMap a -> IntMap a #

Ord a => Ord (Seq a) 
Instance details

Defined in Data.Sequence.Internal

Methods

compare :: Seq a -> Seq a -> Ordering #

(<) :: Seq a -> Seq a -> Bool #

(<=) :: Seq a -> Seq a -> Bool #

(>) :: Seq a -> Seq a -> Bool #

(>=) :: Seq a -> Seq a -> Bool #

max :: Seq a -> Seq a -> Seq a #

min :: Seq a -> Seq a -> Seq a #

Ord a => Ord (ViewL a) 
Instance details

Defined in Data.Sequence.Internal

Methods

compare :: ViewL a -> ViewL a -> Ordering #

(<) :: ViewL a -> ViewL a -> Bool #

(<=) :: ViewL a -> ViewL a -> Bool #

(>) :: ViewL a -> ViewL a -> Bool #

(>=) :: ViewL a -> ViewL a -> Bool #

max :: ViewL a -> ViewL a -> ViewL a #

min :: ViewL a -> ViewL a -> ViewL a #

Ord a => Ord (ViewR a) 
Instance details

Defined in Data.Sequence.Internal

Methods

compare :: ViewR a -> ViewR a -> Ordering #

(<) :: ViewR a -> ViewR a -> Bool #

(<=) :: ViewR a -> ViewR a -> Bool #

(>) :: ViewR a -> ViewR a -> Bool #

(>=) :: ViewR a -> ViewR a -> Bool #

max :: ViewR a -> ViewR a -> ViewR a #

min :: ViewR a -> ViewR a -> ViewR a #

Ord a => Ord (Intersection a) 
Instance details

Defined in Data.Set.Internal

Methods

compare :: Intersection a -> Intersection a -> Ordering #

(<) :: Intersection a -> Intersection a -> Bool #

(<=) :: Intersection a -> Intersection a -> Bool #

(>) :: Intersection a -> Intersection a -> Bool #

(>=) :: Intersection a -> Intersection a -> Bool #

max :: Intersection a -> Intersection a -> Intersection a #

min :: Intersection a -> Intersection a -> Intersection a #

Ord a => Ord (Set a) 
Instance details

Defined in Data.Set.Internal

Methods

compare :: Set a -> Set a -> Ordering #

(<) :: Set a -> Set a -> Bool #

(<=) :: Set a -> Set a -> Bool #

(>) :: Set a -> Set a -> Bool #

(>=) :: Set a -> Set a -> Bool #

max :: Set a -> Set a -> Set a #

min :: Set a -> Set a -> Set a #

Ord a => Ord (Tree a) 
Instance details

Defined in Data.Tree

Methods

compare :: Tree a -> Tree a -> Ordering #

(<) :: Tree a -> Tree a -> Bool #

(<=) :: Tree a -> Tree a -> Bool #

(>) :: Tree a -> Tree a -> Bool #

(>=) :: Tree a -> Tree a -> Bool #

max :: Tree a -> Tree a -> Tree a #

min :: Tree a -> Tree a -> Tree a #

Ord (Digest a) 
Instance details

Defined in Crypto.Hash.Types

Methods

compare :: Digest a -> Digest a -> Ordering #

(<) :: Digest a -> Digest a -> Bool #

(<=) :: Digest a -> Digest a -> Bool #

(>) :: Digest a -> Digest a -> Bool #

(>=) :: Digest a -> Digest a -> Bool #

max :: Digest a -> Digest a -> Digest a #

min :: Digest a -> Digest a -> Digest a #

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 (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 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 (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 (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 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 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 a => Ord (Array a) 
Instance details

Defined in Data.Primitive.Array

Methods

compare :: Array a -> Array a -> Ordering #

(<) :: Array a -> Array a -> Bool #

(<=) :: Array a -> Array a -> Bool #

(>) :: Array a -> Array a -> Bool #

(>=) :: Array a -> Array a -> Bool #

max :: Array a -> Array a -> Array a #

min :: Array a -> Array a -> Array a #

(Ord a, Prim a) => Ord (PrimArray a) 
Instance details

Defined in Data.Primitive.PrimArray

Methods

compare :: PrimArray a -> PrimArray a -> Ordering #

(<) :: PrimArray a -> PrimArray a -> Bool #

(<=) :: PrimArray a -> PrimArray a -> Bool #

(>) :: PrimArray a -> PrimArray a -> Bool #

(>=) :: PrimArray a -> PrimArray a -> Bool #

max :: PrimArray a -> PrimArray a -> PrimArray a #

min :: PrimArray a -> PrimArray a -> PrimArray a #

Ord a => Ord (SmallArray a) 
Instance details

Defined in Data.Primitive.SmallArray

Methods

compare :: SmallArray a -> SmallArray a -> Ordering #

(<) :: SmallArray a -> SmallArray a -> Bool #

(<=) :: SmallArray a -> SmallArray a -> Bool #

(>) :: SmallArray a -> SmallArray a -> Bool #

(>=) :: SmallArray a -> SmallArray a -> Bool #

max :: SmallArray a -> SmallArray a -> SmallArray a #

min :: SmallArray a -> SmallArray a -> SmallArray a #

Ord g => Ord (StateGen g) 
Instance details

Defined in System.Random.Internal

Methods

compare :: StateGen g -> StateGen g -> Ordering #

(<) :: StateGen g -> StateGen g -> Bool #

(<=) :: StateGen g -> StateGen g -> Bool #

(>) :: StateGen g -> StateGen g -> Bool #

(>=) :: StateGen g -> StateGen g -> Bool #

max :: StateGen g -> StateGen g -> StateGen g #

min :: StateGen g -> StateGen g -> StateGen g #

Ord g => Ord (AtomicGen g) 
Instance details

Defined in System.Random.Stateful

Methods

compare :: AtomicGen g -> AtomicGen g -> Ordering #

(<) :: AtomicGen g -> AtomicGen g -> Bool #

(<=) :: AtomicGen g -> AtomicGen g -> Bool #

(>) :: AtomicGen g -> AtomicGen g -> Bool #

(>=) :: AtomicGen g -> AtomicGen g -> Bool #

max :: AtomicGen g -> AtomicGen g -> AtomicGen g #

min :: AtomicGen g -> AtomicGen g -> AtomicGen g #

Ord g => Ord (IOGen g) 
Instance details

Defined in System.Random.Stateful

Methods

compare :: IOGen g -> IOGen g -> Ordering #

(<) :: IOGen g -> IOGen g -> Bool #

(<=) :: IOGen g -> IOGen g -> Bool #

(>) :: IOGen g -> IOGen g -> Bool #

(>=) :: IOGen g -> IOGen g -> Bool #

max :: IOGen g -> IOGen g -> IOGen g #

min :: IOGen g -> IOGen g -> IOGen g #

Ord g => Ord (STGen g) 
Instance details

Defined in System.Random.Stateful

Methods

compare :: STGen g -> STGen g -> Ordering #

(<) :: STGen g -> STGen g -> Bool #

(<=) :: STGen g -> STGen g -> Bool #

(>) :: STGen g -> STGen g -> Bool #

(>=) :: STGen g -> STGen g -> Bool #

max :: STGen g -> STGen g -> STGen g #

min :: STGen g -> STGen g -> STGen g #

Ord g => Ord (TGen g) 
Instance details

Defined in System.Random.Stateful

Methods

compare :: TGen g -> TGen g -> Ordering #

(<) :: TGen g -> TGen g -> Bool #

(<=) :: TGen g -> TGen g -> Bool #

(>) :: TGen g -> TGen g -> Bool #

(>=) :: TGen g -> TGen g -> Bool #

max :: TGen g -> TGen g -> TGen g #

min :: TGen g -> TGen g -> TGen g #

Ord a => Ord (Maybe a) 
Instance details

Defined in Data.Strict.Maybe

Methods

compare :: Maybe a -> Maybe a -> Ordering #

(<) :: Maybe a -> Maybe a -> Bool #

(<=) :: Maybe a -> Maybe a -> Bool #

(>) :: Maybe a -> Maybe a -> Bool #

(>=) :: Maybe a -> Maybe a -> Bool #

max :: Maybe a -> Maybe a -> Maybe a #

min :: Maybe a -> Maybe a -> Maybe a #

Ord 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 (HashSet a) 
Instance details

Defined in Data.HashSet.Internal

Methods

compare :: HashSet a -> HashSet a -> Ordering #

(<) :: HashSet a -> HashSet a -> Bool #

(<=) :: HashSet a -> HashSet a -> Bool #

(>) :: HashSet a -> HashSet a -> Bool #

(>=) :: HashSet a -> HashSet a -> Bool #

max :: HashSet a -> HashSet a -> HashSet a #

min :: HashSet a -> HashSet a -> HashSet a #

Ord a => Ord (Vector a) 
Instance details

Defined in Data.Vector

Methods

compare :: Vector a -> Vector a -> Ordering #

(<) :: Vector a -> Vector a -> Bool #

(<=) :: Vector a -> Vector a -> Bool #

(>) :: Vector a -> Vector a -> Bool #

(>=) :: Vector a -> Vector a -> Bool #

max :: Vector a -> Vector a -> Vector a #

min :: Vector a -> Vector a -> Vector a #

(Prim a, Ord a) => Ord (Vector a) 
Instance details

Defined in Data.Vector.Primitive

Methods

compare :: Vector a -> Vector a -> Ordering #

(<) :: Vector a -> Vector a -> Bool #

(<=) :: Vector a -> Vector a -> Bool #

(>) :: Vector a -> Vector a -> Bool #

(>=) :: Vector a -> Vector a -> Bool #

max :: Vector a -> Vector a -> Vector a #

min :: Vector a -> Vector a -> Vector a #

(Storable a, Ord a) => Ord (Vector a) 
Instance details

Defined in Data.Vector.Storable

Methods

compare :: Vector a -> Vector a -> Ordering #

(<) :: Vector a -> Vector a -> Bool #

(<=) :: Vector a -> Vector a -> Bool #

(>) :: Vector a -> Vector a -> Bool #

(>=) :: Vector a -> Vector a -> Bool #

max :: Vector a -> Vector a -> Vector a #

min :: Vector a -> Vector a -> Vector a #

Ord a => Ord (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 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 (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 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] #

(Ix ix, Ord e, IArray UArray e) => Ord (UArray ix e) 
Instance details

Defined in Data.Array.Base

Methods

compare :: UArray ix e -> UArray ix e -> Ordering #

(<) :: UArray ix e -> UArray ix e -> Bool #

(<=) :: UArray ix e -> UArray ix e -> Bool #

(>) :: UArray ix e -> UArray ix e -> Bool #

(>=) :: UArray ix e -> UArray ix e -> Bool #

max :: UArray ix e -> UArray ix e -> UArray ix e #

min :: UArray ix e -> UArray ix e -> UArray ix e #

(Ord a, Ord b) => Ord (Either a b) 
Instance details

Defined in Data.Either

Methods

compare :: Either a b -> Either a b -> Ordering #

(<) :: Either a b -> Either a b -> Bool #

(<=) :: Either a b -> Either a b -> Bool #

(>) :: Either a b -> Either a b -> Bool #

(>=) :: Either a b -> Either a b -> Bool #

max :: Either a b -> Either a b -> Either a b #

min :: Either a b -> Either a b -> Either a b #

Ord (Fixed a) 
Instance details

Defined in Data.Fixed

Methods

compare :: Fixed a -> Fixed a -> Ordering #

(<) :: Fixed a -> Fixed a -> Bool #

(<=) :: Fixed a -> Fixed a -> Bool #

(>) :: Fixed a -> Fixed a -> Bool #

(>=) :: Fixed a -> Fixed a -> Bool #

max :: Fixed a -> Fixed a -> Fixed a #

min :: Fixed a -> Fixed a -> Fixed a #

Ord (Proxy s) 
Instance details

Defined in Data.Proxy

Methods

compare :: Proxy s -> Proxy s -> Ordering #

(<) :: Proxy s -> Proxy s -> Bool #

(<=) :: Proxy s -> Proxy s -> Bool #

(>) :: Proxy s -> Proxy s -> Bool #

(>=) :: Proxy s -> Proxy s -> Bool #

max :: Proxy s -> Proxy s -> Proxy s #

min :: Proxy s -> Proxy s -> Proxy s #

Ord a => Ord (Arg a b) 
Instance details

Defined in Data.Semigroup

Methods

compare :: Arg a b -> Arg a b -> Ordering #

(<) :: Arg a b -> Arg a b -> Bool #

(<=) :: Arg a b -> Arg a b -> Bool #

(>) :: Arg a b -> Arg a b -> Bool #

(>=) :: Arg a b -> Arg a b -> Bool #

max :: Arg a b -> Arg a b -> Arg a b #

min :: Arg a b -> Arg a b -> Arg a b #

Ord (TypeRep a) 
Instance details

Defined in Data.Typeable.Internal

Methods

compare :: TypeRep a -> TypeRep a -> Ordering #

(<) :: TypeRep a -> TypeRep a -> Bool #

(<=) :: TypeRep a -> TypeRep a -> Bool #

(>) :: TypeRep a -> TypeRep a -> Bool #

(>=) :: TypeRep a -> TypeRep a -> Bool #

max :: TypeRep a -> TypeRep a -> TypeRep a #

min :: TypeRep a -> TypeRep a -> TypeRep a #

(Ix i, Ord e) => Ord (Array i e) 
Instance details

Defined in GHC.Arr

Methods

compare :: Array i e -> Array i e -> Ordering #

(<) :: Array i e -> Array i e -> Bool #

(<=) :: Array i e -> Array i e -> Bool #

(>) :: Array i e -> Array i e -> Bool #

(>=) :: Array i e -> Array i e -> Bool #

max :: Array i e -> Array i e -> Array i e #

min :: Array i e -> Array i e -> Array i e #

Ord (U1 p) 
Instance details

Defined in GHC.Generics

Methods

compare :: U1 p -> U1 p -> Ordering #

(<) :: U1 p -> U1 p -> Bool #

(<=) :: U1 p -> U1 p -> Bool #

(>) :: U1 p -> U1 p -> Bool #

(>=) :: U1 p -> U1 p -> Bool #

max :: U1 p -> U1 p -> U1 p #

min :: U1 p -> U1 p -> U1 p #

Ord (V1 p) 
Instance details

Defined in GHC.Generics

Methods

compare :: V1 p -> V1 p -> Ordering #

(<) :: V1 p -> V1 p -> Bool #

(<=) :: V1 p -> V1 p -> Bool #

(>) :: V1 p -> V1 p -> Bool #

(>=) :: V1 p -> V1 p -> Bool #

max :: V1 p -> V1 p -> V1 p #

min :: V1 p -> V1 p -> V1 p #

(Ord k, Ord v) => Ord (Map k v) 
Instance details

Defined in Data.Map.Internal

Methods

compare :: Map k v -> Map k v -> Ordering #

(<) :: Map k v -> Map k v -> Bool #

(<=) :: Map k v -> Map k v -> Bool #

(>) :: Map k v -> Map k v -> Bool #

(>=) :: Map k v -> Map k v -> Bool #

max :: Map k v -> Map k v -> Map k v #

min :: Map k v -> Map k v -> Map k v #

(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 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 (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 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 b) => Ord (Either a b) 
Instance details

Defined in Data.Strict.Either

Methods

compare :: Either a b -> Either a b -> Ordering #

(<) :: Either a b -> Either a b -> Bool #

(<=) :: Either a b -> Either a b -> Bool #

(>) :: Either a b -> Either a b -> Bool #

(>=) :: Either a b -> Either a b -> Bool #

max :: Either a b -> Either a b -> Either a b #

min :: Either a b -> Either a b -> Either a b #

(Ord a, Ord b) => Ord (These a b) 
Instance details

Defined in Data.Strict.These

Methods

compare :: These a b -> These a b -> Ordering #

(<) :: These a b -> These a b -> Bool #

(<=) :: These a b -> These a b -> Bool #

(>) :: These a b -> These a b -> Bool #

(>=) :: These a b -> These a b -> Bool #

max :: These a b -> These a b -> These a b #

min :: These a b -> These a b -> These a b #

(Ord a, Ord b) => Ord (Pair a b) 
Instance details

Defined in Data.Strict.Tuple

Methods

compare :: Pair a b -> Pair a b -> Ordering #

(<) :: Pair a b -> Pair a b -> Bool #

(<=) :: Pair a b -> Pair a b -> Bool #

(>) :: Pair a b -> Pair a b -> Bool #

(>=) :: Pair a b -> Pair a b -> Bool #

max :: Pair a b -> Pair a b -> Pair a b #

min :: Pair a b -> Pair a b -> Pair a b #

(Ord a, Ord b) => Ord (These a b) 
Instance details

Defined in Data.These

Methods

compare :: These a b -> These a b -> Ordering #

(<) :: These a b -> These a b -> Bool #

(<=) :: These a b -> These a b -> Bool #

(>) :: These a b -> These a b -> Bool #

(>=) :: These a b -> These a b -> Bool #

max :: These a b -> These a b -> These a b #

min :: These a b -> These a b -> These a b #

(Ord1 f, Ord a) => Ord (Lift f a) 
Instance details

Defined in Control.Applicative.Lift

Methods

compare :: Lift f a -> Lift f a -> Ordering #

(<) :: Lift f a -> Lift f a -> Bool #

(<=) :: Lift f a -> Lift f a -> Bool #

(>) :: Lift f a -> Lift f a -> Bool #

(>=) :: Lift f a -> Lift f a -> Bool #

max :: Lift f a -> Lift f a -> Lift f a #

min :: Lift f a -> Lift f a -> Lift f a #

(Ord1 m, Ord a) => Ord (MaybeT m a) 
Instance details

Defined in Control.Monad.Trans.Maybe

Methods

compare :: MaybeT m a -> MaybeT m a -> Ordering #

(<) :: MaybeT m a -> MaybeT m a -> Bool #

(<=) :: MaybeT m a -> MaybeT m a -> Bool #

(>) :: MaybeT m a -> MaybeT m a -> Bool #

(>=) :: MaybeT m a -> MaybeT m a -> Bool #

max :: MaybeT m a -> MaybeT m a -> MaybeT m a #

min :: MaybeT m a -> MaybeT m a -> MaybeT m a #

(Ord k, Ord v) => Ord (HashMap k v) 
Instance details

Defined in Data.HashMap.Internal

Methods

compare :: HashMap k v -> HashMap k v -> Ordering #

(<) :: HashMap k v -> HashMap k v -> Bool #

(<=) :: HashMap k v -> HashMap k v -> Bool #

(>) :: HashMap k v -> HashMap k v -> Bool #

(>=) :: HashMap k v -> HashMap k v -> Bool #

max :: HashMap k v -> HashMap k v -> HashMap k v #

min :: HashMap k v -> HashMap k v -> HashMap k v #

(Ord a, Ord b) => Ord (a, b) 
Instance details

Defined in GHC.Classes

Methods

compare :: (a, b) -> (a, b) -> Ordering #

(<) :: (a, b) -> (a, b) -> Bool #

(<=) :: (a, b) -> (a, b) -> Bool #

(>) :: (a, b) -> (a, b) -> Bool #

(>=) :: (a, b) -> (a, b) -> Bool #

max :: (a, b) -> (a, b) -> (a, b) #

min :: (a, b) -> (a, b) -> (a, b) #

Ord a => Ord (Const a b) 
Instance details

Defined in Data.Functor.Const

Methods

compare :: Const a b -> Const a b -> Ordering #

(<) :: Const a b -> Const a b -> Bool #

(<=) :: Const a b -> Const a b -> Bool #

(>) :: Const a b -> Const a b -> Bool #

(>=) :: Const a b -> Const a b -> Bool #

max :: Const a b -> Const a b -> Const a b #

min :: Const a b -> Const a b -> Const a b #

Ord (f a) => Ord (Ap f a) 
Instance details

Defined in Data.Monoid

Methods

compare :: Ap f a -> Ap f a -> Ordering #

(<) :: Ap f a -> Ap f a -> Bool #

(<=) :: Ap f a -> Ap f a -> Bool #

(>) :: Ap f a -> Ap f a -> Bool #

(>=) :: Ap f a -> Ap f a -> Bool #

max :: Ap f a -> Ap f a -> Ap f a #

min :: Ap f a -> Ap f a -> Ap f a #

Ord (f a) => Ord (Alt f a) 
Instance details

Defined in Data.Semigroup.Internal

Methods

compare :: Alt f a -> Alt f a -> Ordering #

(<) :: Alt f a -> Alt f a -> Bool #

(<=) :: Alt f a -> Alt f a -> Bool #

(>) :: Alt f a -> Alt f a -> Bool #

(>=) :: Alt f a -> Alt f a -> Bool #

max :: Alt f a -> Alt f a -> Alt f a #

min :: Alt f a -> Alt f a -> Alt f a #

Ord (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 (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 (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 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 (ErrorT e m a) 
Instance details

Defined in Control.Monad.Trans.Error

Methods

compare :: ErrorT e m a -> ErrorT e m a -> Ordering #

(<) :: ErrorT e m a -> ErrorT e m a -> Bool #

(<=) :: ErrorT e m a -> ErrorT e m a -> Bool #

(>) :: ErrorT e m a -> ErrorT e m a -> Bool #

(>=) :: ErrorT e m a -> ErrorT e m a -> Bool #

max :: ErrorT e m a -> ErrorT e m a -> ErrorT e m a #

min :: ErrorT e m a -> ErrorT e m a -> ErrorT e m 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) #

(Ord1 f, Ord1 g, Ord 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 #

(Ord1 f, Ord1 g, Ord 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) #

(Ord1 f, Ord1 g, Ord 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 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 Bounded a where #

Methods

minBound :: a #

maxBound :: a #

Instances

Instances details
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 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 TimeSpec 
Instance details

Defined in System.Clock

Methods

minBound :: TimeSpec #

maxBound :: TimeSpec #

Bounded FileType 
Instance details

Defined in System.Directory.Internal.Common

Methods

minBound :: FileType #

maxBound :: FileType #

Bounded XdgDirectory 
Instance details

Defined in System.Directory.Internal.Common

Methods

minBound :: XdgDirectory #

maxBound :: XdgDirectory #

Bounded XdgDirectoryList 
Instance details

Defined in System.Directory.Internal.Common

Methods

minBound :: XdgDirectoryList #

maxBound :: XdgDirectoryList #

Bounded Extension 
Instance details

Defined in GHC.LanguageExtensions.Type

Methods

minBound :: Extension #

maxBound :: Extension #

Bounded Ordering 
Instance details

Defined in GHC.Enum

Bounded 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 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 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 FPFormat 
Instance details

Defined in Data.Text.Lazy.Builder.RealFloat

Methods

minBound :: FPFormat #

maxBound :: FPFormat #

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 (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 (a) 
Instance details

Defined in GHC.Enum

Methods

minBound :: (a) #

maxBound :: (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 #

a ~ b => Bounded (a :~: b) 
Instance details

Defined in Data.Type.Equality

Methods

minBound :: a :~: b #

maxBound :: a :~: b #

Bounded b => Bounded (Tagged s b) 
Instance details

Defined in Data.Tagged

Methods

minBound :: Tagged s b #

maxBound :: Tagged s b #

(Bounded a, Bounded b, Bounded c) => Bounded (a, b, c) 
Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c) #

maxBound :: (a, b, c) #

a ~~ b => Bounded (a :~~: b) 
Instance details

Defined in Data.Type.Equality

Methods

minBound :: a :~~: b #

maxBound :: a :~~: b #

(Bounded a, Bounded b, Bounded c, Bounded d) => Bounded (a, b, c, d) 
Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d) #

maxBound :: (a, b, c, d) #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e) => Bounded (a, b, c, d, e) 
Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d, e) #

maxBound :: (a, b, c, d, e) #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f) => Bounded (a, b, c, d, e, f) 
Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d, e, f) #

maxBound :: (a, b, c, d, e, f) #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g) => Bounded (a, b, c, d, e, f, g) 
Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d, e, f, g) #

maxBound :: (a, b, c, d, e, f, g) #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h) => Bounded (a, b, c, d, e, f, g, h) 
Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d, e, f, g, h) #

maxBound :: (a, b, c, d, e, f, g, h) #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i) => Bounded (a, b, c, d, e, f, g, h, i) 
Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d, e, f, g, h, i) #

maxBound :: (a, b, c, d, e, f, g, h, i) #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i, Bounded j) => Bounded (a, b, c, d, e, f, g, h, i, j) 
Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d, e, f, g, h, i, j) #

maxBound :: (a, b, c, d, e, f, g, h, i, j) #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i, Bounded j, Bounded k) => Bounded (a, b, c, d, e, f, g, h, i, j, k) 
Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d, e, f, g, h, i, j, k) #

maxBound :: (a, b, c, d, e, f, g, h, i, j, k) #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i, Bounded j, Bounded k, Bounded l) => Bounded (a, b, c, d, e, f, g, h, i, j, k, l) 
Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d, e, f, g, h, i, j, k, l) #

maxBound :: (a, b, c, d, e, f, g, h, i, j, k, l) #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i, Bounded j, Bounded k, Bounded l, Bounded m) => Bounded (a, b, c, d, e, f, g, h, i, j, k, l, m) 
Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d, e, f, g, h, i, j, k, l, m) #

maxBound :: (a, b, c, d, e, f, g, h, i, j, k, l, m) #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i, Bounded j, Bounded k, Bounded l, Bounded m, Bounded n) => Bounded (a, b, c, d, e, f, g, h, i, j, k, l, m, n) 
Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) #

maxBound :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) #

(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i, Bounded j, Bounded k, Bounded l, Bounded m, Bounded n, Bounded o) => Bounded (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) 
Instance details

Defined in GHC.Enum

Methods

minBound :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) #

maxBound :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) #

class (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 #

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 Word64 #

Instances

Instances details
FromJSON Word64 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Word64 #

parseJSONList :: Value -> Parser [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 #

BitOps Word64 
Instance details

Defined in Basement.Bits

Methods

(.&.) :: Word64 -> Word64 -> Word64

(.|.) :: Word64 -> Word64 -> Word64

(.^.) :: Word64 -> Word64 -> Word64

(.<<.) :: Word64 -> CountOf Bool -> Word64

(.>>.) :: Word64 -> CountOf Bool -> Word64

bit :: Offset Bool -> Word64

isBitSet :: Word64 -> Offset Bool -> Bool

setBit :: Word64 -> Offset Bool -> Word64

clearBit :: Word64 -> Offset Bool -> Word64

FiniteBitsOps Word64 
Instance details

Defined in Basement.Bits

Methods

numberOfBits :: Word64 -> CountOf Bool

rotateL :: Word64 -> CountOf Bool -> Word64

rotateR :: Word64 -> CountOf Bool -> Word64

popCount :: Word64 -> CountOf Bool

bitFlip :: Word64 -> Word64

countLeadingZeros :: Word64 -> CountOf Bool

countTrailingZeros :: Word64 -> CountOf Bool

Subtractive Word64 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Word64

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 :: Nat

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

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 #

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 #

ToField Word64 
Instance details

Defined in Database.PostgreSQL.Simple.ToField

Methods

toField :: Word64 -> Action

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

ByteSource Word64 
Instance details

Defined in Data.UUID.Types.Internal.Builder

Methods

(/-/) :: ByteSink Word64 g -> Word64 -> g

Unbox Word64 
Instance details

Defined in Data.Vector.Unboxed.Base

IArray UArray Word64 
Instance details

Defined in Data.Array.Base

Methods

bounds :: Ix i => UArray i Word64 -> (i, i)

numElements :: Ix i => UArray i Word64 -> Int

unsafeArray :: Ix i => (i, i) -> [(Int, Word64)] -> UArray i Word64

unsafeAt :: Ix i => UArray i Word64 -> Int -> Word64

unsafeReplace :: Ix i => UArray i Word64 -> [(Int, Word64)] -> UArray i Word64

unsafeAccum :: Ix i => (Word64 -> e' -> Word64) -> UArray i Word64 -> [(Int, e')] -> UArray i Word64

unsafeAccumArray :: Ix i => (Word64 -> e' -> Word64) -> Word64 -> (i, i) -> [(Int, e')] -> UArray i Word64

Lift Word64 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Word64 -> m Exp

liftTyped :: forall (m :: Type -> Type). Quote m => Word64 -> Code m Word64

Vector Vector Word64 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: Mutable Vector s Word64 -> ST s (Vector Word64)

basicUnsafeThaw :: Vector Word64 -> ST s (Mutable Vector s Word64)

basicLength :: Vector Word64 -> Int

basicUnsafeSlice :: Int -> Int -> Vector Word64 -> Vector Word64

basicUnsafeIndexM :: Vector Word64 -> Int -> Box Word64

basicUnsafeCopy :: Mutable Vector s Word64 -> Vector Word64 -> ST s ()

elemseq :: Vector Word64 -> Word64 -> b -> b

MVector MVector Word64 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s Word64 -> Int

basicUnsafeSlice :: Int -> Int -> MVector s Word64 -> MVector s Word64

basicOverlaps :: MVector s Word64 -> MVector s Word64 -> Bool

basicUnsafeNew :: Int -> ST s (MVector s Word64)

basicInitialize :: MVector s Word64 -> ST s ()

basicUnsafeReplicate :: Int -> Word64 -> ST s (MVector s Word64)

basicUnsafeRead :: MVector s Word64 -> Int -> ST s Word64

basicUnsafeWrite :: MVector s Word64 -> Int -> Word64 -> ST s ()

basicClear :: MVector s Word64 -> ST s ()

basicSet :: MVector s Word64 -> Word64 -> ST s ()

basicUnsafeCopy :: MVector s Word64 -> MVector s Word64 -> ST s ()

basicUnsafeMove :: MVector s Word64 -> MVector s Word64 -> ST s ()

basicUnsafeGrow :: MVector s Word64 -> Int -> ST s (MVector s Word64)

MArray (STUArray s) Word64 (ST s) 
Instance details

Defined in Data.Array.Base

Methods

getBounds :: Ix i => STUArray s i Word64 -> ST s (i, i)

getNumElements :: Ix i => STUArray s i Word64 -> ST s Int

newArray :: Ix i => (i, i) -> Word64 -> ST s (STUArray s i Word64)

newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Word64)

unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Word64)

unsafeRead :: Ix i => STUArray s i Word64 -> Int -> ST s Word64

unsafeWrite :: Ix i => STUArray s i Word64 -> Int -> Word64 -> ST s ()

type NatNumMaxBound Word64 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Word64 = 18446744073709551615
type Difference Word64 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Word64 = Word64
type PrimSize Word64 
Instance details

Defined in Basement.PrimType

type PrimSize Word64 = 8
newtype Vector Word64 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector Word64 = V_Word64 (Vector Word64)
type ByteSink Word64 g 
Instance details

Defined in Data.UUID.Types.Internal.Builder

type ByteSink Word64 g = Takes8Bytes g
newtype MVector s Word64 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Word64 = MV_Word64 (MVector s Word64)

data Word32 #

Instances

Instances details
FromJSON Word32 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Word32 #

parseJSONList :: Value -> Parser [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 #

BitOps Word32 
Instance details

Defined in Basement.Bits

Methods

(.&.) :: Word32 -> Word32 -> Word32

(.|.) :: Word32 -> Word32 -> Word32

(.^.) :: Word32 -> Word32 -> Word32

(.<<.) :: Word32 -> CountOf Bool -> Word32

(.>>.) :: Word32 -> CountOf Bool -> Word32

bit :: Offset Bool -> Word32

isBitSet :: Word32 -> Offset Bool -> Bool

setBit :: Word32 -> Offset Bool -> Word32

clearBit :: Word32 -> Offset Bool -> Word32

FiniteBitsOps Word32 
Instance details

Defined in Basement.Bits

Methods

numberOfBits :: Word32 -> CountOf Bool

rotateL :: Word32 -> CountOf Bool -> Word32

rotateR :: Word32 -> CountOf Bool -> Word32

popCount :: Word32 -> CountOf Bool

bitFlip :: Word32 -> Word32

countLeadingZeros :: Word32 -> CountOf Bool

countTrailingZeros :: Word32 -> CountOf Bool

Subtractive Word32 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Word32

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 :: Nat

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

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 #

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 #

ToField Word32 
Instance details

Defined in Database.PostgreSQL.Simple.ToField

Methods

toField :: Word32 -> Action

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

ByteSource Word32 
Instance details

Defined in Data.UUID.Types.Internal.Builder

Methods

(/-/) :: ByteSink Word32 g -> Word32 -> g

Unbox Word32 
Instance details

Defined in Data.Vector.Unboxed.Base

IArray UArray Word32 
Instance details

Defined in Data.Array.Base

Methods

bounds :: Ix i => UArray i Word32 -> (i, i)

numElements :: Ix i => UArray i Word32 -> Int

unsafeArray :: Ix i => (i, i) -> [(Int, Word32)] -> UArray i Word32

unsafeAt :: Ix i => UArray i Word32 -> Int -> Word32

unsafeReplace :: Ix i => UArray i Word32 -> [(Int, Word32)] -> UArray i Word32

unsafeAccum :: Ix i => (Word32 -> e' -> Word32) -> UArray i Word32 -> [(Int, e')] -> UArray i Word32

unsafeAccumArray :: Ix i => (Word32 -> e' -> Word32) -> Word32 -> (i, i) -> [(Int, e')] -> UArray i Word32

Lift Word32 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Word32 -> m Exp

liftTyped :: forall (m :: Type -> Type). Quote m => Word32 -> Code m Word32

Vector Vector Word32 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: Mutable Vector s Word32 -> ST s (Vector Word32)

basicUnsafeThaw :: Vector Word32 -> ST s (Mutable Vector s Word32)

basicLength :: Vector Word32 -> Int

basicUnsafeSlice :: Int -> Int -> Vector Word32 -> Vector Word32

basicUnsafeIndexM :: Vector Word32 -> Int -> Box Word32

basicUnsafeCopy :: Mutable Vector s Word32 -> Vector Word32 -> ST s ()

elemseq :: Vector Word32 -> Word32 -> b -> b

MVector MVector Word32 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s Word32 -> Int

basicUnsafeSlice :: Int -> Int -> MVector s Word32 -> MVector s Word32

basicOverlaps :: MVector s Word32 -> MVector s Word32 -> Bool

basicUnsafeNew :: Int -> ST s (MVector s Word32)

basicInitialize :: MVector s Word32 -> ST s ()

basicUnsafeReplicate :: Int -> Word32 -> ST s (MVector s Word32)

basicUnsafeRead :: MVector s Word32 -> Int -> ST s Word32

basicUnsafeWrite :: MVector s Word32 -> Int -> Word32 -> ST s ()

basicClear :: MVector s Word32 -> ST s ()

basicSet :: MVector s Word32 -> Word32 -> ST s ()

basicUnsafeCopy :: MVector s Word32 -> MVector s Word32 -> ST s ()

basicUnsafeMove :: MVector s Word32 -> MVector s Word32 -> ST s ()

basicUnsafeGrow :: MVector s Word32 -> Int -> ST s (MVector s Word32)

MArray (STUArray s) Word32 (ST s) 
Instance details

Defined in Data.Array.Base

Methods

getBounds :: Ix i => STUArray s i Word32 -> ST s (i, i)

getNumElements :: Ix i => STUArray s i Word32 -> ST s Int

newArray :: Ix i => (i, i) -> Word32 -> ST s (STUArray s i Word32)

newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Word32)

unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Word32)

unsafeRead :: Ix i => STUArray s i Word32 -> Int -> ST s Word32

unsafeWrite :: Ix i => STUArray s i Word32 -> Int -> Word32 -> ST s ()

type NatNumMaxBound Word32 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Word32 = 4294967295
type Difference Word32 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Word32 = Word32
type PrimSize Word32 
Instance details

Defined in Basement.PrimType

type PrimSize Word32 = 4
newtype Vector Word32 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector Word32 = V_Word32 (Vector Word32)
type ByteSink Word32 g 
Instance details

Defined in Data.UUID.Types.Internal.Builder

type ByteSink Word32 g = Takes4Bytes g
newtype MVector s Word32 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Word32 = MV_Word32 (MVector s Word32)

data Word8 #

Instances

Instances details
FromJSON Word8 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Word8 #

parseJSONList :: Value -> Parser [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 #

BitOps Word8 
Instance details

Defined in Basement.Bits

Methods

(.&.) :: Word8 -> Word8 -> Word8

(.|.) :: Word8 -> Word8 -> Word8

(.^.) :: Word8 -> Word8 -> Word8

(.<<.) :: Word8 -> CountOf Bool -> Word8

(.>>.) :: Word8 -> CountOf Bool -> Word8

bit :: Offset Bool -> Word8

isBitSet :: Word8 -> Offset Bool -> Bool

setBit :: Word8 -> Offset Bool -> Word8

clearBit :: Word8 -> Offset Bool -> Word8

FiniteBitsOps Word8 
Instance details

Defined in Basement.Bits

Methods

numberOfBits :: Word8 -> CountOf Bool

rotateL :: Word8 -> CountOf Bool -> Word8

rotateR :: Word8 -> CountOf Bool -> Word8

popCount :: Word8 -> CountOf Bool

bitFlip :: Word8 -> Word8

countLeadingZeros :: Word8 -> CountOf Bool

countTrailingZeros :: Word8 -> CountOf Bool

Subtractive Word8 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Word8

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 :: Nat

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 ()

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 #

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

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

ByteSource Word8 
Instance details

Defined in Data.UUID.Types.Internal.Builder

Methods

(/-/) :: ByteSink Word8 g -> Word8 -> g

Unbox Word8 
Instance details

Defined in Data.Vector.Unboxed.Base

IArray UArray Word8 
Instance details

Defined in Data.Array.Base

Methods

bounds :: Ix i => UArray i Word8 -> (i, i)

numElements :: Ix i => UArray i Word8 -> Int

unsafeArray :: Ix i => (i, i) -> [(Int, Word8)] -> UArray i Word8

unsafeAt :: Ix i => UArray i Word8 -> Int -> Word8

unsafeReplace :: Ix i => UArray i Word8 -> [(Int, Word8)] -> UArray i Word8

unsafeAccum :: Ix i => (Word8 -> e' -> Word8) -> UArray i Word8 -> [(Int, e')] -> UArray i Word8

unsafeAccumArray :: Ix i => (Word8 -> e' -> Word8) -> Word8 -> (i, i) -> [(Int, e')] -> UArray i Word8

Lift Word8 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Word8 -> m Exp

liftTyped :: forall (m :: Type -> Type). Quote m => Word8 -> Code m Word8

Vector Vector Word8 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: Mutable Vector s Word8 -> ST s (Vector Word8)

basicUnsafeThaw :: Vector Word8 -> ST s (Mutable Vector s Word8)

basicLength :: Vector Word8 -> Int

basicUnsafeSlice :: Int -> Int -> Vector Word8 -> Vector Word8

basicUnsafeIndexM :: Vector Word8 -> Int -> Box Word8

basicUnsafeCopy :: Mutable Vector s Word8 -> Vector Word8 -> ST s ()

elemseq :: Vector Word8 -> Word8 -> b -> b

MVector MVector Word8 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s Word8 -> Int

basicUnsafeSlice :: Int -> Int -> MVector s Word8 -> MVector s Word8

basicOverlaps :: MVector s Word8 -> MVector s Word8 -> Bool

basicUnsafeNew :: Int -> ST s (MVector s Word8)

basicInitialize :: MVector s Word8 -> ST s ()

basicUnsafeReplicate :: Int -> Word8 -> ST s (MVector s Word8)

basicUnsafeRead :: MVector s Word8 -> Int -> ST s Word8

basicUnsafeWrite :: MVector s Word8 -> Int -> Word8 -> ST s ()

basicClear :: MVector s Word8 -> ST s ()

basicSet :: MVector s Word8 -> Word8 -> ST s ()

basicUnsafeCopy :: MVector s Word8 -> MVector s Word8 -> ST s ()

basicUnsafeMove :: MVector s Word8 -> MVector s Word8 -> ST s ()

basicUnsafeGrow :: MVector s Word8 -> Int -> ST s (MVector s Word8)

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)

MArray (STUArray s) Word8 (ST s) 
Instance details

Defined in Data.Array.Base

Methods

getBounds :: Ix i => STUArray s i Word8 -> ST s (i, i)

getNumElements :: Ix i => STUArray s i Word8 -> ST s Int

newArray :: Ix i => (i, i) -> Word8 -> ST s (STUArray s i Word8)

newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Word8)

unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Word8)

unsafeRead :: Ix i => STUArray s i Word8 -> Int -> ST s Word8

unsafeWrite :: Ix i => STUArray s i Word8 -> Int -> Word8 -> ST s ()

type NatNumMaxBound Word8 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Word8 = 255
type Difference Word8 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Word8 = Word8
type PrimSize Word8 
Instance details

Defined in Basement.PrimType

type PrimSize Word8 = 1
newtype Vector Word8 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector Word8 = V_Word8 (Vector Word8)
type ByteSink Word8 g 
Instance details

Defined in Data.UUID.Types.Internal.Builder

type ByteSink Word8 g = Takes1Byte g
newtype MVector s Word8 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Word8 = MV_Word8 (MVector s Word8)

data Int64 #

Instances

Instances details
FromJSON Int64 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Int64 #

parseJSONList :: Value -> Parser [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 #

BitOps Int64 
Instance details

Defined in Basement.Bits

Methods

(.&.) :: Int64 -> Int64 -> Int64

(.|.) :: Int64 -> Int64 -> Int64

(.^.) :: Int64 -> Int64 -> Int64

(.<<.) :: Int64 -> CountOf Bool -> Int64

(.>>.) :: Int64 -> CountOf Bool -> Int64

bit :: Offset Bool -> Int64

isBitSet :: Int64 -> Offset Bool -> Bool

setBit :: Int64 -> Offset Bool -> Int64

clearBit :: Int64 -> Offset Bool -> Int64

FiniteBitsOps Int64 
Instance details

Defined in Basement.Bits

Methods

numberOfBits :: Int64 -> CountOf Bool

rotateL :: Int64 -> CountOf Bool -> Int64

rotateR :: Int64 -> CountOf Bool -> Int64

popCount :: Int64 -> CountOf Bool

bitFlip :: Int64 -> Int64

countLeadingZeros :: Int64 -> CountOf Bool

countTrailingZeros :: Int64 -> CountOf Bool

Subtractive Int64 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Int64

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 :: Nat

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

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 #

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

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

Unbox Int64 
Instance details

Defined in Data.Vector.Unboxed.Base

IArray UArray Int64 
Instance details

Defined in Data.Array.Base

Methods

bounds :: Ix i => UArray i Int64 -> (i, i)

numElements :: Ix i => UArray i Int64 -> Int

unsafeArray :: Ix i => (i, i) -> [(Int, Int64)] -> UArray i Int64

unsafeAt :: Ix i => UArray i Int64 -> Int -> Int64

unsafeReplace :: Ix i => UArray i Int64 -> [(Int, Int64)] -> UArray i Int64

unsafeAccum :: Ix i => (Int64 -> e' -> Int64) -> UArray i Int64 -> [(Int, e')] -> UArray i Int64

unsafeAccumArray :: Ix i => (Int64 -> e' -> Int64) -> Int64 -> (i, i) -> [(Int, e')] -> UArray i Int64

Lift Int64 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Int64 -> m Exp

liftTyped :: forall (m :: Type -> Type). Quote m => Int64 -> Code m Int64

Vector Vector Int64 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: Mutable Vector s Int64 -> ST s (Vector Int64)

basicUnsafeThaw :: Vector Int64 -> ST s (Mutable Vector s Int64)

basicLength :: Vector Int64 -> Int

basicUnsafeSlice :: Int -> Int -> Vector Int64 -> Vector Int64

basicUnsafeIndexM :: Vector Int64 -> Int -> Box Int64

basicUnsafeCopy :: Mutable Vector s Int64 -> Vector Int64 -> ST s ()

elemseq :: Vector Int64 -> Int64 -> b -> b

MVector MVector Int64 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s Int64 -> Int

basicUnsafeSlice :: Int -> Int -> MVector s Int64 -> MVector s Int64

basicOverlaps :: MVector s Int64 -> MVector s Int64 -> Bool

basicUnsafeNew :: Int -> ST s (MVector s Int64)

basicInitialize :: MVector s Int64 -> ST s ()

basicUnsafeReplicate :: Int -> Int64 -> ST s (MVector s Int64)

basicUnsafeRead :: MVector s Int64 -> Int -> ST s Int64

basicUnsafeWrite :: MVector s Int64 -> Int -> Int64 -> ST s ()

basicClear :: MVector s Int64 -> ST s ()

basicSet :: MVector s Int64 -> Int64 -> ST s ()

basicUnsafeCopy :: MVector s Int64 -> MVector s Int64 -> ST s ()

basicUnsafeMove :: MVector s Int64 -> MVector s Int64 -> ST s ()

basicUnsafeGrow :: MVector s Int64 -> Int -> ST s (MVector s Int64)

MArray (STUArray s) Int64 (ST s) 
Instance details

Defined in Data.Array.Base

Methods

getBounds :: Ix i => STUArray s i Int64 -> ST s (i, i)

getNumElements :: Ix i => STUArray s i Int64 -> ST s Int

newArray :: Ix i => (i, i) -> Int64 -> ST s (STUArray s i Int64)

newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Int64)

unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Int64)

unsafeRead :: Ix i => STUArray s i Int64 -> Int -> ST s Int64

unsafeWrite :: Ix i => STUArray s i Int64 -> Int -> Int64 -> ST s ()

type NatNumMaxBound Int64 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Int64 = 9223372036854775807
type Difference Int64 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Int64 = Int64
type PrimSize Int64 
Instance details

Defined in Basement.PrimType

type PrimSize Int64 = 8
newtype Vector Int64 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector Int64 = V_Int64 (Vector Int64)
newtype MVector s Int64 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Int64 = MV_Int64 (MVector s Int64)

data Int32 #

Instances

Instances details
FromJSON Int32 
Instance details

Defined in Data.Aeson.Types.FromJSON

Methods

parseJSON :: Value -> Parser Int32 #

parseJSONList :: Value -> Parser [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 #

BitOps Int32 
Instance details

Defined in Basement.Bits

Methods

(.&.) :: Int32 -> Int32 -> Int32

(.|.) :: Int32 -> Int32 -> Int32

(.^.) :: Int32 -> Int32 -> Int32

(.<<.) :: Int32 -> CountOf Bool -> Int32

(.>>.) :: Int32 -> CountOf Bool -> Int32

bit :: Offset Bool -> Int32

isBitSet :: Int32 -> Offset Bool -> Bool

setBit :: Int32 -> Offset Bool -> Int32

clearBit :: Int32 -> Offset Bool -> Int32

FiniteBitsOps Int32 
Instance details

Defined in Basement.Bits

Methods

numberOfBits :: Int32 -> CountOf Bool

rotateL :: Int32 -> CountOf Bool -> Int32

rotateR :: Int32 -> CountOf Bool -> Int32

popCount :: Int32 -> CountOf Bool

bitFlip :: Int32 -> Int32

countLeadingZeros :: Int32 -> CountOf Bool

countTrailingZeros :: Int32 -> CountOf Bool

Subtractive Int32 
Instance details

Defined in Basement.Numerical.Subtractive

Associated Types

type Difference Int32

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 :: Nat

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

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 #

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

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

Unbox Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

IArray UArray Int32 
Instance details

Defined in Data.Array.Base

Methods

bounds :: Ix i => UArray i Int32 -> (i, i)

numElements :: Ix i => UArray i Int32 -> Int

unsafeArray :: Ix i => (i, i) -> [(Int, Int32)] -> UArray i Int32

unsafeAt :: Ix i => UArray i Int32 -> Int -> Int32

unsafeReplace :: Ix i => UArray i Int32 -> [(Int, Int32)] -> UArray i Int32

unsafeAccum :: Ix i => (Int32 -> e' -> Int32) -> UArray i Int32 -> [(Int, e')] -> UArray i Int32

unsafeAccumArray :: Ix i => (Int32 -> e' -> Int32) -> Int32 -> (i, i) -> [(Int, e')] -> UArray i Int32

Lift Int32 
Instance details

Defined in Language.Haskell.TH.Syntax

Methods

lift :: Quote m => Int32 -> m Exp

liftTyped :: forall (m :: Type -> Type). Quote m => Int32 -> Code m Int32

Vector Vector Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicUnsafeFreeze :: Mutable Vector s Int32 -> ST s (Vector Int32)

basicUnsafeThaw :: Vector Int32 -> ST s (Mutable Vector s Int32)

basicLength :: Vector Int32 -> Int

basicUnsafeSlice :: Int -> Int -> Vector Int32 -> Vector Int32

basicUnsafeIndexM :: Vector Int32 -> Int -> Box Int32

basicUnsafeCopy :: Mutable Vector s Int32 -> Vector Int32 -> ST s ()

elemseq :: Vector Int32 -> Int32 -> b -> b

MVector MVector Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

Methods

basicLength :: MVector s Int32 -> Int

basicUnsafeSlice :: Int -> Int -> MVector s Int32 -> MVector s Int32

basicOverlaps :: MVector s Int32 -> MVector s Int32 -> Bool

basicUnsafeNew :: Int -> ST s (MVector s Int32)

basicInitialize :: MVector s Int32 -> ST s ()

basicUnsafeReplicate :: Int -> Int32 -> ST s (MVector s Int32)

basicUnsafeRead :: MVector s Int32 -> Int -> ST s Int32

basicUnsafeWrite :: MVector s Int32 -> Int -> Int32 -> ST s ()

basicClear :: MVector s Int32 -> ST s ()

basicSet :: MVector s Int32 -> Int32 -> ST s ()

basicUnsafeCopy :: MVector s Int32 -> MVector s Int32 -> ST s ()

basicUnsafeMove :: MVector s Int32 -> MVector s Int32 -> ST s ()

basicUnsafeGrow :: MVector s Int32 -> Int -> ST s (MVector s Int32)

MArray (STUArray s) Int32 (ST s) 
Instance details

Defined in Data.Array.Base

Methods

getBounds :: Ix i => STUArray s i Int32 -> ST s (i, i)

getNumElements :: Ix i => STUArray s i Int32 -> ST s Int

newArray :: Ix i => (i, i) -> Int32 -> ST s (STUArray s i Int32)

newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Int32)

unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Int32)

unsafeRead :: Ix i => STUArray s i Int32 -> Int -> ST s Int32

unsafeWrite :: Ix i => STUArray s i Int32 -> Int -> Int32 -> ST s ()

type NatNumMaxBound Int32 
Instance details

Defined in Basement.Nat

type NatNumMaxBound Int32 = 2147483647
type Difference Int32 
Instance details

Defined in Basement.Numerical.Subtractive

type Difference Int32 = Int32
type PrimSize Int32 
Instance details

Defined in Basement.PrimType

type PrimSize Int32 = 4
newtype Vector Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype Vector Int32 = V_Int32 (Vector Int32)
newtype MVector s Int32 
Instance details

Defined in Data.Vector.Unboxed.Base

newtype MVector s Int32 = MV_Int32 (MVector s Int32)

class Generic a #

Minimal complete definition

from, to

Instances

Instances details
Generic Value 
Instance details

Defined in Data.Aeson.Types.Internal

Associated Types

type Rep Value :: Type -> Type

Methods

from :: Value -> Rep Value x

to :: Rep Value x -> Value

Generic All 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep All :: Type -> Type

Methods

from :: All -> Rep All x

to :: Rep All x -> All

Generic Any 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep Any :: Type -> Type

Methods

from :: Any -> Rep Any x

to :: Rep Any x -> Any

Generic Version 
Instance details

Defined in Data.Version

Associated Types

type Rep Version :: Type -> Type

Methods

from :: Version -> Rep Version x

to :: Rep Version x -> Version

Generic Void 
Instance details

Defined in Data.Void

Associated Types

type Rep Void :: Type -> Type

Methods

from :: Void -> Rep Void x

to :: Rep Void x -> Void

Generic ByteOrder 
Instance details

Defined in GHC.ByteOrder

Associated Types

type Rep ByteOrder :: Type -> Type

Methods

from :: ByteOrder -> Rep ByteOrder x

to :: Rep ByteOrder x -> ByteOrder

Generic Fingerprint 
Instance details

Defined in GHC.Generics

Associated Types

type Rep Fingerprint :: Type -> Type

Methods

from :: Fingerprint -> Rep Fingerprint x

to :: Rep Fingerprint x -> Fingerprint

Generic Associativity 
Instance details

Defined in GHC.Generics

Associated Types

type Rep Associativity :: Type -> Type

Methods

from :: Associativity -> Rep Associativity x

to :: Rep Associativity x -> Associativity

Generic DecidedStrictness 
Instance details

Defined in GHC.Generics

Associated Types

type Rep DecidedStrictness :: Type -> Type

Methods

from :: DecidedStrictness -> Rep DecidedStrictness x

to :: Rep DecidedStrictness x -> DecidedStrictness

Generic Fixity 
Instance details

Defined in GHC.Generics

Associated Types

type Rep Fixity :: Type -> Type

Methods

from :: Fixity -> Rep Fixity x

to :: Rep Fixity x -> Fixity

Generic SourceStrictness 
Instance details

Defined in GHC.Generics

Associated Types

type Rep SourceStrictness :: Type -> Type

Methods

from :: SourceStrictness -> Rep SourceStrictness x

to :: Rep SourceStrictness x -> SourceStrictness

Generic SourceUnpackedness 
Instance details

Defined in GHC.Generics

Associated Types

type Rep SourceUnpackedness :: Type -> Type

Methods

from :: SourceUnpackedness -> Rep SourceUnpackedness x

to :: Rep SourceUnpackedness x -> SourceUnpackedness

Generic ExitCode 
Instance details

Defined in GHC.IO.Exception

Associated Types

type Rep ExitCode :: Type -> Type

Methods

from :: ExitCode -> Rep ExitCode x

to :: Rep ExitCode x -> ExitCode

Generic CCFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep CCFlags :: Type -> Type

Methods

from :: CCFlags -> Rep CCFlags x

to :: Rep CCFlags x -> CCFlags

Generic ConcFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep ConcFlags :: Type -> Type

Methods

from :: ConcFlags -> Rep ConcFlags x

to :: Rep ConcFlags x -> ConcFlags

Generic DebugFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep DebugFlags :: Type -> Type

Methods

from :: DebugFlags -> Rep DebugFlags x

to :: Rep DebugFlags x -> DebugFlags

Generic DoCostCentres 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep DoCostCentres :: Type -> Type

Methods

from :: DoCostCentres -> Rep DoCostCentres x

to :: Rep DoCostCentres x -> DoCostCentres

Generic DoHeapProfile 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep DoHeapProfile :: Type -> Type

Methods

from :: DoHeapProfile -> Rep DoHeapProfile x

to :: Rep DoHeapProfile x -> DoHeapProfile

Generic DoTrace 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep DoTrace :: Type -> Type

Methods

from :: DoTrace -> Rep DoTrace x

to :: Rep DoTrace x -> DoTrace

Generic GCFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep GCFlags :: Type -> Type

Methods

from :: GCFlags -> Rep GCFlags x

to :: Rep GCFlags x -> GCFlags

Generic GiveGCStats 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep GiveGCStats :: Type -> Type

Methods

from :: GiveGCStats -> Rep GiveGCStats x

to :: Rep GiveGCStats x -> GiveGCStats

Generic MiscFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep MiscFlags :: Type -> Type

Methods

from :: MiscFlags -> Rep MiscFlags x

to :: Rep MiscFlags x -> MiscFlags

Generic ParFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep ParFlags :: Type -> Type

Methods

from :: ParFlags -> Rep ParFlags x

to :: Rep ParFlags x -> ParFlags

Generic ProfFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep ProfFlags :: Type -> Type

Methods

from :: ProfFlags -> Rep ProfFlags x

to :: Rep ProfFlags x -> ProfFlags

Generic RTSFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep RTSFlags :: Type -> Type

Methods

from :: RTSFlags -> Rep RTSFlags x

to :: Rep RTSFlags x -> RTSFlags

Generic TickyFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep TickyFlags :: Type -> Type

Methods

from :: TickyFlags -> Rep TickyFlags x

to :: Rep TickyFlags x -> TickyFlags

Generic TraceFlags 
Instance details

Defined in GHC.RTS.Flags

Associated Types

type Rep TraceFlags :: Type -> Type

Methods

from :: TraceFlags -> Rep TraceFlags x

to :: Rep TraceFlags x -> TraceFlags

Generic SrcLoc 
Instance details

Defined in GHC.Generics

Associated Types

type Rep SrcLoc :: Type -> Type

Methods

from :: SrcLoc -> Rep SrcLoc x

to :: Rep SrcLoc x -> SrcLoc

Generic GCDetails 
Instance details

Defined in GHC.Stats

Associated Types

type Rep GCDetails :: Type -> Type

Methods

from :: GCDetails -> Rep GCDetails x

to :: Rep GCDetails x -> GCDetails

Generic RTSStats 
Instance details

Defined in GHC.Stats

Associated Types

type Rep RTSStats :: Type -> Type

Methods

from :: RTSStats -> Rep RTSStats x

to :: Rep RTSStats x -> RTSStats

Generic GeneralCategory 
Instance details

Defined in GHC.Generics

Associated Types

type Rep GeneralCategory :: Type -> Type

Methods

from :: GeneralCategory -> Rep GeneralCategory x

to :: Rep GeneralCategory x -> GeneralCategory

Generic Clock 
Instance details

Defined in System.Clock

Associated Types

type Rep Clock :: Type -> Type

Methods

from :: Clock -> Rep Clock x

to :: Rep Clock x -> Clock

Generic TimeSpec 
Instance details

Defined in System.Clock

Associated Types

type Rep TimeSpec :: Type -> Type

Methods

from :: TimeSpec -> Rep TimeSpec x

to :: Rep TimeSpec x -> TimeSpec

Generic ForeignSrcLang 
Instance details

Defined in GHC.ForeignSrcLang.Type

Associated Types

type Rep ForeignSrcLang :: Type -> Type

Methods

from :: ForeignSrcLang -> Rep ForeignSrcLang x

to :: Rep ForeignSrcLang x -> ForeignSrcLang

Generic Extension 
Instance details

Defined in GHC.LanguageExtensions.Type

Associated Types

type Rep Extension :: Type -> Type

Methods

from :: Extension -> Rep Extension x

to :: Rep Extension x -> Extension

Generic ClosureType 
Instance details

Defined in GHC.Exts.Heap.ClosureTypes

Associated Types

type Rep ClosureType :: Type -> Type

Methods

from :: ClosureType -> Rep ClosureType x

to :: Rep ClosureType x -> ClosureType

Generic PrimType 
Instance details

Defined in GHC.Exts.Heap.Closures

Associated Types

type Rep PrimType :: Type -> Type

Methods

from :: PrimType -> Rep PrimType x

to :: Rep PrimType x -> PrimType

Generic TsoFlags 
Instance details

Defined in GHC.Exts.Heap.Closures

Associated Types

type Rep TsoFlags :: Type -> Type

Methods

from :: TsoFlags -> Rep TsoFlags x

to :: Rep TsoFlags x -> TsoFlags

Generic WhatNext 
Instance details

Defined in GHC.Exts.Heap.Closures

Associated Types

type Rep WhatNext :: Type -> Type

Methods

from :: WhatNext -> Rep WhatNext x

to :: Rep WhatNext x -> WhatNext

Generic WhyBlocked 
Instance details

Defined in GHC.Exts.Heap.Closures

Associated Types

type Rep WhyBlocked :: Type -> Type

Methods

from :: WhyBlocked -> Rep WhyBlocked x

to :: Rep WhyBlocked x -> WhyBlocked

Generic StgInfoTable 
Instance details

Defined in GHC.Exts.Heap.InfoTable.Types

Associated Types

type Rep StgInfoTable :: Type -> Type

Methods

from :: StgInfoTable -> Rep StgInfoTable x

to :: Rep StgInfoTable x -> StgInfoTable

Generic CostCentre 
Instance details

Defined in GHC.Exts.Heap.ProfInfo.Types

Associated Types

type Rep CostCentre :: Type -> Type

Methods

from :: CostCentre -> Rep CostCentre x

to :: Rep CostCentre x -> CostCentre

Generic CostCentreStack 
Instance details

Defined in GHC.Exts.Heap.ProfInfo.Types

Associated Types

type Rep CostCentreStack :: Type -> Type

Methods

from :: CostCentreStack -> Rep CostCentreStack x

to :: Rep CostCentreStack x -> CostCentreStack

Generic IndexTable 
Instance details

Defined in GHC.Exts.Heap.ProfInfo.Types

Associated Types

type Rep IndexTable :: Type -> Type

Methods

from :: IndexTable -> Rep IndexTable x

to :: Rep IndexTable x -> IndexTable

Generic StgTSOProfInfo 
Instance details

Defined in GHC.Exts.Heap.ProfInfo.Types

Associated Types

type Rep StgTSOProfInfo :: Type -> Type

Methods

from :: StgTSOProfInfo -> Rep StgTSOProfInfo x

to :: Rep StgTSOProfInfo x -> StgTSOProfInfo

Generic Ordering 
Instance details

Defined in GHC.Generics

Associated Types

type Rep Ordering :: Type -> Type

Methods

from :: Ordering -> Rep Ordering x

to :: Rep Ordering x -> Ordering

Generic FFIConv 
Instance details

Defined in GHCi.FFI

Associated Types

type Rep FFIConv :: Type -> Type

Methods

from :: FFIConv -> Rep FFIConv x

to :: Rep FFIConv x -> FFIConv

Generic FFIType 
Instance details

Defined in GHCi.FFI

Associated Types

type Rep FFIType :: Type -> Type

Methods

from :: FFIType -> Rep FFIType x

to :: Rep FFIType x -> FFIType

Generic EvalOpts 
Instance details

Defined in GHCi.Message

Associated Types

type Rep EvalOpts :: Type -> Type

Methods

from :: EvalOpts -> Rep EvalOpts x

to :: Rep EvalOpts x -> EvalOpts

Generic SerializableException 
Instance details

Defined in GHCi.Message

Associated Types

type Rep SerializableException :: Type -> Type

Methods

from :: SerializableException -> Rep SerializableException x

to :: Rep SerializableException x -> SerializableException

Generic THResultType 
Instance details

Defined in GHCi.Message

Associated Types

type Rep THResultType :: Type -> Type

Methods

from :: THResultType -> Rep THResultType x

to :: Rep THResultType x -> THResultType

Generic ResolvedBCO 
Instance details

Defined in GHCi.ResolvedBCO

Associated Types

type Rep ResolvedBCO :: Type -> Type

Methods

from :: ResolvedBCO -> Rep ResolvedBCO x

to :: Rep ResolvedBCO x -> ResolvedBCO

Generic ResolvedBCOPtr 
Instance details

Defined in GHCi.ResolvedBCO

Associated Types

type Rep ResolvedBCOPtr :: Type -> Type

Methods

from :: ResolvedBCOPtr -> Rep ResolvedBCOPtr x

to :: Rep ResolvedBCOPtr x -> ResolvedBCOPtr

Generic SrcLoc 
Instance details

Defined in Language.Haskell.Exts.SrcLoc

Associated Types

type Rep SrcLoc :: Type -> Type

Methods

from :: SrcLoc -> Rep SrcLoc x

to :: Rep SrcLoc x -> SrcLoc

Generic SrcSpan 
Instance details

Defined in Language.Haskell.Exts.SrcLoc

Associated Types

type Rep SrcSpan :: Type -> Type

Methods

from :: SrcSpan -> Rep SrcSpan x

to :: Rep SrcSpan x -> SrcSpan

Generic SrcSpanInfo 
Instance details

Defined in Language.Haskell.Exts.SrcLoc

Associated Types

type Rep SrcSpanInfo :: Type -> Type

Methods

from :: SrcSpanInfo -> Rep SrcSpanInfo x

to :: Rep SrcSpanInfo x -> SrcSpanInfo

Generic Boxed 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep Boxed :: Type -> Type

Methods

from :: Boxed -> Rep Boxed x

to :: Rep Boxed x -> Boxed

Generic Tool 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep Tool :: Type -> Type

Methods

from :: Tool -> Rep Tool x

to :: Rep Tool x -> Tool

Generic InflectionException 
Instance details

Defined in Text.Inflections.Types

Associated Types

type Rep InflectionException :: Type -> Type

Methods

from :: InflectionException -> Rep InflectionException x

to :: Rep InflectionException x -> InflectionException

Generic IP 
Instance details

Defined in Net.IP

Associated Types

type Rep IP :: Type -> Type

Methods

from :: IP -> Rep IP x

to :: Rep IP x -> IP

Generic IPv4 
Instance details

Defined in Net.IPv4

Associated Types

type Rep IPv4 :: Type -> Type

Methods

from :: IPv4 -> Rep IPv4 x

to :: Rep IPv4 x -> IPv4

Generic IPv4Range 
Instance details

Defined in Net.IPv4

Associated Types

type Rep IPv4Range :: Type -> Type

Methods

from :: IPv4Range -> Rep IPv4Range x

to :: Rep IPv4Range x -> IPv4Range

Generic IPv6 
Instance details

Defined in Net.IPv6

Associated Types

type Rep IPv6 :: Type -> Type

Methods

from :: IPv6 -> Rep IPv6 x

to :: Rep IPv6 x -> IPv6

Generic IPv6Range 
Instance details

Defined in Net.IPv6

Associated Types

type Rep IPv6Range :: Type -> Type

Methods

from :: IPv6Range -> Rep IPv6Range x

to :: Rep IPv6Range x -> IPv6Range

Generic IP 
Instance details

Defined in Data.IP.Addr

Associated Types

type Rep IP :: Type -> Type

Methods

from :: IP -> Rep IP x

to :: Rep IP x -> IP

Generic IPv4 
Instance details

Defined in Data.IP.Addr

Associated Types

type Rep IPv4 :: Type -> Type

Methods

from :: IPv4 -> Rep IPv4 x

to :: Rep IPv4 x -> IPv4

Generic IPv6 
Instance details

Defined in Data.IP.Addr

Associated Types

type Rep IPv6 :: Type -> Type

Methods

from :: IPv6 -> Rep IPv6 x

to :: Rep IPv6 x -> IPv6

Generic IPRange 
Instance details

Defined in Data.IP.Range

Associated Types

type Rep IPRange :: Type -> Type

Methods

from :: IPRange -> Rep IPRange x

to :: Rep IPRange x -> IPRange

Generic FunctionCall Source # 
Instance details

Defined in IHP.DataSync.DynamicQuery

Associated Types

type Rep FunctionCall :: Type -> Type

Generic OrderByClause Source # 
Instance details

Defined in IHP.DataSync.DynamicQuery

Associated Types

type Rep OrderByClause :: Type -> Type

Generic OrderByClause Source # 
Instance details

Defined in IHP.QueryBuilder

Associated Types

type Rep OrderByClause :: Type -> Type

Generic OrderByDirection Source # 
Instance details

Defined in IHP.QueryBuilder

Associated Types

type Rep OrderByDirection :: Type -> Type

Generic InvalidPosException 
Instance details

Defined in Text.Megaparsec.Pos

Associated Types

type Rep InvalidPosException :: Type -> Type

Methods

from :: InvalidPosException -> Rep InvalidPosException x

to :: Rep InvalidPosException x -> InvalidPosException

Generic Pos 
Instance details

Defined in Text.Megaparsec.Pos

Associated Types

type Rep Pos :: Type -> Type

Methods

from :: Pos -> Rep Pos x

to :: Rep Pos x -> Pos

Generic SourcePos 
Instance details

Defined in Text.Megaparsec.Pos

Associated Types

type Rep SourcePos :: Type -> Type

Methods

from :: SourcePos -> Rep SourcePos x

to :: Rep SourcePos x -> SourcePos

Generic Address 
Instance details

Defined in Network.Mail.Mime

Associated Types

type Rep Address :: Type -> Type

Methods

from :: Address -> Rep Address x

to :: Rep Address x -> Address

Generic Disposition 
Instance details

Defined in Network.Mail.Mime

Associated Types

type Rep Disposition :: Type -> Type

Methods

from :: Disposition -> Rep Disposition x

to :: Rep Disposition x -> Disposition

Generic Encoding 
Instance details

Defined in Network.Mail.Mime

Associated Types

type Rep Encoding :: Type -> Type

Methods

from :: Encoding -> Rep Encoding x

to :: Rep Encoding x -> Encoding

Generic Mail 
Instance details

Defined in Network.Mail.Mime

Associated Types

type Rep Mail :: Type -> Type

Methods

from :: Mail -> Rep Mail x

to :: Rep Mail x -> Mail

Generic Part 
Instance details

Defined in Network.Mail.Mime

Associated Types

type Rep Part :: Type -> Type

Methods

from :: Part -> Rep Part x

to :: Rep Part x -> Part

Generic PartContent 
Instance details

Defined in Network.Mail.Mime

Associated Types

type Rep PartContent :: Type -> Type

Methods

from :: PartContent -> Rep PartContent x

to :: Rep PartContent x -> PartContent

Generic URI 
Instance details

Defined in Network.URI

Associated Types

type Rep URI :: Type -> Type

Methods

from :: URI -> Rep URI x

to :: Rep URI x -> URI

Generic URIAuth 
Instance details

Defined in Network.URI

Associated Types

type Rep URIAuth :: Type -> Type

Methods

from :: URIAuth -> Rep URIAuth x

to :: Rep URIAuth x -> URIAuth

Generic ConnectInfo 
Instance details

Defined in Database.PostgreSQL.Simple.Internal

Associated Types

type Rep ConnectInfo :: Type -> Type

Methods

from :: ConnectInfo -> Rep ConnectInfo x

to :: Rep ConnectInfo x -> ConnectInfo

Generic Mode 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Associated Types

type Rep Mode :: Type -> Type

Methods

from :: Mode -> Rep Mode x

to :: Rep Mode x -> Mode

Generic Style 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Associated Types

type Rep Style :: Type -> Type

Methods

from :: Style -> Rep Style x

to :: Rep Style x -> Style

Generic TextDetails 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Associated Types

type Rep TextDetails :: Type -> Type

Methods

from :: TextDetails -> Rep TextDetails x

to :: Rep TextDetails x -> TextDetails

Generic Doc 
Instance details

Defined in Text.PrettyPrint.HughesPJ

Associated Types

type Rep Doc :: Type -> Type

Methods

from :: Doc -> Rep Doc x

to :: Rep Doc x -> Doc

Generic Undefined 
Instance details

Defined in Relude.Debug

Associated Types

type Rep Undefined :: Type -> Type

Methods

from :: Undefined -> Rep Undefined x

to :: Rep Undefined x -> Undefined

Generic RetryAction 
Instance details

Defined in Control.Retry

Associated Types

type Rep RetryAction :: Type -> Type

Methods

from :: RetryAction -> Rep RetryAction x

to :: Rep RetryAction x -> RetryAction

Generic RetryStatus 
Instance details

Defined in Control.Retry

Associated Types

type Rep RetryStatus :: Type -> Type

Methods

from :: RetryStatus -> Rep RetryStatus x

to :: Rep RetryStatus x -> RetryStatus

Generic AnnLookup 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep AnnLookup :: Type -> Type

Methods

from :: AnnLookup -> Rep AnnLookup x

to :: Rep AnnLookup x -> AnnLookup

Generic AnnTarget 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep AnnTarget :: Type -> Type

Methods

from :: AnnTarget -> Rep AnnTarget x

to :: Rep AnnTarget x -> AnnTarget

Generic Bang 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Bang :: Type -> Type

Methods

from :: Bang -> Rep Bang x

to :: Rep Bang x -> Bang

Generic Body 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Body :: Type -> Type

Methods

from :: Body -> Rep Body x

to :: Rep Body x -> Body

Generic Bytes 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Bytes :: Type -> Type

Methods

from :: Bytes -> Rep Bytes x

to :: Rep Bytes x -> Bytes

Generic Callconv 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Callconv :: Type -> Type

Methods

from :: Callconv -> Rep Callconv x

to :: Rep Callconv x -> Callconv

Generic Clause 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Clause :: Type -> Type

Methods

from :: Clause -> Rep Clause x

to :: Rep Clause x -> Clause

Generic Con 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Con :: Type -> Type

Methods

from :: Con -> Rep Con x

to :: Rep Con x -> Con

Generic Dec 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Dec :: Type -> Type

Methods

from :: Dec -> Rep Dec x

to :: Rep Dec x -> Dec

Generic DecidedStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep DecidedStrictness :: Type -> Type

Methods

from :: DecidedStrictness -> Rep DecidedStrictness x

to :: Rep DecidedStrictness x -> DecidedStrictness

Generic DerivClause 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep DerivClause :: Type -> Type

Methods

from :: DerivClause -> Rep DerivClause x

to :: Rep DerivClause x -> DerivClause

Generic DerivStrategy 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep DerivStrategy :: Type -> Type

Methods

from :: DerivStrategy -> Rep DerivStrategy x

to :: Rep DerivStrategy x -> DerivStrategy

Generic DocLoc 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep DocLoc :: Type -> Type

Methods

from :: DocLoc -> Rep DocLoc x

to :: Rep DocLoc x -> DocLoc

Generic Exp 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Exp :: Type -> Type

Methods

from :: Exp -> Rep Exp x

to :: Rep Exp x -> Exp

Generic FamilyResultSig 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep FamilyResultSig :: Type -> Type

Methods

from :: FamilyResultSig -> Rep FamilyResultSig x

to :: Rep FamilyResultSig x -> FamilyResultSig

Generic Fixity 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Fixity :: Type -> Type

Methods

from :: Fixity -> Rep Fixity x

to :: Rep Fixity x -> Fixity

Generic FixityDirection 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep FixityDirection :: Type -> Type

Methods

from :: FixityDirection -> Rep FixityDirection x

to :: Rep FixityDirection x -> FixityDirection

Generic Foreign 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Foreign :: Type -> Type

Methods

from :: Foreign -> Rep Foreign x

to :: Rep Foreign x -> Foreign

Generic FunDep 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep FunDep :: Type -> Type

Methods

from :: FunDep -> Rep FunDep x

to :: Rep FunDep x -> FunDep

Generic Guard 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Guard :: Type -> Type

Methods

from :: Guard -> Rep Guard x

to :: Rep Guard x -> Guard

Generic Info 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Info :: Type -> Type

Methods

from :: Info -> Rep Info x

to :: Rep Info x -> Info

Generic InjectivityAnn 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep InjectivityAnn :: Type -> Type

Methods

from :: InjectivityAnn -> Rep InjectivityAnn x

to :: Rep InjectivityAnn x -> InjectivityAnn

Generic Inline 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Inline :: Type -> Type

Methods

from :: Inline -> Rep Inline x

to :: Rep Inline x -> Inline

Generic Lit 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Lit :: Type -> Type

Methods

from :: Lit -> Rep Lit x

to :: Rep Lit x -> Lit

Generic Loc 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Loc :: Type -> Type

Methods

from :: Loc -> Rep Loc x

to :: Rep Loc x -> Loc

Generic Match 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Match :: Type -> Type

Methods

from :: Match -> Rep Match x

to :: Rep Match x -> Match

Generic ModName 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep ModName :: Type -> Type

Methods

from :: ModName -> Rep ModName x

to :: Rep ModName x -> ModName

Generic Module 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Module :: Type -> Type

Methods

from :: Module -> Rep Module x

to :: Rep Module x -> Module

Generic ModuleInfo 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep ModuleInfo :: Type -> Type

Methods

from :: ModuleInfo -> Rep ModuleInfo x

to :: Rep ModuleInfo x -> ModuleInfo

Generic Name 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Name :: Type -> Type

Methods

from :: Name -> Rep Name x

to :: Rep Name x -> Name

Generic NameFlavour 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep NameFlavour :: Type -> Type

Methods

from :: NameFlavour -> Rep NameFlavour x

to :: Rep NameFlavour x -> NameFlavour

Generic NameSpace 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep NameSpace :: Type -> Type

Methods

from :: NameSpace -> Rep NameSpace x

to :: Rep NameSpace x -> NameSpace

Generic OccName 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep OccName :: Type -> Type

Methods

from :: OccName -> Rep OccName x

to :: Rep OccName x -> OccName

Generic Overlap 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Overlap :: Type -> Type

Methods

from :: Overlap -> Rep Overlap x

to :: Rep Overlap x -> Overlap

Generic Pat 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Pat :: Type -> Type

Methods

from :: Pat -> Rep Pat x

to :: Rep Pat x -> Pat

Generic PatSynArgs 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep PatSynArgs :: Type -> Type

Methods

from :: PatSynArgs -> Rep PatSynArgs x

to :: Rep PatSynArgs x -> PatSynArgs

Generic PatSynDir 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep PatSynDir :: Type -> Type

Methods

from :: PatSynDir -> Rep PatSynDir x

to :: Rep PatSynDir x -> PatSynDir

Generic Phases 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Phases :: Type -> Type

Methods

from :: Phases -> Rep Phases x

to :: Rep Phases x -> Phases

Generic PkgName 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep PkgName :: Type -> Type

Methods

from :: PkgName -> Rep PkgName x

to :: Rep PkgName x -> PkgName

Generic Pragma 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Pragma :: Type -> Type

Methods

from :: Pragma -> Rep Pragma x

to :: Rep Pragma x -> Pragma

Generic Range 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Range :: Type -> Type

Methods

from :: Range -> Rep Range x

to :: Rep Range x -> Range

Generic Role 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Role :: Type -> Type

Methods

from :: Role -> Rep Role x

to :: Rep Role x -> Role

Generic RuleBndr 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep RuleBndr :: Type -> Type

Methods

from :: RuleBndr -> Rep RuleBndr x

to :: Rep RuleBndr x -> RuleBndr

Generic RuleMatch 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep RuleMatch :: Type -> Type

Methods

from :: RuleMatch -> Rep RuleMatch x

to :: Rep RuleMatch x -> RuleMatch

Generic Safety 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Safety :: Type -> Type

Methods

from :: Safety -> Rep Safety x

to :: Rep Safety x -> Safety

Generic SourceStrictness 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep SourceStrictness :: Type -> Type

Methods

from :: SourceStrictness -> Rep SourceStrictness x

to :: Rep SourceStrictness x -> SourceStrictness

Generic SourceUnpackedness 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep SourceUnpackedness :: Type -> Type

Methods

from :: SourceUnpackedness -> Rep SourceUnpackedness x

to :: Rep SourceUnpackedness x -> SourceUnpackedness

Generic Specificity 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Specificity :: Type -> Type

Methods

from :: Specificity -> Rep Specificity x

to :: Rep Specificity x -> Specificity

Generic Stmt 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Stmt :: Type -> Type

Methods

from :: Stmt -> Rep Stmt x

to :: Rep Stmt x -> Stmt

Generic TyLit 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep TyLit :: Type -> Type

Methods

from :: TyLit -> Rep TyLit x

to :: Rep TyLit x -> TyLit

Generic TySynEqn 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep TySynEqn :: Type -> Type

Methods

from :: TySynEqn -> Rep TySynEqn x

to :: Rep TySynEqn x -> TySynEqn

Generic Type 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep Type :: Type -> Type

Methods

from :: Type -> Rep Type x

to :: Rep Type x -> Type

Generic TypeFamilyHead 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep TypeFamilyHead :: Type -> Type

Methods

from :: TypeFamilyHead -> Rep TypeFamilyHead x

to :: Rep TypeFamilyHead x -> TypeFamilyHead

Generic ConstructorInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep ConstructorInfo :: Type -> Type

Methods

from :: ConstructorInfo -> Rep ConstructorInfo x

to :: Rep ConstructorInfo x -> ConstructorInfo

Generic ConstructorVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep ConstructorVariant :: Type -> Type

Methods

from :: ConstructorVariant -> Rep ConstructorVariant x

to :: Rep ConstructorVariant x -> ConstructorVariant

Generic DatatypeInfo 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep DatatypeInfo :: Type -> Type

Methods

from :: DatatypeInfo -> Rep DatatypeInfo x

to :: Rep DatatypeInfo x -> DatatypeInfo

Generic DatatypeVariant 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep DatatypeVariant :: Type -> Type

Methods

from :: DatatypeVariant -> Rep DatatypeVariant x

to :: Rep DatatypeVariant x -> DatatypeVariant

Generic FieldStrictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep FieldStrictness :: Type -> Type

Methods

from :: FieldStrictness -> Rep FieldStrictness x

to :: Rep FieldStrictness x -> FieldStrictness

Generic Strictness 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep Strictness :: Type -> Type

Methods

from :: Strictness -> Rep Strictness x

to :: Rep Strictness x -> Strictness

Generic Unpackedness 
Instance details

Defined in Language.Haskell.TH.Datatype

Associated Types

type Rep Unpackedness :: Type -> Type

Methods

from :: Unpackedness -> Rep Unpackedness x

to :: Rep Unpackedness x -> Unpackedness

Generic ConcException 
Instance details

Defined in UnliftIO.Internals.Async

Associated Types

type Rep ConcException :: Type -> Type

Generic Int128 
Instance details

Defined in Data.WideWord.Int128

Associated Types

type Rep Int128 :: Type -> Type

Methods

from :: Int128 -> Rep Int128 x

to :: Rep Int128 x -> Int128

Generic Word128 
Instance details

Defined in Data.WideWord.Word128

Associated Types

type Rep Word128 :: Type -> Type

Methods

from :: Word128 -> Rep Word128 x

to :: Rep Word128 x -> Word128

Generic Word256 
Instance details

Defined in Data.WideWord.Word256

Associated Types

type Rep Word256 :: Type -> Type

Methods

from :: Word256 -> Rep Word256 x

to :: Rep Word256 x -> Word256

Generic Content 
Instance details

Defined in Data.XML.Types

Associated Types

type Rep Content :: Type -> Type

Methods

from :: Content -> Rep Content x

to :: Rep Content x -> Content

Generic Doctype 
Instance details

Defined in Data.XML.Types

Associated Types

type Rep Doctype :: Type -> Type

Methods

from :: Doctype -> Rep Doctype x

to :: Rep Doctype x -> Doctype

Generic Document 
Instance details

Defined in Data.XML.Types

Associated Types

type Rep Document :: Type -> Type

Methods

from :: Document -> Rep Document x

to :: Rep Document x -> Document

Generic Element 
Instance details

Defined in Data.XML.Types

Associated Types

type Rep Element :: Type -> Type

Methods

from :: Element -> Rep Element x

to :: Rep Element x -> Element

Generic Event 
Instance details

Defined in Data.XML.Types

Associated Types

type Rep Event :: Type -> Type

Methods

from :: Event -> Rep Event x

to :: Rep Event x -> Event

Generic ExternalID 
Instance details

Defined in Data.XML.Types

Associated Types

type Rep ExternalID :: Type -> Type

Methods

from :: ExternalID -> Rep ExternalID x

to :: Rep ExternalID x -> ExternalID

Generic Instruction 
Instance details

Defined in Data.XML.Types

Associated Types

type Rep Instruction :: Type -> Type

Methods

from :: Instruction -> Rep Instruction x

to :: Rep Instruction x -> Instruction

Generic Miscellaneous 
Instance details

Defined in Data.XML.Types

Associated Types

type Rep Miscellaneous :: Type -> Type

Methods

from :: Miscellaneous -> Rep Miscellaneous x

to :: Rep Miscellaneous x -> Miscellaneous

Generic Name 
Instance details

Defined in Data.XML.Types

Associated Types

type Rep Name :: Type -> Type

Methods

from :: Name -> Rep Name x

to :: Rep Name x -> Name

Generic Node 
Instance details

Defined in Data.XML.Types

Associated Types

type Rep Node :: Type -> Type

Methods

from :: Node -> Rep Node x

to :: Rep Node x -> Node

Generic Prologue 
Instance details

Defined in Data.XML.Types

Associated Types

type Rep Prologue :: Type -> Type

Methods

from :: Prologue -> Rep Prologue x

to :: Rep Prologue x -> Prologue

Generic CompressionLevel 
Instance details

Defined in Codec.Compression.Zlib.Stream

Associated Types

type Rep CompressionLevel :: Type -> Type

Methods

from :: CompressionLevel -> Rep CompressionLevel x

to :: Rep CompressionLevel x -> CompressionLevel

Generic CompressionStrategy 
Instance details

Defined in Codec.Compression.Zlib.Stream

Associated Types

type Rep CompressionStrategy :: Type -> Type

Methods

from :: CompressionStrategy -> Rep CompressionStrategy x

to :: Rep CompressionStrategy x -> CompressionStrategy

Generic Format 
Instance details

Defined in Codec.Compression.Zlib.Stream

Associated Types

type Rep Format :: Type -> Type

Methods

from :: Format -> Rep Format x

to :: Rep Format x -> Format

Generic MemoryLevel 
Instance details

Defined in Codec.Compression.Zlib.Stream

Associated Types

type Rep MemoryLevel :: Type -> Type

Methods

from :: MemoryLevel -> Rep MemoryLevel x

to :: Rep MemoryLevel x -> MemoryLevel

Generic Method 
Instance details

Defined in Codec.Compression.Zlib.Stream

Associated Types

type Rep Method :: Type -> Type

Methods

from :: Method -> Rep Method x

to :: Rep Method x -> Method

Generic WindowBits 
Instance details

Defined in Codec.Compression.Zlib.Stream

Associated Types

type Rep WindowBits :: Type -> Type

Methods

from :: WindowBits -> Rep WindowBits x

to :: Rep WindowBits x -> WindowBits

Generic () 
Instance details

Defined in GHC.Generics

Associated Types

type Rep () :: Type -> Type

Methods

from :: () -> Rep () x

to :: Rep () x -> ()

Generic Bool 
Instance details

Defined in GHC.Generics

Associated Types

type Rep Bool :: Type -> Type

Methods

from :: Bool -> Rep Bool x

to :: Rep Bool x -> Bool

Generic (Only a) 
Instance details

Defined in Data.Tuple.Only

Associated Types

type Rep (Only a) :: Type -> Type

Methods

from :: Only a -> Rep (Only a) x

to :: Rep (Only a) x -> Only a

Generic (ZipList a) 
Instance details

Defined in Control.Applicative

Associated Types

type Rep (ZipList a) :: Type -> Type

Methods

from :: ZipList a -> Rep (ZipList a) x

to :: Rep (ZipList a) x -> ZipList a

Generic (Complex a) 
Instance details

Defined in Data.Complex

Associated Types

type Rep (Complex a) :: Type -> Type

Methods

from :: Complex a -> Rep (Complex a) x

to :: Rep (Complex a) x -> Complex a

Generic (Identity a) 
Instance details

Defined in Data.Functor.Identity

Associated Types

type Rep (Identity a) :: Type -> Type

Methods

from :: Identity a -> Rep (Identity a) x

to :: Rep (Identity a) x -> Identity a

Generic (First a) 
Instance details

Defined in Data.Monoid

Associated Types

type Rep (First a) :: Type -> Type

Methods

from :: First a -> Rep (First a) x

to :: Rep (First a) x -> First a

Generic (Last a) 
Instance details

Defined in Data.Monoid

Associated Types

type Rep (Last a) :: Type -> Type

Methods

from :: Last a -> Rep (Last a) x

to :: Rep (Last a) x -> Last a

Generic (Down a) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Down a) :: Type -> Type

Methods

from :: Down a -> Rep (Down a) x

to :: Rep (Down a) x -> Down a

Generic (First a) 
Instance details

Defined in Data.Semigroup

Associated Types

type Rep (First a) :: Type -> Type

Methods

from :: First a -> Rep (First a) x

to :: Rep (First a) x -> First a

Generic (Last a) 
Instance details

Defined in Data.Semigroup

Associated Types

type Rep (Last a) :: Type -> Type

Methods

from :: Last a -> Rep (Last a) x

to :: Rep (Last a) x -> Last a

Generic (Max a) 
Instance details

Defined in Data.Semigroup

Associated Types

type Rep (Max a) :: Type -> Type

Methods

from :: Max a -> Rep (Max a) x

to :: Rep (Max a) x -> Max a

Generic (Min a) 
Instance details

Defined in Data.Semigroup

Associated Types

type Rep (Min a) :: Type -> Type

Methods

from :: Min a -> Rep (Min a) x

to :: Rep (Min a) x -> Min a

Generic (WrappedMonoid m) 
Instance details

Defined in Data.Semigroup

Associated Types

type Rep (WrappedMonoid m) :: Type -> Type

Methods

from :: WrappedMonoid m -> Rep (WrappedMonoid m) x

to :: Rep (WrappedMonoid m) x -> WrappedMonoid m

Generic (Dual a) 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep (Dual a) :: Type -> Type

Methods

from :: Dual a -> Rep (Dual a) x

to :: Rep (Dual a) x -> Dual a

Generic (Endo a) 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep (Endo a) :: Type -> Type

Methods

from :: Endo a -> Rep (Endo a) x

to :: Rep (Endo a) x -> Endo a

Generic (Product a) 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep (Product a) :: Type -> Type

Methods

from :: Product a -> Rep (Product a) x

to :: Rep (Product a) x -> Product a

Generic (Sum a) 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep (Sum a) :: Type -> Type

Methods

from :: Sum a -> Rep (Sum a) x

to :: Rep (Sum a) x -> Sum a

Generic (Par1 p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Par1 p) :: Type -> Type

Methods

from :: Par1 p -> Rep (Par1 p) x

to :: Rep (Par1 p) x -> Par1 p

Generic (SCC vertex) 
Instance details

Defined in Data.Graph

Associated Types

type Rep (SCC vertex) :: Type -> Type

Methods

from :: SCC vertex -> Rep (SCC vertex) x

to :: Rep (SCC vertex) x -> SCC vertex

Generic (Digit a) 
Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep (Digit a) :: Type -> Type

Methods

from :: Digit a -> Rep (Digit a) x

to :: Rep (Digit a) x -> Digit a

Generic (Elem a) 
Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep (Elem a) :: Type -> Type

Methods

from :: Elem a -> Rep (Elem a) x

to :: Rep (Elem a) x -> Elem a

Generic (FingerTree a) 
Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep (FingerTree a) :: Type -> Type

Methods

from :: FingerTree a -> Rep (FingerTree a) x

to :: Rep (FingerTree a) x -> FingerTree a

Generic (Node a) 
Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep (Node a) :: Type -> Type

Methods

from :: Node a -> Rep (Node a) x

to :: Rep (Node a) x -> Node a

Generic (ViewL a) 
Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep (ViewL a) :: Type -> Type

Methods

from :: ViewL a -> Rep (ViewL a) x

to :: Rep (ViewL a) x -> ViewL a

Generic (ViewR a) 
Instance details

Defined in Data.Sequence.Internal

Associated Types

type Rep (ViewR a) :: Type -> Type

Methods

from :: ViewR a -> Rep (ViewR a) x

to :: Rep (ViewR a) x -> ViewR a

Generic (Tree a) 
Instance details

Defined in Data.Tree

Associated Types

type Rep (Tree a) :: Type -> Type

Methods

from :: Tree a -> Rep (Tree a) x

to :: Rep (Tree a) x -> Tree a

Generic (Fix f) 
Instance details

Defined in Data.Fix

Associated Types

type Rep (Fix f) :: Type -> Type

Methods

from :: Fix f -> Rep (Fix f) x

to :: Rep (Fix f) x -> Fix f

Generic (SizedSeq a) 
Instance details

Defined in GHC.Data.SizedSeq

Associated Types

type Rep (SizedSeq a) :: Type -> Type

Methods

from :: SizedSeq a -> Rep (SizedSeq a) x

to :: Rep (SizedSeq a) x -> SizedSeq a

Generic (GenClosure b) 
Instance details

Defined in GHC.Exts.Heap.Closures

Associated Types

type Rep (GenClosure b) :: Type -> Type

Methods

from :: GenClosure b -> Rep (GenClosure b) x

to :: Rep (GenClosure b) x -> GenClosure b

Generic (EvalExpr a) 
Instance details

Defined in GHCi.Message

Associated Types

type Rep (EvalExpr a) :: Type -> Type

Methods

from :: EvalExpr a -> Rep (EvalExpr a) x

to :: Rep (EvalExpr a) x -> EvalExpr a

Generic (EvalResult a) 
Instance details

Defined in GHCi.Message

Associated Types

type Rep (EvalResult a) :: Type -> Type

Methods

from :: EvalResult a -> Rep (EvalResult a) x

to :: Rep (EvalResult a) x -> EvalResult a

Generic (QResult a) 
Instance details

Defined in GHCi.Message

Associated Types

type Rep (QResult a) :: Type -> Type

Methods

from :: QResult a -> Rep (QResult a) x

to :: Rep (QResult a) x -> QResult a

Generic (THResult a) 
Instance details

Defined in GHCi.Message

Associated Types

type Rep (THResult a) :: Type -> Type

Methods

from :: THResult a -> Rep (THResult a) x

to :: Rep (THResult a) x -> THResult a

Generic (Loc a) 
Instance details

Defined in Language.Haskell.Exts.SrcLoc

Associated Types

type Rep (Loc a) :: Type -> Type

Methods

from :: Loc a -> Rep (Loc a) x

to :: Rep (Loc a) x -> Loc a

Generic (Activation l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Activation l) :: Type -> Type

Methods

from :: Activation l -> Rep (Activation l) x

to :: Rep (Activation l) x -> Activation l

Generic (Alt l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Alt l) :: Type -> Type

Methods

from :: Alt l -> Rep (Alt l) x

to :: Rep (Alt l) x -> Alt l

Generic (Annotation l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Annotation l) :: Type -> Type

Methods

from :: Annotation l -> Rep (Annotation l) x

to :: Rep (Annotation l) x -> Annotation l

Generic (Assoc l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Assoc l) :: Type -> Type

Methods

from :: Assoc l -> Rep (Assoc l) x

to :: Rep (Assoc l) x -> Assoc l

Generic (Asst l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Asst l) :: Type -> Type

Methods

from :: Asst l -> Rep (Asst l) x

to :: Rep (Asst l) x -> Asst l

Generic (BangType l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (BangType l) :: Type -> Type

Methods

from :: BangType l -> Rep (BangType l) x

to :: Rep (BangType l) x -> BangType l

Generic (Binds l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Binds l) :: Type -> Type

Methods

from :: Binds l -> Rep (Binds l) x

to :: Rep (Binds l) x -> Binds l

Generic (BooleanFormula l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (BooleanFormula l) :: Type -> Type

Methods

from :: BooleanFormula l -> Rep (BooleanFormula l) x

to :: Rep (BooleanFormula l) x -> BooleanFormula l

Generic (Bracket l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Bracket l) :: Type -> Type

Methods

from :: Bracket l -> Rep (Bracket l) x

to :: Rep (Bracket l) x -> Bracket l

Generic (CName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (CName l) :: Type -> Type

Methods

from :: CName l -> Rep (CName l) x

to :: Rep (CName l) x -> CName l

Generic (CallConv l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (CallConv l) :: Type -> Type

Methods

from :: CallConv l -> Rep (CallConv l) x

to :: Rep (CallConv l) x -> CallConv l

Generic (ClassDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (ClassDecl l) :: Type -> Type

Methods

from :: ClassDecl l -> Rep (ClassDecl l) x

to :: Rep (ClassDecl l) x -> ClassDecl l

Generic (ConDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (ConDecl l) :: Type -> Type

Methods

from :: ConDecl l -> Rep (ConDecl l) x

to :: Rep (ConDecl l) x -> ConDecl l

Generic (Context l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Context l) :: Type -> Type

Methods

from :: Context l -> Rep (Context l) x

to :: Rep (Context l) x -> Context l

Generic (DataOrNew l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (DataOrNew l) :: Type -> Type

Methods

from :: DataOrNew l -> Rep (DataOrNew l) x

to :: Rep (DataOrNew l) x -> DataOrNew l

Generic (Decl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Decl l) :: Type -> Type

Methods

from :: Decl l -> Rep (Decl l) x

to :: Rep (Decl l) x -> Decl l

Generic (DeclHead l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (DeclHead l) :: Type -> Type

Methods

from :: DeclHead l -> Rep (DeclHead l) x

to :: Rep (DeclHead l) x -> DeclHead l

Generic (DerivStrategy l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (DerivStrategy l) :: Type -> Type

Methods

from :: DerivStrategy l -> Rep (DerivStrategy l) x

to :: Rep (DerivStrategy l) x -> DerivStrategy l

Generic (Deriving l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Deriving l) :: Type -> Type

Methods

from :: Deriving l -> Rep (Deriving l) x

to :: Rep (Deriving l) x -> Deriving l

Generic (EWildcard l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (EWildcard l) :: Type -> Type

Methods

from :: EWildcard l -> Rep (EWildcard l) x

to :: Rep (EWildcard l) x -> EWildcard l

Generic (Exp l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Exp l) :: Type -> Type

Methods

from :: Exp l -> Rep (Exp l) x

to :: Rep (Exp l) x -> Exp l

Generic (ExportSpec l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (ExportSpec l) :: Type -> Type

Methods

from :: ExportSpec l -> Rep (ExportSpec l) x

to :: Rep (ExportSpec l) x -> ExportSpec l

Generic (ExportSpecList l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (ExportSpecList l) :: Type -> Type

Methods

from :: ExportSpecList l -> Rep (ExportSpecList l) x

to :: Rep (ExportSpecList l) x -> ExportSpecList l

Generic (FieldDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (FieldDecl l) :: Type -> Type

Methods

from :: FieldDecl l -> Rep (FieldDecl l) x

to :: Rep (FieldDecl l) x -> FieldDecl l

Generic (FieldUpdate l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (FieldUpdate l) :: Type -> Type

Methods

from :: FieldUpdate l -> Rep (FieldUpdate l) x

to :: Rep (FieldUpdate l) x -> FieldUpdate l

Generic (FunDep l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (FunDep l) :: Type -> Type

Methods

from :: FunDep l -> Rep (FunDep l) x

to :: Rep (FunDep l) x -> FunDep l

Generic (GadtDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (GadtDecl l) :: Type -> Type

Methods

from :: GadtDecl l -> Rep (GadtDecl l) x

to :: Rep (GadtDecl l) x -> GadtDecl l

Generic (GuardedRhs l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (GuardedRhs l) :: Type -> Type

Methods

from :: GuardedRhs l -> Rep (GuardedRhs l) x

to :: Rep (GuardedRhs l) x -> GuardedRhs l

Generic (IPBind l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (IPBind l) :: Type -> Type

Methods

from :: IPBind l -> Rep (IPBind l) x

to :: Rep (IPBind l) x -> IPBind l

Generic (IPName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (IPName l) :: Type -> Type

Methods

from :: IPName l -> Rep (IPName l) x

to :: Rep (IPName l) x -> IPName l

Generic (ImportDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (ImportDecl l) :: Type -> Type

Methods

from :: ImportDecl l -> Rep (ImportDecl l) x

to :: Rep (ImportDecl l) x -> ImportDecl l

Generic (ImportSpec l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (ImportSpec l) :: Type -> Type

Methods

from :: ImportSpec l -> Rep (ImportSpec l) x

to :: Rep (ImportSpec l) x -> ImportSpec l

Generic (ImportSpecList l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (ImportSpecList l) :: Type -> Type

Methods

from :: ImportSpecList l -> Rep (ImportSpecList l) x

to :: Rep (ImportSpecList l) x -> ImportSpecList l

Generic (InjectivityInfo l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (InjectivityInfo l) :: Type -> Type

Methods

from :: InjectivityInfo l -> Rep (InjectivityInfo l) x

to :: Rep (InjectivityInfo l) x -> InjectivityInfo l

Generic (InstDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (InstDecl l) :: Type -> Type

Methods

from :: InstDecl l -> Rep (InstDecl l) x

to :: Rep (InstDecl l) x -> InstDecl l

Generic (InstHead l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (InstHead l) :: Type -> Type

Methods

from :: InstHead l -> Rep (InstHead l) x

to :: Rep (InstHead l) x -> InstHead l

Generic (InstRule l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (InstRule l) :: Type -> Type

Methods

from :: InstRule l -> Rep (InstRule l) x

to :: Rep (InstRule l) x -> InstRule l

Generic (Literal l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Literal l) :: Type -> Type

Methods

from :: Literal l -> Rep (Literal l) x

to :: Rep (Literal l) x -> Literal l

Generic (Match l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Match l) :: Type -> Type

Methods

from :: Match l -> Rep (Match l) x

to :: Rep (Match l) x -> Match l

Generic (MaybePromotedName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (MaybePromotedName l) :: Type -> Type

Methods

from :: MaybePromotedName l -> Rep (MaybePromotedName l) x

to :: Rep (MaybePromotedName l) x -> MaybePromotedName l

Generic (Module l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Module l) :: Type -> Type

Methods

from :: Module l -> Rep (Module l) x

to :: Rep (Module l) x -> Module l

Generic (ModuleHead l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (ModuleHead l) :: Type -> Type

Methods

from :: ModuleHead l -> Rep (ModuleHead l) x

to :: Rep (ModuleHead l) x -> ModuleHead l

Generic (ModuleName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (ModuleName l) :: Type -> Type

Methods

from :: ModuleName l -> Rep (ModuleName l) x

to :: Rep (ModuleName l) x -> ModuleName l

Generic (ModulePragma l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (ModulePragma l) :: Type -> Type

Methods

from :: ModulePragma l -> Rep (ModulePragma l) x

to :: Rep (ModulePragma l) x -> ModulePragma l

Generic (Name l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Name l) :: Type -> Type

Methods

from :: Name l -> Rep (Name l) x

to :: Rep (Name l) x -> Name l

Generic (Namespace l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Namespace l) :: Type -> Type

Methods

from :: Namespace l -> Rep (Namespace l) x

to :: Rep (Namespace l) x -> Namespace l

Generic (Op l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Op l) :: Type -> Type

Methods

from :: Op l -> Rep (Op l) x

to :: Rep (Op l) x -> Op l

Generic (Overlap l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Overlap l) :: Type -> Type

Methods

from :: Overlap l -> Rep (Overlap l) x

to :: Rep (Overlap l) x -> Overlap l

Generic (PXAttr l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (PXAttr l) :: Type -> Type

Methods

from :: PXAttr l -> Rep (PXAttr l) x

to :: Rep (PXAttr l) x -> PXAttr l

Generic (Pat l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Pat l) :: Type -> Type

Methods

from :: Pat l -> Rep (Pat l) x

to :: Rep (Pat l) x -> Pat l

Generic (PatField l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (PatField l) :: Type -> Type

Methods

from :: PatField l -> Rep (PatField l) x

to :: Rep (PatField l) x -> PatField l

Generic (PatternSynDirection l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (PatternSynDirection l) :: Type -> Type

Methods

from :: PatternSynDirection l -> Rep (PatternSynDirection l) x

to :: Rep (PatternSynDirection l) x -> PatternSynDirection l

Generic (Promoted l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Promoted l) :: Type -> Type

Methods

from :: Promoted l -> Rep (Promoted l) x

to :: Rep (Promoted l) x -> Promoted l

Generic (QName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (QName l) :: Type -> Type

Methods

from :: QName l -> Rep (QName l) x

to :: Rep (QName l) x -> QName l

Generic (QOp l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (QOp l) :: Type -> Type

Methods

from :: QOp l -> Rep (QOp l) x

to :: Rep (QOp l) x -> QOp l

Generic (QualConDecl l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (QualConDecl l) :: Type -> Type

Methods

from :: QualConDecl l -> Rep (QualConDecl l) x

to :: Rep (QualConDecl l) x -> QualConDecl l

Generic (QualStmt l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (QualStmt l) :: Type -> Type

Methods

from :: QualStmt l -> Rep (QualStmt l) x

to :: Rep (QualStmt l) x -> QualStmt l

Generic (RPat l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (RPat l) :: Type -> Type

Methods

from :: RPat l -> Rep (RPat l) x

to :: Rep (RPat l) x -> RPat l

Generic (RPatOp l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (RPatOp l) :: Type -> Type

Methods

from :: RPatOp l -> Rep (RPatOp l) x

to :: Rep (RPatOp l) x -> RPatOp l

Generic (ResultSig l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (ResultSig l) :: Type -> Type

Methods

from :: ResultSig l -> Rep (ResultSig l) x

to :: Rep (ResultSig l) x -> ResultSig l

Generic (Rhs l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Rhs l) :: Type -> Type

Methods

from :: Rhs l -> Rep (Rhs l) x

to :: Rep (Rhs l) x -> Rhs l

Generic (Role l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Role l) :: Type -> Type

Methods

from :: Role l -> Rep (Role l) x

to :: Rep (Role l) x -> Role l

Generic (Rule l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Rule l) :: Type -> Type

Methods

from :: Rule l -> Rep (Rule l) x

to :: Rep (Rule l) x -> Rule l

Generic (RuleVar l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (RuleVar l) :: Type -> Type

Methods

from :: RuleVar l -> Rep (RuleVar l) x

to :: Rep (RuleVar l) x -> RuleVar l

Generic (Safety l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Safety l) :: Type -> Type

Methods

from :: Safety l -> Rep (Safety l) x

to :: Rep (Safety l) x -> Safety l

Generic (Sign l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Sign l) :: Type -> Type

Methods

from :: Sign l -> Rep (Sign l) x

to :: Rep (Sign l) x -> Sign l

Generic (SpecialCon l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (SpecialCon l) :: Type -> Type

Methods

from :: SpecialCon l -> Rep (SpecialCon l) x

to :: Rep (SpecialCon l) x -> SpecialCon l

Generic (Splice l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Splice l) :: Type -> Type

Methods

from :: Splice l -> Rep (Splice l) x

to :: Rep (Splice l) x -> Splice l

Generic (Stmt l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Stmt l) :: Type -> Type

Methods

from :: Stmt l -> Rep (Stmt l) x

to :: Rep (Stmt l) x -> Stmt l

Generic (TyVarBind l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (TyVarBind l) :: Type -> Type

Methods

from :: TyVarBind l -> Rep (TyVarBind l) x

to :: Rep (TyVarBind l) x -> TyVarBind l

Generic (Type l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Type l) :: Type -> Type

Methods

from :: Type l -> Rep (Type l) x

to :: Rep (Type l) x -> Type l

Generic (TypeEqn l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (TypeEqn l) :: Type -> Type

Methods

from :: TypeEqn l -> Rep (TypeEqn l) x

to :: Rep (TypeEqn l) x -> TypeEqn l

Generic (Unpackedness l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (Unpackedness l) :: Type -> Type

Methods

from :: Unpackedness l -> Rep (Unpackedness l) x

to :: Rep (Unpackedness l) x -> Unpackedness l

Generic (WarningText l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (WarningText l) :: Type -> Type

Methods

from :: WarningText l -> Rep (WarningText l) x

to :: Rep (WarningText l) x -> WarningText l

Generic (XAttr l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (XAttr l) :: Type -> Type

Methods

from :: XAttr l -> Rep (XAttr l) x

to :: Rep (XAttr l) x -> XAttr l

Generic (XName l) 
Instance details

Defined in Language.Haskell.Exts.Syntax

Associated Types

type Rep (XName l) :: Type -> Type

Methods

from :: XName l -> Rep (XName l) x

to :: Rep (XName l) x -> XName l

Generic (HistoriedResponse body) 
Instance details

Defined in Network.HTTP.Client

Associated Types

type Rep (HistoriedResponse body) :: Type -> Type

Methods

from :: HistoriedResponse body -> Rep (HistoriedResponse body) x

to :: Rep (HistoriedResponse body) x -> HistoriedResponse body

Generic (AddrRange a) 
Instance details

Defined in Data.IP.Range

Associated Types

type Rep (AddrRange a) :: Type -> Type

Methods

from :: AddrRange a -> Rep (AddrRange a) x

to :: Rep (AddrRange a) x -> AddrRange a

Generic (ErrorFancy e) 
Instance details

Defined in Text.Megaparsec.Error

Associated Types

type Rep (ErrorFancy e) :: Type -> Type

Methods

from :: ErrorFancy e -> Rep (ErrorFancy e) x

to :: Rep (ErrorFancy e) x -> ErrorFancy e

Generic (ErrorItem t) 
Instance details

Defined in Text.Megaparsec.Error

Associated Types

type Rep (ErrorItem t) :: Type -> Type

Methods

from :: ErrorItem t -> Rep (ErrorItem t) x

to :: Rep (ErrorItem t) x -> ErrorItem t

Generic (PosState s) 
Instance details

Defined in Text.Megaparsec.State

Associated Types

type Rep (PosState s) :: Type -> Type

Methods

from :: PosState s -> Rep (PosState s) x

to :: Rep (PosState s) x -> PosState s

Generic (Doc a) 
Instance details

Defined in Text.PrettyPrint.Annotated.HughesPJ

Associated Types

type Rep (Doc a) :: Type -> Type

Methods

from :: Doc a -> Rep (Doc a) x

to :: Rep (Doc a) x -> Doc a

Generic (Maybe a) 
Instance details

Defined in Data.Strict.Maybe

Associated Types

type Rep (Maybe a) :: Type -> Type

Methods

from :: Maybe a -> Rep (Maybe a) x

to :: Rep (Maybe a) x -> Maybe a

Generic (TyVarBndr flag) 
Instance details

Defined in Language.Haskell.TH.Syntax

Associated Types

type Rep (TyVarBndr flag) :: Type -> Type

Methods

from :: TyVarBndr flag -> Rep (TyVarBndr flag) x

to :: Rep (TyVarBndr flag) x -> TyVarBndr flag

Generic (NonEmpty a) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (NonEmpty a) :: Type -> Type

Methods

from :: NonEmpty a -> Rep (NonEmpty a) x

to :: Rep (NonEmpty a) x -> NonEmpty a

Generic (Maybe a) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Maybe a) :: Type -> Type

Methods

from :: Maybe a -> Rep (Maybe a) x

to :: Rep (Maybe a) x -> Maybe a

Generic (a) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a) :: Type -> Type

Methods

from :: (a) -> Rep (a) x

to :: Rep (a) x -> (a)

Generic [a] 
Instance details

Defined in GHC.Generics

Associated Types

type Rep [a] :: Type -> Type

Methods

from :: [a] -> Rep [a] x

to :: Rep [a] x -> [a]

Generic (WrappedMonad m a) 
Instance details

Defined in Control.Applicative

Associated Types

type Rep (WrappedMonad m a) :: Type -> Type

Methods

from :: WrappedMonad m a -> Rep (WrappedMonad m a) x

to :: Rep (WrappedMonad m a) x -> WrappedMonad m a

Generic (Either a b) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Either a b) :: Type -> Type

Methods

from :: Either a b -> Rep (Either a b) x

to :: Rep (Either a b) x -> Either a b

Generic (Proxy t) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Proxy t) :: Type -> Type

Methods

from :: Proxy t -> Rep (Proxy t) x

to :: Rep (Proxy t) x -> Proxy t

Generic (Arg a b) 
Instance details

Defined in Data.Semigroup

Associated Types

type Rep (Arg a b) :: Type -> Type

Methods

from :: Arg a b -> Rep (Arg a b) x

to :: Rep (Arg a b) x -> Arg a b

Generic (U1 p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (U1 p) :: Type -> Type

Methods

from :: U1 p -> Rep (U1 p) x

to :: Rep (U1 p) x -> U1 p

Generic (V1 p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (V1 p) :: Type -> Type

Methods

from :: V1 p -> Rep (V1 p) x

to :: Rep (V1 p) x -> V1 p

Generic (Cofree f a) 
Instance details

Defined in Control.Comonad.Cofree

Associated Types

type Rep (Cofree f a) :: Type -> Type

Methods

from :: Cofree f a -> Rep (Cofree f a) x

to :: Rep (Cofree f a) x -> Cofree f a

Generic (Free f a) 
Instance details

Defined in Control.Monad.Free

Associated Types

type Rep (Free f a) :: Type -> Type

Methods

from :: Free f a -> Rep (Free f a) x

to :: Rep (Free f a) x -> Free f a

Generic (EvalStatus_ a b) 
Instance details

Defined in GHCi.Message

Associated Types

type Rep (EvalStatus_ a b) :: Type -> Type

Methods

from :: EvalStatus_ a b -> Rep (EvalStatus_ a b) x

to :: Rep (EvalStatus_ a b) x -> EvalStatus_ a b

Generic (ParseError s e) 
Instance details

Defined in Text.Megaparsec.Error

Associated Types

type Rep (ParseError s e) :: Type -> Type

Methods

from :: ParseError s e -> Rep (ParseError s e) x

to :: Rep (ParseError s e) x -> ParseError s e

Generic (ParseErrorBundle s e) 
Instance details

Defined in Text.Megaparsec.Error

Associated Types

type Rep (ParseErrorBundle s e) :: Type -> Type

Methods

from :: ParseErrorBundle s e -> Rep (ParseErrorBundle s e) x

to :: Rep (ParseErrorBundle s e) x -> ParseErrorBundle s e

Generic (State s e) 
Instance details

Defined in Text.Megaparsec.State

Associated Types

type Rep (State s e) :: Type -> Type

Methods

from :: State s e -> Rep (State s e) x

to :: Rep (State s e) x -> State s e

Generic (Either a b) 
Instance details

Defined in Data.Strict.Either

Associated Types

type Rep (Either a b) :: Type -> Type

Methods

from :: Either a b -> Rep (Either a b) x

to :: Rep (Either a b) x -> Either a b

Generic (These a b) 
Instance details

Defined in Data.Strict.These

Associated Types

type Rep (These a b) :: Type -> Type

Methods

from :: These a b -> Rep (These a b) x

to :: Rep (These a b) x -> These a b

Generic (Pair a b) 
Instance details

Defined in Data.Strict.Tuple

Associated Types

type Rep (Pair a b) :: Type -> Type

Methods

from :: Pair a b -> Rep (Pair a b) x

to :: Rep (Pair a b) x -> Pair a b

Generic (These a b) 
Instance details

Defined in Data.These

Associated Types

type Rep (These a b) :: Type -> Type

Methods

from :: These a b -> Rep (These a b) x

to :: Rep (These a b) x -> These a b

Generic (a, b) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b) :: Type -> Type

Methods

from :: (a, b) -> Rep (a, b) x

to :: Rep (a, b) x -> (a, b)

Generic (WrappedArrow a b c) 
Instance details

Defined in Control.Applicative

Associated Types

type Rep (WrappedArrow a b c) :: Type -> Type

Methods

from :: WrappedArrow a b c -> Rep (WrappedArrow a b c) x

to :: Rep (WrappedArrow a b c) x -> WrappedArrow a b c

Generic (Kleisli m a b) 
Instance details

Defined in Control.Arrow

Associated Types

type Rep (Kleisli m a b) :: Type -> Type

Methods

from :: Kleisli m a b -> Rep (Kleisli m a b) x

to :: Rep (Kleisli m a b) x -> Kleisli m a b

Generic (Const a b) 
Instance details

Defined in Data.Functor.Const

Associated Types

type Rep (Const a b) :: Type -> Type

Methods

from :: Const a b -> Rep (Const a b) x

to :: Rep (Const a b) x -> Const a b

Generic (Ap f a) 
Instance details

Defined in Data.Monoid

Associated Types

type Rep (Ap f a) :: Type -> Type

Methods

from :: Ap f a -> Rep (Ap f a) x

to :: Rep (Ap f a) x -> Ap f a

Generic (Alt f a) 
Instance details

Defined in Data.Semigroup.Internal

Associated Types

type Rep (Alt f a) :: Type -> Type

Methods

from :: Alt f a -> Rep (Alt f a) x

to :: Rep (Alt f a) x -> Alt f a

Generic (Rec1 f p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (Rec1 f p) :: Type -> Type

Methods

from :: Rec1 f p -> Rep (Rec1 f p) x

to :: Rep (Rec1 f p) x -> Rec1 f p

Generic (URec (Ptr ()) p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec (Ptr ()) p) :: Type -> Type

Methods

from :: URec (Ptr ()) p -> Rep (URec (Ptr ()) p) x

to :: Rep (URec (Ptr ()) p) x -> URec (Ptr ()) p

Generic (URec Char p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Char p) :: Type -> Type

Methods

from :: URec Char p -> Rep (URec Char p) x

to :: Rep (URec Char p) x -> URec Char p

Generic (URec Double p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Double p) :: Type -> Type

Methods

from :: URec Double p -> Rep (URec Double p) x

to :: Rep (URec Double p) x -> URec Double p

Generic (URec Float p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Float p) :: Type -> Type

Methods

from :: URec Float p -> Rep (URec Float p) x

to :: Rep (URec Float p) x -> URec Float p

Generic (URec Int p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Int p) :: Type -> Type

Methods

from :: URec Int p -> Rep (URec Int p) x

to :: Rep (URec Int p) x -> URec Int p

Generic (URec Word p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (URec Word p) :: Type -> Type

Methods

from :: URec Word p -> Rep (URec Word p) x

to :: Rep (URec Word p) x -> URec Word p

Generic (Fix p a) 
Instance details

Defined in Data.Bifunctor.Fix

Associated Types

type Rep (Fix p a) :: Type -> Type

Methods

from :: Fix p a -> Rep (Fix p a) x

to :: Rep (Fix p a) x -> Fix p a

Generic (Join p a) 
Instance details

Defined in Data.Bifunctor.Join

Associated Types

type Rep (Join p a) :: Type -> Type

Methods

from :: Join p a -> Rep (Join p a) x

to :: Rep (Join p a) x -> Join p a

Generic (CofreeF f a b) 
Instance details

Defined in Control.Comonad.Trans.Cofree

Associated Types

type Rep (CofreeF f a b) :: Type -> Type

Methods

from :: CofreeF f a b -> Rep (CofreeF f a b) x

to :: Rep (CofreeF f a b) x -> CofreeF f a b

Generic (FreeF f a b) 
Instance details

Defined in Control.Monad.Trans.Free

Associated Types

type Rep (FreeF f a b) :: Type -> Type

Methods

from :: FreeF f a b -> Rep (FreeF f a b) x

to :: Rep (FreeF f a b) x -> FreeF f a b

Generic (Tagged s b) 
Instance details

Defined in Data.Tagged

Associated Types

type Rep (Tagged s b) :: Type -> Type

Methods

from :: Tagged s b -> Rep (Tagged s b) x

to :: Rep (Tagged s b) x -> Tagged s b

Generic (These1 f g a) 
Instance details

Defined in Data.Functor.These

Associated Types

type Rep (These1 f g a) :: Type -> Type

Methods

from :: These1 f g a -> Rep (These1 f g a) x

to :: Rep (These1 f g a) x -> These1 f g a

Generic (a, b, c) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c) :: Type -> Type

Methods

from :: (a, b, c) -> Rep (a, b, c) x

to :: Rep (a, b, c) x -> (a, b, c)

Generic (Product f g a) 
Instance details

Defined in Data.Functor.Product

Associated Types

type Rep (Product f g a) :: Type -> Type

Methods

from :: Product f g a -> Rep (Product f g a) x

to :: Rep (Product f g a) x -> Product f g a

Generic (Sum f g a) 
Instance details

Defined in Data.Functor.Sum

Associated Types

type Rep (Sum f g a) :: Type -> Type

Methods

from :: Sum f g a -> Rep (Sum f g a) x

to :: Rep (Sum f g a) x -> Sum f g a

Generic ((f :*: g) p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep ((f :*: g) p) :: Type -> Type

Methods

from :: (f :*: g) p -> Rep ((f :*: g) p) x

to :: Rep ((f :*: g) p) x -> (f :*: g) p

Generic ((f :+: g) p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep ((f :+: g) p) :: Type -> Type

Methods

from :: (f :+: g) p -> Rep ((f :+: g) p) x

to :: Rep ((f :+: g) p) x -> (f :+: g) p

Generic (K1 i c p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (K1 i c p) :: Type -> Type

Methods

from :: K1 i c p -> Rep (K1 i c p) x

to :: Rep (K1 i c p) x -> K1 i c p

Generic (a, b, c, d) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d) :: Type -> Type

Methods

from :: (a, b, c, d) -> Rep (a, b, c, d) x

to :: Rep (a, b, c, d) x -> (a, b, c, d)

Generic (Compose f g a) 
Instance details

Defined in Data.Functor.Compose

Associated Types

type Rep (Compose f g a) :: Type -> Type

Methods

from :: Compose f g a -> Rep (Compose f g a) x

to :: Rep (Compose f g a) x -> Compose f g a

Generic ((f :.: g) p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep ((f :.: g) p) :: Type -> Type

Methods

from :: (f :.: g) p -> Rep ((f :.: g) p) x

to :: Rep ((f :.: g) p) x -> (f :.: g) p

Generic (M1 i c f p) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (M1 i c f p) :: Type -> Type

Methods

from :: M1 i c f p -> Rep (M1 i c f p) x

to :: Rep (M1 i c f p) x -> M1 i c f p

Generic (Clown f a b) 
Instance details

Defined in Data.Bifunctor.Clown

Associated Types

type Rep (Clown f a b) :: Type -> Type

Methods

from :: Clown f a b -> Rep (Clown f a b) x

to :: Rep (Clown f a b) x -> Clown f a b

Generic (Flip p a b) 
Instance details

Defined in Data.Bifunctor.Flip

Associated Types

type Rep (Flip p a b) :: Type -> Type

Methods

from :: Flip p a b -> Rep (Flip p a b) x

to :: Rep (Flip p a b) x -> Flip p a b

Generic (Joker g a b) 
Instance details

Defined in Data.Bifunctor.Joker

Associated Types

type Rep (Joker g a b) :: Type -> Type

Methods

from :: Joker g a b -> Rep (Joker g a b) x

to :: Rep (Joker g a b) x -> Joker g a b

Generic (WrappedBifunctor p a b) 
Instance details

Defined in Data.Bifunctor.Wrapped

Associated Types

type Rep (WrappedBifunctor p a b) :: Type -> Type

Methods

from :: WrappedBifunctor p a b -> Rep (WrappedBifunctor p a b) x

to :: Rep (WrappedBifunctor p a b) x -> WrappedBifunctor p a b

Generic (a, b, c, d, e) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e) :: Type -> Type

Methods

from :: (a, b, c, d, e) -> Rep (a, b, c, d, e) x

to :: Rep (a, b, c, d, e) x -> (a, b, c, d, e)

Generic (Product f g a b) 
Instance details

Defined in Data.Bifunctor.Product

Associated Types

type Rep (Product f g a b) :: Type -> Type

Methods

from :: Product f g a b -> Rep (Product f g a b) x

to :: Rep (Product f g a b) x -> Product f g a b

Generic (Sum p q a b) 
Instance details

Defined in Data.Bifunctor.Sum

Associated Types

type Rep (Sum p q a b) :: Type -> Type

Methods

from :: Sum p q a b -> Rep (Sum p q a b) x

to :: Rep (Sum p q a b) x -> Sum p q a b

Generic (a, b, c, d, e, f) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e, f) :: Type -> Type

Methods

from :: (a, b, c, d, e, f) -> Rep (a, b, c, d, e, f) x

to :: Rep (a, b, c, d, e, f) x -> (a, b, c, d, e, f)

Generic (Tannen f p a b) 
Instance details

Defined in Data.Bifunctor.Tannen

Associated Types

type Rep (Tannen f p a b) :: Type -> Type

Methods

from :: Tannen f p a b -> Rep (Tannen f p a b) x

to :: Rep (Tannen f p a b) x -> Tannen f p a b

Generic (a, b, c, d, e, f, g) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e, f, g) :: Type -> Type

Methods

from :: (a, b, c, d, e, f, g) -> Rep (a, b, c, d, e, f, g) x

to :: Rep (a, b, c, d, e, f, g) x -> (a, b, c, d, e, f, g)

Generic (a, b, c, d, e, f, g, h) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e, f, g, h) :: Type -> Type

Methods

from :: (a, b, c, d, e, f, g, h) -> Rep (a, b, c, d, e, f, g, h) x

to :: Rep (a, b, c, d, e, f, g, h) x -> (a, b, c, d, e, f, g, h)

Generic (Biff p f g a b) 
Instance details

Defined in Data.Bifunctor.Biff

Associated Types

type Rep (Biff p f g a b) :: Type -> Type

Methods

from :: Biff p f g a b -> Rep (Biff p f g a b) x

to :: Rep (Biff p f g a b) x -> Biff p f g a b

Generic (a, b, c, d, e, f, g, h, i) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e, f, g, h, i) :: Type -> Type

Methods

from :: (a, b, c, d, e, f, g, h, i) -> Rep (a, b, c, d, e, f, g, h, i) x

to :: Rep (a, b, c, d, e, f, g, h, i) x -> (a, b, c, d, e, f, g, h, i)

Generic (a, b, c, d, e, f, g, h, i, j) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e, f, g, h, i, j) :: Type -> Type

Methods

from :: (a, b, c, d, e, f, g, h, i, j) -> Rep (a, b, c, d, e, f, g, h, i, j) x

to :: Rep (a, b, c, d, e, f, g, h, i, j) x -> (a, b, c, d, e, f, g, h, i, j)

Generic (a, b, c, d, e, f, g, h, i, j, k) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e, f, g, h, i, j, k) :: Type -> Type

Methods

from :: (a, b, c, d, e, f, g, h, i, j, k) -> Rep (a, b, c, d, e, f, g, h, i, j, k) x

to :: Rep (a, b, c, d, e, f, g, h, i, j, k) x -> (a, b, c, d, e, f, g, h, i, j, k)

Generic (a, b, c, d, e, f, g, h, i, j, k, l) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e, f, g, h, i, j, k, l) :: Type -> Type

Methods

from :: (a, b, c, d, e, f, g, h, i, j, k, l) -> Rep (a, b, c, d, e, f, g, h, i, j, k, l) x

to :: Rep (a, b, c, d, e, f, g, h, i, j, k, l) x -> (a, b, c, d, e, f, g, h, i, j, k, l)

Generic (a, b, c, d, e, f, g, h, i, j, k, l, m) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e, f, g, h, i, j, k, l, m) :: Type -> Type

Methods

from :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Rep (a, b, c, d, e, f, g, h, i, j, k, l, m) x

to :: Rep (a, b, c, d, e, f, g, h, i, j, k, l, m) x -> (a, b, c, d, e, f, g, h, i, j, k, l, m)

Generic (a, b, c, d, e, f, g, h, i, j, k, l, m, n) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n) :: Type -> Type

Methods

from :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n) x

to :: Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n) x -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n)

Generic (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) 
Instance details

Defined in GHC.Generics

Associated Types

type Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) :: Type -> Type

Methods

from :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) x

to :: Rep (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) x -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o)

async :: MonadUnliftIO m => m a -> m (Async a) #

deepseq :: NFData a => a -> b -> b #

say :: MonadIO m => Text -> m () #

void :: Functor f => f a -> f () #

group :: (IsSequence seq, Eq (Element seq)) => seq -> [seq] #

(.) :: 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 #

mapMaybe :: (a -> Maybe b) -> [a] -> [b] #

fromMaybe :: a -> Maybe a -> a #

isJust :: Maybe a -> Bool #

listToMaybe :: [a] -> Maybe a #

tshow :: Show a => a -> Text #

error :: forall (r :: RuntimeRep) (a :: TYPE r). HasCallStack => [Char] -> a #

map :: Functor f => (a -> b) -> f a -> f b #

putStrLn :: MonadIO m => Text -> m () #

elem :: (MonoFoldable mono, Eq (Element mono)) => Element mono -> mono -> Bool #

putStr :: MonadIO m => Text -> m () #

print :: (Show a, MonadIO m) => a -> m () #

($) :: forall (r :: RuntimeRep) a (b :: TYPE r). (a -> b) -> a -> b #

join :: Monad m => m (m a) -> m a #

finally :: MonadUnliftIO m => m a -> m b -> m a #

catch :: (MonadUnliftIO m, Exception e) => m a -> (e -> m a) -> m a #

head :: MonoFoldable mono => NonNull mono -> Element mono #

headMay :: MonoFoldable mono => mono -> Maybe (Element mono) #

last :: MonoFoldable mono => NonNull mono -> Element mono #

lastMay :: MonoFoldable mono => mono -> Maybe (Element mono) #

tail :: IsSequence seq => NonNull seq -> seq #

init :: IsSequence seq => NonNull seq -> seq #

(++) :: Monoid m => m -> m -> m #

null :: MonoFoldable mono => mono -> Bool #

when :: Applicative f => Bool -> f () -> f () #

unless :: Applicative f => Bool -> f () -> f () #

mapM_ :: (MonoFoldable mono, Applicative m) => (Element mono -> m ()) -> mono -> m () #

forM :: (Traversable t, Monad m) => t a -> (a -> m b) -> m (t b) #

forM_ :: (MonoFoldable mono, Applicative m) => mono -> (Element mono -> m ()) -> m () #

sequence_ :: (Applicative m, MonoFoldable mono, Element mono ~ m ()) => mono -> m () #

forever :: Applicative f => f a -> f b #

isPrefixOf :: (IsSequence seq, Eq (Element seq)) => seq -> seq -> Bool #

isSuffixOf :: (IsSequence seq, Eq (Element seq)) => seq -> seq -> Bool #

isInfixOf :: (IsSequence seq, Eq (Element seq)) => seq -> seq -> Bool #

intercalate :: (MonoFoldable mono, Monoid (Element mono)) => Element mono -> mono -> Element mono #

throwIO :: (MonadIO m, Exception e) => e -> m a #

(<&>) :: Functor f => f a -> (a -> b) -> f b #

bool :: a -> a -> Bool -> a #

(||) :: Bool -> Bool -> Bool #

(<&&>) :: Applicative a => a Bool -> a Bool -> a Bool #

(<||>) :: Applicative a => a Bool -> a Bool -> a Bool #

(\\) :: SetContainer a => a -> a -> a #

traceShowM :: (Show a, Monad m) => a -> m () #

traceShowId :: Show a => a -> a #

traceM :: Monad m => String -> m () #

traceShow :: Show a => a -> b -> b #

trace :: String -> 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 #

optional :: Alternative f => f a -> f (Maybe a) #

(<=<) :: Monad m => (b -> m c) -> (a -> m b) -> a -> m c #

(>=>) :: Monad m => (a -> m b) -> (b -> m c) -> a -> m c #

replicateM_ :: Applicative m => Int -> m a -> m () #

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 => f a -> b -> f b #

(<$>) :: 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 #

for :: (Traversable t, Applicative f) => t a -> (a -> f b) -> f (t b) #

curry :: ((a, b) -> c) -> a -> b -> c #

fst :: (a, b) -> a #

snd :: (a, b) -> b #

swap :: (a, b) -> (b, a) #

uncurry :: (a -> b -> c) -> (a, b) -> c #

($!) :: forall (r :: RuntimeRep) a (b :: TYPE r). (a -> b) -> a -> b #

(<**>) :: Applicative f => f a -> f (a -> b) -> f b #

(=<<) :: Monad m => (a -> m b) -> m a -> m b #

ap :: Monad m => m (a -> b) -> m a -> m b #

asTypeOf :: a -> a -> a #

const :: a -> b -> a #

flip :: (a -> b -> c) -> b -> a -> c #

liftA :: Applicative f => (a -> b) -> f a -> f b #

liftA3 :: Applicative f => (a -> b -> c -> d) -> f a -> f b -> f c -> f d #

liftM :: Monad m => (a1 -> r) -> m a1 -> m r #

liftM2 :: Monad m => (a1 -> a2 -> r) -> m a1 -> m a2 -> m r #

liftM3 :: Monad m => (a1 -> a2 -> a3 -> r) -> m a1 -> m a2 -> m a3 -> m r #

liftM4 :: Monad m => (a1 -> a2 -> a3 -> a4 -> r) -> m a1 -> m a2 -> m a3 -> m a4 -> m r #

liftM5 :: Monad m => (a1 -> a2 -> a3 -> a4 -> a5 -> r) -> m a1 -> m a2 -> m a3 -> m a4 -> m a5 -> m r #

until :: (a -> Bool) -> (a -> a) -> a -> a #

newTVar :: a -> STM (TVar a) #

orElse :: STM a -> STM a -> STM a #

readTVar :: TVar a -> STM a #

writeTVar :: TVar a -> a -> STM () #

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] #

textToBuilder :: ToBuilder Text builder => Text -> builder #

applyDList :: DList a -> [a] -> [a] #

asDList :: DList a -> DList a #

asHashMap :: HashMap k v -> HashMap k v #

asList :: [a] -> [a] #

asMap :: Map k v -> Map k v #

asMaybe :: Maybe a -> Maybe a #

asSet :: Set a -> Set a #

asString :: [Char] -> [Char] #

getChar :: MonadIO m => m Char #

getLine :: MonadIO m => m Text #

hPut :: MonadIO m => Handle -> ByteString -> m () #

hashNub :: (Hashable a, Eq a) => [a] -> [a] #

interact :: MonadIO m => (LText -> LText) -> m () #

intersect :: SetContainer a => a -> a -> a #

link2Async :: MonadIO m => Async a -> Async b -> m () #

linkAsync :: MonadIO m => Async a -> m () #

orElseSTM :: STM a -> STM a -> STM a #

ordNub :: Ord a => [a] -> [a] #

ordNubBy :: Ord b => (a -> b) -> (a -> a -> Bool) -> [a] -> [a] #

putChar :: MonadIO m => Char -> m () #

readMay :: (Element c ~ Char, MonoFoldable c, Read a) => c -> Maybe a #

sortWith :: (Ord a, IsSequence c) => (Element c -> a) -> c -> c #

tlshow :: Show a => a -> LText #

unlessM :: Monad m => m Bool -> m () -> m () #

waitAsync :: MonadIO m => Async a -> m a #

whenM :: Monad m => m Bool -> m () -> m () #

writeFileUtf8 :: MonadIO m => FilePath -> Text -> m () #

yieldThread :: MonadIO m => m () #

($!!) :: NFData a => (a -> b) -> a -> b #

force :: NFData a => a -> a #

(&&) :: Bool -> Bool -> Bool #

not :: Bool -> Bool #

maximumByMay :: MonoFoldable mono => (Element mono -> Element mono -> Ordering) -> mono -> Maybe (Element mono) #

maximumEx :: (MonoFoldable mono, Ord (Element mono)) => mono -> Element mono #

maximumMay :: (MonoFoldable mono, Ord (Element mono)) => mono -> Maybe (Element mono) #

minimumByMay :: MonoFoldable mono => (Element mono -> Element mono -> Ordering) -> mono -> Maybe (Element mono) #

minimumEx :: (MonoFoldable mono, Ord (Element mono)) => mono -> Element mono #

minimumMay :: (MonoFoldable mono, Ord (Element mono)) => mono -> Maybe (Element mono) #

oand :: (Element mono ~ Bool, MonoFoldable mono) => mono -> Bool #

oconcat :: (MonoFoldable mono, Monoid (Element mono)) => mono -> Element mono #

oconcatMap :: (MonoFoldable mono, Monoid m) => (Element mono -> m) -> mono -> m #

ofold :: (MonoFoldable mono, Monoid (Element mono)) => mono -> Element mono #

ofoldM :: (MonoFoldable mono, Monad m) => (a -> Element mono -> m a) -> a -> mono -> m a #

ofoldMUnwrap :: (Monad m, MonoFoldable mono) => (x -> Element mono -> m x) -> m x -> (x -> m b) -> mono -> m b #

ofoldlUnwrap :: MonoFoldable mono => (x -> Element mono -> x) -> x -> (x -> b) -> mono -> b #

ofor :: (MonoTraversable mono, Applicative f) => mono -> (Element mono -> f (Element mono)) -> f mono #

oforM :: (MonoTraversable mono, Applicative f) => mono -> (Element mono -> f (Element mono)) -> f mono #

ointercalate :: (MonoFoldable mono, Monoid (Element mono)) => Element mono -> mono -> Element mono #

oor :: (Element mono ~ Bool, MonoFoldable mono) => mono -> Bool #

oproduct :: (MonoFoldable mono, Num (Element mono)) => mono -> Element mono #

osequence_ :: (Applicative m, MonoFoldable mono, Element mono ~ m ()) => mono -> m () #

osum :: (MonoFoldable mono, Num (Element mono)) => mono -> Element mono #

replaceElem :: (MonoFunctor mono, Eq (Element mono)) => Element mono -> Element mono -> mono -> mono #

replaceElemLazyText :: Char -> Char -> Text -> Text #

unwrapMono :: WrappedMono mono a -> mono #

all :: MonoFoldable mono => (Element mono -> Bool) -> mono -> Bool #

and :: (MonoFoldable mono, Element mono ~ Bool) => mono -> Bool #

any :: MonoFoldable mono => (Element mono -> Bool) -> mono -> Bool #

compareLength :: (MonoFoldable mono, Integral i) => mono -> i -> Ordering #

concat :: (MonoFoldable mono, Monoid (Element mono)) => mono -> Element mono #

concatMap :: (MonoFoldable mono, Monoid m) => (Element mono -> m) -> mono -> m #

fold :: (MonoFoldable mono, Monoid (Element mono)) => mono -> Element mono #

foldM :: (MonoFoldable mono, Monad m) => (a -> Element mono -> m a) -> a -> mono -> m a #

foldMap :: (MonoFoldable mono, Monoid m) => (Element mono -> m) -> mono -> m #

foldMap1Ex :: (MonoFoldable mono, Semigroup m) => (Element mono -> m) -> mono -> m #

foldl' :: MonoFoldable mono => (a -> Element mono -> a) -> a -> mono -> a #

foldl1Ex' :: MonoFoldable mono => (Element mono -> Element mono -> Element mono) -> mono -> Element mono #

foldlM :: (MonoFoldable mono, Monad m) => (a -> Element mono -> m a) -> a -> mono -> m a #

foldr :: MonoFoldable mono => (Element mono -> b -> b) -> b -> mono -> b #

foldr1Ex :: MonoFoldable mono => (Element mono -> Element mono -> Element mono) -> mono -> Element mono #

for_ :: (MonoFoldable mono, Applicative f) => mono -> (Element mono -> f b) -> f () #

length :: MonoFoldable mono => mono -> Int #

length64 :: MonoFoldable mono => mono -> Int64 #

notElem :: (MonoFoldable mono, Eq (Element mono)) => Element mono -> mono -> Bool #

or :: (MonoFoldable mono, Element mono ~ Bool) => mono -> Bool #

point :: MonoPointed mono => Element mono -> mono #

product :: (MonoFoldable mono, Num (Element mono)) => mono -> Element mono #

sum :: (MonoFoldable mono, Num (Element mono)) => mono -> Element mono #

toList :: MonoFoldable mono => mono -> [Element mono] #

traverse_ :: (MonoFoldable mono, Applicative f) => (Element mono -> f b) -> mono -> f () #

(<|) :: SemiSequence seq => Element seq -> NonNull seq -> NonNull seq #

fromNonEmpty :: IsSequence seq => NonEmpty (Element seq) -> NonNull seq #

fromNullable :: MonoFoldable mono => mono -> Maybe (NonNull mono) #

impureNonNull :: MonoFoldable mono => mono -> NonNull mono #

mapNonNull :: (Functor f, MonoFoldable (f b)) => (a -> b) -> NonNull (f a) -> NonNull (f b) #

maximum :: (MonoFoldable mono, Ord (Element mono)) => NonNull mono -> Element mono #

maximumBy :: MonoFoldable mono => (Element mono -> Element mono -> Ordering) -> NonNull mono -> Element mono #

minimum :: (MonoFoldable mono, Ord (Element mono)) => NonNull mono -> Element mono #

minimumBy :: MonoFoldable mono => (Element mono -> Element mono -> Ordering) -> NonNull mono -> Element mono #

nReplicate :: IsSequence seq => Index seq -> Element seq -> NonNull seq #

ncons :: SemiSequence seq => Element seq -> seq -> NonNull seq #

nfilter :: IsSequence seq => (Element seq -> Bool) -> NonNull seq -> seq #

nfilterM :: (Monad m, IsSequence seq) => (Element seq -> m Bool) -> NonNull seq -> m seq #

nonNull :: MonoFoldable mono => mono -> NonNull mono #

nuncons :: IsSequence seq => NonNull seq -> (Element seq, Maybe (NonNull seq)) #

ofold1 :: (MonoFoldable mono, Semigroup (Element mono)) => NonNull mono -> Element mono #

ofoldMap1 :: (MonoFoldable mono, Semigroup m) => (Element mono -> m) -> NonNull mono -> m #

ofoldl1' :: MonoFoldable mono => (Element mono -> Element mono -> Element mono) -> NonNull mono -> Element mono #

ofoldr1 :: MonoFoldable mono => (Element mono -> Element mono -> Element mono) -> NonNull mono -> Element mono #

splitFirst :: IsSequence seq => NonNull seq -> (Element seq, seq) #

toMinList :: NonEmpty a -> NonNull [a] #

toNonEmpty :: MonoFoldable mono => NonNull mono -> NonEmpty (Element mono) #

catMaybes :: (IsSequence (f (Maybe t)), Functor f, Element (f (Maybe t)) ~ Maybe t) => f (Maybe t) -> f t #

defaultCons :: IsSequence seq => Element seq -> seq -> seq #

defaultFind :: MonoFoldable seq => (Element seq -> Bool) -> seq -> Maybe (Element seq) #

defaultIntersperse :: IsSequence seq => Element seq -> seq -> seq #

defaultReverse :: IsSequence seq => seq -> seq #

defaultSnoc :: IsSequence seq => seq -> Element seq -> seq #

defaultSortBy :: IsSequence seq => (Element seq -> Element seq -> Ordering) -> seq -> seq #

defaultSplitWhen :: IsSequence seq => (Element seq -> Bool) -> seq -> [seq] #

deleteBy :: (IsSequence seq, Eq (Element seq)) => (Element seq -> Element seq -> Bool) -> Element seq -> seq -> seq #

dropPrefix :: (IsSequence seq, Eq (Element seq)) => seq -> seq -> seq #

dropSuffix :: (IsSequence seq, Eq (Element seq)) => seq -> seq -> seq #

ensurePrefix :: (Eq (Element seq), IsSequence seq) => seq -> seq -> seq #

ensureSuffix :: (Eq (Element seq), IsSequence seq) => seq -> seq -> seq #

groupAll :: (IsSequence seq, Eq (Element seq)) => seq -> [seq] #

initDef :: IsSequence seq => seq -> seq #

pack :: IsSequence seq => [Element seq] -> seq #

repack :: (MonoFoldable a, IsSequence b, Element a ~ Element b) => a -> b #

replaceSeq :: (IsSequence seq, Eq (Element seq)) => seq -> seq -> seq -> seq #

replaceSeqLazyText :: Text -> Text -> Text -> Text #

singleton :: MonoPointed seq => Element seq -> seq #

sort :: (SemiSequence seq, Ord (Element seq)) => seq -> seq #

sortOn :: (Ord o, SemiSequence seq) => (Element seq -> o) -> seq -> seq #

splitElem :: (IsSequence seq, Eq (Element seq)) => Element seq -> seq -> [seq] #

splitSeq :: (IsSequence seq, Eq (Element seq)) => seq -> seq -> [seq] #

splitSeqLazyBS :: Word8 -> ByteString -> [ByteString] #

splitSeqLazyText :: Text -> Text -> [Text] #

stripPrefix :: (IsSequence seq, Eq (Element seq)) => seq -> seq -> Maybe seq #

stripPrefixLazyBS :: ByteString -> ByteString -> Maybe ByteString #

stripSuffix :: (IsSequence seq, Eq (Element seq)) => seq -> seq -> Maybe seq #

stripSuffixLazyBS :: ByteString -> ByteString -> Maybe ByteString #

tailDef :: IsSequence seq => seq -> seq #

unpack :: MonoFoldable mono => mono -> [Element mono] #

vectorSort :: (Vector v e, Ord e) => v e -> v e #

vectorSortBy :: Vector v e => (e -> e -> Ordering) -> v e -> v e #

asks :: MonadReader r m => (r -> a) -> m a #

asBRef :: BRef s a -> BRef s a #

asIORef :: IORef a -> IORef a #

asMutVar :: MutVar s a -> MutVar s a #

asSTRef :: STRef s a -> STRef s a #

asDLList :: DLList s a -> DLList s a #

asBDeque :: BDeque s a -> BDeque s a #

asSDeque :: SDeque s a -> SDeque s a #

asUDeque :: UDeque s a -> UDeque s a #

asPRef :: PRef s a -> PRef s a #

asSRef :: SRef s a -> SRef s a #

asURef :: URef s a -> URef s a #

primToIO :: (PrimBase m, PrimState m ~ RealWorld) => m a -> IO a #

primToPrim :: (PrimBase m1, PrimMonad m2, PrimState m1 ~ PrimState m2) => m1 a -> m2 a #

primToST :: PrimBase m => m a -> ST (PrimState m) a #

atomicModifyMutVar :: PrimMonad m => MutVar (PrimState m) a -> (a -> (a, b)) -> m b #

atomicModifyMutVar' :: PrimMonad m => MutVar (PrimState m) a -> (a -> (a, b)) -> m b #

modifyMutVar :: PrimMonad m => MutVar (PrimState m) a -> (a -> a) -> m () #

modifyMutVar' :: PrimMonad m => MutVar (PrimState m) a -> (a -> a) -> m () #

newMutVar :: PrimMonad m => a -> m (MutVar (PrimState m) a) #

readMutVar :: PrimMonad m => MutVar (PrimState m) a -> m a #

writeMutVar :: PrimMonad m => MutVar (PrimState m) a -> a -> m () #

hSay :: MonadIO m => Handle -> Text -> m () #

hSayShow :: (MonadIO m, Show a) => Handle -> a -> m () #

hSayString :: MonadIO m => Handle -> String -> m () #

sayErr :: MonadIO m => Text -> m () #

sayErrShow :: (MonadIO m, Show a) => a -> m () #

sayErrString :: MonadIO m => String -> m () #

sayShow :: (MonadIO m, Show a) => a -> m () #

sayString :: MonadIO m => String -> m () #

lengthTBQueue :: TBQueue a -> STM Natural #

newTBQueue :: Natural -> STM (TBQueue a) #

unGetTBQueue :: TBQueue a -> a -> STM () #

writeTBQueue :: TBQueue a -> a -> STM () #

cloneTChan :: TChan a -> STM (TChan a) #

dupTChan :: TChan a -> STM (TChan a) #

peekTChan :: TChan a -> STM a #

readTChan :: TChan a -> STM a #

unGetTChan :: TChan a -> a -> STM () #

writeTChan :: TChan a -> a -> STM () #

newTMVar :: a -> STM (TMVar a) #

putTMVar :: TMVar a -> a -> STM () #

readTMVar :: TMVar a -> STM a #

swapTMVar :: TMVar a -> a -> STM a #

takeTMVar :: TMVar a -> STM a #

tryPutTMVar :: TMVar a -> a -> STM Bool #

writeTMVar :: TMVar a -> a -> STM () #

unGetTQueue :: TQueue a -> a -> STM () #

writeTQueue :: TQueue a -> a -> STM () #

modifyTVar :: TVar a -> (a -> a) -> STM () #

modifyTVar' :: TVar a -> (a -> a) -> STM () #

stateTVar :: TVar s -> (s -> (a, s)) -> STM a #

swapTVar :: TVar a -> a -> STM a #

unGetTBChan :: TBChan a -> a -> STM () #

writeTBChan :: TBChan a -> a -> STM () #

unGetTBMChan :: TBMChan a -> a -> STM () #

writeTBMChan :: TBMChan a -> a -> STM () #

unGetTBMQueue :: TBMQueue a -> a -> STM () #

writeTBMQueue :: TBMQueue a -> a -> STM () #

closeTMChan :: TMChan a -> STM () #

unGetTMChan :: TMChan a -> a -> STM () #

writeTMChan :: TMChan a -> a -> STM () #

unGetTMQueue :: TMQueue a -> a -> STM () #

writeTMQueue :: TMQueue a -> a -> STM () #

parseTimeM :: (MonadFail m, ParseTime t) => Bool -> TimeLocale -> String -> String -> m t #

dupChan :: MonadIO m => Chan a -> m (Chan a) #

getChanContents :: MonadIO m => Chan a -> m [a] #

newChan :: MonadIO m => m (Chan a) #

readChan :: MonadIO m => Chan a -> m a #

writeChan :: MonadIO m => Chan a -> a -> m () #

writeList2Chan :: MonadIO m => Chan a -> [a] -> m () #

bracket :: MonadUnliftIO m => m a -> (a -> m b) -> (a -> m c) -> m c #

bracketOnError :: MonadUnliftIO m => m a -> (a -> m b) -> (a -> m c) -> m c #

bracketOnError_ :: MonadUnliftIO m => m a -> m b -> m c -> m c #

bracket_ :: MonadUnliftIO m => m a -> m b -> m c -> m c #

catchAny :: MonadUnliftIO m => m a -> (SomeException -> m a) -> m a #

catchAnyDeep :: (NFData a, MonadUnliftIO m) => m a -> (SomeException -> m a) -> m a #

catchDeep :: (MonadUnliftIO m, Exception e, NFData a) => m a -> (e -> m a) -> m a #

catchIO :: MonadUnliftIO m => m a -> (IOException -> m a) -> m a #

catchJust :: (MonadUnliftIO m, Exception e) => (e -> Maybe b) -> m a -> (b -> m a) -> m a #

catchSyncOrAsync :: (MonadUnliftIO m, Exception e) => m a -> (e -> m a) -> m a #

catches :: MonadUnliftIO m => m a -> [Handler m a] -> m a #

catchesDeep :: (MonadUnliftIO m, NFData a) => m a -> [Handler m a] -> m a #

evaluate :: MonadIO m => a -> m a #

evaluateDeep :: (MonadIO m, NFData a) => a -> m a #

fromEither :: (Exception e, MonadIO m) => Either e a -> m a #

fromEitherIO :: (Exception e, MonadIO m) => IO (Either e a) -> m a #

fromEitherM :: (Exception e, MonadIO m) => m (Either e a) -> m a #

handle :: (MonadUnliftIO m, Exception e) => (e -> m a) -> m a -> m a #

handleAny :: MonadUnliftIO m => (SomeException -> m a) -> m a -> m a #

handleAnyDeep :: (MonadUnliftIO m, NFData a) => (SomeException -> m a) -> m a -> m a #

handleDeep :: (MonadUnliftIO m, Exception e, NFData a) => (e -> m a) -> m a -> m a #

handleIO :: MonadUnliftIO m => (IOException -> m a) -> m a -> m a #

handleJust :: (MonadUnliftIO m, Exception e) => (e -> Maybe b) -> (b -> m a) -> m a -> m a #

handleSyncOrAsync :: (MonadUnliftIO m, Exception e) => (e -> m a) -> m a -> m a #

impureThrow :: Exception e => e -> a #

mapExceptionM :: (Exception e1, Exception e2, MonadUnliftIO m) => (e1 -> e2) -> m a -> m a #

mask :: MonadUnliftIO m => ((forall a. m a -> m a) -> m b) -> m b #

mask_ :: MonadUnliftIO m => m a -> m a #

onException :: MonadUnliftIO m => m a -> m b -> m a #

throwTo :: (Exception e, MonadIO m) => ThreadId -> e -> m () #

tryDeep :: (MonadUnliftIO m, Exception e, NFData a) => m a -> m (Either e a) #

tryIO :: MonadUnliftIO m => m a -> m (Either IOException a) #

tryJust :: (MonadUnliftIO m, Exception e) => (e -> Maybe b) -> m a -> m (Either b a) #

trySyncOrAsync :: (MonadUnliftIO m, Exception e) => m a -> m (Either e a) #

uninterruptibleMask :: MonadUnliftIO m => ((forall a. m a -> m a) -> m b) -> m b #

withException :: (MonadUnliftIO m, Exception e) => m a -> (e -> m b) -> m a #

hClose :: MonadIO m => Handle -> m () #

hFlush :: MonadIO m => Handle -> m () #

hIsEOF :: MonadIO m => Handle -> m Bool #

hIsOpen :: MonadIO m => Handle -> m Bool #

hReady :: MonadIO m => Handle -> m Bool #

hSeek :: MonadIO m => Handle -> SeekMode -> Integer -> m () #

hSetEcho :: MonadIO m => Handle -> Bool -> m () #

hSetFileSize :: MonadIO m => Handle -> Integer -> m () #

withBinaryFile :: MonadUnliftIO m => FilePath -> IOMode -> (Handle -> m a) -> m a #

withFile :: MonadUnliftIO m => FilePath -> IOMode -> (Handle -> m a) -> m a #

atomicModifyIORef :: MonadIO m => IORef a -> (a -> (a, b)) -> m b #

atomicModifyIORef' :: MonadIO m => IORef a -> (a -> (a, b)) -> m b #

atomicWriteIORef :: MonadIO m => IORef a -> a -> m () #

mkWeakIORef :: MonadUnliftIO m => IORef a -> m () -> m (Weak (IORef a)) #

modifyIORef :: MonadIO m => IORef a -> (a -> a) -> m () #

modifyIORef' :: MonadIO m => IORef a -> (a -> a) -> m () #

newIORef :: MonadIO m => a -> m (IORef a) #

readIORef :: MonadIO m => IORef a -> m a #

writeIORef :: MonadIO m => IORef a -> a -> m () #

asyncBound :: MonadUnliftIO m => m a -> m (Async a) #

asyncOn :: MonadUnliftIO m => Int -> m a -> m (Async a) #

asyncOnWithUnmask :: MonadUnliftIO m => Int -> ((forall b. m b -> m b) -> m a) -> m (Async a) #

asyncWithUnmask :: MonadUnliftIO m => ((forall b. m b -> m b) -> m a) -> m (Async a) #

cancel :: MonadIO m => Async a -> m () #

cancelWith :: (Exception e, MonadIO m) => Async a -> e -> m () #

conc :: m a -> Conc m a #

concurrently :: MonadUnliftIO m => m a -> m b -> m (a, b) #

concurrently_ :: MonadUnliftIO m => m a -> m b -> m () #

forConcurrently :: (MonadUnliftIO m, Traversable t) => t a -> (a -> m b) -> m (t b) #

forConcurrently_ :: (MonadUnliftIO m, Foldable f) => f a -> (a -> m b) -> m () #

link :: MonadIO m => Async a -> m () #

link2 :: MonadIO m => Async a -> Async b -> m () #

mapConcurrently :: (MonadUnliftIO m, Traversable t) => (a -> m b) -> t a -> m (t b) #

mapConcurrently_ :: (MonadUnliftIO m, Foldable f) => (a -> m b) -> f a -> m () #

pooledForConcurrently :: (MonadUnliftIO m, Traversable t) => t a -> (a -> m b) -> m (t b) #

pooledForConcurrentlyN :: (MonadUnliftIO m, Traversable t) => Int -> t a -> (a -> m b) -> m (t b) #

pooledForConcurrentlyN_ :: (MonadUnliftIO m, Foldable t) => Int -> t a -> (a -> m b) -> m () #

pooledForConcurrently_ :: (MonadUnliftIO m, Foldable f) => f a -> (a -> m b) -> m () #

pooledMapConcurrently :: (MonadUnliftIO m, Traversable t) => (a -> m b) -> t a -> m (t b) #

pooledMapConcurrentlyN :: (MonadUnliftIO m, Traversable t) => Int -> (a -> m b) -> t a -> m (t b) #

pooledMapConcurrentlyN_ :: (MonadUnliftIO m, Foldable f) => Int -> (a -> m b) -> f a -> m () #

pooledMapConcurrently_ :: (MonadUnliftIO m, Foldable f) => (a -> m b) -> f a -> m () #

race :: MonadUnliftIO m => m a -> m b -> m (Either a b) #

race_ :: MonadUnliftIO m => m a -> m b -> m () #

replicateConcurrently :: MonadUnliftIO f => Int -> f a -> f [a] #

runConc :: MonadUnliftIO m => Conc m a -> m a #

wait :: MonadIO m => Async a -> m a #

waitAny :: MonadIO m => [Async a] -> m (Async a, a) #

waitAnyCancel :: MonadIO m => [Async a] -> m (Async a, a) #

waitBoth :: MonadIO m => Async a -> Async b -> m (a, b) #

waitEither :: MonadIO m => Async a -> Async b -> m (Either a b) #

waitEitherCancel :: MonadIO m => Async a -> Async b -> m (Either a b) #

waitEither_ :: MonadIO m => Async a -> Async b -> m () #

withAsync :: MonadUnliftIO m => m a -> (Async a -> m b) -> m b #

withAsyncBound :: MonadUnliftIO m => m a -> (Async a -> m b) -> m b #

withAsyncOn :: MonadUnliftIO m => Int -> m a -> (Async a -> m b) -> m b #

withAsyncOnWithUnmask :: MonadUnliftIO m => Int -> ((forall c. m c -> m c) -> m a) -> (Async a -> m b) -> m b #

withAsyncWithUnmask :: MonadUnliftIO m => ((forall c. m c -> m c) -> m a) -> (Async a -> m b) -> m b #

isEmptyMVar :: MonadIO m => MVar a -> m Bool #

mkWeakMVar :: MonadUnliftIO m => MVar a -> m () -> m (Weak (MVar a)) #

modifyMVar :: MonadUnliftIO m => MVar a -> (a -> m (a, b)) -> m b #

modifyMVarMasked :: MonadUnliftIO m => MVar a -> (a -> m (a, b)) -> m b #

modifyMVarMasked_ :: MonadUnliftIO m => MVar a -> (a -> m a) -> m () #

modifyMVar_ :: MonadUnliftIO m => MVar a -> (a -> m a) -> m () #

newEmptyMVar :: MonadIO m => m (MVar a) #

newMVar :: MonadIO m => a -> m (MVar a) #

putMVar :: MonadIO m => MVar a -> a -> m () #

readMVar :: MonadIO m => MVar a -> m a #

swapMVar :: MonadIO m => MVar a -> a -> m a #

takeMVar :: MonadIO m => MVar a -> m a #

tryPutMVar :: MonadIO m => MVar a -> a -> m Bool #

tryReadMVar :: MonadIO m => MVar a -> m (Maybe a) #

tryTakeMVar :: MonadIO m => MVar a -> m (Maybe a) #

withMVar :: MonadUnliftIO m => MVar a -> (a -> m b) -> m b #

withMVarMasked :: MonadUnliftIO m => MVar a -> (a -> m b) -> m b #

memoizeMVar :: MonadUnliftIO m => m a -> m (Memoized a) #

memoizeRef :: MonadUnliftIO m => m a -> m (Memoized a) #

runMemoized :: MonadIO m => Memoized a -> m a #

newQSem :: MonadIO m => Int -> m QSem #

signalQSem :: MonadIO m => QSem -> m () #

waitQSem :: MonadIO m => QSem -> m () #

withQSem :: MonadUnliftIO m => QSem -> m a -> m a #

newQSemN :: MonadIO m => Int -> m QSemN #

signalQSemN :: MonadIO m => QSemN -> Int -> m () #

waitQSemN :: MonadIO m => QSemN -> Int -> m () #

withQSemN :: MonadUnliftIO m => QSemN -> Int -> m a -> m a #

atomically :: MonadIO m => STM a -> m a #

checkSTM :: Bool -> STM () #

mkWeakTMVar :: MonadUnliftIO m => TMVar a -> m () -> m (Weak (TMVar a)) #

mkWeakTVar :: MonadUnliftIO m => TVar a -> m () -> m (Weak (TVar a)) #

newTBQueueIO :: MonadIO m => Natural -> m (TBQueue a) #

newTChanIO :: MonadIO m => m (TChan a) #

newTMVarIO :: MonadIO m => a -> m (TMVar a) #

newTQueueIO :: MonadIO m => m (TQueue a) #

newTVarIO :: MonadIO m => a -> m (TVar a) #

readTVarIO :: MonadIO m => TVar a -> m a #

withSystemTempFile :: MonadUnliftIO m => String -> (FilePath -> Handle -> m a) -> m a #

withTempFile :: MonadUnliftIO m => FilePath -> String -> (FilePath -> Handle -> m a) -> m a #

timeout :: MonadUnliftIO m => Int -> m a -> m (Maybe a) #

askRunInIO :: MonadUnliftIO m => m (m a -> IO a) #

liftIOOp :: MonadUnliftIO m => (IO a -> IO b) -> m a -> m b #

toIO :: MonadUnliftIO m => m a -> m (IO a) #

withUnliftIO :: MonadUnliftIO m => (UnliftIO m -> IO a) -> m a #

wrappedWithRunInIO :: MonadUnliftIO n => (n b -> m b) -> (forall a. m a -> n a) -> ((forall a. m a -> IO a) -> IO b) -> m b #

(&&&) :: 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') #

zipWith :: Zip f => (a -> b -> c) -> f a -> f b -> f c #

unzip :: Zip f => f (a, b) -> (f a, f b) #

zip :: Zip f => f a -> f b -> f (a, b) #

zipWith3 :: Zip3 f => (a -> b -> c -> d) -> f a -> f b -> f c -> f d #

unzip3 :: Zip3 f => f (a, b, c) -> (f a, f b, f c) #

zip3 :: Zip3 f => f a -> f b -> f c -> f (a, b, c) #

zipWith4 :: Zip4 f => (a -> b -> c -> d -> e) -> f a -> f b -> f c -> f d -> f e #

unzip4 :: Zip4 f => f (a, b, c, d) -> (f a, f b, f c, f d) #

zip4 :: Zip4 f => f a -> f b -> f c -> f d -> f (a, b, c, d) #

zipWith5 :: Zip5 f => (a -> b -> c -> d -> e -> g) -> f a -> f b -> f c -> f d -> f e -> f g #

unzip5 :: Zip5 f => f (a, b, c, d, e) -> (f a, f b, f c, f d, f e) #

zip5 :: Zip5 f => f a -> f b -> f c -> f d -> f e -> f (a, b, c, d, e) #

zipWith6 :: Zip6 f => (a -> b -> c -> d -> e -> g -> h) -> f a -> f b -> f c -> f d -> f e -> f g -> f h #

unzip6 :: Zip6 f => f (a, b, c, d, e, g) -> (f a, f b, f c, f d, f e, f g) #

zip6 :: Zip6 f => f a -> f b -> f c -> f d -> f e -> f g -> f (a, b, c, d, e, g) #

zipWith7 :: Zip7 f => (a -> b -> c -> d -> e -> g -> h -> i) -> f a -> f b -> f c -> f d -> f e -> f g -> f h -> f i #

unzip7 :: Zip7 f => f (a, b, c, d, e, g, h) -> (f a, f b, f c, f d, f e, f g, f h) #

zip7 :: Zip7 f => f a -> f b -> f c -> f d -> f e -> f g -> f h -> f (a, b, c, d, e, g, h) #

lift :: (MonadTrans t, Monad m) => m a -> t m a #

guard :: Alternative f => Bool -> f () #

assert :: Bool -> a -> a #

realToFrac :: (Real a, Fractional b) => a -> b #

fromIntegral :: (Integral a, Num b) => a -> b #

seq :: forall {r :: RuntimeRep} a (b :: TYPE r). a -> b -> b #

cs :: ConvertibleStrings a b => a -> b #

newtype Id' table 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] #

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 #

(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 #

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 Source #

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 Source #

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), value ~ Id' table, HasField "id" model value, ToField (PrimaryKey table), GetModelByTableName (GetTableName model) ~ model) => Fetchable [Id' table] model Source # 
Instance details

Defined in IHP.Fetch

Associated Types

type FetchResult [Id' table] model Source #

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]

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

data StdMethod #

Constructors

GET 
POST 
HEAD 
PUT 
DELETE 
TRACE 
CONNECT 
OPTIONS 
PATCH 

Instances

Instances details
Bounded StdMethod 
Instance details

Defined in Network.HTTP.Types.Method

Enum StdMethod 
Instance details

Defined in Network.HTTP.Types.Method

Ix StdMethod 
Instance details

Defined in Network.HTTP.Types.Method

Read StdMethod 
Instance details

Defined in Network.HTTP.Types.Method

Methods

readsPrec :: Int -> ReadS StdMethod

readList :: ReadS [StdMethod]

readPrec :: ReadPrec StdMethod

readListPrec :: ReadPrec [StdMethod]

Show StdMethod 
Instance details

Defined in Network.HTTP.Types.Method

Methods

showsPrec :: Int -> StdMethod -> ShowS #

show :: StdMethod -> String

showList :: [StdMethod] -> ShowS #

Eq StdMethod 
Instance details

Defined in Network.HTTP.Types.Method

Ord StdMethod 
Instance details

Defined in Network.HTTP.Types.Method