Safe Haskell | None |
---|---|
Language | GHC2021 |
GHC.Prelude.Basic
Description
Documentation
Instances
Instances
PrintfArg Float | Since: base-2.1 | ||||
Defined in Text.Printf | |||||
Binary Float | Uses non-IEEE754 encoding. Does not round-trip NaN. | ||||
NFData Float | |||||
Defined in Control.DeepSeq | |||||
Outputable Float Source # | |||||
Data Float | |||||
Defined in GHC.Internal.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 # 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 # | |||||
Floating Float | |||||
RealFloat Float | |||||
Defined in GHC.Internal.Float Methods floatRadix :: Float -> Integer # floatDigits :: Float -> Int # floatRange :: Float -> (Int, Int) # decodeFloat :: Float -> (Integer, Int) # encodeFloat :: Integer -> Int -> Float # significand :: Float -> Float # scaleFloat :: Int -> Float -> Float # isInfinite :: Float -> Bool # isDenormalized :: Float -> Bool # isNegativeZero :: Float -> Bool # | |||||
Storable Float | |||||
Read Float | |||||
Eq Float | |||||
Ord Float | |||||
IArray UArray Float | |||||
Defined in Data.Array.Base Methods bounds :: Ix i => UArray i Float -> (i, i) Source # numElements :: Ix i => UArray i Float -> Int Source # unsafeArray :: Ix i => (i, i) -> [(Int, Float)] -> UArray i Float Source # unsafeAt :: Ix i => UArray i Float -> Int -> Float Source # unsafeReplace :: Ix i => UArray i Float -> [(Int, Float)] -> UArray i Float Source # unsafeAccum :: Ix i => (Float -> e' -> Float) -> UArray i Float -> [(Int, e')] -> UArray i Float Source # unsafeAccumArray :: Ix i => (Float -> e' -> Float) -> Float -> (i, i) -> [(Int, e')] -> UArray i Float Source # | |||||
Lift Float | |||||
MArray IOUArray Float IO | |||||
Defined in Data.Array.IO.Internals Methods getBounds :: Ix i => IOUArray i Float -> IO (i, i) Source # getNumElements :: Ix i => IOUArray i Float -> IO Int Source # newArray :: Ix i => (i, i) -> Float -> IO (IOUArray i Float) Source # newArray_ :: Ix i => (i, i) -> IO (IOUArray i Float) Source # unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Float) Source # unsafeRead :: Ix i => IOUArray i Float -> Int -> IO Float Source # unsafeWrite :: Ix i => IOUArray i Float -> Int -> Float -> IO () Source # | |||||
Generic1 (URec Float :: k -> Type) | |||||
Defined in GHC.Internal.Generics Associated Types
| |||||
Foldable (UFloat :: Type -> Type) | |||||
Defined in GHC.Internal.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 # elem :: Eq a => a -> UFloat a -> Bool # maximum :: Ord a => UFloat a -> a # minimum :: Ord a => UFloat a -> a # | |||||
Traversable (UFloat :: Type -> Type) | |||||
MArray (STUArray s) Float (ST s) | |||||
Defined in Data.Array.Base Methods getBounds :: Ix i => STUArray s i Float -> ST s (i, i) Source # getNumElements :: Ix i => STUArray s i Float -> ST s Int Source # newArray :: Ix i => (i, i) -> Float -> ST s (STUArray s i Float) Source # newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Float) Source # unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Float) Source # unsafeRead :: Ix i => STUArray s i Float -> Int -> ST s Float Source # unsafeWrite :: Ix i => STUArray s i Float -> Int -> Float -> ST s () Source # | |||||
Functor (URec Float :: Type -> Type) | |||||
Generic (URec Float p) | |||||
Defined in GHC.Internal.Generics Associated Types
| |||||
Show (URec Float p) | |||||
Eq (URec Float p) | |||||
Ord (URec Float p) | |||||
Defined in GHC.Internal.Generics | |||||
data URec Float (p :: k) | |||||
type Rep1 (URec Float :: k -> Type) | |||||
Defined in GHC.Internal.Generics | |||||
type Rep (URec Float p) | |||||
Defined in GHC.Internal.Generics |
Instances
IsChar Char | Since: base-2.1 | ||||
PrintfArg Char | Since: base-2.1 | ||||
Defined in Text.Printf | |||||
Binary Char | |||||
NFData Char | |||||
Defined in Control.DeepSeq | |||||
ToJExpr Char Source # | |||||
Binary Char Source # | |||||
ToJson String Source # | |||||
Data Char | |||||
Defined in GHC.Internal.Data.Data Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Char -> c Char # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Char # dataTypeOf :: Char -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Char) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Char) # gmapT :: (forall b. Data b => b -> b) -> Char -> Char # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Char -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Char -> r # gmapQ :: (forall d. Data d => d -> u) -> Char -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Char -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Char -> m Char # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Char -> m Char # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Char -> m Char # | |||||
Bounded Char | |||||
Enum Char | |||||
Storable Char | |||||
Defined in GHC.Internal.Foreign.Storable | |||||
Ix Char | |||||
Read Char | |||||
Show Char | |||||
Eq Char | |||||
Ord Char | |||||
HpcHash Char | |||||
IArray UArray Char | |||||
Defined in Data.Array.Base Methods bounds :: Ix i => UArray i Char -> (i, i) Source # numElements :: Ix i => UArray i Char -> Int Source # unsafeArray :: Ix i => (i, i) -> [(Int, Char)] -> UArray i Char Source # unsafeAt :: Ix i => UArray i Char -> Int -> Char Source # unsafeReplace :: Ix i => UArray i Char -> [(Int, Char)] -> UArray i Char Source # unsafeAccum :: Ix i => (Char -> e' -> Char) -> UArray i Char -> [(Int, e')] -> UArray i Char Source # unsafeAccumArray :: Ix i => (Char -> e' -> Char) -> Char -> (i, i) -> [(Int, e')] -> UArray i Char Source # | |||||
TestCoercion SChar | |||||
Defined in GHC.Internal.TypeLits | |||||
TestEquality SChar | |||||
Defined in GHC.Internal.TypeLits | |||||
Lift Char | |||||
MArray IOUArray Char IO | |||||
Defined in Data.Array.IO.Internals Methods getBounds :: Ix i => IOUArray i Char -> IO (i, i) Source # getNumElements :: Ix i => IOUArray i Char -> IO Int Source # newArray :: Ix i => (i, i) -> Char -> IO (IOUArray i Char) Source # newArray_ :: Ix i => (i, i) -> IO (IOUArray i Char) Source # unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Char) Source # unsafeRead :: Ix i => IOUArray i Char -> Int -> IO Char Source # unsafeWrite :: Ix i => IOUArray i Char -> Int -> Char -> IO () Source # | |||||
Generic1 (URec Char :: k -> Type) | |||||
Defined in GHC.Internal.Generics Associated Types
| |||||
Foldable (UChar :: Type -> Type) | |||||
Defined in GHC.Internal.Data.Foldable Methods fold :: Monoid m => UChar m -> m # foldMap :: Monoid m => (a -> m) -> UChar a -> m # foldMap' :: Monoid m => (a -> m) -> UChar a -> m # foldr :: (a -> b -> b) -> b -> UChar a -> b # foldr' :: (a -> b -> b) -> b -> UChar a -> b # foldl :: (b -> a -> b) -> b -> UChar a -> b # foldl' :: (b -> a -> b) -> b -> UChar a -> b # foldr1 :: (a -> a -> a) -> UChar a -> a # foldl1 :: (a -> a -> a) -> UChar a -> a # elem :: Eq a => a -> UChar a -> Bool # maximum :: Ord a => UChar a -> a # minimum :: Ord a => UChar a -> a # | |||||
Traversable (UChar :: Type -> Type) | |||||
MArray (STUArray s) Char (ST s) | |||||
Defined in Data.Array.Base Methods getBounds :: Ix i => STUArray s i Char -> ST s (i, i) Source # getNumElements :: Ix i => STUArray s i Char -> ST s Int Source # newArray :: Ix i => (i, i) -> Char -> ST s (STUArray s i Char) Source # newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Char) Source # unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Char) Source # unsafeRead :: Ix i => STUArray s i Char -> Int -> ST s Char Source # unsafeWrite :: Ix i => STUArray s i Char -> Int -> Char -> ST s () Source # | |||||
ToJExpr a => ToJExpr (Map String a) Source # | |||||
Functor (URec Char :: Type -> Type) | |||||
Generic (URec Char p) | |||||
Defined in GHC.Internal.Generics Associated Types
| |||||
Show (URec Char p) | |||||
Eq (URec Char p) | |||||
Ord (URec Char p) | |||||
Defined in GHC.Internal.Generics | |||||
data URec Char (p :: k) | |||||
type Compare (a :: Char) (b :: Char) | |||||
Defined in GHC.Internal.Data.Type.Ord | |||||
type Rep1 (URec Char :: k -> Type) | |||||
Defined in GHC.Internal.Generics | |||||
type Rep (URec Char p) | |||||
Defined in GHC.Internal.Generics |
Instances
MonadZip Maybe | Since: base-4.8.0.0 | ||||
Eq1 Maybe | Since: base-4.9.0.0 | ||||
Ord1 Maybe | Since: base-4.9.0.0 | ||||
Defined in Data.Functor.Classes | |||||
Read1 Maybe | Since: base-4.9.0.0 | ||||
Defined in Data.Functor.Classes Methods liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (Maybe a) Source # liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [Maybe a] Source # liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (Maybe a) Source # liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [Maybe a] Source # | |||||
Show1 Maybe | Since: base-4.9.0.0 | ||||
NFData1 Maybe | Since: deepseq-1.4.3.0 | ||||
Defined in Control.DeepSeq | |||||
MonadThrow Maybe | |||||
Defined in Control.Monad.Catch | |||||
Alternative Maybe | |||||
Applicative Maybe | |||||
Functor Maybe | |||||
Monad Maybe | |||||
MonadPlus Maybe | |||||
MonadFail Maybe | |||||
Defined in GHC.Internal.Control.Monad.Fail | |||||
MonadFix Maybe | |||||
Defined in GHC.Internal.Control.Monad.Fix | |||||
Foldable Maybe | |||||
Defined in GHC.Internal.Data.Foldable Methods fold :: Monoid m => Maybe m -> m # foldMap :: Monoid m => (a -> m) -> Maybe a -> m # foldMap' :: Monoid m => (a -> m) -> Maybe a -> m # foldr :: (a -> b -> b) -> b -> Maybe a -> b # foldr' :: (a -> b -> b) -> b -> Maybe a -> b # foldl :: (b -> a -> b) -> b -> Maybe a -> b # foldl' :: (b -> a -> b) -> b -> Maybe a -> b # foldr1 :: (a -> a -> a) -> Maybe a -> a # foldl1 :: (a -> a -> a) -> Maybe a -> a # elem :: Eq a => a -> Maybe a -> Bool # maximum :: Ord a => Maybe a -> a # minimum :: Ord a => Maybe a -> a # | |||||
Traversable Maybe | |||||
Generic1 Maybe | |||||
Defined in GHC.Internal.Generics Associated Types
| |||||
OutputableP env a => OutputableP env (Maybe a) Source # | |||||
Lift a => Lift (Maybe a :: Type) | |||||
Binary a => Binary (Maybe a) | |||||
NFData a => NFData (Maybe a) | |||||
Defined in Control.DeepSeq | |||||
HasLoc a => HasLoc (Maybe a) Source # | |||||
NoAnn (Maybe a) Source # | |||||
Defined in GHC.Parser.Annotation | |||||
Binary a => Binary (Maybe a) Source # | |||||
Outputable a => Outputable (Maybe a) Source # | |||||
Semigroup a => Monoid (Maybe a) | |||||
Semigroup a => Semigroup (Maybe a) | |||||
Data a => Data (Maybe a) | |||||
Defined in GHC.Internal.Data.Data Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Maybe a -> c (Maybe a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Maybe a) # toConstr :: Maybe a -> Constr # dataTypeOf :: Maybe a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Maybe a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Maybe a)) # gmapT :: (forall b. Data b => b -> b) -> Maybe a -> Maybe a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Maybe a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Maybe a -> r # gmapQ :: (forall d. Data d => d -> u) -> Maybe a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Maybe a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Maybe a -> m (Maybe a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Maybe a -> m (Maybe a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Maybe a -> m (Maybe a) # | |||||
Generic (Maybe a) | |||||
Defined in GHC.Internal.Generics Associated Types
| |||||
SingKind a => SingKind (Maybe a) | |||||
Defined in GHC.Internal.Generics Associated Types
| |||||
Read a => Read (Maybe a) | |||||
Show a => Show (Maybe a) | |||||
Eq (DeBruijn a) => Eq (DeBruijn (Maybe a)) Source # | |||||
Eq a => Eq (Maybe a) | |||||
Ord a => Ord (Maybe a) | |||||
SingI ('Nothing :: Maybe a) | |||||
Defined in GHC.Internal.Generics | |||||
SingI a2 => SingI ('Just a2 :: Maybe a1) | |||||
Defined in GHC.Internal.Generics | |||||
type Rep1 Maybe | |||||
Defined in GHC.Internal.Generics | |||||
type Anno (Maybe Role) Source # | |||||
Defined in GHC.Hs.Decls | |||||
type Anno (Maybe Role) Source # | |||||
Defined in GHC.Hs.Decls | |||||
type DemoteRep (Maybe a) | |||||
Defined in GHC.Internal.Generics | |||||
type Rep (Maybe a) | |||||
Defined in GHC.Internal.Generics | |||||
data Sing (b :: Maybe a) | |||||
Instances
MonadIO IO | Since: base-4.9.0.0 |
MonadCatch IO | |
Defined in Control.Monad.Catch | |
MonadMask IO | |
Defined in Control.Monad.Catch Methods mask :: HasCallStack => ((forall a. IO a -> IO a) -> IO b) -> IO b Source # uninterruptibleMask :: HasCallStack => ((forall a. IO a -> IO a) -> IO b) -> IO b Source # generalBracket :: HasCallStack => IO a -> (a -> ExitCase b -> IO c) -> (a -> IO b) -> IO (b, c) Source # | |
MonadThrow IO | |
Defined in Control.Monad.Catch | |
Alternative IO | |
Applicative IO | |
Functor IO | |
Monad IO | |
MonadPlus IO | |
MonadFail IO | |
Defined in GHC.Internal.Control.Monad.Fail | |
MonadFix IO | |
Defined in GHC.Internal.Control.Monad.Fix | |
Quasi IO | |
Defined in Language.Haskell.TH.Syntax Methods qNewName :: String -> IO Name Source # qReport :: Bool -> String -> IO () Source # qRecover :: IO a -> IO a -> IO a Source # qLookupName :: Bool -> String -> IO (Maybe Name) Source # qReify :: Name -> IO Info Source # qReifyFixity :: Name -> IO (Maybe Fixity) Source # qReifyType :: Name -> IO Type Source # qReifyInstances :: Name -> [Type] -> IO [Dec] Source # qReifyRoles :: Name -> IO [Role] Source # qReifyAnnotations :: Data a => AnnLookup -> IO [a] Source # qReifyModule :: Module -> IO ModuleInfo Source # qReifyConStrictness :: Name -> IO [DecidedStrictness] Source # qRunIO :: IO a -> IO a Source # qGetPackageRoot :: IO FilePath Source # qAddDependentFile :: FilePath -> IO () Source # qAddTempFile :: String -> IO FilePath Source # qAddTopDecls :: [Dec] -> IO () Source # qAddForeignFilePath :: ForeignSrcLang -> String -> IO () Source # qAddModFinalizer :: Q () -> IO () Source # qAddCorePlugin :: String -> IO () Source # qGetQ :: Typeable a => IO (Maybe a) Source # qPutQ :: Typeable a => a -> IO () Source # qIsExtEnabled :: Extension -> IO Bool Source # qExtsEnabled :: IO [Extension] Source # | |
Quote IO | |
MArray IOUArray Int16 IO | |
Defined in Data.Array.IO.Internals Methods getBounds :: Ix i => IOUArray i Int16 -> IO (i, i) Source # getNumElements :: Ix i => IOUArray i Int16 -> IO Int Source # newArray :: Ix i => (i, i) -> Int16 -> IO (IOUArray i Int16) Source # newArray_ :: Ix i => (i, i) -> IO (IOUArray i Int16) Source # unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Int16) Source # unsafeRead :: Ix i => IOUArray i Int16 -> Int -> IO Int16 Source # unsafeWrite :: Ix i => IOUArray i Int16 -> Int -> Int16 -> IO () Source # | |
MArray IOUArray Int32 IO | |
Defined in Data.Array.IO.Internals Methods getBounds :: Ix i => IOUArray i Int32 -> IO (i, i) Source # getNumElements :: Ix i => IOUArray i Int32 -> IO Int Source # newArray :: Ix i => (i, i) -> Int32 -> IO (IOUArray i Int32) Source # newArray_ :: Ix i => (i, i) -> IO (IOUArray i Int32) Source # unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Int32) Source # unsafeRead :: Ix i => IOUArray i Int32 -> Int -> IO Int32 Source # unsafeWrite :: Ix i => IOUArray i Int32 -> Int -> Int32 -> IO () Source # | |
MArray IOUArray Int64 IO | |
Defined in Data.Array.IO.Internals Methods getBounds :: Ix i => IOUArray i Int64 -> IO (i, i) Source # getNumElements :: Ix i => IOUArray i Int64 -> IO Int Source # newArray :: Ix i => (i, i) -> Int64 -> IO (IOUArray i Int64) Source # newArray_ :: Ix i => (i, i) -> IO (IOUArray i Int64) Source # unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Int64) Source # unsafeRead :: Ix i => IOUArray i Int64 -> Int -> IO Int64 Source # unsafeWrite :: Ix i => IOUArray i Int64 -> Int -> Int64 -> IO () Source # | |
MArray IOUArray Int8 IO | |
Defined in Data.Array.IO.Internals Methods getBounds :: Ix i => IOUArray i Int8 -> IO (i, i) Source # getNumElements :: Ix i => IOUArray i Int8 -> IO Int Source # newArray :: Ix i => (i, i) -> Int8 -> IO (IOUArray i Int8) Source # newArray_ :: Ix i => (i, i) -> IO (IOUArray i Int8) Source # unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Int8) Source # unsafeRead :: Ix i => IOUArray i Int8 -> Int -> IO Int8 Source # unsafeWrite :: Ix i => IOUArray i Int8 -> Int -> Int8 -> IO () Source # | |
MArray IOUArray Word16 IO | |
Defined in Data.Array.IO.Internals Methods getBounds :: Ix i => IOUArray i Word16 -> IO (i, i) Source # getNumElements :: Ix i => IOUArray i Word16 -> IO Int Source # newArray :: Ix i => (i, i) -> Word16 -> IO (IOUArray i Word16) Source # newArray_ :: Ix i => (i, i) -> IO (IOUArray i Word16) Source # unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Word16) Source # unsafeRead :: Ix i => IOUArray i Word16 -> Int -> IO Word16 Source # unsafeWrite :: Ix i => IOUArray i Word16 -> Int -> Word16 -> IO () Source # | |
MArray IOUArray Word32 IO | |
Defined in Data.Array.IO.Internals Methods getBounds :: Ix i => IOUArray i Word32 -> IO (i, i) Source # getNumElements :: Ix i => IOUArray i Word32 -> IO Int Source # newArray :: Ix i => (i, i) -> Word32 -> IO (IOUArray i Word32) Source # newArray_ :: Ix i => (i, i) -> IO (IOUArray i Word32) Source # unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Word32) Source # unsafeRead :: Ix i => IOUArray i Word32 -> Int -> IO Word32 Source # unsafeWrite :: Ix i => IOUArray i Word32 -> Int -> Word32 -> IO () Source # | |
MArray IOUArray Word64 IO | |
Defined in Data.Array.IO.Internals Methods getBounds :: Ix i => IOUArray i Word64 -> IO (i, i) Source # getNumElements :: Ix i => IOUArray i Word64 -> IO Int Source # newArray :: Ix i => (i, i) -> Word64 -> IO (IOUArray i Word64) Source # newArray_ :: Ix i => (i, i) -> IO (IOUArray i Word64) Source # unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Word64) Source # unsafeRead :: Ix i => IOUArray i Word64 -> Int -> IO Word64 Source # unsafeWrite :: Ix i => IOUArray i Word64 -> Int -> Word64 -> IO () Source # | |
MArray IOUArray Word8 IO | |
Defined in Data.Array.IO.Internals Methods getBounds :: Ix i => IOUArray i Word8 -> IO (i, i) Source # getNumElements :: Ix i => IOUArray i Word8 -> IO Int Source # newArray :: Ix i => (i, i) -> Word8 -> IO (IOUArray i Word8) Source # newArray_ :: Ix i => (i, i) -> IO (IOUArray i Word8) Source # unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Word8) Source # unsafeRead :: Ix i => IOUArray i Word8 -> Int -> IO Word8 Source # unsafeWrite :: Ix i => IOUArray i Word8 -> Int -> Word8 -> IO () Source # | |
MArray IOUArray Bool IO | |
Defined in Data.Array.IO.Internals Methods getBounds :: Ix i => IOUArray i Bool -> IO (i, i) Source # getNumElements :: Ix i => IOUArray i Bool -> IO Int Source # newArray :: Ix i => (i, i) -> Bool -> IO (IOUArray i Bool) Source # newArray_ :: Ix i => (i, i) -> IO (IOUArray i Bool) Source # unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Bool) Source # unsafeRead :: Ix i => IOUArray i Bool -> Int -> IO Bool Source # unsafeWrite :: Ix i => IOUArray i Bool -> Int -> Bool -> IO () Source # | |
MArray IOUArray Char IO | |
Defined in Data.Array.IO.Internals Methods getBounds :: Ix i => IOUArray i Char -> IO (i, i) Source # getNumElements :: Ix i => IOUArray i Char -> IO Int Source # newArray :: Ix i => (i, i) -> Char -> IO (IOUArray i Char) Source # newArray_ :: Ix i => (i, i) -> IO (IOUArray i Char) Source # unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Char) Source # unsafeRead :: Ix i => IOUArray i Char -> Int -> IO Char Source # unsafeWrite :: Ix i => IOUArray i Char -> Int -> Char -> IO () Source # | |
MArray IOUArray Double IO | |
Defined in Data.Array.IO.Internals Methods getBounds :: Ix i => IOUArray i Double -> IO (i, i) Source # getNumElements :: Ix i => IOUArray i Double -> IO Int Source # newArray :: Ix i => (i, i) -> Double -> IO (IOUArray i Double) Source # newArray_ :: Ix i => (i, i) -> IO (IOUArray i Double) Source # unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Double) Source # unsafeRead :: Ix i => IOUArray i Double -> Int -> IO Double Source # unsafeWrite :: Ix i => IOUArray i Double -> Int -> Double -> IO () Source # | |
MArray IOUArray Float IO | |
Defined in Data.Array.IO.Internals Methods getBounds :: Ix i => IOUArray i Float -> IO (i, i) Source # getNumElements :: Ix i => IOUArray i Float -> IO Int Source # newArray :: Ix i => (i, i) -> Float -> IO (IOUArray i Float) Source # newArray_ :: Ix i => (i, i) -> IO (IOUArray i Float) Source # unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Float) Source # unsafeRead :: Ix i => IOUArray i Float -> Int -> IO Float Source # unsafeWrite :: Ix i => IOUArray i Float -> Int -> Float -> IO () Source # | |
MArray IOUArray Int IO | |
Defined in Data.Array.IO.Internals Methods getBounds :: Ix i => IOUArray i Int -> IO (i, i) Source # getNumElements :: Ix i => IOUArray i Int -> IO Int Source # newArray :: Ix i => (i, i) -> Int -> IO (IOUArray i Int) Source # newArray_ :: Ix i => (i, i) -> IO (IOUArray i Int) Source # unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Int) Source # unsafeRead :: Ix i => IOUArray i Int -> Int -> IO Int Source # unsafeWrite :: Ix i => IOUArray i Int -> Int -> Int -> IO () Source # | |
MArray IOUArray Word IO | |
Defined in Data.Array.IO.Internals Methods getBounds :: Ix i => IOUArray i Word -> IO (i, i) Source # getNumElements :: Ix i => IOUArray i Word -> IO Int Source # newArray :: Ix i => (i, i) -> Word -> IO (IOUArray i Word) Source # newArray_ :: Ix i => (i, i) -> IO (IOUArray i Word) Source # unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Word) Source # unsafeRead :: Ix i => IOUArray i Word -> Int -> IO Word Source # unsafeWrite :: Ix i => IOUArray i Word -> Int -> Word -> IO () Source # | |
Storable e => MArray StorableArray e IO | |
Defined in Data.Array.Storable.Internals Methods getBounds :: Ix i => StorableArray i e -> IO (i, i) Source # getNumElements :: Ix i => StorableArray i e -> IO Int Source # newArray :: Ix i => (i, i) -> e -> IO (StorableArray i e) Source # newArray_ :: Ix i => (i, i) -> IO (StorableArray i e) Source # unsafeNewArray_ :: Ix i => (i, i) -> IO (StorableArray i e) Source # unsafeRead :: Ix i => StorableArray i e -> Int -> IO e Source # unsafeWrite :: Ix i => StorableArray i e -> Int -> e -> IO () Source # | |
MArray IOArray e IO | |
Defined in Data.Array.Base Methods getBounds :: Ix i => IOArray i e -> IO (i, i) Source # getNumElements :: Ix i => IOArray i e -> IO Int Source # newArray :: Ix i => (i, i) -> e -> IO (IOArray i e) Source # newArray_ :: Ix i => (i, i) -> IO (IOArray i e) Source # unsafeNewArray_ :: Ix i => (i, i) -> IO (IOArray i e) Source # unsafeRead :: Ix i => IOArray i e -> Int -> IO e Source # unsafeWrite :: Ix i => IOArray i e -> Int -> e -> IO () Source # | |
MArray TArray e IO | Writes are slow in |
Defined in Control.Concurrent.STM.TArray Methods getBounds :: Ix i => TArray i e -> IO (i, i) Source # getNumElements :: Ix i => TArray i e -> IO Int Source # newArray :: Ix i => (i, i) -> e -> IO (TArray i e) Source # newArray_ :: Ix i => (i, i) -> IO (TArray i e) Source # unsafeNewArray_ :: Ix i => (i, i) -> IO (TArray i e) Source # unsafeRead :: Ix i => TArray i e -> Int -> IO e Source # unsafeWrite :: Ix i => TArray i e -> Int -> e -> IO () Source # | |
MArray IOUArray (FunPtr a) IO | |
Defined in Data.Array.IO.Internals Methods getBounds :: Ix i => IOUArray i (FunPtr a) -> IO (i, i) Source # getNumElements :: Ix i => IOUArray i (FunPtr a) -> IO Int Source # newArray :: Ix i => (i, i) -> FunPtr a -> IO (IOUArray i (FunPtr a)) Source # newArray_ :: Ix i => (i, i) -> IO (IOUArray i (FunPtr a)) Source # unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i (FunPtr a)) Source # unsafeRead :: Ix i => IOUArray i (FunPtr a) -> Int -> IO (FunPtr a) Source # unsafeWrite :: Ix i => IOUArray i (FunPtr a) -> Int -> FunPtr a -> IO () Source # | |
MArray IOUArray (Ptr a) IO | |
Defined in Data.Array.IO.Internals Methods getBounds :: Ix i => IOUArray i (Ptr a) -> IO (i, i) Source # getNumElements :: Ix i => IOUArray i (Ptr a) -> IO Int Source # newArray :: Ix i => (i, i) -> Ptr a -> IO (IOUArray i (Ptr a)) Source # newArray_ :: Ix i => (i, i) -> IO (IOUArray i (Ptr a)) Source # unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i (Ptr a)) Source # unsafeRead :: Ix i => IOUArray i (Ptr a) -> Int -> IO (Ptr a) Source # unsafeWrite :: Ix i => IOUArray i (Ptr a) -> Int -> Ptr a -> IO () Source # | |
MArray IOUArray (StablePtr a) IO | |
Defined in Data.Array.IO.Internals Methods getBounds :: Ix i => IOUArray i (StablePtr a) -> IO (i, i) Source # getNumElements :: Ix i => IOUArray i (StablePtr a) -> IO Int Source # newArray :: Ix i => (i, i) -> StablePtr a -> IO (IOUArray i (StablePtr a)) Source # newArray_ :: Ix i => (i, i) -> IO (IOUArray i (StablePtr a)) Source # unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i (StablePtr a)) Source # unsafeRead :: Ix i => IOUArray i (StablePtr a) -> Int -> IO (StablePtr a) Source # unsafeWrite :: Ix i => IOUArray i (StablePtr a) -> Int -> StablePtr a -> IO () Source # | |
a ~ () => HPrintfType (IO a) | Since: base-4.7.0.0 |
Defined in Text.Printf | |
a ~ () => PrintfType (IO a) | Since: base-4.7.0.0 |
Defined in Text.Printf | |
Monoid a => Monoid (IO a) | |
Semigroup a => Semigroup (IO a) | |
Instances
Binary Bool | |||||
NFData Bool | |||||
Defined in Control.DeepSeq | |||||
ToJExpr Bool Source # | |||||
NoAnn Bool Source # | |||||
Defined in GHC.Parser.Annotation | |||||
Binary Bool Source # | |||||
Outputable Bool Source # | |||||
Bits Bool | |||||
Defined in GHC.Internal.Bits Methods (.&.) :: Bool -> Bool -> Bool # (.|.) :: Bool -> Bool -> Bool # complement :: Bool -> Bool # shift :: Bool -> Int -> Bool # rotate :: Bool -> Int -> Bool # setBit :: Bool -> Int -> Bool # clearBit :: Bool -> Int -> Bool # complementBit :: Bool -> Int -> Bool # testBit :: Bool -> Int -> Bool # bitSizeMaybe :: Bool -> Maybe Int # shiftL :: Bool -> Int -> Bool # unsafeShiftL :: Bool -> Int -> Bool # shiftR :: Bool -> Int -> Bool # unsafeShiftR :: Bool -> Int -> Bool # rotateL :: Bool -> Int -> Bool # | |||||
FiniteBits Bool | |||||
Defined in GHC.Internal.Bits Methods finiteBitSize :: Bool -> Int # countLeadingZeros :: Bool -> Int # countTrailingZeros :: Bool -> Int # | |||||
Data Bool | |||||
Defined in GHC.Internal.Data.Data Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Bool -> c Bool # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Bool # dataTypeOf :: Bool -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Bool) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Bool) # gmapT :: (forall b. Data b => b -> b) -> Bool -> Bool # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Bool -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Bool -> r # gmapQ :: (forall d. Data d => d -> u) -> Bool -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Bool -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Bool -> m Bool # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Bool -> m Bool # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Bool -> m Bool # | |||||
Bounded Bool | |||||
Enum Bool | |||||
Storable Bool | |||||
Defined in GHC.Internal.Foreign.Storable | |||||
Generic Bool | |||||
Defined in GHC.Internal.Generics | |||||
SingKind Bool | |||||
Defined in GHC.Internal.Generics Associated Types
| |||||
Ix Bool | |||||
Read Bool | |||||
Show Bool | |||||
Eq Bool | |||||
Ord Bool | |||||
HpcHash Bool | |||||
IArray UArray Bool | |||||
Defined in Data.Array.Base Methods bounds :: Ix i => UArray i Bool -> (i, i) Source # numElements :: Ix i => UArray i Bool -> Int Source # unsafeArray :: Ix i => (i, i) -> [(Int, Bool)] -> UArray i Bool Source # unsafeAt :: Ix i => UArray i Bool -> Int -> Bool Source # unsafeReplace :: Ix i => UArray i Bool -> [(Int, Bool)] -> UArray i Bool Source # unsafeAccum :: Ix i => (Bool -> e' -> Bool) -> UArray i Bool -> [(Int, e')] -> UArray i Bool Source # unsafeAccumArray :: Ix i => (Bool -> e' -> Bool) -> Bool -> (i, i) -> [(Int, e')] -> UArray i Bool Source # | |||||
SingI 'False | |||||
Defined in GHC.Internal.Generics | |||||
SingI 'True | |||||
Defined in GHC.Internal.Generics | |||||
Lift Bool | |||||
MArray IOUArray Bool IO | |||||
Defined in Data.Array.IO.Internals Methods getBounds :: Ix i => IOUArray i Bool -> IO (i, i) Source # getNumElements :: Ix i => IOUArray i Bool -> IO Int Source # newArray :: Ix i => (i, i) -> Bool -> IO (IOUArray i Bool) Source # newArray_ :: Ix i => (i, i) -> IO (IOUArray i Bool) Source # unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Bool) Source # unsafeRead :: Ix i => IOUArray i Bool -> Int -> IO Bool Source # unsafeWrite :: Ix i => IOUArray i Bool -> Int -> Bool -> IO () Source # | |||||
MArray (STUArray s) Bool (ST s) | |||||
Defined in Data.Array.Base Methods getBounds :: Ix i => STUArray s i Bool -> ST s (i, i) Source # getNumElements :: Ix i => STUArray s i Bool -> ST s Int Source # newArray :: Ix i => (i, i) -> Bool -> ST s (STUArray s i Bool) Source # newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Bool) Source # unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Bool) Source # unsafeRead :: Ix i => STUArray s i Bool -> Int -> ST s Bool Source # unsafeWrite :: Ix i => STUArray s i Bool -> Int -> Bool -> ST s () Source # | |||||
type Anno Bool Source # | |||||
Defined in GHC.Hs.Decls | |||||
type DemoteRep Bool | |||||
Defined in GHC.Internal.Generics | |||||
type Rep Bool | |||||
data Sing (a :: Bool) | |||||
Instances
PrintfArg Double | Since: base-2.1 | ||||
Defined in Text.Printf Methods formatArg :: Double -> FieldFormatter Source # parseFormat :: Double -> ModifierParser Source # | |||||
Binary Double | Uses non-IEEE754 encoding. Does not round-trip NaN. | ||||
NFData Double | |||||
Defined in Control.DeepSeq | |||||
ToJExpr Double Source # | |||||
Outputable Double Source # | |||||
Data Double | |||||
Defined in GHC.Internal.Data.Data Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Double -> c Double # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Double # toConstr :: Double -> Constr # dataTypeOf :: Double -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Double) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Double) # gmapT :: (forall b. Data b => b -> b) -> Double -> Double # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Double -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Double -> r # gmapQ :: (forall d. Data d => d -> u) -> Double -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Double -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Double -> m Double # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Double -> m Double # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Double -> m Double # | |||||
Floating Double | |||||
RealFloat Double | |||||
Defined in GHC.Internal.Float Methods floatRadix :: Double -> Integer # floatDigits :: Double -> Int # floatRange :: Double -> (Int, Int) # decodeFloat :: Double -> (Integer, Int) # encodeFloat :: Integer -> Int -> Double # significand :: Double -> Double # scaleFloat :: Int -> Double -> Double # isInfinite :: Double -> Bool # isDenormalized :: Double -> Bool # isNegativeZero :: Double -> Bool # | |||||
Storable Double | |||||
Read Double | |||||
Eq Double | |||||
Ord Double | |||||
IArray UArray Double | |||||
Defined in Data.Array.Base Methods bounds :: Ix i => UArray i Double -> (i, i) Source # numElements :: Ix i => UArray i Double -> Int Source # unsafeArray :: Ix i => (i, i) -> [(Int, Double)] -> UArray i Double Source # unsafeAt :: Ix i => UArray i Double -> Int -> Double Source # unsafeReplace :: Ix i => UArray i Double -> [(Int, Double)] -> UArray i Double Source # unsafeAccum :: Ix i => (Double -> e' -> Double) -> UArray i Double -> [(Int, e')] -> UArray i Double Source # unsafeAccumArray :: Ix i => (Double -> e' -> Double) -> Double -> (i, i) -> [(Int, e')] -> UArray i Double Source # | |||||
Lift Double | |||||
MArray IOUArray Double IO | |||||
Defined in Data.Array.IO.Internals Methods getBounds :: Ix i => IOUArray i Double -> IO (i, i) Source # getNumElements :: Ix i => IOUArray i Double -> IO Int Source # newArray :: Ix i => (i, i) -> Double -> IO (IOUArray i Double) Source # newArray_ :: Ix i => (i, i) -> IO (IOUArray i Double) Source # unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Double) Source # unsafeRead :: Ix i => IOUArray i Double -> Int -> IO Double Source # unsafeWrite :: Ix i => IOUArray i Double -> Int -> Double -> IO () Source # | |||||
Generic1 (URec Double :: k -> Type) | |||||
Defined in GHC.Internal.Generics Associated Types
| |||||
Foldable (UDouble :: Type -> Type) | |||||
Defined in GHC.Internal.Data.Foldable Methods fold :: Monoid m => UDouble m -> m # foldMap :: Monoid m => (a -> m) -> UDouble a -> m # foldMap' :: Monoid m => (a -> m) -> UDouble a -> m # foldr :: (a -> b -> b) -> b -> UDouble a -> b # foldr' :: (a -> b -> b) -> b -> UDouble a -> b # foldl :: (b -> a -> b) -> b -> UDouble a -> b # foldl' :: (b -> a -> b) -> b -> UDouble a -> b # foldr1 :: (a -> a -> a) -> UDouble a -> a # foldl1 :: (a -> a -> a) -> UDouble a -> a # elem :: Eq a => a -> UDouble a -> Bool # maximum :: Ord a => UDouble a -> a # minimum :: Ord a => UDouble a -> a # | |||||
Traversable (UDouble :: Type -> Type) | |||||
MArray (STUArray s) Double (ST s) | |||||
Defined in Data.Array.Base Methods getBounds :: Ix i => STUArray s i Double -> ST s (i, i) Source # getNumElements :: Ix i => STUArray s i Double -> ST s Int Source # newArray :: Ix i => (i, i) -> Double -> ST s (STUArray s i Double) Source # newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Double) Source # unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Double) Source # unsafeRead :: Ix i => STUArray s i Double -> Int -> ST s Double Source # unsafeWrite :: Ix i => STUArray s i Double -> Int -> Double -> ST s () Source # | |||||
Functor (URec Double :: Type -> Type) | |||||
Generic (URec Double p) | |||||
Defined in GHC.Internal.Generics Associated Types
| |||||
Show (URec Double p) | |||||
Eq (URec Double p) | |||||
Ord (URec Double p) | |||||
Defined in GHC.Internal.Generics Methods compare :: URec Double p -> URec Double p -> Ordering # (<) :: URec Double p -> URec Double p -> Bool # (<=) :: URec Double p -> URec Double p -> Bool # (>) :: URec Double p -> URec Double p -> Bool # (>=) :: URec Double p -> URec Double p -> Bool # | |||||
data URec Double (p :: k) | |||||
type Rep1 (URec Double :: k -> Type) | |||||
Defined in GHC.Internal.Generics | |||||
type Rep (URec Double p) | |||||
Defined in GHC.Internal.Generics |
Instances
PrintfArg Word | Since: base-2.1 | ||||
Defined in Text.Printf | |||||
Binary Word | |||||
NFData Word | |||||
Defined in Control.DeepSeq | |||||
Outputable Word Source # | |||||
Bits Word | |||||
Defined in GHC.Internal.Bits Methods (.&.) :: Word -> Word -> Word # (.|.) :: Word -> Word -> Word # complement :: Word -> Word # shift :: Word -> Int -> Word # rotate :: Word -> Int -> Word # setBit :: Word -> Int -> Word # clearBit :: Word -> Int -> Word # complementBit :: Word -> Int -> Word # testBit :: Word -> Int -> Bool # bitSizeMaybe :: Word -> Maybe Int # shiftL :: Word -> Int -> Word # unsafeShiftL :: Word -> Int -> Word # shiftR :: Word -> Int -> Word # unsafeShiftR :: Word -> Int -> Word # rotateL :: Word -> Int -> Word # | |||||
FiniteBits Word | |||||
Defined in GHC.Internal.Bits Methods finiteBitSize :: Word -> Int # countLeadingZeros :: Word -> Int # countTrailingZeros :: Word -> Int # | |||||
Data Word | |||||
Defined in GHC.Internal.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 # 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 # | |||||
Bounded Word | |||||
Enum Word | |||||
Storable Word | |||||
Defined in GHC.Internal.Foreign.Storable | |||||
Ix Word | |||||
Num Word | |||||
Read Word | |||||
Integral Word | |||||
Real Word | |||||
Defined in GHC.Internal.Real Methods toRational :: Word -> Rational # | |||||
Show Word | |||||
Eq Word | |||||
Ord Word | |||||
IArray UArray Word | |||||
Defined in Data.Array.Base Methods bounds :: Ix i => UArray i Word -> (i, i) Source # numElements :: Ix i => UArray i Word -> Int Source # unsafeArray :: Ix i => (i, i) -> [(Int, Word)] -> UArray i Word Source # unsafeAt :: Ix i => UArray i Word -> Int -> Word Source # unsafeReplace :: Ix i => UArray i Word -> [(Int, Word)] -> UArray i Word Source # unsafeAccum :: Ix i => (Word -> e' -> Word) -> UArray i Word -> [(Int, e')] -> UArray i Word Source # unsafeAccumArray :: Ix i => (Word -> e' -> Word) -> Word -> (i, i) -> [(Int, e')] -> UArray i Word Source # | |||||
Lift Word | |||||
MArray IOUArray Word IO | |||||
Defined in Data.Array.IO.Internals Methods getBounds :: Ix i => IOUArray i Word -> IO (i, i) Source # getNumElements :: Ix i => IOUArray i Word -> IO Int Source # newArray :: Ix i => (i, i) -> Word -> IO (IOUArray i Word) Source # newArray_ :: Ix i => (i, i) -> IO (IOUArray i Word) Source # unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Word) Source # unsafeRead :: Ix i => IOUArray i Word -> Int -> IO Word Source # unsafeWrite :: Ix i => IOUArray i Word -> Int -> Word -> IO () Source # | |||||
Generic1 (URec Word :: k -> Type) | |||||
Defined in GHC.Internal.Generics Associated Types
| |||||
Foldable (UWord :: Type -> Type) | |||||
Defined in GHC.Internal.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 # elem :: Eq a => a -> UWord a -> Bool # maximum :: Ord a => UWord a -> a # minimum :: Ord a => UWord a -> a # | |||||
Traversable (UWord :: Type -> Type) | |||||
MArray (STUArray s) Word (ST s) | |||||
Defined in Data.Array.Base Methods getBounds :: Ix i => STUArray s i Word -> ST s (i, i) Source # getNumElements :: Ix i => STUArray s i Word -> ST s Int Source # newArray :: Ix i => (i, i) -> Word -> ST s (STUArray s i Word) Source # newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Word) Source # unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Word) Source # unsafeRead :: Ix i => STUArray s i Word -> Int -> ST s Word Source # unsafeWrite :: Ix i => STUArray s i Word -> Int -> Word -> ST s () Source # | |||||
Functor (URec Word :: Type -> Type) | |||||
Generic (URec Word p) | |||||
Defined in GHC.Internal.Generics Associated Types
| |||||
Show (URec Word p) | |||||
Eq (URec Word p) | |||||
Ord (URec Word p) | |||||
Defined in GHC.Internal.Generics | |||||
data URec Word (p :: k) | |||||
type Rep1 (URec Word :: k -> Type) | |||||
Defined in GHC.Internal.Generics | |||||
type Rep (URec Word p) | |||||
Defined in GHC.Internal.Generics |
Instances
Binary Ordering | |
NFData Ordering | |
Defined in Control.DeepSeq | |
Outputable Ordering Source # | |
Monoid Ordering | |
Semigroup Ordering | |
Data Ordering | |
Defined in GHC.Internal.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 # | |
Bounded Ordering | |
Enum Ordering | |
Defined in GHC.Internal.Enum | |
Generic Ordering | |
Defined in GHC.Internal.Generics | |
Ix Ordering | |
Defined in GHC.Internal.Ix Methods range :: (Ordering, Ordering) -> [Ordering] # index :: (Ordering, Ordering) -> Ordering -> Int # unsafeIndex :: (Ordering, Ordering) -> Ordering -> Int # inRange :: (Ordering, Ordering) -> Ordering -> Bool # rangeSize :: (Ordering, Ordering) -> Int # unsafeRangeSize :: (Ordering, Ordering) -> Int # | |
Read Ordering | |
Show Ordering | |
Eq Ordering | |
Ord Ordering | |
Defined in GHC.Classes | |
type Rep Ordering | |
Instances
PrintfArg Integer | Since: base-2.1 |
Defined in Text.Printf Methods formatArg :: Integer -> FieldFormatter Source # parseFormat :: Integer -> ModifierParser Source # | |
Binary Integer | |
NFData Integer | |
Defined in Control.DeepSeq | |
ToJExpr Integer Source # | |
Binary Integer Source # | |
Outputable Integer Source # | |
Bits Integer | |
Defined in GHC.Internal.Bits Methods (.&.) :: Integer -> Integer -> Integer # (.|.) :: Integer -> Integer -> Integer # xor :: Integer -> Integer -> Integer # complement :: Integer -> Integer # shift :: Integer -> Int -> Integer # rotate :: Integer -> Int -> Integer # setBit :: Integer -> Int -> Integer # clearBit :: Integer -> Int -> Integer # complementBit :: Integer -> Int -> Integer # testBit :: Integer -> Int -> Bool # bitSizeMaybe :: Integer -> Maybe Int # shiftL :: Integer -> Int -> Integer # unsafeShiftL :: Integer -> Int -> Integer # shiftR :: Integer -> Int -> Integer # unsafeShiftR :: Integer -> Int -> Integer # rotateL :: Integer -> Int -> Integer # | |
Data Integer | |
Defined in GHC.Internal.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 | |
Ix Integer | |
Defined in GHC.Internal.Ix | |
Num Integer | |
Read Integer | |
Integral Integer | |
Defined in GHC.Internal.Real | |
Real Integer | |
Defined in GHC.Internal.Real Methods toRational :: Integer -> Rational # | |
Show Integer | |
Eq Integer | |
Ord Integer | |
HpcHash Integer | |
Lift Integer | |
cycle :: HasCallStack => [a] -> [a] #
class Foldable (t :: Type -> Type) where #
Methods
foldMap :: Monoid m => (a -> m) -> t a -> m #
foldr :: (a -> b -> b) -> b -> t a -> b #
foldl :: (b -> a -> b) -> b -> t a -> b #
foldl' :: (b -> a -> b) -> b -> t a -> b #
foldr1 :: (a -> a -> a) -> t a -> a #
foldl1 :: (a -> a -> a) -> t a -> a #
elem :: Eq a => a -> t a -> Bool #
maximum :: Ord a => t a -> a #
Instances
Foldable Complex | Since: base-4.9.0.0 |
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 # elem :: Eq a => a -> Complex a -> Bool # maximum :: Ord a => Complex a -> a # minimum :: Ord a => Complex a -> a # | |
Foldable First | Since: base-4.9.0.0 |
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 # elem :: Eq a => a -> First a -> Bool # maximum :: Ord a => First a -> a # minimum :: Ord a => First a -> a # | |
Foldable Last | Since: base-4.9.0.0 |
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 # elem :: Eq a => a -> Last a -> Bool # maximum :: Ord a => Last a -> a # | |
Foldable Max | Since: base-4.9.0.0 |
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 # elem :: Eq a => a -> Max a -> Bool # maximum :: Ord a => Max a -> a # | |
Foldable Min | Since: base-4.9.0.0 |
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 # elem :: Eq a => a -> Min a -> Bool # maximum :: Ord a => Min a -> a # | |
Foldable SCC | Since: containers-0.5.9 |
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 # elem :: Eq a => a -> SCC a -> Bool # maximum :: Ord a => SCC a -> a # | |
Foldable IntMap | Folds in order of increasing key. |
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 # elem :: Eq a => a -> IntMap a -> Bool # maximum :: Ord a => IntMap a -> a # minimum :: Ord a => IntMap a -> a # | |
Foldable Digit | |
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 # elem :: Eq a => a -> Digit a -> Bool # maximum :: Ord a => Digit a -> a # minimum :: Ord a => Digit a -> a # | |
Foldable Elem | |
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 # elem :: Eq a => a -> Elem a -> Bool # maximum :: Ord a => Elem a -> a # | |
Foldable FingerTree | |
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 | |
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 # elem :: Eq a => a -> Node a -> Bool # maximum :: Ord a => Node a -> a # | |
Foldable Seq | |
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 # elem :: Eq a => a -> Seq a -> Bool # maximum :: Ord a => Seq a -> a # | |
Foldable ViewL | |
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 # elem :: Eq a => a -> ViewL a -> Bool # maximum :: Ord a => ViewL a -> a # minimum :: Ord a => ViewL a -> a # | |
Foldable ViewR | |
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 # elem :: Eq a => a -> ViewR a -> Bool # maximum :: Ord a => ViewR a -> a # minimum :: Ord a => ViewR a -> a # | |
Foldable Set | Folds in order of increasing key. |
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 # elem :: Eq a => a -> Set a -> Bool # maximum :: Ord a => Set a -> a # | |
Foldable Tree | Folds in preorder |
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 # elem :: Eq a => a -> Tree a -> Bool # maximum :: Ord a => Tree a -> a # | |
Foldable LabelMap Source # | |
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 # elem :: Eq a => a -> LabelMap a -> Bool # maximum :: Ord a => LabelMap a -> a # minimum :: Ord a => LabelMap a -> a # | |
Foldable Bag Source # | |
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 # elem :: Eq a => a -> Bag a -> Bool # maximum :: Ord a => Bag a -> a # | |
Foldable BooleanFormula Source # | |
Defined in GHC.Data.BooleanFormula 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 Infinite Source # | |
Defined in GHC.Data.List.Infinite Methods fold :: Monoid m => Infinite m -> m # foldMap :: Monoid m => (a -> m) -> Infinite a -> m # foldMap' :: Monoid m => (a -> m) -> Infinite a -> m # foldr :: (a -> b -> b) -> b -> Infinite a -> b # foldr' :: (a -> b -> b) -> b -> Infinite a -> b # foldl :: (b -> a -> b) -> b -> Infinite a -> b # foldl' :: (b -> a -> b) -> b -> Infinite a -> b # foldr1 :: (a -> a -> a) -> Infinite a -> a # foldl1 :: (a -> a -> a) -> Infinite a -> a # elem :: Eq a => a -> Infinite a -> Bool # maximum :: Ord a => Infinite a -> a # minimum :: Ord a => Infinite a -> a # | |
Foldable OrdList Source # | |
Defined in GHC.Data.OrdList Methods fold :: Monoid m => OrdList m -> m # foldMap :: Monoid m => (a -> m) -> OrdList a -> m # foldMap' :: Monoid m => (a -> m) -> OrdList a -> m # foldr :: (a -> b -> b) -> b -> OrdList a -> b # foldr' :: (a -> b -> b) -> b -> OrdList a -> b # foldl :: (b -> a -> b) -> b -> OrdList a -> b # foldl' :: (b -> a -> b) -> b -> OrdList a -> b # foldr1 :: (a -> a -> a) -> OrdList a -> a # foldl1 :: (a -> a -> a) -> OrdList a -> a # elem :: Eq a => a -> OrdList a -> Bool # maximum :: Ord a => OrdList a -> a # minimum :: Ord a => OrdList a -> a # | |
Foldable Pair Source # | |
Defined in GHC.Data.Pair Methods fold :: Monoid m => Pair m -> m # foldMap :: Monoid m => (a -> m) -> Pair a -> m # foldMap' :: Monoid m => (a -> m) -> Pair a -> m # foldr :: (a -> b -> b) -> b -> Pair a -> b # foldr' :: (a -> b -> b) -> b -> Pair a -> b # foldl :: (b -> a -> b) -> b -> Pair a -> b # foldl' :: (b -> a -> b) -> b -> Pair a -> b # foldr1 :: (a -> a -> a) -> Pair a -> a # foldl1 :: (a -> a -> a) -> Pair a -> a # elem :: Eq a => a -> Pair a -> Bool # maximum :: Ord a => Pair a -> a # | |
Foldable Maybe Source # | |
Defined in GHC.Data.Strict 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 # elem :: Eq a => a -> Maybe a -> Bool # maximum :: Ord a => Maybe a -> a # minimum :: Ord a => Maybe a -> a # | |
Foldable Word64Map Source # | Folds in order of increasing key. |
Defined in GHC.Data.Word64Map.Internal Methods fold :: Monoid m => Word64Map m -> m # foldMap :: Monoid m => (a -> m) -> Word64Map a -> m # foldMap' :: Monoid m => (a -> m) -> Word64Map a -> m # foldr :: (a -> b -> b) -> b -> Word64Map a -> b # foldr' :: (a -> b -> b) -> b -> Word64Map a -> b # foldl :: (b -> a -> b) -> b -> Word64Map a -> b # foldl' :: (b -> a -> b) -> b -> Word64Map a -> b # foldr1 :: (a -> a -> a) -> Word64Map a -> a # foldl1 :: (a -> a -> a) -> Word64Map a -> a # toList :: Word64Map a -> [a] # length :: Word64Map a -> Int # elem :: Eq a => a -> Word64Map a -> Bool # maximum :: Ord a => Word64Map a -> a # minimum :: Ord a => Word64Map a -> a # | |
Foldable ModNodeMap Source # | |
Defined in GHC.Driver.Make Methods fold :: Monoid m => ModNodeMap m -> m # foldMap :: Monoid m => (a -> m) -> ModNodeMap a -> m # foldMap' :: Monoid m => (a -> m) -> ModNodeMap a -> m # foldr :: (a -> b -> b) -> b -> ModNodeMap a -> b # foldr' :: (a -> b -> b) -> b -> ModNodeMap a -> b # foldl :: (b -> a -> b) -> b -> ModNodeMap a -> b # foldl' :: (b -> a -> b) -> b -> ModNodeMap a -> b # foldr1 :: (a -> a -> a) -> ModNodeMap a -> a # foldl1 :: (a -> a -> a) -> ModNodeMap a -> a # toList :: ModNodeMap a -> [a] # null :: ModNodeMap a -> Bool # length :: ModNodeMap a -> Int # elem :: Eq a => a -> ModNodeMap a -> Bool # maximum :: Ord a => ModNodeMap a -> a # minimum :: Ord a => ModNodeMap a -> a # sum :: Num a => ModNodeMap a -> a # product :: Num a => ModNodeMap a -> a # | |
Foldable HieAST Source # | |
Defined in GHC.Iface.Ext.Types Methods fold :: Monoid m => HieAST m -> m # foldMap :: Monoid m => (a -> m) -> HieAST a -> m # foldMap' :: Monoid m => (a -> m) -> HieAST a -> m # foldr :: (a -> b -> b) -> b -> HieAST a -> b # foldr' :: (a -> b -> b) -> b -> HieAST a -> b # foldl :: (b -> a -> b) -> b -> HieAST a -> b # foldl' :: (b -> a -> b) -> b -> HieAST a -> b # foldr1 :: (a -> a -> a) -> HieAST a -> a # foldl1 :: (a -> a -> a) -> HieAST a -> a # elem :: Eq a => a -> HieAST a -> Bool # maximum :: Ord a => HieAST a -> a # minimum :: Ord a => HieAST a -> a # | |
Foldable HieASTs Source # | |
Defined in GHC.Iface.Ext.Types Methods fold :: Monoid m => HieASTs m -> m # foldMap :: Monoid m => (a -> m) -> HieASTs a -> m # foldMap' :: Monoid m => (a -> m) -> HieASTs a -> m # foldr :: (a -> b -> b) -> b -> HieASTs a -> b # foldr' :: (a -> b -> b) -> b -> HieASTs a -> b # foldl :: (b -> a -> b) -> b -> HieASTs a -> b # foldl' :: (b -> a -> b) -> b -> HieASTs a -> b # foldr1 :: (a -> a -> a) -> HieASTs a -> a # foldl1 :: (a -> a -> a) -> HieASTs a -> a # elem :: Eq a => a -> HieASTs a -> Bool # maximum :: Ord a => HieASTs a -> a # minimum :: Ord a => HieASTs a -> a # | |
Foldable HieArgs Source # | |
Defined in GHC.Iface.Ext.Types Methods fold :: Monoid m => HieArgs m -> m # foldMap :: Monoid m => (a -> m) -> HieArgs a -> m # foldMap' :: Monoid m => (a -> m) -> HieArgs a -> m # foldr :: (a -> b -> b) -> b -> HieArgs a -> b # foldr' :: (a -> b -> b) -> b -> HieArgs a -> b # foldl :: (b -> a -> b) -> b -> HieArgs a -> b # foldl' :: (b -> a -> b) -> b -> HieArgs a -> b # foldr1 :: (a -> a -> a) -> HieArgs a -> a # foldl1 :: (a -> a -> a) -> HieArgs a -> a # elem :: Eq a => a -> HieArgs a -> Bool # maximum :: Ord a => HieArgs a -> a # minimum :: Ord a => HieArgs a -> a # | |
Foldable HieType Source # | |
Defined in GHC.Iface.Ext.Types Methods fold :: Monoid m => HieType m -> m # foldMap :: Monoid m => (a -> m) -> HieType a -> m # foldMap' :: Monoid m => (a -> m) -> HieType a -> m # foldr :: (a -> b -> b) -> b -> HieType a -> b # foldr' :: (a -> b -> b) -> b -> HieType a -> b # foldl :: (b -> a -> b) -> b -> HieType a -> b # foldl' :: (b -> a -> b) -> b -> HieType a -> b # foldr1 :: (a -> a -> a) -> HieType a -> a # foldl1 :: (a -> a -> a) -> HieType a -> a # elem :: Eq a => a -> HieType a -> Bool # maximum :: Ord a => HieType a -> a # minimum :: Ord a => HieType a -> a # | |
Foldable IdentifierDetails Source # | |
Defined in GHC.Iface.Ext.Types Methods fold :: Monoid m => IdentifierDetails m -> m # foldMap :: Monoid m => (a -> m) -> IdentifierDetails a -> m # foldMap' :: Monoid m => (a -> m) -> IdentifierDetails a -> m # foldr :: (a -> b -> b) -> b -> IdentifierDetails a -> b # foldr' :: (a -> b -> b) -> b -> IdentifierDetails a -> b # foldl :: (b -> a -> b) -> b -> IdentifierDetails a -> b # foldl' :: (b -> a -> b) -> b -> IdentifierDetails a -> b # foldr1 :: (a -> a -> a) -> IdentifierDetails a -> a # foldl1 :: (a -> a -> a) -> IdentifierDetails a -> a # toList :: IdentifierDetails a -> [a] # null :: IdentifierDetails a -> Bool # length :: IdentifierDetails a -> Int # elem :: Eq a => a -> IdentifierDetails a -> Bool # maximum :: Ord a => IdentifierDetails a -> a # minimum :: Ord a => IdentifierDetails a -> a # sum :: Num a => IdentifierDetails a -> a # product :: Num a => IdentifierDetails a -> a # | |
Foldable NodeInfo Source # | |
Defined in GHC.Iface.Ext.Types Methods fold :: Monoid m => NodeInfo m -> m # foldMap :: Monoid m => (a -> m) -> NodeInfo a -> m # foldMap' :: Monoid m => (a -> m) -> NodeInfo a -> m # foldr :: (a -> b -> b) -> b -> NodeInfo a -> b # foldr' :: (a -> b -> b) -> b -> NodeInfo a -> b # foldl :: (b -> a -> b) -> b -> NodeInfo a -> b # foldl' :: (b -> a -> b) -> b -> NodeInfo a -> b # foldr1 :: (a -> a -> a) -> NodeInfo a -> a # foldl1 :: (a -> a -> a) -> NodeInfo a -> a # elem :: Eq a => a -> NodeInfo a -> Bool # maximum :: Ord a => NodeInfo a -> a # minimum :: Ord a => NodeInfo a -> a # | |
Foldable SourcedNodeInfo Source # | |
Defined in GHC.Iface.Ext.Types Methods fold :: Monoid m => SourcedNodeInfo m -> m # foldMap :: Monoid m => (a -> m) -> SourcedNodeInfo a -> m # foldMap' :: Monoid m => (a -> m) -> SourcedNodeInfo a -> m # foldr :: (a -> b -> b) -> b -> SourcedNodeInfo a -> b # foldr' :: (a -> b -> b) -> b -> SourcedNodeInfo a -> b # foldl :: (b -> a -> b) -> b -> SourcedNodeInfo a -> b # foldl' :: (b -> a -> b) -> b -> SourcedNodeInfo a -> b # foldr1 :: (a -> a -> a) -> SourcedNodeInfo a -> a # foldl1 :: (a -> a -> a) -> SourcedNodeInfo a -> a # toList :: SourcedNodeInfo a -> [a] # null :: SourcedNodeInfo a -> Bool # length :: SourcedNodeInfo a -> Int # elem :: Eq a => a -> SourcedNodeInfo a -> Bool # maximum :: Ord a => SourcedNodeInfo a -> a # minimum :: Ord a => SourcedNodeInfo a -> a # sum :: Num a => SourcedNodeInfo a -> a # product :: Num a => SourcedNodeInfo a -> a # | |
Foldable Messages Source # | |
Defined in GHC.Types.Error Methods fold :: Monoid m => Messages m -> m # foldMap :: Monoid m => (a -> m) -> Messages a -> m # foldMap' :: Monoid m => (a -> m) -> Messages a -> m # foldr :: (a -> b -> b) -> b -> Messages a -> b # foldr' :: (a -> b -> b) -> b -> Messages a -> b # foldl :: (b -> a -> b) -> b -> Messages a -> b # foldl' :: (b -> a -> b) -> b -> Messages a -> b # foldr1 :: (a -> a -> a) -> Messages a -> a # foldl1 :: (a -> a -> a) -> Messages a -> a # elem :: Eq a => a -> Messages a -> Bool # maximum :: Ord a => Messages a -> a # minimum :: Ord a => Messages a -> a # | |
Foldable MsgEnvelope Source # | |
Defined in GHC.Types.Error Methods fold :: Monoid m => MsgEnvelope m -> m # foldMap :: Monoid m => (a -> m) -> MsgEnvelope a -> m # foldMap' :: Monoid m => (a -> m) -> MsgEnvelope a -> m # foldr :: (a -> b -> b) -> b -> MsgEnvelope a -> b # foldr' :: (a -> b -> b) -> b -> MsgEnvelope a -> b # foldl :: (b -> a -> b) -> b -> MsgEnvelope a -> b # foldl' :: (b -> a -> b) -> b -> MsgEnvelope a -> b # foldr1 :: (a -> a -> a) -> MsgEnvelope a -> a # foldl1 :: (a -> a -> a) -> MsgEnvelope a -> a # toList :: MsgEnvelope a -> [a] # null :: MsgEnvelope a -> Bool # length :: MsgEnvelope a -> Int # elem :: Eq a => a -> MsgEnvelope a -> Bool # maximum :: Ord a => MsgEnvelope a -> a # minimum :: Ord a => MsgEnvelope a -> a # sum :: Num a => MsgEnvelope a -> a # product :: Num a => MsgEnvelope a -> a # | |
Foldable UnitEnvGraph Source # | |
Defined in GHC.Unit.Env Methods fold :: Monoid m => UnitEnvGraph m -> m # foldMap :: Monoid m => (a -> m) -> UnitEnvGraph a -> m # foldMap' :: Monoid m => (a -> m) -> UnitEnvGraph a -> m # foldr :: (a -> b -> b) -> b -> UnitEnvGraph a -> b # foldr' :: (a -> b -> b) -> b -> UnitEnvGraph a -> b # foldl :: (b -> a -> b) -> b -> UnitEnvGraph a -> b # foldl' :: (b -> a -> b) -> b -> UnitEnvGraph a -> b # foldr1 :: (a -> a -> a) -> UnitEnvGraph a -> a # foldl1 :: (a -> a -> a) -> UnitEnvGraph a -> a # toList :: UnitEnvGraph a -> [a] # null :: UnitEnvGraph a -> Bool # length :: UnitEnvGraph a -> Int # elem :: Eq a => a -> UnitEnvGraph a -> Bool # maximum :: Ord a => UnitEnvGraph a -> a # minimum :: Ord a => UnitEnvGraph a -> a # sum :: Num a => UnitEnvGraph a -> a # product :: Num a => UnitEnvGraph a -> a # | |
Foldable GenWithIsBoot Source # | |
Defined in GHC.Unit.Types Methods fold :: Monoid m => GenWithIsBoot m -> m # foldMap :: Monoid m => (a -> m) -> GenWithIsBoot a -> m # foldMap' :: Monoid m => (a -> m) -> GenWithIsBoot a -> m # foldr :: (a -> b -> b) -> b -> GenWithIsBoot a -> b # foldr' :: (a -> b -> b) -> b -> GenWithIsBoot a -> b # foldl :: (b -> a -> b) -> b -> GenWithIsBoot a -> b # foldl' :: (b -> a -> b) -> b -> GenWithIsBoot a -> b # foldr1 :: (a -> a -> a) -> GenWithIsBoot a -> a # foldl1 :: (a -> a -> a) -> GenWithIsBoot a -> a # toList :: GenWithIsBoot a -> [a] # null :: GenWithIsBoot a -> Bool # length :: GenWithIsBoot a -> Int # elem :: Eq a => a -> GenWithIsBoot a -> Bool # maximum :: Ord a => GenWithIsBoot a -> a # minimum :: Ord a => GenWithIsBoot a -> a # sum :: Num a => GenWithIsBoot a -> a # product :: Num a => GenWithIsBoot a -> a # | |
Foldable DataDefnCons Source # | |
Defined in Language.Haskell.Syntax.Decls Methods fold :: Monoid m => DataDefnCons m -> m # foldMap :: Monoid m => (a -> m) -> DataDefnCons a -> m # foldMap' :: Monoid m => (a -> m) -> DataDefnCons a -> m # foldr :: (a -> b -> b) -> b -> DataDefnCons a -> b # foldr' :: (a -> b -> b) -> b -> DataDefnCons a -> b # foldl :: (b -> a -> b) -> b -> DataDefnCons a -> b # foldl' :: (b -> a -> b) -> b -> DataDefnCons a -> b # foldr1 :: (a -> a -> a) -> DataDefnCons a -> a # foldl1 :: (a -> a -> a) -> DataDefnCons a -> a # toList :: DataDefnCons a -> [a] # null :: DataDefnCons a -> Bool # length :: DataDefnCons a -> Int # elem :: Eq a => a -> DataDefnCons a -> Bool # maximum :: Ord a => DataDefnCons a -> a # minimum :: Ord a => DataDefnCons a -> a # sum :: Num a => DataDefnCons a -> a # product :: Num a => DataDefnCons a -> a # | |
Foldable SizedSeq | |
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 # elem :: Eq a => a -> SizedSeq a -> Bool # maximum :: Ord a => SizedSeq a -> a # minimum :: Ord a => SizedSeq a -> a # | |
Foldable GenClosure | |
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 GenStackField | |
Defined in GHC.Exts.Heap.Closures Methods fold :: Monoid m => GenStackField m -> m # foldMap :: Monoid m => (a -> m) -> GenStackField a -> m # foldMap' :: Monoid m => (a -> m) -> GenStackField a -> m # foldr :: (a -> b -> b) -> b -> GenStackField a -> b # foldr' :: (a -> b -> b) -> b -> GenStackField a -> b # foldl :: (b -> a -> b) -> b -> GenStackField a -> b # foldl' :: (b -> a -> b) -> b -> GenStackField a -> b # foldr1 :: (a -> a -> a) -> GenStackField a -> a # foldl1 :: (a -> a -> a) -> GenStackField a -> a # toList :: GenStackField a -> [a] # null :: GenStackField a -> Bool # length :: GenStackField a -> Int # elem :: Eq a => a -> GenStackField a -> Bool # maximum :: Ord a => GenStackField a -> a # minimum :: Ord a => GenStackField a -> a # sum :: Num a => GenStackField a -> a # product :: Num a => GenStackField a -> a # | |
Foldable GenStackFrame | |
Defined in GHC.Exts.Heap.Closures Methods fold :: Monoid m => GenStackFrame m -> m # foldMap :: Monoid m => (a -> m) -> GenStackFrame a -> m # foldMap' :: Monoid m => (a -> m) -> GenStackFrame a -> m # foldr :: (a -> b -> b) -> b -> GenStackFrame a -> b # foldr' :: (a -> b -> b) -> b -> GenStackFrame a -> b # foldl :: (b -> a -> b) -> b -> GenStackFrame a -> b # foldl' :: (b -> a -> b) -> b -> GenStackFrame a -> b # foldr1 :: (a -> a -> a) -> GenStackFrame a -> a # foldl1 :: (a -> a -> a) -> GenStackFrame a -> a # toList :: GenStackFrame a -> [a] # null :: GenStackFrame a -> Bool # length :: GenStackFrame a -> Int # elem :: Eq a => a -> GenStackFrame a -> Bool # maximum :: Ord a => GenStackFrame a -> a # minimum :: Ord a => GenStackFrame a -> a # sum :: Num a => GenStackFrame a -> a # product :: Num a => GenStackFrame a -> a # | |
Foldable GenStgStackClosure | |
Defined in GHC.Exts.Heap.Closures Methods fold :: Monoid m => GenStgStackClosure m -> m # foldMap :: Monoid m => (a -> m) -> GenStgStackClosure a -> m # foldMap' :: Monoid m => (a -> m) -> GenStgStackClosure a -> m # foldr :: (a -> b -> b) -> b -> GenStgStackClosure a -> b # foldr' :: (a -> b -> b) -> b -> GenStgStackClosure a -> b # foldl :: (b -> a -> b) -> b -> GenStgStackClosure a -> b # foldl' :: (b -> a -> b) -> b -> GenStgStackClosure a -> b # foldr1 :: (a -> a -> a) -> GenStgStackClosure a -> a # foldl1 :: (a -> a -> a) -> GenStgStackClosure a -> a # toList :: GenStgStackClosure a -> [a] # null :: GenStgStackClosure a -> Bool # length :: GenStgStackClosure a -> Int # elem :: Eq a => a -> GenStgStackClosure a -> Bool # maximum :: Ord a => GenStgStackClosure a -> a # minimum :: Ord a => GenStgStackClosure a -> a # sum :: Num a => GenStgStackClosure a -> a # product :: Num a => GenStgStackClosure a -> a # | |
Foldable NonEmpty | |
Defined in GHC.Internal.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 # elem :: Eq a => a -> NonEmpty a -> Bool # maximum :: Ord a => NonEmpty a -> a # minimum :: Ord a => NonEmpty a -> a # | |
Foldable Identity | |
Defined in GHC.Internal.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 # elem :: Eq a => a -> Identity a -> Bool # maximum :: Ord a => Identity a -> a # minimum :: Ord a => Identity a -> a # | |
Foldable First | |
Defined in GHC.Internal.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 # elem :: Eq a => a -> First a -> Bool # maximum :: Ord a => First a -> a # minimum :: Ord a => First a -> a # | |
Foldable Last | |
Defined in GHC.Internal.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 # elem :: Eq a => a -> Last a -> Bool # maximum :: Ord a => Last a -> a # | |
Foldable Down | |
Defined in GHC.Internal.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 # elem :: Eq a => a -> Down a -> Bool # maximum :: Ord a => Down a -> a # | |
Foldable Dual | |
Defined in GHC.Internal.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 # elem :: Eq a => a -> Dual a -> Bool # maximum :: Ord a => Dual a -> a # | |
Foldable Product | |
Defined in GHC.Internal.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 # elem :: Eq a => a -> Product a -> Bool # maximum :: Ord a => Product a -> a # minimum :: Ord a => Product a -> a # | |
Foldable Sum | |
Defined in GHC.Internal.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 # elem :: Eq a => a -> Sum a -> Bool # maximum :: Ord a => Sum a -> a # | |
Foldable ZipList | |
Defined in GHC.Internal.Functor.ZipList Methods fold :: Monoid m => ZipList m -> m # foldMap :: Monoid m => (a -> m) -> ZipList a -> m # foldMap' :: Monoid m => (a -> m) -> ZipList a -> m # foldr :: (a -> b -> b) -> b -> ZipList a -> b # foldr' :: (a -> b -> b) -> b -> ZipList a -> b # foldl :: (b -> a -> b) -> b -> ZipList a -> b # foldl' :: (b -> a -> b) -> b -> ZipList a -> b # foldr1 :: (a -> a -> a) -> ZipList a -> a # foldl1 :: (a -> a -> a) -> ZipList a -> a # elem :: Eq a => a -> ZipList a -> Bool # maximum :: Ord a => ZipList a -> a # minimum :: Ord a => ZipList a -> a # | |
Foldable Par1 | |
Defined in GHC.Internal.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 # elem :: Eq a => a -> Par1 a -> Bool # maximum :: Ord a => Par1 a -> a # | |
Foldable TyVarBndr | |
Defined in Language.Haskell.TH.Syntax Methods fold :: Monoid m => TyVarBndr m -> m # foldMap :: Monoid m => (a -> m) -> TyVarBndr a -> m # foldMap' :: Monoid m => (a -> m) -> TyVarBndr a -> m # foldr :: (a -> b -> b) -> b -> TyVarBndr a -> b # foldr' :: (a -> b -> b) -> b -> TyVarBndr a -> b # foldl :: (b -> a -> b) -> b -> TyVarBndr a -> b # foldl' :: (b -> a -> b) -> b -> TyVarBndr a -> b # foldr1 :: (a -> a -> a) -> TyVarBndr a -> a # foldl1 :: (a -> a -> a) -> TyVarBndr a -> a # toList :: TyVarBndr a -> [a] # length :: TyVarBndr a -> Int # elem :: Eq a => a -> TyVarBndr a -> Bool # maximum :: Ord a => TyVarBndr a -> a # minimum :: Ord a => TyVarBndr a -> a # | |
Foldable Maybe | |
Defined in GHC.Internal.Data.Foldable Methods fold :: Monoid m => Maybe m -> m # foldMap :: Monoid m => (a -> m) -> Maybe a -> m # foldMap' :: Monoid m => (a -> m) -> Maybe a -> m # foldr :: (a -> b -> b) -> b -> Maybe a -> b # foldr' :: (a -> b -> b) -> b -> Maybe a -> b # foldl :: (b -> a -> b) -> b -> Maybe a -> b # foldl' :: (b -> a -> b) -> b -> Maybe a -> b # foldr1 :: (a -> a -> a) -> Maybe a -> a # foldl1 :: (a -> a -> a) -> Maybe a -> a # elem :: Eq a => a -> Maybe a -> Bool # maximum :: Ord a => Maybe a -> a # minimum :: Ord a => Maybe a -> a # | |
Foldable Solo | |
Defined in GHC.Internal.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 # elem :: Eq a => a -> Solo a -> Bool # maximum :: Ord a => Solo a -> a # | |
Foldable [] | |
Defined in GHC.Internal.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 # elem :: Eq a => a -> [a] -> Bool # maximum :: Ord a => [a] -> a # | |
Foldable (Arg a) | Since: base-4.9.0.0 |
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 # elem :: Eq a0 => a0 -> Arg a a0 -> Bool # maximum :: Ord a0 => Arg a a0 -> a0 # minimum :: Ord a0 => Arg a a0 -> a0 # | |
Foldable (Map k) | Folds in order of increasing key. |
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 # elem :: Eq a => a -> Map k a -> Bool # maximum :: Ord a => Map k a -> a # minimum :: Ord a => Map k a -> a # | |
Foldable m => Foldable (CatchT m) | |
Defined in Control.Monad.Catch.Pure Methods fold :: Monoid m0 => CatchT m m0 -> m0 # foldMap :: Monoid m0 => (a -> m0) -> CatchT m a -> m0 # foldMap' :: Monoid m0 => (a -> m0) -> CatchT m a -> m0 # foldr :: (a -> b -> b) -> b -> CatchT m a -> b # foldr' :: (a -> b -> b) -> b -> CatchT m a -> b # foldl :: (b -> a -> b) -> b -> CatchT m a -> b # foldl' :: (b -> a -> b) -> b -> CatchT m a -> b # foldr1 :: (a -> a -> a) -> CatchT m a -> a # foldl1 :: (a -> a -> a) -> CatchT m a -> a # elem :: Eq a => a -> CatchT m a -> Bool # maximum :: Ord a => CatchT m a -> a # minimum :: Ord a => CatchT m a -> a # | |
Foldable (Pair a) Source # | |
Defined in GHC.Data.Strict Methods fold :: Monoid m => Pair a m -> m # foldMap :: Monoid m => (a0 -> m) -> Pair a a0 -> m # foldMap' :: Monoid m => (a0 -> m) -> Pair a a0 -> m # foldr :: (a0 -> b -> b) -> b -> Pair a a0 -> b # foldr' :: (a0 -> b -> b) -> b -> Pair a a0 -> b # foldl :: (b -> a0 -> b) -> b -> Pair a a0 -> b # foldl' :: (b -> a0 -> b) -> b -> Pair a a0 -> b # foldr1 :: (a0 -> a0 -> a0) -> Pair a a0 -> a0 # foldl1 :: (a0 -> a0 -> a0) -> Pair a a0 -> a0 # elem :: Eq a0 => a0 -> Pair a a0 -> Bool # maximum :: Ord a0 => Pair a a0 -> a0 # minimum :: Ord a0 => Pair a a0 -> a0 # | |
(Eq (Key m), TrieMap m) => Foldable (GenMap m) Source # | |
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 # elem :: Eq a => a -> GenMap m a -> Bool # maximum :: Ord a => GenMap m a -> a # minimum :: Ord a => GenMap m a -> a # | |
TrieMap m => Foldable (ListMap m) Source # | |
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] # 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 # | |
TrieMap m => Foldable (MaybeMap m) Source # | |
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 # | |
Foldable (IfaceBindingX r) Source # | |
Defined in GHC.Iface.Syntax Methods fold :: Monoid m => IfaceBindingX r m -> m # foldMap :: Monoid m => (a -> m) -> IfaceBindingX r a -> m # foldMap' :: Monoid m => (a -> m) -> IfaceBindingX r a -> m # foldr :: (a -> b -> b) -> b -> IfaceBindingX r a -> b # foldr' :: (a -> b -> b) -> b -> IfaceBindingX r a -> b # foldl :: (b -> a -> b) -> b -> IfaceBindingX r a -> b # foldl' :: (b -> a -> b) -> b -> IfaceBindingX r a -> b # foldr1 :: (a -> a -> a) -> IfaceBindingX r a -> a # foldl1 :: (a -> a -> a) -> IfaceBindingX r a -> a # toList :: IfaceBindingX r a -> [a] # null :: IfaceBindingX r a -> Bool # length :: IfaceBindingX r a -> Int # elem :: Eq a => a -> IfaceBindingX r a -> Bool # maximum :: Ord a => IfaceBindingX r a -> a # minimum :: Ord a => IfaceBindingX r a -> a # sum :: Num a => IfaceBindingX r a -> a # product :: Num a => IfaceBindingX r a -> a # | |
Foldable (GenLocated l) Source # | |
Defined in GHC.Types.SrcLoc Methods fold :: Monoid m => GenLocated l m -> m # foldMap :: Monoid m => (a -> m) -> GenLocated l a -> m # foldMap' :: Monoid m => (a -> m) -> GenLocated l a -> m # foldr :: (a -> b -> b) -> b -> GenLocated l a -> b # foldr' :: (a -> b -> b) -> b -> GenLocated l a -> b # foldl :: (b -> a -> b) -> b -> GenLocated l a -> b # foldl' :: (b -> a -> b) -> b -> GenLocated l a -> b # foldr1 :: (a -> a -> a) -> GenLocated l a -> a # foldl1 :: (a -> a -> a) -> GenLocated l a -> a # toList :: GenLocated l a -> [a] # null :: GenLocated l a -> Bool # length :: GenLocated l a -> Int # elem :: Eq a => a -> GenLocated l a -> Bool # maximum :: Ord a => GenLocated l a -> a # minimum :: Ord a => GenLocated l a -> a # sum :: Num a => GenLocated l a -> a # product :: Num a => GenLocated l a -> a # | |
Foldable (HsFieldBind lhs) Source # | |
Defined in Language.Haskell.Syntax.Pat Methods fold :: Monoid m => HsFieldBind lhs m -> m # foldMap :: Monoid m => (a -> m) -> HsFieldBind lhs a -> m # foldMap' :: Monoid m => (a -> m) -> HsFieldBind lhs a -> m # foldr :: (a -> b -> b) -> b -> HsFieldBind lhs a -> b # foldr' :: (a -> b -> b) -> b -> HsFieldBind lhs a -> b # foldl :: (b -> a -> b) -> b -> HsFieldBind lhs a -> b # foldl' :: (b -> a -> b) -> b -> HsFieldBind lhs a -> b # foldr1 :: (a -> a -> a) -> HsFieldBind lhs a -> a # foldl1 :: (a -> a -> a) -> HsFieldBind lhs a -> a # toList :: HsFieldBind lhs a -> [a] # null :: HsFieldBind lhs a -> Bool # length :: HsFieldBind lhs a -> Int # elem :: Eq a => a -> HsFieldBind lhs a -> Bool # maximum :: Ord a => HsFieldBind lhs a -> a # minimum :: Ord a => HsFieldBind lhs a -> a # sum :: Num a => HsFieldBind lhs a -> a # product :: Num a => HsFieldBind lhs a -> a # | |
Foldable (DbOpenMode mode) | |
Defined in GHC.Unit.Database Methods fold :: Monoid m => DbOpenMode mode m -> m # foldMap :: Monoid m => (a -> m) -> DbOpenMode mode a -> m # foldMap' :: Monoid m => (a -> m) -> DbOpenMode mode a -> m # foldr :: (a -> b -> b) -> b -> DbOpenMode mode a -> b # foldr' :: (a -> b -> b) -> b -> DbOpenMode mode a -> b # foldl :: (b -> a -> b) -> b -> DbOpenMode mode a -> b # foldl' :: (b -> a -> b) -> b -> DbOpenMode mode a -> b # foldr1 :: (a -> a -> a) -> DbOpenMode mode a -> a # foldl1 :: (a -> a -> a) -> DbOpenMode mode a -> a # toList :: DbOpenMode mode a -> [a] # null :: DbOpenMode mode a -> Bool # length :: DbOpenMode mode a -> Int # elem :: Eq a => a -> DbOpenMode mode a -> Bool # maximum :: Ord a => DbOpenMode mode a -> a # minimum :: Ord a => DbOpenMode mode a -> a # sum :: Num a => DbOpenMode mode a -> a # product :: Num a => DbOpenMode mode a -> a # | |
Foldable (Array i) | |
Defined in GHC.Internal.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 # elem :: Eq a => a -> Array i a -> Bool # maximum :: Ord a => Array i a -> a # minimum :: Ord a => Array i a -> a # | |
Foldable (Either a) | |
Defined in GHC.Internal.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] # 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 # | |
Foldable (Proxy :: Type -> Type) | |
Defined in GHC.Internal.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 # elem :: Eq a => a -> Proxy a -> Bool # maximum :: Ord a => Proxy a -> a # minimum :: Ord a => Proxy a -> a # | |
Foldable (U1 :: Type -> Type) | |
Defined in GHC.Internal.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 # elem :: Eq a => a -> U1 a -> Bool # maximum :: Ord a => U1 a -> a # | |
Foldable (UAddr :: Type -> Type) | |
Defined in GHC.Internal.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 # elem :: Eq a => a -> UAddr a -> Bool # maximum :: Ord a => UAddr a -> a # minimum :: Ord a => UAddr a -> a # | |
Foldable (UChar :: Type -> Type) | |
Defined in GHC.Internal.Data.Foldable Methods fold :: Monoid m => UChar m -> m # foldMap :: Monoid m => (a -> m) -> UChar a -> m # foldMap' :: Monoid m => (a -> m) -> UChar a -> m # foldr :: (a -> b -> b) -> b -> UChar a -> b # foldr' :: (a -> b -> b) -> b -> UChar a -> b # foldl :: (b -> a -> b) -> b -> UChar a -> b # foldl' :: (b -> a -> b) -> b -> UChar a -> b # foldr1 :: (a -> a -> a) -> UChar a -> a # foldl1 :: (a -> a -> a) -> UChar a -> a # elem :: Eq a => a -> UChar a -> Bool # maximum :: Ord a => UChar a -> a # minimum :: Ord a => UChar a -> a # | |
Foldable (UDouble :: Type -> Type) | |
Defined in GHC.Internal.Data.Foldable Methods fold :: Monoid m => UDouble m -> m # foldMap :: Monoid m => (a -> m) -> UDouble a -> m # foldMap' :: Monoid m => (a -> m) -> UDouble a -> m # foldr :: (a -> b -> b) -> b -> UDouble a -> b # foldr' :: (a -> b -> b) -> b -> UDouble a -> b # foldl :: (b -> a -> b) -> b -> UDouble a -> b # foldl' :: (b -> a -> b) -> b -> UDouble a -> b # foldr1 :: (a -> a -> a) -> UDouble a -> a # foldl1 :: (a -> a -> a) -> UDouble a -> a # elem :: Eq a => a -> UDouble a -> Bool # maximum :: Ord a => UDouble a -> a # minimum :: Ord a => UDouble a -> a # | |
Foldable (UFloat :: Type -> Type) | |
Defined in GHC.Internal.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 # elem :: Eq a => a -> UFloat a -> Bool # maximum :: Ord a => UFloat a -> a # minimum :: Ord a => UFloat a -> a # | |
Foldable (UInt :: Type -> Type) | |
Defined in GHC.Internal.Data.Foldable Methods fold :: Monoid m => UInt m -> m # foldMap :: Monoid m => (a -> m) -> UInt a -> m # foldMap' :: Monoid m => (a -> m) -> UInt a -> m # foldr :: (a -> b -> b) -> b -> UInt a -> b # foldr' :: (a -> b -> b) -> b -> UInt a -> b # foldl :: (b -> a -> b) -> b -> UInt a -> b # foldl' :: (b -> a -> b) -> b -> UInt a -> b # foldr1 :: (a -> a -> a) -> UInt a -> a # foldl1 :: (a -> a -> a) -> UInt a -> a # elem :: Eq a => a -> UInt a -> Bool # maximum :: Ord a => UInt a -> a # | |
Foldable (UWord :: Type -> Type) | |
Defined in GHC.Internal.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 # elem :: Eq a => a -> UWord a -> Bool # maximum :: Ord a => UWord a -> a # minimum :: Ord a => UWord a -> a # | |
Foldable (V1 :: Type -> Type) | |
Defined in GHC.Internal.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 # elem :: Eq a => a -> V1 a -> Bool # maximum :: Ord a => V1 a -> a # | |
Foldable f => Foldable (Lift f) | |
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 # elem :: Eq a => a -> Lift f a -> Bool # maximum :: Ord a => Lift f a -> a # minimum :: Ord a => Lift f a -> a # | |
Foldable f => Foldable (MaybeT f) | |
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 # elem :: Eq a => a -> MaybeT f a -> Bool # maximum :: Ord a => MaybeT f a -> a # minimum :: Ord a => MaybeT f a -> a # | |
Foldable ((,) a) | |
Defined in GHC.Internal.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 # elem :: Eq a0 => a0 -> (a, a0) -> Bool # maximum :: Ord a0 => (a, a0) -> a0 # minimum :: Ord a0 => (a, a0) -> a0 # | |
Foldable (UniqDFM key) Source # | Deterministic, in O(n log n). |
Defined in GHC.Types.Unique.DFM Methods fold :: Monoid m => UniqDFM key m -> m # foldMap :: Monoid m => (a -> m) -> UniqDFM key a -> m # foldMap' :: Monoid m => (a -> m) -> UniqDFM key a -> m # foldr :: (a -> b -> b) -> b -> UniqDFM key a -> b # foldr' :: (a -> b -> b) -> b -> UniqDFM key a -> b # foldl :: (b -> a -> b) -> b -> UniqDFM key a -> b # foldl' :: (b -> a -> b) -> b -> UniqDFM key a -> b # foldr1 :: (a -> a -> a) -> UniqDFM key a -> a # foldl1 :: (a -> a -> a) -> UniqDFM key a -> a # toList :: UniqDFM key a -> [a] # null :: UniqDFM key a -> Bool # length :: UniqDFM key a -> Int # elem :: Eq a => a -> UniqDFM key a -> Bool # maximum :: Ord a => UniqDFM key a -> a # minimum :: Ord a => UniqDFM key a -> a # | |
Foldable (NonDetUniqFM key) Source # | Inherently nondeterministic. If you use this please provide a justification why it doesn't introduce nondeterminism. See Note [Deterministic UniqFM] in GHC.Types.Unique.DFM to learn about determinism. |
Defined in GHC.Types.Unique.FM Methods fold :: Monoid m => NonDetUniqFM key m -> m # foldMap :: Monoid m => (a -> m) -> NonDetUniqFM key a -> m # foldMap' :: Monoid m => (a -> m) -> NonDetUniqFM key a -> m # foldr :: (a -> b -> b) -> b -> NonDetUniqFM key a -> b # foldr' :: (a -> b -> b) -> b -> NonDetUniqFM key a -> b # foldl :: (b -> a -> b) -> b -> NonDetUniqFM key a -> b # foldl' :: (b -> a -> b) -> b -> NonDetUniqFM key a -> b # foldr1 :: (a -> a -> a) -> NonDetUniqFM key a -> a # foldl1 :: (a -> a -> a) -> NonDetUniqFM key a -> a # toList :: NonDetUniqFM key a -> [a] # null :: NonDetUniqFM key a -> Bool # length :: NonDetUniqFM key a -> Int # elem :: Eq a => a -> NonDetUniqFM key a -> Bool # maximum :: Ord a => NonDetUniqFM key a -> a # minimum :: Ord a => NonDetUniqFM key a -> a # sum :: Num a => NonDetUniqFM key a -> a # product :: Num a => NonDetUniqFM key a -> a # | |
Foldable (Const m :: Type -> Type) | |
Defined in GHC.Internal.Data.Functor.Const Methods fold :: Monoid m0 => Const m m0 -> m0 # foldMap :: Monoid m0 => (a -> m0) -> Const m a -> m0 # foldMap' :: Monoid m0 => (a -> m0) -> Const m a -> m0 # foldr :: (a -> b -> b) -> b -> Const m a -> b # foldr' :: (a -> b -> b) -> b -> Const m a -> b # foldl :: (b -> a -> b) -> b -> Const m a -> b # foldl' :: (b -> a -> b) -> b -> Const m a -> b # foldr1 :: (a -> a -> a) -> Const m a -> a # foldl1 :: (a -> a -> a) -> Const m a -> a # elem :: Eq a => a -> Const m a -> Bool # maximum :: Ord a => Const m a -> a # minimum :: Ord a => Const m a -> a # | |
Foldable f => Foldable (Ap f) | |
Defined in GHC.Internal.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 # elem :: Eq a => a -> Ap f a -> Bool # maximum :: Ord a => Ap f a -> a # | |
Foldable f => Foldable (Alt f) | |
Defined in GHC.Internal.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 # elem :: Eq a => a -> Alt f a -> Bool # maximum :: Ord a => Alt f a -> a # minimum :: Ord a => Alt f a -> a # | |
Foldable f => Foldable (Rec1 f) | |
Defined in GHC.Internal.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 # elem :: Eq a => a -> Rec1 f a -> Bool # maximum :: Ord a => Rec1 f a -> a # minimum :: Ord a => Rec1 f a -> a # | |
Foldable f => Foldable (Backwards f) | Derived instance. |
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 # | |
Foldable f => Foldable (ExceptT e f) | |
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 # | |
Foldable f => Foldable (IdentityT f) | |
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 # | |
Foldable f => Foldable (WriterT w f) | |
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 # | |
Foldable f => Foldable (WriterT w f) | |
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 # | |
Foldable (Constant a :: Type -> Type) | |
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 # | |
Foldable f => Foldable (Reverse f) | Fold from right to left. |
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] # 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 # | |
(Foldable f, Foldable g) => Foldable (Product f g) | Since: base-4.9.0.0 |
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 # | |
(Foldable f, Foldable g) => Foldable (Sum f g) | Since: base-4.9.0.0 |
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 # 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 # | |
(Foldable f, Foldable g) => Foldable (f :*: g) | |
Defined in GHC.Internal.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] # 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 # | |
(Foldable f, Foldable g) => Foldable (f :+: g) | |
Defined in GHC.Internal.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] # 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 # | |
Foldable (K1 i c :: Type -> Type) | |
Defined in GHC.Internal.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 # 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 # | |
(Foldable f, Foldable g) => Foldable (Compose f g) | Since: base-4.9.0.0 |
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 # | |
(Foldable f, Foldable g) => Foldable (f :.: g) | |
Defined in GHC.Internal.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] # 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 # | |
Foldable f => Foldable (M1 i c f) | |
Defined in GHC.Internal.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 # 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 # |
Methods
fromInteger :: Integer -> a #
Instances
Num ByteOff Source # | |
Num HalfWord Source # | |
Num RegBitmap Source # | |
Defined in GHC.ByteCode.Types | |
Num WordOff Source # | |
Num EdgeWeight Source # | |
Defined in GHC.CmmToAsm.CFG Methods (+) :: EdgeWeight -> EdgeWeight -> EdgeWeight # (-) :: EdgeWeight -> EdgeWeight -> EdgeWeight # (*) :: EdgeWeight -> EdgeWeight -> EdgeWeight # negate :: EdgeWeight -> EdgeWeight # abs :: EdgeWeight -> EdgeWeight # signum :: EdgeWeight -> EdgeWeight # fromInteger :: Integer -> EdgeWeight # | |
Num JStgExpr Source # | |
Num IntWithInf Source # | |
Defined in GHC.Types.Basic Methods (+) :: IntWithInf -> IntWithInf -> IntWithInf # (-) :: IntWithInf -> IntWithInf -> IntWithInf # (*) :: IntWithInf -> IntWithInf -> IntWithInf # negate :: IntWithInf -> IntWithInf # abs :: IntWithInf -> IntWithInf # signum :: IntWithInf -> IntWithInf # fromInteger :: Integer -> IntWithInf # | |
Num SaneDouble Source # | |
Defined in GHC.Types.SaneDouble Methods (+) :: SaneDouble -> SaneDouble -> SaneDouble # (-) :: SaneDouble -> SaneDouble -> SaneDouble # (*) :: SaneDouble -> SaneDouble -> SaneDouble # negate :: SaneDouble -> SaneDouble # abs :: SaneDouble -> SaneDouble # signum :: SaneDouble -> SaneDouble # fromInteger :: Integer -> SaneDouble # | |
Num ByteOffset | |
Defined in GHC.Exts.Stack.Constants Methods (+) :: ByteOffset -> ByteOffset -> ByteOffset # (-) :: ByteOffset -> ByteOffset -> ByteOffset # (*) :: ByteOffset -> ByteOffset -> ByteOffset # negate :: ByteOffset -> ByteOffset # abs :: ByteOffset -> ByteOffset # signum :: ByteOffset -> ByteOffset # fromInteger :: Integer -> ByteOffset # | |
Num WordOffset | |
Defined in GHC.Exts.Stack.Constants Methods (+) :: WordOffset -> WordOffset -> WordOffset # (-) :: WordOffset -> WordOffset -> WordOffset # (*) :: WordOffset -> WordOffset -> WordOffset # negate :: WordOffset -> WordOffset # abs :: WordOffset -> WordOffset # signum :: WordOffset -> WordOffset # fromInteger :: Integer -> WordOffset # | |
Num CBool | |
Num CChar | |
Num CClock | |
Num CDouble | |
Num CFloat | |
Num CInt | |
Num CIntMax | |
Num CIntPtr | |
Num CLLong | |
Num CLong | |
Num CPtrdiff | |
Num CSChar | |
Num CSUSeconds | |
Defined in GHC.Internal.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 | |
Num CSigAtomic | |
Defined in GHC.Internal.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 | |
Num CTime | |
Num CUChar | |
Num CUInt | |
Num CUIntMax | |
Num CUIntPtr | |
Num CULLong | |
Num CULong | |
Num CUSeconds | |
Defined in GHC.Internal.Foreign.C.Types | |
Num CUShort | |
Num CWchar | |
Num Int16 | |
Num Int32 | |
Num Int64 | |
Num Int8 | |
Num CBlkCnt | |
Num CBlkSize | |
Defined in GHC.Internal.System.Posix.Types | |
Num CCc | |
Num CClockId | |
Defined in GHC.Internal.System.Posix.Types | |
Num CDev | |
Num CFsBlkCnt | |
Defined in GHC.Internal.System.Posix.Types | |
Num CFsFilCnt | |
Defined in GHC.Internal.System.Posix.Types | |
Num CGid | |
Num CId | |
Num CIno | |
Num CKey | |
Num CMode | |
Num CNfds | |
Num CNlink | |
Num COff | |
Num CPid | |
Num CRLim | |
Num CSocklen | |
Defined in GHC.Internal.System.Posix.Types | |
Num CSpeed | |
Num CSsize | |
Num CTcflag | |
Num CUid | |
Num Fd | |
Num Word16 | |
Num Word32 | |
Num Word64 | |
Num Word8 | |
Num Hash | |
Num DiffTime | |
Defined in Data.Time.Clock.Internal.DiffTime | |
Num CAttributes | |
Defined in System.Posix.Files.Common Methods (+) :: CAttributes -> CAttributes -> CAttributes # (-) :: CAttributes -> CAttributes -> CAttributes # (*) :: CAttributes -> CAttributes -> CAttributes # negate :: CAttributes -> CAttributes # abs :: CAttributes -> CAttributes # signum :: CAttributes -> CAttributes # fromInteger :: Integer -> CAttributes # | |
Num StatxFlags | |
Defined in System.Posix.Files.Common Methods (+) :: StatxFlags -> StatxFlags -> StatxFlags # (-) :: StatxFlags -> StatxFlags -> StatxFlags # (*) :: StatxFlags -> StatxFlags -> StatxFlags # negate :: StatxFlags -> StatxFlags # abs :: StatxFlags -> StatxFlags # signum :: StatxFlags -> StatxFlags # fromInteger :: Integer -> StatxFlags # | |
Num StatxMask | |
Defined in System.Posix.Files.Common | |
Num Integer | |
Num Natural | |
Num Int | |
Num Word | |
RealFloat a => Num (Complex a) | Since: base-2.1 |
Num a => Num (Max a) | Since: base-4.9.0.0 |
Num a => Num (Min a) | Since: base-4.9.0.0 |
Num a => Num (Identity a) | |
Defined in GHC.Internal.Data.Functor.Identity | |
Num a => Num (Down a) | |
Num a => Num (Product a) | |
Defined in GHC.Internal.Data.Semigroup.Internal | |
Num a => Num (Sum a) | |
Integral a => Num (Ratio a) | |
HasResolution a => Num (Fixed a) | Multiplication is not associative or distributive:
Since: base-2.1 |
Num a => Num (Op a b) | |
Num a => Num (Const a b) | |
Defined in GHC.Internal.Data.Functor.Const | |
(Applicative f, Num a) => Num (Ap f a) | |
Num (f a) => Num (Alt f a) | |
Num (f (g a)) => Num (Compose f g a) | Since: base-4.19.0.0 |
Defined in Data.Functor.Compose Methods (+) :: Compose f g a -> Compose f g a -> Compose f g a # (-) :: Compose f g a -> Compose f g a -> Compose f g a # (*) :: Compose f g a -> Compose f g a -> Compose f g a # negate :: Compose f g a -> Compose f g a # abs :: Compose f g a -> Compose f g a # signum :: Compose f g a -> Compose f g a # fromInteger :: Integer -> Compose f g a # |
class Num a => Fractional a where #
Minimal complete definition
fromRational, (recip | (/))
Instances
Fractional EdgeWeight Source # | |
Defined in GHC.CmmToAsm.CFG Methods (/) :: EdgeWeight -> EdgeWeight -> EdgeWeight # recip :: EdgeWeight -> EdgeWeight # fromRational :: Rational -> EdgeWeight # | |
Fractional JStgExpr Source # | |
Fractional SaneDouble Source # | |
Defined in GHC.Types.SaneDouble Methods (/) :: SaneDouble -> SaneDouble -> SaneDouble # recip :: SaneDouble -> SaneDouble # fromRational :: Rational -> SaneDouble # | |
Fractional CDouble | |
Fractional CFloat | |
Fractional DiffTime | |
RealFloat a => Fractional (Complex a) | Since: base-2.1 |
Fractional a => Fractional (Identity a) | |
Fractional a => Fractional (Down a) | |
Integral a => Fractional (Ratio a) | |
HasResolution a => Fractional (Fixed a) | Since: base-2.1 |
Fractional a => Fractional (Op a b) | |
Fractional a => Fractional (Const a b) | |
Fractional (f (g a)) => Fractional (Compose f g a) | Since: base-4.20.0.0 |
Methods
enumFromThen :: a -> a -> [a] #
enumFromTo :: a -> a -> [a] #
enumFromThenTo :: a -> a -> a -> [a] #
Instances
Enum FileType | |
Defined in System.Directory.Internal.Common | |
Enum XdgDirectory | |
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 | |
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 ByteOff Source # | |
Enum HalfWord Source # | |
Defined in GHC.ByteCode.Types | |
Enum RegBitmap Source # | |
Defined in GHC.ByteCode.Types Methods succ :: RegBitmap -> RegBitmap # pred :: RegBitmap -> RegBitmap # fromEnum :: RegBitmap -> Int # enumFrom :: RegBitmap -> [RegBitmap] # enumFromThen :: RegBitmap -> RegBitmap -> [RegBitmap] # enumFromTo :: RegBitmap -> RegBitmap -> [RegBitmap] # enumFromThenTo :: RegBitmap -> RegBitmap -> RegBitmap -> [RegBitmap] # | |
Enum WordOff Source # | |
Enum EdgeWeight Source # | |
Defined in GHC.CmmToAsm.CFG Methods succ :: EdgeWeight -> EdgeWeight # pred :: EdgeWeight -> EdgeWeight # toEnum :: Int -> EdgeWeight # fromEnum :: EdgeWeight -> Int # enumFrom :: EdgeWeight -> [EdgeWeight] # enumFromThen :: EdgeWeight -> EdgeWeight -> [EdgeWeight] # enumFromTo :: EdgeWeight -> EdgeWeight -> [EdgeWeight] # enumFromThenTo :: EdgeWeight -> EdgeWeight -> EdgeWeight -> [EdgeWeight] # | |
Enum RegClass Source # | |
Defined in GHC.CmmToAsm.Reg.Graph.Base | |
Enum RegSub Source # | |
Defined in GHC.CmmToAsm.Reg.Graph.Base | |
Enum PrimElemRep Source # | |
Defined in GHC.Core.TyCon Methods succ :: PrimElemRep -> PrimElemRep # pred :: PrimElemRep -> PrimElemRep # toEnum :: Int -> PrimElemRep # fromEnum :: PrimElemRep -> Int # enumFrom :: PrimElemRep -> [PrimElemRep] # enumFromThen :: PrimElemRep -> PrimElemRep -> [PrimElemRep] # enumFromTo :: PrimElemRep -> PrimElemRep -> [PrimElemRep] # enumFromThenTo :: PrimElemRep -> PrimElemRep -> PrimElemRep -> [PrimElemRep] # | |
Enum OverridingBool Source # | Since: ghc-9.4.1 |
Defined in GHC.Data.Bool Methods succ :: OverridingBool -> OverridingBool # pred :: OverridingBool -> OverridingBool # toEnum :: Int -> OverridingBool # fromEnum :: OverridingBool -> Int # enumFrom :: OverridingBool -> [OverridingBool] # enumFromThen :: OverridingBool -> OverridingBool -> [OverridingBool] # enumFromTo :: OverridingBool -> OverridingBool -> [OverridingBool] # enumFromThenTo :: OverridingBool -> OverridingBool -> OverridingBool -> [OverridingBool] # | |
Enum DumpFlag Source # | |
Enum GeneralFlag Source # | |
Defined in GHC.Driver.Flags Methods succ :: GeneralFlag -> GeneralFlag # pred :: GeneralFlag -> GeneralFlag # toEnum :: Int -> GeneralFlag # fromEnum :: GeneralFlag -> Int # enumFrom :: GeneralFlag -> [GeneralFlag] # enumFromThen :: GeneralFlag -> GeneralFlag -> [GeneralFlag] # enumFromTo :: GeneralFlag -> GeneralFlag -> [GeneralFlag] # enumFromThenTo :: GeneralFlag -> GeneralFlag -> GeneralFlag -> [GeneralFlag] # | |
Enum Language Source # | |
Enum WarningFlag Source # | |
Defined in GHC.Driver.Flags Methods succ :: WarningFlag -> WarningFlag # pred :: WarningFlag -> WarningFlag # toEnum :: Int -> WarningFlag # fromEnum :: WarningFlag -> Int # enumFrom :: WarningFlag -> [WarningFlag] # enumFromThen :: WarningFlag -> WarningFlag -> [WarningFlag] # enumFromTo :: WarningFlag -> WarningFlag -> [WarningFlag] # enumFromThenTo :: WarningFlag -> WarningFlag -> WarningFlag -> [WarningFlag] # | |
Enum WarningGroup Source # | |
Defined in GHC.Driver.Flags Methods succ :: WarningGroup -> WarningGroup # pred :: WarningGroup -> WarningGroup # toEnum :: Int -> WarningGroup # fromEnum :: WarningGroup -> Int # enumFrom :: WarningGroup -> [WarningGroup] # enumFromThen :: WarningGroup -> WarningGroup -> [WarningGroup] # enumFromTo :: WarningGroup -> WarningGroup -> [WarningGroup] # enumFromThenTo :: WarningGroup -> WarningGroup -> WarningGroup -> [WarningGroup] # | |
Enum BindType Source # | |
Defined in GHC.Iface.Ext.Types | |
Enum DeclType Source # | |
Defined in GHC.Iface.Ext.Types | |
Enum IEType Source # | |
Defined in GHC.Iface.Ext.Types | |
Enum NodeOrigin Source # | |
Defined in GHC.Iface.Ext.Types Methods succ :: NodeOrigin -> NodeOrigin # pred :: NodeOrigin -> NodeOrigin # toEnum :: Int -> NodeOrigin # fromEnum :: NodeOrigin -> Int # enumFrom :: NodeOrigin -> [NodeOrigin] # enumFromThen :: NodeOrigin -> NodeOrigin -> [NodeOrigin] # enumFromTo :: NodeOrigin -> NodeOrigin -> [NodeOrigin] # enumFromThenTo :: NodeOrigin -> NodeOrigin -> NodeOrigin -> [NodeOrigin] # | |
Enum RecFieldContext Source # | |
Defined in GHC.Iface.Ext.Types Methods succ :: RecFieldContext -> RecFieldContext # pred :: RecFieldContext -> RecFieldContext # toEnum :: Int -> RecFieldContext # fromEnum :: RecFieldContext -> Int # enumFrom :: RecFieldContext -> [RecFieldContext] # enumFromThen :: RecFieldContext -> RecFieldContext -> [RecFieldContext] # enumFromTo :: RecFieldContext -> RecFieldContext -> [RecFieldContext] # enumFromThenTo :: RecFieldContext -> RecFieldContext -> RecFieldContext -> [RecFieldContext] # | |
Enum AOp Source # | |
Enum Op Source # | |
Enum UOp Source # | |
Enum AOp Source # | |
Enum Op Source # | |
Enum UOp Source # | |
Enum MetaId Source # | |
Defined in GHC.Llvm.MetaData | |
Enum ExtBits Source # | |
Enum StgReg Source # | |
Defined in GHC.StgToJS.Regs | |
Enum StgRet Source # | |
Defined in GHC.StgToJS.Regs | |
Enum ClosureType Source # | |
Defined in GHC.StgToJS.Types 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 IdType Source # | |
Defined in GHC.StgToJS.Types | |
Enum JSFFIType Source # | |
Defined in GHC.StgToJS.Types Methods succ :: JSFFIType -> JSFFIType # pred :: JSFFIType -> JSFFIType # fromEnum :: JSFFIType -> Int # enumFrom :: JSFFIType -> [JSFFIType] # enumFromThen :: JSFFIType -> JSFFIType -> [JSFFIType] # enumFromTo :: JSFFIType -> JSFFIType -> [JSFFIType] # enumFromThenTo :: JSFFIType -> JSFFIType -> JSFFIType -> [JSFFIType] # | |
Enum JSRep Source # | |
Defined in GHC.StgToJS.Types | |
Enum ThreadStatus Source # | |
Defined in GHC.StgToJS.Types Methods succ :: ThreadStatus -> ThreadStatus # pred :: ThreadStatus -> ThreadStatus # toEnum :: Int -> ThreadStatus # fromEnum :: ThreadStatus -> Int # enumFrom :: ThreadStatus -> [ThreadStatus] # enumFromThen :: ThreadStatus -> ThreadStatus -> [ThreadStatus] # enumFromTo :: ThreadStatus -> ThreadStatus -> [ThreadStatus] # enumFromThenTo :: ThreadStatus -> ThreadStatus -> ThreadStatus -> [ThreadStatus] # | |
Enum CCallConv Source # | |
Defined in GHC.Types.ForeignCall Methods succ :: CCallConv -> CCallConv # pred :: CCallConv -> CCallConv # fromEnum :: CCallConv -> Int # enumFrom :: CCallConv -> [CCallConv] # enumFromThen :: CCallConv -> CCallConv -> [CCallConv] # enumFromTo :: CCallConv -> CCallConv -> [CCallConv] # enumFromThenTo :: CCallConv -> CCallConv -> CCallConv -> [CCallConv] # | |
Enum Safety Source # | |
Defined in GHC.Types.ForeignCall | |
Enum LitNumType Source # | |
Defined in GHC.Types.Literal Methods succ :: LitNumType -> LitNumType # pred :: LitNumType -> LitNumType # toEnum :: Int -> LitNumType # fromEnum :: LitNumType -> Int # enumFrom :: LitNumType -> [LitNumType] # enumFromThen :: LitNumType -> LitNumType -> [LitNumType] # enumFromTo :: LitNumType -> LitNumType -> [LitNumType] # enumFromThenTo :: LitNumType -> LitNumType -> LitNumType -> [LitNumType] # | |
Enum ProfAuto Source # | |
Defined in GHC.Types.ProfAuto | |
Enum Extension | |
Defined in GHC.LanguageExtensions.Type Methods succ :: Extension -> Extension # pred :: Extension -> Extension # fromEnum :: Extension -> Int # enumFrom :: Extension -> [Extension] # enumFromThen :: Extension -> Extension -> [Extension] # enumFromTo :: Extension -> Extension -> [Extension] # enumFromThenTo :: Extension -> Extension -> Extension -> [Extension] # | |
Enum ByteOffset | |
Defined in GHC.Exts.Stack.Constants Methods succ :: ByteOffset -> ByteOffset # pred :: ByteOffset -> ByteOffset # toEnum :: Int -> ByteOffset # fromEnum :: ByteOffset -> Int # enumFrom :: ByteOffset -> [ByteOffset] # enumFromThen :: ByteOffset -> ByteOffset -> [ByteOffset] # enumFromTo :: ByteOffset -> ByteOffset -> [ByteOffset] # enumFromThenTo :: ByteOffset -> ByteOffset -> ByteOffset -> [ByteOffset] # | |
Enum WordOffset | |
Defined in GHC.Exts.Stack.Constants Methods succ :: WordOffset -> WordOffset # pred :: WordOffset -> WordOffset # toEnum :: Int -> WordOffset # fromEnum :: WordOffset -> Int # enumFrom :: WordOffset -> [WordOffset] # enumFromThen :: WordOffset -> WordOffset -> [WordOffset] # enumFromTo :: WordOffset -> WordOffset -> [WordOffset] # enumFromThenTo :: WordOffset -> WordOffset -> WordOffset -> [WordOffset] # | |
Enum ByteOrder | |
Defined in GHC.Internal.ByteOrder Methods succ :: ByteOrder -> ByteOrder # pred :: ByteOrder -> ByteOrder # fromEnum :: ByteOrder -> Int # enumFrom :: ByteOrder -> [ByteOrder] # enumFromThen :: ByteOrder -> ByteOrder -> [ByteOrder] # enumFromTo :: ByteOrder -> ByteOrder -> [ByteOrder] # enumFromThenTo :: ByteOrder -> ByteOrder -> ByteOrder -> [ByteOrder] # | |
Enum ClosureType | |
Defined in GHC.Internal.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 CBool | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CChar | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CClock | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CDouble | |
Enum CFloat | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CInt | |
Enum CIntMax | |
Enum CIntPtr | |
Enum CLLong | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CLong | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CPtrdiff | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CSChar | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CSUSeconds | |
Defined in GHC.Internal.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 | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CSigAtomic | |
Defined in GHC.Internal.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 | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CTime | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CUChar | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CUInt | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CUIntMax | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CUIntPtr | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CULLong | |
Enum CULong | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CUSeconds | |
Defined in GHC.Internal.Foreign.C.Types Methods succ :: CUSeconds -> CUSeconds # pred :: CUSeconds -> CUSeconds # fromEnum :: CUSeconds -> Int # enumFrom :: CUSeconds -> [CUSeconds] # enumFromThen :: CUSeconds -> CUSeconds -> [CUSeconds] # enumFromTo :: CUSeconds -> CUSeconds -> [CUSeconds] # enumFromThenTo :: CUSeconds -> CUSeconds -> CUSeconds -> [CUSeconds] # | |
Enum CUShort | |
Enum CWchar | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum Associativity | |
Defined in GHC.Internal.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 | |
Defined in GHC.Internal.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 | |
Defined in GHC.Internal.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 | |
Defined in GHC.Internal.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 IOMode | |
Defined in GHC.Internal.IO.IOMode | |
Enum Int16 | |
Defined in GHC.Internal.Int | |
Enum Int32 | |
Defined in GHC.Internal.Int | |
Enum Int64 | |
Defined in GHC.Internal.Int | |
Enum Int8 | |
Enum DoCostCentres | |
Defined in GHC.Internal.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 | |
Defined in GHC.Internal.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 | |
Enum GiveGCStats | |
Defined in GHC.Internal.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 | |
Defined in GHC.Internal.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 CBlkCnt | |
Defined in GHC.Internal.System.Posix.Types Methods enumFrom :: CBlkCnt -> [CBlkCnt] # enumFromThen :: CBlkCnt -> CBlkCnt -> [CBlkCnt] # enumFromTo :: CBlkCnt -> CBlkCnt -> [CBlkCnt] # enumFromThenTo :: CBlkCnt -> CBlkCnt -> CBlkCnt -> [CBlkCnt] # | |
Enum CBlkSize | |
Defined in GHC.Internal.System.Posix.Types Methods succ :: CBlkSize -> CBlkSize # pred :: CBlkSize -> CBlkSize # enumFrom :: CBlkSize -> [CBlkSize] # enumFromThen :: CBlkSize -> CBlkSize -> [CBlkSize] # enumFromTo :: CBlkSize -> CBlkSize -> [CBlkSize] # enumFromThenTo :: CBlkSize -> CBlkSize -> CBlkSize -> [CBlkSize] # | |
Enum CCc | |
Defined in GHC.Internal.System.Posix.Types | |
Enum CClockId | |
Defined in GHC.Internal.System.Posix.Types Methods succ :: CClockId -> CClockId # pred :: CClockId -> CClockId # enumFrom :: CClockId -> [CClockId] # enumFromThen :: CClockId -> CClockId -> [CClockId] # enumFromTo :: CClockId -> CClockId -> [CClockId] # enumFromThenTo :: CClockId -> CClockId -> CClockId -> [CClockId] # | |
Enum CDev | |
Defined in GHC.Internal.System.Posix.Types | |
Enum CFsBlkCnt | |
Defined in GHC.Internal.System.Posix.Types Methods succ :: CFsBlkCnt -> CFsBlkCnt # pred :: CFsBlkCnt -> CFsBlkCnt # fromEnum :: CFsBlkCnt -> Int # enumFrom :: CFsBlkCnt -> [CFsBlkCnt] # enumFromThen :: CFsBlkCnt -> CFsBlkCnt -> [CFsBlkCnt] # enumFromTo :: CFsBlkCnt -> CFsBlkCnt -> [CFsBlkCnt] # enumFromThenTo :: CFsBlkCnt -> CFsBlkCnt -> CFsBlkCnt -> [CFsBlkCnt] # | |
Enum CFsFilCnt | |
Defined in GHC.Internal.System.Posix.Types Methods succ :: CFsFilCnt -> CFsFilCnt # pred :: CFsFilCnt -> CFsFilCnt # fromEnum :: CFsFilCnt -> Int # enumFrom :: CFsFilCnt -> [CFsFilCnt] # enumFromThen :: CFsFilCnt -> CFsFilCnt -> [CFsFilCnt] # enumFromTo :: CFsFilCnt -> CFsFilCnt -> [CFsFilCnt] # enumFromThenTo :: CFsFilCnt -> CFsFilCnt -> CFsFilCnt -> [CFsFilCnt] # | |
Enum CGid | |
Enum CId | |
Defined in GHC.Internal.System.Posix.Types | |
Enum CIno | |
Defined in GHC.Internal.System.Posix.Types | |
Enum CKey | |
Defined in GHC.Internal.System.Posix.Types | |
Enum CMode | |
Defined in GHC.Internal.System.Posix.Types | |
Enum CNfds | |
Defined in GHC.Internal.System.Posix.Types | |
Enum CNlink | |
Defined in GHC.Internal.System.Posix.Types | |
Enum COff | |
Defined in GHC.Internal.System.Posix.Types | |
Enum CPid | |
Defined in GHC.Internal.System.Posix.Types | |
Enum CRLim | |
Defined in GHC.Internal.System.Posix.Types | |
Enum CSocklen | |
Defined in GHC.Internal.System.Posix.Types Methods succ :: CSocklen -> CSocklen # pred :: CSocklen -> CSocklen # enumFrom :: CSocklen -> [CSocklen] # enumFromThen :: CSocklen -> CSocklen -> [CSocklen] # enumFromTo :: CSocklen -> CSocklen -> [CSocklen] # enumFromThenTo :: CSocklen -> CSocklen -> CSocklen -> [CSocklen] # | |
Enum CSpeed | |
Defined in GHC.Internal.System.Posix.Types | |
Enum CSsize | |
Defined in GHC.Internal.System.Posix.Types | |
Enum CTcflag | |
Defined in GHC.Internal.System.Posix.Types Methods enumFrom :: CTcflag -> [CTcflag] # enumFromThen :: CTcflag -> CTcflag -> [CTcflag] # enumFromTo :: CTcflag -> CTcflag -> [CTcflag] # enumFromThenTo :: CTcflag -> CTcflag -> CTcflag -> [CTcflag] # | |
Enum CUid | |
Defined in GHC.Internal.System.Posix.Types | |
Enum Fd | |
Defined in GHC.Internal.System.Posix.Types | |
Enum GeneralCategory | |
Defined in GHC.Internal.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 | |
Defined in GHC.Internal.Word | |
Enum Word32 | |
Defined in GHC.Internal.Word | |
Enum Word64 | |
Defined in GHC.Internal.Word | |
Enum Word8 | |
Defined in GHC.Internal.Word | |
Enum Ordering | |
Defined in GHC.Internal.Enum | |
Enum THResultType | |
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 Day | |
Enum Month | |
Defined in Data.Time.Calendar.Month | |
Enum Quarter | |
Enum QuarterOfYear | maps Q1..Q4 to 1..4 |
Defined in Data.Time.Calendar.Quarter Methods succ :: QuarterOfYear -> QuarterOfYear # pred :: QuarterOfYear -> QuarterOfYear # toEnum :: Int -> QuarterOfYear # fromEnum :: QuarterOfYear -> Int # enumFrom :: QuarterOfYear -> [QuarterOfYear] # enumFromThen :: QuarterOfYear -> QuarterOfYear -> [QuarterOfYear] # enumFromTo :: QuarterOfYear -> QuarterOfYear -> [QuarterOfYear] # enumFromThenTo :: QuarterOfYear -> QuarterOfYear -> QuarterOfYear -> [QuarterOfYear] # | |
Enum DiffTime | |
Defined in Data.Time.Clock.Internal.DiffTime | |
Enum StatxFlags | |
Defined in System.Posix.Files.Common Methods succ :: StatxFlags -> StatxFlags # pred :: StatxFlags -> StatxFlags # toEnum :: Int -> StatxFlags # fromEnum :: StatxFlags -> Int # enumFrom :: StatxFlags -> [StatxFlags] # enumFromThen :: StatxFlags -> StatxFlags -> [StatxFlags] # enumFromTo :: StatxFlags -> StatxFlags -> [StatxFlags] # enumFromThenTo :: StatxFlags -> StatxFlags -> StatxFlags -> [StatxFlags] # | |
Enum StatxMask | |
Defined in System.Posix.Files.Common Methods succ :: StatxMask -> StatxMask # pred :: StatxMask -> StatxMask # fromEnum :: StatxMask -> Int # enumFrom :: StatxMask -> [StatxMask] # enumFromThen :: StatxMask -> StatxMask -> [StatxMask] # enumFromTo :: StatxMask -> StatxMask -> [StatxMask] # enumFromThenTo :: StatxMask -> StatxMask -> StatxMask -> [StatxMask] # | |
Enum Integer | |
Enum Natural | |
Enum () | |
Defined in GHC.Internal.Enum | |
Enum Bool | |
Enum Char | |
Enum Int | |
Enum Levity | |
Defined in GHC.Internal.Enum | |
Enum VecCount | |
Defined in GHC.Internal.Enum | |
Enum VecElem | |
Enum Word | |
Enum a => Enum (First a) | Since: base-4.9.0.0 |
Enum a => Enum (Last a) | Since: base-4.9.0.0 |
Defined in Data.Semigroup | |
Enum a => Enum (Max a) | Since: base-4.9.0.0 |
Enum a => Enum (Min a) | Since: base-4.9.0.0 |
Enum a => Enum (WrappedMonoid a) | Since: base-4.9.0.0 |
Defined in Data.Semigroup Methods succ :: WrappedMonoid a -> WrappedMonoid a # pred :: WrappedMonoid a -> WrappedMonoid a # toEnum :: Int -> WrappedMonoid a # fromEnum :: WrappedMonoid a -> Int # enumFrom :: WrappedMonoid a -> [WrappedMonoid a] # enumFromThen :: WrappedMonoid a -> WrappedMonoid a -> [WrappedMonoid a] # enumFromTo :: WrappedMonoid a -> WrappedMonoid a -> [WrappedMonoid a] # enumFromThenTo :: WrappedMonoid a -> WrappedMonoid a -> WrappedMonoid a -> [WrappedMonoid a] # | |
Enum a => Enum (And a) | |
Defined in GHC.Internal.Data.Bits | |
Enum a => Enum (Iff a) | |
Defined in GHC.Internal.Data.Bits | |
Enum a => Enum (Ior a) | |
Defined in GHC.Internal.Data.Bits | |
Enum a => Enum (Xor a) | |
Defined in GHC.Internal.Data.Bits | |
Enum a => Enum (Identity a) | |
Defined in GHC.Internal.Data.Functor.Identity Methods succ :: Identity a -> Identity a # pred :: Identity a -> Identity a # fromEnum :: Identity a -> Int # enumFrom :: Identity a -> [Identity a] # enumFromThen :: Identity a -> Identity a -> [Identity a] # enumFromTo :: Identity a -> Identity a -> [Identity a] # enumFromThenTo :: Identity a -> Identity a -> Identity a -> [Identity a] # | |
(Enum a, Bounded a, Eq a) => Enum (Down a) | |
Defined in GHC.Internal.Data.Ord | |
Integral a => Enum (Ratio a) | |
Enum a => Enum (Solo a) | |
Defined in GHC.Internal.Enum | |
Enum (Fixed a) | Recall that, for numeric types,
and likewise
In other words,
and similarly
This is worth bearing in mind when defining [1..10] :: [Pico] evaluates to However, this is not true. On the contrary, similarly to the above
implementations of [1.000000000000, 1.00000000001, 1.00000000002, ..., 10.000000000000] and contains Since: base-2.1 |
Enum (Proxy s) | |
Enum a => Enum (Const a b) | |
Defined in GHC.Internal.Data.Functor.Const Methods succ :: Const a b -> Const a b # pred :: Const a b -> 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) | |
Defined in GHC.Internal.Data.Monoid | |
Enum (f a) => Enum (Alt f a) | |
a ~ b => Enum (a :~: b) | |
Defined in GHC.Internal.Data.Type.Equality Methods succ :: (a :~: b) -> a :~: b # pred :: (a :~: b) -> a :~: b # fromEnum :: (a :~: b) -> Int # enumFrom :: (a :~: b) -> [a :~: b] # enumFromThen :: (a :~: b) -> (a :~: b) -> [a :~: b] # enumFromTo :: (a :~: b) -> (a :~: b) -> [a :~: b] # enumFromThenTo :: (a :~: b) -> (a :~: b) -> (a :~: b) -> [a :~: b] # | |
a ~~ b => Enum (a :~~: b) | |
Defined in GHC.Internal.Data.Type.Equality Methods succ :: (a :~~: b) -> a :~~: b # pred :: (a :~~: b) -> a :~~: b # fromEnum :: (a :~~: b) -> Int # enumFrom :: (a :~~: b) -> [a :~~: b] # enumFromThen :: (a :~~: b) -> (a :~~: b) -> [a :~~: b] # enumFromTo :: (a :~~: b) -> (a :~~: b) -> [a :~~: b] # enumFromThenTo :: (a :~~: b) -> (a :~~: b) -> (a :~~: b) -> [a :~~: b] # | |
Enum (f (g a)) => Enum (Compose f g a) | Since: base-4.19.0.0 |
Defined in Data.Functor.Compose Methods succ :: Compose f g a -> Compose f g a # pred :: Compose f g a -> Compose f g a # toEnum :: Int -> Compose f g a # fromEnum :: Compose f g a -> Int # enumFrom :: Compose f g a -> [Compose f g a] # enumFromThen :: Compose f g a -> Compose f g a -> [Compose f g a] # enumFromTo :: Compose f g a -> Compose f g a -> [Compose f g a] # enumFromThenTo :: Compose f g a -> Compose f g a -> Compose f g a -> [Compose f g a] # |
Instances
Eq ByteArray | Since: base-4.17.0.0 |
Eq Timeout | |
Eq ByteString | |
Defined in Data.ByteString.Internal.Type | |
Eq ByteString | |
Defined in Data.ByteString.Lazy.Internal | |
Eq ShortByteString | |
Defined in Data.ByteString.Short.Internal Methods (==) :: ShortByteString -> ShortByteString -> Bool # (/=) :: ShortByteString -> ShortByteString -> Bool # | |
Eq IntSet | |
Eq FileType | |
Eq Permissions | |
Defined in System.Directory.Internal.Common | |
Eq XdgDirectory | |
Defined in System.Directory.Internal.Common | |
Eq XdgDirectoryList | |
Defined in System.Directory.Internal.Common Methods (==) :: XdgDirectoryList -> XdgDirectoryList -> Bool # (/=) :: XdgDirectoryList -> XdgDirectoryList -> Bool # | |
Eq PrimOp Source # | |
Eq PrimOpEffect Source # | |
Defined in GHC.Builtin.PrimOps | |
Eq LocalLabel Source # | |
Defined in GHC.ByteCode.Instr | |
Eq ByteOff Source # | |
Eq HalfWord Source # | |
Eq NativeCallType Source # | |
Defined in GHC.ByteCode.Types Methods (==) :: NativeCallType -> NativeCallType -> Bool # (/=) :: NativeCallType -> NativeCallType -> Bool # | |
Eq RegBitmap Source # | |
Eq WordOff Source # | |
Eq CmmInfoTable Source # | |
Defined in GHC.Cmm | |
Eq ProfilingInfo Source # | |
Defined in GHC.Cmm Methods (==) :: ProfilingInfo -> ProfilingInfo -> Bool # (/=) :: ProfilingInfo -> ProfilingInfo -> Bool # | |
Eq SectionProtection Source # | |
Defined in GHC.Cmm Methods (==) :: SectionProtection -> SectionProtection -> Bool # (/=) :: SectionProtection -> SectionProtection -> Bool # | |
Eq CLabel Source # | |
Eq ConInfoTableLocation Source # | |
Defined in GHC.Cmm.CLabel Methods (==) :: ConInfoTableLocation -> ConInfoTableLocation -> Bool # (/=) :: ConInfoTableLocation -> ConInfoTableLocation -> Bool # | |
Eq DynamicLinkerLabelInfo Source # | |
Defined in GHC.Cmm.CLabel Methods (==) :: DynamicLinkerLabelInfo -> DynamicLinkerLabelInfo -> Bool # (/=) :: DynamicLinkerLabelInfo -> DynamicLinkerLabelInfo -> Bool # | |
Eq ForeignLabelSource Source # | |
Defined in GHC.Cmm.CLabel Methods (==) :: ForeignLabelSource -> ForeignLabelSource -> Bool # (/=) :: ForeignLabelSource -> ForeignLabelSource -> Bool # | |
Eq InfoProvEnt Source # | |
Defined in GHC.Cmm.CLabel | |
Eq NeedExternDecl Source # | |
Defined in GHC.Cmm.CLabel Methods (==) :: NeedExternDecl -> NeedExternDecl -> Bool # (/=) :: NeedExternDecl -> NeedExternDecl -> Bool # | |
Eq Label Source # | |
Eq LabelSet Source # | |
Eq UnwindExpr Source # | |
Defined in GHC.Cmm.DebugBlock | |
Eq DominatorSet Source # | |
Defined in GHC.Cmm.Dominators | |
Eq RPNum Source # | |
Eq AlignmentSpec Source # | |
Defined in GHC.Cmm.Expr Methods (==) :: AlignmentSpec -> AlignmentSpec -> Bool # (/=) :: AlignmentSpec -> AlignmentSpec -> Bool # | |
Eq Area Source # | |
Eq CmmExpr Source # | |
Eq CmmLit Source # | |
Eq Transfer Source # | |
Eq AtomicMachOp Source # | |
Defined in GHC.Cmm.MachOp | |
Eq CallishMachOp Source # | |
Defined in GHC.Cmm.MachOp Methods (==) :: CallishMachOp -> CallishMachOp -> Bool # (/=) :: CallishMachOp -> CallishMachOp -> Bool # | |
Eq FMASign Source # | |
Eq MachOp Source # | |
Eq MemoryOrdering Source # | |
Defined in GHC.Cmm.MachOp Methods (==) :: MemoryOrdering -> MemoryOrdering -> Bool # (/=) :: MemoryOrdering -> MemoryOrdering -> Bool # | |
Eq CmmReturnInfo Source # | |
Defined in GHC.Cmm.Node Methods (==) :: CmmReturnInfo -> CmmReturnInfo -> Bool # (/=) :: CmmReturnInfo -> CmmReturnInfo -> Bool # | |
Eq CmmTickScope Source # | |
Defined in GHC.Cmm.Node | |
Eq Convention Source # | |
Defined in GHC.Cmm.Node | |
Eq ForeignConvention Source # | |
Defined in GHC.Cmm.Node Methods (==) :: ForeignConvention -> ForeignConvention -> Bool # (/=) :: ForeignConvention -> ForeignConvention -> Bool # | |
Eq ForeignTarget Source # | |
Defined in GHC.Cmm.Node Methods (==) :: ForeignTarget -> ForeignTarget -> Bool # (/=) :: ForeignTarget -> ForeignTarget -> Bool # | |
Eq Reducibility Source # | |
Defined in GHC.Cmm.Reducibility | |
Eq CmmReg Source # | |
Eq GlobalReg Source # | |
Eq GlobalRegUse Source # | |
Defined in GHC.Cmm.Reg | |
Eq LocalReg Source # | |
Eq SwitchTargets Source # | |
Defined in GHC.Cmm.Switch Methods (==) :: SwitchTargets -> SwitchTargets -> Bool # (/=) :: SwitchTargets -> SwitchTargets -> Bool # | |
Eq ForeignHint Source # | |
Defined in GHC.Cmm.Type | |
Eq Width Source # | |
Eq Cond Source # | |
Eq ExtMode Source # | |
Eq Operand Source # | |
Eq ShiftMode Source # | |
Eq Target Source # | |
Eq AddrMode Source # | |
Eq Imm Source # | |
Eq CfgEdge Source # | Careful! Since we assume there is at most one edge from A to B the Eq instance does not consider weight. |
Eq EdgeInfo Source # | |
Eq EdgeWeight Source # | |
Defined in GHC.CmmToAsm.CFG | |
Eq TransitionSource Source # | |
Defined in GHC.CmmToAsm.CFG Methods (==) :: TransitionSource -> TransitionSource -> Bool # (/=) :: TransitionSource -> TransitionSource -> Bool # | |
Eq Format Source # | |
Eq ReferenceKind Source # | |
Defined in GHC.CmmToAsm.PIC Methods (==) :: ReferenceKind -> ReferenceKind -> Bool # (/=) :: ReferenceKind -> ReferenceKind -> Bool # | |
Eq Cond Source # | |
Eq Reg Source # | |
Eq RegClass Source # | |
Eq RegSub Source # | |
Eq Loc Source # | |
Eq SomeWasmType Source # | |
Defined in GHC.CmmToAsm.Wasm.Types | |
Eq SymKind Source # | |
Eq SymName Source # | |
Eq Cond Source # | |
Eq LlvmVersion Source # | |
Defined in GHC.CmmToLlvm.Version.Type | |
Eq AltCon Source # | |
Eq UnfoldingCache Source # | |
Defined in GHC.Core Methods (==) :: UnfoldingCache -> UnfoldingCache -> Bool # (/=) :: UnfoldingCache -> UnfoldingCache -> Bool # | |
Eq UnfoldingGuidance Source # | |
Defined in GHC.Core Methods (==) :: UnfoldingGuidance -> UnfoldingGuidance -> Bool # (/=) :: UnfoldingGuidance -> UnfoldingGuidance -> Bool # | |
Eq Class Source # | |
Eq CoAxiomRule Source # | |
Defined in GHC.Core.Coercion.Axiom | |
Eq ConLike Source # | |
Eq DataCon Source # | |
Eq StrictnessMark Source # | |
Defined in GHC.Core.DataCon Methods (==) :: StrictnessMark -> StrictnessMark -> Bool # (/=) :: StrictnessMark -> StrictnessMark -> Bool # | |
Eq StaticPtrCheck Source # | |
Defined in GHC.Core.Lint Methods (==) :: StaticPtrCheck -> StaticPtrCheck -> Bool # (/=) :: StaticPtrCheck -> StaticPtrCheck -> Bool # | |
Eq IsSubmult Source # | |
Eq ArityType Source # | |
Eq Level Source # | |
Eq LevelType Source # | |
Eq Tick Source # | |
Eq IsRecDataConResult Source # | |
Defined in GHC.Core.Opt.WorkWrap.Utils Methods (==) :: IsRecDataConResult -> IsRecDataConResult -> Bool # (/=) :: IsRecDataConResult -> IsRecDataConResult -> Bool # | |
Eq PatSyn Source # | |
Eq EqRel Source # | |
Eq CoSel Source # | |
Eq FunSel Source # | |
Eq TyLit Source # | |
Eq Injectivity Source # | |
Defined in GHC.Core.TyCon | |
Eq PrimElemRep Source # | |
Defined in GHC.Core.TyCon | |
Eq PrimRep Source # | |
Eq TyCon Source # | |
Eq BindFlag Source # | |
Eq OverridingBool Source # | Since: ghc-9.4.1 |
Defined in GHC.Data.Bool Methods (==) :: OverridingBool -> OverridingBool -> Bool # (/=) :: OverridingBool -> OverridingBool -> Bool # | |
Eq FastString Source # | |
Defined in GHC.Data.FastString | |
Eq LexicalFastString Source # | |
Defined in GHC.Data.FastString Methods (==) :: LexicalFastString -> LexicalFastString -> Bool # (/=) :: LexicalFastString -> LexicalFastString -> Bool # | |
Eq NonDetFastString Source # | |
Defined in GHC.Data.FastString Methods (==) :: NonDetFastString -> NonDetFastString -> Bool # (/=) :: NonDetFastString -> NonDetFastString -> Bool # | |
Eq EdgeType Source # | |
Eq UnVarSet Source # | |
Eq Word64Set Source # | |
Eq BackendName Source # | |
Defined in GHC.Driver.Backend.Internal | |
Eq CompilerInfo Source # | |
Defined in GHC.Driver.DynFlags | |
Eq DynLibLoader Source # | |
Defined in GHC.Driver.DynFlags | |
Eq DynamicTooState Source # | |
Defined in GHC.Driver.DynFlags Methods (==) :: DynamicTooState -> DynamicTooState -> Bool # (/=) :: DynamicTooState -> DynamicTooState -> Bool # | |
Eq GhcLink Source # | |
Eq GhcMode Source # | |
Eq IgnorePackageFlag Source # | |
Defined in GHC.Driver.DynFlags Methods (==) :: IgnorePackageFlag -> IgnorePackageFlag -> Bool # (/=) :: IgnorePackageFlag -> IgnorePackageFlag -> Bool # | |
Eq LinkerInfo Source # | |
Defined in GHC.Driver.DynFlags | |
Eq ModRenaming Source # | |
Defined in GHC.Driver.DynFlags | |
Eq PackageArg Source # | |
Defined in GHC.Driver.DynFlags | |
Eq PackageDBFlag Source # | |
Defined in GHC.Driver.DynFlags Methods (==) :: PackageDBFlag -> PackageDBFlag -> Bool # (/=) :: PackageDBFlag -> PackageDBFlag -> Bool # | |
Eq PackageFlag Source # | |
Defined in GHC.Driver.DynFlags | |
Eq PkgDbRef Source # | |
Eq TrustFlag Source # | |
Eq DumpFlag Source # | |
Eq GeneralFlag Source # | |
Defined in GHC.Driver.Flags | |
Eq Language Source # | |
Eq WarningFlag Source # | |
Defined in GHC.Driver.Flags | |
Eq WarningGroup Source # | |
Defined in GHC.Driver.Flags | |
Eq Phase Source # | |
Eq AnnsModule Source # | |
Defined in GHC.Hs | |
Eq NamespaceSpecifier Source # | |
Defined in GHC.Hs.Binds Methods (==) :: NamespaceSpecifier -> NamespaceSpecifier -> Bool # (/=) :: NamespaceSpecifier -> NamespaceSpecifier -> Bool # | |
Eq HsRuleAnn Source # | |
Eq HsDocString Source # | |
Defined in GHC.Hs.DocString | |
Eq HsDocStringChunk Source # | |
Defined in GHC.Hs.DocString Methods (==) :: HsDocStringChunk -> HsDocStringChunk -> Bool # (/=) :: HsDocStringChunk -> HsDocStringChunk -> Bool # | |
Eq HsDocStringDecorator Source # | |
Defined in GHC.Hs.DocString Methods (==) :: HsDocStringDecorator -> HsDocStringDecorator -> Bool # (/=) :: HsDocStringDecorator -> HsDocStringDecorator -> Bool # | |
Eq BlankEpAnnotations Source # | |
Defined in GHC.Hs.Dump Methods (==) :: BlankEpAnnotations -> BlankEpAnnotations -> Bool # (/=) :: BlankEpAnnotations -> BlankEpAnnotations -> Bool # | |
Eq BlankSrcSpan Source # | |
Defined in GHC.Hs.Dump | |
Eq GenerateInhabitingPatternsMode Source # | |
Defined in GHC.HsToCore.Pmc.Solver | |
Eq BotInfo Source # | |
Eq PmAltCon Source # | Syntactic equality. |
Eq PmEquality Source # | |
Defined in GHC.HsToCore.Pmc.Solver.Types | |
Eq PmLit Source # | Syntactic equality. |
Eq Precision Source # | |
Eq TickishType Source # | |
Defined in GHC.HsToCore.Ticks | |
Eq CheckHiWay Source # | |
Defined in GHC.Iface.Binary | |
Eq BuildingCabalPackage Source # | |
Defined in GHC.Iface.Errors.Types Methods (==) :: BuildingCabalPackage -> BuildingCabalPackage -> Bool # (/=) :: BuildingCabalPackage -> BuildingCabalPackage -> Bool # | |
Eq BindType Source # | |
Eq ContextInfo Source # | |
Defined in GHC.Iface.Ext.Types | |
Eq DeclType Source # | |
Eq EvBindDeps Source # | |
Defined in GHC.Iface.Ext.Types | |
Eq EvVarSource Source # | |
Defined in GHC.Iface.Ext.Types | |
Eq HieName Source # | |
Eq HieTypeFix Source # | |
Defined in GHC.Iface.Ext.Types | |
Eq IEType Source # | |
Eq NodeAnnotation Source # | |
Defined in GHC.Iface.Ext.Types Methods (==) :: NodeAnnotation -> NodeAnnotation -> Bool # (/=) :: NodeAnnotation -> NodeAnnotation -> Bool # | |
Eq NodeOrigin Source # | |
Defined in GHC.Iface.Ext.Types | |
Eq RecFieldContext Source # | |
Defined in GHC.Iface.Ext.Types Methods (==) :: RecFieldContext -> RecFieldContext -> Bool # (/=) :: RecFieldContext -> RecFieldContext -> Bool # | |
Eq Scope Source # | |
Eq TyVarScope Source # | |
Defined in GHC.Iface.Ext.Types | |
Eq CompileReason Source # | |
Defined in GHC.Iface.Recomp Methods (==) :: CompileReason -> CompileReason -> Bool # (/=) :: CompileReason -> CompileReason -> Bool # | |
Eq RecompReason Source # | |
Defined in GHC.Iface.Recomp | |
Eq RecompileRequired Source # | |
Defined in GHC.Iface.Recomp Methods (==) :: RecompileRequired -> RecompileRequired -> Bool # (/=) :: RecompileRequired -> RecompileRequired -> Bool # | |
Eq UnfoldingExposure Source # | |
Defined in GHC.Iface.Tidy Methods (==) :: UnfoldingExposure -> UnfoldingExposure -> Bool # (/=) :: UnfoldingExposure -> UnfoldingExposure -> Bool # | |
Eq IfaceTyCon Source # | |
Defined in GHC.Iface.Type | |
Eq IfaceTyConInfo Source # | |
Defined in GHC.Iface.Type Methods (==) :: IfaceTyConInfo -> IfaceTyConInfo -> Bool # (/=) :: IfaceTyConInfo -> IfaceTyConInfo -> Bool # | |
Eq IfaceTyConSort Source # | |
Defined in GHC.Iface.Type Methods (==) :: IfaceTyConSort -> IfaceTyConSort -> Bool # (/=) :: IfaceTyConSort -> IfaceTyConSort -> Bool # | |
Eq IfaceTyLit Source # | |
Defined in GHC.Iface.Type | |
Eq Ident Source # | |
Eq AOp Source # | |
Eq JStgExpr Source # | |
Eq JStgStat Source # | |
Eq JVal Source # | |
Eq Op Source # | |
Eq UOp Source # | |
Eq AOp Source # | |
Eq JExpr Source # | |
Eq JStat Source # | |
Eq JVal Source # | |
Eq Op Source # | |
Eq UOp Source # | |
Eq MetaAnnot Source # | |
Eq MetaExpr Source # | |
Eq MetaId Source # | |
Eq LlvmAtomicOp Source # | |
Defined in GHC.Llvm.Syntax | |
Eq LlvmExpression Source # | |
Defined in GHC.Llvm.Syntax Methods (==) :: LlvmExpression -> LlvmExpression -> Bool # (/=) :: LlvmExpression -> LlvmExpression -> Bool # | |
Eq LlvmStatement Source # | |
Defined in GHC.Llvm.Syntax Methods (==) :: LlvmStatement -> LlvmStatement -> Bool # (/=) :: LlvmStatement -> LlvmStatement -> Bool # | |
Eq LlvmSyncOrdering Source # | |
Defined in GHC.Llvm.Syntax Methods (==) :: LlvmSyncOrdering -> LlvmSyncOrdering -> Bool # (/=) :: LlvmSyncOrdering -> LlvmSyncOrdering -> Bool # | |
Eq LMConst Source # | |
Eq LlvmCallConvention Source # | |
Defined in GHC.Llvm.Types Methods (==) :: LlvmCallConvention -> LlvmCallConvention -> Bool # (/=) :: LlvmCallConvention -> LlvmCallConvention -> Bool # | |
Eq LlvmCallType Source # | |
Defined in GHC.Llvm.Types | |
Eq LlvmCastOp Source # | |
Defined in GHC.Llvm.Types | |
Eq LlvmCmpOp Source # | |
Eq LlvmFuncAttr Source # | |
Defined in GHC.Llvm.Types | |
Eq LlvmFunctionDecl Source # | |
Defined in GHC.Llvm.Types Methods (==) :: LlvmFunctionDecl -> LlvmFunctionDecl -> Bool # (/=) :: LlvmFunctionDecl -> LlvmFunctionDecl -> Bool # | |
Eq LlvmLinkageType Source # | |
Defined in GHC.Llvm.Types Methods (==) :: LlvmLinkageType -> LlvmLinkageType -> Bool # (/=) :: LlvmLinkageType -> LlvmLinkageType -> Bool # | |
Eq LlvmLit Source # | |
Eq LlvmMachOp Source # | |
Defined in GHC.Llvm.Types | |
Eq LlvmParamAttr Source # | |
Defined in GHC.Llvm.Types Methods (==) :: LlvmParamAttr -> LlvmParamAttr -> Bool # (/=) :: LlvmParamAttr -> LlvmParamAttr -> Bool # | |
Eq LlvmParameterListType Source # | |
Defined in GHC.Llvm.Types Methods (==) :: LlvmParameterListType -> LlvmParameterListType -> Bool # (/=) :: LlvmParameterListType -> LlvmParameterListType -> Bool # | |
Eq LlvmType Source # | |
Eq LlvmVar Source # | |
Eq AddEpAnn Source # | |
Eq AnnKeywordId Source # | |
Defined in GHC.Parser.Annotation | |
Eq AnnList Source # | |
Eq AnnListItem Source # | |
Defined in GHC.Parser.Annotation | |
Eq AnnPragma Source # | |
Eq BindTag Source # | |
Eq DeclTag Source # | |
Eq EpAnnComments Source # | |
Defined in GHC.Parser.Annotation Methods (==) :: EpAnnComments -> EpAnnComments -> Bool # (/=) :: EpAnnComments -> EpAnnComments -> Bool # | |
Eq EpaComment Source # | |
Defined in GHC.Parser.Annotation | |
Eq EpaCommentTok Source # | |
Defined in GHC.Parser.Annotation Methods (==) :: EpaCommentTok -> EpaCommentTok -> Bool # (/=) :: EpaCommentTok -> EpaCommentTok -> Bool # | |
Eq HasE Source # | |
Eq IsUnicodeSyntax Source # | |
Defined in GHC.Parser.Annotation Methods (==) :: IsUnicodeSyntax -> IsUnicodeSyntax -> Bool # (/=) :: IsUnicodeSyntax -> IsUnicodeSyntax -> Bool # | |
Eq NameAdornment Source # | |
Defined in GHC.Parser.Annotation Methods (==) :: NameAdornment -> NameAdornment -> Bool # (/=) :: NameAdornment -> NameAdornment -> Bool # | |
Eq NameAnn Source # | |
Eq NoEpAnns Source # | |
Eq ParenType Source # | |
Eq TokenLocation Source # | |
Defined in GHC.Parser.Annotation Methods (==) :: TokenLocation -> TokenLocation -> Bool # (/=) :: TokenLocation -> TokenLocation -> Bool # | |
Eq TrailingAnn Source # | |
Defined in GHC.Parser.Annotation | |
Eq LexErrKind Source # | |
Defined in GHC.Parser.Errors.Types | |
Eq NumUnderscoreReason Source # | |
Defined in GHC.Parser.Errors.Types Methods (==) :: NumUnderscoreReason -> NumUnderscoreReason -> Bool # (/=) :: NumUnderscoreReason -> NumUnderscoreReason -> Bool # | |
Eq ParseContext Source # | |
Defined in GHC.Parser.Errors.Types | |
Eq PatIncompleteDoBlock Source # | |
Defined in GHC.Parser.Errors.Types Methods (==) :: PatIncompleteDoBlock -> PatIncompleteDoBlock -> Bool # (/=) :: PatIncompleteDoBlock -> PatIncompleteDoBlock -> Bool # | |
Eq BmiVersion Source # | |
Defined in GHC.Platform | |
Eq Platform Source # | |
Eq PlatformWordSize Source # | |
Defined in GHC.Platform Methods (==) :: PlatformWordSize -> PlatformWordSize -> Bool # (/=) :: PlatformWordSize -> PlatformWordSize -> Bool # | |
Eq SseVersion Source # | |
Defined in GHC.Platform | |
Eq PlatformConstants Source # | |
Defined in GHC.Platform.Constants Methods (==) :: PlatformConstants -> PlatformConstants -> Bool # (/=) :: PlatformConstants -> PlatformConstants -> Bool # | |
Eq Profile Source # | |
Eq RealReg Source # | |
Eq Reg Source # | |
Eq VirtualReg Source # | |
Defined in GHC.Platform.Reg | |
Eq RegClass Source # | |
Eq Way Source # | |
Eq WhatLooking Source # | |
Defined in GHC.Rename.Unbound | |
Eq ArgDescr Source # | |
Eq ClosureTypeInfo Source # | |
Defined in GHC.Runtime.Heap.Layout Methods (==) :: ClosureTypeInfo -> ClosureTypeInfo -> Bool # (/=) :: ClosureTypeInfo -> ClosureTypeInfo -> Bool # | |
Eq SMRep Source # | |
Eq StgHalfWord Source # | |
Defined in GHC.Runtime.Heap.Layout | |
Eq StgWord Source # | |
Eq TagInfo Source # | |
Eq TagSig Source # | |
Eq StgLiftConfig Source # | |
Defined in GHC.Stg.Lift.Config Methods (==) :: StgLiftConfig -> StgLiftConfig -> Bool # (/=) :: StgLiftConfig -> StgLiftConfig -> Bool # | |
Eq StgToDo Source # | |
Eq NoExtFieldSilent Source # | |
Defined in GHC.Stg.Syntax Methods (==) :: NoExtFieldSilent -> NoExtFieldSilent -> Bool # (/=) :: NoExtFieldSilent -> NoExtFieldSilent -> Bool # | |
Eq ArgRep Source # | |
Eq StandardFormInfo Source # | |
Defined in GHC.StgToCmm.Types Methods (==) :: StandardFormInfo -> StandardFormInfo -> Bool # (/=) :: StandardFormInfo -> StandardFormInfo -> Bool # | |
Eq BlockRef Source # | |
Eq ExportedFun Source # | |
Defined in GHC.StgToJS.Object | |
Eq JSOptions Source # | |
Eq ObjectKind Source # | |
Defined in GHC.StgToJS.Object | |
Eq Special Source # | |
Eq StgReg Source # | |
Eq StgRet Source # | |
Eq CILayout Source # | |
Eq CIRegs Source # | |
Eq CIStatic Source # | |
Eq CIType Source # | |
Eq ClosureInfo Source # | |
Defined in GHC.StgToJS.Types | |
Eq ClosureType Source # | |
Defined in GHC.StgToJS.Types | |
Eq ExpFun Source # | |
Eq ExprResult Source # | |
Defined in GHC.StgToJS.Types | |
Eq ExprValData Source # | |
Defined in GHC.StgToJS.Types | |
Eq IdKey Source # | |
Eq IdType Source # | |
Eq JSFFIType Source # | |
Eq JSRep Source # | |
Eq OtherSymb Source # | |
Eq StackSlot Source # | |
Eq StaticArg Source # | |
Eq StaticInfo Source # | |
Defined in GHC.StgToJS.Types | |
Eq StaticLit Source # | |
Eq StaticUnboxed Source # | |
Defined in GHC.StgToJS.Types Methods (==) :: StaticUnboxed -> StaticUnboxed -> Bool # (/=) :: StaticUnboxed -> StaticUnboxed -> Bool # | |
Eq StaticVal Source # | |
Eq ThreadStatus Source # | |
Defined in GHC.StgToJS.Types | |
Eq Archive Source # | |
Eq ArchiveEntry Source # | |
Defined in GHC.SysTools.Ar | |
Eq HoleFitSortingAlg Source # | |
Defined in GHC.Tc.Errors.Hole Methods (==) :: HoleFitSortingAlg -> HoleFitSortingAlg -> Bool # (/=) :: HoleFitSortingAlg -> HoleFitSortingAlg -> Bool # | |
Eq HoleFit Source # | |
Eq HoleFitCandidate Source # | |
Defined in GHC.Tc.Errors.Hole.FitTypes Methods (==) :: HoleFitCandidate -> HoleFitCandidate -> Bool # (/=) :: HoleFitCandidate -> HoleFitCandidate -> Bool # | |
Eq AssociatedTyLastVarInKind Source # | |
Defined in GHC.Tc.Errors.Types Methods (==) :: AssociatedTyLastVarInKind -> AssociatedTyLastVarInKind -> Bool # (/=) :: AssociatedTyLastVarInKind -> AssociatedTyLastVarInKind -> Bool # | |
Eq AssociatedTyNotParamOverLastTyVar Source # | |
Defined in GHC.Tc.Errors.Types | |
Eq DeriveAnyClassEnabled Source # | |
Defined in GHC.Tc.Errors.Types Methods (==) :: DeriveAnyClassEnabled -> DeriveAnyClassEnabled -> Bool # (/=) :: DeriveAnyClassEnabled -> DeriveAnyClassEnabled -> Bool # | |
Eq Exported Source # | |
Eq HasAssociatedDataFamInsts Source # | |
Defined in GHC.Tc.Errors.Types Methods (==) :: HasAssociatedDataFamInsts -> HasAssociatedDataFamInsts -> Bool # (/=) :: HasAssociatedDataFamInsts -> HasAssociatedDataFamInsts -> Bool # | |
Eq HasKinds Source # | |
Eq HasWildcard Source # | |
Defined in GHC.Tc.Errors.Types | |
Eq SuggestPartialTypeSignatures Source # | |
Defined in GHC.Tc.Errors.Types Methods (==) :: SuggestPartialTypeSignatures -> SuggestPartialTypeSignatures -> Bool # (/=) :: SuggestPartialTypeSignatures -> SuggestPartialTypeSignatures -> Bool # | |
Eq SuggestUndecidableInstances Source # | |
Defined in GHC.Tc.Errors.Types Methods (==) :: SuggestUndecidableInstances -> SuggestUndecidableInstances -> Bool # (/=) :: SuggestUndecidableInstances -> SuggestUndecidableInstances -> Bool # | |
Eq UnsupportedCallConvention Source # | |
Defined in GHC.Tc.Errors.Types Methods (==) :: UnsupportedCallConvention -> UnsupportedCallConvention -> Bool # (/=) :: UnsupportedCallConvention -> UnsupportedCallConvention -> Bool # | |
Eq UsingGeneralizedNewtypeDeriving Source # | |
Defined in GHC.Tc.Errors.Types | |
Eq DocLoc Source # | |
Eq CheckTyEqProblem Source # | |
Defined in GHC.Tc.Types.Constraint Methods (==) :: CheckTyEqProblem -> CheckTyEqProblem -> Bool # (/=) :: CheckTyEqProblem -> CheckTyEqProblem -> Bool # | |
Eq CtFlavour Source # | |
Eq HasGivenEqs Source # | |
Defined in GHC.Tc.Types.Constraint | |
Eq SubGoalDepth Source # | |
Defined in GHC.Tc.Types.Constraint | |
Eq ReportRedundantConstraints Source # | |
Defined in GHC.Tc.Types.Origin Methods (==) :: ReportRedundantConstraints -> ReportRedundantConstraints -> Bool # (/=) :: ReportRedundantConstraints -> ReportRedundantConstraints -> Bool # | |
Eq UserTypeCtxt Source # | |
Defined in GHC.Tc.Types.Origin | |
Eq TcLevel Source # | |
Eq Activation Source # | |
Defined in GHC.Types.Basic | |
Eq Alignment Source # | |
Eq CbvMark Source # | |
Eq CompilerPhase Source # | |
Defined in GHC.Types.Basic Methods (==) :: CompilerPhase -> CompilerPhase -> Bool # (/=) :: CompilerPhase -> CompilerPhase -> Bool # | |
Eq DoPmc Source # | |
Eq FunctionOrData Source # | |
Defined in GHC.Types.Basic Methods (==) :: FunctionOrData -> FunctionOrData -> Bool # (/=) :: FunctionOrData -> FunctionOrData -> Bool # | |
Eq GenReason Source # | |
Eq InlinePragma Source # | |
Defined in GHC.Types.Basic | |
Eq InlineSpec Source # | |
Defined in GHC.Types.Basic | |
Eq InsideLam Source # | |
Eq IntWithInf Source # | |
Defined in GHC.Types.Basic | |
Eq InterestingCxt Source # | |
Defined in GHC.Types.Basic Methods (==) :: InterestingCxt -> InterestingCxt -> Bool # (/=) :: InterestingCxt -> InterestingCxt -> Bool # | |
Eq LeftOrRight Source # | |
Defined in GHC.Types.Basic | |
Eq Levity Source # | |
Eq OccInfo Source # | |
Eq OneShotInfo Source # | |
Defined in GHC.Types.Basic | |
Eq Origin Source # | |
Eq OverlapFlag Source # | |
Defined in GHC.Types.Basic | |
Eq OverlapMode Source # | |
Defined in GHC.Types.Basic | |
Eq PprPrec Source # | |
Eq RecFlag Source # | |
Eq RuleMatchInfo Source # | |
Defined in GHC.Types.Basic Methods (==) :: RuleMatchInfo -> RuleMatchInfo -> Bool # (/=) :: RuleMatchInfo -> RuleMatchInfo -> Bool # | |
Eq TailCallInfo Source # | |
Defined in GHC.Types.Basic | |
Eq TupleSort Source # | |
Eq TypeOrConstraint Source # | |
Defined in GHC.Types.Basic Methods (==) :: TypeOrConstraint -> TypeOrConstraint -> Bool # (/=) :: TypeOrConstraint -> TypeOrConstraint -> Bool # | |
Eq TypeOrData Source # | |
Defined in GHC.Types.Basic | |
Eq TypeOrKind Source # | |
Defined in GHC.Types.Basic | |
Eq UnboxedTupleOrSum Source # | |
Defined in GHC.Types.Basic Methods (==) :: UnboxedTupleOrSum -> UnboxedTupleOrSum -> Bool # (/=) :: UnboxedTupleOrSum -> UnboxedTupleOrSum -> Bool # | |
Eq CCFlavour Source # | |
Eq CostCentre Source # | |
Defined in GHC.Types.CostCentre | |
Eq CostCentreStack Source # | |
Defined in GHC.Types.CostCentre Methods (==) :: CostCentreStack -> CostCentreStack -> Bool # (/=) :: CostCentreStack -> CostCentreStack -> Bool # | |
Eq CostCentreIndex Source # | |
Defined in GHC.Types.CostCentre.State Methods (==) :: CostCentreIndex -> CostCentreIndex -> Bool # (/=) :: CostCentreIndex -> CostCentreIndex -> Bool # | |
Eq Cpr Source # | |
Eq CprSig Source # | |
Eq CprType Source # | |
Eq Card Source # | |
Eq Demand Source # | |
Eq Divergence Source # | |
Defined in GHC.Types.Demand | |
Eq DmdEnv Source # | |
Eq DmdSig Source # | |
Eq DmdType Source # | See Note [Demand env Equality]. |
Eq SubDemand Source # | We have to respect Poly rewrites through |
Eq DiagnosticCode Source # | |
Defined in GHC.Types.Error Methods (==) :: DiagnosticCode -> DiagnosticCode -> Bool # (/=) :: DiagnosticCode -> DiagnosticCode -> Bool # | |
Eq DiagnosticReason Source # | |
Defined in GHC.Types.Error Methods (==) :: DiagnosticReason -> DiagnosticReason -> Bool # (/=) :: DiagnosticReason -> DiagnosticReason -> Bool # | |
Eq Severity Source # | |
Eq DuplicateRecordFields Source # | |
Defined in GHC.Types.FieldLabel Methods (==) :: DuplicateRecordFields -> DuplicateRecordFields -> Bool # (/=) :: DuplicateRecordFields -> DuplicateRecordFields -> Bool # | |
Eq FieldLabel Source # | |
Defined in GHC.Types.FieldLabel | |
Eq FieldSelectors Source # | |
Defined in GHC.Types.FieldLabel Methods (==) :: FieldSelectors -> FieldSelectors -> Bool # (/=) :: FieldSelectors -> FieldSelectors -> Bool # | |
Eq Fixity Source # | |
Eq FixityDirection Source # | |
Defined in GHC.Types.Fixity Methods (==) :: FixityDirection -> FixityDirection -> Bool # (/=) :: FixityDirection -> FixityDirection -> Bool # | |
Eq LexicalFixity Source # | |
Defined in GHC.Types.Fixity Methods (==) :: LexicalFixity -> LexicalFixity -> Bool # (/=) :: LexicalFixity -> LexicalFixity -> Bool # | |
Eq CCallConv Source # | |
Eq CCallSpec Source # | |
Eq CCallTarget Source # | |
Defined in GHC.Types.ForeignCall | |
Eq CType Source # | |
Eq ForeignCall Source # | |
Defined in GHC.Types.ForeignCall | |
Eq Header Source # | |
Eq Safety Source # | |
Eq ConInfo Source # | |
Eq ConLikeName Source # | |
Defined in GHC.Types.GREInfo | |
Eq RecFieldInfo Source # | |
Defined in GHC.Types.GREInfo | |
Eq CafInfo Source # | |
Eq RecSelParent Source # | |
Defined in GHC.Types.Id.Info | |
Eq LitNumType Source # | |
Defined in GHC.Types.Literal | |
Eq Literal Source # | |
Eq Name Source # | |
Eq NameSpace Source # | |
Eq OccName Source # | |
Eq FieldsOrSelectors Source # | |
Defined in GHC.Types.Name.Reader Methods (==) :: FieldsOrSelectors -> FieldsOrSelectors -> Bool # (/=) :: FieldsOrSelectors -> FieldsOrSelectors -> Bool # | |
Eq ImpDeclSpec Source # | |
Defined in GHC.Types.Name.Reader | |
Eq ImpItemSpec Source # | |
Defined in GHC.Types.Name.Reader | |
Eq ImportSpec Source # | |
Defined in GHC.Types.Name.Reader | |
Eq Parent Source # | |
Eq RdrName Source # | |
Eq PkgQual Source # | |
Eq ProfAuto Source # | |
Eq SlotTy Source # | |
Eq SafeHaskellMode Source # | |
Defined in GHC.Types.SafeHaskell Methods (==) :: SafeHaskellMode -> SafeHaskellMode -> Bool # (/=) :: SafeHaskellMode -> SafeHaskellMode -> Bool # | |
Eq SaneDouble Source # | |
Defined in GHC.Types.SaneDouble | |
Eq HsBootOrSig Source # | |
Defined in GHC.Types.SourceFile | |
Eq HscSource Source # | |
Eq FractionalExponentBase Source # | |
Defined in GHC.Types.SourceText Methods (==) :: FractionalExponentBase -> FractionalExponentBase -> Bool # (/=) :: FractionalExponentBase -> FractionalExponentBase -> Bool # | |
Eq FractionalLit Source # | Be wary of using this instance to compare for equal *values* when exponents are large. The same value expressed in different syntactic form won't compare as equal when any of the exponents is >= 100. |
Defined in GHC.Types.SourceText Methods (==) :: FractionalLit -> FractionalLit -> Bool # (/=) :: FractionalLit -> FractionalLit -> Bool # | |
Eq IntegralLit Source # | |
Defined in GHC.Types.SourceText | |
Eq SourceText Source # | |
Defined in GHC.Types.SourceText | |
Eq StringLiteral Source # | |
Defined in GHC.Types.SourceText Methods (==) :: StringLiteral -> StringLiteral -> Bool # (/=) :: StringLiteral -> StringLiteral -> Bool # | |
Eq BufPos Source # | |
Eq BufSpan Source # | |
Eq DeltaPos Source # | |
Eq NoComments Source # | |
Defined in GHC.Types.SrcLoc | |
Eq PsLoc Source # | |
Eq PsSpan Source # | |
Eq RealSrcLoc Source # | |
Defined in GHC.Types.SrcLoc | |
Eq RealSrcSpan Source # | |
Defined in GHC.Types.SrcLoc | |
Eq SrcLoc Source # | |
Eq SrcSpan Source # | |
Eq UnhelpfulSpanReason Source # | |
Defined in GHC.Types.SrcLoc Methods (==) :: UnhelpfulSpanReason -> UnhelpfulSpanReason -> Bool # (/=) :: UnhelpfulSpanReason -> UnhelpfulSpanReason -> Bool # | |
Eq TargetId Source # | |
Eq TickishPlacement Source # | |
Defined in GHC.Types.Tickish Methods (==) :: TickishPlacement -> TickishPlacement -> Bool # (/=) :: TickishPlacement -> TickishPlacement -> Bool # | |
Eq TickishScoping Source # | |
Defined in GHC.Types.Tickish Methods (==) :: TickishScoping -> TickishScoping -> Bool # (/=) :: TickishScoping -> TickishScoping -> Bool # | |
Eq Unique Source # | |
Eq ForAllTyFlag Source # | |
Defined in GHC.Types.Var | |
Eq FunTyFlag Source # | |
Eq Specificity Source # | |
Defined in GHC.Types.Var | |
Eq Var Source # | |
Eq PackageId Source # | |
Eq PackageName Source # | |
Defined in GHC.Unit.Info | |
Eq Dependencies Source # | |
Defined in GHC.Unit.Module.Deps | |
Eq Usage Source # | |
Eq ModNodeKeyWithUid Source # | |
Defined in GHC.Unit.Module.Graph Methods (==) :: ModNodeKeyWithUid -> ModNodeKeyWithUid -> Bool # (/=) :: ModNodeKeyWithUid -> ModNodeKeyWithUid -> Bool # | |
Eq ModuleGraphNode Source # | |
Defined in GHC.Unit.Module.Graph Methods (==) :: ModuleGraphNode -> ModuleGraphNode -> Bool # (/=) :: ModuleGraphNode -> ModuleGraphNode -> Bool # | |
Eq NodeKey Source # | |
Eq InWarningCategory Source # | |
Defined in GHC.Unit.Module.Warnings Methods (==) :: InWarningCategory -> InWarningCategory -> Bool # (/=) :: InWarningCategory -> InWarningCategory -> Bool # | |
Eq WarningCategory Source # | |
Defined in GHC.Unit.Module.Warnings Methods (==) :: WarningCategory -> WarningCategory -> Bool # (/=) :: WarningCategory -> WarningCategory -> Bool # | |
Eq UnitId Source # | |
Eq Option Source # | |
Eq DumpFormat Source # | |
Defined in GHC.Utils.Logger | |
Eq BindingSite Source # | |
Defined in GHC.Utils.Outputable | |
Eq JoinPointHood Source # | |
Defined in GHC.Utils.Outputable Methods (==) :: JoinPointHood -> JoinPointHood -> Bool # (/=) :: JoinPointHood -> JoinPointHood -> Bool # | |
Eq Boxity Source # | |
Eq FieldLabelString Source # | |
Defined in Language.Haskell.Syntax.Basic Methods (==) :: FieldLabelString -> FieldLabelString -> Bool # (/=) :: FieldLabelString -> FieldLabelString -> Bool # | |
Eq Role Source # | |
Eq SrcStrictness Source # | |
Defined in Language.Haskell.Syntax.Basic Methods (==) :: SrcStrictness -> SrcStrictness -> Bool # (/=) :: SrcStrictness -> SrcStrictness -> Bool # | |
Eq SrcUnpackedness Source # | |
Defined in Language.Haskell.Syntax.Basic Methods (==) :: SrcUnpackedness -> SrcUnpackedness -> Bool # (/=) :: SrcUnpackedness -> SrcUnpackedness -> Bool # | |
Eq NewOrData Source # | |
Eq SpliceDecoration Source # | |
Defined in Language.Haskell.Syntax.Decls Methods (==) :: SpliceDecoration -> SpliceDecoration -> Bool # (/=) :: SpliceDecoration -> SpliceDecoration -> Bool # | |
Eq HsDoFlavour Source # | |
Defined in Language.Haskell.Syntax.Expr | |
Eq HsLamVariant Source # | |
Defined in Language.Haskell.Syntax.Expr | |
Eq DataConCantHappen Source # | |
Defined in Language.Haskell.Syntax.Extension Methods (==) :: DataConCantHappen -> DataConCantHappen -> Bool # (/=) :: DataConCantHappen -> DataConCantHappen -> Bool # | |
Eq NoExtField Source # | |
Defined in Language.Haskell.Syntax.Extension | |
Eq IEWildcard Source # | |
Defined in Language.Haskell.Syntax.ImpExp | |
Eq ImportDeclQualifiedStyle Source # | |
Defined in Language.Haskell.Syntax.ImpExp Methods (==) :: ImportDeclQualifiedStyle -> ImportDeclQualifiedStyle -> Bool # (/=) :: ImportDeclQualifiedStyle -> ImportDeclQualifiedStyle -> Bool # | |
Eq ImportListInterpretation Source # | |
Defined in Language.Haskell.Syntax.ImpExp Methods (==) :: ImportListInterpretation -> ImportListInterpretation -> Bool # (/=) :: ImportListInterpretation -> ImportListInterpretation -> Bool # | |
Eq IsBootInterface Source # | |
Defined in Language.Haskell.Syntax.ImpExp Methods (==) :: IsBootInterface -> IsBootInterface -> Bool # (/=) :: IsBootInterface -> IsBootInterface -> Bool # | |
Eq OverLitVal Source # | |
Defined in Language.Haskell.Syntax.Lit | |
Eq ModuleName Source # | |
Defined in Language.Haskell.Syntax.Module.Name | |
Eq RecFieldsDotDot Source # | |
Defined in Language.Haskell.Syntax.Pat Methods (==) :: RecFieldsDotDot -> RecFieldsDotDot -> Bool # (/=) :: RecFieldsDotDot -> RecFieldsDotDot -> Bool # | |
Eq HsIPName Source # | |
Eq PromotionFlag Source # | |
Defined in Language.Haskell.Syntax.Type Methods (==) :: PromotionFlag -> PromotionFlag -> Bool # (/=) :: PromotionFlag -> PromotionFlag -> Bool # | |
Eq BigNat | |
Eq ShortText | |
Eq DbInstUnitId | |
Defined in GHC.Unit.Database | |
Eq DbModule | |
Eq ForeignSrcLang | |
Defined in GHC.ForeignSrcLang.Type Methods (==) :: ForeignSrcLang -> ForeignSrcLang -> Bool # (/=) :: ForeignSrcLang -> ForeignSrcLang -> Bool # | |
Eq Extension | |
Eq PrimType | |
Eq TsoFlags | |
Eq WhatNext | |
Eq WhyBlocked | |
Defined in GHC.Exts.Heap.Closures | |
Eq StgInfoTable | |
Defined in GHC.Exts.Heap.InfoTable.Types | |
Eq CostCentre | |
Defined in GHC.Exts.Heap.ProfInfo.Types | |
Eq CostCentreStack | |
Defined in GHC.Exts.Heap.ProfInfo.Types Methods (==) :: CostCentreStack -> CostCentreStack -> Bool # (/=) :: CostCentreStack -> CostCentreStack -> Bool # | |
Eq IndexTable | |
Defined in GHC.Exts.Heap.ProfInfo.Types | |
Eq StgTSOProfInfo | |
Defined in GHC.Exts.Heap.ProfInfo.Types Methods (==) :: StgTSOProfInfo -> StgTSOProfInfo -> Bool # (/=) :: StgTSOProfInfo -> StgTSOProfInfo -> Bool # | |
Eq ByteOffset | |
Defined in GHC.Exts.Stack.Constants | |
Eq WordOffset | |
Defined in GHC.Exts.Stack.Constants | |
Eq Void | |
Eq ByteOrder | |
Eq ClosureType | |
Defined in GHC.Internal.ClosureTypes | |
Eq BlockReason | |
Defined in GHC.Internal.Conc.Sync | |
Eq ThreadId | |
Eq ThreadStatus | |
Defined in GHC.Internal.Conc.Sync | |
Eq Constr | |
Eq ConstrRep | |
Eq DataRep | |
Eq Fixity | |
Eq All | |
Eq Any | |
Eq SomeTypeRep | |
Defined in GHC.Internal.Data.Typeable.Internal | |
Eq Version | |
Eq ErrorCall | |
Eq ArithException | |
Defined in GHC.Internal.Exception.Type Methods (==) :: ArithException -> ArithException -> Bool # (/=) :: ArithException -> ArithException -> Bool # | |
Eq SpecConstrAnnotation | |
Defined in GHC.Internal.Exts Methods (==) :: SpecConstrAnnotation -> SpecConstrAnnotation -> Bool # (/=) :: SpecConstrAnnotation -> SpecConstrAnnotation -> Bool # | |
Eq Fingerprint | |
Defined in GHC.Internal.Fingerprint.Type | |
Eq CBool | |
Eq CChar | |
Eq CClock | |
Eq CDouble | |
Eq CFloat | |
Eq CInt | |
Eq CIntMax | |
Eq CIntPtr | |
Eq CLLong | |
Eq CLong | |
Eq CPtrdiff | |
Eq CSChar | |
Eq CSUSeconds | |
Defined in GHC.Internal.Foreign.C.Types | |
Eq CShort | |
Eq CSigAtomic | |
Defined in GHC.Internal.Foreign.C.Types | |
Eq CSize | |
Eq CTime | |
Eq CUChar | |
Eq CUInt | |
Eq CUIntMax | |
Eq CUIntPtr | |
Eq CULLong | |
Eq CULong | |
Eq CUSeconds | |
Eq CUShort | |
Eq CWchar | |
Eq Associativity | |
Defined in GHC.Internal.Generics Methods (==) :: Associativity -> Associativity -> Bool # (/=) :: Associativity -> Associativity -> Bool # | |
Eq DecidedStrictness | |
Defined in GHC.Internal.Generics Methods (==) :: DecidedStrictness -> DecidedStrictness -> Bool # (/=) :: DecidedStrictness -> DecidedStrictness -> Bool # | |
Eq Fixity | |
Eq SourceStrictness | |
Defined in GHC.Internal.Generics Methods (==) :: SourceStrictness -> SourceStrictness -> Bool # (/=) :: SourceStrictness -> SourceStrictness -> Bool # | |
Eq SourceUnpackedness | |
Defined in GHC.Internal.Generics Methods (==) :: SourceUnpackedness -> SourceUnpackedness -> Bool # (/=) :: SourceUnpackedness -> SourceUnpackedness -> Bool # | |
Eq MaskingState | |
Defined in GHC.Internal.IO | |
Eq BufferState | |
Defined in GHC.Internal.IO.Buffer | |
Eq CodingProgress | |
Defined in GHC.Internal.IO.Encoding.Types Methods (==) :: CodingProgress -> CodingProgress -> Bool # (/=) :: CodingProgress -> CodingProgress -> Bool # | |
Eq ArrayException | |
Defined in GHC.Internal.IO.Exception Methods (==) :: ArrayException -> ArrayException -> Bool # (/=) :: ArrayException -> ArrayException -> Bool # | |
Eq AsyncException | |
Defined in GHC.Internal.IO.Exception Methods (==) :: AsyncException -> AsyncException -> Bool # (/=) :: AsyncException -> AsyncException -> Bool # | |
Eq ExitCode | |
Eq IOErrorType | |
Defined in GHC.Internal.IO.Exception | |
Eq IOException | |
Defined in GHC.Internal.IO.Exception | |
Eq HandlePosn | |
Defined in GHC.Internal.IO.Handle | |
Eq BufferMode | |
Defined in GHC.Internal.IO.Handle.Types | |
Eq Handle | |
Eq Newline | |
Eq NewlineMode | |
Defined in GHC.Internal.IO.Handle.Types | |
Eq IOMode | |
Eq Int16 | |
Eq Int32 | |
Eq Int64 | |
Eq Int8 | |
Eq IoSubSystem | |
Defined in GHC.Internal.RTS.Flags | |
Eq SrcLoc | |
Eq CBlkCnt | |
Eq CBlkSize | |
Eq CCc | |
Eq CClockId | |
Eq CDev | |
Eq CFsBlkCnt | |
Eq CFsFilCnt | |
Eq CGid | |
Eq CId | |
Eq CIno | |
Eq CKey | |
Eq CMode | |
Eq CNfds | |
Eq CNlink | |
Eq COff | |
Eq CPid | |
Eq CRLim | |
Eq CSocklen | |
Eq CSpeed | |
Eq CSsize | |
Eq CTcflag | |
Eq CTimer | |
Eq CUid | |
Eq Fd | |
Eq Lexeme | |
Eq Number | |
Eq SomeChar | |
Eq SomeSymbol | |
Defined in GHC.Internal.TypeLits | |
Eq SomeNat | |
Eq GeneralCategory | |
Defined in GHC.Internal.Unicode Methods (==) :: GeneralCategory -> GeneralCategory -> Bool # (/=) :: GeneralCategory -> GeneralCategory -> Bool # | |
Eq Word16 | |
Eq Word32 | |
Eq Word64 | |
Eq Word8 | |
Eq Arch | |
Eq ArchOS | |
Eq ArmABI | |
Eq ArmISA | |
Eq ArmISAExt | |
Eq OS | |
Eq PPC_64ABI | |
Eq Module | |
Eq Ordering | |
Eq TrName | |
Eq TyCon | |
Eq BoxLabel | |
Eq CondBox | |
Eq Mix | |
Eq Tix | |
Eq TixModule | |
Eq Hash | |
Eq HpcPos | |
Eq OsChar | |
Eq OsString | |
Eq PosixChar | |
Eq PosixString | |
Defined in System.OsString.Internal.Types | |
Eq WindowsChar | |
Defined in System.OsString.Internal.Types | |
Eq WindowsString | |
Defined in System.OsString.Internal.Types Methods (==) :: WindowsString -> WindowsString -> Bool # (/=) :: WindowsString -> WindowsString -> Bool # | |
Eq Mode | |
Eq Style | |
Eq TextDetails | |
Eq Doc | |
Eq CmdSpec | |
Eq CreateProcess | |
Defined in System.Process.Common Methods (==) :: CreateProcess -> CreateProcess -> Bool # (/=) :: CreateProcess -> CreateProcess -> Bool # | |
Eq StdStream | |
Eq SemaphoreName | |
Defined in System.Semaphore Methods (==) :: SemaphoreName -> SemaphoreName -> Bool # (/=) :: SemaphoreName -> SemaphoreName -> Bool # | |
Eq TSem | |
Eq AnnLookup | |
Eq AnnTarget | |
Eq Bang | |
Eq BndrVis | |
Eq Body | |
Eq Bytes | |
Eq Callconv | |
Eq Clause | |
Eq Con | |
Eq Dec | |
Eq DecidedStrictness | |
Defined in Language.Haskell.TH.Syntax Methods (==) :: DecidedStrictness -> DecidedStrictness -> Bool # (/=) :: DecidedStrictness -> DecidedStrictness -> Bool # | |
Eq DerivClause | |
Defined in Language.Haskell.TH.Syntax | |
Eq DerivStrategy | |
Defined in Language.Haskell.TH.Syntax Methods (==) :: DerivStrategy -> DerivStrategy -> Bool # (/=) :: DerivStrategy -> DerivStrategy -> Bool # | |
Eq DocLoc | |
Eq Exp | |
Eq FamilyResultSig | |
Defined in Language.Haskell.TH.Syntax Methods (==) :: FamilyResultSig -> FamilyResultSig -> Bool # (/=) :: FamilyResultSig -> FamilyResultSig -> Bool # | |
Eq Fixity | |
Eq FixityDirection | |
Defined in Language.Haskell.TH.Syntax Methods (==) :: FixityDirection -> FixityDirection -> Bool # (/=) :: FixityDirection -> FixityDirection -> Bool # | |
Eq Foreign | |
Eq FunDep | |
Eq Guard | |
Eq Info | |
Eq InjectivityAnn | |
Defined in Language.Haskell.TH.Syntax Methods (==) :: InjectivityAnn -> InjectivityAnn -> Bool # (/=) :: InjectivityAnn -> InjectivityAnn -> Bool # | |
Eq Inline | |
Eq Lit | |
Eq Loc | |
Eq Match | |
Eq ModName | |
Eq Module | |
Eq ModuleInfo | |
Defined in Language.Haskell.TH.Syntax | |
Eq Name | |
Eq NameFlavour | |
Defined in Language.Haskell.TH.Syntax | |
Eq NameSpace | |
Eq NamespaceSpecifier | |
Defined in Language.Haskell.TH.Syntax Methods (==) :: NamespaceSpecifier -> NamespaceSpecifier -> Bool # (/=) :: NamespaceSpecifier -> NamespaceSpecifier -> Bool # | |
Eq OccName | |
Eq Overlap | |
Eq Pat | |
Eq PatSynArgs | |
Defined in Language.Haskell.TH.Syntax | |
Eq PatSynDir | |
Eq Phases | |
Eq PkgName | |
Eq Pragma | |
Eq Range | |
Eq Role | |
Eq RuleBndr | |
Eq RuleMatch | |
Eq Safety | |
Eq SourceStrictness | |
Defined in Language.Haskell.TH.Syntax Methods (==) :: SourceStrictness -> SourceStrictness -> Bool # (/=) :: SourceStrictness -> SourceStrictness -> Bool # | |
Eq SourceUnpackedness | |
Defined in Language.Haskell.TH.Syntax Methods (==) :: SourceUnpackedness -> SourceUnpackedness -> Bool # (/=) :: SourceUnpackedness -> SourceUnpackedness -> Bool # | |
Eq Specificity | |
Defined in Language.Haskell.TH.Syntax | |
Eq Stmt | |
Eq TyLit | |
Eq TySynEqn | |
Eq Type | |
Eq TypeFamilyHead | |
Defined in Language.Haskell.TH.Syntax Methods (==) :: TypeFamilyHead -> TypeFamilyHead -> Bool # (/=) :: TypeFamilyHead -> TypeFamilyHead -> Bool # | |
Eq Day | |
Eq Month | |
Eq Quarter | |
Eq QuarterOfYear | |
Defined in Data.Time.Calendar.Quarter Methods (==) :: QuarterOfYear -> QuarterOfYear -> Bool # (/=) :: QuarterOfYear -> QuarterOfYear -> Bool # | |
Eq FirstWeekType | |
Defined in Data.Time.Calendar.WeekDate Methods (==) :: FirstWeekType -> FirstWeekType -> Bool # (/=) :: FirstWeekType -> FirstWeekType -> Bool # | |
Eq DiffTime | |
Eq UTCTime | |
Eq UniversalTime | |
Defined in Data.Time.Clock.Internal.UniversalTime Methods (==) :: UniversalTime -> UniversalTime -> Bool # (/=) :: UniversalTime -> UniversalTime -> Bool # | |
Eq LocalTime | |
Eq Advice | |
Eq CAttributes | |
Defined in System.Posix.Files.Common | |
Eq StatxFlags | |
Defined in System.Posix.Files.Common | |
Eq StatxMask | |
Eq OpenFileFlags | |
Defined in System.Posix.IO.Common Methods (==) :: OpenFileFlags -> OpenFileFlags -> Bool # (/=) :: OpenFileFlags -> OpenFileFlags -> Bool # | |
Eq OpenMode | |
Eq ProcessStatus | |
Defined in System.Posix.Process.Internals Methods (==) :: ProcessStatus -> ProcessStatus -> Bool # (/=) :: ProcessStatus -> ProcessStatus -> Bool # | |
Eq Resource | |
Eq ResourceLimit | |
Defined in System.Posix.Resource Methods (==) :: ResourceLimit -> ResourceLimit -> Bool # (/=) :: ResourceLimit -> ResourceLimit -> Bool # | |
Eq ResourceLimits | |
Defined in System.Posix.Resource Methods (==) :: ResourceLimits -> ResourceLimits -> Bool # (/=) :: ResourceLimits -> ResourceLimits -> Bool # | |
Eq Integer | |
Eq Natural | |
Eq () | |
Eq Bool | |
Eq Char | |
Eq Double | |
Eq Float | |
Eq Int | |
Eq Word | |
Eq (Chan a) | Since: base-4.4.0.0 |
Eq (MutableByteArray s) | Since: base-4.17.0.0 |
Defined in Data.Array.Byte Methods (==) :: MutableByteArray s -> MutableByteArray s -> Bool # (/=) :: MutableByteArray s -> MutableByteArray s -> Bool # | |
Eq a => Eq (Complex a) | Since: base-2.1 |
Eq a => Eq (First a) | Since: base-4.9.0.0 |
Eq a => Eq (Last a) | Since: base-4.9.0.0 |
Eq a => Eq (Max a) | Since: base-4.9.0.0 |
Eq a => Eq (Min a) | Since: base-4.9.0.0 |
Eq m => Eq (WrappedMonoid m) | Since: base-4.9.0.0 |
Defined in Data.Semigroup Methods (==) :: WrappedMonoid m -> WrappedMonoid m -> Bool # (/=) :: WrappedMonoid m -> WrappedMonoid m -> Bool # | |
Eq vertex => Eq (SCC vertex) | Since: containers-0.5.9 |
Eq a => Eq (IntMap a) | |
Eq a => Eq (Seq a) | |
Eq a => Eq (ViewL a) | |
Eq a => Eq (ViewR a) | |
Eq a => Eq (Intersection a) | |
Defined in Data.Set.Internal Methods (==) :: Intersection a -> Intersection a -> Bool # (/=) :: Intersection a -> Intersection a -> Bool # | |
Eq a => Eq (Set a) | |
Eq a => Eq (Tree a) | |
Eq v => Eq (LabelMap v) Source # | |
Eq (CoAxiom br) Source # | |
Eq (DeBruijn CoreAlt) Source # | |
Eq (DeBruijn CoreExpr) Source # | |
Eq (DeBruijn Coercion) Source # | |
Eq (DeBruijn Type) Source # | |
Eq (DeBruijn Var) Source # | |
Eq (DeBruijn a) => Eq (DeBruijn (Maybe a)) Source # | |
Eq (DeBruijn a) => Eq (DeBruijn [a]) Source # | |
Eq a => Eq (BooleanFormula a) Source # | |
Defined in GHC.Data.BooleanFormula Methods (==) :: BooleanFormula a -> BooleanFormula a -> Bool # (/=) :: BooleanFormula a -> BooleanFormula a -> Bool # | |
Eq a => Eq (LPath a) Source # | |
Eq a => Eq (Maybe a) Source # | |
Eq a => Eq (Word64Map a) Source # | |
Eq a => Eq (OnOff a) Source # | |
Eq a => Eq (HieArgs a) Source # | |
Eq a => Eq (HieType a) Source # | |
Eq a => Eq (IdentifierDetails a) Source # | |
Defined in GHC.Iface.Ext.Types Methods (==) :: IdentifierDetails a -> IdentifierDetails a -> Bool # (/=) :: IdentifierDetails a -> IdentifierDetails a -> Bool # | |
Eq a => Eq (EvidenceInfo a) Source # | |
Defined in GHC.Iface.Ext.Utils Methods (==) :: EvidenceInfo a -> EvidenceInfo a -> Bool # (/=) :: EvidenceInfo a -> EvidenceInfo a -> Bool # | |
Eq tag => Eq (AnnSortKey tag) Source # | |
Defined in GHC.Parser.Annotation Methods (==) :: AnnSortKey tag -> AnnSortKey tag -> Bool # (/=) :: AnnSortKey tag -> AnnSortKey tag -> Bool # | |
Eq ann => Eq (EpAnn ann) Source # | |
Eq (EpToken tok) Source # | |
Eq a => Eq (NonVoid a) Source # | |
Eq tc => Eq (TyConFlavour tc) Source # | |
Defined in GHC.Types.Basic Methods (==) :: TyConFlavour tc -> TyConFlavour tc -> Bool # (/=) :: TyConFlavour tc -> TyConFlavour tc -> Bool # | |
Eq a => Eq (EpaLocation' a) Source # | |
Defined in GHC.Types.SrcLoc Methods (==) :: EpaLocation' a -> EpaLocation' a -> Bool # (/=) :: EpaLocation' a -> EpaLocation' a -> Bool # | |
Eq (UniqDSet a) Source # | |
Eq (UniqSet a) Source # | |
Eq (IdP pass) => Eq (WarningTxt pass) Source # | |
Defined in GHC.Unit.Module.Warnings Methods (==) :: WarningTxt pass -> WarningTxt pass -> Bool # (/=) :: WarningTxt pass -> WarningTxt pass -> Bool # | |
Eq (IdP pass) => Eq (Warnings pass) Source # | |
Eq unit => Eq (Definite unit) Source # | |
Eq (GenInstantiatedUnit unit) Source # | |
Defined in GHC.Unit.Types Methods (==) :: GenInstantiatedUnit unit -> GenInstantiatedUnit unit -> Bool # (/=) :: GenInstantiatedUnit unit -> GenInstantiatedUnit unit -> Bool # | |
Eq unit => Eq (GenModule unit) Source # | |
IsUnitId u => Eq (GenUnit u) Source # | |
Eq mod => Eq (GenWithIsBoot mod) Source # | |
Defined in GHC.Unit.Types Methods (==) :: GenWithIsBoot mod -> GenWithIsBoot mod -> Bool # (/=) :: GenWithIsBoot mod -> GenWithIsBoot mod -> Bool # | |
Eq a => Eq (FixedLengthEncoding a) Source # | |
Defined in GHC.Utils.Binary Methods (==) :: FixedLengthEncoding a -> FixedLengthEncoding a -> Bool # (/=) :: FixedLengthEncoding a -> FixedLengthEncoding a -> Bool # | |
Eq a => Eq (DataDefnCons a) Source # | |
Defined in Language.Haskell.Syntax.Decls Methods (==) :: DataDefnCons a -> DataDefnCons a -> Bool # (/=) :: DataDefnCons a -> DataDefnCons a -> Bool # | |
Eq (IE GhcPs) Source # | |
Eq (IE GhcRn) Source # | |
Eq (IE GhcTc) Source # | |
Eq (IEWrappedName GhcPs) Source # | |
Defined in GHC.Hs.ImpExp Methods (==) :: IEWrappedName GhcPs -> IEWrappedName GhcPs -> Bool # (/=) :: IEWrappedName GhcPs -> IEWrappedName GhcPs -> Bool # | |
Eq (IEWrappedName GhcRn) Source # | |
Defined in GHC.Hs.ImpExp Methods (==) :: IEWrappedName GhcRn -> IEWrappedName GhcRn -> Bool # (/=) :: IEWrappedName GhcRn -> IEWrappedName GhcRn -> Bool # | |
Eq (IEWrappedName GhcTc) Source # | |
Defined in GHC.Hs.ImpExp Methods (==) :: IEWrappedName GhcTc -> IEWrappedName GhcTc -> Bool # (/=) :: IEWrappedName GhcTc -> IEWrappedName GhcTc -> Bool # | |
Eq (HsLit x) Source # | |
Eq (XXOverLit p) => Eq (HsOverLit p) Source # | |
(Eq (XRec pass RdrName), Eq (XCFieldOcc pass), Eq (XXFieldOcc pass)) => Eq (FieldOcc pass) Source # | |
Eq a => Eq (NonEmpty a) | |
Eq (TVar a) | |
Eq a => Eq (And a) | |
Eq a => Eq (Iff a) | |
Eq a => Eq (Ior a) | |
Eq a => Eq (Xor a) | |
Eq a => Eq (Identity a) | |
Eq a => Eq (First a) | |
Eq a => Eq (Last a) | |
Eq a => Eq (Down a) | |
Eq a => Eq (Dual a) | |
Eq a => Eq (Product a) | |
Eq a => Eq (Sum a) | |
Eq (ForeignPtr a) | |
Defined in GHC.Internal.ForeignPtr | |
Eq a => Eq (ZipList a) | |
Eq p => Eq (Par1 p) | |
Eq (IORef a) | |
Eq (MVar a) | |
Eq (FunPtr a) | |
Eq (Ptr a) | |
Eq a => Eq (Ratio a) | |
Eq (SChar c) | |
Eq (SSymbol s) | |
Eq (SNat n) | |
Eq a => Eq (AnnotDetails a) | |
Eq (Doc a) | |
Eq a => Eq (Span a) | |
Eq (TBQueue a) | |
Eq (TChan a) | |
Eq (TMVar a) | |
Eq (TQueue a) | |
Eq flag => Eq (TyVarBndr flag) | |
Eq a => Eq (Maybe a) | |
Eq a => Eq (Solo a) | |
Eq a => Eq [a] | |
(Ix ix, Eq e, IArray UArray e) => Eq (UArray ix e) | |
Eq (IOUArray i e) | |
Eq (Fixed a) | Since: base-2.1 |
Eq a => Eq (Arg a b) | Since: base-4.9.0.0 |
(Eq k, Eq a) => Eq (Map k a) | |
Eq (CmmNode e x) Source # | |
(Eq a, Ord b) => Eq (Gr a b) Source # | |
(Eq a, Eq b) => Eq (Pair a b) Source # | |
Eq (Point s a) Source # | |
(Eq (IdP pass), Eq a) => Eq (WithHsDocIdentifiers a pass) Source # | |
Defined in GHC.Hs.Doc Methods (==) :: WithHsDocIdentifiers a pass -> WithHsDocIdentifiers a pass -> Bool # (/=) :: WithHsDocIdentifiers a pass -> WithHsDocIdentifiers a pass -> Bool # | |
(Eq b, Eq r) => Eq (IfaceBindingX r b) Source # | |
Defined in GHC.Iface.Syntax Methods (==) :: IfaceBindingX r b -> IfaceBindingX r b -> Bool # (/=) :: IfaceBindingX r b -> IfaceBindingX r b -> Bool # | |
(Eq l, Eq e) => Eq (GenLocated l e) Source # | |
Defined in GHC.Types.SrcLoc Methods (==) :: GenLocated l e -> GenLocated l e -> Bool # (/=) :: GenLocated l e -> GenLocated l e -> Bool # | |
(Eq k, Eq a) => Eq (UniqMap k a) Source # | |
Eq (Bin a) Source # | |
(Ix i, Eq e) => Eq (Array i e) | |
(Eq a, Eq b) => Eq (Either a b) | |
Eq (Proxy s) | |
Eq (TypeRep a) | |
Eq (U1 p) | |
Eq (V1 p) | |
Eq (IOArray i e) | |
Eq (STRef s a) | |
(Eq i, Eq e) => Eq (TArray i e) | |
(Eq1 f, Eq a) => Eq (Lift f a) | |
(Eq1 m, Eq a) => Eq (MaybeT m a) | |
(Eq a, Eq b) => Eq (a, b) | |
Eq (STUArray s i e) | |
Eq ele => Eq (UniqFM key ele) Source # | |
Eq (STArray s i e) | |
Eq a => Eq (Const a b) | |
Eq (f a) => Eq (Ap f a) | |
Eq (f a) => Eq (Alt f a) | |
Eq (a :~: b) | |
Eq (OrderingI a b) | |
(Generic1 f, Eq (Rep1 f a)) => Eq (Generically1 f a) | |
Defined in GHC.Internal.Generics Methods (==) :: Generically1 f a -> Generically1 f a -> Bool # (/=) :: Generically1 f a -> Generically1 f a -> Bool # | |
Eq (f p) => Eq (Rec1 f p) | |
Eq (URec (Ptr ()) p) | |
Eq (URec Char p) | |
Eq (URec Double p) | |
Eq (URec Float p) | |
Eq (URec Int p) | |
Eq (URec Word p) | |
(Eq1 f, Eq a) => Eq (Backwards f a) | |
(Eq e, Eq1 m, Eq a) => Eq (ExceptT e m a) | |
(Eq1 f, Eq a) => Eq (IdentityT f a) | |
(Eq w, Eq1 m, Eq a) => Eq (WriterT w m a) | |
(Eq w, Eq1 m, Eq a) => Eq (WriterT w m a) | |
Eq a => Eq (Constant a b) | |
(Eq1 f, Eq a) => Eq (Reverse f a) | |
(Eq a, Eq b, Eq c) => Eq (a, b, c) | |
(Eq (f a), Eq (g a)) => Eq (Product f g a) | Since: base-4.18.0.0 |
(Eq (f a), Eq (g a)) => Eq (Sum f g a) | Since: base-4.18.0.0 |
Eq (a :~~: b) | |
(Eq (f p), Eq (g p)) => Eq ((f :*: g) p) | |
(Eq (f p), Eq (g p)) => Eq ((f :+: g) p) | |
Eq c => Eq (K1 i c p) | |
(Eq a, Eq b, Eq c, Eq d) => Eq (a, b, c, d) | |
Eq (f (g a)) => Eq (Compose f g a) | Since: base-4.18.0.0 |
(Graph gr, Ord a, Ord b) => Eq (OrdGr gr a b) Source # | |
(Eq uid, Eq modulename, Eq mod, Eq srcpkgid, Eq srcpkgname) => Eq (GenericUnitInfo srcpkgid srcpkgname uid modulename mod) | |
Defined in GHC.Unit.Database Methods (==) :: GenericUnitInfo srcpkgid srcpkgname uid modulename mod -> GenericUnitInfo srcpkgid srcpkgname uid modulename mod -> Bool # (/=) :: GenericUnitInfo srcpkgid srcpkgname uid modulename mod -> GenericUnitInfo srcpkgid srcpkgname uid modulename mod -> Bool # | |
Eq (f (g p)) => Eq ((f :.: g) p) | |
Eq (f p) => Eq (M1 i c f p) | |
(Eq a, Eq b, Eq c, Eq d, Eq e) => Eq (a, b, c, d, e) | |
(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f) => Eq (a, b, c, d, e, f) | |
(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g) => Eq (a, b, c, d, e, f, g) | |
(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) | |
(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) | |
(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) | |
(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) | |
(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) | |
(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) | |
(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) | |
(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) | |
Instances
Ord ByteArray | Non-lexicographic ordering. This compares the lengths of the byte arrays first and uses a lexicographic ordering if the lengths are equal. Subject to change between major versions. Since: base-4.17.0.0 |
Ord ByteString | |
Defined in Data.ByteString.Internal.Type 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 ByteString | |
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 | Lexicographic order. |
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 IntSet | |
Ord FileType | |
Defined in System.Directory.Internal.Common | |
Ord Permissions | |
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 | |
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 | |
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 PrimOp Source # | |
Ord PrimOpEffect Source # | |
Defined in GHC.Builtin.PrimOps Methods compare :: PrimOpEffect -> PrimOpEffect -> Ordering # (<) :: PrimOpEffect -> PrimOpEffect -> Bool # (<=) :: PrimOpEffect -> PrimOpEffect -> Bool # (>) :: PrimOpEffect -> PrimOpEffect -> Bool # (>=) :: PrimOpEffect -> PrimOpEffect -> Bool # max :: PrimOpEffect -> PrimOpEffect -> PrimOpEffect # min :: PrimOpEffect -> PrimOpEffect -> PrimOpEffect # | |
Ord LocalLabel Source # | |
Defined in GHC.ByteCode.Instr Methods compare :: LocalLabel -> LocalLabel -> Ordering # (<) :: LocalLabel -> LocalLabel -> Bool # (<=) :: LocalLabel -> LocalLabel -> Bool # (>) :: LocalLabel -> LocalLabel -> Bool # (>=) :: LocalLabel -> LocalLabel -> Bool # max :: LocalLabel -> LocalLabel -> LocalLabel # min :: LocalLabel -> LocalLabel -> LocalLabel # | |
Ord ByteOff Source # | |
Ord HalfWord Source # | |
Defined in GHC.ByteCode.Types | |
Ord RegBitmap Source # | |
Ord WordOff Source # | |
Ord CmmInfoTable Source # | |
Defined in GHC.Cmm Methods compare :: CmmInfoTable -> CmmInfoTable -> Ordering # (<) :: CmmInfoTable -> CmmInfoTable -> Bool # (<=) :: CmmInfoTable -> CmmInfoTable -> Bool # (>) :: CmmInfoTable -> CmmInfoTable -> Bool # (>=) :: CmmInfoTable -> CmmInfoTable -> Bool # max :: CmmInfoTable -> CmmInfoTable -> CmmInfoTable # min :: CmmInfoTable -> CmmInfoTable -> CmmInfoTable # | |
Ord ProfilingInfo Source # | |
Defined in GHC.Cmm Methods compare :: ProfilingInfo -> ProfilingInfo -> Ordering # (<) :: ProfilingInfo -> ProfilingInfo -> Bool # (<=) :: ProfilingInfo -> ProfilingInfo -> Bool # (>) :: ProfilingInfo -> ProfilingInfo -> Bool # (>=) :: ProfilingInfo -> ProfilingInfo -> Bool # max :: ProfilingInfo -> ProfilingInfo -> ProfilingInfo # min :: ProfilingInfo -> ProfilingInfo -> ProfilingInfo # | |
Ord CLabel Source # | |
Ord ConInfoTableLocation Source # | |
Defined in GHC.Cmm.CLabel Methods compare :: ConInfoTableLocation -> ConInfoTableLocation -> Ordering # (<) :: ConInfoTableLocation -> ConInfoTableLocation -> Bool # (<=) :: ConInfoTableLocation -> ConInfoTableLocation -> Bool # (>) :: ConInfoTableLocation -> ConInfoTableLocation -> Bool # (>=) :: ConInfoTableLocation -> ConInfoTableLocation -> Bool # max :: ConInfoTableLocation -> ConInfoTableLocation -> ConInfoTableLocation # min :: ConInfoTableLocation -> ConInfoTableLocation -> ConInfoTableLocation # | |
Ord DynamicLinkerLabelInfo Source # | |
Defined in GHC.Cmm.CLabel Methods compare :: DynamicLinkerLabelInfo -> DynamicLinkerLabelInfo -> Ordering # (<) :: DynamicLinkerLabelInfo -> DynamicLinkerLabelInfo -> Bool # (<=) :: DynamicLinkerLabelInfo -> DynamicLinkerLabelInfo -> Bool # (>) :: DynamicLinkerLabelInfo -> DynamicLinkerLabelInfo -> Bool # (>=) :: DynamicLinkerLabelInfo -> DynamicLinkerLabelInfo -> Bool # max :: DynamicLinkerLabelInfo -> DynamicLinkerLabelInfo -> DynamicLinkerLabelInfo # min :: DynamicLinkerLabelInfo -> DynamicLinkerLabelInfo -> DynamicLinkerLabelInfo # | |
Ord ForeignLabelSource Source # | |
Defined in GHC.Cmm.CLabel Methods compare :: ForeignLabelSource -> ForeignLabelSource -> Ordering # (<) :: ForeignLabelSource -> ForeignLabelSource -> Bool # (<=) :: ForeignLabelSource -> ForeignLabelSource -> Bool # (>) :: ForeignLabelSource -> ForeignLabelSource -> Bool # (>=) :: ForeignLabelSource -> ForeignLabelSource -> Bool # max :: ForeignLabelSource -> ForeignLabelSource -> ForeignLabelSource # min :: ForeignLabelSource -> ForeignLabelSource -> ForeignLabelSource # | |
Ord InfoProvEnt Source # | |
Defined in GHC.Cmm.CLabel Methods compare :: InfoProvEnt -> InfoProvEnt -> Ordering # (<) :: InfoProvEnt -> InfoProvEnt -> Bool # (<=) :: InfoProvEnt -> InfoProvEnt -> Bool # (>) :: InfoProvEnt -> InfoProvEnt -> Bool # (>=) :: InfoProvEnt -> InfoProvEnt -> Bool # max :: InfoProvEnt -> InfoProvEnt -> InfoProvEnt # min :: InfoProvEnt -> InfoProvEnt -> InfoProvEnt # | |
Ord NeedExternDecl Source # | |
Defined in GHC.Cmm.CLabel Methods compare :: NeedExternDecl -> NeedExternDecl -> Ordering # (<) :: NeedExternDecl -> NeedExternDecl -> Bool # (<=) :: NeedExternDecl -> NeedExternDecl -> Bool # (>) :: NeedExternDecl -> NeedExternDecl -> Bool # (>=) :: NeedExternDecl -> NeedExternDecl -> Bool # max :: NeedExternDecl -> NeedExternDecl -> NeedExternDecl # min :: NeedExternDecl -> NeedExternDecl -> NeedExternDecl # | |
Ord Label Source # | |
Ord LabelSet Source # | |
Defined in GHC.Cmm.Dataflow.Label | |
Ord RPNum Source # | |
Ord AlignmentSpec Source # | |
Defined in GHC.Cmm.Expr Methods compare :: AlignmentSpec -> AlignmentSpec -> Ordering # (<) :: AlignmentSpec -> AlignmentSpec -> Bool # (<=) :: AlignmentSpec -> AlignmentSpec -> Bool # (>) :: AlignmentSpec -> AlignmentSpec -> Bool # (>=) :: AlignmentSpec -> AlignmentSpec -> Bool # max :: AlignmentSpec -> AlignmentSpec -> AlignmentSpec # min :: AlignmentSpec -> AlignmentSpec -> AlignmentSpec # | |
Ord Area Source # | |
Ord MemoryOrdering Source # | |
Defined in GHC.Cmm.MachOp Methods compare :: MemoryOrdering -> MemoryOrdering -> Ordering # (<) :: MemoryOrdering -> MemoryOrdering -> Bool # (<=) :: MemoryOrdering -> MemoryOrdering -> Bool # (>) :: MemoryOrdering -> MemoryOrdering -> Bool # (>=) :: MemoryOrdering -> MemoryOrdering -> Bool # max :: MemoryOrdering -> MemoryOrdering -> MemoryOrdering # min :: MemoryOrdering -> MemoryOrdering -> MemoryOrdering # | |
Ord CmmTickScope Source # | |
Defined in GHC.Cmm.Node Methods compare :: CmmTickScope -> CmmTickScope -> Ordering # (<) :: CmmTickScope -> CmmTickScope -> Bool # (<=) :: CmmTickScope -> CmmTickScope -> Bool # (>) :: CmmTickScope -> CmmTickScope -> Bool # (>=) :: CmmTickScope -> CmmTickScope -> Bool # max :: CmmTickScope -> CmmTickScope -> CmmTickScope # min :: CmmTickScope -> CmmTickScope -> CmmTickScope # | |
Ord CmmReg Source # | |
Ord GlobalReg Source # | |
Ord GlobalRegUse Source # | |
Defined in GHC.Cmm.Reg Methods compare :: GlobalRegUse -> GlobalRegUse -> Ordering # (<) :: GlobalRegUse -> GlobalRegUse -> Bool # (<=) :: GlobalRegUse -> GlobalRegUse -> Bool # (>) :: GlobalRegUse -> GlobalRegUse -> Bool # (>=) :: GlobalRegUse -> GlobalRegUse -> Bool # max :: GlobalRegUse -> GlobalRegUse -> GlobalRegUse # min :: GlobalRegUse -> GlobalRegUse -> GlobalRegUse # | |
Ord LocalReg Source # | |
Defined in GHC.Cmm.Reg | |
Ord Width Source # | |
Ord Target Source # | |
Ord CfgEdge Source # | Edges are sorted ascending pointwise by weight, source and destination |
Ord EdgeWeight Source # | |
Defined in GHC.CmmToAsm.CFG Methods compare :: EdgeWeight -> EdgeWeight -> Ordering # (<) :: EdgeWeight -> EdgeWeight -> Bool # (<=) :: EdgeWeight -> EdgeWeight -> Bool # (>) :: EdgeWeight -> EdgeWeight -> Bool # (>=) :: EdgeWeight -> EdgeWeight -> Bool # max :: EdgeWeight -> EdgeWeight -> EdgeWeight # min :: EdgeWeight -> EdgeWeight -> EdgeWeight # | |
Ord RegSub Source # | |
Ord Loc Source # | |
Ord SymName Source # | |
Defined in GHC.CmmToAsm.Wasm.Types | |
Ord LlvmVersion Source # | |
Defined in GHC.CmmToLlvm.Version.Type Methods compare :: LlvmVersion -> LlvmVersion -> Ordering # (<) :: LlvmVersion -> LlvmVersion -> Bool # (<=) :: LlvmVersion -> LlvmVersion -> Bool # (>) :: LlvmVersion -> LlvmVersion -> Bool # (>=) :: LlvmVersion -> LlvmVersion -> Bool # max :: LlvmVersion -> LlvmVersion -> LlvmVersion # min :: LlvmVersion -> LlvmVersion -> LlvmVersion # | |
Ord AltCon Source # | |
Ord CoAxiomRule Source # | |
Defined in GHC.Core.Coercion.Axiom Methods compare :: CoAxiomRule -> CoAxiomRule -> Ordering # (<) :: CoAxiomRule -> CoAxiomRule -> Bool # (<=) :: CoAxiomRule -> CoAxiomRule -> Bool # (>) :: CoAxiomRule -> CoAxiomRule -> Bool # (>=) :: CoAxiomRule -> CoAxiomRule -> Bool # max :: CoAxiomRule -> CoAxiomRule -> CoAxiomRule # min :: CoAxiomRule -> CoAxiomRule -> CoAxiomRule # | |
Ord Tick Source # | |
Ord EqRel Source # | |
Ord PrimElemRep Source # | |
Defined in GHC.Core.TyCon Methods compare :: PrimElemRep -> PrimElemRep -> Ordering # (<) :: PrimElemRep -> PrimElemRep -> Bool # (<=) :: PrimElemRep -> PrimElemRep -> Bool # (>) :: PrimElemRep -> PrimElemRep -> Bool # (>=) :: PrimElemRep -> PrimElemRep -> Bool # max :: PrimElemRep -> PrimElemRep -> PrimElemRep # min :: PrimElemRep -> PrimElemRep -> PrimElemRep # | |
Ord PrimRep Source # | |
Ord OverridingBool Source # | Since: ghc-9.4.1 |
Defined in GHC.Data.Bool Methods compare :: OverridingBool -> OverridingBool -> Ordering # (<) :: OverridingBool -> OverridingBool -> Bool # (<=) :: OverridingBool -> OverridingBool -> Bool # (>) :: OverridingBool -> OverridingBool -> Bool # (>=) :: OverridingBool -> OverridingBool -> Bool # max :: OverridingBool -> OverridingBool -> OverridingBool # min :: OverridingBool -> OverridingBool -> OverridingBool # | |
Ord LexicalFastString Source # | |
Defined in GHC.Data.FastString Methods compare :: LexicalFastString -> LexicalFastString -> Ordering # (<) :: LexicalFastString -> LexicalFastString -> Bool # (<=) :: LexicalFastString -> LexicalFastString -> Bool # (>) :: LexicalFastString -> LexicalFastString -> Bool # (>=) :: LexicalFastString -> LexicalFastString -> Bool # max :: LexicalFastString -> LexicalFastString -> LexicalFastString # min :: LexicalFastString -> LexicalFastString -> LexicalFastString # | |
Ord NonDetFastString Source # | |
Defined in GHC.Data.FastString Methods compare :: NonDetFastString -> NonDetFastString -> Ordering # (<) :: NonDetFastString -> NonDetFastString -> Bool # (<=) :: NonDetFastString -> NonDetFastString -> Bool # (>) :: NonDetFastString -> NonDetFastString -> Bool # (>=) :: NonDetFastString -> NonDetFastString -> Bool # max :: NonDetFastString -> NonDetFastString -> NonDetFastString # min :: NonDetFastString -> NonDetFastString -> NonDetFastString # | |
Ord EdgeType Source # | |
Defined in GHC.Data.Graph.Directed | |
Ord Word64Set Source # | |
Ord DynamicTooState Source # | |
Defined in GHC.Driver.DynFlags Methods compare :: DynamicTooState -> DynamicTooState -> Ordering # (<) :: DynamicTooState -> DynamicTooState -> Bool # (<=) :: DynamicTooState -> DynamicTooState -> Bool # (>) :: DynamicTooState -> DynamicTooState -> Bool # (>=) :: DynamicTooState -> DynamicTooState -> Bool # max :: DynamicTooState -> DynamicTooState -> DynamicTooState # min :: DynamicTooState -> DynamicTooState -> DynamicTooState # | |
Ord WarningFlag Source # | |
Defined in GHC.Driver.Flags Methods compare :: WarningFlag -> WarningFlag -> Ordering # (<) :: WarningFlag -> WarningFlag -> Bool # (<=) :: WarningFlag -> WarningFlag -> Bool # (>) :: WarningFlag -> WarningFlag -> Bool # (>=) :: WarningFlag -> WarningFlag -> Bool # max :: WarningFlag -> WarningFlag -> WarningFlag # min :: WarningFlag -> WarningFlag -> WarningFlag # | |
Ord HsDocStringChunk Source # | |
Defined in GHC.Hs.DocString Methods compare :: HsDocStringChunk -> HsDocStringChunk -> Ordering # (<) :: HsDocStringChunk -> HsDocStringChunk -> Bool # (<=) :: HsDocStringChunk -> HsDocStringChunk -> Bool # (>) :: HsDocStringChunk -> HsDocStringChunk -> Bool # (>=) :: HsDocStringChunk -> HsDocStringChunk -> Bool # max :: HsDocStringChunk -> HsDocStringChunk -> HsDocStringChunk # min :: HsDocStringChunk -> HsDocStringChunk -> HsDocStringChunk # | |
Ord HsDocStringDecorator Source # | |
Defined in GHC.Hs.DocString Methods compare :: HsDocStringDecorator -> HsDocStringDecorator -> Ordering # (<) :: HsDocStringDecorator -> HsDocStringDecorator -> Bool # (<=) :: HsDocStringDecorator -> HsDocStringDecorator -> Bool # (>) :: HsDocStringDecorator -> HsDocStringDecorator -> Bool # (>=) :: HsDocStringDecorator -> HsDocStringDecorator -> Bool # max :: HsDocStringDecorator -> HsDocStringDecorator -> HsDocStringDecorator # min :: HsDocStringDecorator -> HsDocStringDecorator -> HsDocStringDecorator # | |
Ord BindType Source # | |
Defined in GHC.Iface.Ext.Types | |
Ord ContextInfo Source # | |
Defined in GHC.Iface.Ext.Types Methods compare :: ContextInfo -> ContextInfo -> Ordering # (<) :: ContextInfo -> ContextInfo -> Bool # (<=) :: ContextInfo -> ContextInfo -> Bool # (>) :: ContextInfo -> ContextInfo -> Bool # (>=) :: ContextInfo -> ContextInfo -> Bool # max :: ContextInfo -> ContextInfo -> ContextInfo # min :: ContextInfo -> ContextInfo -> ContextInfo # | |
Ord DeclType Source # | |
Defined in GHC.Iface.Ext.Types | |
Ord EvBindDeps Source # | |
Defined in GHC.Iface.Ext.Types Methods compare :: EvBindDeps -> EvBindDeps -> Ordering # (<) :: EvBindDeps -> EvBindDeps -> Bool # (<=) :: EvBindDeps -> EvBindDeps -> Bool # (>) :: EvBindDeps -> EvBindDeps -> Bool # (>=) :: EvBindDeps -> EvBindDeps -> Bool # max :: EvBindDeps -> EvBindDeps -> EvBindDeps # min :: EvBindDeps -> EvBindDeps -> EvBindDeps # | |
Ord EvVarSource Source # | |
Defined in GHC.Iface.Ext.Types Methods compare :: EvVarSource -> EvVarSource -> Ordering # (<) :: EvVarSource -> EvVarSource -> Bool # (<=) :: EvVarSource -> EvVarSource -> Bool # (>) :: EvVarSource -> EvVarSource -> Bool # (>=) :: EvVarSource -> EvVarSource -> Bool # max :: EvVarSource -> EvVarSource -> EvVarSource # min :: EvVarSource -> EvVarSource -> EvVarSource # | |
Ord HieName Source # | |
Ord IEType Source # | |
Ord NodeAnnotation Source # | |
Defined in GHC.Iface.Ext.Types Methods compare :: NodeAnnotation -> NodeAnnotation -> Ordering # (<) :: NodeAnnotation -> NodeAnnotation -> Bool # (<=) :: NodeAnnotation -> NodeAnnotation -> Bool # (>) :: NodeAnnotation -> NodeAnnotation -> Bool # (>=) :: NodeAnnotation -> NodeAnnotation -> Bool # max :: NodeAnnotation -> NodeAnnotation -> NodeAnnotation # min :: NodeAnnotation -> NodeAnnotation -> NodeAnnotation # | |
Ord NodeOrigin Source # | |
Defined in GHC.Iface.Ext.Types Methods compare :: NodeOrigin -> NodeOrigin -> Ordering # (<) :: NodeOrigin -> NodeOrigin -> Bool # (<=) :: NodeOrigin -> NodeOrigin -> Bool # (>) :: NodeOrigin -> NodeOrigin -> Bool # (>=) :: NodeOrigin -> NodeOrigin -> Bool # max :: NodeOrigin -> NodeOrigin -> NodeOrigin # min :: NodeOrigin -> NodeOrigin -> NodeOrigin # | |
Ord RecFieldContext Source # | |
Defined in GHC.Iface.Ext.Types Methods compare :: RecFieldContext -> RecFieldContext -> Ordering # (<) :: RecFieldContext -> RecFieldContext -> Bool # (<=) :: RecFieldContext -> RecFieldContext -> Bool # (>) :: RecFieldContext -> RecFieldContext -> Bool # (>=) :: RecFieldContext -> RecFieldContext -> Bool # max :: RecFieldContext -> RecFieldContext -> RecFieldContext # min :: RecFieldContext -> RecFieldContext -> RecFieldContext # | |
Ord Scope Source # | |
Ord TyVarScope Source # | |
Defined in GHC.Iface.Ext.Types Methods compare :: TyVarScope -> TyVarScope -> Ordering # (<) :: TyVarScope -> TyVarScope -> Bool # (<=) :: TyVarScope -> TyVarScope -> Bool # (>) :: TyVarScope -> TyVarScope -> Bool # (>=) :: TyVarScope -> TyVarScope -> Bool # max :: TyVarScope -> TyVarScope -> TyVarScope # min :: TyVarScope -> TyVarScope -> TyVarScope # | |
Ord UnfoldingExposure Source # | |
Defined in GHC.Iface.Tidy Methods compare :: UnfoldingExposure -> UnfoldingExposure -> Ordering # (<) :: UnfoldingExposure -> UnfoldingExposure -> Bool # (<=) :: UnfoldingExposure -> UnfoldingExposure -> Bool # (>) :: UnfoldingExposure -> UnfoldingExposure -> Bool # (>=) :: UnfoldingExposure -> UnfoldingExposure -> Bool # max :: UnfoldingExposure -> UnfoldingExposure -> UnfoldingExposure # min :: UnfoldingExposure -> UnfoldingExposure -> UnfoldingExposure # | |
Ord AOp Source # | |
Ord Op Source # | |
Ord UOp Source # | |
Ord AOp Source # | |
Ord Op Source # | |
Ord UOp Source # | |
Ord MetaId Source # | |
Ord AnnKeywordId Source # | |
Defined in GHC.Parser.Annotation Methods compare :: AnnKeywordId -> AnnKeywordId -> Ordering # (<) :: AnnKeywordId -> AnnKeywordId -> Bool # (<=) :: AnnKeywordId -> AnnKeywordId -> Bool # (>) :: AnnKeywordId -> AnnKeywordId -> Bool # (>=) :: AnnKeywordId -> AnnKeywordId -> Bool # max :: AnnKeywordId -> AnnKeywordId -> AnnKeywordId # min :: AnnKeywordId -> AnnKeywordId -> AnnKeywordId # | |
Ord BindTag Source # | |
Defined in GHC.Parser.Annotation | |
Ord DeclTag Source # | |
Defined in GHC.Parser.Annotation | |
Ord HasE Source # | |
Ord IsUnicodeSyntax Source # | |
Defined in GHC.Parser.Annotation Methods compare :: IsUnicodeSyntax -> IsUnicodeSyntax -> Ordering # (<) :: IsUnicodeSyntax -> IsUnicodeSyntax -> Bool # (<=) :: IsUnicodeSyntax -> IsUnicodeSyntax -> Bool # (>) :: IsUnicodeSyntax -> IsUnicodeSyntax -> Bool # (>=) :: IsUnicodeSyntax -> IsUnicodeSyntax -> Bool # max :: IsUnicodeSyntax -> IsUnicodeSyntax -> IsUnicodeSyntax # min :: IsUnicodeSyntax -> IsUnicodeSyntax -> IsUnicodeSyntax # | |
Ord NameAdornment Source # | |
Defined in GHC.Parser.Annotation Methods compare :: NameAdornment -> NameAdornment -> Ordering # (<) :: NameAdornment -> NameAdornment -> Bool # (<=) :: NameAdornment -> NameAdornment -> Bool # (>) :: NameAdornment -> NameAdornment -> Bool # (>=) :: NameAdornment -> NameAdornment -> Bool # max :: NameAdornment -> NameAdornment -> NameAdornment # min :: NameAdornment -> NameAdornment -> NameAdornment # | |
Ord NoEpAnns Source # | |
Defined in GHC.Parser.Annotation | |
Ord ParenType Source # | |
Ord LexErrKind Source # | |
Defined in GHC.Parser.Errors.Types Methods compare :: LexErrKind -> LexErrKind -> Ordering # (<) :: LexErrKind -> LexErrKind -> Bool # (<=) :: LexErrKind -> LexErrKind -> Bool # (>) :: LexErrKind -> LexErrKind -> Bool # (>=) :: LexErrKind -> LexErrKind -> Bool # max :: LexErrKind -> LexErrKind -> LexErrKind # min :: LexErrKind -> LexErrKind -> LexErrKind # | |
Ord NumUnderscoreReason Source # | |
Defined in GHC.Parser.Errors.Types Methods compare :: NumUnderscoreReason -> NumUnderscoreReason -> Ordering # (<) :: NumUnderscoreReason -> NumUnderscoreReason -> Bool # (<=) :: NumUnderscoreReason -> NumUnderscoreReason -> Bool # (>) :: NumUnderscoreReason -> NumUnderscoreReason -> Bool # (>=) :: NumUnderscoreReason -> NumUnderscoreReason -> Bool # max :: NumUnderscoreReason -> NumUnderscoreReason -> NumUnderscoreReason # min :: NumUnderscoreReason -> NumUnderscoreReason -> NumUnderscoreReason # | |
Ord BmiVersion Source # | |
Defined in GHC.Platform Methods compare :: BmiVersion -> BmiVersion -> Ordering # (<) :: BmiVersion -> BmiVersion -> Bool # (<=) :: BmiVersion -> BmiVersion -> Bool # (>) :: BmiVersion -> BmiVersion -> Bool # (>=) :: BmiVersion -> BmiVersion -> Bool # max :: BmiVersion -> BmiVersion -> BmiVersion # min :: BmiVersion -> BmiVersion -> BmiVersion # | |
Ord Platform Source # | |
Defined in GHC.Platform | |
Ord PlatformWordSize Source # | |
Defined in GHC.Platform Methods compare :: PlatformWordSize -> PlatformWordSize -> Ordering # (<) :: PlatformWordSize -> PlatformWordSize -> Bool # (<=) :: PlatformWordSize -> PlatformWordSize -> Bool # (>) :: PlatformWordSize -> PlatformWordSize -> Bool # (>=) :: PlatformWordSize -> PlatformWordSize -> Bool # max :: PlatformWordSize -> PlatformWordSize -> PlatformWordSize # min :: PlatformWordSize -> PlatformWordSize -> PlatformWordSize # | |
Ord SseVersion Source # | |
Defined in GHC.Platform Methods compare :: SseVersion -> SseVersion -> Ordering # (<) :: SseVersion -> SseVersion -> Bool # (<=) :: SseVersion -> SseVersion -> Bool # (>) :: SseVersion -> SseVersion -> Bool # (>=) :: SseVersion -> SseVersion -> Bool # max :: SseVersion -> SseVersion -> SseVersion # min :: SseVersion -> SseVersion -> SseVersion # | |
Ord PlatformConstants Source # | |
Defined in GHC.Platform.Constants Methods compare :: PlatformConstants -> PlatformConstants -> Ordering # (<) :: PlatformConstants -> PlatformConstants -> Bool # (<=) :: PlatformConstants -> PlatformConstants -> Bool # (>) :: PlatformConstants -> PlatformConstants -> Bool # (>=) :: PlatformConstants -> PlatformConstants -> Bool # max :: PlatformConstants -> PlatformConstants -> PlatformConstants # min :: PlatformConstants -> PlatformConstants -> PlatformConstants # | |
Ord Profile Source # | |
Defined in GHC.Platform.Profile | |
Ord RealReg Source # | |
Ord Reg Source # | |
Ord VirtualReg Source # | |
Defined in GHC.Platform.Reg Methods compare :: VirtualReg -> VirtualReg -> Ordering # (<) :: VirtualReg -> VirtualReg -> Bool # (<=) :: VirtualReg -> VirtualReg -> Bool # (>) :: VirtualReg -> VirtualReg -> Bool # (>=) :: VirtualReg -> VirtualReg -> Bool # max :: VirtualReg -> VirtualReg -> VirtualReg # min :: VirtualReg -> VirtualReg -> VirtualReg # | |
Ord Way Source # | |
Ord ArgDescr Source # | |
Defined in GHC.Runtime.Heap.Layout | |
Ord ClosureTypeInfo Source # | |
Defined in GHC.Runtime.Heap.Layout Methods compare :: ClosureTypeInfo -> ClosureTypeInfo -> Ordering # (<) :: ClosureTypeInfo -> ClosureTypeInfo -> Bool # (<=) :: ClosureTypeInfo -> ClosureTypeInfo -> Bool # (>) :: ClosureTypeInfo -> ClosureTypeInfo -> Bool # (>=) :: ClosureTypeInfo -> ClosureTypeInfo -> Bool # max :: ClosureTypeInfo -> ClosureTypeInfo -> ClosureTypeInfo # min :: ClosureTypeInfo -> ClosureTypeInfo -> ClosureTypeInfo # | |
Ord SMRep Source # | |
Ord StgLiftConfig Source # | |
Defined in GHC.Stg.Lift.Config Methods compare :: StgLiftConfig -> StgLiftConfig -> Ordering # (<) :: StgLiftConfig -> StgLiftConfig -> Bool # (<=) :: StgLiftConfig -> StgLiftConfig -> Bool # (>) :: StgLiftConfig -> StgLiftConfig -> Bool # (>=) :: StgLiftConfig -> StgLiftConfig -> Bool # max :: StgLiftConfig -> StgLiftConfig -> StgLiftConfig # min :: StgLiftConfig -> StgLiftConfig -> StgLiftConfig # | |
Ord StgToDo Source # | |
Ord NoExtFieldSilent Source # | |
Defined in GHC.Stg.Syntax Methods compare :: NoExtFieldSilent -> NoExtFieldSilent -> Ordering # (<) :: NoExtFieldSilent -> NoExtFieldSilent -> Bool # (<=) :: NoExtFieldSilent -> NoExtFieldSilent -> Bool # (>) :: NoExtFieldSilent -> NoExtFieldSilent -> Bool # (>=) :: NoExtFieldSilent -> NoExtFieldSilent -> Bool # max :: NoExtFieldSilent -> NoExtFieldSilent -> NoExtFieldSilent # min :: NoExtFieldSilent -> NoExtFieldSilent -> NoExtFieldSilent # | |
Ord BlockRef Source # | |
Defined in GHC.StgToJS.Object | |
Ord ExportedFun Source # | |
Defined in GHC.StgToJS.Object Methods compare :: ExportedFun -> ExportedFun -> Ordering # (<) :: ExportedFun -> ExportedFun -> Bool # (<=) :: ExportedFun -> ExportedFun -> Bool # (>) :: ExportedFun -> ExportedFun -> Bool # (>=) :: ExportedFun -> ExportedFun -> Bool # max :: ExportedFun -> ExportedFun -> ExportedFun # min :: ExportedFun -> ExportedFun -> ExportedFun # | |
Ord JSOptions Source # | |
Ord ObjectKind Source # | |
Defined in GHC.StgToJS.Object Methods compare :: ObjectKind -> ObjectKind -> Ordering # (<) :: ObjectKind -> ObjectKind -> Bool # (<=) :: ObjectKind -> ObjectKind -> Bool # (>) :: ObjectKind -> ObjectKind -> Bool # (>=) :: ObjectKind -> ObjectKind -> Bool # max :: ObjectKind -> ObjectKind -> ObjectKind # min :: ObjectKind -> ObjectKind -> ObjectKind # | |
Ord StgReg Source # | |
Ord StgRet Source # | |
Ord CILayout Source # | |
Defined in GHC.StgToJS.Types | |
Ord CIRegs Source # | |
Ord CIType Source # | |
Ord ClosureType Source # | |
Defined in GHC.StgToJS.Types 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 ExpFun Source # | |
Ord IdKey Source # | |
Ord IdType Source # | |
Ord JSFFIType Source # | |
Ord JSRep Source # | |
Ord OtherSymb Source # | |
Ord StackSlot Source # | |
Ord StaticUnboxed Source # | |
Defined in GHC.StgToJS.Types Methods compare :: StaticUnboxed -> StaticUnboxed -> Ordering # (<) :: StaticUnboxed -> StaticUnboxed -> Bool # (<=) :: StaticUnboxed -> StaticUnboxed -> Bool # (>) :: StaticUnboxed -> StaticUnboxed -> Bool # (>=) :: StaticUnboxed -> StaticUnboxed -> Bool # max :: StaticUnboxed -> StaticUnboxed -> StaticUnboxed # min :: StaticUnboxed -> StaticUnboxed -> StaticUnboxed # | |
Ord ThreadStatus Source # | |
Defined in GHC.StgToJS.Types 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 HoleFitSortingAlg Source # | |
Defined in GHC.Tc.Errors.Hole Methods compare :: HoleFitSortingAlg -> HoleFitSortingAlg -> Ordering # (<) :: HoleFitSortingAlg -> HoleFitSortingAlg -> Bool # (<=) :: HoleFitSortingAlg -> HoleFitSortingAlg -> Bool # (>) :: HoleFitSortingAlg -> HoleFitSortingAlg -> Bool # (>=) :: HoleFitSortingAlg -> HoleFitSortingAlg -> Bool # max :: HoleFitSortingAlg -> HoleFitSortingAlg -> HoleFitSortingAlg # min :: HoleFitSortingAlg -> HoleFitSortingAlg -> HoleFitSortingAlg # | |
Ord HoleFit Source # | |
Defined in GHC.Tc.Errors.Hole.FitTypes | |
Ord HoleFitCandidate Source # | |
Defined in GHC.Tc.Errors.Hole.FitTypes Methods compare :: HoleFitCandidate -> HoleFitCandidate -> Ordering # (<) :: HoleFitCandidate -> HoleFitCandidate -> Bool # (<=) :: HoleFitCandidate -> HoleFitCandidate -> Bool # (>) :: HoleFitCandidate -> HoleFitCandidate -> Bool # (>=) :: HoleFitCandidate -> HoleFitCandidate -> Bool # max :: HoleFitCandidate -> HoleFitCandidate -> HoleFitCandidate # min :: HoleFitCandidate -> HoleFitCandidate -> HoleFitCandidate # | |
Ord DocLoc Source # | |
Ord SubGoalDepth Source # | |
Defined in GHC.Tc.Types.Constraint Methods compare :: SubGoalDepth -> SubGoalDepth -> Ordering # (<) :: SubGoalDepth -> SubGoalDepth -> Bool # (<=) :: SubGoalDepth -> SubGoalDepth -> Bool # (>) :: SubGoalDepth -> SubGoalDepth -> Bool # (>=) :: SubGoalDepth -> SubGoalDepth -> Bool # max :: SubGoalDepth -> SubGoalDepth -> SubGoalDepth # min :: SubGoalDepth -> SubGoalDepth -> SubGoalDepth # | |
Ord TcLevel Source # | |
Ord Alignment Source # | |
Ord FunctionOrData Source # | |
Defined in GHC.Types.Basic Methods compare :: FunctionOrData -> FunctionOrData -> Ordering # (<) :: FunctionOrData -> FunctionOrData -> Bool # (<=) :: FunctionOrData -> FunctionOrData -> Bool # (>) :: FunctionOrData -> FunctionOrData -> Bool # (>=) :: FunctionOrData -> FunctionOrData -> Bool # max :: FunctionOrData -> FunctionOrData -> FunctionOrData # min :: FunctionOrData -> FunctionOrData -> FunctionOrData # | |
Ord IntWithInf Source # | |
Defined in GHC.Types.Basic Methods compare :: IntWithInf -> IntWithInf -> Ordering # (<) :: IntWithInf -> IntWithInf -> Bool # (<=) :: IntWithInf -> IntWithInf -> Bool # (>) :: IntWithInf -> IntWithInf -> Bool # (>=) :: IntWithInf -> IntWithInf -> Bool # max :: IntWithInf -> IntWithInf -> IntWithInf # min :: IntWithInf -> IntWithInf -> IntWithInf # | |
Ord Levity Source # | |
Ord PprPrec Source # | |
Ord TypeOrConstraint Source # | |
Defined in GHC.Types.Basic Methods compare :: TypeOrConstraint -> TypeOrConstraint -> Ordering # (<) :: TypeOrConstraint -> TypeOrConstraint -> Bool # (<=) :: TypeOrConstraint -> TypeOrConstraint -> Bool # (>) :: TypeOrConstraint -> TypeOrConstraint -> Bool # (>=) :: TypeOrConstraint -> TypeOrConstraint -> Bool # max :: TypeOrConstraint -> TypeOrConstraint -> TypeOrConstraint # min :: TypeOrConstraint -> TypeOrConstraint -> TypeOrConstraint # | |
Ord CCFlavour Source # | |
Ord CostCentre Source # | |
Defined in GHC.Types.CostCentre 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 Source # | |
Defined in GHC.Types.CostCentre 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 CostCentreIndex Source # | |
Defined in GHC.Types.CostCentre.State Methods compare :: CostCentreIndex -> CostCentreIndex -> Ordering # (<) :: CostCentreIndex -> CostCentreIndex -> Bool # (<=) :: CostCentreIndex -> CostCentreIndex -> Bool # (>) :: CostCentreIndex -> CostCentreIndex -> Bool # (>=) :: CostCentreIndex -> CostCentreIndex -> Bool # max :: CostCentreIndex -> CostCentreIndex -> CostCentreIndex # min :: CostCentreIndex -> CostCentreIndex -> CostCentreIndex # | |
Ord DiagnosticCode Source # | |
Defined in GHC.Types.Error Methods compare :: DiagnosticCode -> DiagnosticCode -> Ordering # (<) :: DiagnosticCode -> DiagnosticCode -> Bool # (<=) :: DiagnosticCode -> DiagnosticCode -> Bool # (>) :: DiagnosticCode -> DiagnosticCode -> Bool # (>=) :: DiagnosticCode -> DiagnosticCode -> Bool # max :: DiagnosticCode -> DiagnosticCode -> DiagnosticCode # min :: DiagnosticCode -> DiagnosticCode -> DiagnosticCode # | |
Ord Severity Source # | |
Defined in GHC.Types.Error | |
Ord CafInfo Source # | |
Ord LitNumType Source # | |
Defined in GHC.Types.Literal Methods compare :: LitNumType -> LitNumType -> Ordering # (<) :: LitNumType -> LitNumType -> Bool # (<=) :: LitNumType -> LitNumType -> Bool # (>) :: LitNumType -> LitNumType -> Bool # (>=) :: LitNumType -> LitNumType -> Bool # max :: LitNumType -> LitNumType -> LitNumType # min :: LitNumType -> LitNumType -> LitNumType # | |
Ord Literal Source # | Needed for the |
Ord Name Source # | Caution: This instance is implemented via See |
Ord NameSpace Source # | |
Ord OccName Source # | |
Defined in GHC.Types.Name.Occurrence | |
Ord RdrName Source # | |
Defined in GHC.Types.Name.Reader | |
Ord PkgQual Source # | |
Ord SlotTy Source # | |
Ord SaneDouble Source # | |
Defined in GHC.Types.SaneDouble Methods compare :: SaneDouble -> SaneDouble -> Ordering # (<) :: SaneDouble -> SaneDouble -> Bool # (<=) :: SaneDouble -> SaneDouble -> Bool # (>) :: SaneDouble -> SaneDouble -> Bool # (>=) :: SaneDouble -> SaneDouble -> Bool # max :: SaneDouble -> SaneDouble -> SaneDouble # min :: SaneDouble -> SaneDouble -> SaneDouble # | |
Ord HsBootOrSig Source # | |
Defined in GHC.Types.SourceFile Methods compare :: HsBootOrSig -> HsBootOrSig -> Ordering # (<) :: HsBootOrSig -> HsBootOrSig -> Bool # (<=) :: HsBootOrSig -> HsBootOrSig -> Bool # (>) :: HsBootOrSig -> HsBootOrSig -> Bool # (>=) :: HsBootOrSig -> HsBootOrSig -> Bool # max :: HsBootOrSig -> HsBootOrSig -> HsBootOrSig # min :: HsBootOrSig -> HsBootOrSig -> HsBootOrSig # | |
Ord HscSource Source # | |
Ord FractionalExponentBase Source # | |
Defined in GHC.Types.SourceText Methods compare :: FractionalExponentBase -> FractionalExponentBase -> Ordering # (<) :: FractionalExponentBase -> FractionalExponentBase -> Bool # (<=) :: FractionalExponentBase -> FractionalExponentBase -> Bool # (>) :: FractionalExponentBase -> FractionalExponentBase -> Bool # (>=) :: FractionalExponentBase -> FractionalExponentBase -> Bool # max :: FractionalExponentBase -> FractionalExponentBase -> FractionalExponentBase # min :: FractionalExponentBase -> FractionalExponentBase -> FractionalExponentBase # | |
Ord FractionalLit Source # | Be wary of using this instance to compare for equal *values* when exponents are large. The same value expressed in different syntactic form won't compare as equal when any of the exponents is >= 100. |
Defined in GHC.Types.SourceText Methods compare :: FractionalLit -> FractionalLit -> Ordering # (<) :: FractionalLit -> FractionalLit -> Bool # (<=) :: FractionalLit -> FractionalLit -> Bool # (>) :: FractionalLit -> FractionalLit -> Bool # (>=) :: FractionalLit -> FractionalLit -> Bool # max :: FractionalLit -> FractionalLit -> FractionalLit # min :: FractionalLit -> FractionalLit -> FractionalLit # | |
Ord IntegralLit Source # | |
Defined in GHC.Types.SourceText Methods compare :: IntegralLit -> IntegralLit -> Ordering # (<) :: IntegralLit -> IntegralLit -> Bool # (<=) :: IntegralLit -> IntegralLit -> Bool # (>) :: IntegralLit -> IntegralLit -> Bool # (>=) :: IntegralLit -> IntegralLit -> Bool # max :: IntegralLit -> IntegralLit -> IntegralLit # min :: IntegralLit -> IntegralLit -> IntegralLit # | |
Ord BufPos Source # | |
Ord BufSpan Source # | |
Ord DeltaPos Source # | |
Defined in GHC.Types.SrcLoc | |
Ord NoComments Source # | |
Defined in GHC.Types.SrcLoc Methods compare :: NoComments -> NoComments -> Ordering # (<) :: NoComments -> NoComments -> Bool # (<=) :: NoComments -> NoComments -> Bool # (>) :: NoComments -> NoComments -> Bool # (>=) :: NoComments -> NoComments -> Bool # max :: NoComments -> NoComments -> NoComments # min :: NoComments -> NoComments -> NoComments # | |
Ord PsLoc Source # | |
Ord PsSpan Source # | |
Ord RealSrcLoc Source # | |
Defined in GHC.Types.SrcLoc Methods compare :: RealSrcLoc -> RealSrcLoc -> Ordering # (<) :: RealSrcLoc -> RealSrcLoc -> Bool # (<=) :: RealSrcLoc -> RealSrcLoc -> Bool # (>) :: RealSrcLoc -> RealSrcLoc -> Bool # (>=) :: RealSrcLoc -> RealSrcLoc -> Bool # max :: RealSrcLoc -> RealSrcLoc -> RealSrcLoc # min :: RealSrcLoc -> RealSrcLoc -> RealSrcLoc # | |
Ord RealSrcSpan Source # | |
Defined in GHC.Types.SrcLoc Methods compare :: RealSrcSpan -> RealSrcSpan -> Ordering # (<) :: RealSrcSpan -> RealSrcSpan -> Bool # (<=) :: RealSrcSpan -> RealSrcSpan -> Bool # (>) :: RealSrcSpan -> RealSrcSpan -> Bool # (>=) :: RealSrcSpan -> RealSrcSpan -> Bool # max :: RealSrcSpan -> RealSrcSpan -> RealSrcSpan # min :: RealSrcSpan -> RealSrcSpan -> RealSrcSpan # | |
Ord ForAllTyFlag Source # | |
Defined in GHC.Types.Var Methods compare :: ForAllTyFlag -> ForAllTyFlag -> Ordering # (<) :: ForAllTyFlag -> ForAllTyFlag -> Bool # (<=) :: ForAllTyFlag -> ForAllTyFlag -> Bool # (>) :: ForAllTyFlag -> ForAllTyFlag -> Bool # (>=) :: ForAllTyFlag -> ForAllTyFlag -> Bool # max :: ForAllTyFlag -> ForAllTyFlag -> ForAllTyFlag # min :: ForAllTyFlag -> ForAllTyFlag -> ForAllTyFlag # | |
Ord FunTyFlag Source # | |
Ord Specificity Source # | |
Defined in GHC.Types.Var Methods compare :: Specificity -> Specificity -> Ordering # (<) :: Specificity -> Specificity -> Bool # (<=) :: Specificity -> Specificity -> Bool # (>) :: Specificity -> Specificity -> Bool # (>=) :: Specificity -> Specificity -> Bool # max :: Specificity -> Specificity -> Specificity # min :: Specificity -> Specificity -> Specificity # | |
Ord Var Source # | |
Ord ModNodeKeyWithUid Source # | |
Defined in GHC.Unit.Module.Graph Methods compare :: ModNodeKeyWithUid -> ModNodeKeyWithUid -> Ordering # (<) :: ModNodeKeyWithUid -> ModNodeKeyWithUid -> Bool # (<=) :: ModNodeKeyWithUid -> ModNodeKeyWithUid -> Bool # (>) :: ModNodeKeyWithUid -> ModNodeKeyWithUid -> Bool # (>=) :: ModNodeKeyWithUid -> ModNodeKeyWithUid -> Bool # max :: ModNodeKeyWithUid -> ModNodeKeyWithUid -> ModNodeKeyWithUid # min :: ModNodeKeyWithUid -> ModNodeKeyWithUid -> ModNodeKeyWithUid # | |
Ord ModuleGraphNode Source # | |
Defined in GHC.Unit.Module.Graph Methods compare :: ModuleGraphNode -> ModuleGraphNode -> Ordering # (<) :: ModuleGraphNode -> ModuleGraphNode -> Bool # (<=) :: ModuleGraphNode -> ModuleGraphNode -> Bool # (>) :: ModuleGraphNode -> ModuleGraphNode -> Bool # (>=) :: ModuleGraphNode -> ModuleGraphNode -> Bool # max :: ModuleGraphNode -> ModuleGraphNode -> ModuleGraphNode # min :: ModuleGraphNode -> ModuleGraphNode -> ModuleGraphNode # | |
Ord NodeKey Source # | |
Defined in GHC.Unit.Module.Graph | |
Ord Unit Source # | |
Ord UnitId Source # | |
Ord Role Source # | |
Ord DataConCantHappen Source # | |
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 Source # | |
Defined in Language.Haskell.Syntax.Extension Methods compare :: NoExtField -> NoExtField -> Ordering # (<) :: NoExtField -> NoExtField -> Bool # (<=) :: NoExtField -> NoExtField -> Bool # (>) :: NoExtField -> NoExtField -> Bool # (>=) :: NoExtField -> NoExtField -> Bool # max :: NoExtField -> NoExtField -> NoExtField # min :: NoExtField -> NoExtField -> NoExtField # | |
Ord IsBootInterface Source # | |
Defined in Language.Haskell.Syntax.ImpExp Methods compare :: IsBootInterface -> IsBootInterface -> Ordering # (<) :: IsBootInterface -> IsBootInterface -> Bool # (<=) :: IsBootInterface -> IsBootInterface -> Bool # (>) :: IsBootInterface -> IsBootInterface -> Bool # (>=) :: IsBootInterface -> IsBootInterface -> Bool # max :: IsBootInterface -> IsBootInterface -> IsBootInterface # min :: IsBootInterface -> IsBootInterface -> IsBootInterface # | |
Ord OverLitVal Source # | |
Defined in Language.Haskell.Syntax.Lit Methods compare :: OverLitVal -> OverLitVal -> Ordering # (<) :: OverLitVal -> OverLitVal -> Bool # (<=) :: OverLitVal -> OverLitVal -> Bool # (>) :: OverLitVal -> OverLitVal -> Bool # (>=) :: OverLitVal -> OverLitVal -> Bool # max :: OverLitVal -> OverLitVal -> OverLitVal # min :: OverLitVal -> OverLitVal -> OverLitVal # | |
Ord ModuleName Source # | |
Defined in Language.Haskell.Syntax.Module.Name Methods compare :: ModuleName -> ModuleName -> Ordering # (<) :: ModuleName -> ModuleName -> Bool # (<=) :: ModuleName -> ModuleName -> Bool # (>) :: ModuleName -> ModuleName -> Bool # (>=) :: ModuleName -> ModuleName -> Bool # max :: ModuleName -> ModuleName -> ModuleName # min :: ModuleName -> ModuleName -> ModuleName # | |
Ord RecFieldsDotDot Source # | |
Defined in Language.Haskell.Syntax.Pat Methods compare :: RecFieldsDotDot -> RecFieldsDotDot -> Ordering # (<) :: RecFieldsDotDot -> RecFieldsDotDot -> Bool # (<=) :: RecFieldsDotDot -> RecFieldsDotDot -> Bool # (>) :: RecFieldsDotDot -> RecFieldsDotDot -> Bool # (>=) :: RecFieldsDotDot -> RecFieldsDotDot -> Bool # max :: RecFieldsDotDot -> RecFieldsDotDot -> RecFieldsDotDot # min :: RecFieldsDotDot -> RecFieldsDotDot -> RecFieldsDotDot # | |
Ord BigNat | |
Ord ShortText | |
Ord Extension | |
Ord PrimType | |
Defined in GHC.Exts.Heap.Closures | |
Ord TsoFlags | |
Defined in GHC.Exts.Heap.Closures | |
Ord WhatNext | |
Defined in GHC.Exts.Heap.Closures | |
Ord WhyBlocked | |
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 | |
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 | |
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 | |
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 | |
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 ByteOffset | |
Defined in GHC.Exts.Stack.Constants Methods compare :: ByteOffset -> ByteOffset -> Ordering # (<) :: ByteOffset -> ByteOffset -> Bool # (<=) :: ByteOffset -> ByteOffset -> Bool # (>) :: ByteOffset -> ByteOffset -> Bool # (>=) :: ByteOffset -> ByteOffset -> Bool # max :: ByteOffset -> ByteOffset -> ByteOffset # min :: ByteOffset -> ByteOffset -> ByteOffset # | |
Ord WordOffset | |
Defined in GHC.Exts.Stack.Constants Methods compare :: WordOffset -> WordOffset -> Ordering # (<) :: WordOffset -> WordOffset -> Bool # (<=) :: WordOffset -> WordOffset -> Bool # (>) :: WordOffset -> WordOffset -> Bool # (>=) :: WordOffset -> WordOffset -> Bool # max :: WordOffset -> WordOffset -> WordOffset # min :: WordOffset -> WordOffset -> WordOffset # | |
Ord Void | |
Ord ByteOrder | |
Ord ClosureType | |
Defined in GHC.Internal.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 BlockReason | |
Defined in GHC.Internal.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 | |
Defined in GHC.Internal.Conc.Sync | |
Ord ThreadStatus | |
Defined in GHC.Internal.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 All | |
Ord Any | |
Ord SomeTypeRep | |
Defined in GHC.Internal.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 Version | |
Defined in GHC.Internal.Data.Version | |
Ord ErrorCall | |
Ord ArithException | |
Defined in GHC.Internal.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 | |
Defined in GHC.Internal.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 CBool | |
Ord CChar | |
Ord CClock | |
Ord CDouble | |
Defined in GHC.Internal.Foreign.C.Types | |
Ord CFloat | |
Ord CInt | |
Ord CIntMax | |
Defined in GHC.Internal.Foreign.C.Types | |
Ord CIntPtr | |
Defined in GHC.Internal.Foreign.C.Types | |
Ord CLLong | |
Ord CLong | |
Ord CPtrdiff | |
Defined in GHC.Internal.Foreign.C.Types | |
Ord CSChar | |
Ord CSUSeconds | |
Defined in GHC.Internal.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 | |
Ord CSigAtomic | |
Defined in GHC.Internal.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 | |
Ord CTime | |
Ord CUChar | |
Ord CUInt | |
Ord CUIntMax | |
Defined in GHC.Internal.Foreign.C.Types | |
Ord CUIntPtr | |
Defined in GHC.Internal.Foreign.C.Types | |
Ord CULLong | |
Defined in GHC.Internal.Foreign.C.Types | |
Ord CULong | |
Ord CUSeconds | |
Ord CUShort | |
Defined in GHC.Internal.Foreign.C.Types | |
Ord CWchar | |
Ord Associativity | |
Defined in GHC.Internal.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 | |
Defined in GHC.Internal.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 | |
Ord SourceStrictness | |
Defined in GHC.Internal.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 | |
Defined in GHC.Internal.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 ArrayException | |
Defined in GHC.Internal.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 | |
Defined in GHC.Internal.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 | |
Defined in GHC.Internal.IO.Exception | |
Ord BufferMode | |
Defined in GHC.Internal.IO.Handle.Types Methods compare :: BufferMode -> BufferMode -> Ordering # (<) :: BufferMode -> BufferMode -> Bool # (<=) :: BufferMode -> BufferMode -> Bool # (>) :: BufferMode -> BufferMode -> Bool # (>=) :: BufferMode -> BufferMode -> Bool # max :: BufferMode -> BufferMode -> BufferMode # min :: BufferMode -> BufferMode -> BufferMode # | |
Ord Newline | |
Defined in GHC.Internal.IO.Handle.Types | |
Ord NewlineMode | |
Defined in GHC.Internal.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 | |
Ord Int16 | |
Ord Int32 | |
Ord Int64 | |
Ord Int8 | |
Ord CBlkCnt | |
Defined in GHC.Internal.System.Posix.Types | |
Ord CBlkSize | |
Defined in GHC.Internal.System.Posix.Types | |
Ord CCc | |
Ord CClockId | |
Defined in GHC.Internal.System.Posix.Types | |
Ord CDev | |
Ord CFsBlkCnt | |
Ord CFsFilCnt | |
Ord CGid | |
Ord CId | |
Ord CIno | |
Ord CKey | |
Ord CMode | |
Ord CNfds | |
Ord CNlink | |
Ord COff | |
Ord CPid | |
Ord CRLim | |
Ord CSocklen | |
Defined in GHC.Internal.System.Posix.Types | |
Ord CSpeed | |
Ord CSsize | |
Ord CTcflag | |
Defined in GHC.Internal.System.Posix.Types | |
Ord CTimer | |
Ord CUid | |
Ord Fd | |
Ord SomeChar | |
Defined in GHC.Internal.TypeLits | |
Ord SomeSymbol | |
Defined in GHC.Internal.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 | |
Defined in GHC.Internal.TypeNats | |
Ord GeneralCategory | |
Defined in GHC.Internal.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 | |
Ord Word32 | |
Ord Word64 | |
Ord Word8 | |
Ord Arch | |
Ord ArchOS | |
Ord ArmABI | |
Ord ArmISA | |
Ord ArmISAExt | |
Ord OS | |
Ord PPC_64ABI | |
Ord Ordering | |
Defined in GHC.Classes | |
Ord TyCon | |
Ord BoxLabel | |
Defined in Trace.Hpc.Mix | |
Ord CondBox | |
Ord HpcPos | |
Ord OsChar | |
Ord OsString | |
Defined in System.OsString.Internal.Types | |
Ord PosixChar | |
Ord PosixString | |
Defined in System.OsString.Internal.Types Methods compare :: PosixString -> PosixString -> Ordering # (<) :: PosixString -> PosixString -> Bool # (<=) :: PosixString -> PosixString -> Bool # (>) :: PosixString -> PosixString -> Bool # (>=) :: PosixString -> PosixString -> Bool # max :: PosixString -> PosixString -> PosixString # min :: PosixString -> PosixString -> PosixString # | |
Ord WindowsChar | |
Defined in System.OsString.Internal.Types Methods compare :: WindowsChar -> WindowsChar -> Ordering # (<) :: WindowsChar -> WindowsChar -> Bool # (<=) :: WindowsChar -> WindowsChar -> Bool # (>) :: WindowsChar -> WindowsChar -> Bool # (>=) :: WindowsChar -> WindowsChar -> Bool # max :: WindowsChar -> WindowsChar -> WindowsChar # min :: WindowsChar -> WindowsChar -> WindowsChar # | |
Ord WindowsString | |
Defined in System.OsString.Internal.Types Methods compare :: WindowsString -> WindowsString -> Ordering # (<) :: WindowsString -> WindowsString -> Bool # (<=) :: WindowsString -> WindowsString -> Bool # (>) :: WindowsString -> WindowsString -> Bool # (>=) :: WindowsString -> WindowsString -> Bool # max :: WindowsString -> WindowsString -> WindowsString # min :: WindowsString -> WindowsString -> WindowsString # | |
Ord AnnLookup | |
Ord AnnTarget | |
Ord Bang | |
Ord BndrVis | |
Defined in Language.Haskell.TH.Syntax | |
Ord Body | |
Ord Bytes | |
Ord Callconv | |
Defined in Language.Haskell.TH.Syntax | |
Ord Clause | |
Ord Con | |
Ord Dec | |
Ord DecidedStrictness | |
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 | |
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 | |
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 | |
Ord Exp | |
Ord FamilyResultSig | |
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 | |
Ord FixityDirection | |
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 | |
Defined in Language.Haskell.TH.Syntax | |
Ord FunDep | |
Ord Guard | |
Ord Info | |
Ord InjectivityAnn | |
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 | |
Ord Lit | |
Ord Loc | |
Ord Match | |
Ord ModName | |
Defined in Language.Haskell.TH.Syntax | |
Ord Module | |
Ord ModuleInfo | |
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 | |
Ord NameFlavour | |
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 | |
Ord NamespaceSpecifier | |
Defined in Language.Haskell.TH.Syntax Methods compare :: NamespaceSpecifier -> NamespaceSpecifier -> Ordering # (<) :: NamespaceSpecifier -> NamespaceSpecifier -> Bool # (<=) :: NamespaceSpecifier -> NamespaceSpecifier -> Bool # (>) :: NamespaceSpecifier -> NamespaceSpecifier -> Bool # (>=) :: NamespaceSpecifier -> NamespaceSpecifier -> Bool # max :: NamespaceSpecifier -> NamespaceSpecifier -> NamespaceSpecifier # min :: NamespaceSpecifier -> NamespaceSpecifier -> NamespaceSpecifier # | |
Ord OccName | |
Defined in Language.Haskell.TH.Syntax | |
Ord Overlap | |
Defined in Language.Haskell.TH.Syntax | |
Ord Pat | |
Ord PatSynArgs | |
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 | |
Ord Phases | |
Ord PkgName | |
Defined in Language.Haskell.TH.Syntax | |
Ord Pragma | |
Ord Range | |
Ord Role | |
Ord RuleBndr | |
Defined in Language.Haskell.TH.Syntax | |
Ord RuleMatch | |
Ord Safety | |
Ord SourceStrictness | |
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 | |
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 | |
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 | |
Ord TyLit | |
Ord TySynEqn | |
Defined in Language.Haskell.TH.Syntax | |
Ord Type | |
Ord TypeFamilyHead | |
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 Day | |
Ord Month | |
Ord Quarter | |
Defined in Data.Time.Calendar.Quarter | |
Ord QuarterOfYear | |
Defined in Data.Time.Calendar.Quarter Methods compare :: QuarterOfYear -> QuarterOfYear -> Ordering # (<) :: QuarterOfYear -> QuarterOfYear -> Bool # (<=) :: QuarterOfYear -> QuarterOfYear -> Bool # (>) :: QuarterOfYear -> QuarterOfYear -> Bool # (>=) :: QuarterOfYear -> QuarterOfYear -> Bool # max :: QuarterOfYear -> QuarterOfYear -> QuarterOfYear # min :: QuarterOfYear -> QuarterOfYear -> QuarterOfYear # | |
Ord DiffTime | |
Defined in Data.Time.Clock.Internal.DiffTime | |
Ord UTCTime | |
Defined in Data.Time.Clock.Internal.UTCTime | |
Ord UniversalTime | |
Defined in Data.Time.Clock.Internal.UniversalTime Methods compare :: UniversalTime -> UniversalTime -> Ordering # (<) :: UniversalTime -> UniversalTime -> Bool # (<=) :: UniversalTime -> UniversalTime -> Bool # (>) :: UniversalTime -> UniversalTime -> Bool # (>=) :: UniversalTime -> UniversalTime -> Bool # max :: UniversalTime -> UniversalTime -> UniversalTime # min :: UniversalTime -> UniversalTime -> UniversalTime # | |
Ord LocalTime | |
Defined in Data.Time.LocalTime.Internal.LocalTime | |
Ord CAttributes | |
Defined in System.Posix.Files.Common Methods compare :: CAttributes -> CAttributes -> Ordering # (<) :: CAttributes -> CAttributes -> Bool # (<=) :: CAttributes -> CAttributes -> Bool # (>) :: CAttributes -> CAttributes -> Bool # (>=) :: CAttributes -> CAttributes -> Bool # max :: CAttributes -> CAttributes -> CAttributes # min :: CAttributes -> CAttributes -> CAttributes # | |
Ord StatxFlags | |
Defined in System.Posix.Files.Common Methods compare :: StatxFlags -> StatxFlags -> Ordering # (<) :: StatxFlags -> StatxFlags -> Bool # (<=) :: StatxFlags -> StatxFlags -> Bool # (>) :: StatxFlags -> StatxFlags -> Bool # (>=) :: StatxFlags -> StatxFlags -> Bool # max :: StatxFlags -> StatxFlags -> StatxFlags # min :: StatxFlags -> StatxFlags -> StatxFlags # | |
Ord StatxMask | |
Ord OpenFileFlags | |
Defined in System.Posix.IO.Common Methods compare :: OpenFileFlags -> OpenFileFlags -> Ordering # (<) :: OpenFileFlags -> OpenFileFlags -> Bool # (<=) :: OpenFileFlags -> OpenFileFlags -> Bool # (>) :: OpenFileFlags -> OpenFileFlags -> Bool # (>=) :: OpenFileFlags -> OpenFileFlags -> Bool # max :: OpenFileFlags -> OpenFileFlags -> OpenFileFlags # min :: OpenFileFlags -> OpenFileFlags -> OpenFileFlags # | |
Ord OpenMode | |
Defined in System.Posix.IO.Common | |
Ord ProcessStatus | |
Defined in System.Posix.Process.Internals Methods compare :: ProcessStatus -> ProcessStatus -> Ordering # (<) :: ProcessStatus -> ProcessStatus -> Bool # (<=) :: ProcessStatus -> ProcessStatus -> Bool # (>) :: ProcessStatus -> ProcessStatus -> Bool # (>=) :: ProcessStatus -> ProcessStatus -> Bool # max :: ProcessStatus -> ProcessStatus -> ProcessStatus # min :: ProcessStatus -> ProcessStatus -> ProcessStatus # | |
Ord Integer | |
Ord Natural | |
Ord () | |
Ord Bool | |
Ord Char | |
Ord Double | |
Ord Float | |
Ord Int | |
Ord Word | |
Ord a => Ord (First a) | Since: base-4.9.0.0 |
Ord a => Ord (Last a) | Since: base-4.9.0.0 |
Ord a => Ord (Max a) | Since: base-4.9.0.0 |
Ord a => Ord (Min a) | Since: base-4.9.0.0 |
Ord m => Ord (WrappedMonoid m) | Since: base-4.9.0.0 |
Defined in Data.Semigroup Methods compare :: WrappedMonoid m -> WrappedMonoid m -> Ordering # (<) :: WrappedMonoid m -> WrappedMonoid m -> Bool # (<=) :: WrappedMonoid m -> WrappedMonoid m -> Bool # (>) :: WrappedMonoid m -> WrappedMonoid m -> Bool # (>=) :: WrappedMonoid m -> WrappedMonoid m -> Bool # max :: WrappedMonoid m -> WrappedMonoid m -> WrappedMonoid m # min :: WrappedMonoid m -> WrappedMonoid m -> WrappedMonoid m # | |
Ord a => Ord (IntMap a) | |
Defined in Data.IntMap.Internal | |
Ord a => Ord (Seq a) | |
Ord a => Ord (ViewL a) | |
Defined in Data.Sequence.Internal | |
Ord a => Ord (ViewR a) | |
Defined in Data.Sequence.Internal | |
Ord a => Ord (Intersection a) | |
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) | |
Ord a => Ord (Tree a) | Since: containers-0.6.5 |
Ord v => Ord (LabelMap v) Source # | |
Defined in GHC.Cmm.Dataflow.Label | |
Ord a => Ord (LPath a) Source # | |
Defined in GHC.Data.Graph.Inductive.Graph | |
Ord a => Ord (Maybe a) Source # | |
Ord a => Ord (Word64Map a) Source # | |
Defined in GHC.Data.Word64Map.Internal | |
Ord a => Ord (EvidenceInfo a) Source # | |
Defined in GHC.Iface.Ext.Utils Methods compare :: EvidenceInfo a -> EvidenceInfo a -> Ordering # (<) :: EvidenceInfo a -> EvidenceInfo a -> Bool # (<=) :: EvidenceInfo a -> EvidenceInfo a -> Bool # (>) :: EvidenceInfo a -> EvidenceInfo a -> Bool # (>=) :: EvidenceInfo a -> EvidenceInfo a -> Bool # max :: EvidenceInfo a -> EvidenceInfo a -> EvidenceInfo a # min :: EvidenceInfo a -> EvidenceInfo a -> EvidenceInfo a # | |
Ord unit => Ord (Definite unit) Source # | |
Defined in GHC.Unit.Types Methods compare :: Definite unit -> Definite unit -> Ordering # (<) :: Definite unit -> Definite unit -> Bool # (<=) :: Definite unit -> Definite unit -> Bool # (>) :: Definite unit -> Definite unit -> Bool # (>=) :: Definite unit -> Definite unit -> Bool # | |
Ord (GenInstantiatedUnit unit) Source # | |
Defined in GHC.Unit.Types Methods compare :: GenInstantiatedUnit unit -> GenInstantiatedUnit unit -> Ordering # (<) :: GenInstantiatedUnit unit -> GenInstantiatedUnit unit -> Bool # (<=) :: GenInstantiatedUnit unit -> GenInstantiatedUnit unit -> Bool # (>) :: GenInstantiatedUnit unit -> GenInstantiatedUnit unit -> Bool # (>=) :: GenInstantiatedUnit unit -> GenInstantiatedUnit unit -> Bool # max :: GenInstantiatedUnit unit -> GenInstantiatedUnit unit -> GenInstantiatedUnit unit # min :: GenInstantiatedUnit unit -> GenInstantiatedUnit unit -> GenInstantiatedUnit unit # | |
Ord unit => Ord (GenModule unit) Source # | |
Defined in GHC.Unit.Types Methods compare :: GenModule unit -> GenModule unit -> Ordering # (<) :: GenModule unit -> GenModule unit -> Bool # (<=) :: GenModule unit -> GenModule unit -> Bool # (>) :: GenModule unit -> GenModule unit -> Bool # (>=) :: GenModule unit -> GenModule unit -> Bool # | |
Ord mod => Ord (GenWithIsBoot mod) Source # | |
Defined in GHC.Unit.Types Methods compare :: GenWithIsBoot mod -> GenWithIsBoot mod -> Ordering # (<) :: GenWithIsBoot mod -> GenWithIsBoot mod -> Bool # (<=) :: GenWithIsBoot mod -> GenWithIsBoot mod -> Bool # (>) :: GenWithIsBoot mod -> GenWithIsBoot mod -> Bool # (>=) :: GenWithIsBoot mod -> GenWithIsBoot mod -> Bool # max :: GenWithIsBoot mod -> GenWithIsBoot mod -> GenWithIsBoot mod # min :: GenWithIsBoot mod -> GenWithIsBoot mod -> GenWithIsBoot mod # | |
Ord a => Ord (FixedLengthEncoding a) Source # | |
Defined in GHC.Utils.Binary Methods compare :: FixedLengthEncoding a -> FixedLengthEncoding a -> Ordering # (<) :: FixedLengthEncoding a -> FixedLengthEncoding a -> Bool # (<=) :: FixedLengthEncoding a -> FixedLengthEncoding a -> Bool # (>) :: FixedLengthEncoding a -> FixedLengthEncoding a -> Bool # (>=) :: FixedLengthEncoding a -> FixedLengthEncoding a -> Bool # max :: FixedLengthEncoding a -> FixedLengthEncoding a -> FixedLengthEncoding a # min :: FixedLengthEncoding a -> FixedLengthEncoding a -> FixedLengthEncoding a # | |
Ord (XXOverLit p) => Ord (HsOverLit p) Source # | |
Defined in Language.Haskell.Syntax.Lit | |
Ord a => Ord (NonEmpty a) | |
Ord a => Ord (Identity a) | |
Defined in GHC.Internal.Data.Functor.Identity | |
Ord a => Ord (First a) | |
Defined in GHC.Internal.Data.Monoid | |
Ord a => Ord (Last a) | |
Ord a => Ord (Down a) | |
Ord a => Ord (Dual a) | |
Defined in GHC.Internal.Data.Semigroup.Internal | |
Ord a => Ord (Product a) | |
Defined in GHC.Internal.Data.Semigroup.Internal | |
Ord a => Ord (Sum a) | |
Ord (ForeignPtr a) | |
Defined in GHC.Internal.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 a => Ord (ZipList a) | |
Ord p => Ord (Par1 p) | |
Ord (FunPtr a) | |
Defined in GHC.Internal.Ptr | |
Ord (Ptr a) | |
Integral a => Ord (Ratio a) | |
Ord (SChar c) | |
Defined in GHC.Internal.TypeLits | |
Ord (SSymbol s) | |
Ord (SNat n) | |
Ord flag => Ord (TyVarBndr flag) | |
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 # | |
Ord a => Ord (Maybe a) | |
Ord a => Ord (Solo a) | |
Ord a => Ord [a] | |
(Ix ix, Ord e, IArray UArray e) => Ord (UArray ix e) | |
Defined in Data.Array.Base | |
Ord (Fixed a) | Since: base-2.1 |
Ord a => Ord (Arg a b) | Since: base-4.9.0.0 |
(Ord k, Ord v) => Ord (Map k v) | |
(Ord a, Ord b) => Ord (Pair a b) Source # | |
Defined in GHC.Data.Strict | |
(Ord b, Ord r) => Ord (IfaceBindingX r b) Source # | |
Defined in GHC.Iface.Syntax Methods compare :: IfaceBindingX r b -> IfaceBindingX r b -> Ordering # (<) :: IfaceBindingX r b -> IfaceBindingX r b -> Bool # (<=) :: IfaceBindingX r b -> IfaceBindingX r b -> Bool # (>) :: IfaceBindingX r b -> IfaceBindingX r b -> Bool # (>=) :: IfaceBindingX r b -> IfaceBindingX r b -> Bool # max :: IfaceBindingX r b -> IfaceBindingX r b -> IfaceBindingX r b # min :: IfaceBindingX r b -> IfaceBindingX r b -> IfaceBindingX r b # | |
(Ord l, Ord e) => Ord (GenLocated l e) Source # | |
Defined in GHC.Types.SrcLoc Methods compare :: GenLocated l e -> GenLocated l e -> Ordering # (<) :: GenLocated l e -> GenLocated l e -> Bool # (<=) :: GenLocated l e -> GenLocated l e -> Bool # (>) :: GenLocated l e -> GenLocated l e -> Bool # (>=) :: GenLocated l e -> GenLocated l e -> Bool # max :: GenLocated l e -> GenLocated l e -> GenLocated l e # min :: GenLocated l e -> GenLocated l e -> GenLocated l e # | |
Ord (Bin a) Source # | |
(Ix i, Ord e) => Ord (Array i e) | |
(Ord a, Ord b) => Ord (Either a b) | |
Defined in GHC.Internal.Data.Either | |
Ord (Proxy s) | |
Defined in GHC.Internal.Data.Proxy | |
Ord (TypeRep a) | |
Defined in GHC.Internal.Data.Typeable.Internal | |
Ord (U1 p) | |
Ord (V1 p) | |
(Ord1 f, Ord a) => Ord (Lift f a) | |
Defined in Control.Applicative.Lift | |
(Ord1 m, Ord a) => Ord (MaybeT m a) | |
Defined in Control.Monad.Trans.Maybe | |
(Ord a, Ord b) => Ord (a, b) | |
Ord a => Ord (Const a b) | |
Ord (f a) => Ord (Ap f a) | |
Ord (f a) => Ord (Alt f a) | |
Defined in GHC.Internal.Data.Semigroup.Internal | |
Ord (a :~: b) | |
Defined in GHC.Internal.Data.Type.Equality | |
(Generic1 f, Ord (Rep1 f a)) => Ord (Generically1 f a) | |
Defined in GHC.Internal.Generics Methods compare :: Generically1 f a -> Generically1 f a -> Ordering # (<) :: Generically1 f a -> Generically1 f a -> Bool # (<=) :: Generically1 f a -> Generically1 f a -> Bool # (>) :: Generically1 f a -> Generically1 f a -> Bool # (>=) :: Generically1 f a -> Generically1 f a -> Bool # max :: Generically1 f a -> Generically1 f a -> Generically1 f a # min :: Generically1 f a -> Generically1 f a -> Generically1 f a # | |
Ord (f p) => Ord (Rec1 f p) | |
Defined in GHC.Internal.Generics | |
Ord (URec (Ptr ()) p) | |
Defined in GHC.Internal.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) | |
Defined in GHC.Internal.Generics | |
Ord (URec Double p) | |
Defined in GHC.Internal.Generics Methods compare :: URec Double p -> URec Double p -> Ordering # (<) :: URec Double p -> URec Double p -> Bool # (<=) :: URec Double p -> URec Double p -> Bool # (>) :: URec Double p -> URec Double p -> Bool # (>=) :: URec Double p -> URec Double p -> Bool # | |
Ord (URec Float p) | |
Defined in GHC.Internal.Generics | |
Ord (URec Int p) | |
Defined in GHC.Internal.Generics | |
Ord (URec Word p) | |
Defined in GHC.Internal.Generics | |
(Ord1 f, Ord a) => Ord (Backwards f a) | |
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 # | |
(Ord e, Ord1 m, Ord a) => Ord (ExceptT e m a) | |
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 # | |
(Ord1 f, Ord a) => Ord (IdentityT f a) | |
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 # | |
(Ord w, Ord1 m, Ord a) => Ord (WriterT w m a) | |
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 # | |
(Ord w, Ord1 m, Ord a) => Ord (WriterT w m a) | |
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 # | |
Ord a => Ord (Constant a b) | |
Defined in Data.Functor.Constant | |
(Ord1 f, Ord a) => Ord (Reverse f a) | |
Defined in Data.Functor.Reverse | |
(Ord a, Ord b, Ord c) => Ord (a, b, c) | |
(Ord (f a), Ord (g a)) => Ord (Product f g a) | Since: base-4.18.0.0 |
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 # | |
(Ord (f a), Ord (g a)) => Ord (Sum f g a) | Since: base-4.18.0.0 |
Ord (a :~~: b) | |
Defined in GHC.Internal.Data.Type.Equality | |
(Ord (f p), Ord (g p)) => Ord ((f :*: g) p) | |
Defined in GHC.Internal.Generics | |
(Ord (f p), Ord (g p)) => Ord ((f :+: g) p) | |
Defined in GHC.Internal.Generics | |
Ord c => Ord (K1 i c p) | |
Defined in GHC.Internal.Generics | |
(Ord a, Ord b, Ord c, Ord d) => Ord (a, b, c, d) | |
Defined in GHC.Classes | |
Ord (f (g a)) => Ord (Compose f g a) | Since: base-4.18.0.0 |
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 # | |
(Graph gr, Ord a, Ord b) => Ord (OrdGr gr a b) Source # | |
Defined in GHC.Data.Graph.Inductive.Graph | |
Ord (f (g p)) => Ord ((f :.: g) p) | |
Defined in GHC.Internal.Generics | |
Ord (f p) => Ord (M1 i c f p) | |
Defined in GHC.Internal.Generics | |
(Ord a, Ord b, Ord c, Ord d, Ord e) => Ord (a, b, c, d, e) | |
Defined in GHC.Classes Methods compare :: (a, b, c, d, e) -> (a, b, c, d, e) -> Ordering # (<) :: (a, b, c, d, e) -> (a, b, c, d, e) -> Bool # (<=) :: (a, b, c, d, e) -> (a, b, c, d, e) -> Bool # (>) :: (a, b, c, d, e) -> (a, b, c, d, e) -> Bool # (>=) :: (a, b, c, d, e) -> (a, b, c, d, e) -> Bool # max :: (a, b, c, d, e) -> (a, b, c, d, e) -> (a, b, c, d, e) # min :: (a, b, c, d, e) -> (a, b, c, d, e) -> (a, b, c, d, e) # | |
(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f) => Ord (a, b, c, d, e, f) | |
Defined in GHC.Classes Methods compare :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> Ordering # (<) :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> Bool # (<=) :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> Bool # (>) :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> Bool # (>=) :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> Bool # max :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> (a, b, c, d, e, f) # min :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> (a, b, c, d, e, f) # | |
(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g) => Ord (a, b, c, d, e, f, g) | |
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) | |
Defined in GHC.Classes Methods compare :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> Ordering # (<) :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> Bool # (<=) :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> Bool # (>) :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> Bool # (>=) :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> Bool # max :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) # min :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) # | |
(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i) => Ord (a, b, c, d, e, f, g, h, i) | |
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) | |
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) | |
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) | |
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) | |
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) | |
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) | |
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 Applicative m => Monad (m :: Type -> Type) where #
Minimal complete definition
Instances
Monad Complex | Since: base-4.9.0.0 |
Monad First | Since: base-4.9.0.0 |
Monad Last | Since: base-4.9.0.0 |
Monad Max | Since: base-4.9.0.0 |
Monad Min | Since: base-4.9.0.0 |
Monad Get | |
Monad PutM | |
Monad Put | |
Monad Seq | |
Monad Tree | |
Monad PD Source # | |
Monad NatM Source # | |
Monad LlvmM Source # | |
Monad CoreM Source # | |
Monad SimplM Source # | |
Monad UnifyResultM Source # | |
Defined in GHC.Core.Unify Methods (>>=) :: UnifyResultM a -> (a -> UnifyResultM b) -> UnifyResultM b # (>>) :: UnifyResultM a -> UnifyResultM b -> UnifyResultM b # return :: a -> UnifyResultM a # | |
Monad NullCollapseViz Source # | |
Defined in GHC.Data.Graph.Collapse Methods (>>=) :: NullCollapseViz a -> (a -> NullCollapseViz b) -> NullCollapseViz b # (>>) :: NullCollapseViz a -> NullCollapseViz b -> NullCollapseViz b # return :: a -> NullCollapseViz a # | |
Monad Hsc Source # | |
Monad Ghc Source # | |
Monad HookedUse Source # | |
Monad P Source # | |
Monad PV Source # | |
Monad CpsRn Source # | |
Monad LiftM Source # | |
Monad CmmParse Source # | |
Monad FCode Source # | |
Monad SolverStage Source # | |
Defined in GHC.Tc.Solver.Monad Methods (>>=) :: SolverStage a -> (a -> SolverStage b) -> SolverStage b # (>>) :: SolverStage a -> SolverStage b -> SolverStage b # return :: a -> SolverStage a # | |
Monad TcS Source # | |
Monad TcPluginM Source # | |
Monad ZonkM Source # | |
Monad UniqSM Source # | |
Monad NonEmpty | |
Monad STM | |
Monad Identity | |
Monad First | |
Monad Last | |
Monad Down | |
Monad Dual | |
Monad Product | |
Monad Sum | |
Monad Par1 | |
Monad P | |
Monad ReadP | |
Monad ReadPrec | |
Monad IO | |
Monad GHCiQ | |
Monad PprM | |
Monad Q | |
Monad Maybe | |
Monad Solo | |
Monad [] | |
Monad m => Monad (WrappedMonad m) | Since: base-4.7.0.0 |
Defined in Control.Applicative Methods (>>=) :: WrappedMonad m a -> (a -> WrappedMonad m b) -> WrappedMonad m b # (>>) :: WrappedMonad m a -> WrappedMonad m b -> WrappedMonad m b # return :: a -> WrappedMonad m a # | |
Monad (SetM s) | |
Monad m => Monad (CatchT m) | |
Monad (RegM freeRegs) Source # | |
Monad (WasmCodeGenM w) Source # | |
Defined in GHC.CmmToAsm.Wasm.Types Methods (>>=) :: WasmCodeGenM w a -> (a -> WasmCodeGenM w b) -> WasmCodeGenM w b # (>>) :: WasmCodeGenM w a -> WasmCodeGenM w b -> WasmCodeGenM w b # return :: a -> WasmCodeGenM w a # | |
Monad (IOEnv m) Source # | |
Monad (MaybeErr err) Source # | |
Monad m => Monad (EwM m) Source # | |
Monad m => Monad (GhcT m) Source # | |
Monad (CmdLineP s) Source # | |
Monad (ZonkBndrT m) Source # | |
Monad m => Monad (ZonkT m) Source # | |
Monad (Codensity f) Source # | |
Monad (State s) Source # | |
ArrowApply a => Monad (ArrowMonad a) | |
Defined in GHC.Internal.Control.Arrow Methods (>>=) :: ArrowMonad a a0 -> (a0 -> ArrowMonad a b) -> ArrowMonad a b # (>>) :: ArrowMonad a a0 -> ArrowMonad a b -> ArrowMonad a b # return :: a0 -> ArrowMonad a a0 # | |
Monad (Either e) | |
Monad (Proxy :: Type -> Type) | |
Monad (U1 :: Type -> Type) | |
Monad (ST s) | |
Monad m => Monad (MaybeT m) | |
Monoid a => Monad ((,) a) | |
(Applicative f, Monad f) => Monad (WhenMissing f x) | Equivalent to Since: containers-0.5.9 |
Defined in Data.IntMap.Internal Methods (>>=) :: WhenMissing f x a -> (a -> WhenMissing f x b) -> WhenMissing f x b # (>>) :: WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x b # return :: a -> WhenMissing f x a # | |
Monad (Stream m a) Source # | |
Monad m => Monad (StreamS m a) Source # | |
(Applicative f, Monad f) => Monad (WhenMissing f x) Source # | Equivalent to Since: ghc-0.5.9 |
Defined in GHC.Data.Word64Map.Internal Methods (>>=) :: WhenMissing f x a -> (a -> WhenMissing f x b) -> WhenMissing f x b # (>>) :: WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x b # return :: a -> WhenMissing f x a # | |
Monad m => Monad (Kleisli m a) | |
Monad f => Monad (Ap f) | |
Monad f => Monad (Alt f) | |
Monad f => Monad (Rec1 f) | |
(Monoid w, Functor m, Monad m) => Monad (AccumT w m) | |
Monad m => Monad (ExceptT e m) | |
Monad m => Monad (IdentityT m) | |
Monad m => Monad (ReaderT r m) | |
Monad m => Monad (SelectT r m) | |
Monad m => Monad (StateT s m) | |
Monad m => Monad (StateT s m) | |
Monad m => Monad (WriterT w m) | |
(Monoid w, Monad m) => Monad (WriterT w m) | |
(Monoid w, Monad m) => Monad (WriterT w m) | |
Monad m => Monad (Reverse m) | Derived instance. |
(Monoid a, Monoid b) => Monad ((,,) a b) | |
(Monad f, Monad g) => Monad (Product f g) | Since: base-4.9.0.0 |
(Monad f, Applicative f) => Monad (WhenMatched f x y) | Equivalent to Since: containers-0.5.9 |
Defined in Data.IntMap.Internal Methods (>>=) :: WhenMatched f x y a -> (a -> WhenMatched f x y b) -> WhenMatched f x y b # (>>) :: WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y b # return :: a -> WhenMatched f x y a # | |
(Applicative f, Monad f) => Monad (WhenMissing f k x) | Equivalent to Since: containers-0.5.9 |
Defined in Data.Map.Internal Methods (>>=) :: WhenMissing f k x a -> (a -> WhenMissing f k x b) -> WhenMissing f k x b # (>>) :: WhenMissing f k x a -> WhenMissing f k x b -> WhenMissing f k x b # return :: a -> WhenMissing f k x a # | |
(Monad f, Applicative f) => Monad (WhenMatched f x y) Source # | Equivalent to Since: ghc-0.5.9 |
Defined in GHC.Data.Word64Map.Internal Methods (>>=) :: WhenMatched f x y a -> (a -> WhenMatched f x y b) -> WhenMatched f x y b # (>>) :: WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y b # return :: a -> WhenMatched f x y a # | |
(Monad f, Monad g) => Monad (f :*: g) | |
Monad (ContT r m) | |
(Monoid a, Monoid b, Monoid c) => Monad ((,,,) a b c) | |
Monad ((->) r) | |
(Monad f, Applicative f) => Monad (WhenMatched f k x y) | Equivalent to Since: containers-0.5.9 |
Defined in Data.Map.Internal Methods (>>=) :: WhenMatched f k x y a -> (a -> WhenMatched f k x y b) -> WhenMatched f k x y b # (>>) :: WhenMatched f k x y a -> WhenMatched f k x y b -> WhenMatched f k x y b # return :: a -> WhenMatched f k x y a # | |
Monad f => Monad (M1 i c f) | |
Monad m => Monad (RWST r w s m) | |
(Monoid w, Monad m) => Monad (RWST r w s m) | |
(Monoid w, Monad m) => Monad (RWST r w s m) | |
class Functor (f :: Type -> Type) where #
Minimal complete definition
Instances
Functor Complex | Since: base-4.9.0.0 |
Functor First | Since: base-4.9.0.0 |
Functor Last | Since: base-4.9.0.0 |
Functor Max | Since: base-4.9.0.0 |
Functor Min | Since: base-4.9.0.0 |
Functor ArgDescr | Since: base-4.7.0.0 |
Functor ArgOrder | Since: base-4.7.0.0 |
Functor OptDescr | Since: base-4.7.0.0 |
Functor Decoder | |
Functor Get | |
Functor PutM | |
Functor Put | |
Functor SCC | Since: containers-0.5.4 |
Functor IntMap | |
Functor Digit | |
Functor Elem | |
Functor FingerTree | |
Defined in Data.Sequence.Internal Methods fmap :: (a -> b) -> FingerTree a -> FingerTree b # (<$) :: a -> FingerTree b -> FingerTree a # | |
Functor Node | |
Functor Seq | |
Functor ViewL | |
Functor ViewR | |
Functor Tree | |
Functor GenBasicBlock Source # | |
Defined in GHC.Cmm Methods fmap :: (a -> b) -> GenBasicBlock a -> GenBasicBlock b # (<$) :: a -> GenBasicBlock b -> GenBasicBlock a # | |
Functor ListGraph Source # | |
Functor LabelMap Source # | |
Functor PD Source # | |
Functor NatM Source # | |
Functor InstrSR Source # | |
Functor LiveInstr Source # | |
Functor LlvmM Source # | |
Functor NormaliseStepResult Source # | |
Defined in GHC.Core.Coercion Methods fmap :: (a -> b) -> NormaliseStepResult a -> NormaliseStepResult b # (<$) :: a -> NormaliseStepResult b -> NormaliseStepResult a # | |
Functor CoreMap Source # | |
Functor BndrMap Source # | |
Functor LooseTypeMap Source # | |
Defined in GHC.Core.Map.Type Methods fmap :: (a -> b) -> LooseTypeMap a -> LooseTypeMap b # (<$) :: a -> LooseTypeMap b -> LooseTypeMap a # | |
Functor TypeMap Source # | |
Functor VarMap Source # | |
Functor CoreM Source # | |
Functor SimplM Source # | |
Functor RoughMap Source # | |
Functor UnifyResultM Source # | |
Defined in GHC.Core.Unify Methods fmap :: (a -> b) -> UnifyResultM a -> UnifyResultM b # (<$) :: a -> UnifyResultM b -> UnifyResultM a # | |
Functor Bag Source # | |
Functor BooleanFormula Source # | |
Defined in GHC.Data.BooleanFormula Methods fmap :: (a -> b) -> BooleanFormula a -> BooleanFormula b # (<$) :: a -> BooleanFormula b -> BooleanFormula a # | |
Functor NullCollapseViz Source # | |
Defined in GHC.Data.Graph.Collapse Methods fmap :: (a -> b) -> NullCollapseViz a -> NullCollapseViz b # (<$) :: a -> NullCollapseViz b -> NullCollapseViz a # | |
Functor Infinite Source # | |
Functor OrdList Source # | |
Functor Pair Source # | |
Functor Maybe Source # | |
Functor Word64Map Source # | |
Functor KnotVars Source # | |
Functor Hsc Source # | |
Functor ModNodeMap Source # | |
Defined in GHC.Driver.Make Methods fmap :: (a -> b) -> ModNodeMap a -> ModNodeMap b # (<$) :: a -> ModNodeMap b -> ModNodeMap a # | |
Functor Ghc Source # | |
Functor HookedUse Source # | |
Functor MatchResult Source # | |
Defined in GHC.HsToCore.Monad Methods fmap :: (a -> b) -> MatchResult a -> MatchResult b # (<$) :: a -> MatchResult b -> MatchResult a # | |
Functor CheckAction Source # | |
Defined in GHC.HsToCore.Pmc.Check Methods fmap :: (a -> b) -> CheckAction a -> CheckAction b # (<$) :: a -> CheckAction b -> CheckAction a # | |
Functor CheckResult Source # | |
Defined in GHC.HsToCore.Pmc.Types Methods fmap :: (a -> b) -> CheckResult a -> CheckResult b # (<$) :: a -> CheckResult b -> CheckResult a # | |
Functor HieAST Source # | |
Functor HieASTs Source # | |
Functor HieArgs Source # | |
Functor HieType Source # | |
Functor IdentifierDetails Source # | |
Defined in GHC.Iface.Ext.Types Methods fmap :: (a -> b) -> IdentifierDetails a -> IdentifierDetails b # (<$) :: a -> IdentifierDetails b -> IdentifierDetails a # | |
Functor NodeInfo Source # | |
Functor SourcedNodeInfo Source # | |
Defined in GHC.Iface.Ext.Types Methods fmap :: (a -> b) -> SourcedNodeInfo a -> SourcedNodeInfo b # (<$) :: a -> SourcedNodeInfo b -> SourcedNodeInfo a # | |
Functor EvidenceInfo Source # | |
Defined in GHC.Iface.Ext.Utils Methods fmap :: (a -> b) -> EvidenceInfo a -> EvidenceInfo b # (<$) :: a -> EvidenceInfo b -> EvidenceInfo a # | |
Functor MaybeValidated Source # | |
Defined in GHC.Iface.Recomp Methods fmap :: (a -> b) -> MaybeValidated a -> MaybeValidated b # (<$) :: a -> MaybeValidated b -> MaybeValidated a # | |
Functor EpAnn Source # | |
Functor P Source # | |
Functor PV Source # | |
Functor CpsRn Source # | |
Functor LiftM Source # | |
Functor CmmParse Source # | |
Functor FCode Source # | |
Functor FunDepEqn Source # | |
Functor SolverStage Source # | |
Defined in GHC.Tc.Solver.Monad Methods fmap :: (a -> b) -> SolverStage a -> SolverStage b # (<$) :: a -> SolverStage b -> SolverStage a # | |
Functor StopOrContinue Source # | |
Defined in GHC.Tc.Solver.Monad Methods fmap :: (a -> b) -> StopOrContinue a -> StopOrContinue b # (<$) :: a -> StopOrContinue b -> StopOrContinue a # | |
Functor TcS Source # | |
Functor TcPluginM Source # | |
Functor ZonkM Source # | |
Functor AnnTarget Source # | |
Functor TyConFlavour Source # | |
Defined in GHC.Types.Basic Methods fmap :: (a -> b) -> TyConFlavour a -> TyConFlavour b # (<$) :: a -> TyConFlavour b -> TyConFlavour a # | |
Functor Messages Source # | |
Functor MsgEnvelope Source # | |
Defined in GHC.Types.Error Methods fmap :: (a -> b) -> MsgEnvelope a -> MsgEnvelope b # (<$) :: a -> MsgEnvelope b -> MsgEnvelope a # | |
Functor OccEnv Source # | |
Functor UniqSM Source # | |
Functor UnitEnvGraph Source # | |
Defined in GHC.Unit.Env Methods fmap :: (a -> b) -> UnitEnvGraph a -> UnitEnvGraph b # (<$) :: a -> UnitEnvGraph b -> UnitEnvGraph a # | |
Functor Definite Source # | |
Functor GenModule Source # | |
Functor GenWithIsBoot Source # | |
Defined in GHC.Unit.Types Methods fmap :: (a -> b) -> GenWithIsBoot a -> GenWithIsBoot b # (<$) :: a -> GenWithIsBoot b -> GenWithIsBoot a # | |
Functor Validity' Source # | |
Functor DataDefnCons Source # | |
Defined in Language.Haskell.Syntax.Decls Methods fmap :: (a -> b) -> DataDefnCons a -> DataDefnCons b # (<$) :: a -> DataDefnCons b -> DataDefnCons a # | |
Functor SizedSeq | |
Functor GenClosure | |
Defined in GHC.Exts.Heap.Closures Methods fmap :: (a -> b) -> GenClosure a -> GenClosure b # (<$) :: a -> GenClosure b -> GenClosure a # | |
Functor GenStackField | |
Defined in GHC.Exts.Heap.Closures Methods fmap :: (a -> b) -> GenStackField a -> GenStackField b # (<$) :: a -> GenStackField b -> GenStackField a # | |
Functor GenStackFrame | |
Defined in GHC.Exts.Heap.Closures Methods fmap :: (a -> b) -> GenStackFrame a -> GenStackFrame b # (<$) :: a -> GenStackFrame b -> GenStackFrame a # | |
Functor GenStgStackClosure | |
Defined in GHC.Exts.Heap.Closures Methods fmap :: (a -> b) -> GenStgStackClosure a -> GenStgStackClosure b # (<$) :: a -> GenStgStackClosure b -> GenStgStackClosure a # | |
Functor NonEmpty | |
Functor STM | |
Functor Handler | |
Functor Identity | |
Functor First | |
Functor Last | |
Functor Down | |
Functor Dual | |
Functor Product | |
Functor Sum | |
Functor ZipList | |
Functor Par1 | |
Functor P | |
Defined in GHC.Internal.Text.ParserCombinators.ReadP | |
Functor ReadP | |
Functor ReadPrec | |
Functor IO | |
Functor GHCiQ | |
Functor AnnotDetails | |
Defined in Text.PrettyPrint.Annotated.HughesPJ | |
Functor Doc | |
Defined in Text.PrettyPrint.Annotated.HughesPJ | |
Functor Span | |
Defined in Text.PrettyPrint.Annotated.HughesPJ | |
Functor PprM | |
Functor Q | |
Functor TyVarBndr | |
Functor Maybe | |
Functor Solo | |
Functor [] | |
Defined in GHC.Internal.Base | |
Monad m => Functor (WrappedMonad m) | Since: base-2.1 |
Defined in Control.Applicative Methods fmap :: (a -> b) -> WrappedMonad m a -> WrappedMonad m b # (<$) :: a -> WrappedMonad m b -> WrappedMonad m a # | |
Functor (Arg a) | Since: base-4.9.0.0 |
Functor (SetM s) | |
Defined in Data.Graph | |
Functor (Map k) | |
Monad m => Functor (Handler m) | |
Monad m => Functor (CatchT m) | |
Functor (MaybeO ex) Source # | |
Functor (RegAllocStats statics) Source # | |
Defined in GHC.CmmToAsm.Reg.Graph.Stats Methods fmap :: (a -> b) -> RegAllocStats statics a -> RegAllocStats statics b # (<$) :: a -> RegAllocStats statics b -> RegAllocStats statics a # | |
Functor (RegM freeRegs) Source # | |
Functor (WasmCodeGenM w) Source # | |
Defined in GHC.CmmToAsm.Wasm.Types Methods fmap :: (a -> b) -> WasmCodeGenM w a -> WasmCodeGenM w b # (<$) :: a -> WasmCodeGenM w b -> WasmCodeGenM w a # | |
Functor (Node key) Source # | |
Functor (Gr a) Source # | |
Functor (IOEnv env) Source # | |
Functor (MaybeErr err) Source # | |
Functor (Pair a) Source # | |
Functor m => Functor (GenMap m) Source # | |
Functor m => Functor (ListMap m) Source # | |
Functor m => Functor (MaybeMap m) Source # | |
Functor m => Functor (EwM m) Source # | |
Functor m => Functor (GhcT m) Source # | |
Functor (CmdLineP s) Source # | |
Functor (IfaceBindingX r) Source # | |
Defined in GHC.Iface.Syntax Methods fmap :: (a -> b) -> IfaceBindingX r a -> IfaceBindingX r b # (<$) :: a -> IfaceBindingX r b -> IfaceBindingX r a # | |
Functor (PuResult a) Source # | |
Functor (ZonkBndrT m) Source # | |
Functor m => Functor (ZonkT m) Source # | |
Functor (GenLocated l) Source # | |
Defined in GHC.Types.SrcLoc Methods fmap :: (a -> b) -> GenLocated l a -> GenLocated l b # (<$) :: a -> GenLocated l b -> GenLocated l a # | |
Functor (UniqMap k) Source # | |
Functor (Codensity k) Source # | |
Functor (State s) Source # | |
Functor (HsFieldBind lhs) Source # | |
Defined in Language.Haskell.Syntax.Pat Methods fmap :: (a -> b) -> HsFieldBind lhs a -> HsFieldBind lhs b # (<$) :: a -> HsFieldBind lhs b -> HsFieldBind lhs a # | |
Functor (DbOpenMode mode) | |
Defined in GHC.Unit.Database Methods fmap :: (a -> b) -> DbOpenMode mode a -> DbOpenMode mode b # (<$) :: a -> DbOpenMode mode b -> DbOpenMode mode a # | |
Functor (Array i) | |
Arrow a => Functor (ArrowMonad a) | |
Defined in GHC.Internal.Control.Arrow Methods fmap :: (a0 -> b) -> ArrowMonad a a0 -> ArrowMonad a b # (<$) :: a0 -> ArrowMonad a b -> ArrowMonad a a0 # | |
Functor (Either a) | |
Functor (Proxy :: Type -> Type) | |
Functor (U1 :: Type -> Type) | |
Functor (V1 :: Type -> Type) | |
Functor (ST s) | |
Functor f => Functor (Lift f) | |
Functor m => Functor (MaybeT m) | |
Functor ((,) a) | |
Defined in GHC.Internal.Base | |
Arrow a => Functor (WrappedArrow a b) | Since: base-2.1 |
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 # | |
(Applicative f, Monad f) => Functor (WhenMissing f x) | Since: containers-0.5.9 |
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 (GenCmmDecl d h) Source # | |
Defined in GHC.Cmm Methods fmap :: (a -> b) -> GenCmmDecl d h a -> GenCmmDecl d h b # (<$) :: a -> GenCmmDecl d h b -> GenCmmDecl d h a # | |
Functor (Stream f a) Source # | |
Functor m => Functor (StreamS m a) Source # | |
(Applicative f, Monad f) => Functor (WhenMissing f x) Source # | Since: ghc-0.5.9 |
Defined in GHC.Data.Word64Map.Internal Methods fmap :: (a -> b) -> WhenMissing f x a -> WhenMissing f x b # (<$) :: a -> WhenMissing f x b -> WhenMissing f x a # | |
Functor (UniqDFM key) Source # | |
Functor (NonDetUniqFM key) Source # | |
Defined in GHC.Types.Unique.FM Methods fmap :: (a -> b) -> NonDetUniqFM key a -> NonDetUniqFM key b # (<$) :: a -> NonDetUniqFM key b -> NonDetUniqFM key a # | |
Functor (UniqFM key) Source # | |
Functor m => Functor (Kleisli m a) | |
Functor (Const m :: Type -> Type) | |
Functor f => Functor (Ap f) | |
Functor f => Functor (Alt f) | |
(Generic1 f, Functor (Rep1 f)) => Functor (Generically1 f) | |
Defined in GHC.Internal.Generics Methods fmap :: (a -> b) -> Generically1 f a -> Generically1 f b # (<$) :: a -> Generically1 f b -> Generically1 f a # | |
Functor f => Functor (Rec1 f) | |
Functor (URec (Ptr ()) :: Type -> Type) | |
Functor (URec Char :: Type -> Type) | |
Functor (URec Double :: Type -> Type) | |
Functor (URec Float :: Type -> Type) | |
Functor (URec Int :: Type -> Type) | |
Functor (URec Word :: Type -> Type) | |
Functor f => Functor (Backwards f) | Derived instance. |
Functor m => Functor (AccumT w m) | |
Functor m => Functor (ExceptT e m) | |
Functor m => Functor (IdentityT m) | |
Functor m => Functor (ReaderT r m) | |
Functor m => Functor (SelectT r m) | |
Functor m => Functor (StateT s m) | |
Functor m => Functor (StateT s m) | |
Functor m => Functor (WriterT w m) | |
Functor m => Functor (WriterT w m) | |
Functor m => Functor (WriterT w m) | |
Functor (Constant a :: Type -> Type) | |
Functor f => Functor (Reverse f) | Derived instance. |
Functor ((,,) a b) | |
Defined in GHC.Internal.Base | |
(Functor f, Functor g) => Functor (Product f g) | Since: base-4.9.0.0 |
(Functor f, Functor g) => Functor (Sum f g) | Since: base-4.9.0.0 |
Functor f => Functor (WhenMatched f x y) | Since: containers-0.5.9 |
Defined in Data.IntMap.Internal Methods fmap :: (a -> b) -> WhenMatched f x y a -> WhenMatched f x y b # (<$) :: a -> WhenMatched f x y b -> WhenMatched f x y a # | |
(Applicative f, Monad f) => Functor (WhenMissing f k x) | Since: containers-0.5.9 |
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 f => Functor (WhenMatched f x y) Source # | Since: ghc-0.5.9 |
Defined in GHC.Data.Word64Map.Internal Methods fmap :: (a -> b) -> WhenMatched f x y a -> WhenMatched f x y b # (<$) :: a -> WhenMatched f x y b -> WhenMatched f x y a # | |
(Functor f, Functor g) => Functor (f :*: g) | |
(Functor f, Functor g) => Functor (f :+: g) | |
Functor (K1 i c :: Type -> Type) | |
Functor (ContT r m) | |
Functor ((,,,) a b c) | |
Defined in GHC.Internal.Base | |
Functor ((->) r) | |
Defined in GHC.Internal.Base | |
(Functor f, Functor g) => Functor (Compose f g) | Since: base-4.9.0.0 |
Functor f => Functor (WhenMatched f k x y) | Since: containers-0.5.9 |
Defined in Data.Map.Internal Methods fmap :: (a -> b) -> WhenMatched f k x y a -> WhenMatched f k x y b # (<$) :: a -> WhenMatched f k x y b -> WhenMatched f k x y a # | |
(Functor f, Functor g) => Functor (f :.: g) | |
Functor f => Functor (M1 i c f) | |
Functor m => Functor (RWST r w s m) | |
Functor m => Functor (RWST r w s m) | |
Functor m => Functor (RWST r w s m) | |
Functor ((,,,,) a b c d) | |
Defined in GHC.Internal.Base | |
Functor ((,,,,,) a b c d e) | |
Defined in GHC.Internal.Base | |
Functor ((,,,,,,) a b c d e f) | |
Defined in GHC.Internal.Base |
class Monad m => MonadFail (m :: Type -> Type) where #
Instances
MonadFail Get | |
Defined in Data.Binary.Get.Internal | |
MonadFail Ghc Source # | |
Defined in GHC.Driver.Monad | |
MonadFail TcS Source # | |
Defined in GHC.Tc.Solver.Monad | |
MonadFail TcPluginM Source # | |
Defined in GHC.Tc.Types | |
MonadFail UniqSM Source # | |
Defined in GHC.Types.Unique.Supply | |
MonadFail P | |
Defined in GHC.Internal.Text.ParserCombinators.ReadP | |
MonadFail ReadP | |
Defined in GHC.Internal.Text.ParserCombinators.ReadP | |
MonadFail ReadPrec | |
Defined in GHC.Internal.Text.ParserCombinators.ReadPrec | |
MonadFail IO | |
Defined in GHC.Internal.Control.Monad.Fail | |
MonadFail GHCiQ | |
MonadFail Q | |
Defined in Language.Haskell.TH.Syntax | |
MonadFail Maybe | |
Defined in GHC.Internal.Control.Monad.Fail | |
MonadFail [] | |
Defined in GHC.Internal.Control.Monad.Fail | |
Monad m => MonadFail (CatchT m) | |
Defined in Control.Monad.Catch.Pure | |
MonadFail (IOEnv m) Source # | |
Defined in GHC.Data.IOEnv | |
MonadFail m => MonadFail (GhcT m) Source # | |
Defined in GHC.Driver.Monad | |
Monad m => MonadFail (MaybeT m) | |
Defined in Control.Monad.Trans.Maybe | |
MonadFail f => MonadFail (Ap f) | |
Defined in GHC.Internal.Data.Monoid | |
(Monoid w, MonadFail m) => MonadFail (AccumT w m) | |
Defined in Control.Monad.Trans.Accum | |
MonadFail m => MonadFail (ExceptT e m) | |
Defined in Control.Monad.Trans.Except | |
MonadFail m => MonadFail (IdentityT m) | |
Defined in Control.Monad.Trans.Identity | |
MonadFail m => MonadFail (ReaderT r m) | |
Defined in Control.Monad.Trans.Reader | |
MonadFail m => MonadFail (SelectT r m) | |
Defined in Control.Monad.Trans.Select | |
MonadFail m => MonadFail (StateT s m) | |
Defined in Control.Monad.Trans.State.Lazy | |
MonadFail m => MonadFail (StateT s m) | |
Defined in Control.Monad.Trans.State.Strict | |
MonadFail m => MonadFail (WriterT w m) | |
Defined in Control.Monad.Trans.Writer.CPS | |
(Monoid w, MonadFail m) => MonadFail (WriterT w m) | |
Defined in Control.Monad.Trans.Writer.Lazy | |
(Monoid w, MonadFail m) => MonadFail (WriterT w m) | |
Defined in Control.Monad.Trans.Writer.Strict | |
MonadFail m => MonadFail (Reverse m) | |
Defined in Data.Functor.Reverse | |
MonadFail m => MonadFail (ContT r m) | |
Defined in Control.Monad.Trans.Cont | |
MonadFail m => MonadFail (RWST r w s m) | |
Defined in Control.Monad.Trans.RWS.CPS | |
(Monoid w, MonadFail m) => MonadFail (RWST r w s m) | |
Defined in Control.Monad.Trans.RWS.Lazy | |
(Monoid w, MonadFail m) => MonadFail (RWST r w s m) | |
Defined in Control.Monad.Trans.RWS.Strict |
fromIntegral :: (Integral a, Num b) => a -> b #
realToFrac :: (Real a, Fractional b) => a -> b #
class (Real a, Enum a) => Integral a where #
Methods
Instances
Integral ByteOff Source # | |
Defined in GHC.ByteCode.Types | |
Integral HalfWord Source # | |
Defined in GHC.ByteCode.Types | |
Integral RegBitmap Source # | |
Defined in GHC.ByteCode.Types Methods quot :: RegBitmap -> RegBitmap -> RegBitmap # rem :: RegBitmap -> RegBitmap -> RegBitmap # div :: RegBitmap -> RegBitmap -> RegBitmap # mod :: RegBitmap -> RegBitmap -> RegBitmap # quotRem :: RegBitmap -> RegBitmap -> (RegBitmap, RegBitmap) # divMod :: RegBitmap -> RegBitmap -> (RegBitmap, RegBitmap) # | |
Integral WordOff Source # | |
Defined in GHC.ByteCode.Types | |
Integral ByteOffset | |
Defined in GHC.Exts.Stack.Constants Methods quot :: ByteOffset -> ByteOffset -> ByteOffset # rem :: ByteOffset -> ByteOffset -> ByteOffset # div :: ByteOffset -> ByteOffset -> ByteOffset # mod :: ByteOffset -> ByteOffset -> ByteOffset # quotRem :: ByteOffset -> ByteOffset -> (ByteOffset, ByteOffset) # divMod :: ByteOffset -> ByteOffset -> (ByteOffset, ByteOffset) # toInteger :: ByteOffset -> Integer # | |
Integral WordOffset | |
Defined in GHC.Exts.Stack.Constants Methods quot :: WordOffset -> WordOffset -> WordOffset # rem :: WordOffset -> WordOffset -> WordOffset # div :: WordOffset -> WordOffset -> WordOffset # mod :: WordOffset -> WordOffset -> WordOffset # quotRem :: WordOffset -> WordOffset -> (WordOffset, WordOffset) # divMod :: WordOffset -> WordOffset -> (WordOffset, WordOffset) # toInteger :: WordOffset -> Integer # | |
Integral CBool | |
Integral CChar | |
Integral CInt | |
Integral CIntMax | |
Defined in GHC.Internal.Foreign.C.Types | |
Integral CIntPtr | |
Defined in GHC.Internal.Foreign.C.Types | |
Integral CLLong | |
Defined in GHC.Internal.Foreign.C.Types | |
Integral CLong | |
Integral CPtrdiff | |
Defined in GHC.Internal.Foreign.C.Types | |
Integral CSChar | |
Defined in GHC.Internal.Foreign.C.Types | |
Integral CShort | |
Defined in GHC.Internal.Foreign.C.Types | |
Integral CSigAtomic | |
Defined in GHC.Internal.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 | |
Integral CUChar | |
Defined in GHC.Internal.Foreign.C.Types | |
Integral CUInt | |
Integral CUIntMax | |
Defined in GHC.Internal.Foreign.C.Types | |
Integral CUIntPtr | |
Defined in GHC.Internal.Foreign.C.Types | |
Integral CULLong | |
Defined in GHC.Internal.Foreign.C.Types | |
Integral CULong | |
Defined in GHC.Internal.Foreign.C.Types | |
Integral CUShort | |
Defined in GHC.Internal.Foreign.C.Types | |
Integral CWchar | |
Defined in GHC.Internal.Foreign.C.Types | |
Integral Int16 | |
Integral Int32 | |
Integral Int64 | |
Integral Int8 | |
Integral CBlkCnt | |
Defined in GHC.Internal.System.Posix.Types | |
Integral CBlkSize | |
Defined in GHC.Internal.System.Posix.Types | |
Integral CClockId | |
Defined in GHC.Internal.System.Posix.Types | |
Integral CDev | |
Integral CFsBlkCnt | |
Defined in GHC.Internal.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) # | |
Integral CFsFilCnt | |
Defined in GHC.Internal.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) # | |
Integral CGid | |
Integral CId | |
Integral CIno | |
Integral CKey | |
Integral CMode | |
Integral CNfds | |
Integral CNlink | |
Defined in GHC.Internal.System.Posix.Types | |
Integral COff | |
Integral CPid | |
Integral CRLim | |
Integral CSocklen | |
Defined in GHC.Internal.System.Posix.Types | |
Integral CSsize | |
Defined in GHC.Internal.System.Posix.Types | |
Integral CTcflag | |
Defined in GHC.Internal.System.Posix.Types | |
Integral CUid | |
Integral Fd | |
Integral Word16 | |
Defined in GHC.Internal.Word | |
Integral Word32 | |
Defined in GHC.Internal.Word | |
Integral Word64 | |
Defined in GHC.Internal.Word | |
Integral Word8 | |
Integral StatxFlags | |
Defined in System.Posix.Files.Common Methods quot :: StatxFlags -> StatxFlags -> StatxFlags # rem :: StatxFlags -> StatxFlags -> StatxFlags # div :: StatxFlags -> StatxFlags -> StatxFlags # mod :: StatxFlags -> StatxFlags -> StatxFlags # quotRem :: StatxFlags -> StatxFlags -> (StatxFlags, StatxFlags) # divMod :: StatxFlags -> StatxFlags -> (StatxFlags, StatxFlags) # toInteger :: StatxFlags -> Integer # | |
Integral StatxMask | |
Defined in System.Posix.Files.Common Methods quot :: StatxMask -> StatxMask -> StatxMask # rem :: StatxMask -> StatxMask -> StatxMask # div :: StatxMask -> StatxMask -> StatxMask # mod :: StatxMask -> StatxMask -> StatxMask # quotRem :: StatxMask -> StatxMask -> (StatxMask, StatxMask) # divMod :: StatxMask -> StatxMask -> (StatxMask, StatxMask) # | |
Integral Integer | |
Defined in GHC.Internal.Real | |
Integral Natural | |
Defined in GHC.Internal.Real | |
Integral Int | |
Integral Word | |
Integral a => Integral (Identity a) | |
Defined in GHC.Internal.Data.Functor.Identity Methods quot :: Identity a -> Identity a -> Identity a # rem :: Identity a -> Identity a -> Identity a # div :: Identity a -> Identity a -> Identity a # mod :: Identity a -> Identity a -> Identity a # quotRem :: Identity a -> Identity a -> (Identity a, Identity a) # divMod :: Identity a -> Identity a -> (Identity a, Identity a) # | |
Integral a => Integral (Const a b) | |
Defined in GHC.Internal.Data.Functor.Const Methods quot :: Const a b -> Const a b -> Const a b # rem :: Const a b -> Const a b -> Const a b # div :: Const a b -> Const a b -> Const a b # mod :: Const a b -> Const a b -> Const a b # quotRem :: Const a b -> Const a b -> (Const a b, Const a b) # divMod :: Const a b -> Const a b -> (Const a b, Const a b) # | |
Integral (f (g a)) => Integral (Compose f g a) | Since: base-4.19.0.0 |
Defined in Data.Functor.Compose Methods quot :: Compose f g a -> Compose f g a -> Compose f g a # rem :: Compose f g a -> Compose f g a -> Compose f g a # div :: Compose f g a -> Compose f g a -> Compose f g a # mod :: Compose f g a -> Compose f g a -> Compose f g a # quotRem :: Compose f g a -> Compose f g a -> (Compose f g a, Compose f g a) # divMod :: Compose f g a -> Compose f g a -> (Compose f g a, Compose f g a) # |
class (Num a, Ord a) => Real a where #
Methods
toRational :: a -> Rational #
Instances
Real ByteOff Source # | |
Defined in GHC.ByteCode.Types Methods toRational :: ByteOff -> Rational # | |
Real HalfWord Source # | |
Defined in GHC.ByteCode.Types Methods toRational :: HalfWord -> Rational # | |
Real RegBitmap Source # | |
Defined in GHC.ByteCode.Types Methods toRational :: RegBitmap -> Rational # | |
Real WordOff Source # | |
Defined in GHC.ByteCode.Types Methods toRational :: WordOff -> Rational # | |
Real EdgeWeight Source # | |
Defined in GHC.CmmToAsm.CFG Methods toRational :: EdgeWeight -> Rational # | |
Real ByteOffset | |
Defined in GHC.Exts.Stack.Constants Methods toRational :: ByteOffset -> Rational # | |
Real WordOffset | |
Defined in GHC.Exts.Stack.Constants Methods toRational :: WordOffset -> Rational # | |
Real CBool | |
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CBool -> Rational # | |
Real CChar | |
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CChar -> Rational # | |
Real CClock | |
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CClock -> Rational # | |
Real CDouble | |
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CDouble -> Rational # | |
Real CFloat | |
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CFloat -> Rational # | |
Real CInt | |
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CInt -> Rational # | |
Real CIntMax | |
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CIntMax -> Rational # | |
Real CIntPtr | |
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CIntPtr -> Rational # | |
Real CLLong | |
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CLLong -> Rational # | |
Real CLong | |
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CLong -> Rational # | |
Real CPtrdiff | |
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CPtrdiff -> Rational # | |
Real CSChar | |
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CSChar -> Rational # | |
Real CSUSeconds | |
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CSUSeconds -> Rational # | |
Real CShort | |
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CShort -> Rational # | |
Real CSigAtomic | |
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CSigAtomic -> Rational # | |
Real CSize | |
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CSize -> Rational # | |
Real CTime | |
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CTime -> Rational # | |
Real CUChar | |
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CUChar -> Rational # | |
Real CUInt | |
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CUInt -> Rational # | |
Real CUIntMax | |
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CUIntMax -> Rational # | |
Real CUIntPtr | |
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CUIntPtr -> Rational # | |
Real CULLong | |
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CULLong -> Rational # | |
Real CULong | |
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CULong -> Rational # | |
Real CUSeconds | |
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CUSeconds -> Rational # | |
Real CUShort | |
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CUShort -> Rational # | |
Real CWchar | |
Defined in GHC.Internal.Foreign.C.Types Methods toRational :: CWchar -> Rational # | |
Real Int16 | |
Defined in GHC.Internal.Int Methods toRational :: Int16 -> Rational # | |
Real Int32 | |
Defined in GHC.Internal.Int Methods toRational :: Int32 -> Rational # | |
Real Int64 | |
Defined in GHC.Internal.Int Methods toRational :: Int64 -> Rational # | |
Real Int8 | |
Defined in GHC.Internal.Int Methods toRational :: Int8 -> Rational # | |
Real CBlkCnt | |
Defined in GHC.Internal.System.Posix.Types Methods toRational :: CBlkCnt -> Rational # | |
Real CBlkSize | |
Defined in GHC.Internal.System.Posix.Types Methods toRational :: CBlkSize -> Rational # | |
Real CCc | |
Defined in GHC.Internal.System.Posix.Types Methods toRational :: CCc -> Rational # | |
Real CClockId | |
Defined in GHC.Internal.System.Posix.Types Methods toRational :: CClockId -> Rational # | |
Real CDev | |
Defined in GHC.Internal.System.Posix.Types Methods toRational :: CDev -> Rational # | |
Real CFsBlkCnt | |
Defined in GHC.Internal.System.Posix.Types Methods toRational :: CFsBlkCnt -> Rational # | |
Real CFsFilCnt | |
Defined in GHC.Internal.System.Posix.Types Methods toRational :: CFsFilCnt -> Rational # | |
Real CGid | |
Defined in GHC.Internal.System.Posix.Types Methods toRational :: CGid -> Rational # | |
Real CId | |
Defined in GHC.Internal.System.Posix.Types Methods toRational :: CId -> Rational # | |
Real CIno | |
Defined in GHC.Internal.System.Posix.Types Methods toRational :: CIno -> Rational # | |
Real CKey | |
Defined in GHC.Internal.System.Posix.Types Methods toRational :: CKey -> Rational # | |
Real CMode | |
Defined in GHC.Internal.System.Posix.Types Methods toRational :: CMode -> Rational # | |
Real CNfds | |
Defined in GHC.Internal.System.Posix.Types Methods toRational :: CNfds -> Rational # | |
Real CNlink | |
Defined in GHC.Internal.System.Posix.Types Methods toRational :: CNlink -> Rational # | |
Real COff | |
Defined in GHC.Internal.System.Posix.Types Methods toRational :: COff -> Rational # | |
Real CPid | |
Defined in GHC.Internal.System.Posix.Types Methods toRational :: CPid -> Rational # | |
Real CRLim | |
Defined in GHC.Internal.System.Posix.Types Methods toRational :: CRLim -> Rational # | |
Real CSocklen | |
Defined in GHC.Internal.System.Posix.Types Methods toRational :: CSocklen -> Rational # | |
Real CSpeed | |
Defined in GHC.Internal.System.Posix.Types Methods toRational :: CSpeed -> Rational # | |
Real CSsize | |
Defined in GHC.Internal.System.Posix.Types Methods toRational :: CSsize -> Rational # | |
Real CTcflag | |
Defined in GHC.Internal.System.Posix.Types Methods toRational :: CTcflag -> Rational # | |
Real CUid | |
Defined in GHC.Internal.System.Posix.Types Methods toRational :: CUid -> Rational # | |
Real Fd | |
Defined in GHC.Internal.System.Posix.Types Methods toRational :: Fd -> Rational # | |
Real Word16 | |
Defined in GHC.Internal.Word Methods toRational :: Word16 -> Rational # | |
Real Word32 | |
Defined in GHC.Internal.Word Methods toRational :: Word32 -> Rational # | |
Real Word64 | |
Defined in GHC.Internal.Word Methods toRational :: Word64 -> Rational # | |
Real Word8 | |
Defined in GHC.Internal.Word Methods toRational :: Word8 -> Rational # | |
Real DiffTime | |
Defined in Data.Time.Clock.Internal.DiffTime Methods toRational :: DiffTime -> Rational # | |
Real StatxFlags | |
Defined in System.Posix.Files.Common Methods toRational :: StatxFlags -> Rational # | |
Real StatxMask | |
Defined in System.Posix.Files.Common Methods toRational :: StatxMask -> Rational # | |
Real Integer | |
Defined in GHC.Internal.Real Methods toRational :: Integer -> Rational # | |
Real Natural | |
Defined in GHC.Internal.Real Methods toRational :: Natural -> Rational # | |
Real Int | |
Defined in GHC.Internal.Real Methods toRational :: Int -> Rational # | |
Real Word | |
Defined in GHC.Internal.Real Methods toRational :: Word -> Rational # | |
Real a => Real (Identity a) | |
Defined in GHC.Internal.Data.Functor.Identity Methods toRational :: Identity a -> Rational # | |
Real a => Real (Down a) | |
Defined in GHC.Internal.Data.Ord Methods toRational :: Down a -> Rational # | |
Integral a => Real (Ratio a) | |
Defined in GHC.Internal.Real Methods toRational :: Ratio a -> Rational # | |
HasResolution a => Real (Fixed a) | Since: base-2.1 |
Defined in Data.Fixed Methods toRational :: Fixed a -> Rational # | |
Real a => Real (Const a b) | |
Defined in GHC.Internal.Data.Functor.Const Methods toRational :: Const a b -> Rational # | |
Real (f (g a)) => Real (Compose f g a) | Since: base-4.19.0.0 |
Defined in Data.Functor.Compose Methods toRational :: Compose f g a -> Rational # |
class Semigroup a => Monoid a where #
Instances
Monoid ByteArray | Since: base-4.17.0.0 |
Monoid Builder | |
Monoid ByteString | |
Defined in Data.ByteString.Internal.Type Methods mempty :: ByteString # mappend :: ByteString -> ByteString -> ByteString # mconcat :: [ByteString] -> ByteString # | |
Monoid ByteString | |
Defined in Data.ByteString.Lazy.Internal Methods mempty :: ByteString # mappend :: ByteString -> ByteString -> ByteString # mconcat :: [ByteString] -> ByteString # | |
Monoid ShortByteString | |
Defined in Data.ByteString.Short.Internal Methods mappend :: ShortByteString -> ShortByteString -> ShortByteString # mconcat :: [ShortByteString] -> ShortByteString # | |
Monoid IntSet | |
Monoid LabelSet Source # | |
Monoid FastString Source # | |
Defined in GHC.Data.FastString Methods mempty :: FastString # mappend :: FastString -> FastString -> FastString # mconcat :: [FastString] -> FastString # | |
Monoid Word64Set Source # | |
Monoid PluginRecompile Source # | |
Defined in GHC.Driver.Plugins Methods mappend :: PluginRecompile -> PluginRecompile -> PluginRecompile # mconcat :: [PluginRecompile] -> PluginRecompile # | |
Monoid Nablas Source # | |
Monoid Precision Source # | |
Monoid RecompileRequired Source # | |
Defined in GHC.Iface.Recomp Methods mappend :: RecompileRequired -> RecompileRequired -> RecompileRequired # mconcat :: [RecompileRequired] -> RecompileRequired # | |
Monoid IfaceAppArgs Source # | |
Defined in GHC.Iface.Type Methods mempty :: IfaceAppArgs # mappend :: IfaceAppArgs -> IfaceAppArgs -> IfaceAppArgs # mconcat :: [IfaceAppArgs] -> IfaceAppArgs # | |
Monoid JStgStat Source # | |
Monoid JStat Source # | |
Monoid IPEStats Source # | |
Monoid CIStatic Source # | |
Monoid Archive Source # | |
Monoid CheckTyEqResult Source # | |
Defined in GHC.Tc.Types.Constraint Methods mappend :: CheckTyEqResult -> CheckTyEqResult -> CheckTyEqResult # mconcat :: [CheckTyEqResult] -> CheckTyEqResult # | |
Monoid HasGivenEqs Source # | |
Defined in GHC.Tc.Types.Constraint Methods mempty :: HasGivenEqs # mappend :: HasGivenEqs -> HasGivenEqs -> HasGivenEqs # mconcat :: [HasGivenEqs] -> HasGivenEqs # | |
Monoid RewriterSet Source # | |
Defined in GHC.Tc.Types.Constraint Methods mempty :: RewriterSet # mappend :: RewriterSet -> RewriterSet -> RewriterSet # mconcat :: [RewriterSet] -> RewriterSet # | |
Monoid HsWrapper Source # | |
Monoid CandidatesQTvs Source # | |
Defined in GHC.Tc.Utils.TcMType Methods mappend :: CandidatesQTvs -> CandidatesQTvs -> CandidatesQTvs # mconcat :: [CandidatesQTvs] -> CandidatesQTvs # | |
Monoid InsideLam Source # | |
Monoid InterestingCxt Source # | |
Defined in GHC.Types.Basic Methods mappend :: InterestingCxt -> InterestingCxt -> InterestingCxt # mconcat :: [InterestingCxt] -> InterestingCxt # | |
Monoid CHeader Source # | |
Monoid CStub Source # | |
Monoid NonCaffySet Source # | |
Defined in GHC.Types.Name.Set Methods mempty :: NonCaffySet # mappend :: NonCaffySet -> NonCaffySet -> NonCaffySet # mconcat :: [NonCaffySet] -> NonCaffySet # | |
Monoid ModuleOrigin Source # | |
Defined in GHC.Unit.State Methods mempty :: ModuleOrigin # mappend :: ModuleOrigin -> ModuleOrigin -> ModuleOrigin # mconcat :: [ModuleOrigin] -> ModuleOrigin # | |
Monoid PprColour Source # | Allow colours to be combined (e.g. bold + red); In case of conflict, right side takes precedence. |
Monoid ShortText | |
Monoid All | |
Monoid Any | |
Monoid ExceptionContext | |
Defined in GHC.Internal.Exception.Context Methods mappend :: ExceptionContext -> ExceptionContext -> ExceptionContext # mconcat :: [ExceptionContext] -> ExceptionContext # | |
Monoid Ordering | |
Monoid OsString | |
Monoid PosixString | |
Defined in System.OsString.Internal.Types Methods mempty :: PosixString # mappend :: PosixString -> PosixString -> PosixString # mconcat :: [PosixString] -> PosixString # | |
Monoid WindowsString | |
Defined in System.OsString.Internal.Types Methods mempty :: WindowsString # mappend :: WindowsString -> WindowsString -> WindowsString # mconcat :: [WindowsString] -> WindowsString # | |
Monoid Doc | |
Monoid StatxFlags | |
Defined in System.Posix.Files.Common Methods mempty :: StatxFlags # mappend :: StatxFlags -> StatxFlags -> StatxFlags # mconcat :: [StatxFlags] -> StatxFlags # | |
Monoid StatxMask | |
Monoid () | |
Monoid (Comparison a) |
mempty :: Comparison a mempty = Comparison _ _ -> EQ |
Defined in Data.Functor.Contravariant Methods mempty :: Comparison a # mappend :: Comparison a -> Comparison a -> Comparison a # mconcat :: [Comparison a] -> Comparison a # | |
Monoid (Equivalence a) |
mempty :: Equivalence a mempty = Equivalence _ _ -> True |
Defined in Data.Functor.Contravariant Methods mempty :: Equivalence a # mappend :: Equivalence a -> Equivalence a -> Equivalence a # mconcat :: [Equivalence a] -> Equivalence a # | |
Monoid (Predicate a) |
mempty :: Predicate a mempty = _ -> True |
(Ord a, Bounded a) => Monoid (Max a) | Since: base-4.9.0.0 |
(Ord a, Bounded a) => Monoid (Min a) | Since: base-4.9.0.0 |
Monoid m => Monoid (WrappedMonoid m) | Since: base-4.9.0.0 |
Defined in Data.Semigroup Methods mempty :: WrappedMonoid m # mappend :: WrappedMonoid m -> WrappedMonoid m -> WrappedMonoid m # mconcat :: [WrappedMonoid m] -> WrappedMonoid m # | |
Monoid (PutM ()) | |
Monoid (IntMap a) | |
Monoid (Seq a) | |
Monoid (MergeSet a) | |
Ord a => Monoid (Set a) | |
Monoid (Bag a) Source # | |
Monoid (OrdList a) Source # | |
(Semigroup a, Monoid a) => Monoid (Pair a) Source # | |
Semigroup a => Monoid (Maybe a) Source # | |
Monoid (Word64Map a) Source # | |
Monoid (IdentifierDetails a) Source # | |
Defined in GHC.Iface.Ext.Types Methods mempty :: IdentifierDetails a # mappend :: IdentifierDetails a -> IdentifierDetails a -> IdentifierDetails a # mconcat :: [IdentifierDetails a] -> IdentifierDetails a # | |
Monoid (AnnSortKey tag) Source # | |
Defined in GHC.Parser.Annotation Methods mempty :: AnnSortKey tag # mappend :: AnnSortKey tag -> AnnSortKey tag -> AnnSortKey tag # mconcat :: [AnnSortKey tag] -> AnnSortKey tag # | |
Monoid (Messages e) Source # | |
Monoid (UniqSet a) Source # | |
Monoid a => Monoid (STM a) | |
FiniteBits a => Monoid (And a) | |
FiniteBits a => Monoid (Iff a) | |
Bits a => Monoid (Ior a) | |
Bits a => Monoid (Xor a) | |
Monoid a => Monoid (Identity a) | |
Monoid (First a) | |
Monoid (Last a) | |
Monoid a => Monoid (Down a) | |
Monoid a => Monoid (Dual a) | |
Monoid (Endo a) | |
Num a => Monoid (Product a) | |
Num a => Monoid (Sum a) | |
(Generic a, Monoid (Rep a ())) => Monoid (Generically a) | |
Defined in GHC.Internal.Generics Methods mempty :: Generically a # mappend :: Generically a -> Generically a -> Generically a # mconcat :: [Generically a] -> Generically a # | |
Monoid p => Monoid (Par1 p) | |
Monoid a => Monoid (IO a) | |
Monoid (Doc a) | |
Monoid a => Monoid (Q a) | Since: template-haskell-2.17.0.0 |
Semigroup a => Monoid (Maybe a) | |
Monoid a => Monoid (Solo a) | |
Monoid [a] | |
Monoid a => Monoid (Op a b) |
mempty :: Op a b mempty = Op _ -> mempty |
Ord k => Monoid (Map k v) | |
Monoid (EnumSet a) Source # | |
Monoid (UniqMap k a) Source # | |
Monoid (Proxy s) | |
Monoid (U1 p) | |
Monoid a => Monoid (ST s a) | |
(Monoid a, Monoid b) => Monoid (a, b) | |
Monoid b => Monoid (a -> b) | |
Monoid (UniqFM key a) Source # | |
Monoid a => Monoid (Const a b) | |
(Applicative f, Monoid a) => Monoid (Ap f a) | |
Alternative f => Monoid (Alt f a) | |
Monoid (f p) => Monoid (Rec1 f p) | |
Monoid a => Monoid (Constant a b) | |
(Monoid a, Monoid b, Monoid c) => Monoid (a, b, c) | |
(Monoid (f a), Monoid (g a)) => Monoid (Product f g a) | Since: base-4.16.0.0 |
(Monoid (f p), Monoid (g p)) => Monoid ((f :*: g) p) | |
Monoid c => Monoid (K1 i c p) | |
(Monoid a, Monoid b, Monoid c, Monoid d) => Monoid (a, b, c, d) | |
Monoid (f (g a)) => Monoid (Compose f g a) | Since: base-4.16.0.0 |
Monoid (f (g p)) => Monoid ((f :.: g) p) | |
Monoid (f p) => Monoid (M1 i c f p) | |
(Monoid a, Monoid b, Monoid c, Monoid d, Monoid e) => Monoid (a, b, c, d, e) | |
Instances
Bounded FileType | |
Bounded XdgDirectory | |
Defined in System.Directory.Internal.Common | |
Bounded XdgDirectoryList | |
Defined in System.Directory.Internal.Common | |
Bounded OverridingBool Source # | Since: ghc-9.4.1 |
Defined in GHC.Data.Bool | |
Bounded Language Source # | |
Bounded WarningFlag Source # | |
Defined in GHC.Driver.Flags | |
Bounded WarningGroup Source # | |
Defined in GHC.Driver.Flags | |
Bounded StgReg Source # | |
Bounded StgRet Source # | |
Bounded ClosureType Source # | |
Defined in GHC.StgToJS.Types | |
Bounded JSRep Source # | |
Bounded ThreadStatus Source # | |
Defined in GHC.StgToJS.Types | |
Bounded Extension | |
Bounded ByteOrder | |
Bounded All | |
Bounded Any | |
Bounded CBool | |
Bounded CChar | |
Bounded CInt | |
Bounded CIntMax | |
Bounded CIntPtr | |
Bounded CLLong | |
Bounded CLong | |
Bounded CPtrdiff | |
Bounded CSChar | |
Bounded CShort | |
Bounded CSigAtomic | |
Defined in GHC.Internal.Foreign.C.Types | |
Bounded CSize | |
Bounded CUChar | |
Bounded CUInt | |
Bounded CUIntMax | |
Bounded CUIntPtr | |
Bounded CULLong | |
Bounded CULong | |
Bounded CUShort | |
Bounded CWchar | |
Bounded Associativity | |
Defined in GHC.Internal.Generics | |
Bounded DecidedStrictness | |
Defined in GHC.Internal.Generics | |
Bounded SourceStrictness | |
Defined in GHC.Internal.Generics | |
Bounded SourceUnpackedness | |
Defined in GHC.Internal.Generics | |
Bounded Int16 | |
Bounded Int32 | |
Bounded Int64 | |
Bounded Int8 | |
Bounded CBlkCnt | |
Defined in GHC.Internal.System.Posix.Types | |
Bounded CBlkSize | |
Defined in GHC.Internal.System.Posix.Types | |
Bounded CClockId | |
Defined in GHC.Internal.System.Posix.Types | |
Bounded CDev | |
Defined in GHC.Internal.System.Posix.Types | |
Bounded CFsBlkCnt | |
Defined in GHC.Internal.System.Posix.Types | |
Bounded CFsFilCnt | |
Defined in GHC.Internal.System.Posix.Types | |
Bounded CGid | |
Bounded CId | |
Defined in GHC.Internal.System.Posix.Types | |
Bounded CIno | |
Defined in GHC.Internal.System.Posix.Types | |
Bounded CKey | |
Defined in GHC.Internal.System.Posix.Types | |
Bounded CMode | |
Defined in GHC.Internal.System.Posix.Types | |
Bounded CNfds | |
Defined in GHC.Internal.System.Posix.Types | |
Bounded CNlink | |
Defined in GHC.Internal.System.Posix.Types | |
Bounded COff | |
Defined in GHC.Internal.System.Posix.Types | |
Bounded CPid | |
Defined in GHC.Internal.System.Posix.Types | |
Bounded CRLim | |
Defined in GHC.Internal.System.Posix.Types | |
Bounded CSocklen | |
Defined in GHC.Internal.System.Posix.Types | |
Bounded CSsize | |
Defined in GHC.Internal.System.Posix.Types | |
Bounded CTcflag | |
Defined in GHC.Internal.System.Posix.Types | |
Bounded CUid | |
Defined in GHC.Internal.System.Posix.Types | |
Bounded Fd | |
Defined in GHC.Internal.System.Posix.Types | |
Bounded GeneralCategory | |
Defined in GHC.Internal.Unicode | |
Bounded Word16 | |
Bounded Word32 | |
Bounded Word64 | |
Bounded Word8 | |
Bounded Ordering | |
Bounded QuarterOfYear | |
Defined in Data.Time.Calendar.Quarter | |
Bounded () | |
Defined in GHC.Internal.Enum | |
Bounded Bool | |
Bounded Char | |
Bounded Int | |
Bounded Levity | |
Bounded VecCount | |
Bounded VecElem | |
Bounded Word | |
Bounded a => Bounded (First a) | Since: base-4.9.0.0 |
Bounded a => Bounded (Last a) | Since: base-4.9.0.0 |
Bounded a => Bounded (Max a) | Since: base-4.9.0.0 |
Bounded a => Bounded (Min a) | Since: base-4.9.0.0 |
Bounded m => Bounded (WrappedMonoid m) | Since: base-4.9.0.0 |
Defined in Data.Semigroup | |
Bounded a => Bounded (And a) | |
Bounded a => Bounded (Iff a) | |
Bounded a => Bounded (Ior a) | |
Bounded a => Bounded (Xor a) | |
Bounded a => Bounded (Identity a) | |
Bounded a => Bounded (Down a) | |
Bounded a => Bounded (Dual a) | |
Bounded a => Bounded (Product a) | |
Bounded a => Bounded (Sum a) | |
Bounded a => Bounded (Solo a) | |
Bounded (Bin a) Source # | |
Bounded (Proxy t) | |
(Bounded a, Bounded b) => Bounded (a, b) | |
Defined in GHC.Internal.Enum | |
Bounded a => Bounded (Const a b) | |
(Applicative f, Bounded a) => Bounded (Ap f a) | |
a ~ b => Bounded (a :~: b) | |
(Bounded a, Bounded b, Bounded c) => Bounded (a, b, c) | |
Defined in GHC.Internal.Enum | |
a ~~ b => Bounded (a :~~: b) | |
(Bounded a, Bounded b, Bounded c, Bounded d) => Bounded (a, b, c, d) | |
Defined in GHC.Internal.Enum | |
Bounded (f (g a)) => Bounded (Compose f g a) | Since: base-4.19.0.0 |
(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e) => Bounded (a, b, c, d, e) | |
Defined in GHC.Internal.Enum | |
(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f) => Bounded (a, b, c, d, e, f) | |
Defined in GHC.Internal.Enum | |
(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g) => Bounded (a, b, c, d, e, f, g) | |
Defined in GHC.Internal.Enum | |
(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) | |
Defined in GHC.Internal.Enum | |
(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) | |
Defined in GHC.Internal.Enum | |
(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) | |
Defined in GHC.Internal.Enum | |
(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) | |
Defined in GHC.Internal.Enum | |
(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) | |
Defined in GHC.Internal.Enum | |
(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) | |
Defined in GHC.Internal.Enum | |
(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) | |
Defined in GHC.Internal.Enum | |
(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) | |
Defined in GHC.Internal.Enum |
class Fractional a => Floating a where #
Minimal complete definition
pi, exp, log, sin, cos, asin, acos, atan, sinh, cosh, asinh, acosh, atanh
Methods
Instances
Floating CDouble | |
Floating CFloat | |
Floating Double | |
Floating Float | |
RealFloat a => Floating (Complex a) | Since: base-2.1 |
Defined in Data.Complex Methods 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 # | |
Floating a => Floating (Identity a) | |
Defined in GHC.Internal.Data.Functor.Identity Methods exp :: Identity a -> Identity a # log :: Identity a -> Identity a # sqrt :: Identity a -> Identity a # (**) :: Identity a -> Identity a -> Identity a # logBase :: Identity a -> Identity a -> Identity a # sin :: Identity a -> Identity a # cos :: Identity a -> Identity a # tan :: Identity a -> Identity a # asin :: Identity a -> Identity a # acos :: Identity a -> Identity a # atan :: Identity a -> Identity a # sinh :: Identity a -> Identity a # cosh :: Identity a -> Identity a # tanh :: Identity a -> Identity a # asinh :: Identity a -> Identity a # acosh :: Identity a -> Identity a # atanh :: Identity a -> Identity a # log1p :: Identity a -> Identity a # expm1 :: Identity a -> Identity a # | |
Floating a => Floating (Down a) | |
Floating a => Floating (Op a b) | |
Floating a => Floating (Const a b) | |
Defined in GHC.Internal.Data.Functor.Const Methods 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 # | |
Floating (f (g a)) => Floating (Compose f g a) | Since: base-4.20.0.0 |
Defined in Data.Functor.Compose Methods exp :: Compose f g a -> Compose f g a # log :: Compose f g a -> Compose f g a # sqrt :: Compose f g a -> Compose f g a # (**) :: Compose f g a -> Compose f g a -> Compose f g a # logBase :: Compose f g a -> Compose f g a -> Compose f g a # sin :: Compose f g a -> Compose f g a # cos :: Compose f g a -> Compose f g a # tan :: Compose f g a -> Compose f g a # asin :: Compose f g a -> Compose f g a # acos :: Compose f g a -> Compose f g a # atan :: Compose f g a -> Compose f g a # sinh :: Compose f g a -> Compose f g a # cosh :: Compose f g a -> Compose f g a # tanh :: Compose f g a -> Compose f g a # asinh :: Compose f g a -> Compose f g a # acosh :: Compose f g a -> Compose f g a # atanh :: Compose f g a -> Compose f g a # log1p :: Compose f g a -> Compose f g a # expm1 :: Compose f g a -> Compose f g a # |
Instances
Read ByteString | |
Defined in Data.ByteString.Internal.Type Methods readsPrec :: Int -> ReadS ByteString # readList :: ReadS [ByteString] # readPrec :: ReadPrec ByteString # readListPrec :: ReadPrec [ByteString] # | |
Read ByteString | |
Defined in Data.ByteString.Lazy.Internal Methods readsPrec :: Int -> ReadS ByteString # readList :: ReadS [ByteString] # readPrec :: ReadPrec ByteString # readListPrec :: ReadPrec [ByteString] # | |
Read ShortByteString | |
Defined in Data.ByteString.Short.Internal Methods readsPrec :: Int -> ReadS ShortByteString # readList :: ReadS [ShortByteString] # | |
Read IntSet | |
Read FileType | |
Read Permissions | |
Defined in System.Directory.Internal.Common Methods readsPrec :: Int -> ReadS Permissions # readList :: ReadS [Permissions] # readPrec :: ReadPrec Permissions # readListPrec :: ReadPrec [Permissions] # | |
Read XdgDirectory | |
Defined in System.Directory.Internal.Common Methods readsPrec :: Int -> ReadS XdgDirectory # readList :: ReadS [XdgDirectory] # | |
Read XdgDirectoryList | |
Defined in System.Directory.Internal.Common Methods readsPrec :: Int -> ReadS XdgDirectoryList # readList :: ReadS [XdgDirectoryList] # | |
Read OverridingBool Source # | Since: ghc-9.4.1 |
Defined in GHC.Data.Bool Methods readsPrec :: Int -> ReadS OverridingBool # readList :: ReadS [OverridingBool] # | |
Read Word64Set Source # | |
Read Platform Source # | |
Read PlatformWordSize Source # | |
Defined in GHC.Platform Methods readsPrec :: Int -> ReadS PlatformWordSize # readList :: ReadS [PlatformWordSize] # | |
Read PlatformConstants Source # | |
Defined in GHC.Platform.Constants Methods readsPrec :: Int -> ReadS PlatformConstants # readList :: ReadS [PlatformConstants] # | |
Read Profile Source # | |
Read Way Source # | |
Read StgLiftConfig Source # | |
Defined in GHC.Stg.Lift.Config Methods readsPrec :: Int -> ReadS StgLiftConfig # readList :: ReadS [StgLiftConfig] # | |
Read StgToDo Source # | |
Read Void | |
Read ByteOrder | |
Read All | |
Read Any | |
Read Version | |
Read CBool | |
Read CChar | |
Read CClock | |
Read CDouble | |
Read CFloat | |
Read CInt | |
Read CIntMax | |
Read CIntPtr | |
Read CLLong | |
Read CLong | |
Read CPtrdiff | |
Read CSChar | |
Read CSUSeconds | |
Defined in GHC.Internal.Foreign.C.Types Methods readsPrec :: Int -> ReadS CSUSeconds # readList :: ReadS [CSUSeconds] # readPrec :: ReadPrec CSUSeconds # readListPrec :: ReadPrec [CSUSeconds] # | |
Read CShort | |
Read CSigAtomic | |
Defined in GHC.Internal.Foreign.C.Types Methods readsPrec :: Int -> ReadS CSigAtomic # readList :: ReadS [CSigAtomic] # readPrec :: ReadPrec CSigAtomic # readListPrec :: ReadPrec [CSigAtomic] # | |
Read CSize | |
Read CTime | |
Read CUChar | |
Read CUInt | |
Read CUIntMax | |
Read CUIntPtr | |
Read CULLong | |
Read CULong | |
Read CUSeconds | |
Read CUShort | |
Read CWchar | |
Read Associativity | |
Defined in GHC.Internal.Generics Methods readsPrec :: Int -> ReadS Associativity # readList :: ReadS [Associativity] # | |
Read DecidedStrictness | |
Defined in GHC.Internal.Generics Methods readsPrec :: Int -> ReadS DecidedStrictness # readList :: ReadS [DecidedStrictness] # | |
Read Fixity | |
Read SourceStrictness | |
Defined in GHC.Internal.Generics Methods readsPrec :: Int -> ReadS SourceStrictness # readList :: ReadS [SourceStrictness] # | |
Read SourceUnpackedness | |
Defined in GHC.Internal.Generics Methods readsPrec :: Int -> ReadS SourceUnpackedness # readList :: ReadS [SourceUnpackedness] # | |
Read ExitCode | |
Read BufferMode | |
Defined in GHC.Internal.IO.Handle.Types Methods readsPrec :: Int -> ReadS BufferMode # readList :: ReadS [BufferMode] # readPrec :: ReadPrec BufferMode # readListPrec :: ReadPrec [BufferMode] # | |
Read Newline | |
Read NewlineMode | |
Defined in GHC.Internal.IO.Handle.Types Methods readsPrec :: Int -> ReadS NewlineMode # readList :: ReadS [NewlineMode] # readPrec :: ReadPrec NewlineMode # readListPrec :: ReadPrec [NewlineMode] # | |
Read IOMode | |
Read Int16 | |
Read Int32 | |
Read Int64 | |
Read Int8 | |
Read CBlkCnt | |
Read CBlkSize | |
Read CCc | |
Read CClockId | |
Read CDev | |
Read CFsBlkCnt | |
Read CFsFilCnt | |
Read CGid | |
Read CId | |
Read CIno | |
Read CKey | |
Read CMode | |
Read CNfds | |
Read CNlink | |
Read COff | |
Read CPid | |
Read CRLim | |
Read CSocklen | |
Read CSpeed | |
Read CSsize | |
Read CTcflag | |
Read CUid | |
Read Fd | |
Read Lexeme | |
Read SomeChar | |
Read SomeSymbol | |
Defined in GHC.Internal.TypeLits Methods readsPrec :: Int -> ReadS SomeSymbol # readList :: ReadS [SomeSymbol] # readPrec :: ReadPrec SomeSymbol # readListPrec :: ReadPrec [SomeSymbol] # | |
Read SomeNat | |
Read GeneralCategory | |
Defined in GHC.Internal.Read Methods readsPrec :: Int -> ReadS GeneralCategory # readList :: ReadS [GeneralCategory] # | |
Read Word16 | |
Read Word32 | |
Read Word64 | |
Read Word8 | |
Read Arch | |
Read ArchOS | |
Read ArmABI | |
Read ArmISA | |
Read ArmISAExt | |
Read OS | |
Read PPC_64ABI | |
Read Ordering | |
Read BoxLabel | |
Read CondBox | |
Read Mix | |
Read Tix | |
Read TixModule | |
Read Hash | |
Read HpcPos | |
Read Month | Read as |
Read Quarter | Read as |
Read QuarterOfYear | |
Defined in Data.Time.Calendar.Quarter Methods readsPrec :: Int -> ReadS QuarterOfYear # readList :: ReadS [QuarterOfYear] # | |
Read DiffTime | |
Read RTLDFlags | |
Read CAttributes | |
Defined in System.Posix.Files.Common Methods readsPrec :: Int -> ReadS CAttributes # readList :: ReadS [CAttributes] # readPrec :: ReadPrec CAttributes # readListPrec :: ReadPrec [CAttributes] # | |
Read StatxFlags | |
Defined in System.Posix.Files.Common Methods readsPrec :: Int -> ReadS StatxFlags # readList :: ReadS [StatxFlags] # readPrec :: ReadPrec StatxFlags # readListPrec :: ReadPrec [StatxFlags] # | |
Read StatxMask | |
Read OpenFileFlags | |
Defined in System.Posix.IO.Common Methods readsPrec :: Int -> ReadS OpenFileFlags # readList :: ReadS [OpenFileFlags] # | |
Read OpenMode | |
Read Integer | |
Read Natural | |
Read () | |
Read Bool | |
Read Char | |
Read Double | |
Read Float | |
Read Int | |
Read Word | |
Read a => Read (Complex a) | Since: base-2.1 |
Read a => Read (First a) | Since: base-4.9.0.0 |
Read a => Read (Last a) | Since: base-4.9.0.0 |
Read a => Read (Max a) | Since: base-4.9.0.0 |
Read a => Read (Min a) | Since: base-4.9.0.0 |
Read m => Read (WrappedMonoid m) | Since: base-4.9.0.0 |
Defined in Data.Semigroup Methods readsPrec :: Int -> ReadS (WrappedMonoid m) # readList :: ReadS [WrappedMonoid m] # readPrec :: ReadPrec (WrappedMonoid m) # readListPrec :: ReadPrec [WrappedMonoid m] # | |
Read vertex => Read (SCC vertex) | Since: containers-0.5.9 |
Read e => Read (IntMap e) | |
Read a => Read (Seq a) | |
Read a => Read (ViewL a) | |
Read a => Read (ViewR a) | |
(Read a, Ord a) => Read (Set a) | |
Read a => Read (Tree a) | |
Read e => Read (Word64Map e) Source # | |
Read a => Read (NonEmpty a) | |
Read a => Read (And a) | |
Read a => Read (Iff a) | |
Read a => Read (Ior a) | |
Read a => Read (Xor a) | |
Read a => Read (Identity a) | |
Read a => Read (First a) | |
Read a => Read (Last a) | |
Read a => Read (Down a) | |
Read a => Read (Dual a) | |
Read a => Read (Product a) | |
Read a => Read (Sum a) | |
Read a => Read (ZipList a) | |
Read p => Read (Par1 p) | |
(Integral a, Read a) => Read (Ratio a) | |
Read a => Read (Maybe a) | |
Read a => Read (Solo a) | |
Read a => Read [a] | |
(Ix ix, Read ix, Read e, IArray UArray e) => Read (UArray ix e) | |
HasResolution a => Read (Fixed a) | Since: base-4.3.0.0 |
(Read a, Read b) => Read (Arg a b) | Since: base-4.9.0.0 |
(Ord k, Read k, Read e) => Read (Map k e) | |
(Read a, Read b) => Read (Gr a b) Source # | |
(Ix a, Read a, Read b) => Read (Array a b) | |
(Read a, Read b) => Read (Either a b) | |
Read (Proxy t) | |
Read (U1 p) | |
Read (V1 p) | |
(Read1 f, Read a) => Read (Lift f a) | |
(Read1 m, Read a) => Read (MaybeT m a) | |
(Read a, Read b) => Read (a, b) | |
Read a => Read (Const a b) | |
Read (f a) => Read (Ap f a) | |
Read (f a) => Read (Alt f a) | |
a ~ b => Read (a :~: b) | |
Read (f p) => Read (Rec1 f p) | |
(Read1 f, Read a) => Read (Backwards f a) | |
(Read e, Read1 m, Read a) => Read (ExceptT e m a) | |
(Read1 f, Read a) => Read (IdentityT f a) | |
(Read w, Read1 m, Read a) => Read (WriterT w m a) | |
(Read w, Read1 m, Read a) => Read (WriterT w m a) | |
Read a => Read (Constant a b) | |
(Read1 f, Read a) => Read (Reverse f a) | |
(Read a, Read b, Read c) => Read (a, b, c) | |
(Read (f a), Read (g a)) => Read (Product f g a) | Since: base-4.18.0.0 |
(Read (f a), Read (g a)) => Read (Sum f g a) | Since: base-4.18.0.0 |
a ~~ b => Read (a :~~: b) | |
(Read (f p), Read (g p)) => Read ((f :*: g) p) | |
(Read (f p), Read (g p)) => Read ((f :+: g) p) | |
Read c => Read (K1 i c p) | |
(Read a, Read b, Read c, Read d) => Read (a, b, c, d) | |
Read (f (g a)) => Read (Compose f g a) | Since: base-4.18.0.0 |
Read (gr a b) => Read (OrdGr gr a b) Source # | |
Read (f (g p)) => Read ((f :.: g) p) | |
Read (f p) => Read (M1 i c f p) | |
(Read a, Read b, Read c, Read d, Read e) => Read (a, b, c, d, e) | |
(Read a, Read b, Read c, Read d, Read e, Read f) => Read (a, b, c, d, e, f) | |
(Read a, Read b, Read c, Read d, Read e, Read f, Read g) => Read (a, b, c, d, e, f, g) | |
(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) | |
(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) | |
(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) | |
(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) | |
(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) | |
(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) | |
(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) | |
Defined in GHC.Internal.Read | |
(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) | |
Defined in GHC.Internal.Read |
class (RealFrac a, Floating a) => RealFloat a where #
Minimal complete definition
floatRadix, floatDigits, floatRange, decodeFloat, encodeFloat, isNaN, isInfinite, isDenormalized, isNegativeZero, isIEEE
Methods
floatRadix :: a -> Integer #
floatDigits :: a -> Int #
floatRange :: a -> (Int, Int) #
decodeFloat :: a -> (Integer, Int) #
encodeFloat :: Integer -> Int -> a #
significand :: a -> a #
scaleFloat :: Int -> a -> a #
isInfinite :: a -> Bool #
isDenormalized :: a -> Bool #
isNegativeZero :: a -> Bool #
Instances
RealFloat CDouble | |
Defined in GHC.Internal.Foreign.C.Types Methods floatRadix :: CDouble -> Integer # floatDigits :: CDouble -> Int # floatRange :: CDouble -> (Int, Int) # decodeFloat :: CDouble -> (Integer, Int) # encodeFloat :: Integer -> Int -> CDouble # significand :: CDouble -> CDouble # scaleFloat :: Int -> CDouble -> CDouble # isInfinite :: CDouble -> Bool # isDenormalized :: CDouble -> Bool # isNegativeZero :: CDouble -> Bool # | |
RealFloat CFloat | |
Defined in GHC.Internal.Foreign.C.Types Methods floatRadix :: CFloat -> Integer # floatDigits :: CFloat -> Int # floatRange :: CFloat -> (Int, Int) # decodeFloat :: CFloat -> (Integer, Int) # encodeFloat :: Integer -> Int -> CFloat # significand :: CFloat -> CFloat # scaleFloat :: Int -> CFloat -> CFloat # isInfinite :: CFloat -> Bool # isDenormalized :: CFloat -> Bool # isNegativeZero :: CFloat -> Bool # | |
RealFloat Double | |
Defined in GHC.Internal.Float Methods floatRadix :: Double -> Integer # floatDigits :: Double -> Int # floatRange :: Double -> (Int, Int) # decodeFloat :: Double -> (Integer, Int) # encodeFloat :: Integer -> Int -> Double # significand :: Double -> Double # scaleFloat :: Int -> Double -> Double # isInfinite :: Double -> Bool # isDenormalized :: Double -> Bool # isNegativeZero :: Double -> Bool # | |
RealFloat Float | |
Defined in GHC.Internal.Float Methods floatRadix :: Float -> Integer # floatDigits :: Float -> Int # floatRange :: Float -> (Int, Int) # decodeFloat :: Float -> (Integer, Int) # encodeFloat :: Integer -> Int -> Float # significand :: Float -> Float # scaleFloat :: Int -> Float -> Float # isInfinite :: Float -> Bool # isDenormalized :: Float -> Bool # isNegativeZero :: Float -> Bool # | |
RealFloat a => RealFloat (Identity a) | |
Defined in GHC.Internal.Data.Functor.Identity Methods floatRadix :: Identity a -> Integer # floatDigits :: Identity a -> Int # floatRange :: Identity a -> (Int, Int) # decodeFloat :: Identity a -> (Integer, Int) # encodeFloat :: Integer -> Int -> Identity a # exponent :: Identity a -> Int # significand :: Identity a -> Identity a # scaleFloat :: Int -> Identity a -> Identity a # isInfinite :: Identity a -> Bool # isDenormalized :: Identity a -> Bool # isNegativeZero :: Identity a -> Bool # | |
RealFloat a => RealFloat (Down a) | |
Defined in GHC.Internal.Data.Ord Methods floatRadix :: Down a -> Integer # floatDigits :: Down a -> Int # floatRange :: Down a -> (Int, Int) # decodeFloat :: Down a -> (Integer, Int) # encodeFloat :: Integer -> Int -> Down a # significand :: Down a -> Down a # scaleFloat :: Int -> Down a -> Down a # isInfinite :: Down a -> Bool # isDenormalized :: Down a -> Bool # isNegativeZero :: Down a -> Bool # | |
RealFloat a => RealFloat (Const a b) | |
Defined in GHC.Internal.Data.Functor.Const Methods floatRadix :: Const a b -> Integer # floatDigits :: Const a b -> Int # floatRange :: Const a b -> (Int, Int) # decodeFloat :: Const a b -> (Integer, Int) # encodeFloat :: Integer -> Int -> Const a b # exponent :: Const a b -> Int # significand :: Const a b -> Const a b # scaleFloat :: Int -> Const a b -> Const a b # isInfinite :: Const a b -> Bool # isDenormalized :: Const a b -> Bool # isNegativeZero :: Const a b -> Bool # | |
RealFloat (f (g a)) => RealFloat (Compose f g a) | Since: base-4.20.0.0 |
Defined in Data.Functor.Compose Methods floatRadix :: Compose f g a -> Integer # floatDigits :: Compose f g a -> Int # floatRange :: Compose f g a -> (Int, Int) # decodeFloat :: Compose f g a -> (Integer, Int) # encodeFloat :: Integer -> Int -> Compose f g a # exponent :: Compose f g a -> Int # significand :: Compose f g a -> Compose f g a # scaleFloat :: Int -> Compose f g a -> Compose f g a # isNaN :: Compose f g a -> Bool # isInfinite :: Compose f g a -> Bool # isDenormalized :: Compose f g a -> Bool # isNegativeZero :: Compose f g a -> Bool # |
class (Real a, Fractional a) => RealFrac a where #
Minimal complete definition
Methods
properFraction :: Integral b => a -> (b, a) #
truncate :: Integral b => a -> b #
round :: Integral b => a -> b #
Instances
RealFrac CDouble | |
RealFrac CFloat | |
RealFrac DiffTime | |
RealFrac a => RealFrac (Identity a) | |
RealFrac a => RealFrac (Down a) | |
Integral a => RealFrac (Ratio a) | |
HasResolution a => RealFrac (Fixed a) | Since: base-2.1 |
RealFrac a => RealFrac (Const a b) | |
RealFrac (f (g a)) => RealFrac (Compose f g a) | Since: base-4.20.0.0 |
Instances
Show ByteArray | Since: base-4.17.0.0 |
Show Timeout | Since: base-4.0 |
Show FormatMode | |
Show ByteString | |
Defined in Data.ByteString.Internal.Type Methods showsPrec :: Int -> ByteString -> ShowS # show :: ByteString -> String # showList :: [ByteString] -> ShowS # | |
Show SizeOverflowException | |
Defined in Data.ByteString.Internal.Type Methods showsPrec :: Int -> SizeOverflowException -> ShowS # show :: SizeOverflowException -> String # showList :: [SizeOverflowException] -> ShowS # | |
Show ByteString | |
Defined in Data.ByteString.Lazy.Internal Methods showsPrec :: Int -> ByteString -> ShowS # show :: ByteString -> String # showList :: [ByteString] -> ShowS # | |
Show ShortByteString | |
Defined in Data.ByteString.Short.Internal Methods showsPrec :: Int -> ShortByteString -> ShowS # show :: ShortByteString -> String # showList :: [ShortByteString] -> ShowS # | |
Show IntSet | |
Show BitQueue | |
Show BitQueueB | |
Show FileType | |
Show Permissions | |
Defined in System.Directory.Internal.Common Methods showsPrec :: Int -> Permissions -> ShowS # show :: Permissions -> String # showList :: [Permissions] -> ShowS # | |
Show XdgDirectory | |
Defined in System.Directory.Internal.Common Methods showsPrec :: Int -> XdgDirectory -> ShowS # show :: XdgDirectory -> String # showList :: [XdgDirectory] -> ShowS # | |
Show XdgDirectoryList | |
Defined in System.Directory.Internal.Common Methods showsPrec :: Int -> XdgDirectoryList -> ShowS # show :: XdgDirectoryList -> String # showList :: [XdgDirectoryList] -> ShowS # | |
Show GhcApiError Source # | |
Defined in GHC Methods showsPrec :: Int -> GhcApiError -> ShowS # show :: GhcApiError -> String # showList :: [GhcApiError] -> ShowS # | |
Show ByteOff Source # | |
Show FFIInfo Source # | |
Show HalfWord Source # | |
Show ItblPtr Source # | |
Show RegBitmap Source # | |
Show WordOff Source # | |
Show SectionType Source # | |
Defined in GHC.Cmm Methods showsPrec :: Int -> SectionType -> ShowS # show :: SectionType -> String # showList :: [SectionType] -> ShowS # | |
Show CLabel Source # | |
Show Label Source # | |
Show LabelSet Source # | |
Show RPNum Source # | |
Show AlignmentSpec Source # | |
Defined in GHC.Cmm.Expr Methods showsPrec :: Int -> AlignmentSpec -> ShowS # show :: AlignmentSpec -> String # showList :: [AlignmentSpec] -> ShowS # | |
Show Area Source # | |
Show CmmExpr Source # | |
Show CmmLit Source # | |
Show CmmToken Source # | |
Show AtomicMachOp Source # | |
Defined in GHC.Cmm.MachOp Methods showsPrec :: Int -> AtomicMachOp -> ShowS # show :: AtomicMachOp -> String # showList :: [AtomicMachOp] -> ShowS # | |
Show CallishMachOp Source # | |
Defined in GHC.Cmm.MachOp Methods showsPrec :: Int -> CallishMachOp -> ShowS # show :: CallishMachOp -> String # showList :: [CallishMachOp] -> ShowS # | |
Show FMASign Source # | |
Show MachOp Source # | |
Show MemoryOrdering Source # | |
Defined in GHC.Cmm.MachOp Methods showsPrec :: Int -> MemoryOrdering -> ShowS # show :: MemoryOrdering -> String # showList :: [MemoryOrdering] -> ShowS # | |
Show Reducibility Source # | |
Defined in GHC.Cmm.Reducibility Methods showsPrec :: Int -> Reducibility -> ShowS # show :: Reducibility -> String # showList :: [Reducibility] -> ShowS # | |
Show CmmReg Source # | |
Show GlobalReg Source # | |
Show GlobalRegUse Source # | |
Defined in GHC.Cmm.Reg Methods showsPrec :: Int -> GlobalRegUse -> ShowS # show :: GlobalRegUse -> String # showList :: [GlobalRegUse] -> ShowS # | |
Show LocalReg Source # | |
Show SwitchPlan Source # | |
Defined in GHC.Cmm.Switch Methods showsPrec :: Int -> SwitchPlan -> ShowS # show :: SwitchPlan -> String # showList :: [SwitchPlan] -> ShowS # | |
Show SwitchTargets Source # | |
Defined in GHC.Cmm.Switch Methods showsPrec :: Int -> SwitchTargets -> ShowS # show :: SwitchTargets -> String # showList :: [SwitchTargets] -> ShowS # | |
Show CmmType Source # | |
Show Width Source # | |
Show ExtMode Source # | |
Show Operand Source # | |
Show ShiftMode Source # | |
Show AddrMode Source # | |
Show Imm Source # | |
Show Format Source # | |
Show RegUsage Source # | |
Show Reg Source # | |
Show RegClass Source # | |
Show RegSub Source # | |
Show FreeRegs Source # | |
Show Loc Source # | |
Show FreeRegs Source # | |
Show FreeRegs Source # | |
Show FreeRegs Source # | |
Show BrTableInterval Source # | |
Defined in GHC.CmmToAsm.Wasm.Types Methods showsPrec :: Int -> BrTableInterval -> ShowS # show :: BrTableInterval -> String # showList :: [BrTableInterval] -> ShowS # | |
Show SymName Source # | |
Show IsSubmult Source # | |
Show IsRecDataConResult Source # | |
Defined in GHC.Core.Opt.WorkWrap.Utils Methods showsPrec :: Int -> IsRecDataConResult -> ShowS # show :: IsRecDataConResult -> String # showList :: [IsRecDataConResult] -> ShowS # | |
Show PrimElemRep Source # | |
Defined in GHC.Core.TyCon Methods showsPrec :: Int -> PrimElemRep -> ShowS # show :: PrimElemRep -> String # showList :: [PrimElemRep] -> ShowS # | |
Show PrimRep Source # | |
Show OverridingBool Source # | |
Defined in GHC.Data.Bool Methods showsPrec :: Int -> OverridingBool -> ShowS # show :: OverridingBool -> String # showList :: [OverridingBool] -> ShowS # | |
Show FastString Source # | |
Defined in GHC.Data.FastString Methods showsPrec :: Int -> FastString -> ShowS # show :: FastString -> String # showList :: [FastString] -> ShowS # | |
Show LexicalFastString Source # | |
Defined in GHC.Data.FastString Methods showsPrec :: Int -> LexicalFastString -> ShowS # show :: LexicalFastString -> String # showList :: [LexicalFastString] -> ShowS # | |
Show NonDetFastString Source # | |
Defined in GHC.Data.FastString Methods showsPrec :: Int -> NonDetFastString -> ShowS # show :: NonDetFastString -> String # showList :: [NonDetFastString] -> ShowS # | |
Show IOEnvFailure Source # | |
Defined in GHC.Data.IOEnv Methods showsPrec :: Int -> IOEnvFailure -> ShowS # show :: IOEnvFailure -> String # showList :: [IOEnvFailure] -> ShowS # | |
Show StringBuffer Source # | |
Defined in GHC.Data.StringBuffer Methods showsPrec :: Int -> StringBuffer -> ShowS # show :: StringBuffer -> String # showList :: [StringBuffer] -> ShowS # | |
Show Word64Set Source # | |
Show Backend Source # | The Show instance is for messages only. If code depends on what's in the string, you deserve what happens to you. |
Show PrimitiveImplementation Source # | |
Defined in GHC.Driver.Backend Methods showsPrec :: Int -> PrimitiveImplementation -> ShowS # show :: PrimitiveImplementation -> String # showList :: [PrimitiveImplementation] -> ShowS # | |
Show BackendName Source # | |
Defined in GHC.Driver.Backend.Internal Methods showsPrec :: Int -> BackendName -> ShowS # show :: BackendName -> String # showList :: [BackendName] -> ShowS # | |
Show DynamicTooState Source # | |
Defined in GHC.Driver.DynFlags Methods showsPrec :: Int -> DynamicTooState -> ShowS # show :: DynamicTooState -> String # showList :: [DynamicTooState] -> ShowS # | |
Show GhcLink Source # | |
Show IncludeSpecs Source # | |
Defined in GHC.Driver.DynFlags Methods showsPrec :: Int -> IncludeSpecs -> ShowS # show :: IncludeSpecs -> String # showList :: [IncludeSpecs] -> ShowS # | |
Show PackageArg Source # | |
Defined in GHC.Driver.DynFlags Methods showsPrec :: Int -> PackageArg -> ShowS # show :: PackageArg -> String # showList :: [PackageArg] -> ShowS # | |
Show RtsOptsEnabled Source # | |
Defined in GHC.Driver.DynFlags Methods showsPrec :: Int -> RtsOptsEnabled -> ShowS # show :: RtsOptsEnabled -> String # showList :: [RtsOptsEnabled] -> ShowS # | |
Show DumpFlag Source # | |
Show GeneralFlag Source # | |
Defined in GHC.Driver.Flags Methods showsPrec :: Int -> GeneralFlag -> ShowS # show :: GeneralFlag -> String # showList :: [GeneralFlag] -> ShowS # | |
Show Language Source # | |
Show WarningFlag Source # | |
Defined in GHC.Driver.Flags Methods showsPrec :: Int -> WarningFlag -> ShowS # show :: WarningFlag -> String # showList :: [WarningFlag] -> ShowS # | |
Show Phase Source # | |
Show PipelineOutput Source # | |
Defined in GHC.Driver.Pipeline.Monad Methods showsPrec :: Int -> PipelineOutput -> ShowS # show :: PipelineOutput -> String # showList :: [PipelineOutput] -> ShowS # | |
Show HsDocString Source # | |
Defined in GHC.Hs.DocString Methods showsPrec :: Int -> HsDocString -> ShowS # show :: HsDocString -> String # showList :: [HsDocString] -> ShowS # | |
Show HsDocStringChunk Source # | |
Defined in GHC.Hs.DocString Methods showsPrec :: Int -> HsDocStringChunk -> ShowS # show :: HsDocStringChunk -> String # showList :: [HsDocStringChunk] -> ShowS # | |
Show HsDocStringDecorator Source # | |
Defined in GHC.Hs.DocString Methods showsPrec :: Int -> HsDocStringDecorator -> ShowS # show :: HsDocStringDecorator -> String # showList :: [HsDocStringDecorator] -> ShowS # | |
Show BlankEpAnnotations Source # | |
Defined in GHC.Hs.Dump Methods showsPrec :: Int -> BlankEpAnnotations -> ShowS # show :: BlankEpAnnotations -> String # showList :: [BlankEpAnnotations] -> ShowS # | |
Show BlankSrcSpan Source # | |
Defined in GHC.Hs.Dump Methods showsPrec :: Int -> BlankSrcSpan -> ShowS # show :: BlankSrcSpan -> String # showList :: [BlankSrcSpan] -> ShowS # | |
Show GenerateInhabitingPatternsMode Source # | |
Defined in GHC.HsToCore.Pmc.Solver Methods showsPrec :: Int -> GenerateInhabitingPatternsMode -> ShowS # show :: GenerateInhabitingPatternsMode -> String # showList :: [GenerateInhabitingPatternsMode] -> ShowS # | |
Show PmEquality Source # | |
Defined in GHC.HsToCore.Pmc.Solver.Types Methods showsPrec :: Int -> PmEquality -> ShowS # show :: PmEquality -> String # showList :: [PmEquality] -> ShowS # | |
Show Precision Source # | |
Show UnfoldingExposure Source # | |
Defined in GHC.Iface.Tidy Methods showsPrec :: Int -> UnfoldingExposure -> ShowS # show :: UnfoldingExposure -> String # showList :: [UnfoldingExposure] -> ShowS # | |
Show Ident Source # | |
Show AOp Source # | |
Show Op Source # | |
Show UOp Source # | |
Show AOp Source # | |
Show Op Source # | |
Show UOp Source # | |
Show LlvmAtomicOp Source # | |
Defined in GHC.Llvm.Syntax Methods showsPrec :: Int -> LlvmAtomicOp -> ShowS # show :: LlvmAtomicOp -> String # showList :: [LlvmAtomicOp] -> ShowS # | |
Show LlvmSyncOrdering Source # | |
Defined in GHC.Llvm.Syntax Methods showsPrec :: Int -> LlvmSyncOrdering -> ShowS # show :: LlvmSyncOrdering -> String # showList :: [LlvmSyncOrdering] -> ShowS # | |
Show LlvmCallType Source # | |
Defined in GHC.Llvm.Types Methods showsPrec :: Int -> LlvmCallType -> ShowS # show :: LlvmCallType -> String # showList :: [LlvmCallType] -> ShowS # | |
Show LlvmParameterListType Source # | |
Defined in GHC.Llvm.Types Methods showsPrec :: Int -> LlvmParameterListType -> ShowS # show :: LlvmParameterListType -> String # showList :: [LlvmParameterListType] -> ShowS # | |
Show AnnKeywordId Source # | |
Defined in GHC.Parser.Annotation Methods showsPrec :: Int -> AnnKeywordId -> ShowS # show :: AnnKeywordId -> String # showList :: [AnnKeywordId] -> ShowS # | |
Show BindTag Source # | |
Show DeclTag Source # | |
Show EpaComment Source # | |
Defined in GHC.Parser.Annotation Methods showsPrec :: Int -> EpaComment -> ShowS # show :: EpaComment -> String # showList :: [EpaComment] -> ShowS # | |
Show EpaCommentTok Source # | |
Defined in GHC.Parser.Annotation Methods showsPrec :: Int -> EpaCommentTok -> ShowS # show :: EpaCommentTok -> String # showList :: [EpaCommentTok] -> ShowS # | |
Show HasE Source # | |
Show IsUnicodeSyntax Source # | |
Defined in GHC.Parser.Annotation Methods showsPrec :: Int -> IsUnicodeSyntax -> ShowS # show :: IsUnicodeSyntax -> String # showList :: [IsUnicodeSyntax] -> ShowS # | |
Show ParenType Source # | |
Show LexErrKind Source # | |
Defined in GHC.Parser.Errors.Types Methods showsPrec :: Int -> LexErrKind -> ShowS # show :: LexErrKind -> String # showList :: [LexErrKind] -> ShowS # | |
Show NumUnderscoreReason Source # | |
Defined in GHC.Parser.Errors.Types Methods showsPrec :: Int -> NumUnderscoreReason -> ShowS # show :: NumUnderscoreReason -> String # showList :: [NumUnderscoreReason] -> ShowS # | |
Show HdkComment Source # | |
Defined in GHC.Parser.Lexer Methods showsPrec :: Int -> HdkComment -> ShowS # show :: HdkComment -> String # showList :: [HdkComment] -> ShowS # | |
Show Token Source # | |
Show Platform Source # | |
Show PlatformWordSize Source # | |
Defined in GHC.Platform Methods showsPrec :: Int -> PlatformWordSize -> ShowS # show :: PlatformWordSize -> String # showList :: [PlatformWordSize] -> ShowS # | |
Show PlatformConstants Source # | |
Defined in GHC.Platform.Constants Methods showsPrec :: Int -> PlatformConstants -> ShowS # show :: PlatformConstants -> String # showList :: [PlatformConstants] -> ShowS # | |
Show Profile Source # | |
Show RealReg Source # | |
Show Reg Source # | |
Show VirtualReg Source # | |
Defined in GHC.Platform.Reg Methods showsPrec :: Int -> VirtualReg -> ShowS # show :: VirtualReg -> String # showList :: [VirtualReg] -> ShowS # | |
Show Way Source # | |
Show StgLiftConfig Source # | |
Defined in GHC.Stg.Lift.Config Methods showsPrec :: Int -> StgLiftConfig -> ShowS # show :: StgLiftConfig -> String # showList :: [StgLiftConfig] -> ShowS # | |
Show StgToDo Source # | |
Show ObjectKind Source # | |
Defined in GHC.StgToJS.Object Methods showsPrec :: Int -> ObjectKind -> ShowS # show :: ObjectKind -> String # showList :: [ObjectKind] -> ShowS # | |
Show Special Source # | |
Show StgReg Source # | |
Show StgRet Source # | |
Show CILayout Source # | |
Show CIRegs Source # | |
Show CIStatic Source # | |
Show CIType Source # | |
Show ClosureInfo Source # | |
Defined in GHC.StgToJS.Types Methods showsPrec :: Int -> ClosureInfo -> ShowS # show :: ClosureInfo -> String # showList :: [ClosureInfo] -> ShowS # | |
Show ClosureType Source # | |
Defined in GHC.StgToJS.Types Methods showsPrec :: Int -> ClosureType -> ShowS # show :: ClosureType -> String # showList :: [ClosureType] -> ShowS # | |
Show ExpFun Source # | |
Show JSFFIType Source # | |
Show JSRep Source # | |
Show StaticArg Source # | |
Show StaticInfo Source # | |
Defined in GHC.StgToJS.Types Methods showsPrec :: Int -> StaticInfo -> ShowS # show :: StaticInfo -> String # showList :: [StaticInfo] -> ShowS # | |
Show StaticLit Source # | |
Show StaticUnboxed Source # | |
Defined in GHC.StgToJS.Types Methods showsPrec :: Int -> StaticUnboxed -> ShowS # show :: StaticUnboxed -> String # showList :: [StaticUnboxed] -> ShowS # | |
Show StaticVal Source # | |
Show ThreadStatus Source # | |
Defined in GHC.StgToJS.Types Methods showsPrec :: Int -> ThreadStatus -> ShowS # show :: ThreadStatus -> String # showList :: [ThreadStatus] -> ShowS # | |
Show Archive Source # | |
Show ArchiveEntry Source # | |
Defined in GHC.SysTools.Ar Methods showsPrec :: Int -> ArchiveEntry -> ShowS # show :: ArchiveEntry -> String # showList :: [ArchiveEntry] -> ShowS # | |
Show HasKinds Source # | |
Show SuggestPartialTypeSignatures Source # | |
Defined in GHC.Tc.Errors.Types Methods showsPrec :: Int -> SuggestPartialTypeSignatures -> ShowS # show :: SuggestPartialTypeSignatures -> String # showList :: [SuggestPartialTypeSignatures] -> ShowS # | |
Show SuggestUndecidableInstances Source # | |
Defined in GHC.Tc.Errors.Types Methods showsPrec :: Int -> SuggestUndecidableInstances -> ShowS # show :: SuggestUndecidableInstances -> String # showList :: [SuggestUndecidableInstances] -> ShowS # | |
Show InlineSpec Source # | |
Defined in GHC.Types.Basic Methods showsPrec :: Int -> InlineSpec -> ShowS # show :: InlineSpec -> String # showList :: [InlineSpec] -> ShowS # | |
Show Levity Source # | |
Show PprPrec Source # | |
Show RuleMatchInfo Source # | |
Defined in GHC.Types.Basic Methods showsPrec :: Int -> RuleMatchInfo -> ShowS # show :: RuleMatchInfo -> String # showList :: [RuleMatchInfo] -> ShowS # | |
Show Card Source # | |
Show DiagnosticCode Source # | |
Defined in GHC.Types.Error Methods showsPrec :: Int -> DiagnosticCode -> ShowS # show :: DiagnosticCode -> String # showList :: [DiagnosticCode] -> ShowS # | |
Show DiagnosticReason Source # | |
Defined in GHC.Types.Error Methods showsPrec :: Int -> DiagnosticReason -> ShowS # show :: DiagnosticReason -> String # showList :: [DiagnosticReason] -> ShowS # | |
Show Severity Source # | |
Show DuplicateRecordFields Source # | |
Defined in GHC.Types.FieldLabel Methods showsPrec :: Int -> DuplicateRecordFields -> ShowS # show :: DuplicateRecordFields -> String # showList :: [DuplicateRecordFields] -> ShowS # | |
Show FieldSelectors Source # | |
Defined in GHC.Types.FieldLabel Methods showsPrec :: Int -> FieldSelectors -> ShowS # show :: FieldSelectors -> String # showList :: [FieldSelectors] -> ShowS # | |
Show Safety Source # | |
Show FieldsOrSelectors Source # | |
Defined in GHC.Types.Name.Reader Methods showsPrec :: Int -> FieldsOrSelectors -> ShowS # show :: FieldsOrSelectors -> String # showList :: [FieldsOrSelectors] -> ShowS # | |
Show SafeHaskellMode Source # | |
Defined in GHC.Types.SafeHaskell Methods showsPrec :: Int -> SafeHaskellMode -> ShowS # show :: SafeHaskellMode -> String # showList :: [SafeHaskellMode] -> ShowS # | |
Show SaneDouble Source # | |
Defined in GHC.Types.SaneDouble Methods showsPrec :: Int -> SaneDouble -> ShowS # show :: SaneDouble -> String # showList :: [SaneDouble] -> ShowS # | |
Show SourceError Source # | |
Defined in GHC.Types.SourceError Methods showsPrec :: Int -> SourceError -> ShowS # show :: SourceError -> String # showList :: [SourceError] -> ShowS # | |
Show HsBootOrSig Source # | |
Defined in GHC.Types.SourceFile Methods showsPrec :: Int -> HsBootOrSig -> ShowS # show :: HsBootOrSig -> String # showList :: [HsBootOrSig] -> ShowS # | |
Show HscSource Source # | |
Show FractionalExponentBase Source # | |
Defined in GHC.Types.SourceText Methods showsPrec :: Int -> FractionalExponentBase -> ShowS # show :: FractionalExponentBase -> String # showList :: [FractionalExponentBase] -> ShowS # | |
Show FractionalLit Source # | |
Defined in GHC.Types.SourceText Methods showsPrec :: Int -> FractionalLit -> ShowS # show :: FractionalLit -> String # showList :: [FractionalLit] -> ShowS # | |
Show IntegralLit Source # | |
Defined in GHC.Types.SourceText Methods showsPrec :: Int -> IntegralLit -> ShowS # show :: IntegralLit -> String # showList :: [IntegralLit] -> ShowS # | |
Show SourceText Source # | |
Defined in GHC.Types.SourceText Methods showsPrec :: Int -> SourceText -> ShowS # show :: SourceText -> String # showList :: [SourceText] -> ShowS # | |
Show BufPos Source # | |
Show BufSpan Source # | |
Show DeltaPos Source # | |
Show NoComments Source # | |
Defined in GHC.Types.SrcLoc Methods showsPrec :: Int -> NoComments -> ShowS # show :: NoComments -> String # showList :: [NoComments] -> ShowS # | |
Show PsLoc Source # | |
Show PsSpan Source # | |
Show RealSrcLoc Source # | |
Defined in GHC.Types.SrcLoc Methods showsPrec :: Int -> RealSrcLoc -> ShowS # show :: RealSrcLoc -> String # showList :: [RealSrcLoc] -> ShowS # | |
Show RealSrcSpan Source # | |
Defined in GHC.Types.SrcLoc Methods showsPrec :: Int -> RealSrcSpan -> ShowS # show :: RealSrcSpan -> String # showList :: [RealSrcSpan] -> ShowS # | |
Show SrcLoc Source # | |
Show SrcSpan Source # | |
Show UnhelpfulSpanReason Source # | |
Defined in GHC.Types.SrcLoc Methods showsPrec :: Int -> UnhelpfulSpanReason -> ShowS # show :: UnhelpfulSpanReason -> String # showList :: [UnhelpfulSpanReason] -> ShowS # | |
Show TickishPlacement Source # | |
Defined in GHC.Types.Tickish Methods showsPrec :: Int -> TickishPlacement -> ShowS # show :: TickishPlacement -> String # showList :: [TickishPlacement] -> ShowS # | |
Show Unique Source # | |
Show FinderOpts Source # | |
Defined in GHC.Unit.Finder.Types Methods showsPrec :: Int -> FinderOpts -> ShowS # show :: FinderOpts -> String # showList :: [FinderOpts] -> ShowS # | |
Show ModLocation Source # | |
Defined in GHC.Unit.Module.Location Methods showsPrec :: Int -> ModLocation -> ShowS # show :: ModLocation -> String # showList :: [ModLocation] -> ShowS # | |
Show WarningCategory Source # | |
Defined in GHC.Unit.Module.Warnings Methods showsPrec :: Int -> WarningCategory -> ShowS # show :: WarningCategory -> String # showList :: [WarningCategory] -> ShowS # | |
Show Unit Source # | |
Show DumpFormat Source # | |
Defined in GHC.Utils.Logger Methods showsPrec :: Int -> DumpFormat -> ShowS # show :: DumpFormat -> String # showList :: [DumpFormat] -> ShowS # | |
Show GhcException Source # | |
Defined in GHC.Utils.Panic Methods showsPrec :: Int -> GhcException -> ShowS # show :: GhcException -> String # showList :: [GhcException] -> ShowS # | |
Show PlainGhcException Source # | |
Defined in GHC.Utils.Panic.Plain Methods showsPrec :: Int -> PlainGhcException -> ShowS # show :: PlainGhcException -> String # showList :: [PlainGhcException] -> ShowS # | |
Show Doc Source # | |
Show TempFileLifetime Source # | |
Defined in GHC.Utils.TmpFs Methods showsPrec :: Int -> TempFileLifetime -> ShowS # show :: TempFileLifetime -> String # showList :: [TempFileLifetime] -> ShowS # | |
Show SpliceDecoration Source # | |
Defined in Language.Haskell.Syntax.Decls Methods showsPrec :: Int -> SpliceDecoration -> ShowS # show :: SpliceDecoration -> String # showList :: [SpliceDecoration] -> ShowS # | |
Show IsBootInterface Source # | |
Defined in Language.Haskell.Syntax.ImpExp Methods showsPrec :: Int -> IsBootInterface -> ShowS # show :: IsBootInterface -> String # showList :: [IsBootInterface] -> ShowS # | |
Show ModuleName Source # | |
Defined in Language.Haskell.Syntax.Module.Name Methods showsPrec :: Int -> ModuleName -> ShowS # show :: ModuleName -> String # showList :: [ModuleName] -> ShowS # | |
Show ShortText | |
Show DbInstUnitId | |
Defined in GHC.Unit.Database Methods showsPrec :: Int -> DbInstUnitId -> ShowS # show :: DbInstUnitId -> String # showList :: [DbInstUnitId] -> ShowS # | |
Show DbModule | |
Show ForeignSrcLang | |
Defined in GHC.ForeignSrcLang.Type Methods showsPrec :: Int -> ForeignSrcLang -> ShowS # show :: ForeignSrcLang -> String # showList :: [ForeignSrcLang] -> ShowS # | |
Show Extension | |
Show Box | |
Show PrimType | |
Show TsoFlags | |
Show WhatNext | |
Show WhyBlocked | |
Defined in GHC.Exts.Heap.Closures Methods showsPrec :: Int -> WhyBlocked -> ShowS # show :: WhyBlocked -> String # showList :: [WhyBlocked] -> ShowS # | |
Show StgInfoTable | |
Defined in GHC.Exts.Heap.InfoTable.Types Methods showsPrec :: Int -> StgInfoTable -> ShowS # show :: StgInfoTable -> String # showList :: [StgInfoTable] -> ShowS # | |
Show CostCentre | |
Defined in GHC.Exts.Heap.ProfInfo.Types Methods showsPrec :: Int -> CostCentre -> ShowS # show :: CostCentre -> String # showList :: [CostCentre] -> ShowS # | |
Show CostCentreStack | |
Defined in GHC.Exts.Heap.ProfInfo.Types Methods showsPrec :: Int -> CostCentreStack -> ShowS # show :: CostCentreStack -> String # showList :: [CostCentreStack] -> ShowS # | |
Show IndexTable | |
Defined in GHC.Exts.Heap.ProfInfo.Types Methods showsPrec :: Int -> IndexTable -> ShowS # show :: IndexTable -> String # showList :: [IndexTable] -> ShowS # | |
Show StgTSOProfInfo | |
Defined in GHC.Exts.Heap.ProfInfo.Types Methods showsPrec :: Int -> StgTSOProfInfo -> ShowS # show :: StgTSOProfInfo -> String # showList :: [StgTSOProfInfo] -> ShowS # | |
Show ByteOffset | |
Defined in GHC.Exts.Stack.Constants Methods showsPrec :: Int -> ByteOffset -> ShowS # show :: ByteOffset -> String # showList :: [ByteOffset] -> ShowS # | |
Show WordOffset | |
Defined in GHC.Exts.Stack.Constants Methods showsPrec :: Int -> WordOffset -> ShowS # show :: WordOffset -> String # showList :: [WordOffset] -> ShowS # | |
Show Pointerness | |
Show Void | |
Show ByteOrder | |
Show ClosureType | |
Defined in GHC.Internal.ClosureTypes Methods showsPrec :: Int -> ClosureType -> ShowS # show :: ClosureType -> String # showList :: [ClosureType] -> ShowS # | |
Show BlockReason | |
Defined in GHC.Internal.Conc.Sync Methods showsPrec :: Int -> BlockReason -> ShowS # show :: BlockReason -> String # showList :: [BlockReason] -> ShowS # | |
Show ThreadId | |
Show ThreadStatus | |
Defined in GHC.Internal.Conc.Sync Methods showsPrec :: Int -> ThreadStatus -> ShowS # show :: ThreadStatus -> String # showList :: [ThreadStatus] -> ShowS # | |
Show NestedAtomically | |
Defined in GHC.Internal.Control.Exception.Base Methods showsPrec :: Int -> NestedAtomically -> ShowS # show :: NestedAtomically -> String # showList :: [NestedAtomically] -> ShowS # | |
Show NoMatchingContinuationPrompt | |
Defined in GHC.Internal.Control.Exception.Base Methods showsPrec :: Int -> NoMatchingContinuationPrompt -> ShowS # show :: NoMatchingContinuationPrompt -> String # showList :: [NoMatchingContinuationPrompt] -> ShowS # | |
Show NoMethodError | |
Defined in GHC.Internal.Control.Exception.Base Methods showsPrec :: Int -> NoMethodError -> ShowS # show :: NoMethodError -> String # showList :: [NoMethodError] -> ShowS # | |
Show NonTermination | |
Defined in GHC.Internal.Control.Exception.Base Methods showsPrec :: Int -> NonTermination -> ShowS # show :: NonTermination -> String # showList :: [NonTermination] -> ShowS # | |
Show PatternMatchFail | |
Defined in GHC.Internal.Control.Exception.Base Methods showsPrec :: Int -> PatternMatchFail -> ShowS # show :: PatternMatchFail -> String # showList :: [PatternMatchFail] -> ShowS # | |
Show RecConError | |
Defined in GHC.Internal.Control.Exception.Base Methods showsPrec :: Int -> RecConError -> ShowS # show :: RecConError -> String # showList :: [RecConError] -> ShowS # | |
Show RecSelError | |
Defined in GHC.Internal.Control.Exception.Base Methods showsPrec :: Int -> RecSelError -> ShowS # show :: RecSelError -> String # showList :: [RecSelError] -> ShowS # | |
Show RecUpdError | |
Defined in GHC.Internal.Control.Exception.Base Methods showsPrec :: Int -> RecUpdError -> ShowS # show :: RecUpdError -> String # showList :: [RecUpdError] -> ShowS # | |
Show TypeError | |
Show Constr | |
Show ConstrRep | |
Show DataRep | |
Show DataType | |
Show Fixity | |
Show Dynamic | |
Show All | |
Show Any | |
Show SomeTypeRep | |
Defined in GHC.Internal.Data.Typeable.Internal Methods showsPrec :: Int -> SomeTypeRep -> ShowS # show :: SomeTypeRep -> String # showList :: [SomeTypeRep] -> ShowS # | |
Show Version | |
Show ErrorCall | |
Show ArithException | |
Defined in GHC.Internal.Exception.Type Methods showsPrec :: Int -> ArithException -> ShowS # show :: ArithException -> String # showList :: [ArithException] -> ShowS # | |
Show SomeException | |
Defined in GHC.Internal.Exception.Type Methods showsPrec :: Int -> SomeException -> ShowS # show :: SomeException -> String # showList :: [SomeException] -> ShowS # | |
Show Fingerprint | |
Defined in GHC.Internal.Fingerprint.Type Methods showsPrec :: Int -> Fingerprint -> ShowS # show :: Fingerprint -> String # showList :: [Fingerprint] -> ShowS # | |
Show CBool | |
Show CChar | |
Show CClock | |
Show CDouble | |
Show CFloat | |
Show CInt | |
Show CIntMax | |
Show CIntPtr | |
Show CLLong | |
Show CLong | |
Show CPtrdiff | |
Show CSChar | |
Show CSUSeconds | |
Defined in GHC.Internal.Foreign.C.Types Methods showsPrec :: Int -> CSUSeconds -> ShowS # show :: CSUSeconds -> String # showList :: [CSUSeconds] -> ShowS # | |
Show CShort | |
Show CSigAtomic | |
Defined in GHC.Internal.Foreign.C.Types Methods showsPrec :: Int -> CSigAtomic -> ShowS # show :: CSigAtomic -> String # showList :: [CSigAtomic] -> ShowS # | |
Show CSize | |
Show CTime | |
Show CUChar | |
Show CUInt | |
Show CUIntMax | |
Show CUIntPtr | |
Show CULLong | |
Show CULong | |
Show CUSeconds | |
Show CUShort | |
Show CWchar | |
Show Associativity | |
Defined in GHC.Internal.Generics Methods showsPrec :: Int -> Associativity -> ShowS # show :: Associativity -> String # showList :: [Associativity] -> ShowS # | |
Show DecidedStrictness | |
Defined in GHC.Internal.Generics Methods showsPrec :: Int -> DecidedStrictness -> ShowS # show :: DecidedStrictness -> String # showList :: [DecidedStrictness] -> ShowS # | |
Show Fixity | |
Show SourceStrictness | |
Defined in GHC.Internal.Generics Methods showsPrec :: Int -> SourceStrictness -> ShowS # show :: SourceStrictness -> String # showList :: [SourceStrictness] -> ShowS # | |
Show SourceUnpackedness | |
Defined in GHC.Internal.Generics Methods showsPrec :: Int -> SourceUnpackedness -> ShowS # show :: SourceUnpackedness -> String # showList :: [SourceUnpackedness] -> ShowS # | |
Show MaskingState | |
Defined in GHC.Internal.IO Methods showsPrec :: Int -> MaskingState -> ShowS # show :: MaskingState -> String # showList :: [MaskingState] -> ShowS # | |
Show CodingFailureMode | |
Defined in GHC.Internal.IO.Encoding.Failure Methods showsPrec :: Int -> CodingFailureMode -> ShowS # show :: CodingFailureMode -> String # showList :: [CodingFailureMode] -> ShowS # | |
Show CodingProgress | |
Defined in GHC.Internal.IO.Encoding.Types Methods showsPrec :: Int -> CodingProgress -> ShowS # show :: CodingProgress -> String # showList :: [CodingProgress] -> ShowS # | |
Show TextEncoding | |
Defined in GHC.Internal.IO.Encoding.Types Methods showsPrec :: Int -> TextEncoding -> ShowS # show :: TextEncoding -> String # showList :: [TextEncoding] -> ShowS # | |
Show AllocationLimitExceeded | |
Defined in GHC.Internal.IO.Exception Methods showsPrec :: Int -> AllocationLimitExceeded -> ShowS # show :: AllocationLimitExceeded -> String # showList :: [AllocationLimitExceeded] -> ShowS # | |
Show ArrayException | |
Defined in GHC.Internal.IO.Exception Methods showsPrec :: Int -> ArrayException -> ShowS # show :: ArrayException -> String # showList :: [ArrayException] -> ShowS # | |
Show AssertionFailed | |
Defined in GHC.Internal.IO.Exception Methods showsPrec :: Int -> AssertionFailed -> ShowS # show :: AssertionFailed -> String # showList :: [AssertionFailed] -> ShowS # | |
Show AsyncException | |
Defined in GHC.Internal.IO.Exception Methods showsPrec :: Int -> AsyncException -> ShowS # show :: AsyncException -> String # showList :: [AsyncException] -> ShowS # | |
Show BlockedIndefinitelyOnMVar | |
Defined in GHC.Internal.IO.Exception Methods showsPrec :: Int -> BlockedIndefinitelyOnMVar -> ShowS # show :: BlockedIndefinitelyOnMVar -> String # showList :: [BlockedIndefinitelyOnMVar] -> ShowS # | |
Show BlockedIndefinitelyOnSTM | |
Defined in GHC.Internal.IO.Exception Methods showsPrec :: Int -> BlockedIndefinitelyOnSTM -> ShowS # show :: BlockedIndefinitelyOnSTM -> String # showList :: [BlockedIndefinitelyOnSTM] -> ShowS # | |
Show CompactionFailed | |
Defined in GHC.Internal.IO.Exception Methods showsPrec :: Int -> CompactionFailed -> ShowS # show :: CompactionFailed -> String # showList :: [CompactionFailed] -> ShowS # | |
Show Deadlock | |
Show ExitCode | |
Show FixIOException | |
Defined in GHC.Internal.IO.Exception Methods showsPrec :: Int -> FixIOException -> ShowS # show :: FixIOException -> String # showList :: [FixIOException] -> ShowS # | |
Show IOErrorType | |
Defined in GHC.Internal.IO.Exception Methods showsPrec :: Int -> IOErrorType -> ShowS # show :: IOErrorType -> String # showList :: [IOErrorType] -> ShowS # | |
Show IOException | |
Defined in GHC.Internal.IO.Exception Methods showsPrec :: Int -> IOException -> ShowS # show :: IOException -> String # showList :: [IOException] -> ShowS # | |
Show SomeAsyncException | |
Defined in GHC.Internal.IO.Exception Methods showsPrec :: Int -> SomeAsyncException -> ShowS # show :: SomeAsyncException -> String # showList :: [SomeAsyncException] -> ShowS # | |
Show HandlePosn | |
Defined in GHC.Internal.IO.Handle Methods showsPrec :: Int -> HandlePosn -> ShowS # show :: HandlePosn -> String # showList :: [HandlePosn] -> ShowS # | |
Show BufferMode | |
Defined in GHC.Internal.IO.Handle.Types Methods showsPrec :: Int -> BufferMode -> ShowS # show :: BufferMode -> String # showList :: [BufferMode] -> ShowS # | |
Show Handle | |
Show HandleType | |
Defined in GHC.Internal.IO.Handle.Types Methods showsPrec :: Int -> HandleType -> ShowS # show :: HandleType -> String # showList :: [HandleType] -> ShowS # | |
Show Newline | |
Show NewlineMode | |
Defined in GHC.Internal.IO.Handle.Types Methods showsPrec :: Int -> NewlineMode -> ShowS # show :: NewlineMode -> String # showList :: [NewlineMode] -> ShowS # | |
Show IOMode | |
Show Int16 | |
Show Int32 | |
Show Int64 | |
Show Int8 | |
Show CCFlags | |
Show ConcFlags | |
Show DebugFlags | |
Defined in GHC.Internal.RTS.Flags Methods showsPrec :: Int -> DebugFlags -> ShowS # show :: DebugFlags -> String # showList :: [DebugFlags] -> ShowS # | |
Show DoCostCentres | |
Defined in GHC.Internal.RTS.Flags Methods showsPrec :: Int -> DoCostCentres -> ShowS # show :: DoCostCentres -> String # showList :: [DoCostCentres] -> ShowS # | |
Show DoHeapProfile | |
Defined in GHC.Internal.RTS.Flags Methods showsPrec :: Int -> DoHeapProfile -> ShowS # show :: DoHeapProfile -> String # showList :: [DoHeapProfile] -> ShowS # | |
Show DoTrace | |
Show GCFlags | |
Show GiveGCStats | |
Defined in GHC.Internal.RTS.Flags Methods showsPrec :: Int -> GiveGCStats -> ShowS # show :: GiveGCStats -> String # showList :: [GiveGCStats] -> ShowS # | |
Show HpcFlags | |
Show IoSubSystem | |
Defined in GHC.Internal.RTS.Flags Methods showsPrec :: Int -> IoSubSystem -> ShowS # show :: IoSubSystem -> String # showList :: [IoSubSystem] -> ShowS # | |
Show MiscFlags | |
Show ParFlags | |
Show ProfFlags | |
Show RTSFlags | |
Show TickyFlags | |
Defined in GHC.Internal.RTS.Flags Methods showsPrec :: Int -> TickyFlags -> ShowS # show :: TickyFlags -> String # showList :: [TickyFlags] -> ShowS # | |
Show TraceFlags | |
Defined in GHC.Internal.RTS.Flags Methods showsPrec :: Int -> TraceFlags -> ShowS # show :: TraceFlags -> String # showList :: [TraceFlags] -> ShowS # | |
Show FractionalExponentBase | |
Defined in GHC.Internal.Real Methods showsPrec :: Int -> FractionalExponentBase -> ShowS # show :: FractionalExponentBase -> String # showList :: [FractionalExponentBase] -> ShowS # | |
Show CallStack | |
Show SrcLoc | |
Show CBlkCnt | |
Show CBlkSize | |
Show CCc | |
Show CClockId | |
Show CDev | |
Show CFsBlkCnt | |
Show CFsFilCnt | |
Show CGid | |
Show CId | |
Show CIno | |
Show CKey | |
Show CMode | |
Show CNfds | |
Show CNlink | |
Show COff | |
Show CPid | |
Show CRLim | |
Show CSocklen | |
Show CSpeed | |
Show CSsize | |
Show CTcflag | |
Show CTimer | |
Show CUid | |
Show Fd | |
Show Lexeme | |
Show Number | |
Show SomeChar | |
Show SomeSymbol | |
Defined in GHC.Internal.TypeLits Methods showsPrec :: Int -> SomeSymbol -> ShowS # show :: SomeSymbol -> String # showList :: [SomeSymbol] -> ShowS # | |
Show SomeNat | |
Show GeneralCategory | |
Defined in GHC.Internal.Unicode Methods showsPrec :: Int -> GeneralCategory -> ShowS # show :: GeneralCategory -> String # showList :: [GeneralCategory] -> ShowS # | |
Show Word16 | |
Show Word32 | |
Show Word64 | |
Show Word8 | |
Show Arch | |
Show ArchOS | |
Show ArmABI | |
Show ArmISA | |
Show ArmISAExt | |
Show OS | |
Show PPC_64ABI | |
Show KindRep | |
Show Module | |
Show Ordering | |
Show TrName | |
Show TyCon | |
Show TypeLitSort | |
Defined in GHC.Internal.Show Methods showsPrec :: Int -> TypeLitSort -> ShowS # show :: TypeLitSort -> String # showList :: [TypeLitSort] -> ShowS # | |
Show FFIConv | |
Show FFIType | |
Show EvalBreakpoint | |
Defined in GHCi.Message Methods showsPrec :: Int -> EvalBreakpoint -> ShowS # show :: EvalBreakpoint -> String # showList :: [EvalBreakpoint] -> ShowS # | |
Show EvalOpts | |
Show QState | |
Show SerializableException | |
Defined in GHCi.Message Methods showsPrec :: Int -> SerializableException -> ShowS # show :: SerializableException -> String # showList :: [SerializableException] -> ShowS # | |
Show THResultType | |
Defined in GHCi.Message Methods showsPrec :: Int -> THResultType -> ShowS # show :: THResultType -> String # showList :: [THResultType] -> ShowS # | |
Show HValue | |
Show ResolvedBCO | |
Defined in GHCi.ResolvedBCO Methods showsPrec :: Int -> ResolvedBCO -> ShowS # show :: ResolvedBCO -> String # showList :: [ResolvedBCO] -> ShowS # | |
Show ResolvedBCOPtr | |
Defined in GHCi.ResolvedBCO Methods showsPrec :: Int -> ResolvedBCOPtr -> ShowS # show :: ResolvedBCOPtr -> String # showList :: [ResolvedBCOPtr] -> ShowS # | |
Show GHCiQException | |
Defined in GHCi.TH Methods showsPrec :: Int -> GHCiQException -> ShowS # show :: GHCiQException -> String # showList :: [GHCiQException] -> ShowS # | |
Show BoxLabel | |
Show CondBox | |
Show Mix | |
Show Tix | |
Show TixModule | |
Show Hash | |
Show HpcPos | |
Show OsChar | |
Show OsString | |
Show PosixChar | |
Show PosixString | |
Defined in System.OsString.Internal.Types Methods showsPrec :: Int -> PosixString -> ShowS # show :: PosixString -> String # showList :: [PosixString] -> ShowS # | |
Show WindowsChar | |
Defined in System.OsString.Internal.Types Methods showsPrec :: Int -> WindowsChar -> ShowS # show :: WindowsChar -> String # showList :: [WindowsChar] -> ShowS # | |
Show WindowsString | |
Defined in System.OsString.Internal.Types Methods showsPrec :: Int -> WindowsString -> ShowS # show :: WindowsString -> String # showList :: [WindowsString] -> ShowS # | |
Show Mode | |
Show Style | |
Show TextDetails | |
Show Doc | |
Show CmdSpec | |
Show CreateProcess | |
Defined in System.Process.Common Methods showsPrec :: Int -> CreateProcess -> ShowS # show :: CreateProcess -> String # showList :: [CreateProcess] -> ShowS # | |
Show StdStream | |
Show ForallVisFlag | |
Defined in Language.Haskell.TH.Ppr Methods showsPrec :: Int -> ForallVisFlag -> ShowS # show :: ForallVisFlag -> String # showList :: [ForallVisFlag] -> ShowS # | |
Show Doc | |
Show AnnLookup | |
Show AnnTarget | |
Show Bang | |
Show BndrVis | |
Show Body | |
Show Bytes | |
Show Callconv | |
Show Clause | |
Show Con | |
Show Dec | |
Show DecidedStrictness | |
Defined in Language.Haskell.TH.Syntax Methods showsPrec :: Int -> DecidedStrictness -> ShowS # show :: DecidedStrictness -> String # showList :: [DecidedStrictness] -> ShowS # | |
Show DerivClause | |
Defined in Language.Haskell.TH.Syntax Methods showsPrec :: Int -> DerivClause -> ShowS # show :: DerivClause -> String # showList :: [DerivClause] -> ShowS # | |
Show DerivStrategy | |
Defined in Language.Haskell.TH.Syntax Methods showsPrec :: Int -> DerivStrategy -> ShowS # show :: DerivStrategy -> String # showList :: [DerivStrategy] -> ShowS # | |
Show DocLoc | |
Show Exp | |
Show FamilyResultSig | |
Defined in Language.Haskell.TH.Syntax Methods showsPrec :: Int -> FamilyResultSig -> ShowS # show :: FamilyResultSig -> String # showList :: [FamilyResultSig] -> ShowS # | |
Show Fixity | |
Show FixityDirection | |
Defined in Language.Haskell.TH.Syntax Methods showsPrec :: Int -> FixityDirection -> ShowS # show :: FixityDirection -> String # showList :: [FixityDirection] -> ShowS # | |
Show Foreign | |
Show FunDep | |
Show Guard | |
Show Info | |
Show InjectivityAnn | |
Defined in Language.Haskell.TH.Syntax Methods showsPrec :: Int -> InjectivityAnn -> ShowS # show :: InjectivityAnn -> String # showList :: [InjectivityAnn] -> ShowS # | |
Show Inline | |
Show Lit | |
Show Loc | |
Show Match | |
Show ModName | |
Show Module | |
Show ModuleInfo | |
Defined in Language.Haskell.TH.Syntax Methods showsPrec :: Int -> ModuleInfo -> ShowS # show :: ModuleInfo -> String # showList :: [ModuleInfo] -> ShowS # | |
Show Name | |
Show NameFlavour | |
Defined in Language.Haskell.TH.Syntax Methods showsPrec :: Int -> NameFlavour -> ShowS # show :: NameFlavour -> String # showList :: [NameFlavour] -> ShowS # | |
Show NameSpace | |
Show NamespaceSpecifier | |
Defined in Language.Haskell.TH.Syntax Methods showsPrec :: Int -> NamespaceSpecifier -> ShowS # show :: NamespaceSpecifier -> String # showList :: [NamespaceSpecifier] -> ShowS # | |
Show OccName | |
Show Overlap | |
Show Pat | |
Show PatSynArgs | |
Defined in Language.Haskell.TH.Syntax Methods showsPrec :: Int -> PatSynArgs -> ShowS # show :: PatSynArgs -> String # showList :: [PatSynArgs] -> ShowS # | |
Show PatSynDir | |
Show Phases | |
Show PkgName | |
Show Pragma | |
Show Range | |
Show Role | |
Show RuleBndr | |
Show RuleMatch | |
Show Safety | |
Show SourceStrictness | |
Defined in Language.Haskell.TH.Syntax Methods showsPrec :: Int -> SourceStrictness -> ShowS # show :: SourceStrictness -> String # showList :: [SourceStrictness] -> ShowS # | |
Show SourceUnpackedness | |
Defined in Language.Haskell.TH.Syntax Methods showsPrec :: Int -> SourceUnpackedness -> ShowS # show :: SourceUnpackedness -> String # showList :: [SourceUnpackedness] -> ShowS # | |
Show Specificity | |
Defined in Language.Haskell.TH.Syntax Methods showsPrec :: Int -> Specificity -> ShowS # show :: Specificity -> String # showList :: [Specificity] -> ShowS # | |
Show Stmt | |
Show TyLit | |
Show TySynEqn | |
Show Type | |
Show TypeFamilyHead | |
Defined in Language.Haskell.TH.Syntax Methods showsPrec :: Int -> TypeFamilyHead -> ShowS # show :: TypeFamilyHead -> String # showList :: [TypeFamilyHead] -> ShowS # | |
Show Month | Show as |
Show Quarter | Show as |
Show QuarterOfYear | |
Defined in Data.Time.Calendar.Quarter Methods showsPrec :: Int -> QuarterOfYear -> ShowS # show :: QuarterOfYear -> String # showList :: [QuarterOfYear] -> ShowS # | |
Show DiffTime | |
Show LocalTime | |
Show ZonedTime | For the time zone, this only shows the name, or offset if the name is empty. |
Show DL | |
Show RTLDFlags | |
Show CAttributes | |
Defined in System.Posix.Files.Common Methods showsPrec :: Int -> CAttributes -> ShowS # show :: CAttributes -> String # showList :: [CAttributes] -> ShowS # | |
Show StatxFlags | |
Defined in System.Posix.Files.Common Methods showsPrec :: Int -> StatxFlags -> ShowS # show :: StatxFlags -> String # showList :: [StatxFlags] -> ShowS # | |
Show StatxMask | |
Show OpenFileFlags | |
Defined in System.Posix.IO.Common Methods showsPrec :: Int -> OpenFileFlags -> ShowS # show :: OpenFileFlags -> String # showList :: [OpenFileFlags] -> ShowS # | |
Show OpenMode | |
Show ProcessStatus | |
Defined in System.Posix.Process.Internals Methods showsPrec :: Int -> ProcessStatus -> ShowS # show :: ProcessStatus -> String # showList :: [ProcessStatus] -> ShowS # | |
Show Resource | |
Show ResourceLimit | |
Defined in System.Posix.Resource Methods showsPrec :: Int -> ResourceLimit -> ShowS # show :: ResourceLimit -> String # showList :: [ResourceLimit] -> ShowS # | |
Show ResourceLimits | |
Defined in System.Posix.Resource Methods showsPrec :: Int -> ResourceLimits -> ShowS # show :: ResourceLimits -> String # showList :: [ResourceLimits] -> ShowS # | |
Show Integer | |
Show Natural | |
Show () | |
Show Bool | |
Show Char | |
Show Int | |
Show Levity | |
Show RuntimeRep | |
Defined in GHC.Internal.Show Methods showsPrec :: Int -> RuntimeRep -> ShowS # show :: RuntimeRep -> String # showList :: [RuntimeRep] -> ShowS # | |
Show VecCount | |
Show VecElem | |
Show Word | |
Show a => Show (Complex a) | Since: base-2.1 |
Show a => Show (First a) | Since: base-4.9.0.0 |
Show a => Show (Last a) | Since: base-4.9.0.0 |
Show a => Show (Max a) | Since: base-4.9.0.0 |
Show a => Show (Min a) | Since: base-4.9.0.0 |
Show m => Show (WrappedMonoid m) | Since: base-4.9.0.0 |
Defined in Data.Semigroup Methods showsPrec :: Int -> WrappedMonoid m -> ShowS # show :: WrappedMonoid m -> String # showList :: [WrappedMonoid m] -> ShowS # | |
Show a => Show (Decoder a) | |
Show vertex => Show (SCC vertex) | Since: containers-0.5.9 |
Show a => Show (IntMap a) | |
Show a => Show (Seq a) | |
Show a => Show (ViewL a) | |
Show a => Show (ViewR a) | |
Show a => Show (Intersection a) | |
Defined in Data.Set.Internal Methods showsPrec :: Int -> Intersection a -> ShowS # show :: Intersection a -> String # showList :: [Intersection a] -> ShowS # | |
Show a => Show (Set a) | |
Show a => Show (Tree a) | |
Show a => Show (ExitCase a) | |
Show v => Show (LabelMap v) Source # | |
Show (WasmTypeTag t) Source # | |
Defined in GHC.CmmToAsm.Wasm.Types Methods showsPrec :: Int -> WasmTypeTag t -> ShowS # show :: WasmTypeTag t -> String # showList :: [WasmTypeTag t] -> ShowS # | |
Show a => Show (LPath a) Source # | |
Show a => Show (Maybe a) Source # | |
Show a => Show (Word64Map a) Source # | |
Show a => Show (OnOff a) Source # | |
Show a => Show (NonVoid a) Source # | |
Show (MsgEnvelope DiagnosticMessage) Source # | |
Defined in GHC.Types.Error Methods showsPrec :: Int -> MsgEnvelope DiagnosticMessage -> ShowS # show :: MsgEnvelope DiagnosticMessage -> String # showList :: [MsgEnvelope DiagnosticMessage] -> ShowS # | |
Show a => Show (EpaLocation' a) Source # | |
Defined in GHC.Types.SrcLoc Methods showsPrec :: Int -> EpaLocation' a -> ShowS # show :: EpaLocation' a -> String # showList :: [EpaLocation' a] -> ShowS # | |
Show mod => Show (GenWithIsBoot mod) Source # | |
Defined in GHC.Unit.Types Methods showsPrec :: Int -> GenWithIsBoot mod -> ShowS # show :: GenWithIsBoot mod -> String # showList :: [GenWithIsBoot mod] -> ShowS # | |
Show a => Show (FixedLengthEncoding a) Source # | |
Defined in GHC.Utils.Binary Methods showsPrec :: Int -> FixedLengthEncoding a -> ShowS # show :: FixedLengthEncoding a -> String # showList :: [FixedLengthEncoding a] -> ShowS # | |
Show a => Show (SizedSeq a) | |
Show b => Show (GenClosure b) | |
Defined in GHC.Exts.Heap.Closures Methods showsPrec :: Int -> GenClosure b -> ShowS # show :: GenClosure b -> String # showList :: [GenClosure b] -> ShowS # | |
Show b => Show (GenStackField b) | |
Defined in GHC.Exts.Heap.Closures Methods showsPrec :: Int -> GenStackField b -> ShowS # show :: GenStackField b -> String # showList :: [GenStackField b] -> ShowS # | |
Show b => Show (GenStackFrame b) | |
Defined in GHC.Exts.Heap.Closures Methods showsPrec :: Int -> GenStackFrame b -> ShowS # show :: GenStackFrame b -> String # showList :: [GenStackFrame b] -> ShowS # | |
Show b => Show (GenStgStackClosure b) | |
Defined in GHC.Exts.Heap.Closures Methods showsPrec :: Int -> GenStgStackClosure b -> ShowS # show :: GenStgStackClosure b -> String # showList :: [GenStgStackClosure b] -> ShowS # | |
Show a => Show (NonEmpty a) | |
Show a => Show (And a) | |
Show a => Show (Iff a) | |
Show a => Show (Ior a) | |
Show a => Show (Xor a) | |
Show a => Show (Identity a) | |
Show a => Show (First a) | |
Show a => Show (Last a) | |
Show a => Show (Down a) | |
Show a => Show (Dual a) | |
Show a => Show (Product a) | |
Show a => Show (Sum a) | |
Show a => Show (ExceptionWithContext a) | |
Defined in GHC.Internal.Exception.Type Methods showsPrec :: Int -> ExceptionWithContext a -> ShowS # show :: ExceptionWithContext a -> String # showList :: [ExceptionWithContext a] -> ShowS # | |
Show e => Show (NoBacktrace e) | |
Show (ForeignPtr a) | |
Defined in GHC.Internal.ForeignPtr Methods showsPrec :: Int -> ForeignPtr a -> ShowS # show :: ForeignPtr a -> String # showList :: [ForeignPtr a] -> ShowS # | |
Show a => Show (ZipList a) | |
Show p => Show (Par1 p) | |
Show (FunPtr a) | |
Show (Ptr a) | |
Show a => Show (Ratio a) | |
Show (SChar c) | |
Show (SSymbol s) | |
Show (SNat n) | |
Show a => Show (EvalExpr a) | |
Show a => Show (EvalResult a) | |
Defined in GHCi.Message Methods showsPrec :: Int -> EvalResult a -> ShowS # show :: EvalResult a -> String # showList :: [EvalResult a] -> ShowS # | |
Show (Message a) | |
Show a => Show (QResult a) | |
Show (THMessage a) | |
Show a => Show (THResult a) | |
Show (RemotePtr a) | |
Show (RemoteRef a) | |
Show a => Show (AnnotDetails a) | |
Show (Doc a) | |
Show a => Show (Span a) | |
Show flag => Show (TyVarBndr flag) | |
Show a => Show (Maybe a) | |
Show a => Show (Solo a) | |
Show a => Show [a] | |
(Ix ix, Show ix, Show e, IArray UArray e) => Show (UArray ix e) | |
HasResolution a => Show (Fixed a) | Since: base-2.1 |
(Show a, Show b) => Show (Arg a b) | Since: base-4.9.0.0 |
(Show k, Show a) => Show (Map k a) | |
(Show a, Show b) => Show (Gr a b) Source # | |
(Show a, Show b) => Show (Pair a b) Source # | |
(Show l, Show e) => Show (GenLocated l e) Source # | |
Defined in GHC.Types.SrcLoc Methods showsPrec :: Int -> GenLocated l e -> ShowS # show :: GenLocated l e -> String # showList :: [GenLocated l e] -> ShowS # | |
Show (Bin a) Source # | |
(Ix a, Show a, Show b) => Show (Array a b) | |
(Show a, Show b) => Show (Either a b) | |
Show (Proxy s) | |
Show (TypeRep a) | |
Show (U1 p) | |
Show (V1 p) | |
Show (ST s a) | |
Show a => Show (EvalStatus_ a b) | |
Defined in GHCi.Message Methods showsPrec :: Int -> EvalStatus_ a b -> ShowS # show :: EvalStatus_ a b -> String # showList :: [EvalStatus_ a b] -> ShowS # | |
(Show1 f, Show a) => Show (Lift f a) | |
(Show1 m, Show a) => Show (MaybeT m a) | |
(Show a, Show b) => Show (a, b) | |
Show a => Show (Const a b) | |
Show (f a) => Show (Ap f a) | |
Show (f a) => Show (Alt f a) | |
Show (a :~: b) | |
Show (OrderingI a b) | |
Show (f p) => Show (Rec1 f p) | |
Show (URec Char p) | |
Show (URec Double p) | |
Show (URec Float p) | |
Show (URec Int p) | |
Show (URec Word p) | |
(Show1 f, Show a) => Show (Backwards f a) | |
(Show e, Show1 m, Show a) => Show (ExceptT e m a) | |
(Show1 f, Show a) => Show (IdentityT f a) | |
(Show w, Show1 m, Show a) => Show (WriterT w m a) | |
(Show w, Show1 m, Show a) => Show (WriterT w m a) | |
Show a => Show (Constant a b) | |
(Show1 f, Show a) => Show (Reverse f a) | |
(Show a, Show b, Show c) => Show (a, b, c) | |
(Show (f a), Show (g a)) => Show (Product f g a) | Since: base-4.18.0.0 |
(Show (f a), Show (g a)) => Show (Sum f g a) | Since: base-4.18.0.0 |
Show (a :~~: b) | |
(Show (f p), Show (g p)) => Show ((f :*: g) p) | |
(Show (f p), Show (g p)) => Show ((f :+: g) p) | |
Show c => Show (K1 i c p) | |
(Show a, Show b, Show c, Show d) => Show (a, b, c, d) | |
Show (f (g a)) => Show (Compose f g a) | Since: base-4.18.0.0 |
Show (gr a b) => Show (OrdGr gr a b) Source # | |
(Show uid, Show modulename, Show mod, Show srcpkgid, Show srcpkgname) => Show (GenericUnitInfo srcpkgid srcpkgname uid modulename mod) | |
Defined in GHC.Unit.Database Methods showsPrec :: Int -> GenericUnitInfo srcpkgid srcpkgname uid modulename mod -> ShowS # show :: GenericUnitInfo srcpkgid srcpkgname uid modulename mod -> String # showList :: [GenericUnitInfo srcpkgid srcpkgname uid modulename mod] -> ShowS # | |
Show (f (g p)) => Show ((f :.: g) p) | |
Show (f p) => Show (M1 i c f p) | |
(Show a, Show b, Show c, Show d, Show e) => Show (a, b, c, d, e) | |
(Show a, Show b, Show c, Show d, Show e, Show f) => Show (a, b, c, d, e, f) | |
(Show a, Show b, Show c, Show d, Show e, Show f, Show g) => Show (a, b, c, d, e, f, g) | |
(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) | |
(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) | |
(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) | |
(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) | |
(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) | |
(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) | |
(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) | |
(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) | |
class (Functor t, Foldable t) => Traversable (t :: Type -> Type) where #
Methods
traverse :: Applicative f => (a -> f b) -> t a -> f (t b) #
sequenceA :: Applicative f => t (f a) -> f (t a) #
Instances
Traversable Complex | Since: base-4.9.0.0 |
Traversable First | Since: base-4.9.0.0 |
Traversable Last | Since: base-4.9.0.0 |
Traversable Max | Since: base-4.9.0.0 |
Traversable Min | Since: base-4.9.0.0 |
Traversable SCC | Since: containers-0.5.9 |
Traversable IntMap | Traverses in order of increasing key. |
Traversable Digit | |
Traversable Elem | |
Traversable FingerTree | |
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 | |
Traversable Seq | |
Traversable ViewL | |
Traversable ViewR | |
Traversable Tree | |
Traversable LabelMap Source # | |
Traversable Bag Source # | |
Traversable BooleanFormula Source # | |
Defined in GHC.Data.BooleanFormula 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 Infinite Source # | |
Traversable OrdList Source # | |
Traversable Pair Source # | |
Traversable Maybe Source # | |
Traversable Word64Map Source # | Traverses in order of increasing key. |
Defined in GHC.Data.Word64Map.Internal | |
Traversable ModNodeMap Source # | |
Defined in GHC.Driver.Make Methods traverse :: Applicative f => (a -> f b) -> ModNodeMap a -> f (ModNodeMap b) # sequenceA :: Applicative f => ModNodeMap (f a) -> f (ModNodeMap a) # mapM :: Monad m => (a -> m b) -> ModNodeMap a -> m (ModNodeMap b) # sequence :: Monad m => ModNodeMap (m a) -> m (ModNodeMap a) # | |
Traversable HieAST Source # | |
Traversable HieASTs Source # | |
Traversable HieArgs Source # | |
Traversable HieType Source # | |
Traversable IdentifierDetails Source # | |
Defined in GHC.Iface.Ext.Types Methods traverse :: Applicative f => (a -> f b) -> IdentifierDetails a -> f (IdentifierDetails b) # sequenceA :: Applicative f => IdentifierDetails (f a) -> f (IdentifierDetails a) # mapM :: Monad m => (a -> m b) -> IdentifierDetails a -> m (IdentifierDetails b) # sequence :: Monad m => IdentifierDetails (m a) -> m (IdentifierDetails a) # | |
Traversable NodeInfo Source # | |
Traversable SourcedNodeInfo Source # | |
Defined in GHC.Iface.Ext.Types Methods traverse :: Applicative f => (a -> f b) -> SourcedNodeInfo a -> f (SourcedNodeInfo b) # sequenceA :: Applicative f => SourcedNodeInfo (f a) -> f (SourcedNodeInfo a) # mapM :: Monad m => (a -> m b) -> SourcedNodeInfo a -> m (SourcedNodeInfo b) # sequence :: Monad m => SourcedNodeInfo (m a) -> m (SourcedNodeInfo a) # | |
Traversable Messages Source # | |
Traversable MsgEnvelope Source # | |
Defined in GHC.Types.Error Methods traverse :: Applicative f => (a -> f b) -> MsgEnvelope a -> f (MsgEnvelope b) # sequenceA :: Applicative f => MsgEnvelope (f a) -> f (MsgEnvelope a) # mapM :: Monad m => (a -> m b) -> MsgEnvelope a -> m (MsgEnvelope b) # sequence :: Monad m => MsgEnvelope (m a) -> m (MsgEnvelope a) # | |
Traversable UnitEnvGraph Source # | |
Defined in GHC.Unit.Env Methods traverse :: Applicative f => (a -> f b) -> UnitEnvGraph a -> f (UnitEnvGraph b) # sequenceA :: Applicative f => UnitEnvGraph (f a) -> f (UnitEnvGraph a) # mapM :: Monad m => (a -> m b) -> UnitEnvGraph a -> m (UnitEnvGraph b) # sequence :: Monad m => UnitEnvGraph (m a) -> m (UnitEnvGraph a) # | |
Traversable GenWithIsBoot Source # | |
Defined in GHC.Unit.Types Methods traverse :: Applicative f => (a -> f b) -> GenWithIsBoot a -> f (GenWithIsBoot b) # sequenceA :: Applicative f => GenWithIsBoot (f a) -> f (GenWithIsBoot a) # mapM :: Monad m => (a -> m b) -> GenWithIsBoot a -> m (GenWithIsBoot b) # sequence :: Monad m => GenWithIsBoot (m a) -> m (GenWithIsBoot a) # | |
Traversable DataDefnCons Source # | |
Defined in Language.Haskell.Syntax.Decls Methods traverse :: Applicative f => (a -> f b) -> DataDefnCons a -> f (DataDefnCons b) # sequenceA :: Applicative f => DataDefnCons (f a) -> f (DataDefnCons a) # mapM :: Monad m => (a -> m b) -> DataDefnCons a -> m (DataDefnCons b) # sequence :: Monad m => DataDefnCons (m a) -> m (DataDefnCons a) # | |
Traversable SizedSeq | |
Traversable GenClosure | |
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 GenStackField | |
Defined in GHC.Exts.Heap.Closures Methods traverse :: Applicative f => (a -> f b) -> GenStackField a -> f (GenStackField b) # sequenceA :: Applicative f => GenStackField (f a) -> f (GenStackField a) # mapM :: Monad m => (a -> m b) -> GenStackField a -> m (GenStackField b) # sequence :: Monad m => GenStackField (m a) -> m (GenStackField a) # | |
Traversable GenStackFrame | |
Defined in GHC.Exts.Heap.Closures Methods traverse :: Applicative f => (a -> f b) -> GenStackFrame a -> f (GenStackFrame b) # sequenceA :: Applicative f => GenStackFrame (f a) -> f (GenStackFrame a) # mapM :: Monad m => (a -> m b) -> GenStackFrame a -> m (GenStackFrame b) # sequence :: Monad m => GenStackFrame (m a) -> m (GenStackFrame a) # | |
Traversable GenStgStackClosure | |
Defined in GHC.Exts.Heap.Closures Methods traverse :: Applicative f => (a -> f b) -> GenStgStackClosure a -> f (GenStgStackClosure b) # sequenceA :: Applicative f => GenStgStackClosure (f a) -> f (GenStgStackClosure a) # mapM :: Monad m => (a -> m b) -> GenStgStackClosure a -> m (GenStgStackClosure b) # sequence :: Monad m => GenStgStackClosure (m a) -> m (GenStgStackClosure a) # | |
Traversable NonEmpty | |
Defined in GHC.Internal.Data.Traversable | |
Traversable Identity | |
Defined in GHC.Internal.Data.Traversable | |
Traversable First | |
Traversable Last | |
Traversable Down | |
Traversable Dual | |
Traversable Product | |
Traversable Sum | |
Traversable ZipList | |
Traversable Par1 | |
Traversable TyVarBndr | |
Defined in Language.Haskell.TH.Syntax | |
Traversable Maybe | |
Traversable Solo | |
Traversable [] | |
Defined in GHC.Internal.Data.Traversable | |
Traversable (Arg a) | Since: base-4.9.0.0 |
Traversable (Map k) | Traverses in order of increasing key. |
(Monad m, Traversable m) => Traversable (CatchT m) | |
Defined in Control.Monad.Catch.Pure | |
Traversable (Pair a) Source # | |
Traversable (IfaceBindingX r) Source # | |
Defined in GHC.Iface.Syntax Methods traverse :: Applicative f => (a -> f b) -> IfaceBindingX r a -> f (IfaceBindingX r b) # sequenceA :: Applicative f => IfaceBindingX r (f a) -> f (IfaceBindingX r a) # mapM :: Monad m => (a -> m b) -> IfaceBindingX r a -> m (IfaceBindingX r b) # sequence :: Monad m => IfaceBindingX r (m a) -> m (IfaceBindingX r a) # | |
Traversable (GenLocated l) Source # | |
Defined in GHC.Types.SrcLoc Methods traverse :: Applicative f => (a -> f b) -> GenLocated l a -> f (GenLocated l b) # sequenceA :: Applicative f => GenLocated l (f a) -> f (GenLocated l a) # mapM :: Monad m => (a -> m b) -> GenLocated l a -> m (GenLocated l b) # sequence :: Monad m => GenLocated l (m a) -> m (GenLocated l a) # | |
Traversable (HsFieldBind lhs) Source # | |
Defined in Language.Haskell.Syntax.Pat Methods traverse :: Applicative f => (a -> f b) -> HsFieldBind lhs a -> f (HsFieldBind lhs b) # sequenceA :: Applicative f => HsFieldBind lhs (f a) -> f (HsFieldBind lhs a) # mapM :: Monad m => (a -> m b) -> HsFieldBind lhs a -> m (HsFieldBind lhs b) # sequence :: Monad m => HsFieldBind lhs (m a) -> m (HsFieldBind lhs a) # | |
Traversable (DbOpenMode mode) | |
Defined in GHC.Unit.Database Methods traverse :: Applicative f => (a -> f b) -> DbOpenMode mode a -> f (DbOpenMode mode b) # sequenceA :: Applicative f => DbOpenMode mode (f a) -> f (DbOpenMode mode a) # mapM :: Monad m => (a -> m b) -> DbOpenMode mode a -> m (DbOpenMode mode b) # sequence :: Monad m => DbOpenMode mode (m a) -> m (DbOpenMode mode a) # | |
Ix i => Traversable (Array i) | |
Traversable (Either a) | |
Defined in GHC.Internal.Data.Traversable | |
Traversable (Proxy :: Type -> Type) | |
Traversable (U1 :: Type -> Type) | |
Traversable (UAddr :: Type -> Type) | |
Traversable (UChar :: Type -> Type) | |
Traversable (UDouble :: Type -> Type) | |
Traversable (UFloat :: Type -> Type) | |
Traversable (UInt :: Type -> Type) | |
Traversable (UWord :: Type -> Type) | |
Traversable (V1 :: Type -> Type) | |
Traversable f => Traversable (Lift f) | |
Traversable f => Traversable (MaybeT f) | |
Defined in Control.Monad.Trans.Maybe | |
Traversable ((,) a) | |
Defined in GHC.Internal.Data.Traversable | |
Traversable (UniqDFM key) Source # | Deterministic, in O(n log n). |
Defined in GHC.Types.Unique.DFM | |
Traversable (NonDetUniqFM key) Source # | Inherently nondeterministic. If you use this please provide a justification why it doesn't introduce nondeterminism. See Note [Deterministic UniqFM] in GHC.Types.Unique.DFM to learn about determinism. |
Defined in GHC.Types.Unique.FM Methods traverse :: Applicative f => (a -> f b) -> NonDetUniqFM key a -> f (NonDetUniqFM key b) # sequenceA :: Applicative f => NonDetUniqFM key (f a) -> f (NonDetUniqFM key a) # mapM :: Monad m => (a -> m b) -> NonDetUniqFM key a -> m (NonDetUniqFM key b) # sequence :: Monad m => NonDetUniqFM key (m a) -> m (NonDetUniqFM key a) # | |
Traversable (Const m :: Type -> Type) | |
Defined in GHC.Internal.Data.Traversable | |
Traversable f => Traversable (Ap f) | |
Traversable f => Traversable (Alt f) | |
Traversable f => Traversable (Rec1 f) | |
Traversable f => Traversable (Backwards f) | Derived instance. |
Defined in Control.Applicative.Backwards | |
Traversable f => Traversable (ExceptT e f) | |
Defined in Control.Monad.Trans.Except | |
Traversable f => Traversable (IdentityT f) | |
Defined in Control.Monad.Trans.Identity | |
Traversable f => Traversable (WriterT w f) | |
Defined in Control.Monad.Trans.Writer.Lazy | |
Traversable f => Traversable (WriterT w f) | |
Defined in Control.Monad.Trans.Writer.Strict | |
Traversable (Constant a :: Type -> Type) | |
Defined in Data.Functor.Constant | |
Traversable f => Traversable (Reverse f) | Traverse from right to left. |
Defined in Data.Functor.Reverse | |
(Traversable f, Traversable g) => Traversable (Product f g) | Since: base-4.9.0.0 |
Defined in Data.Functor.Product | |
(Traversable f, Traversable g) => Traversable (Sum f g) | Since: base-4.9.0.0 |
(Traversable f, Traversable g) => Traversable (f :*: g) | |
Defined in GHC.Internal.Data.Traversable | |
(Traversable f, Traversable g) => Traversable (f :+: g) | |
Defined in GHC.Internal.Data.Traversable | |
Traversable (K1 i c :: Type -> Type) | |
(Traversable f, Traversable g) => Traversable (Compose f g) | Since: base-4.9.0.0 |
Defined in Data.Functor.Compose | |
(Traversable f, Traversable g) => Traversable (f :.: g) | |
Defined in GHC.Internal.Data.Traversable | |
Traversable f => Traversable (M1 i c f) | |
Defined in GHC.Internal.Data.Traversable |
Instances
Semigroup ByteArray | Since: base-4.17.0.0 |
Semigroup Builder | |
Semigroup ByteString | |
Defined in Data.ByteString.Internal.Type Methods (<>) :: ByteString -> ByteString -> ByteString # sconcat :: NonEmpty ByteString -> ByteString # stimes :: Integral b => b -> ByteString -> ByteString # | |
Semigroup ByteString | |
Defined in Data.ByteString.Lazy.Internal Methods (<>) :: ByteString -> ByteString -> ByteString # sconcat :: NonEmpty ByteString -> ByteString # stimes :: Integral b => b -> ByteString -> ByteString # | |
Semigroup ShortByteString | |
Defined in Data.ByteString.Short.Internal Methods (<>) :: ShortByteString -> ShortByteString -> ShortByteString # sconcat :: NonEmpty ShortByteString -> ShortByteString # stimes :: Integral b => b -> ShortByteString -> ShortByteString # | |
Semigroup IntSet | Since: containers-0.5.7 |
Semigroup LabelSet Source # | |
Semigroup PotentialUnifiers Source # | |
Defined in GHC.Core.InstEnv Methods (<>) :: PotentialUnifiers -> PotentialUnifiers -> PotentialUnifiers # sconcat :: NonEmpty PotentialUnifiers -> PotentialUnifiers # stimes :: Integral b => b -> PotentialUnifiers -> PotentialUnifiers # | |
Semigroup MaybeApartReason Source # | |
Defined in GHC.Core.Unify Methods (<>) :: MaybeApartReason -> MaybeApartReason -> MaybeApartReason # sconcat :: NonEmpty MaybeApartReason -> MaybeApartReason # stimes :: Integral b => b -> MaybeApartReason -> MaybeApartReason # | |
Semigroup FastString Source # | |
Defined in GHC.Data.FastString Methods (<>) :: FastString -> FastString -> FastString # sconcat :: NonEmpty FastString -> FastString # stimes :: Integral b => b -> FastString -> FastString # | |
Semigroup Word64Set Source # | Since: ghc-0.5.7 |
Semigroup PluginRecompile Source # | |
Defined in GHC.Driver.Plugins Methods (<>) :: PluginRecompile -> PluginRecompile -> PluginRecompile # sconcat :: NonEmpty PluginRecompile -> PluginRecompile # stimes :: Integral b => b -> PluginRecompile -> PluginRecompile # | |
Semigroup Nablas Source # | |
Semigroup Precision Source # | |
Semigroup RecompileRequired Source # | |
Defined in GHC.Iface.Recomp Methods (<>) :: RecompileRequired -> RecompileRequired -> RecompileRequired # sconcat :: NonEmpty RecompileRequired -> RecompileRequired # stimes :: Integral b => b -> RecompileRequired -> RecompileRequired # | |
Semigroup IfaceAppArgs Source # | |
Defined in GHC.Iface.Type Methods (<>) :: IfaceAppArgs -> IfaceAppArgs -> IfaceAppArgs # sconcat :: NonEmpty IfaceAppArgs -> IfaceAppArgs # stimes :: Integral b => b -> IfaceAppArgs -> IfaceAppArgs # | |
Semigroup JStgStat Source # | |
Semigroup JStat Source # | |
Semigroup AnnListItem Source # | |
Defined in GHC.Parser.Annotation Methods (<>) :: AnnListItem -> AnnListItem -> AnnListItem # sconcat :: NonEmpty AnnListItem -> AnnListItem # stimes :: Integral b => b -> AnnListItem -> AnnListItem # | |
Semigroup EpAnnComments Source # | |
Defined in GHC.Parser.Annotation Methods (<>) :: EpAnnComments -> EpAnnComments -> EpAnnComments # sconcat :: NonEmpty EpAnnComments -> EpAnnComments # stimes :: Integral b => b -> EpAnnComments -> EpAnnComments # | |
Semigroup EpaLocation Source # | |
Defined in GHC.Parser.Annotation Methods (<>) :: EpaLocation -> EpaLocation -> EpaLocation # sconcat :: NonEmpty EpaLocation -> EpaLocation # stimes :: Integral b => b -> EpaLocation -> EpaLocation # | |
Semigroup IPEStats Source # | |
Semigroup JSOptions Source # | |
Semigroup CIStatic Source # | |
Semigroup Archive Source # | |
Semigroup CheckTyEqResult Source # | |
Defined in GHC.Tc.Types.Constraint Methods (<>) :: CheckTyEqResult -> CheckTyEqResult -> CheckTyEqResult # sconcat :: NonEmpty CheckTyEqResult -> CheckTyEqResult # stimes :: Integral b => b -> CheckTyEqResult -> CheckTyEqResult # | |
Semigroup HasGivenEqs Source # | |
Defined in GHC.Tc.Types.Constraint Methods (<>) :: HasGivenEqs -> HasGivenEqs -> HasGivenEqs # sconcat :: NonEmpty HasGivenEqs -> HasGivenEqs # stimes :: Integral b => b -> HasGivenEqs -> HasGivenEqs # | |
Semigroup RewriterSet Source # | |
Defined in GHC.Tc.Types.Constraint Methods (<>) :: RewriterSet -> RewriterSet -> RewriterSet # sconcat :: NonEmpty RewriterSet -> RewriterSet # stimes :: Integral b => b -> RewriterSet -> RewriterSet # | |
Semigroup HsWrapper Source # | The Semigroup instance is a bit fishy, since (a <> b) <> c ?= a <> (b <> c) >(a `WpCompose` b) `WpCompose` c /= @ a `WpCompose` (b `WpCompose` c) However these two associations are are "semantically equal" in the sense
that they produce equal functions when passed to
|
Semigroup CandidatesQTvs Source # | |
Defined in GHC.Tc.Utils.TcMType Methods (<>) :: CandidatesQTvs -> CandidatesQTvs -> CandidatesQTvs # sconcat :: NonEmpty CandidatesQTvs -> CandidatesQTvs # stimes :: Integral b => b -> CandidatesQTvs -> CandidatesQTvs # | |
Semigroup InsideLam Source # | If any occurrence of an identifier is inside a lambda, then the occurrence info of that identifier marks it as occurring inside a lambda |
Semigroup InterestingCxt Source # | If there is any |
Defined in GHC.Types.Basic Methods (<>) :: InterestingCxt -> InterestingCxt -> InterestingCxt # sconcat :: NonEmpty InterestingCxt -> InterestingCxt # stimes :: Integral b => b -> InterestingCxt -> InterestingCxt # | |
Semigroup SuccessFlag Source # | |
Defined in GHC.Types.Basic Methods (<>) :: SuccessFlag -> SuccessFlag -> SuccessFlag # sconcat :: NonEmpty SuccessFlag -> SuccessFlag # stimes :: Integral b => b -> SuccessFlag -> SuccessFlag # | |
Semigroup CHeader Source # | |
Semigroup CStub Source # | |
Semigroup NonCaffySet Source # | |
Defined in GHC.Types.Name.Set Methods (<>) :: NonCaffySet -> NonCaffySet -> NonCaffySet # sconcat :: NonEmpty NonCaffySet -> NonCaffySet # stimes :: Integral b => b -> NonCaffySet -> NonCaffySet # | |
Semigroup BufSpan Source # | |
Semigroup ModuleOrigin Source # | |
Defined in GHC.Unit.State Methods (<>) :: ModuleOrigin -> ModuleOrigin -> ModuleOrigin # sconcat :: NonEmpty ModuleOrigin -> ModuleOrigin # stimes :: Integral b => b -> ModuleOrigin -> ModuleOrigin # | |
Semigroup PprColour Source # | |
Semigroup ShortText | |
Semigroup Void | |
Semigroup All | |
Semigroup Any | |
Semigroup ExceptionContext | |
Defined in GHC.Internal.Exception.Context Methods (<>) :: ExceptionContext -> ExceptionContext -> ExceptionContext # sconcat :: NonEmpty ExceptionContext -> ExceptionContext # stimes :: Integral b => b -> ExceptionContext -> ExceptionContext # | |
Semigroup Ordering | |
Semigroup OsString | |
Semigroup PosixString | |
Defined in System.OsString.Internal.Types Methods (<>) :: PosixString -> PosixString -> PosixString # sconcat :: NonEmpty PosixString -> PosixString # stimes :: Integral b => b -> PosixString -> PosixString # | |
Semigroup WindowsString | |
Defined in System.OsString.Internal.Types Methods (<>) :: WindowsString -> WindowsString -> WindowsString # sconcat :: NonEmpty WindowsString -> WindowsString # stimes :: Integral b => b -> WindowsString -> WindowsString # | |
Semigroup Doc | |
Semigroup StatxFlags | ORs the flags. |
Defined in System.Posix.Files.Common Methods (<>) :: StatxFlags -> StatxFlags -> StatxFlags # sconcat :: NonEmpty StatxFlags -> StatxFlags # stimes :: Integral b => b -> StatxFlags -> StatxFlags # | |
Semigroup StatxMask | ORs the masks. |
Semigroup () | |
Semigroup (FromMaybe b) | |
Semigroup a => Semigroup (JoinWith a) | |
Semigroup (NonEmptyDList a) | |
Semigroup (Comparison a) |
(<>) :: Comparison a -> Comparison a -> Comparison a Comparison cmp <> Comparison cmp' = Comparison a a' -> cmp a a' <> cmp a a' |
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) |
(<>) :: Equivalence a -> Equivalence a -> Equivalence a Equivalence equiv <> Equivalence equiv' = Equivalence a b -> equiv a b && equiv' a b |
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) |
(<>) :: Predicate a -> Predicate a -> Predicate a Predicate pred <> Predicate pred' = Predicate a -> pred a && pred' a |
Semigroup (First a) | Since: base-4.9.0.0 |
Semigroup (Last a) | Since: base-4.9.0.0 |
Ord a => Semigroup (Max a) | Since: base-4.9.0.0 |
Ord a => Semigroup (Min a) | Since: base-4.9.0.0 |
Monoid m => Semigroup (WrappedMonoid m) | Since: base-4.9.0.0 |
Defined in Data.Semigroup Methods (<>) :: WrappedMonoid m -> WrappedMonoid m -> WrappedMonoid m # sconcat :: NonEmpty (WrappedMonoid m) -> WrappedMonoid m # stimes :: Integral b => b -> WrappedMonoid m -> WrappedMonoid m # | |
Semigroup (PutM ()) | |
Semigroup (IntMap a) | Since: containers-0.5.7 |
Semigroup (Seq a) | Since: containers-0.5.7 |
Ord a => Semigroup (Intersection a) | |
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) | |
Ord a => Semigroup (Set a) | Since: containers-0.5.7 |
Semigroup (Bag a) Source # | |
Semigroup (OrdList a) Source # | |
Semigroup a => Semigroup (Pair a) Source # | |
Semigroup a => Semigroup (Maybe a) Source # | |
Semigroup (Word64Map a) Source # | Since: ghc-0.5.7 |
Semigroup (IdentifierDetails a) Source # | |
Defined in GHC.Iface.Ext.Types Methods (<>) :: IdentifierDetails a -> IdentifierDetails a -> IdentifierDetails a # sconcat :: NonEmpty (IdentifierDetails a) -> IdentifierDetails a # stimes :: Integral b => b -> IdentifierDetails a -> IdentifierDetails a # | |
Semigroup (AnnSortKey tag) Source # | |
Defined in GHC.Parser.Annotation Methods (<>) :: AnnSortKey tag -> AnnSortKey tag -> AnnSortKey tag # sconcat :: NonEmpty (AnnSortKey tag) -> AnnSortKey tag # stimes :: Integral b => b -> AnnSortKey tag -> AnnSortKey tag # | |
Semigroup a => Semigroup (EpAnn a) Source # | |
Semigroup (Messages e) Source # | |
Semigroup (UniqSet a) Source # | |
Semigroup (NonEmpty a) | |
Semigroup a => Semigroup (STM a) | |
Bits a => Semigroup (And a) | |
FiniteBits a => Semigroup (Iff a) | |
Bits a => Semigroup (Ior a) | |
Bits a => Semigroup (Xor a) | |
Semigroup a => Semigroup (Identity a) | |
Semigroup (First a) | |
Semigroup (Last a) | |
Semigroup a => Semigroup (Down a) | |
Semigroup a => Semigroup (Dual a) | |
Semigroup (Endo a) | |
Num a => Semigroup (Product a) | |
Num a => Semigroup (Sum a) | |
(Generic a, Semigroup (Rep a ())) => Semigroup (Generically a) | |
Defined in GHC.Internal.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) | |
Semigroup a => Semigroup (IO a) | |
Semigroup (Doc a) | |
Semigroup a => Semigroup (Q a) | Since: template-haskell-2.17.0.0 |
Semigroup a => Semigroup (Maybe a) | |
Semigroup a => Semigroup (Solo a) | |
Semigroup [a] | |
Semigroup a => Semigroup (Op a b) |
(<>) :: Op a b -> Op a b -> Op a b Op f <> Op g = Op a -> f a <> g a |
Ord k => Semigroup (Map k v) | |
Semigroup (EnumSet a) Source # | |
Semigroup (UniqMap k a) Source # | |
Semigroup (Either a b) | |
Semigroup (Proxy s) | |
Semigroup (U1 p) | |
Semigroup (V1 p) | |
Semigroup a => Semigroup (ST s a) | |
(Semigroup a, Semigroup b) => Semigroup (a, b) | |
Semigroup b => Semigroup (a -> b) | |
Semigroup (UniqFM key a) Source # | |
Semigroup a => Semigroup (Const a b) | |
(Applicative f, Semigroup a) => Semigroup (Ap f a) | |
Alternative f => Semigroup (Alt f a) | |
Semigroup (f p) => Semigroup (Rec1 f p) | |
Semigroup a => Semigroup (Constant a b) | |
(Semigroup a, Semigroup b, Semigroup c) => Semigroup (a, b, c) | |
(Semigroup (f a), Semigroup (g a)) => Semigroup (Product f g a) | Since: base-4.16.0.0 |
(Semigroup (f p), Semigroup (g p)) => Semigroup ((f :*: g) p) | |
Semigroup c => Semigroup (K1 i c p) | |
(Semigroup a, Semigroup b, Semigroup c, Semigroup d) => Semigroup (a, b, c, d) | |
Semigroup (f (g a)) => Semigroup (Compose f g a) | Since: base-4.16.0.0 |
Semigroup (f (g p)) => Semigroup ((f :.: g) p) | |
Semigroup (f p) => Semigroup (M1 i c f p) | |
(Semigroup a, Semigroup b, Semigroup c, Semigroup d, Semigroup e) => Semigroup (a, b, c, d, e) | |
Instances
Bifoldable Either | Since: base-4.10.0.0 | ||||
Defined in Data.Bifoldable | |||||
Bifoldable1 Either | |||||
Bifunctor Either | Since: base-4.8.0.0 | ||||
Bitraversable Either | Since: base-4.10.0.0 | ||||
Defined in Data.Bitraversable Methods bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> Either a b -> f (Either c d) Source # | |||||
Eq2 Either | Since: base-4.9.0.0 | ||||
Ord2 Either | Since: base-4.9.0.0 | ||||
Defined in Data.Functor.Classes | |||||
Read2 Either | Since: base-4.9.0.0 | ||||
Defined in Data.Functor.Classes Methods liftReadsPrec2 :: (Int -> ReadS a) -> ReadS [a] -> (Int -> ReadS b) -> ReadS [b] -> Int -> ReadS (Either a b) Source # liftReadList2 :: (Int -> ReadS a) -> ReadS [a] -> (Int -> ReadS b) -> ReadS [b] -> ReadS [Either a b] Source # liftReadPrec2 :: ReadPrec a -> ReadPrec [a] -> ReadPrec b -> ReadPrec [b] -> ReadPrec (Either a b) Source # liftReadListPrec2 :: ReadPrec a -> ReadPrec [a] -> ReadPrec b -> ReadPrec [b] -> ReadPrec [Either a b] Source # | |||||
Show2 Either | Since: base-4.9.0.0 | ||||
Defined in Data.Functor.Classes | |||||
NFData2 Either | Since: deepseq-1.4.3.0 | ||||
Defined in Control.DeepSeq | |||||
Generic1 (Either a :: Type -> Type) | |||||
Defined in GHC.Internal.Generics Associated Types
| |||||
(Lift a, Lift b) => Lift (Either a b :: Type) | |||||
Eq a => Eq1 (Either a) | Since: base-4.9.0.0 | ||||
Ord a => Ord1 (Either a) | Since: base-4.9.0.0 | ||||
Defined in Data.Functor.Classes | |||||
Read a => Read1 (Either a) | Since: base-4.9.0.0 | ||||
Defined in Data.Functor.Classes Methods liftReadsPrec :: (Int -> ReadS a0) -> ReadS [a0] -> Int -> ReadS (Either a a0) Source # liftReadList :: (Int -> ReadS a0) -> ReadS [a0] -> ReadS [Either a a0] Source # liftReadPrec :: ReadPrec a0 -> ReadPrec [a0] -> ReadPrec (Either a a0) Source # liftReadListPrec :: ReadPrec a0 -> ReadPrec [a0] -> ReadPrec [Either a a0] Source # | |||||
Show a => Show1 (Either a) | Since: base-4.9.0.0 | ||||
NFData a => NFData1 (Either a) | Since: deepseq-1.4.3.0 | ||||
Defined in Control.DeepSeq | |||||
e ~ SomeException => MonadCatch (Either e) | Since: exceptions-0.8.3 | ||||
Defined in Control.Monad.Catch | |||||
e ~ SomeException => MonadMask (Either e) | Since: exceptions-0.8.3 | ||||
Defined in Control.Monad.Catch Methods mask :: HasCallStack => ((forall a. Either e a -> Either e a) -> Either e b) -> Either e b Source # uninterruptibleMask :: HasCallStack => ((forall a. Either e a -> Either e a) -> Either e b) -> Either e b Source # generalBracket :: HasCallStack => Either e a -> (a -> ExitCase b -> Either e c) -> (a -> Either e b) -> Either e (b, c) Source # | |||||
e ~ SomeException => MonadThrow (Either e) | |||||
Defined in Control.Monad.Catch | |||||
Applicative (Either e) | |||||
Functor (Either a) | |||||
Monad (Either e) | |||||
MonadFix (Either e) | |||||
Defined in GHC.Internal.Control.Monad.Fix | |||||
Foldable (Either a) | |||||
Defined in GHC.Internal.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] # 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 # | |||||
Traversable (Either a) | |||||
Defined in GHC.Internal.Data.Traversable | |||||
(Binary a, Binary b) => Binary (Either a b) | |||||
(NFData a, NFData b) => NFData (Either a b) | |||||
Defined in Control.DeepSeq | |||||
(Binary a, Binary b) => Binary (Either a b) Source # | |||||
(Outputable a, Outputable b) => Outputable (Either a b) Source # | |||||
Semigroup (Either a b) | |||||
(Data a, Data b) => Data (Either a b) | |||||
Defined in GHC.Internal.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) # | |||||
Generic (Either a b) | |||||
Defined in GHC.Internal.Generics Associated Types
| |||||
(Read a, Read b) => Read (Either a b) | |||||
(Show a, Show b) => Show (Either a b) | |||||
(Eq a, Eq b) => Eq (Either a b) | |||||
(Ord a, Ord b) => Ord (Either a b) | |||||
Defined in GHC.Internal.Data.Either | |||||
type Rep1 (Either a :: Type -> Type) | |||||
Defined in GHC.Internal.Generics type Rep1 (Either a :: Type -> Type) = D1 ('MetaData "Either" "GHC.Internal.Data.Either" "ghc-internal" '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 Rep (Either a b) | |||||
Defined in GHC.Internal.Generics type Rep (Either a b) = D1 ('MetaData "Either" "GHC.Internal.Data.Either" "ghc-internal" '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))) |
error :: HasCallStack => [Char] -> a #
errorWithoutStackTrace :: [Char] -> a #
undefined :: HasCallStack => a #
last :: HasCallStack => [a] -> a #
init :: HasCallStack => [a] -> [a] #
(!!) :: HasCallStack => [a] -> Int -> a #
showString :: String -> ShowS #
(^^) :: (Fractional a, Integral b) => a -> b -> a #
type IOError = IOException #
getContents :: IO String #
appendFile :: FilePath -> String -> IO () #
class Functor f => Applicative (f :: Type -> Type) where #
Instances
Applicative Complex | Since: base-4.9.0.0 |
Applicative First | Since: base-4.9.0.0 |
Applicative Last | Since: base-4.9.0.0 |
Applicative Max | Since: base-4.9.0.0 |
Applicative Min | Since: base-4.9.0.0 |
Applicative Get | |
Applicative PutM | |
Applicative Put | |
Applicative Seq | Since: containers-0.5.4 |
Applicative Tree | |
Applicative PD Source # | |
Applicative NatM Source # | |
Applicative LlvmM Source # | |
Applicative CoreM Source # | |
Applicative SimplM Source # | |
Applicative UnifyResultM Source # | |
Defined in GHC.Core.Unify Methods pure :: a -> UnifyResultM a # (<*>) :: UnifyResultM (a -> b) -> UnifyResultM a -> UnifyResultM b # liftA2 :: (a -> b -> c) -> UnifyResultM a -> UnifyResultM b -> UnifyResultM c # (*>) :: UnifyResultM a -> UnifyResultM b -> UnifyResultM b # (<*) :: UnifyResultM a -> UnifyResultM b -> UnifyResultM a # | |
Applicative NullCollapseViz Source # | |
Defined in GHC.Data.Graph.Collapse Methods pure :: a -> NullCollapseViz a # (<*>) :: NullCollapseViz (a -> b) -> NullCollapseViz a -> NullCollapseViz b # liftA2 :: (a -> b -> c) -> NullCollapseViz a -> NullCollapseViz b -> NullCollapseViz c # (*>) :: NullCollapseViz a -> NullCollapseViz b -> NullCollapseViz b # (<*) :: NullCollapseViz a -> NullCollapseViz b -> NullCollapseViz a # | |
Applicative Infinite Source # | |
Applicative Pair Source # | |
Applicative Maybe Source # | |
Applicative Hsc Source # | |
Applicative Ghc Source # | |
Applicative HookedUse Source # | |
Defined in GHC.Driver.Pipeline.Execute | |
Applicative MatchResult Source # | Product is an "or" on fallibility---the combined match result is infallible only if the left and right argument match results both were. This is useful for combining a bunch of alternatives together and then
getting the overall fallibility of the entire group. See |
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 P Source # | |
Applicative PV Source # | |
Applicative CpsRn Source # | |
Applicative LiftM Source # | |
Applicative CmmParse Source # | |
Applicative FCode Source # | |
Applicative SolverStage Source # | |
Defined in GHC.Tc.Solver.Monad Methods pure :: a -> SolverStage a # (<*>) :: SolverStage (a -> b) -> SolverStage a -> SolverStage b # liftA2 :: (a -> b -> c) -> SolverStage a -> SolverStage b -> SolverStage c # (*>) :: SolverStage a -> SolverStage b -> SolverStage b # (<*) :: SolverStage a -> SolverStage b -> SolverStage a # | |
Applicative TcS Source # | |
Applicative TcPluginM Source # | |
Applicative ZonkM Source # | |
Applicative UniqSM Source # | |
Applicative NonEmpty | |
Applicative STM | |
Applicative Identity | |
Applicative First | |
Applicative Last | |
Applicative Down | |
Applicative Dual | |
Applicative Product | |
Applicative Sum | |
Applicative ZipList | |
Applicative Par1 | |
Applicative P | |
Applicative ReadP | |
Applicative ReadPrec | |
Defined in GHC.Internal.Text.ParserCombinators.ReadPrec | |
Applicative IO | |
Applicative GHCiQ | |
Applicative PprM | |
Applicative Q | |
Applicative Maybe | |
Applicative Solo | |
Applicative [] | |
Monad m => Applicative (WrappedMonad m) | Since: base-2.1 |
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 # | |
Applicative (SetM s) | |
Monad m => Applicative (CatchT m) | |
Applicative (RegM freeRegs) Source # | |
Defined in GHC.CmmToAsm.Reg.Linear.State Methods pure :: a -> RegM freeRegs a # (<*>) :: RegM freeRegs (a -> b) -> RegM freeRegs a -> RegM freeRegs b # liftA2 :: (a -> b -> c) -> RegM freeRegs a -> RegM freeRegs b -> RegM freeRegs c # (*>) :: RegM freeRegs a -> RegM freeRegs b -> RegM freeRegs b # (<*) :: RegM freeRegs a -> RegM freeRegs b -> RegM freeRegs a # | |
Applicative (WasmCodeGenM w) Source # | |
Defined in GHC.CmmToAsm.Wasm.Types Methods pure :: a -> WasmCodeGenM w a # (<*>) :: WasmCodeGenM w (a -> b) -> WasmCodeGenM w a -> WasmCodeGenM w b # liftA2 :: (a -> b -> c) -> WasmCodeGenM w a -> WasmCodeGenM w b -> WasmCodeGenM w c # (*>) :: WasmCodeGenM w a -> WasmCodeGenM w b -> WasmCodeGenM w b # (<*) :: WasmCodeGenM w a -> WasmCodeGenM w b -> WasmCodeGenM w a # | |
Applicative (IOEnv m) Source # | |
Applicative (MaybeErr err) Source # | |
Defined in GHC.Data.Maybe | |
Monad m => Applicative (EwM m) Source # | |
Applicative m => Applicative (GhcT m) Source # | |
Applicative (CmdLineP s) Source # | |
Defined in GHC.Driver.Session | |
Applicative (PuResult a) Source # | |
Defined in GHC.Tc.Utils.Unify | |
Applicative (ZonkBndrT m) Source # | |
Defined in GHC.Tc.Zonk.Env | |
Applicative m => Applicative (ZonkT m) Source # | |
Applicative (Codensity f) Source # | |
Defined in GHC.Utils.Monad.Codensity | |
Applicative (State s) Source # | |
Arrow a => Applicative (ArrowMonad a) | |
Defined in GHC.Internal.Control.Arrow Methods pure :: a0 -> ArrowMonad a a0 # (<*>) :: ArrowMonad a (a0 -> b) -> ArrowMonad a a0 -> ArrowMonad a b # liftA2 :: (a0 -> b -> c) -> ArrowMonad a a0 -> ArrowMonad a b -> ArrowMonad a c # (*>) :: ArrowMonad a a0 -> ArrowMonad a b -> ArrowMonad a b # (<*) :: ArrowMonad a a0 -> ArrowMonad a b -> ArrowMonad a a0 # | |
Applicative (Either e) | |
Applicative (Proxy :: Type -> Type) | |
Applicative (U1 :: Type -> Type) | |
Applicative (ST s) | |
Applicative f => Applicative (Lift f) | A combination is |
(Functor m, Monad m) => Applicative (MaybeT m) | |
Monoid a => Applicative ((,) a) | |
Arrow a => Applicative (WrappedArrow a b) | Since: base-2.1 |
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 f, Monad f) => Applicative (WhenMissing f x) | Equivalent to Since: containers-0.5.9 |
Defined in Data.IntMap.Internal Methods pure :: a -> WhenMissing f x a # (<*>) :: WhenMissing f x (a -> b) -> WhenMissing f x a -> WhenMissing f x b # liftA2 :: (a -> b -> c) -> WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x c # (*>) :: WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x b # (<*) :: WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x a # | |
Applicative (Stream m a) Source # | |
Defined in GHC.Data.Stream | |
Monad m => Applicative (StreamS m a) Source # | |
Defined in GHC.Data.Stream | |
(Applicative f, Monad f) => Applicative (WhenMissing f x) Source # | Equivalent to Since: ghc-0.5.9 |
Defined in GHC.Data.Word64Map.Internal Methods pure :: a -> WhenMissing f x a # (<*>) :: WhenMissing f x (a -> b) -> WhenMissing f x a -> WhenMissing f x b # liftA2 :: (a -> b -> c) -> WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x c # (*>) :: WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x b # (<*) :: WhenMissing f x a -> WhenMissing f x b -> WhenMissing f x a # | |
Applicative m => Applicative (Kleisli m a) | |
Defined in GHC.Internal.Control.Arrow | |
Monoid m => Applicative (Const m :: Type -> Type) | |
Applicative f => Applicative (Ap f) | |
Applicative f => Applicative (Alt f) | |
(Generic1 f, Applicative (Rep1 f)) => Applicative (Generically1 f) | |
Defined in GHC.Internal.Generics Methods pure :: a -> Generically1 f a # (<*>) :: Generically1 f (a -> b) -> Generically1 f a -> Generically1 f b # liftA2 :: (a -> b -> c) -> Generically1 f a -> Generically1 f b -> Generically1 f c # (*>) :: Generically1 f a -> Generically1 f b -> Generically1 f b # (<*) :: Generically1 f a -> Generically1 f b -> Generically1 f a # | |
Applicative f => Applicative (Rec1 f) | |
Applicative f => Applicative (Backwards f) | Apply |
Defined in Control.Applicative.Backwards | |
(Monoid w, Functor m, Monad m) => Applicative (AccumT w m) | |
Defined in Control.Monad.Trans.Accum | |
(Functor m, Monad m) => Applicative (ExceptT e m) | |
Defined in Control.Monad.Trans.Except | |
Applicative m => Applicative (IdentityT m) | |
Defined in Control.Monad.Trans.Identity | |
Applicative m => Applicative (ReaderT r m) | |
Defined in Control.Monad.Trans.Reader | |
(Functor m, Monad m) => Applicative (SelectT r m) | |
Defined in Control.Monad.Trans.Select | |
(Functor m, Monad m) => Applicative (StateT s m) | |
Defined in Control.Monad.Trans.State.Lazy | |
(Functor m, Monad m) => Applicative (StateT s m) | |
Defined in Control.Monad.Trans.State.Strict | |
(Functor m, Monad m) => Applicative (WriterT w m) | |
Defined in Control.Monad.Trans.Writer.CPS | |
(Monoid w, Applicative m) => Applicative (WriterT w m) | |
Defined in Control.Monad.Trans.Writer.Lazy | |
(Monoid w, Applicative m) => Applicative (WriterT w m) | |
Defined in Control.Monad.Trans.Writer.Strict | |
Monoid a => Applicative (Constant a :: Type -> Type) | |
Defined in Data.Functor.Constant | |
Applicative f => Applicative (Reverse f) | Derived instance. |
(Monoid a, Monoid b) => Applicative ((,,) a b) | |
(Applicative f, Applicative g) => Applicative (Product f g) | Since: base-4.9.0.0 |
Defined in Data.Functor.Product | |
(Monad f, Applicative f) => Applicative (WhenMatched f x y) | Equivalent to Since: containers-0.5.9 |
Defined in Data.IntMap.Internal Methods pure :: a -> WhenMatched f x y a # (<*>) :: WhenMatched f x y (a -> b) -> WhenMatched f x y a -> WhenMatched f x y b # liftA2 :: (a -> b -> c) -> WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y c # (*>) :: WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y b # (<*) :: WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y a # | |
(Applicative f, Monad f) => Applicative (WhenMissing f k x) | Equivalent to Since: containers-0.5.9 |
Defined in Data.Map.Internal Methods pure :: a -> WhenMissing f k x a # (<*>) :: WhenMissing f k x (a -> b) -> WhenMissing f k x a -> WhenMissing f k x b # liftA2 :: (a -> b -> c) -> WhenMissing f k x a -> WhenMissing f k x b -> WhenMissing f k x c # (*>) :: WhenMissing f k x a -> WhenMissing f k x b -> WhenMissing f k x b # (<*) :: WhenMissing f k x a -> WhenMissing f k x b -> WhenMissing f k x a # | |
(Monad f, Applicative f) => Applicative (WhenMatched f x y) Source # | Equivalent to Since: ghc-0.5.9 |
Defined in GHC.Data.Word64Map.Internal Methods pure :: a -> WhenMatched f x y a # (<*>) :: WhenMatched f x y (a -> b) -> WhenMatched f x y a -> WhenMatched f x y b # liftA2 :: (a -> b -> c) -> WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y c # (*>) :: WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y b # (<*) :: WhenMatched f x y a -> WhenMatched f x y b -> WhenMatched f x y a # | |
(Applicative f, Applicative g) => Applicative (f :*: g) | |
Monoid c => Applicative (K1 i c :: Type -> Type) | |
Applicative (ContT r m) | |
Defined in Control.Monad.Trans.Cont | |
(Monoid a, Monoid b, Monoid c) => Applicative ((,,,) a b c) | |
Defined in GHC.Internal.Base | |
Applicative ((->) r) | |
(Applicative f, Applicative g) => Applicative (Compose f g) | Since: base-4.9.0.0 |
Defined in Data.Functor.Compose | |
(Monad f, Applicative f) => Applicative (WhenMatched f k x y) | Equivalent to Since: containers-0.5.9 |
Defined in Data.Map.Internal Methods pure :: a -> WhenMatched f k x y a # (<*>) :: WhenMatched f k x y (a -> b) -> WhenMatched f k x y a -> WhenMatched f k x y b # liftA2 :: (a -> b -> c) -> WhenMatched f k x y a -> WhenMatched f k x y b -> WhenMatched f k x y c # (*>) :: WhenMatched f k x y a -> WhenMatched f k x y b -> WhenMatched f k x y b # (<*) :: WhenMatched f k x y a -> WhenMatched f k x y b -> WhenMatched f k x y a # | |
(Applicative f, Applicative g) => Applicative (f :.: g) | |
Applicative f => Applicative (M1 i c f) | |
(Functor m, Monad m) => Applicative (RWST r w s m) | |
Defined in Control.Monad.Trans.RWS.CPS | |
(Monoid w, Functor m, Monad m) => Applicative (RWST r w s m) | |
Defined in Control.Monad.Trans.RWS.Lazy | |
(Monoid w, Functor m, Monad m) => Applicative (RWST r w s m) | |
Defined in Control.Monad.Trans.RWS.Strict |
class Bits b => FiniteBits b where #
Minimal complete definition
Instances
FiniteBits RegBitmap Source # | |
Defined in GHC.ByteCode.Types Methods finiteBitSize :: RegBitmap -> Int # countLeadingZeros :: RegBitmap -> Int # countTrailingZeros :: RegBitmap -> Int # | |
FiniteBits CBool | |
Defined in GHC.Internal.Foreign.C.Types Methods finiteBitSize :: CBool -> Int # countLeadingZeros :: CBool -> Int # countTrailingZeros :: CBool -> Int # | |
FiniteBits CChar | |
Defined in GHC.Internal.Foreign.C.Types Methods finiteBitSize :: CChar -> Int # countLeadingZeros :: CChar -> Int # countTrailingZeros :: CChar -> Int # | |
FiniteBits CInt | |
Defined in GHC.Internal.Foreign.C.Types Methods finiteBitSize :: CInt -> Int # countLeadingZeros :: CInt -> Int # countTrailingZeros :: CInt -> Int # | |
FiniteBits CIntMax | |
Defined in GHC.Internal.Foreign.C.Types Methods finiteBitSize :: CIntMax -> Int # countLeadingZeros :: CIntMax -> Int # countTrailingZeros :: CIntMax -> Int # | |
FiniteBits CIntPtr | |
Defined in GHC.Internal.Foreign.C.Types Methods finiteBitSize :: CIntPtr -> Int # countLeadingZeros :: CIntPtr -> Int # countTrailingZeros :: CIntPtr -> Int # | |
FiniteBits CLLong | |
Defined in GHC.Internal.Foreign.C.Types Methods finiteBitSize :: CLLong -> Int # countLeadingZeros :: CLLong -> Int # countTrailingZeros :: CLLong -> Int # | |
FiniteBits CLong | |
Defined in GHC.Internal.Foreign.C.Types Methods finiteBitSize :: CLong -> Int # countLeadingZeros :: CLong -> Int # countTrailingZeros :: CLong -> Int # | |
FiniteBits CPtrdiff | |
Defined in GHC.Internal.Foreign.C.Types Methods finiteBitSize :: CPtrdiff -> Int # countLeadingZeros :: CPtrdiff -> Int # countTrailingZeros :: CPtrdiff -> Int # | |
FiniteBits CSChar | |
Defined in GHC.Internal.Foreign.C.Types Methods finiteBitSize :: CSChar -> Int # countLeadingZeros :: CSChar -> Int # countTrailingZeros :: CSChar -> Int # | |
FiniteBits CShort | |
Defined in GHC.Internal.Foreign.C.Types Methods finiteBitSize :: CShort -> Int # countLeadingZeros :: CShort -> Int # countTrailingZeros :: CShort -> Int # | |
FiniteBits CSigAtomic | |
Defined in GHC.Internal.Foreign.C.Types Methods finiteBitSize :: CSigAtomic -> Int # countLeadingZeros :: CSigAtomic -> Int # countTrailingZeros :: CSigAtomic -> Int # | |
FiniteBits CSize | |
Defined in GHC.Internal.Foreign.C.Types Methods finiteBitSize :: CSize -> Int # countLeadingZeros :: CSize -> Int # countTrailingZeros :: CSize -> Int # | |
FiniteBits CUChar | |
Defined in GHC.Internal.Foreign.C.Types Methods finiteBitSize :: CUChar -> Int # countLeadingZeros :: CUChar -> Int # countTrailingZeros :: CUChar -> Int # | |
FiniteBits CUInt | |
Defined in GHC.Internal.Foreign.C.Types Methods finiteBitSize :: CUInt -> Int # countLeadingZeros :: CUInt -> Int # countTrailingZeros :: CUInt -> Int # | |
FiniteBits CUIntMax | |
Defined in GHC.Internal.Foreign.C.Types Methods finiteBitSize :: CUIntMax -> Int # countLeadingZeros :: CUIntMax -> Int # countTrailingZeros :: CUIntMax -> Int # | |
FiniteBits CUIntPtr | |
Defined in GHC.Internal.Foreign.C.Types Methods finiteBitSize :: CUIntPtr -> Int # countLeadingZeros :: CUIntPtr -> Int # countTrailingZeros :: CUIntPtr -> Int # | |
FiniteBits CULLong | |
Defined in GHC.Internal.Foreign.C.Types Methods finiteBitSize :: CULLong -> Int # countLeadingZeros :: CULLong -> Int # countTrailingZeros :: CULLong -> Int # | |
FiniteBits CULong | |
Defined in GHC.Internal.Foreign.C.Types Methods finiteBitSize :: CULong -> Int # countLeadingZeros :: CULong -> Int # countTrailingZeros :: CULong -> Int # | |
FiniteBits CUShort | |
Defined in GHC.Internal.Foreign.C.Types Methods finiteBitSize :: CUShort -> Int # countLeadingZeros :: CUShort -> Int # countTrailingZeros :: CUShort -> Int # | |
FiniteBits CWchar | |
Defined in GHC.Internal.Foreign.C.Types Methods finiteBitSize :: CWchar -> Int # countLeadingZeros :: CWchar -> Int # countTrailingZeros :: CWchar -> Int # | |
FiniteBits Int16 | |
Defined in GHC.Internal.Int Methods finiteBitSize :: Int16 -> Int # countLeadingZeros :: Int16 -> Int # countTrailingZeros :: Int16 -> Int # | |
FiniteBits Int32 | |
Defined in GHC.Internal.Int Methods finiteBitSize :: Int32 -> Int # countLeadingZeros :: Int32 -> Int # countTrailingZeros :: Int32 -> Int # | |
FiniteBits Int64 | |
Defined in GHC.Internal.Int Methods finiteBitSize :: Int64 -> Int # countLeadingZeros :: Int64 -> Int # countTrailingZeros :: Int64 -> Int # | |
FiniteBits Int8 | |
Defined in GHC.Internal.Int Methods finiteBitSize :: Int8 -> Int # countLeadingZeros :: Int8 -> Int # countTrailingZeros :: Int8 -> Int # | |
FiniteBits CBlkCnt | |
Defined in GHC.Internal.System.Posix.Types Methods finiteBitSize :: CBlkCnt -> Int # countLeadingZeros :: CBlkCnt -> Int # countTrailingZeros :: CBlkCnt -> Int # | |
FiniteBits CBlkSize | |
Defined in GHC.Internal.System.Posix.Types Methods finiteBitSize :: CBlkSize -> Int # countLeadingZeros :: CBlkSize -> Int # countTrailingZeros :: CBlkSize -> Int # | |
FiniteBits CClockId | |
Defined in GHC.Internal.System.Posix.Types Methods finiteBitSize :: CClockId -> Int # countLeadingZeros :: CClockId -> Int # countTrailingZeros :: CClockId -> Int # | |
FiniteBits CDev | |
Defined in GHC.Internal.System.Posix.Types Methods finiteBitSize :: CDev -> Int # countLeadingZeros :: CDev -> Int # countTrailingZeros :: CDev -> Int # | |
FiniteBits CFsBlkCnt | |
Defined in GHC.Internal.System.Posix.Types Methods finiteBitSize :: CFsBlkCnt -> Int # countLeadingZeros :: CFsBlkCnt -> Int # countTrailingZeros :: CFsBlkCnt -> Int # | |
FiniteBits CFsFilCnt | |
Defined in GHC.Internal.System.Posix.Types Methods finiteBitSize :: CFsFilCnt -> Int # countLeadingZeros :: CFsFilCnt -> Int # countTrailingZeros :: CFsFilCnt -> Int # | |
FiniteBits CGid | |
Defined in GHC.Internal.System.Posix.Types Methods finiteBitSize :: CGid -> Int # countLeadingZeros :: CGid -> Int # countTrailingZeros :: CGid -> Int # | |
FiniteBits CId | |
Defined in GHC.Internal.System.Posix.Types Methods finiteBitSize :: CId -> Int # countLeadingZeros :: CId -> Int # countTrailingZeros :: CId -> Int # | |
FiniteBits CIno | |
Defined in GHC.Internal.System.Posix.Types Methods finiteBitSize :: CIno -> Int # countLeadingZeros :: CIno -> Int # countTrailingZeros :: CIno -> Int # | |
FiniteBits CKey | |
Defined in GHC.Internal.System.Posix.Types Methods finiteBitSize :: CKey -> Int # countLeadingZeros :: CKey -> Int # countTrailingZeros :: CKey -> Int # | |
FiniteBits CMode | |
Defined in GHC.Internal.System.Posix.Types Methods finiteBitSize :: CMode -> Int # countLeadingZeros :: CMode -> Int # countTrailingZeros :: CMode -> Int # | |
FiniteBits CNfds | |
Defined in GHC.Internal.System.Posix.Types Methods finiteBitSize :: CNfds -> Int # countLeadingZeros :: CNfds -> Int # countTrailingZeros :: CNfds -> Int # | |
FiniteBits CNlink | |
Defined in GHC.Internal.System.Posix.Types Methods finiteBitSize :: CNlink -> Int # countLeadingZeros :: CNlink -> Int # countTrailingZeros :: CNlink -> Int # | |
FiniteBits COff | |
Defined in GHC.Internal.System.Posix.Types Methods finiteBitSize :: COff -> Int # countLeadingZeros :: COff -> Int # countTrailingZeros :: COff -> Int # | |
FiniteBits CPid | |
Defined in GHC.Internal.System.Posix.Types Methods finiteBitSize :: CPid -> Int # countLeadingZeros :: CPid -> Int # countTrailingZeros :: CPid -> Int # | |
FiniteBits CRLim | |
Defined in GHC.Internal.System.Posix.Types Methods finiteBitSize :: CRLim -> Int # countLeadingZeros :: CRLim -> Int # countTrailingZeros :: CRLim -> Int # | |
FiniteBits CSocklen | |
Defined in GHC.Internal.System.Posix.Types Methods finiteBitSize :: CSocklen -> Int # countLeadingZeros :: CSocklen -> Int # countTrailingZeros :: CSocklen -> Int # | |
FiniteBits CSsize | |
Defined in GHC.Internal.System.Posix.Types Methods finiteBitSize :: CSsize -> Int # countLeadingZeros :: CSsize -> Int # countTrailingZeros :: CSsize -> Int # | |
FiniteBits CTcflag | |
Defined in GHC.Internal.System.Posix.Types Methods finiteBitSize :: CTcflag -> Int # countLeadingZeros :: CTcflag -> Int # countTrailingZeros :: CTcflag -> Int # | |
FiniteBits CUid | |
Defined in GHC.Internal.System.Posix.Types Methods finiteBitSize :: CUid -> Int # countLeadingZeros :: CUid -> Int # countTrailingZeros :: CUid -> Int # | |
FiniteBits Fd | |
Defined in GHC.Internal.System.Posix.Types Methods finiteBitSize :: Fd -> Int # countLeadingZeros :: Fd -> Int # countTrailingZeros :: Fd -> Int # | |
FiniteBits Word16 | |
Defined in GHC.Internal.Word Methods finiteBitSize :: Word16 -> Int # countLeadingZeros :: Word16 -> Int # countTrailingZeros :: Word16 -> Int # | |
FiniteBits Word32 | |
Defined in GHC.Internal.Word Methods finiteBitSize :: Word32 -> Int # countLeadingZeros :: Word32 -> Int # countTrailingZeros :: Word32 -> Int # | |
FiniteBits Word64 | |
Defined in GHC.Internal.Word Methods finiteBitSize :: Word64 -> Int # countLeadingZeros :: Word64 -> Int # countTrailingZeros :: Word64 -> Int # | |
FiniteBits Word8 | |
Defined in GHC.Internal.Word Methods finiteBitSize :: Word8 -> Int # countLeadingZeros :: Word8 -> Int # countTrailingZeros :: Word8 -> Int # | |
FiniteBits Bool | |
Defined in GHC.Internal.Bits Methods finiteBitSize :: Bool -> Int # countLeadingZeros :: Bool -> Int # countTrailingZeros :: Bool -> Int # | |
FiniteBits Int | |
Defined in GHC.Internal.Bits Methods finiteBitSize :: Int -> Int # countLeadingZeros :: Int -> Int # countTrailingZeros :: Int -> Int # | |
FiniteBits Word | |
Defined in GHC.Internal.Bits Methods finiteBitSize :: Word -> Int # countLeadingZeros :: Word -> Int # countTrailingZeros :: Word -> Int # | |
FiniteBits a => FiniteBits (And a) | |
Defined in GHC.Internal.Data.Bits Methods finiteBitSize :: And a -> Int # countLeadingZeros :: And a -> Int # countTrailingZeros :: And a -> Int # | |
FiniteBits a => FiniteBits (Iff a) | |
Defined in GHC.Internal.Data.Bits Methods finiteBitSize :: Iff a -> Int # countLeadingZeros :: Iff a -> Int # countTrailingZeros :: Iff a -> Int # | |
FiniteBits a => FiniteBits (Ior a) | |
Defined in GHC.Internal.Data.Bits Methods finiteBitSize :: Ior a -> Int # countLeadingZeros :: Ior a -> Int # countTrailingZeros :: Ior a -> Int # | |
FiniteBits a => FiniteBits (Xor a) | |
Defined in GHC.Internal.Data.Bits Methods finiteBitSize :: Xor a -> Int # countLeadingZeros :: Xor a -> Int # countTrailingZeros :: Xor a -> Int # | |
FiniteBits a => FiniteBits (Identity a) | |
Defined in GHC.Internal.Data.Functor.Identity Methods finiteBitSize :: Identity a -> Int # countLeadingZeros :: Identity a -> Int # countTrailingZeros :: Identity a -> Int # | |
FiniteBits a => FiniteBits (Down a) | |
Defined in GHC.Internal.Data.Ord Methods finiteBitSize :: Down a -> Int # countLeadingZeros :: Down a -> Int # countTrailingZeros :: Down a -> Int # | |
FiniteBits a => FiniteBits (Const a b) | |
Defined in GHC.Internal.Data.Functor.Const Methods finiteBitSize :: Const a b -> Int # countLeadingZeros :: Const a b -> Int # countTrailingZeros :: Const a b -> Int # |
Minimal complete definition
(.&.), (.|.), xor, complement, (shift | shiftL, shiftR), (rotate | rotateL, rotateR), bitSize, bitSizeMaybe, isSigned, testBit, bit, popCount
Methods
complement :: a -> a #
complementBit :: a -> Int -> a #
bitSizeMaybe :: a -> Maybe Int #
unsafeShiftL :: a -> Int -> a #
unsafeShiftR :: a -> Int -> a #
Instances
Bits RegBitmap Source # | |
Defined in GHC.ByteCode.Types Methods (.&.) :: RegBitmap -> RegBitmap -> RegBitmap # (.|.) :: RegBitmap -> RegBitmap -> RegBitmap # xor :: RegBitmap -> RegBitmap -> RegBitmap # complement :: RegBitmap -> RegBitmap # shift :: RegBitmap -> Int -> RegBitmap # rotate :: RegBitmap -> Int -> RegBitmap # setBit :: RegBitmap -> Int -> RegBitmap # clearBit :: RegBitmap -> Int -> RegBitmap # complementBit :: RegBitmap -> Int -> RegBitmap # testBit :: RegBitmap -> Int -> Bool # bitSizeMaybe :: RegBitmap -> Maybe Int # isSigned :: RegBitmap -> Bool # shiftL :: RegBitmap -> Int -> RegBitmap # unsafeShiftL :: RegBitmap -> Int -> RegBitmap # shiftR :: RegBitmap -> Int -> RegBitmap # unsafeShiftR :: RegBitmap -> Int -> RegBitmap # rotateL :: RegBitmap -> Int -> RegBitmap # | |
Bits StgWord Source # | |
Defined in GHC.Runtime.Heap.Layout Methods (.&.) :: StgWord -> StgWord -> StgWord # (.|.) :: StgWord -> StgWord -> StgWord # xor :: StgWord -> StgWord -> StgWord # complement :: StgWord -> StgWord # shift :: StgWord -> Int -> StgWord # rotate :: StgWord -> Int -> StgWord # setBit :: StgWord -> Int -> StgWord # clearBit :: StgWord -> Int -> StgWord # complementBit :: StgWord -> Int -> StgWord # testBit :: StgWord -> Int -> Bool # bitSizeMaybe :: StgWord -> Maybe Int # shiftL :: StgWord -> Int -> StgWord # unsafeShiftL :: StgWord -> Int -> StgWord # shiftR :: StgWord -> Int -> StgWord # unsafeShiftR :: StgWord -> Int -> StgWord # rotateL :: StgWord -> Int -> StgWord # | |
Bits CBool | |
Defined in GHC.Internal.Foreign.C.Types Methods (.&.) :: CBool -> CBool -> CBool # (.|.) :: CBool -> CBool -> CBool # xor :: CBool -> CBool -> CBool # complement :: CBool -> CBool # shift :: CBool -> Int -> CBool # rotate :: CBool -> Int -> CBool # setBit :: CBool -> Int -> CBool # clearBit :: CBool -> Int -> CBool # complementBit :: CBool -> Int -> CBool # testBit :: CBool -> Int -> Bool # bitSizeMaybe :: CBool -> Maybe Int # shiftL :: CBool -> Int -> CBool # unsafeShiftL :: CBool -> Int -> CBool # shiftR :: CBool -> Int -> CBool # unsafeShiftR :: CBool -> Int -> CBool # rotateL :: CBool -> Int -> CBool # | |
Bits CChar | |
Defined in GHC.Internal.Foreign.C.Types Methods (.&.) :: CChar -> CChar -> CChar # (.|.) :: CChar -> CChar -> CChar # xor :: CChar -> CChar -> CChar # complement :: CChar -> CChar # shift :: CChar -> Int -> CChar # rotate :: CChar -> Int -> CChar # setBit :: CChar -> Int -> CChar # clearBit :: CChar -> Int -> CChar # complementBit :: CChar -> Int -> CChar # testBit :: CChar -> Int -> Bool # bitSizeMaybe :: CChar -> Maybe Int # shiftL :: CChar -> Int -> CChar # unsafeShiftL :: CChar -> Int -> CChar # shiftR :: CChar -> Int -> CChar # unsafeShiftR :: CChar -> Int -> CChar # rotateL :: CChar -> Int -> CChar # | |
Bits CInt | |
Defined in GHC.Internal.Foreign.C.Types Methods (.&.) :: CInt -> CInt -> CInt # (.|.) :: CInt -> CInt -> CInt # complement :: CInt -> CInt # shift :: CInt -> Int -> CInt # rotate :: CInt -> Int -> CInt # setBit :: CInt -> Int -> CInt # clearBit :: CInt -> Int -> CInt # complementBit :: CInt -> Int -> CInt # testBit :: CInt -> Int -> Bool # bitSizeMaybe :: CInt -> Maybe Int # shiftL :: CInt -> Int -> CInt # unsafeShiftL :: CInt -> Int -> CInt # shiftR :: CInt -> Int -> CInt # unsafeShiftR :: CInt -> Int -> CInt # rotateL :: CInt -> Int -> CInt # | |
Bits CIntMax | |
Defined in GHC.Internal.Foreign.C.Types Methods (.&.) :: CIntMax -> CIntMax -> CIntMax # (.|.) :: CIntMax -> CIntMax -> CIntMax # xor :: CIntMax -> CIntMax -> CIntMax # complement :: CIntMax -> CIntMax # shift :: CIntMax -> Int -> CIntMax # rotate :: CIntMax -> Int -> CIntMax # setBit :: CIntMax -> Int -> CIntMax # clearBit :: CIntMax -> Int -> CIntMax # complementBit :: CIntMax -> Int -> CIntMax # testBit :: CIntMax -> Int -> Bool # bitSizeMaybe :: CIntMax -> Maybe Int # shiftL :: CIntMax -> Int -> CIntMax # unsafeShiftL :: CIntMax -> Int -> CIntMax # shiftR :: CIntMax -> Int -> CIntMax # unsafeShiftR :: CIntMax -> Int -> CIntMax # rotateL :: CIntMax -> Int -> CIntMax # | |
Bits CIntPtr | |
Defined in GHC.Internal.Foreign.C.Types Methods (.&.) :: CIntPtr -> CIntPtr -> CIntPtr # (.|.) :: CIntPtr -> CIntPtr -> CIntPtr # xor :: CIntPtr -> CIntPtr -> CIntPtr # complement :: CIntPtr -> CIntPtr # shift :: CIntPtr -> Int -> CIntPtr # rotate :: CIntPtr -> Int -> CIntPtr # setBit :: CIntPtr -> Int -> CIntPtr # clearBit :: CIntPtr -> Int -> CIntPtr # complementBit :: CIntPtr -> Int -> CIntPtr # testBit :: CIntPtr -> Int -> Bool # bitSizeMaybe :: CIntPtr -> Maybe Int # shiftL :: CIntPtr -> Int -> CIntPtr # unsafeShiftL :: CIntPtr -> Int -> CIntPtr # shiftR :: CIntPtr -> Int -> CIntPtr # unsafeShiftR :: CIntPtr -> Int -> CIntPtr # rotateL :: CIntPtr -> Int -> CIntPtr # | |
Bits CLLong | |
Defined in GHC.Internal.Foreign.C.Types Methods (.&.) :: CLLong -> CLLong -> CLLong # (.|.) :: CLLong -> CLLong -> CLLong # xor :: CLLong -> CLLong -> CLLong # complement :: CLLong -> CLLong # shift :: CLLong -> Int -> CLLong # rotate :: CLLong -> Int -> CLLong # setBit :: CLLong -> Int -> CLLong # clearBit :: CLLong -> Int -> CLLong # complementBit :: CLLong -> Int -> CLLong # testBit :: CLLong -> Int -> Bool # bitSizeMaybe :: CLLong -> Maybe Int # shiftL :: CLLong -> Int -> CLLong # unsafeShiftL :: CLLong -> Int -> CLLong # shiftR :: CLLong -> Int -> CLLong # unsafeShiftR :: CLLong -> Int -> CLLong # rotateL :: CLLong -> Int -> CLLong # | |
Bits CLong | |
Defined in GHC.Internal.Foreign.C.Types Methods (.&.) :: CLong -> CLong -> CLong # (.|.) :: CLong -> CLong -> CLong # xor :: CLong -> CLong -> CLong # complement :: CLong -> CLong # shift :: CLong -> Int -> CLong # rotate :: CLong -> Int -> CLong # setBit :: CLong -> Int -> CLong # clearBit :: CLong -> Int -> CLong # complementBit :: CLong -> Int -> CLong # testBit :: CLong -> Int -> Bool # bitSizeMaybe :: CLong -> Maybe Int # shiftL :: CLong -> Int -> CLong # unsafeShiftL :: CLong -> Int -> CLong # shiftR :: CLong -> Int -> CLong # unsafeShiftR :: CLong -> Int -> CLong # rotateL :: CLong -> Int -> CLong # | |
Bits CPtrdiff | |
Defined in GHC.Internal.Foreign.C.Types Methods (.&.) :: CPtrdiff -> CPtrdiff -> CPtrdiff # (.|.) :: CPtrdiff -> CPtrdiff -> CPtrdiff # xor :: CPtrdiff -> CPtrdiff -> CPtrdiff # complement :: CPtrdiff -> CPtrdiff # shift :: CPtrdiff -> Int -> CPtrdiff # rotate :: CPtrdiff -> Int -> CPtrdiff # setBit :: CPtrdiff -> Int -> CPtrdiff # clearBit :: CPtrdiff -> Int -> CPtrdiff # complementBit :: CPtrdiff -> Int -> CPtrdiff # testBit :: CPtrdiff -> Int -> Bool # bitSizeMaybe :: CPtrdiff -> Maybe Int # isSigned :: CPtrdiff -> Bool # shiftL :: CPtrdiff -> Int -> CPtrdiff # unsafeShiftL :: CPtrdiff -> Int -> CPtrdiff # shiftR :: CPtrdiff -> Int -> CPtrdiff # unsafeShiftR :: CPtrdiff -> Int -> CPtrdiff # rotateL :: CPtrdiff -> Int -> CPtrdiff # | |
Bits CSChar | |
Defined in GHC.Internal.Foreign.C.Types Methods (.&.) :: CSChar -> CSChar -> CSChar # (.|.) :: CSChar -> CSChar -> CSChar # xor :: CSChar -> CSChar -> CSChar # complement :: CSChar -> CSChar # shift :: CSChar -> Int -> CSChar # rotate :: CSChar -> Int -> CSChar # setBit :: CSChar -> Int -> CSChar # clearBit :: CSChar -> Int -> CSChar # complementBit :: CSChar -> Int -> CSChar # testBit :: CSChar -> Int -> Bool # bitSizeMaybe :: CSChar -> Maybe Int # shiftL :: CSChar -> Int -> CSChar # unsafeShiftL :: CSChar -> Int -> CSChar # shiftR :: CSChar -> Int -> CSChar # unsafeShiftR :: CSChar -> Int -> CSChar # rotateL :: CSChar -> Int -> CSChar # | |
Bits CShort | |
Defined in GHC.Internal.Foreign.C.Types Methods (.&.) :: CShort -> CShort -> CShort # (.|.) :: CShort -> CShort -> CShort # xor :: CShort -> CShort -> CShort # complement :: CShort -> CShort # shift :: CShort -> Int -> CShort # rotate :: CShort -> Int -> CShort # setBit :: CShort -> Int -> CShort # clearBit :: CShort -> Int -> CShort # complementBit :: CShort -> Int -> CShort # testBit :: CShort -> Int -> Bool # bitSizeMaybe :: CShort -> Maybe Int # shiftL :: CShort -> Int -> CShort # unsafeShiftL :: CShort -> Int -> CShort # shiftR :: CShort -> Int -> CShort # unsafeShiftR :: CShort -> Int -> CShort # rotateL :: CShort -> Int -> CShort # | |
Bits CSigAtomic | |
Defined in GHC.Internal.Foreign.C.Types Methods (.&.) :: CSigAtomic -> CSigAtomic -> CSigAtomic # (.|.) :: CSigAtomic -> CSigAtomic -> CSigAtomic # xor :: CSigAtomic -> CSigAtomic -> CSigAtomic # complement :: CSigAtomic -> CSigAtomic # shift :: CSigAtomic -> Int -> CSigAtomic # rotate :: CSigAtomic -> Int -> CSigAtomic # zeroBits :: CSigAtomic # bit :: Int -> CSigAtomic # setBit :: CSigAtomic -> Int -> CSigAtomic # clearBit :: CSigAtomic -> Int -> CSigAtomic # complementBit :: CSigAtomic -> Int -> CSigAtomic # testBit :: CSigAtomic -> Int -> Bool # bitSizeMaybe :: CSigAtomic -> Maybe Int # bitSize :: CSigAtomic -> Int # isSigned :: CSigAtomic -> Bool # shiftL :: CSigAtomic -> Int -> CSigAtomic # unsafeShiftL :: CSigAtomic -> Int -> CSigAtomic # shiftR :: CSigAtomic -> Int -> CSigAtomic # unsafeShiftR :: CSigAtomic -> Int -> CSigAtomic # rotateL :: CSigAtomic -> Int -> CSigAtomic # rotateR :: CSigAtomic -> Int -> CSigAtomic # popCount :: CSigAtomic -> Int # | |
Bits CSize | |
Defined in GHC.Internal.Foreign.C.Types Methods (.&.) :: CSize -> CSize -> CSize # (.|.) :: CSize -> CSize -> CSize # xor :: CSize -> CSize -> CSize # complement :: CSize -> CSize # shift :: CSize -> Int -> CSize # rotate :: CSize -> Int -> CSize # setBit :: CSize -> Int -> CSize # clearBit :: CSize -> Int -> CSize # complementBit :: CSize -> Int -> CSize # testBit :: CSize -> Int -> Bool # bitSizeMaybe :: CSize -> Maybe Int # shiftL :: CSize -> Int -> CSize # unsafeShiftL :: CSize -> Int -> CSize # shiftR :: CSize -> Int -> CSize # unsafeShiftR :: CSize -> Int -> CSize # rotateL :: CSize -> Int -> CSize # | |
Bits CUChar | |
Defined in GHC.Internal.Foreign.C.Types Methods (.&.) :: CUChar -> CUChar -> CUChar # (.|.) :: CUChar -> CUChar -> CUChar # xor :: CUChar -> CUChar -> CUChar # complement :: CUChar -> CUChar # shift :: CUChar -> Int -> CUChar # rotate :: CUChar -> Int -> CUChar # setBit :: CUChar -> Int -> CUChar # clearBit :: CUChar -> Int -> CUChar # complementBit :: CUChar -> Int -> CUChar # testBit :: CUChar -> Int -> Bool # bitSizeMaybe :: CUChar -> Maybe Int # shiftL :: CUChar -> Int -> CUChar # unsafeShiftL :: CUChar -> Int -> CUChar # shiftR :: CUChar -> Int -> CUChar # unsafeShiftR :: CUChar -> Int -> CUChar # rotateL :: CUChar -> Int -> CUChar # | |
Bits CUInt | |
Defined in GHC.Internal.Foreign.C.Types Methods (.&.) :: CUInt -> CUInt -> CUInt # (.|.) :: CUInt -> CUInt -> CUInt # xor :: CUInt -> CUInt -> CUInt # complement :: CUInt -> CUInt # shift :: CUInt -> Int -> CUInt # rotate :: CUInt -> Int -> CUInt # setBit :: CUInt -> Int -> CUInt # clearBit :: CUInt -> Int -> CUInt # complementBit :: CUInt -> Int -> CUInt # testBit :: CUInt -> Int -> Bool # bitSizeMaybe :: CUInt -> Maybe Int # shiftL :: CUInt -> Int -> CUInt # unsafeShiftL :: CUInt -> Int -> CUInt # shiftR :: CUInt -> Int -> CUInt # unsafeShiftR :: CUInt -> Int -> CUInt # rotateL :: CUInt -> Int -> CUInt # | |
Bits CUIntMax | |
Defined in GHC.Internal.Foreign.C.Types Methods (.&.) :: CUIntMax -> CUIntMax -> CUIntMax # (.|.) :: CUIntMax -> CUIntMax -> CUIntMax # xor :: CUIntMax -> CUIntMax -> CUIntMax # complement :: CUIntMax -> CUIntMax # shift :: CUIntMax -> Int -> CUIntMax # rotate :: CUIntMax -> Int -> CUIntMax # setBit :: CUIntMax -> Int -> CUIntMax # clearBit :: CUIntMax -> Int -> CUIntMax # complementBit :: CUIntMax -> Int -> CUIntMax # testBit :: CUIntMax -> Int -> Bool # bitSizeMaybe :: CUIntMax -> Maybe Int # isSigned :: CUIntMax -> Bool # shiftL :: CUIntMax -> Int -> CUIntMax # unsafeShiftL :: CUIntMax -> Int -> CUIntMax # shiftR :: CUIntMax -> Int -> CUIntMax # unsafeShiftR :: CUIntMax -> Int -> CUIntMax # rotateL :: CUIntMax -> Int -> CUIntMax # | |
Bits CUIntPtr | |
Defined in GHC.Internal.Foreign.C.Types Methods (.&.) :: CUIntPtr -> CUIntPtr -> CUIntPtr # (.|.) :: CUIntPtr -> CUIntPtr -> CUIntPtr # xor :: CUIntPtr -> CUIntPtr -> CUIntPtr # complement :: CUIntPtr -> CUIntPtr # shift :: CUIntPtr -> Int -> CUIntPtr # rotate :: CUIntPtr -> Int -> CUIntPtr # setBit :: CUIntPtr -> Int -> CUIntPtr # clearBit :: CUIntPtr -> Int -> CUIntPtr # complementBit :: CUIntPtr -> Int -> CUIntPtr # testBit :: CUIntPtr -> Int -> Bool # bitSizeMaybe :: CUIntPtr -> Maybe Int # isSigned :: CUIntPtr -> Bool # shiftL :: CUIntPtr -> Int -> CUIntPtr # unsafeShiftL :: CUIntPtr -> Int -> CUIntPtr # shiftR :: CUIntPtr -> Int -> CUIntPtr # unsafeShiftR :: CUIntPtr -> Int -> CUIntPtr # rotateL :: CUIntPtr -> Int -> CUIntPtr # | |
Bits CULLong | |
Defined in GHC.Internal.Foreign.C.Types Methods (.&.) :: CULLong -> CULLong -> CULLong # (.|.) :: CULLong -> CULLong -> CULLong # xor :: CULLong -> CULLong -> CULLong # complement :: CULLong -> CULLong # shift :: CULLong -> Int -> CULLong # rotate :: CULLong -> Int -> CULLong # setBit :: CULLong -> Int -> CULLong # clearBit :: CULLong -> Int -> CULLong # complementBit :: CULLong -> Int -> CULLong # testBit :: CULLong -> Int -> Bool # bitSizeMaybe :: CULLong -> Maybe Int # shiftL :: CULLong -> Int -> CULLong # unsafeShiftL :: CULLong -> Int -> CULLong # shiftR :: CULLong -> Int -> CULLong # unsafeShiftR :: CULLong -> Int -> CULLong # rotateL :: CULLong -> Int -> CULLong # | |
Bits CULong | |
Defined in GHC.Internal.Foreign.C.Types Methods (.&.) :: CULong -> CULong -> CULong # (.|.) :: CULong -> CULong -> CULong # xor :: CULong -> CULong -> CULong # complement :: CULong -> CULong # shift :: CULong -> Int -> CULong # rotate :: CULong -> Int -> CULong # setBit :: CULong -> Int -> CULong # clearBit :: CULong -> Int -> CULong # complementBit :: CULong -> Int -> CULong # testBit :: CULong -> Int -> Bool # bitSizeMaybe :: CULong -> Maybe Int # shiftL :: CULong -> Int -> CULong # unsafeShiftL :: CULong -> Int -> CULong # shiftR :: CULong -> Int -> CULong # unsafeShiftR :: CULong -> Int -> CULong # rotateL :: CULong -> Int -> CULong # | |
Bits CUShort | |
Defined in GHC.Internal.Foreign.C.Types Methods (.&.) :: CUShort -> CUShort -> CUShort # (.|.) :: CUShort -> CUShort -> CUShort # xor :: CUShort -> CUShort -> CUShort # complement :: CUShort -> CUShort # shift :: CUShort -> Int -> CUShort # rotate :: CUShort -> Int -> CUShort # setBit :: CUShort -> Int -> CUShort # clearBit :: CUShort -> Int -> CUShort # complementBit :: CUShort -> Int -> CUShort # testBit :: CUShort -> Int -> Bool # bitSizeMaybe :: CUShort -> Maybe Int # shiftL :: CUShort -> Int -> CUShort # unsafeShiftL :: CUShort -> Int -> CUShort # shiftR :: CUShort -> Int -> CUShort # unsafeShiftR :: CUShort -> Int -> CUShort # rotateL :: CUShort -> Int -> CUShort # | |
Bits CWchar | |
Defined in GHC.Internal.Foreign.C.Types Methods (.&.) :: CWchar -> CWchar -> CWchar # (.|.) :: CWchar -> CWchar -> CWchar # xor :: CWchar -> CWchar -> CWchar # complement :: CWchar -> CWchar # shift :: CWchar -> Int -> CWchar # rotate :: CWchar -> Int -> CWchar # setBit :: CWchar -> Int -> CWchar # clearBit :: CWchar -> Int -> CWchar # complementBit :: CWchar -> Int -> CWchar # testBit :: CWchar -> Int -> Bool # bitSizeMaybe :: CWchar -> Maybe Int # shiftL :: CWchar -> Int -> CWchar # unsafeShiftL :: CWchar -> Int -> CWchar # shiftR :: CWchar -> Int -> CWchar # unsafeShiftR :: CWchar -> Int -> CWchar # rotateL :: CWchar -> Int -> CWchar # | |
Bits Int16 | |
Defined in GHC.Internal.Int Methods (.&.) :: Int16 -> Int16 -> Int16 # (.|.) :: Int16 -> Int16 -> Int16 # xor :: Int16 -> Int16 -> Int16 # complement :: Int16 -> Int16 # shift :: Int16 -> Int -> Int16 # rotate :: Int16 -> Int -> Int16 # setBit :: Int16 -> Int -> Int16 # clearBit :: Int16 -> Int -> Int16 # complementBit :: Int16 -> Int -> Int16 # testBit :: Int16 -> Int -> Bool # bitSizeMaybe :: Int16 -> Maybe Int # shiftL :: Int16 -> Int -> Int16 # unsafeShiftL :: Int16 -> Int -> Int16 # shiftR :: Int16 -> Int -> Int16 # unsafeShiftR :: Int16 -> Int -> Int16 # rotateL :: Int16 -> Int -> Int16 # | |
Bits Int32 | |
Defined in GHC.Internal.Int Methods (.&.) :: Int32 -> Int32 -> Int32 # (.|.) :: Int32 -> Int32 -> Int32 # xor :: Int32 -> Int32 -> Int32 # complement :: Int32 -> Int32 # shift :: Int32 -> Int -> Int32 # rotate :: Int32 -> Int -> Int32 # setBit :: Int32 -> Int -> Int32 # clearBit :: Int32 -> Int -> Int32 # complementBit :: Int32 -> Int -> Int32 # testBit :: Int32 -> Int -> Bool # bitSizeMaybe :: Int32 -> Maybe Int # shiftL :: Int32 -> Int -> Int32 # unsafeShiftL :: Int32 -> Int -> Int32 # shiftR :: Int32 -> Int -> Int32 # unsafeShiftR :: Int32 -> Int -> Int32 # rotateL :: Int32 -> Int -> Int32 # | |
Bits Int64 | |
Defined in GHC.Internal.Int Methods (.&.) :: Int64 -> Int64 -> Int64 # (.|.) :: Int64 -> Int64 -> Int64 # xor :: Int64 -> Int64 -> Int64 # complement :: Int64 -> Int64 # shift :: Int64 -> Int -> Int64 # rotate :: Int64 -> Int -> Int64 # setBit :: Int64 -> Int -> Int64 # clearBit :: Int64 -> Int -> Int64 # complementBit :: Int64 -> Int -> Int64 # testBit :: Int64 -> Int -> Bool # bitSizeMaybe :: Int64 -> Maybe Int # shiftL :: Int64 -> Int -> Int64 # unsafeShiftL :: Int64 -> Int -> Int64 # shiftR :: Int64 -> Int -> Int64 # unsafeShiftR :: Int64 -> Int -> Int64 # rotateL :: Int64 -> Int -> Int64 # | |
Bits Int8 | |
Defined in GHC.Internal.Int Methods (.&.) :: Int8 -> Int8 -> Int8 # (.|.) :: Int8 -> Int8 -> Int8 # complement :: Int8 -> Int8 # shift :: Int8 -> Int -> Int8 # rotate :: Int8 -> Int -> Int8 # setBit :: Int8 -> Int -> Int8 # clearBit :: Int8 -> Int -> Int8 # complementBit :: Int8 -> Int -> Int8 # testBit :: Int8 -> Int -> Bool # bitSizeMaybe :: Int8 -> Maybe Int # shiftL :: Int8 -> Int -> Int8 # unsafeShiftL :: Int8 -> Int -> Int8 # shiftR :: Int8 -> Int -> Int8 # unsafeShiftR :: Int8 -> Int -> Int8 # rotateL :: Int8 -> Int -> Int8 # | |
Bits CBlkCnt | |
Defined in GHC.Internal.System.Posix.Types Methods (.&.) :: CBlkCnt -> CBlkCnt -> CBlkCnt # (.|.) :: CBlkCnt -> CBlkCnt -> CBlkCnt # xor :: CBlkCnt -> CBlkCnt -> CBlkCnt # complement :: CBlkCnt -> CBlkCnt # shift :: CBlkCnt -> Int -> CBlkCnt # rotate :: CBlkCnt -> Int -> CBlkCnt # setBit :: CBlkCnt -> Int -> CBlkCnt # clearBit :: CBlkCnt -> Int -> CBlkCnt # complementBit :: CBlkCnt -> Int -> CBlkCnt # testBit :: CBlkCnt -> Int -> Bool # bitSizeMaybe :: CBlkCnt -> Maybe Int # shiftL :: CBlkCnt -> Int -> CBlkCnt # unsafeShiftL :: CBlkCnt -> Int -> CBlkCnt # shiftR :: CBlkCnt -> Int -> CBlkCnt # unsafeShiftR :: CBlkCnt -> Int -> CBlkCnt # rotateL :: CBlkCnt -> Int -> CBlkCnt # | |
Bits CBlkSize | |
Defined in GHC.Internal.System.Posix.Types Methods (.&.) :: CBlkSize -> CBlkSize -> CBlkSize # (.|.) :: CBlkSize -> CBlkSize -> CBlkSize # xor :: CBlkSize -> CBlkSize -> CBlkSize # complement :: CBlkSize -> CBlkSize # shift :: CBlkSize -> Int -> CBlkSize # rotate :: CBlkSize -> Int -> CBlkSize # setBit :: CBlkSize -> Int -> CBlkSize # clearBit :: CBlkSize -> Int -> CBlkSize # complementBit :: CBlkSize -> Int -> CBlkSize # testBit :: CBlkSize -> Int -> Bool # bitSizeMaybe :: CBlkSize -> Maybe Int # isSigned :: CBlkSize -> Bool # shiftL :: CBlkSize -> Int -> CBlkSize # unsafeShiftL :: CBlkSize -> Int -> CBlkSize # shiftR :: CBlkSize -> Int -> CBlkSize # unsafeShiftR :: CBlkSize -> Int -> CBlkSize # rotateL :: CBlkSize -> Int -> CBlkSize # | |
Bits CClockId | |
Defined in GHC.Internal.System.Posix.Types Methods (.&.) :: CClockId -> CClockId -> CClockId # (.|.) :: CClockId -> CClockId -> CClockId # xor :: CClockId -> CClockId -> CClockId # complement :: CClockId -> CClockId # shift :: CClockId -> Int -> CClockId # rotate :: CClockId -> Int -> CClockId # setBit :: CClockId -> Int -> CClockId # clearBit :: CClockId -> Int -> CClockId # complementBit :: CClockId -> Int -> CClockId # testBit :: CClockId -> Int -> Bool # bitSizeMaybe :: CClockId -> Maybe Int # isSigned :: CClockId -> Bool # shiftL :: CClockId -> Int -> CClockId # unsafeShiftL :: CClockId -> Int -> CClockId # shiftR :: CClockId -> Int -> CClockId # unsafeShiftR :: CClockId -> Int -> CClockId # rotateL :: CClockId -> Int -> CClockId # | |
Bits CDev | |
Defined in GHC.Internal.System.Posix.Types Methods (.&.) :: CDev -> CDev -> CDev # (.|.) :: CDev -> CDev -> CDev # complement :: CDev -> CDev # shift :: CDev -> Int -> CDev # rotate :: CDev -> Int -> CDev # setBit :: CDev -> Int -> CDev # clearBit :: CDev -> Int -> CDev # complementBit :: CDev -> Int -> CDev # testBit :: CDev -> Int -> Bool # bitSizeMaybe :: CDev -> Maybe Int # shiftL :: CDev -> Int -> CDev # unsafeShiftL :: CDev -> Int -> CDev # shiftR :: CDev -> Int -> CDev # unsafeShiftR :: CDev -> Int -> CDev # rotateL :: CDev -> Int -> CDev # | |
Bits CFsBlkCnt | |
Defined in GHC.Internal.System.Posix.Types Methods (.&.) :: CFsBlkCnt -> CFsBlkCnt -> CFsBlkCnt # (.|.) :: CFsBlkCnt -> CFsBlkCnt -> CFsBlkCnt # xor :: CFsBlkCnt -> CFsBlkCnt -> CFsBlkCnt # complement :: CFsBlkCnt -> CFsBlkCnt # shift :: CFsBlkCnt -> Int -> CFsBlkCnt # rotate :: CFsBlkCnt -> Int -> CFsBlkCnt # setBit :: CFsBlkCnt -> Int -> CFsBlkCnt # clearBit :: CFsBlkCnt -> Int -> CFsBlkCnt # complementBit :: CFsBlkCnt -> Int -> CFsBlkCnt # testBit :: CFsBlkCnt -> Int -> Bool # bitSizeMaybe :: CFsBlkCnt -> Maybe Int # isSigned :: CFsBlkCnt -> Bool # shiftL :: CFsBlkCnt -> Int -> CFsBlkCnt # unsafeShiftL :: CFsBlkCnt -> Int -> CFsBlkCnt # shiftR :: CFsBlkCnt -> Int -> CFsBlkCnt # unsafeShiftR :: CFsBlkCnt -> Int -> CFsBlkCnt # rotateL :: CFsBlkCnt -> Int -> CFsBlkCnt # | |
Bits CFsFilCnt | |
Defined in GHC.Internal.System.Posix.Types Methods (.&.) :: CFsFilCnt -> CFsFilCnt -> CFsFilCnt # (.|.) :: CFsFilCnt -> CFsFilCnt -> CFsFilCnt # xor :: CFsFilCnt -> CFsFilCnt -> CFsFilCnt # complement :: CFsFilCnt -> CFsFilCnt # shift :: CFsFilCnt -> Int -> CFsFilCnt # rotate :: CFsFilCnt -> Int -> CFsFilCnt # setBit :: CFsFilCnt -> Int -> CFsFilCnt # clearBit :: CFsFilCnt -> Int -> CFsFilCnt # complementBit :: CFsFilCnt -> Int -> CFsFilCnt # testBit :: CFsFilCnt -> Int -> Bool # bitSizeMaybe :: CFsFilCnt -> Maybe Int # isSigned :: CFsFilCnt -> Bool # shiftL :: CFsFilCnt -> Int -> CFsFilCnt # unsafeShiftL :: CFsFilCnt -> Int -> CFsFilCnt # shiftR :: CFsFilCnt -> Int -> CFsFilCnt # unsafeShiftR :: CFsFilCnt -> Int -> CFsFilCnt # rotateL :: CFsFilCnt -> Int -> CFsFilCnt # | |
Bits CGid | |
Defined in GHC.Internal.System.Posix.Types Methods (.&.) :: CGid -> CGid -> CGid # (.|.) :: CGid -> CGid -> CGid # complement :: CGid -> CGid # shift :: CGid -> Int -> CGid # rotate :: CGid -> Int -> CGid # setBit :: CGid -> Int -> CGid # clearBit :: CGid -> Int -> CGid # complementBit :: CGid -> Int -> CGid # testBit :: CGid -> Int -> Bool # bitSizeMaybe :: CGid -> Maybe Int # shiftL :: CGid -> Int -> CGid # unsafeShiftL :: CGid -> Int -> CGid # shiftR :: CGid -> Int -> CGid # unsafeShiftR :: CGid -> Int -> CGid # rotateL :: CGid -> Int -> CGid # | |
Bits CId | |
Defined in GHC.Internal.System.Posix.Types | |
Bits CIno | |
Defined in GHC.Internal.System.Posix.Types Methods (.&.) :: CIno -> CIno -> CIno # (.|.) :: CIno -> CIno -> CIno # complement :: CIno -> CIno # shift :: CIno -> Int -> CIno # rotate :: CIno -> Int -> CIno # setBit :: CIno -> Int -> CIno # clearBit :: CIno -> Int -> CIno # complementBit :: CIno -> Int -> CIno # testBit :: CIno -> Int -> Bool # bitSizeMaybe :: CIno -> Maybe Int # shiftL :: CIno -> Int -> CIno # unsafeShiftL :: CIno -> Int -> CIno # shiftR :: CIno -> Int -> CIno # unsafeShiftR :: CIno -> Int -> CIno # rotateL :: CIno -> Int -> CIno # | |
Bits CKey | |
Defined in GHC.Internal.System.Posix.Types Methods (.&.) :: CKey -> CKey -> CKey # (.|.) :: CKey -> CKey -> CKey # complement :: CKey -> CKey # shift :: CKey -> Int -> CKey # rotate :: CKey -> Int -> CKey # setBit :: CKey -> Int -> CKey # clearBit :: CKey -> Int -> CKey # complementBit :: CKey -> Int -> CKey # testBit :: CKey -> Int -> Bool # bitSizeMaybe :: CKey -> Maybe Int # shiftL :: CKey -> Int -> CKey # unsafeShiftL :: CKey -> Int -> CKey # shiftR :: CKey -> Int -> CKey # unsafeShiftR :: CKey -> Int -> CKey # rotateL :: CKey -> Int -> CKey # | |
Bits CMode | |
Defined in GHC.Internal.System.Posix.Types Methods (.&.) :: CMode -> CMode -> CMode # (.|.) :: CMode -> CMode -> CMode # xor :: CMode -> CMode -> CMode # complement :: CMode -> CMode # shift :: CMode -> Int -> CMode # rotate :: CMode -> Int -> CMode # setBit :: CMode -> Int -> CMode # clearBit :: CMode -> Int -> CMode # complementBit :: CMode -> Int -> CMode # testBit :: CMode -> Int -> Bool # bitSizeMaybe :: CMode -> Maybe Int # shiftL :: CMode -> Int -> CMode # unsafeShiftL :: CMode -> Int -> CMode # shiftR :: CMode -> Int -> CMode # unsafeShiftR :: CMode -> Int -> CMode # rotateL :: CMode -> Int -> CMode # | |
Bits CNfds | |
Defined in GHC.Internal.System.Posix.Types Methods (.&.) :: CNfds -> CNfds -> CNfds # (.|.) :: CNfds -> CNfds -> CNfds # xor :: CNfds -> CNfds -> CNfds # complement :: CNfds -> CNfds # shift :: CNfds -> Int -> CNfds # rotate :: CNfds -> Int -> CNfds # setBit :: CNfds -> Int -> CNfds # clearBit :: CNfds -> Int -> CNfds # complementBit :: CNfds -> Int -> CNfds # testBit :: CNfds -> Int -> Bool # bitSizeMaybe :: CNfds -> Maybe Int # shiftL :: CNfds -> Int -> CNfds # unsafeShiftL :: CNfds -> Int -> CNfds # shiftR :: CNfds -> Int -> CNfds # unsafeShiftR :: CNfds -> Int -> CNfds # rotateL :: CNfds -> Int -> CNfds # | |
Bits CNlink | |
Defined in GHC.Internal.System.Posix.Types Methods (.&.) :: CNlink -> CNlink -> CNlink # (.|.) :: CNlink -> CNlink -> CNlink # xor :: CNlink -> CNlink -> CNlink # complement :: CNlink -> CNlink # shift :: CNlink -> Int -> CNlink # rotate :: CNlink -> Int -> CNlink # setBit :: CNlink -> Int -> CNlink # clearBit :: CNlink -> Int -> CNlink # complementBit :: CNlink -> Int -> CNlink # testBit :: CNlink -> Int -> Bool # bitSizeMaybe :: CNlink -> Maybe Int # shiftL :: CNlink -> Int -> CNlink # unsafeShiftL :: CNlink -> Int -> CNlink # shiftR :: CNlink -> Int -> CNlink # unsafeShiftR :: CNlink -> Int -> CNlink # rotateL :: CNlink -> Int -> CNlink # | |
Bits COff | |
Defined in GHC.Internal.System.Posix.Types Methods (.&.) :: COff -> COff -> COff # (.|.) :: COff -> COff -> COff # complement :: COff -> COff # shift :: COff -> Int -> COff # rotate :: COff -> Int -> COff # setBit :: COff -> Int -> COff # clearBit :: COff -> Int -> COff # complementBit :: COff -> Int -> COff # testBit :: COff -> Int -> Bool # bitSizeMaybe :: COff -> Maybe Int # shiftL :: COff -> Int -> COff # unsafeShiftL :: COff -> Int -> COff # shiftR :: COff -> Int -> COff # unsafeShiftR :: COff -> Int -> COff # rotateL :: COff -> Int -> COff # | |
Bits CPid | |
Defined in GHC.Internal.System.Posix.Types Methods (.&.) :: CPid -> CPid -> CPid # (.|.) :: CPid -> CPid -> CPid # complement :: CPid -> CPid # shift :: CPid -> Int -> CPid # rotate :: CPid -> Int -> CPid # setBit :: CPid -> Int -> CPid # clearBit :: CPid -> Int -> CPid # complementBit :: CPid -> Int -> CPid # testBit :: CPid -> Int -> Bool # bitSizeMaybe :: CPid -> Maybe Int # shiftL :: CPid -> Int -> CPid # unsafeShiftL :: CPid -> Int -> CPid # shiftR :: CPid -> Int -> CPid # unsafeShiftR :: CPid -> Int -> CPid # rotateL :: CPid -> Int -> CPid # | |
Bits CRLim | |
Defined in GHC.Internal.System.Posix.Types Methods (.&.) :: CRLim -> CRLim -> CRLim # (.|.) :: CRLim -> CRLim -> CRLim # xor :: CRLim -> CRLim -> CRLim # complement :: CRLim -> CRLim # shift :: CRLim -> Int -> CRLim # rotate :: CRLim -> Int -> CRLim # setBit :: CRLim -> Int -> CRLim # clearBit :: CRLim -> Int -> CRLim # complementBit :: CRLim -> Int -> CRLim # testBit :: CRLim -> Int -> Bool # bitSizeMaybe :: CRLim -> Maybe Int # shiftL :: CRLim -> Int -> CRLim # unsafeShiftL :: CRLim -> Int -> CRLim # shiftR :: CRLim -> Int -> CRLim # unsafeShiftR :: CRLim -> Int -> CRLim # rotateL :: CRLim -> Int -> CRLim # | |
Bits CSocklen | |
Defined in GHC.Internal.System.Posix.Types Methods (.&.) :: CSocklen -> CSocklen -> CSocklen # (.|.) :: CSocklen -> CSocklen -> CSocklen # xor :: CSocklen -> CSocklen -> CSocklen # complement :: CSocklen -> CSocklen # shift :: CSocklen -> Int -> CSocklen # rotate :: CSocklen -> Int -> CSocklen # setBit :: CSocklen -> Int -> CSocklen # clearBit :: CSocklen -> Int -> CSocklen # complementBit :: CSocklen -> Int -> CSocklen # testBit :: CSocklen -> Int -> Bool # bitSizeMaybe :: CSocklen -> Maybe Int # isSigned :: CSocklen -> Bool # shiftL :: CSocklen -> Int -> CSocklen # unsafeShiftL :: CSocklen -> Int -> CSocklen # shiftR :: CSocklen -> Int -> CSocklen # unsafeShiftR :: CSocklen -> Int -> CSocklen # rotateL :: CSocklen -> Int -> CSocklen # | |
Bits CSsize | |
Defined in GHC.Internal.System.Posix.Types Methods (.&.) :: CSsize -> CSsize -> CSsize # (.|.) :: CSsize -> CSsize -> CSsize # xor :: CSsize -> CSsize -> CSsize # complement :: CSsize -> CSsize # shift :: CSsize -> Int -> CSsize # rotate :: CSsize -> Int -> CSsize # setBit :: CSsize -> Int -> CSsize # clearBit :: CSsize -> Int -> CSsize # complementBit :: CSsize -> Int -> CSsize # testBit :: CSsize -> Int -> Bool # bitSizeMaybe :: CSsize -> Maybe Int # shiftL :: CSsize -> Int -> CSsize # unsafeShiftL :: CSsize -> Int -> CSsize # shiftR :: CSsize -> Int -> CSsize # unsafeShiftR :: CSsize -> Int -> CSsize # rotateL :: CSsize -> Int -> CSsize # | |
Bits CTcflag | |
Defined in GHC.Internal.System.Posix.Types Methods (.&.) :: CTcflag -> CTcflag -> CTcflag # (.|.) :: CTcflag -> CTcflag -> CTcflag # xor :: CTcflag -> CTcflag -> CTcflag # complement :: CTcflag -> CTcflag # shift :: CTcflag -> Int -> CTcflag # rotate :: CTcflag -> Int -> CTcflag # setBit :: CTcflag -> Int -> CTcflag # clearBit :: CTcflag -> Int -> CTcflag # complementBit :: CTcflag -> Int -> CTcflag # testBit :: CTcflag -> Int -> Bool # bitSizeMaybe :: CTcflag -> Maybe Int # shiftL :: CTcflag -> Int -> CTcflag # unsafeShiftL :: CTcflag -> Int -> CTcflag # shiftR :: CTcflag -> Int -> CTcflag # unsafeShiftR :: CTcflag -> Int -> CTcflag # rotateL :: CTcflag -> Int -> CTcflag # | |
Bits CUid | |
Defined in GHC.Internal.System.Posix.Types Methods (.&.) :: CUid -> CUid -> CUid # (.|.) :: CUid -> CUid -> CUid # complement :: CUid -> CUid # shift :: CUid -> Int -> CUid # rotate :: CUid -> Int -> CUid # setBit :: CUid -> Int -> CUid # clearBit :: CUid -> Int -> CUid # complementBit :: CUid -> Int -> CUid # testBit :: CUid -> Int -> Bool # bitSizeMaybe :: CUid -> Maybe Int # shiftL :: CUid -> Int -> CUid # unsafeShiftL :: CUid -> Int -> CUid # shiftR :: CUid -> Int -> CUid # unsafeShiftR :: CUid -> Int -> CUid # rotateL :: CUid -> Int -> CUid # | |
Bits Fd | |
Defined in GHC.Internal.System.Posix.Types Methods complement :: Fd -> Fd # complementBit :: Fd -> Int -> Fd # testBit :: Fd -> Int -> Bool # bitSizeMaybe :: Fd -> Maybe Int # unsafeShiftL :: Fd -> Int -> Fd # unsafeShiftR :: Fd -> Int -> Fd # | |
Bits Word16 | |
Defined in GHC.Internal.Word Methods (.&.) :: Word16 -> Word16 -> Word16 # (.|.) :: Word16 -> Word16 -> Word16 # xor :: Word16 -> Word16 -> Word16 # complement :: Word16 -> Word16 # shift :: Word16 -> Int -> Word16 # rotate :: Word16 -> Int -> Word16 # setBit :: Word16 -> Int -> Word16 # clearBit :: Word16 -> Int -> Word16 # complementBit :: Word16 -> Int -> Word16 # testBit :: Word16 -> Int -> Bool # bitSizeMaybe :: Word16 -> Maybe Int # shiftL :: Word16 -> Int -> Word16 # unsafeShiftL :: Word16 -> Int -> Word16 # shiftR :: Word16 -> Int -> Word16 # unsafeShiftR :: Word16 -> Int -> Word16 # rotateL :: Word16 -> Int -> Word16 # | |
Bits Word32 | |
Defined in GHC.Internal.Word Methods (.&.) :: Word32 -> Word32 -> Word32 # (.|.) :: Word32 -> Word32 -> Word32 # xor :: Word32 -> Word32 -> Word32 # complement :: Word32 -> Word32 # shift :: Word32 -> Int -> Word32 # rotate :: Word32 -> Int -> Word32 # setBit :: Word32 -> Int -> Word32 # clearBit :: Word32 -> Int -> Word32 # complementBit :: Word32 -> Int -> Word32 # testBit :: Word32 -> Int -> Bool # bitSizeMaybe :: Word32 -> Maybe Int # shiftL :: Word32 -> Int -> Word32 # unsafeShiftL :: Word32 -> Int -> Word32 # shiftR :: Word32 -> Int -> Word32 # unsafeShiftR :: Word32 -> Int -> Word32 # rotateL :: Word32 -> Int -> Word32 # | |
Bits Word64 | |
Defined in GHC.Internal.Word Methods (.&.) :: Word64 -> Word64 -> Word64 # (.|.) :: Word64 -> Word64 -> Word64 # xor :: Word64 -> Word64 -> Word64 # complement :: Word64 -> Word64 # shift :: Word64 -> Int -> Word64 # rotate :: Word64 -> Int -> Word64 # setBit :: Word64 -> Int -> Word64 # clearBit :: Word64 -> Int -> Word64 # complementBit :: Word64 -> Int -> Word64 # testBit :: Word64 -> Int -> Bool # bitSizeMaybe :: Word64 -> Maybe Int # shiftL :: Word64 -> Int -> Word64 # unsafeShiftL :: Word64 -> Int -> Word64 # shiftR :: Word64 -> Int -> Word64 # unsafeShiftR :: Word64 -> Int -> Word64 # rotateL :: Word64 -> Int -> Word64 # | |
Bits Word8 | |
Defined in GHC.Internal.Word Methods (.&.) :: Word8 -> Word8 -> Word8 # (.|.) :: Word8 -> Word8 -> Word8 # xor :: Word8 -> Word8 -> Word8 # complement :: Word8 -> Word8 # shift :: Word8 -> Int -> Word8 # rotate :: Word8 -> Int -> Word8 # setBit :: Word8 -> Int -> Word8 # clearBit :: Word8 -> Int -> Word8 # complementBit :: Word8 -> Int -> Word8 # testBit :: Word8 -> Int -> Bool # bitSizeMaybe :: Word8 -> Maybe Int # shiftL :: Word8 -> Int -> Word8 # unsafeShiftL :: Word8 -> Int -> Word8 # shiftR :: Word8 -> Int -> Word8 # unsafeShiftR :: Word8 -> Int -> Word8 # rotateL :: Word8 -> Int -> Word8 # | |
Bits CAttributes | |
Defined in System.Posix.Files.Common Methods (.&.) :: CAttributes -> CAttributes -> CAttributes # (.|.) :: CAttributes -> CAttributes -> CAttributes # xor :: CAttributes -> CAttributes -> CAttributes # complement :: CAttributes -> CAttributes # shift :: CAttributes -> Int -> CAttributes # rotate :: CAttributes -> Int -> CAttributes # zeroBits :: CAttributes # bit :: Int -> CAttributes # setBit :: CAttributes -> Int -> CAttributes # clearBit :: CAttributes -> Int -> CAttributes # complementBit :: CAttributes -> Int -> CAttributes # testBit :: CAttributes -> Int -> Bool # bitSizeMaybe :: CAttributes -> Maybe Int # bitSize :: CAttributes -> Int # isSigned :: CAttributes -> Bool # shiftL :: CAttributes -> Int -> CAttributes # unsafeShiftL :: CAttributes -> Int -> CAttributes # shiftR :: CAttributes -> Int -> CAttributes # unsafeShiftR :: CAttributes -> Int -> CAttributes # rotateL :: CAttributes -> Int -> CAttributes # rotateR :: CAttributes -> Int -> CAttributes # popCount :: CAttributes -> Int # | |
Bits StatxFlags | |
Defined in System.Posix.Files.Common Methods (.&.) :: StatxFlags -> StatxFlags -> StatxFlags # (.|.) :: StatxFlags -> StatxFlags -> StatxFlags # xor :: StatxFlags -> StatxFlags -> StatxFlags # complement :: StatxFlags -> StatxFlags # shift :: StatxFlags -> Int -> StatxFlags # rotate :: StatxFlags -> Int -> StatxFlags # zeroBits :: StatxFlags # bit :: Int -> StatxFlags # setBit :: StatxFlags -> Int -> StatxFlags # clearBit :: StatxFlags -> Int -> StatxFlags # complementBit :: StatxFlags -> Int -> StatxFlags # testBit :: StatxFlags -> Int -> Bool # bitSizeMaybe :: StatxFlags -> Maybe Int # bitSize :: StatxFlags -> Int # isSigned :: StatxFlags -> Bool # shiftL :: StatxFlags -> Int -> StatxFlags # unsafeShiftL :: StatxFlags -> Int -> StatxFlags # shiftR :: StatxFlags -> Int -> StatxFlags # unsafeShiftR :: StatxFlags -> Int -> StatxFlags # rotateL :: StatxFlags -> Int -> StatxFlags # rotateR :: StatxFlags -> Int -> StatxFlags # popCount :: StatxFlags -> Int # | |
Bits StatxMask | |
Defined in System.Posix.Files.Common Methods (.&.) :: StatxMask -> StatxMask -> StatxMask # (.|.) :: StatxMask -> StatxMask -> StatxMask # xor :: StatxMask -> StatxMask -> StatxMask # complement :: StatxMask -> StatxMask # shift :: StatxMask -> Int -> StatxMask # rotate :: StatxMask -> Int -> StatxMask # setBit :: StatxMask -> Int -> StatxMask # clearBit :: StatxMask -> Int -> StatxMask # complementBit :: StatxMask -> Int -> StatxMask # testBit :: StatxMask -> Int -> Bool # bitSizeMaybe :: StatxMask -> Maybe Int # isSigned :: StatxMask -> Bool # shiftL :: StatxMask -> Int -> StatxMask # unsafeShiftL :: StatxMask -> Int -> StatxMask # shiftR :: StatxMask -> Int -> StatxMask # unsafeShiftR :: StatxMask -> Int -> StatxMask # rotateL :: StatxMask -> Int -> StatxMask # | |
Bits Integer | |
Defined in GHC.Internal.Bits Methods (.&.) :: Integer -> Integer -> Integer # (.|.) :: Integer -> Integer -> Integer # xor :: Integer -> Integer -> Integer # complement :: Integer -> Integer # shift :: Integer -> Int -> Integer # rotate :: Integer -> Int -> Integer # setBit :: Integer -> Int -> Integer # clearBit :: Integer -> Int -> Integer # complementBit :: Integer -> Int -> Integer # testBit :: Integer -> Int -> Bool # bitSizeMaybe :: Integer -> Maybe Int # shiftL :: Integer -> Int -> Integer # unsafeShiftL :: Integer -> Int -> Integer # shiftR :: Integer -> Int -> Integer # unsafeShiftR :: Integer -> Int -> Integer # rotateL :: Integer -> Int -> Integer # | |
Bits Natural | |
Defined in GHC.Internal.Bits Methods (.&.) :: Natural -> Natural -> Natural # (.|.) :: Natural -> Natural -> Natural # xor :: Natural -> Natural -> Natural # complement :: Natural -> Natural # shift :: Natural -> Int -> Natural # rotate :: Natural -> Int -> Natural # setBit :: Natural -> Int -> Natural # clearBit :: Natural -> Int -> Natural # complementBit :: Natural -> Int -> Natural # testBit :: Natural -> Int -> Bool # bitSizeMaybe :: Natural -> Maybe Int # shiftL :: Natural -> Int -> Natural # unsafeShiftL :: Natural -> Int -> Natural # shiftR :: Natural -> Int -> Natural # unsafeShiftR :: Natural -> Int -> Natural # rotateL :: Natural -> Int -> Natural # | |
Bits Bool | |
Defined in GHC.Internal.Bits Methods (.&.) :: Bool -> Bool -> Bool # (.|.) :: Bool -> Bool -> Bool # complement :: Bool -> Bool # shift :: Bool -> Int -> Bool # rotate :: Bool -> Int -> Bool # setBit :: Bool -> Int -> Bool # clearBit :: Bool -> Int -> Bool # complementBit :: Bool -> Int -> Bool # testBit :: Bool -> Int -> Bool # bitSizeMaybe :: Bool -> Maybe Int # shiftL :: Bool -> Int -> Bool # unsafeShiftL :: Bool -> Int -> Bool # shiftR :: Bool -> Int -> Bool # unsafeShiftR :: Bool -> Int -> Bool # rotateL :: Bool -> Int -> Bool # | |
Bits Int | |
Defined in GHC.Internal.Bits | |
Bits Word | |
Defined in GHC.Internal.Bits Methods (.&.) :: Word -> Word -> Word # (.|.) :: Word -> Word -> Word # complement :: Word -> Word # shift :: Word -> Int -> Word # rotate :: Word -> Int -> Word # setBit :: Word -> Int -> Word # clearBit :: Word -> Int -> Word # complementBit :: Word -> Int -> Word # testBit :: Word -> Int -> Bool # bitSizeMaybe :: Word -> Maybe Int # shiftL :: Word -> Int -> Word # unsafeShiftL :: Word -> Int -> Word # shiftR :: Word -> Int -> Word # unsafeShiftR :: Word -> Int -> Word # rotateL :: Word -> Int -> Word # | |
Bits a => Bits (And a) | |
Defined in GHC.Internal.Data.Bits Methods (.&.) :: And a -> And a -> And a # (.|.) :: And a -> And a -> And a # xor :: And a -> And a -> And a # complement :: And a -> And a # shift :: And a -> Int -> And a # rotate :: And a -> Int -> And a # setBit :: And a -> Int -> And a # clearBit :: And a -> Int -> And a # complementBit :: And a -> Int -> And a # testBit :: And a -> Int -> Bool # bitSizeMaybe :: And a -> Maybe Int # shiftL :: And a -> Int -> And a # unsafeShiftL :: And a -> Int -> And a # shiftR :: And a -> Int -> And a # unsafeShiftR :: And a -> Int -> And a # rotateL :: And a -> Int -> And a # | |
Bits a => Bits (Iff a) | |
Defined in GHC.Internal.Data.Bits Methods (.&.) :: Iff a -> Iff a -> Iff a # (.|.) :: Iff a -> Iff a -> Iff a # xor :: Iff a -> Iff a -> Iff a # complement :: Iff a -> Iff a # shift :: Iff a -> Int -> Iff a # rotate :: Iff a -> Int -> Iff a # setBit :: Iff a -> Int -> Iff a # clearBit :: Iff a -> Int -> Iff a # complementBit :: Iff a -> Int -> Iff a # testBit :: Iff a -> Int -> Bool # bitSizeMaybe :: Iff a -> Maybe Int # shiftL :: Iff a -> Int -> Iff a # unsafeShiftL :: Iff a -> Int -> Iff a # shiftR :: Iff a -> Int -> Iff a # unsafeShiftR :: Iff a -> Int -> Iff a # rotateL :: Iff a -> Int -> Iff a # | |
Bits a => Bits (Ior a) | |
Defined in GHC.Internal.Data.Bits Methods (.&.) :: Ior a -> Ior a -> Ior a # (.|.) :: Ior a -> Ior a -> Ior a # xor :: Ior a -> Ior a -> Ior a # complement :: Ior a -> Ior a # shift :: Ior a -> Int -> Ior a # rotate :: Ior a -> Int -> Ior a # setBit :: Ior a -> Int -> Ior a # clearBit :: Ior a -> Int -> Ior a # complementBit :: Ior a -> Int -> Ior a # testBit :: Ior a -> Int -> Bool # bitSizeMaybe :: Ior a -> Maybe Int # shiftL :: Ior a -> Int -> Ior a # unsafeShiftL :: Ior a -> Int -> Ior a # shiftR :: Ior a -> Int -> Ior a # unsafeShiftR :: Ior a -> Int -> Ior a # rotateL :: Ior a -> Int -> Ior a # | |
Bits a => Bits (Xor a) | |
Defined in GHC.Internal.Data.Bits Methods (.&.) :: Xor a -> Xor a -> Xor a # (.|.) :: Xor a -> Xor a -> Xor a # xor :: Xor a -> Xor a -> Xor a # complement :: Xor a -> Xor a # shift :: Xor a -> Int -> Xor a # rotate :: Xor a -> Int -> Xor a # setBit :: Xor a -> Int -> Xor a # clearBit :: Xor a -> Int -> Xor a # complementBit :: Xor a -> Int -> Xor a # testBit :: Xor a -> Int -> Bool # bitSizeMaybe :: Xor a -> Maybe Int # shiftL :: Xor a -> Int -> Xor a # unsafeShiftL :: Xor a -> Int -> Xor a # shiftR :: Xor a -> Int -> Xor a # unsafeShiftR :: Xor a -> Int -> Xor a # rotateL :: Xor a -> Int -> Xor a # | |
Bits a => Bits (Identity a) | |
Defined in GHC.Internal.Data.Functor.Identity Methods (.&.) :: Identity a -> Identity a -> Identity a # (.|.) :: Identity a -> Identity a -> Identity a # xor :: Identity a -> Identity a -> Identity a # complement :: Identity a -> Identity a # shift :: Identity a -> Int -> Identity a # rotate :: Identity a -> Int -> Identity a # setBit :: Identity a -> Int -> Identity a # clearBit :: Identity a -> Int -> Identity a # complementBit :: Identity a -> Int -> Identity a # testBit :: Identity a -> Int -> Bool # bitSizeMaybe :: Identity a -> Maybe Int # bitSize :: Identity a -> Int # isSigned :: Identity a -> Bool # shiftL :: Identity a -> Int -> Identity a # unsafeShiftL :: Identity a -> Int -> Identity a # shiftR :: Identity a -> Int -> Identity a # unsafeShiftR :: Identity a -> Int -> Identity a # rotateL :: Identity a -> Int -> Identity a # | |
Bits a => Bits (Down a) | |
Defined in GHC.Internal.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 # 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 # 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 # | |
Bits a => Bits (Const a b) | |
Defined in GHC.Internal.Data.Functor.Const Methods (.&.) :: Const a b -> Const a b -> Const a b # (.|.) :: Const a b -> Const a b -> Const a b # xor :: Const a b -> Const a b -> Const a b # complement :: Const a b -> Const a b # shift :: Const a b -> Int -> Const a b # rotate :: Const a b -> Int -> Const a b # setBit :: Const a b -> Int -> Const a b # clearBit :: Const a b -> Int -> Const a b # complementBit :: Const a b -> Int -> Const a b # testBit :: Const a b -> Int -> Bool # bitSizeMaybe :: Const a b -> Maybe Int # isSigned :: Const a b -> Bool # shiftL :: Const a b -> Int -> Const a b # unsafeShiftL :: Const a b -> Int -> Const a b # shiftR :: Const a b -> Int -> Const a b # unsafeShiftR :: Const a b -> Int -> Const a b # rotateL :: Const a b -> Int -> Const a b # |
bitDefault :: (Bits a, Num a) => Int -> a #
popCountDefault :: (Bits a, Num a) => a -> Int #
head :: HasCallStack => [a] -> a Source #
tail :: HasCallStack => [a] -> [a] Source #