Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
GHC.Prelude.Basic
Description
Synopsis
- data Int
- data Float
- data Char
- data Maybe a
- data IO a
- data Bool
- data Double
- data Word
- data Ordering
- class a ~# b => (a :: k) ~ (b :: k)
- data Integer
- error :: HasCallStack => [Char] -> a
- data Either a b
- concat :: Foldable t => t [a] -> [a]
- class Foldable (t :: Type -> Type) where
- 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
- null :: t a -> Bool
- length :: t a -> Int
- elem :: Eq a => a -> t a -> Bool
- maximum :: Ord a => t a -> a
- minimum :: Ord a => t a -> a
- sum :: Num a => t a -> a
- product :: Num a => t a -> a
- class Show a where
- even :: Integral a => a -> Bool
- (<$>) :: Functor f => (a -> b) -> f a -> f b
- class Enum a where
- succ :: a -> a
- pred :: a -> a
- toEnum :: Int -> a
- fromEnum :: a -> Int
- enumFrom :: a -> [a]
- enumFromThen :: a -> a -> [a]
- enumFromTo :: a -> a -> [a]
- enumFromThenTo :: a -> a -> a -> [a]
- class (Real a, Enum a) => Integral a where
- type Rational = Ratio Integer
- ($) :: (a -> b) -> a -> b
- type String = [Char]
- unzip :: [(a, b)] -> ([a], [b])
- class Eq a => Ord a where
- fst :: (a, b) -> a
- class Applicative m => Monad (m :: Type -> Type) where
- class Read a where
- uncurry :: (a -> b -> c) -> (a, b) -> c
- id :: a -> a
- class (Functor t, Foldable t) => Traversable (t :: Type -> Type) where
- traverse :: Applicative f => (a -> f b) -> t a -> f (t b)
- sequenceA :: Applicative f => t (f a) -> f (t a)
- mapM :: Monad m => (a -> m b) -> t a -> m (t b)
- sequence :: Monad m => t (m a) -> m (t a)
- type IOError = IOException
- writeFile :: FilePath -> String -> IO ()
- getLine :: IO String
- putStrLn :: String -> IO ()
- mapM_ :: (Foldable t, Monad m) => (a -> m b) -> t a -> m ()
- sequence_ :: (Foldable t, Monad m) => t (m a) -> m ()
- filter :: (a -> Bool) -> [a] -> [a]
- const :: a -> b -> a
- cycle :: HasCallStack => [a] -> [a]
- (++) :: [a] -> [a] -> [a]
- seq :: a -> b -> b
- zip :: [a] -> [b] -> [(a, b)]
- print :: Show a => a -> IO ()
- otherwise :: Bool
- map :: (a -> b) -> [a] -> [b]
- class Num a where
- class Num a => Fractional a where
- (/) :: a -> a -> a
- recip :: a -> a
- fromRational :: Rational -> a
- class Eq a where
- class Functor (f :: Type -> Type) where
- class Monad m => MonadFail (m :: Type -> Type) where
- fromIntegral :: (Integral a, Num b) => a -> b
- realToFrac :: (Real a, Fractional b) => a -> b
- class (Num a, Ord a) => Real a where
- toRational :: a -> Rational
- class Semigroup a => Monoid a where
- class Bounded a where
- class Fractional a => Floating a where
- class (RealFrac a, Floating a) => RealFloat a where
- floatRadix :: a -> Integer
- floatDigits :: a -> Int
- floatRange :: a -> (Int, Int)
- decodeFloat :: a -> (Integer, Int)
- encodeFloat :: Integer -> Int -> a
- exponent :: a -> Int
- significand :: a -> a
- scaleFloat :: Int -> a -> a
- isNaN :: a -> Bool
- isInfinite :: a -> Bool
- isDenormalized :: a -> Bool
- isNegativeZero :: a -> Bool
- isIEEE :: a -> Bool
- atan2 :: a -> a -> a
- class (Real a, Fractional a) => RealFrac a where
- class Semigroup a
- (^) :: (Num a, Integral b) => a -> b -> a
- (&&) :: Bool -> Bool -> Bool
- (||) :: Bool -> Bool -> Bool
- not :: Bool -> Bool
- errorWithoutStackTrace :: [Char] -> a
- undefined :: HasCallStack => a
- (=<<) :: Monad m => (a -> m b) -> m a -> m b
- (.) :: (b -> c) -> (a -> b) -> a -> c
- flip :: (a -> b -> c) -> b -> a -> c
- ($!) :: (a -> b) -> a -> b
- until :: (a -> Bool) -> (a -> a) -> a -> a
- asTypeOf :: a -> a -> a
- subtract :: Num a => a -> a -> a
- maybe :: b -> (a -> b) -> Maybe a -> b
- last :: HasCallStack => [a] -> a
- init :: HasCallStack => [a] -> [a]
- scanl :: (b -> a -> b) -> b -> [a] -> [b]
- scanl1 :: (a -> a -> a) -> [a] -> [a]
- scanr :: (a -> b -> b) -> b -> [a] -> [b]
- scanr1 :: (a -> a -> a) -> [a] -> [a]
- iterate :: (a -> a) -> a -> [a]
- repeat :: a -> [a]
- replicate :: Int -> a -> [a]
- takeWhile :: (a -> Bool) -> [a] -> [a]
- dropWhile :: (a -> Bool) -> [a] -> [a]
- take :: Int -> [a] -> [a]
- drop :: Int -> [a] -> [a]
- splitAt :: Int -> [a] -> ([a], [a])
- span :: (a -> Bool) -> [a] -> ([a], [a])
- break :: (a -> Bool) -> [a] -> ([a], [a])
- reverse :: [a] -> [a]
- and :: Foldable t => t Bool -> Bool
- or :: Foldable t => t Bool -> Bool
- any :: Foldable t => (a -> Bool) -> t a -> Bool
- all :: Foldable t => (a -> Bool) -> t a -> Bool
- notElem :: (Foldable t, Eq a) => a -> t a -> Bool
- lookup :: Eq a => a -> [(a, b)] -> Maybe b
- concatMap :: Foldable t => (a -> [b]) -> t a -> [b]
- (!!) :: HasCallStack => [a] -> Int -> a
- zip3 :: [a] -> [b] -> [c] -> [(a, b, c)]
- zipWith :: (a -> b -> c) -> [a] -> [b] -> [c]
- zipWith3 :: (a -> b -> c -> d) -> [a] -> [b] -> [c] -> [d]
- unzip3 :: [(a, b, c)] -> ([a], [b], [c])
- type ShowS = String -> String
- shows :: Show a => a -> ShowS
- showChar :: Char -> ShowS
- showString :: String -> ShowS
- showParen :: Bool -> ShowS -> ShowS
- odd :: Integral a => a -> Bool
- (^^) :: (Fractional a, Integral b) => a -> b -> a
- gcd :: Integral a => a -> a -> a
- lcm :: Integral a => a -> a -> a
- snd :: (a, b) -> b
- curry :: ((a, b) -> c) -> a -> b -> c
- type ReadS a = String -> [(a, String)]
- lex :: ReadS String
- readParen :: Bool -> ReadS a -> ReadS a
- either :: (a -> c) -> (b -> c) -> Either a b -> c
- reads :: Read a => ReadS a
- read :: Read a => String -> a
- lines :: String -> [String]
- unlines :: [String] -> String
- words :: String -> [String]
- unwords :: [String] -> String
- userError :: String -> IOError
- type FilePath = String
- ioError :: IOError -> IO a
- putChar :: Char -> IO ()
- putStr :: String -> IO ()
- getChar :: IO Char
- getContents :: IO String
- interact :: (String -> String) -> IO ()
- readFile :: FilePath -> IO String
- appendFile :: FilePath -> String -> IO ()
- readLn :: Read a => IO a
- readIO :: Read a => String -> IO a
- class Functor f => Applicative (f :: Type -> Type) where
- class Bits b => FiniteBits b where
- finiteBitSize :: b -> Int
- countLeadingZeros :: b -> Int
- countTrailingZeros :: b -> Int
- class Eq a => Bits a where
- (.&.) :: a -> a -> a
- (.|.) :: a -> a -> a
- xor :: a -> a -> a
- complement :: a -> a
- shift :: a -> Int -> a
- rotate :: a -> Int -> a
- zeroBits :: a
- bit :: Int -> a
- setBit :: a -> Int -> a
- clearBit :: a -> Int -> a
- complementBit :: a -> Int -> a
- testBit :: a -> Int -> Bool
- bitSizeMaybe :: a -> Maybe Int
- bitSize :: a -> Int
- isSigned :: a -> Bool
- unsafeShiftL :: a -> Int -> a
- unsafeShiftR :: a -> Int -> a
- rotateL :: a -> Int -> a
- rotateR :: a -> Int -> a
- popCount :: a -> Int
- bitDefault :: (Bits a, Num a) => Int -> a
- testBitDefault :: (Bits a, Num a) => a -> Int -> Bool
- popCountDefault :: (Bits a, Num a) => a -> Int
- toIntegralSized :: (Integral a, Integral b, Bits a, Bits b) => a -> Maybe b
- shiftL :: Bits a => a -> Int -> a
- shiftR :: Bits a => a -> Int -> a
- head :: HasCallStack => [a] -> a
- tail :: HasCallStack => [a] -> [a]
Documentation
Instances
Data Int | Since: base-4.0.0.0 | ||||
Defined in Data.Data Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Int -> c Int Source # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Int Source # toConstr :: Int -> Constr Source # dataTypeOf :: Int -> DataType Source # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Int) Source # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Int) Source # gmapT :: (forall b. Data b => b -> b) -> Int -> Int Source # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Int -> r Source # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Int -> r Source # gmapQ :: (forall d. Data d => d -> u) -> Int -> [u] Source # gmapQi :: Int -> (forall d. Data d => d -> u) -> Int -> u Source # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Int -> m Int Source # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Int -> m Int Source # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Int -> m Int Source # | |||||
Storable Int | Since: base-2.1 | ||||
Defined in Foreign.Storable | |||||
Bits Int | Since: base-2.1 | ||||
Defined in GHC.Bits Methods (.&.) :: Int -> Int -> Int Source # (.|.) :: Int -> Int -> Int Source # xor :: Int -> Int -> Int Source # complement :: Int -> Int Source # shift :: Int -> Int -> Int Source # rotate :: Int -> Int -> Int Source # setBit :: Int -> Int -> Int Source # clearBit :: Int -> Int -> Int Source # complementBit :: Int -> Int -> Int Source # testBit :: Int -> Int -> Bool Source # bitSizeMaybe :: Int -> Maybe Int Source # bitSize :: Int -> Int Source # isSigned :: Int -> Bool Source # shiftL :: Int -> Int -> Int Source # unsafeShiftL :: Int -> Int -> Int Source # shiftR :: Int -> Int -> Int Source # unsafeShiftR :: Int -> Int -> Int Source # rotateL :: Int -> Int -> Int Source # | |||||
FiniteBits Int | Since: base-4.6.0.0 | ||||
Bounded Int | Since: base-2.1 | ||||
Enum Int | Since: base-2.1 | ||||
Defined in GHC.Enum | |||||
Ix Int | Since: base-2.1 | ||||
Num Int | Since: base-2.1 | ||||
Read Int | Since: base-2.1 | ||||
Integral Int | Since: base-2.0.1 | ||||
Real Int | Since: base-2.0.1 | ||||
Show Int | Since: base-2.1 | ||||
PrintfArg Int | Since: base-2.1 | ||||
Defined in Text.Printf | |||||
Binary Int | |||||
NFData Int | |||||
Defined in Control.DeepSeq | |||||
ToJExpr Int Source # | |||||
Uniquable Int Source # | |||||
Binary Int Source # | |||||
ToJson Int Source # | |||||
Outputable Int Source # | |||||
Eq Int | |||||
Ord Int | |||||
HpcHash Int | |||||
IArray UArray Int | |||||
Defined in Data.Array.Base Methods bounds :: Ix i => UArray i Int -> (i, i) Source # numElements :: Ix i => UArray i Int -> Int Source # unsafeArray :: Ix i => (i, i) -> [(Int, Int)] -> UArray i Int Source # unsafeAt :: Ix i => UArray i Int -> Int -> Int Source # unsafeReplace :: Ix i => UArray i Int -> [(Int, Int)] -> UArray i Int Source # unsafeAccum :: Ix i => (Int -> e' -> Int) -> UArray i Int -> [(Int, e')] -> UArray i Int Source # unsafeAccumArray :: Ix i => (Int -> e' -> Int) -> Int -> (i, i) -> [(Int, e')] -> UArray i Int Source # | |||||
Lift Int | |||||
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 # | |||||
Generic1 (URec Int :: k -> Type) | |||||
Defined in GHC.Generics Associated Types
| |||||
Foldable (UInt :: Type -> Type) | Since: base-4.9.0.0 | ||||
Defined in Data.Foldable Methods fold :: Monoid m => UInt m -> m Source # foldMap :: Monoid m => (a -> m) -> UInt a -> m Source # foldMap' :: Monoid m => (a -> m) -> UInt a -> m Source # foldr :: (a -> b -> b) -> b -> UInt a -> b Source # foldr' :: (a -> b -> b) -> b -> UInt a -> b Source # foldl :: (b -> a -> b) -> b -> UInt a -> b Source # foldl' :: (b -> a -> b) -> b -> UInt a -> b Source # foldr1 :: (a -> a -> a) -> UInt a -> a Source # foldl1 :: (a -> a -> a) -> UInt a -> a Source # toList :: UInt a -> [a] Source # null :: UInt a -> Bool Source # length :: UInt a -> Int Source # elem :: Eq a => a -> UInt a -> Bool Source # maximum :: Ord a => UInt a -> a Source # minimum :: Ord a => UInt a -> a Source # | |||||
Traversable (UInt :: Type -> Type) | Since: base-4.9.0.0 | ||||
Binary (HieAST TypeIndex) Source # | |||||
Binary (HieASTs TypeIndex) Source # | |||||
Binary (HieArgs TypeIndex) Source # | |||||
Binary (HieType TypeIndex) Source # | |||||
Binary (IdentifierDetails TypeIndex) Source # | |||||
Defined in GHC.Iface.Ext.Types | |||||
Binary (NodeInfo TypeIndex) Source # | |||||
Binary (SourcedNodeInfo TypeIndex) Source # | |||||
Defined in GHC.Iface.Ext.Types | |||||
MArray (STUArray s) Int (ST s) | |||||
Defined in Data.Array.Base Methods getBounds :: Ix i => STUArray s i Int -> ST s (i, i) Source # getNumElements :: Ix i => STUArray s i Int -> ST s Int Source # newArray :: Ix i => (i, i) -> Int -> ST s (STUArray s i Int) Source # newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Int) Source # unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Int) Source # unsafeRead :: Ix i => STUArray s i Int -> Int -> ST s Int Source # unsafeWrite :: Ix i => STUArray s i Int -> Int -> Int -> ST s () Source # | |||||
Functor (URec Int :: Type -> Type) | Since: base-4.9.0.0 | ||||
Generic (URec Int p) | |||||
Defined in GHC.Generics Associated Types
| |||||
Show (URec Int p) | Since: base-4.9.0.0 | ||||
Eq (URec Int p) | Since: base-4.9.0.0 | ||||
Ord (URec Int p) | Since: base-4.9.0.0 | ||||
data URec Int (p :: k) | Used for marking occurrences of Since: base-4.9.0.0 | ||||
type Rep1 (URec Int :: k -> Type) | Since: base-4.9.0.0 | ||||
Defined in GHC.Generics | |||||
type Rep (URec Int p) | Since: base-4.9.0.0 | ||||
Defined in GHC.Generics |
Instances
Instances
Data Char | Since: base-4.0.0.0 | ||||
Defined in Data.Data Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Char -> c Char Source # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Char Source # toConstr :: Char -> Constr Source # dataTypeOf :: Char -> DataType Source # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Char) Source # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Char) Source # gmapT :: (forall b. Data b => b -> b) -> Char -> Char Source # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Char -> r Source # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Char -> r Source # gmapQ :: (forall d. Data d => d -> u) -> Char -> [u] Source # gmapQi :: Int -> (forall d. Data d => d -> u) -> Char -> u Source # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Char -> m Char Source # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Char -> m Char Source # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Char -> m Char Source # | |||||
Storable Char | Since: base-2.1 | ||||
Defined in Foreign.Storable Methods sizeOf :: Char -> Int Source # alignment :: Char -> Int Source # peekElemOff :: Ptr Char -> Int -> IO Char Source # pokeElemOff :: Ptr Char -> Int -> Char -> IO () Source # peekByteOff :: Ptr b -> Int -> IO Char Source # pokeByteOff :: Ptr b -> Int -> Char -> IO () Source # | |||||
Bounded Char | Since: base-2.1 | ||||
Enum Char | Since: base-2.1 | ||||
Ix Char | Since: base-2.1 | ||||
Read Char | Since: base-2.1 | ||||
Show Char | Since: base-2.1 | ||||
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 # | |||||
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 | Since: base-4.18.0.0 | ||||
Defined in GHC.TypeLits | |||||
TestEquality SChar | Since: base-4.18.0.0 | ||||
Defined in GHC.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.Generics Associated Types
| |||||
Foldable (UChar :: Type -> Type) | Since: base-4.9.0.0 | ||||
Defined in Data.Foldable Methods fold :: Monoid m => UChar m -> m Source # foldMap :: Monoid m => (a -> m) -> UChar a -> m Source # foldMap' :: Monoid m => (a -> m) -> UChar a -> m Source # foldr :: (a -> b -> b) -> b -> UChar a -> b Source # foldr' :: (a -> b -> b) -> b -> UChar a -> b Source # foldl :: (b -> a -> b) -> b -> UChar a -> b Source # foldl' :: (b -> a -> b) -> b -> UChar a -> b Source # foldr1 :: (a -> a -> a) -> UChar a -> a Source # foldl1 :: (a -> a -> a) -> UChar a -> a Source # toList :: UChar a -> [a] Source # null :: UChar a -> Bool Source # length :: UChar a -> Int Source # elem :: Eq a => a -> UChar a -> Bool Source # maximum :: Ord a => UChar a -> a Source # minimum :: Ord a => UChar a -> a Source # | |||||
Traversable (UChar :: Type -> Type) | Since: base-4.9.0.0 | ||||
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 # | |||||
Functor (URec Char :: Type -> Type) | Since: base-4.9.0.0 | ||||
ToJExpr a => ToJExpr (Map String a) Source # | |||||
Generic (URec Char p) | |||||
Defined in GHC.Generics Associated Types
| |||||
Show (URec Char p) | Since: base-4.9.0.0 | ||||
Eq (URec Char p) | Since: base-4.9.0.0 | ||||
Ord (URec Char p) | Since: base-4.9.0.0 | ||||
Defined in GHC.Generics | |||||
data URec Char (p :: k) | Used for marking occurrences of Since: base-4.9.0.0 | ||||
type Compare (a :: Char) (b :: Char) | |||||
Defined in Data.Type.Ord | |||||
type Rep1 (URec Char :: k -> Type) | Since: base-4.9.0.0 | ||||
Defined in GHC.Generics | |||||
type Rep (URec Char p) | Since: base-4.9.0.0 | ||||
Defined in GHC.Generics |
The Maybe
type encapsulates an optional value. A value of type
either contains a value of type Maybe
aa
(represented as
),
or it is empty (represented as Just
aNothing
). Using Maybe
is a good way to
deal with errors or exceptional cases without resorting to drastic
measures such as error
.
The Maybe
type is also a monad. It is a simple kind of error
monad, where all errors are represented by Nothing
. A richer
error monad can be built using the Either
type.
Instances
MonadFail Maybe | Since: base-4.9.0.0 | ||||
MonadFix Maybe | Since: base-2.1 | ||||
MonadZip Maybe | Since: base-4.8.0.0 | ||||
Foldable Maybe | Since: base-2.1 | ||||
Defined in Data.Foldable Methods fold :: Monoid m => Maybe m -> m Source # foldMap :: Monoid m => (a -> m) -> Maybe a -> m Source # foldMap' :: Monoid m => (a -> m) -> Maybe a -> m Source # foldr :: (a -> b -> b) -> b -> Maybe a -> b Source # foldr' :: (a -> b -> b) -> b -> Maybe a -> b Source # foldl :: (b -> a -> b) -> b -> Maybe a -> b Source # foldl' :: (b -> a -> b) -> b -> Maybe a -> b Source # foldr1 :: (a -> a -> a) -> Maybe a -> a Source # foldl1 :: (a -> a -> a) -> Maybe a -> a Source # toList :: Maybe a -> [a] Source # null :: Maybe a -> Bool Source # length :: Maybe a -> Int Source # elem :: Eq a => a -> Maybe a -> Bool Source # maximum :: Ord a => Maybe a -> a Source # minimum :: Ord a => Maybe a -> a Source # | |||||
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 | ||||
Traversable Maybe | Since: base-2.1 | ||||
Alternative Maybe | Picks the leftmost Since: base-2.1 | ||||
Applicative Maybe | Since: base-2.1 | ||||
Functor Maybe | Since: base-2.1 | ||||
Monad Maybe | Since: base-2.1 | ||||
MonadPlus Maybe | Picks the leftmost Since: base-2.1 | ||||
NFData1 Maybe | Since: deepseq-1.4.3.0 | ||||
Defined in Control.DeepSeq | |||||
MonadThrow Maybe | |||||
Defined in Control.Monad.Catch | |||||
Generic1 Maybe | |||||
Defined in GHC.Generics | |||||
OutputableP env a => OutputableP env (Maybe a) Source # | |||||
Lift a => Lift (Maybe a :: Type) | |||||
Data a => Data (Maybe a) | Since: base-4.0.0.0 | ||||
Defined in Data.Data Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Maybe a -> c (Maybe a) Source # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Maybe a) Source # toConstr :: Maybe a -> Constr Source # dataTypeOf :: Maybe a -> DataType Source # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Maybe a)) Source # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Maybe a)) Source # gmapT :: (forall b. Data b => b -> b) -> Maybe a -> Maybe a Source # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Maybe a -> r Source # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Maybe a -> r Source # gmapQ :: (forall d. Data d => d -> u) -> Maybe a -> [u] Source # gmapQi :: Int -> (forall d. Data d => d -> u) -> Maybe a -> u Source # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Maybe a -> m (Maybe a) Source # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Maybe a -> m (Maybe a) Source # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Maybe a -> m (Maybe a) Source # | |||||
Semigroup a => Monoid (Maybe a) | Lift a semigroup into Since 4.11.0: constraint on inner Since: base-2.1 | ||||
Semigroup a => Semigroup (Maybe a) | Since: base-4.9.0.0 | ||||
Generic (Maybe a) | |||||
Defined in GHC.Generics Associated Types
| |||||
SingKind a => SingKind (Maybe a) | Since: base-4.9.0.0 | ||||
Defined in GHC.Generics Associated Types
| |||||
Read a => Read (Maybe a) | Since: base-2.1 | ||||
Show a => Show (Maybe a) | Since: base-2.1 | ||||
Binary a => Binary (Maybe a) | |||||
NFData a => NFData (Maybe a) | |||||
Defined in Control.DeepSeq | |||||
Binary a => Binary (Maybe a) Source # | |||||
Outputable a => Outputable (Maybe a) Source # | |||||
Eq (DeBruijn a) => Eq (DeBruijn (Maybe a)) Source # | |||||
Eq a => Eq (Maybe a) | Since: base-2.1 | ||||
Ord a => Ord (Maybe a) | Since: base-2.1 | ||||
SingI ('Nothing :: Maybe a) | Since: base-4.9.0.0 | ||||
Defined in GHC.Generics | |||||
SingI a2 => SingI ('Just a2 :: Maybe a1) | Since: base-4.9.0.0 | ||||
Defined in GHC.Generics | |||||
type Rep1 Maybe | Since: base-4.6.0.0 | ||||
type DemoteRep (Maybe a) | |||||
Defined in GHC.Generics | |||||
type Rep (Maybe a) | Since: base-4.6.0.0 | ||||
Defined in GHC.Generics | |||||
data Sing (b :: Maybe a) | |||||
type Anno (Maybe Role) Source # | |||||
type Anno (Maybe Role) Source # | |||||
Instances
MonadFail IO | Since: base-4.9.0.0 |
MonadFix IO | Since: base-2.1 |
MonadIO IO | Since: base-4.9.0.0 |
Alternative IO | Takes the first non-throwing Since: base-4.9.0.0 |
Applicative IO | Since: base-2.1 |
Functor IO | Since: base-2.1 |
Monad IO | Since: base-2.1 |
MonadPlus IO | Takes the first non-throwing Since: base-4.9.0.0 |
GHCiSandboxIO IO | Since: base-4.4.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 | |
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 # | |
Monoid a => Monoid (IO a) | Since: base-4.9.0.0 |
Semigroup a => Semigroup (IO a) | Since: base-4.10.0.0 |
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 |
Instances
Data Bool | Since: base-4.0.0.0 | ||||
Defined in Data.Data Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Bool -> c Bool Source # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Bool Source # toConstr :: Bool -> Constr Source # dataTypeOf :: Bool -> DataType Source # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Bool) Source # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Bool) Source # gmapT :: (forall b. Data b => b -> b) -> Bool -> Bool Source # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Bool -> r Source # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Bool -> r Source # gmapQ :: (forall d. Data d => d -> u) -> Bool -> [u] Source # gmapQi :: Int -> (forall d. Data d => d -> u) -> Bool -> u Source # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Bool -> m Bool Source # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Bool -> m Bool Source # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Bool -> m Bool Source # | |||||
Storable Bool | Since: base-2.1 | ||||
Defined in Foreign.Storable Methods sizeOf :: Bool -> Int Source # alignment :: Bool -> Int Source # peekElemOff :: Ptr Bool -> Int -> IO Bool Source # pokeElemOff :: Ptr Bool -> Int -> Bool -> IO () Source # peekByteOff :: Ptr b -> Int -> IO Bool Source # pokeByteOff :: Ptr b -> Int -> Bool -> IO () Source # | |||||
Bits Bool | Interpret Since: base-4.7.0.0 | ||||
Defined in GHC.Bits Methods (.&.) :: Bool -> Bool -> Bool Source # (.|.) :: Bool -> Bool -> Bool Source # xor :: Bool -> Bool -> Bool Source # complement :: Bool -> Bool Source # shift :: Bool -> Int -> Bool Source # rotate :: Bool -> Int -> Bool Source # setBit :: Bool -> Int -> Bool Source # clearBit :: Bool -> Int -> Bool Source # complementBit :: Bool -> Int -> Bool Source # testBit :: Bool -> Int -> Bool Source # bitSizeMaybe :: Bool -> Maybe Int Source # bitSize :: Bool -> Int Source # isSigned :: Bool -> Bool Source # shiftL :: Bool -> Int -> Bool Source # unsafeShiftL :: Bool -> Int -> Bool Source # shiftR :: Bool -> Int -> Bool Source # unsafeShiftR :: Bool -> Int -> Bool Source # rotateL :: Bool -> Int -> Bool Source # | |||||
FiniteBits Bool | Since: base-4.7.0.0 | ||||
Bounded Bool | Since: base-2.1 | ||||
Enum Bool | Since: base-2.1 | ||||
Generic Bool | |||||
Defined in GHC.Generics | |||||
SingKind Bool | Since: base-4.9.0.0 | ||||
Defined in GHC.Generics Associated Types
| |||||
Ix Bool | Since: base-2.1 | ||||
Read Bool | Since: base-2.1 | ||||
Show Bool | Since: base-2.1 | ||||
Binary Bool | |||||
NFData Bool | |||||
Defined in Control.DeepSeq | |||||
ToJExpr Bool Source # | |||||
Binary Bool Source # | |||||
Outputable Bool Source # | |||||
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 | Since: base-4.9.0.0 | ||||
Defined in GHC.Generics | |||||
SingI 'True | Since: base-4.9.0.0 | ||||
Defined in GHC.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 DemoteRep Bool | |||||
Defined in GHC.Generics | |||||
type Rep Bool | Since: base-4.6.0.0 | ||||
data Sing (a :: Bool) | |||||
type Anno Bool Source # | |||||
Defined in GHC.Hs.Decls |
Instances
Data Double | Since: base-4.0.0.0 | ||||
Defined in Data.Data Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Double -> c Double Source # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Double Source # toConstr :: Double -> Constr Source # dataTypeOf :: Double -> DataType Source # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Double) Source # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Double) Source # gmapT :: (forall b. Data b => b -> b) -> Double -> Double Source # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Double -> r Source # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Double -> r Source # gmapQ :: (forall d. Data d => d -> u) -> Double -> [u] Source # gmapQi :: Int -> (forall d. Data d => d -> u) -> Double -> u Source # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Double -> m Double Source # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Double -> m Double Source # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Double -> m Double Source # | |||||
Storable Double | Since: base-2.1 | ||||
Defined in Foreign.Storable Methods sizeOf :: Double -> Int Source # alignment :: Double -> Int Source # peekElemOff :: Ptr Double -> Int -> IO Double Source # pokeElemOff :: Ptr Double -> Int -> Double -> IO () Source # peekByteOff :: Ptr b -> Int -> IO Double Source # pokeByteOff :: Ptr b -> Int -> Double -> IO () Source # | |||||
Floating Double | Since: base-2.1 | ||||
Defined in GHC.Float Methods exp :: Double -> Double Source # log :: Double -> Double Source # sqrt :: Double -> Double Source # (**) :: Double -> Double -> Double Source # logBase :: Double -> Double -> Double Source # sin :: Double -> Double Source # cos :: Double -> Double Source # tan :: Double -> Double Source # asin :: Double -> Double Source # acos :: Double -> Double Source # atan :: Double -> Double Source # sinh :: Double -> Double Source # cosh :: Double -> Double Source # tanh :: Double -> Double Source # asinh :: Double -> Double Source # acosh :: Double -> Double Source # atanh :: Double -> Double Source # log1p :: Double -> Double Source # expm1 :: Double -> Double Source # | |||||
RealFloat Double | Since: base-2.1 | ||||
Defined in GHC.Float Methods floatRadix :: Double -> Integer Source # floatDigits :: Double -> Int Source # floatRange :: Double -> (Int, Int) Source # decodeFloat :: Double -> (Integer, Int) Source # encodeFloat :: Integer -> Int -> Double Source # exponent :: Double -> Int Source # significand :: Double -> Double Source # scaleFloat :: Int -> Double -> Double Source # isNaN :: Double -> Bool Source # isInfinite :: Double -> Bool Source # isDenormalized :: Double -> Bool Source # isNegativeZero :: Double -> Bool Source # | |||||
Read Double | Since: base-2.1 | ||||
PrintfArg Double | Since: base-2.1 | ||||
Defined in Text.Printf Methods formatArg :: Double -> FieldFormatter Source # parseFormat :: Double -> ModifierParser Source # | |||||
Binary Double | |||||
NFData Double | |||||
Defined in Control.DeepSeq | |||||
ToJExpr Double Source # | |||||
Outputable Double Source # | |||||
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.Generics Associated Types
| |||||
Foldable (UDouble :: Type -> Type) | Since: base-4.9.0.0 | ||||
Defined in Data.Foldable Methods fold :: Monoid m => UDouble m -> m Source # foldMap :: Monoid m => (a -> m) -> UDouble a -> m Source # foldMap' :: Monoid m => (a -> m) -> UDouble a -> m Source # foldr :: (a -> b -> b) -> b -> UDouble a -> b Source # foldr' :: (a -> b -> b) -> b -> UDouble a -> b Source # foldl :: (b -> a -> b) -> b -> UDouble a -> b Source # foldl' :: (b -> a -> b) -> b -> UDouble a -> b Source # foldr1 :: (a -> a -> a) -> UDouble a -> a Source # foldl1 :: (a -> a -> a) -> UDouble a -> a Source # toList :: UDouble a -> [a] Source # null :: UDouble a -> Bool Source # length :: UDouble a -> Int Source # elem :: Eq a => a -> UDouble a -> Bool Source # maximum :: Ord a => UDouble a -> a Source # minimum :: Ord a => UDouble a -> a Source # | |||||
Traversable (UDouble :: Type -> Type) | Since: base-4.9.0.0 | ||||
Defined in Data.Traversable | |||||
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) | Since: base-4.9.0.0 | ||||
Generic (URec Double p) | |||||
Defined in GHC.Generics Associated Types
| |||||
Show (URec Double p) | Since: base-4.9.0.0 | ||||
Eq (URec Double p) | Since: base-4.9.0.0 | ||||
Ord (URec Double p) | Since: base-4.9.0.0 | ||||
Defined in GHC.Generics Methods compare :: URec Double p -> URec Double p -> Ordering # (<) :: URec Double p -> URec Double p -> Bool # (<=) :: URec Double p -> URec Double p -> Bool # (>) :: URec Double p -> URec Double p -> Bool # (>=) :: URec Double p -> URec Double p -> Bool # | |||||
data URec Double (p :: k) | Used for marking occurrences of Since: base-4.9.0.0 | ||||
type Rep1 (URec Double :: k -> Type) | Since: base-4.9.0.0 | ||||
Defined in GHC.Generics | |||||
type Rep (URec Double p) | Since: base-4.9.0.0 | ||||
Defined in GHC.Generics |
Instances
Data Word | Since: base-4.0.0.0 | ||||
Defined in Data.Data Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Word -> c Word Source # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Word Source # toConstr :: Word -> Constr Source # dataTypeOf :: Word -> DataType Source # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Word) Source # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Word) Source # gmapT :: (forall b. Data b => b -> b) -> Word -> Word Source # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Word -> r Source # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Word -> r Source # gmapQ :: (forall d. Data d => d -> u) -> Word -> [u] Source # gmapQi :: Int -> (forall d. Data d => d -> u) -> Word -> u Source # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Word -> m Word Source # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Word -> m Word Source # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Word -> m Word Source # | |||||
Storable Word | Since: base-2.1 | ||||
Defined in Foreign.Storable Methods sizeOf :: Word -> Int Source # alignment :: Word -> Int Source # peekElemOff :: Ptr Word -> Int -> IO Word Source # pokeElemOff :: Ptr Word -> Int -> Word -> IO () Source # peekByteOff :: Ptr b -> Int -> IO Word Source # pokeByteOff :: Ptr b -> Int -> Word -> IO () Source # | |||||
Bits Word | Since: base-2.1 | ||||
Defined in GHC.Bits Methods (.&.) :: Word -> Word -> Word Source # (.|.) :: Word -> Word -> Word Source # xor :: Word -> Word -> Word Source # complement :: Word -> Word Source # shift :: Word -> Int -> Word Source # rotate :: Word -> Int -> Word Source # setBit :: Word -> Int -> Word Source # clearBit :: Word -> Int -> Word Source # complementBit :: Word -> Int -> Word Source # testBit :: Word -> Int -> Bool Source # bitSizeMaybe :: Word -> Maybe Int Source # bitSize :: Word -> Int Source # isSigned :: Word -> Bool Source # shiftL :: Word -> Int -> Word Source # unsafeShiftL :: Word -> Int -> Word Source # shiftR :: Word -> Int -> Word Source # unsafeShiftR :: Word -> Int -> Word Source # rotateL :: Word -> Int -> Word Source # | |||||
FiniteBits Word | Since: base-4.6.0.0 | ||||
Bounded Word | Since: base-2.1 | ||||
Enum Word | Since: base-2.1 | ||||
Ix Word | Since: base-4.6.0.0 | ||||
Num Word | Since: base-2.1 | ||||
Read Word | Since: base-4.5.0.0 | ||||
Integral Word | Since: base-2.1 | ||||
Defined in GHC.Real | |||||
Real Word | Since: base-2.1 | ||||
Show Word | Since: base-2.1 | ||||
PrintfArg Word | Since: base-2.1 | ||||
Defined in Text.Printf | |||||
Binary Word | |||||
NFData Word | |||||
Defined in Control.DeepSeq | |||||
Outputable Word Source # | |||||
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.Generics Associated Types
| |||||
Foldable (UWord :: Type -> Type) | Since: base-4.9.0.0 | ||||
Defined in Data.Foldable Methods fold :: Monoid m => UWord m -> m Source # foldMap :: Monoid m => (a -> m) -> UWord a -> m Source # foldMap' :: Monoid m => (a -> m) -> UWord a -> m Source # foldr :: (a -> b -> b) -> b -> UWord a -> b Source # foldr' :: (a -> b -> b) -> b -> UWord a -> b Source # foldl :: (b -> a -> b) -> b -> UWord a -> b Source # foldl' :: (b -> a -> b) -> b -> UWord a -> b Source # foldr1 :: (a -> a -> a) -> UWord a -> a Source # foldl1 :: (a -> a -> a) -> UWord a -> a Source # toList :: UWord a -> [a] Source # null :: UWord a -> Bool Source # length :: UWord a -> Int Source # elem :: Eq a => a -> UWord a -> Bool Source # maximum :: Ord a => UWord a -> a Source # minimum :: Ord a => UWord a -> a Source # | |||||
Traversable (UWord :: Type -> Type) | Since: base-4.9.0.0 | ||||
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) | Since: base-4.9.0.0 | ||||
Generic (URec Word p) | |||||
Defined in GHC.Generics Associated Types
| |||||
Show (URec Word p) | Since: base-4.9.0.0 | ||||
Eq (URec Word p) | Since: base-4.9.0.0 | ||||
Ord (URec Word p) | Since: base-4.9.0.0 | ||||
Defined in GHC.Generics | |||||
data URec Word (p :: k) | Used for marking occurrences of Since: base-4.9.0.0 | ||||
type Rep1 (URec Word :: k -> Type) | Since: base-4.9.0.0 | ||||
Defined in GHC.Generics | |||||
type Rep (URec Word p) | Since: base-4.9.0.0 | ||||
Defined in GHC.Generics |
Instances
Data Ordering | Since: base-4.0.0.0 |
Defined in Data.Data Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Ordering -> c Ordering Source # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Ordering Source # toConstr :: Ordering -> Constr Source # dataTypeOf :: Ordering -> DataType Source # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Ordering) Source # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Ordering) Source # gmapT :: (forall b. Data b => b -> b) -> Ordering -> Ordering Source # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Ordering -> r Source # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Ordering -> r Source # gmapQ :: (forall d. Data d => d -> u) -> Ordering -> [u] Source # gmapQi :: Int -> (forall d. Data d => d -> u) -> Ordering -> u Source # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Ordering -> m Ordering Source # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Ordering -> m Ordering Source # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Ordering -> m Ordering Source # | |
Monoid Ordering | Since: base-2.1 |
Semigroup Ordering | Since: base-4.9.0.0 |
Bounded Ordering | Since: base-2.1 |
Enum Ordering | Since: base-2.1 |
Defined in GHC.Enum Methods succ :: Ordering -> Ordering Source # pred :: Ordering -> Ordering Source # toEnum :: Int -> Ordering Source # fromEnum :: Ordering -> Int Source # enumFrom :: Ordering -> [Ordering] Source # enumFromThen :: Ordering -> Ordering -> [Ordering] Source # enumFromTo :: Ordering -> Ordering -> [Ordering] Source # enumFromThenTo :: Ordering -> Ordering -> Ordering -> [Ordering] Source # | |
Generic Ordering | |
Defined in GHC.Generics | |
Ix Ordering | Since: base-2.1 |
Defined in GHC.Ix | |
Read Ordering | Since: base-2.1 |
Show Ordering | Since: base-2.1 |
Binary Ordering | |
NFData Ordering | |
Defined in Control.DeepSeq | |
Outputable Ordering Source # | |
Eq Ordering | |
Ord Ordering | |
Defined in GHC.Classes | |
type Rep Ordering | Since: base-4.6.0.0 |
Instances
Data Integer | Since: base-4.0.0.0 |
Defined in Data.Data Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Integer -> c Integer Source # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Integer Source # toConstr :: Integer -> Constr Source # dataTypeOf :: Integer -> DataType Source # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Integer) Source # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Integer) Source # gmapT :: (forall b. Data b => b -> b) -> Integer -> Integer Source # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Integer -> r Source # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Integer -> r Source # gmapQ :: (forall d. Data d => d -> u) -> Integer -> [u] Source # gmapQi :: Int -> (forall d. Data d => d -> u) -> Integer -> u Source # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Integer -> m Integer Source # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Integer -> m Integer Source # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Integer -> m Integer Source # | |
Bits Integer | Since: base-2.1 |
Defined in GHC.Bits Methods (.&.) :: Integer -> Integer -> Integer Source # (.|.) :: Integer -> Integer -> Integer Source # xor :: Integer -> Integer -> Integer Source # complement :: Integer -> Integer Source # shift :: Integer -> Int -> Integer Source # rotate :: Integer -> Int -> Integer Source # bit :: Int -> Integer Source # setBit :: Integer -> Int -> Integer Source # clearBit :: Integer -> Int -> Integer Source # complementBit :: Integer -> Int -> Integer Source # testBit :: Integer -> Int -> Bool Source # bitSizeMaybe :: Integer -> Maybe Int Source # bitSize :: Integer -> Int Source # isSigned :: Integer -> Bool Source # shiftL :: Integer -> Int -> Integer Source # unsafeShiftL :: Integer -> Int -> Integer Source # shiftR :: Integer -> Int -> Integer Source # unsafeShiftR :: Integer -> Int -> Integer Source # rotateL :: Integer -> Int -> Integer Source # | |
Enum Integer | Since: base-2.1 |
Defined in GHC.Enum Methods succ :: Integer -> Integer Source # pred :: Integer -> Integer Source # toEnum :: Int -> Integer Source # fromEnum :: Integer -> Int Source # enumFrom :: Integer -> [Integer] Source # enumFromThen :: Integer -> Integer -> [Integer] Source # enumFromTo :: Integer -> Integer -> [Integer] Source # enumFromThenTo :: Integer -> Integer -> Integer -> [Integer] Source # | |
Ix Integer | Since: base-2.1 |
Num Integer | Since: base-2.1 |
Defined in GHC.Num | |
Read Integer | Since: base-2.1 |
Integral Integer | Since: base-2.0.1 |
Defined in GHC.Real Methods quot :: Integer -> Integer -> Integer Source # rem :: Integer -> Integer -> Integer Source # div :: Integer -> Integer -> Integer Source # mod :: Integer -> Integer -> Integer Source # quotRem :: Integer -> Integer -> (Integer, Integer) Source # | |
Real Integer | Since: base-2.0.1 |
Show Integer | Since: base-2.1 |
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 # | |
Eq Integer | |
Ord Integer | |
HpcHash Integer | |
Lift Integer | |
The Either
type represents values with two possibilities: a value of
type
is either Either
a b
or Left
a
.Right
b
The Either
type is sometimes used to represent a value which is
either correct or an error; by convention, the Left
constructor is
used to hold an error value and the Right
constructor is used to
hold a correct value (mnemonic: "right" also means "correct").
Examples
The type
is the type of values which can be either
a Either
String
Int
String
or an Int
. The Left
constructor can be used only on
String
s, and the Right
constructor can be used only on Int
s:
>>>
let s = Left "foo" :: Either String Int
>>>
s
Left "foo">>>
let n = Right 3 :: Either String Int
>>>
n
Right 3>>>
:type s
s :: Either String Int>>>
:type n
n :: Either String Int
The fmap
from our Functor
instance will ignore Left
values, but
will apply the supplied function to values contained in a Right
:
>>>
let s = Left "foo" :: Either String Int
>>>
let n = Right 3 :: Either String Int
>>>
fmap (*2) s
Left "foo">>>
fmap (*2) n
Right 6
The Monad
instance for Either
allows us to chain together multiple
actions which may fail, and fail overall if any of the individual
steps failed. First we'll write a function that can either parse an
Int
from a Char
, or fail.
>>>
import Data.Char ( digitToInt, isDigit )
>>>
:{
let parseEither :: Char -> Either String Int parseEither c | isDigit c = Right (digitToInt c) | otherwise = Left "parse error">>>
:}
The following should work, since both '1'
and '2'
can be
parsed as Int
s.
>>>
:{
let parseMultiple :: Either String Int parseMultiple = do x <- parseEither '1' y <- parseEither '2' return (x + y)>>>
:}
>>>
parseMultiple
Right 3
But the following should fail overall, since the first operation where
we attempt to parse 'm'
as an Int
will fail:
>>>
:{
let parseMultiple :: Either String Int parseMultiple = do x <- parseEither 'm' y <- parseEither '2' return (x + y)>>>
:}
>>>
parseMultiple
Left "parse error"
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.Generics Associated Types
| |||||
(Lift a, Lift b) => Lift (Either a b :: Type) | |||||
MonadFix (Either e) | Since: base-4.3.0.0 | ||||
Foldable (Either a) | Since: base-4.7.0.0 | ||||
Defined in Data.Foldable Methods fold :: Monoid m => Either a m -> m Source # foldMap :: Monoid m => (a0 -> m) -> Either a a0 -> m Source # foldMap' :: Monoid m => (a0 -> m) -> Either a a0 -> m Source # foldr :: (a0 -> b -> b) -> b -> Either a a0 -> b Source # foldr' :: (a0 -> b -> b) -> b -> Either a a0 -> b Source # foldl :: (b -> a0 -> b) -> b -> Either a a0 -> b Source # foldl' :: (b -> a0 -> b) -> b -> Either a a0 -> b Source # foldr1 :: (a0 -> a0 -> a0) -> Either a a0 -> a0 Source # foldl1 :: (a0 -> a0 -> a0) -> Either a a0 -> a0 Source # toList :: Either a a0 -> [a0] Source # null :: Either a a0 -> Bool Source # length :: Either a a0 -> Int Source # elem :: Eq a0 => a0 -> Either a a0 -> Bool Source # maximum :: Ord a0 => Either a a0 -> a0 Source # minimum :: Ord a0 => Either a a0 -> a0 Source # | |||||
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 | ||||
Traversable (Either a) | Since: base-4.7.0.0 | ||||
Defined in Data.Traversable Methods traverse :: Applicative f => (a0 -> f b) -> Either a a0 -> f (Either a b) Source # sequenceA :: Applicative f => Either a (f a0) -> f (Either a a0) Source # mapM :: Monad m => (a0 -> m b) -> Either a a0 -> m (Either a b) Source # sequence :: Monad m => Either a (m a0) -> m (Either a a0) Source # | |||||
Applicative (Either e) | Since: base-3.0 | ||||
Defined in Data.Either | |||||
Functor (Either a) | Since: base-3.0 | ||||
Monad (Either e) | Since: base-4.4.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 | |||||
(Data a, Data b) => Data (Either a b) | Since: base-4.0.0.0 | ||||
Defined in Data.Data Methods gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> Either a b -> c (Either a b) Source # gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Either a b) Source # toConstr :: Either a b -> Constr Source # dataTypeOf :: Either a b -> DataType Source # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Either a b)) Source # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Either a b)) Source # gmapT :: (forall b0. Data b0 => b0 -> b0) -> Either a b -> Either a b Source # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Either a b -> r Source # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Either a b -> r Source # gmapQ :: (forall d. Data d => d -> u) -> Either a b -> [u] Source # gmapQi :: Int -> (forall d. Data d => d -> u) -> Either a b -> u Source # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Either a b -> m (Either a b) Source # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Either a b -> m (Either a b) Source # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Either a b -> m (Either a b) Source # | |||||
Semigroup (Either a b) | Since: base-4.9.0.0 | ||||
Generic (Either a b) | |||||
Defined in GHC.Generics Associated Types
| |||||
(Read a, Read b) => Read (Either a b) | Since: base-3.0 | ||||
(Show a, Show b) => Show (Either a b) | Since: base-3.0 | ||||
(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 # | |||||
(Eq a, Eq b) => Eq (Either a b) | Since: base-2.1 | ||||
(Ord a, Ord b) => Ord (Either a b) | Since: base-2.1 | ||||
type Rep1 (Either a :: Type -> Type) | Since: base-4.6.0.0 | ||||
Defined in GHC.Generics type Rep1 (Either a :: Type -> Type) = D1 ('MetaData "Either" "Data.Either" "base" 'False) (C1 ('MetaCons "Left" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)) :+: C1 ('MetaCons "Right" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1)) | |||||
type Rep (Either a b) | Since: base-4.6.0.0 | ||||
Defined in GHC.Generics type Rep (Either a b) = D1 ('MetaData "Either" "Data.Either" "base" 'False) (C1 ('MetaCons "Left" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)) :+: C1 ('MetaCons "Right" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 b))) |
concat :: Foldable t => t [a] -> [a] Source #
The concatenation of all the elements of a container of lists.
Examples
Basic usage:
>>>
concat (Just [1, 2, 3])
[1,2,3]
>>>
concat (Left 42)
[]
>>>
concat [[1, 2, 3], [4, 5], [6], []]
[1,2,3,4,5,6]
class Foldable (t :: Type -> Type) where Source #
The Foldable class represents data structures that can be reduced to a summary value one element at a time. Strict left-associative folds are a good fit for space-efficient reduction, while lazy right-associative folds are a good fit for corecursive iteration, or for folds that short-circuit after processing an initial subsequence of the structure's elements.
Instances can be derived automatically by enabling the DeriveFoldable
extension. For example, a derived instance for a binary tree might be:
{-# LANGUAGE DeriveFoldable #-} data Tree a = Empty | Leaf a | Node (Tree a) a (Tree a) deriving Foldable
A more detailed description can be found in the Overview section of Data.Foldable.
For the class laws see the Laws section of Data.Foldable.
Methods
foldMap :: Monoid m => (a -> m) -> t a -> m Source #
Map each element of the structure into a monoid, and combine the
results with (
. This fold is right-associative and lazy in the
accumulator. For strict left-associative folds consider <>
)foldMap'
instead.
Examples
Basic usage:
>>>
foldMap Sum [1, 3, 5]
Sum {getSum = 9}
>>>
foldMap Product [1, 3, 5]
Product {getProduct = 15}
>>>
foldMap (replicate 3) [1, 2, 3]
[1,1,1,2,2,2,3,3,3]
When a Monoid's (
is lazy in its second argument, <>
)foldMap
can
return a result even from an unbounded structure. For example, lazy
accumulation enables Data.ByteString.Builder to efficiently serialise
large data structures and produce the output incrementally:
>>>
import qualified Data.ByteString.Lazy as L
>>>
import qualified Data.ByteString.Builder as B
>>>
let bld :: Int -> B.Builder; bld i = B.intDec i <> B.word8 0x20
>>>
let lbs = B.toLazyByteString $ foldMap bld [0..]
>>>
L.take 64 lbs
"0 1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 21 22 23 24"
foldr :: (a -> b -> b) -> b -> t a -> b Source #
Right-associative fold of a structure, lazy in the accumulator.
In the case of lists, foldr
, when applied to a binary operator, a
starting value (typically the right-identity of the operator), and a
list, reduces the list using the binary operator, from right to left:
foldr f z [x1, x2, ..., xn] == x1 `f` (x2 `f` ... (xn `f` z)...)
Note that since the head of the resulting expression is produced by an
application of the operator to the first element of the list, given an
operator lazy in its right argument, foldr
can produce a terminating
expression from an unbounded list.
For a general Foldable
structure this should be semantically identical
to,
foldr f z =foldr
f z .toList
Examples
Basic usage:
>>>
foldr (||) False [False, True, False]
True
>>>
foldr (||) False []
False
>>>
foldr (\c acc -> acc ++ [c]) "foo" ['a', 'b', 'c', 'd']
"foodcba"
Infinite structures
⚠️ Applying foldr
to infinite structures usually doesn't terminate.
It may still terminate under one of the following conditions:
- the folding function is short-circuiting
- the folding function is lazy on its second argument
Short-circuiting
(
short-circuits on ||
)True
values, so the following terminates
because there is a True
value finitely far from the left side:
>>>
foldr (||) False (True : repeat False)
True
But the following doesn't terminate:
>>>
foldr (||) False (repeat False ++ [True])
* Hangs forever *
Laziness in the second argument
Applying foldr
to infinite structures terminates when the operator is
lazy in its second argument (the initial accumulator is never used in
this case, and so could be left undefined
, but []
is more clear):
>>>
take 5 $ foldr (\i acc -> i : fmap (+3) acc) [] (repeat 1)
[1,4,7,10,13]
foldl :: (b -> a -> b) -> b -> t a -> b Source #
Left-associative fold of a structure, lazy in the accumulator. This is rarely what you want, but can work well for structures with efficient right-to-left sequencing and an operator that is lazy in its left argument.
In the case of lists, foldl
, when applied to a binary operator, a
starting value (typically the left-identity of the operator), and a
list, reduces the list using the binary operator, from left to right:
foldl f z [x1, x2, ..., xn] == (...((z `f` x1) `f` x2) `f`...) `f` xn
Note that to produce the outermost application of the operator the
entire input list must be traversed. Like all left-associative folds,
foldl
will diverge if given an infinite list.
If you want an efficient strict left-fold, you probably want to use
foldl'
instead of foldl
. The reason for this is that the latter
does not force the inner results (e.g. z `f` x1
in the above
example) before applying them to the operator (e.g. to (`f` x2)
).
This results in a thunk chain O(n) elements long, which then must be
evaluated from the outside-in.
For a general Foldable
structure this should be semantically identical
to:
foldl f z =foldl
f z .toList
Examples
The first example is a strict fold, which in practice is best performed
with foldl'
.
>>>
foldl (+) 42 [1,2,3,4]
52
Though the result below is lazy, the input is reversed before prepending it to the initial accumulator, so corecursion begins only after traversing the entire input string.
>>>
foldl (\acc c -> c : acc) "abcd" "efgh"
"hgfeabcd"
A left fold of a structure that is infinite on the right cannot terminate, even when for any finite input the fold just returns the initial accumulator:
>>>
foldl (\a _ -> a) 0 $ repeat 1
* Hangs forever *
WARNING: When it comes to lists, you always want to use either foldl'
or foldr
instead.
foldl' :: (b -> a -> b) -> b -> t a -> b Source #
Left-associative fold of a structure but with strict application of the operator.
This ensures that each step of the fold is forced to Weak Head Normal
Form before being applied, avoiding the collection of thunks that would
otherwise occur. This is often what you want to strictly reduce a
finite structure to a single strict result (e.g. sum
).
For a general Foldable
structure this should be semantically identical
to,
foldl' f z =foldl'
f z .toList
Since: base-4.6.0.0
foldr1 :: (a -> a -> a) -> t a -> a Source #
A variant of foldr
that has no base case,
and thus may only be applied to non-empty structures.
This function is non-total and will raise a runtime exception if the structure happens to be empty.
Examples
Basic usage:
>>>
foldr1 (+) [1..4]
10
>>>
foldr1 (+) []
Exception: Prelude.foldr1: empty list
>>>
foldr1 (+) Nothing
*** Exception: foldr1: empty structure
>>>
foldr1 (-) [1..4]
-2
>>>
foldr1 (&&) [True, False, True, True]
False
>>>
foldr1 (||) [False, False, True, True]
True
>>>
foldr1 (+) [1..]
* Hangs forever *
foldl1 :: (a -> a -> a) -> t a -> a Source #
A variant of foldl
that has no base case,
and thus may only be applied to non-empty structures.
This function is non-total and will raise a runtime exception if the structure happens to be empty.
foldl1
f =foldl1
f .toList
Examples
Basic usage:
>>>
foldl1 (+) [1..4]
10
>>>
foldl1 (+) []
*** Exception: Prelude.foldl1: empty list
>>>
foldl1 (+) Nothing
*** Exception: foldl1: empty structure
>>>
foldl1 (-) [1..4]
-8
>>>
foldl1 (&&) [True, False, True, True]
False
>>>
foldl1 (||) [False, False, True, True]
True
>>>
foldl1 (+) [1..]
* Hangs forever *
Test whether the structure is empty. The default implementation is Left-associative and lazy in both the initial element and the accumulator. Thus optimised for structures where the first element can be accessed in constant time. Structures where this is not the case should have a non-default implementation.
Examples
Basic usage:
>>>
null []
True
>>>
null [1]
False
null
is expected to terminate even for infinite structures.
The default implementation terminates provided the structure
is bounded on the left (there is a leftmost element).
>>>
null [1..]
False
Since: base-4.8.0.0
Returns the size/length of a finite structure as an Int
. The
default implementation just counts elements starting with the leftmost.
Instances for structures that can compute the element count faster
than via element-by-element counting, should provide a specialised
implementation.
Examples
Basic usage:
>>>
length []
0
>>>
length ['a', 'b', 'c']
3>>>
length [1..]
* Hangs forever *
Since: base-4.8.0.0
elem :: Eq a => a -> t a -> Bool infix 4 Source #
Does the element occur in the structure?
Note: elem
is often used in infix form.
Examples
Basic usage:
>>>
3 `elem` []
False
>>>
3 `elem` [1,2]
False
>>>
3 `elem` [1,2,3,4,5]
True
For infinite structures, the default implementation of elem
terminates if the sought-after value exists at a finite distance
from the left side of the structure:
>>>
3 `elem` [1..]
True
>>>
3 `elem` ([4..] ++ [3])
* Hangs forever *
Since: base-4.8.0.0
maximum :: Ord a => t a -> a Source #
The largest element of a non-empty structure.
This function is non-total and will raise a runtime exception if the structure happens to be empty. A structure that supports random access and maintains its elements in order should provide a specialised implementation to return the maximum in faster than linear time.
Examples
Basic usage:
>>>
maximum [1..10]
10
>>>
maximum []
*** Exception: Prelude.maximum: empty list
>>>
maximum Nothing
*** Exception: maximum: empty structure
WARNING: This function is partial for possibly-empty structures like lists.
Since: base-4.8.0.0
minimum :: Ord a => t a -> a Source #
The least element of a non-empty structure.
This function is non-total and will raise a runtime exception if the structure happens to be empty. A structure that supports random access and maintains its elements in order should provide a specialised implementation to return the minimum in faster than linear time.
Examples
Basic usage:
>>>
minimum [1..10]
1
>>>
minimum []
*** Exception: Prelude.minimum: empty list
>>>
minimum Nothing
*** Exception: minimum: empty structure
WARNING: This function is partial for possibly-empty structures like lists.
Since: base-4.8.0.0
sum :: Num a => t a -> a Source #
The sum
function computes the sum of the numbers of a structure.
Examples
Basic usage:
>>>
sum []
0
>>>
sum [42]
42
>>>
sum [1..10]
55
>>>
sum [4.1, 2.0, 1.7]
7.8
>>>
sum [1..]
* Hangs forever *
Since: base-4.8.0.0
product :: Num a => t a -> a Source #
The product
function computes the product of the numbers of a
structure.
Examples
Basic usage:
>>>
product []
1
>>>
product [42]
42
>>>
product [1..10]
3628800
>>>
product [4.1, 2.0, 1.7]
13.939999999999998
>>>
product [1..]
* Hangs forever *
Since: base-4.8.0.0
Instances
Foldable ZipList | Since: base-4.9.0.0 |
Defined in Control.Applicative Methods fold :: Monoid m => ZipList m -> m Source # foldMap :: Monoid m => (a -> m) -> ZipList a -> m Source # foldMap' :: Monoid m => (a -> m) -> ZipList a -> m Source # foldr :: (a -> b -> b) -> b -> ZipList a -> b Source # foldr' :: (a -> b -> b) -> b -> ZipList a -> b Source # foldl :: (b -> a -> b) -> b -> ZipList a -> b Source # foldl' :: (b -> a -> b) -> b -> ZipList a -> b Source # foldr1 :: (a -> a -> a) -> ZipList a -> a Source # foldl1 :: (a -> a -> a) -> ZipList a -> a Source # toList :: ZipList a -> [a] Source # null :: ZipList a -> Bool Source # length :: ZipList a -> Int Source # elem :: Eq a => a -> ZipList a -> Bool Source # maximum :: Ord a => ZipList a -> a Source # minimum :: Ord a => ZipList a -> a Source # | |
Foldable Complex | Since: base-4.9.0.0 |
Defined in Data.Complex Methods fold :: Monoid m => Complex m -> m Source # foldMap :: Monoid m => (a -> m) -> Complex a -> m Source # foldMap' :: Monoid m => (a -> m) -> Complex a -> m Source # foldr :: (a -> b -> b) -> b -> Complex a -> b Source # foldr' :: (a -> b -> b) -> b -> Complex a -> b Source # foldl :: (b -> a -> b) -> b -> Complex a -> b Source # foldl' :: (b -> a -> b) -> b -> Complex a -> b Source # foldr1 :: (a -> a -> a) -> Complex a -> a Source # foldl1 :: (a -> a -> a) -> Complex a -> a Source # toList :: Complex a -> [a] Source # null :: Complex a -> Bool Source # length :: Complex a -> Int Source # elem :: Eq a => a -> Complex a -> Bool Source # maximum :: Ord a => Complex a -> a Source # minimum :: Ord a => Complex a -> a Source # | |
Foldable Identity | Since: base-4.8.0.0 |
Defined in Data.Functor.Identity Methods fold :: Monoid m => Identity m -> m Source # foldMap :: Monoid m => (a -> m) -> Identity a -> m Source # foldMap' :: Monoid m => (a -> m) -> Identity a -> m Source # foldr :: (a -> b -> b) -> b -> Identity a -> b Source # foldr' :: (a -> b -> b) -> b -> Identity a -> b Source # foldl :: (b -> a -> b) -> b -> Identity a -> b Source # foldl' :: (b -> a -> b) -> b -> Identity a -> b Source # foldr1 :: (a -> a -> a) -> Identity a -> a Source # foldl1 :: (a -> a -> a) -> Identity a -> a Source # toList :: Identity a -> [a] Source # null :: Identity a -> Bool Source # length :: Identity a -> Int Source # elem :: Eq a => a -> Identity a -> Bool Source # maximum :: Ord a => Identity a -> a Source # minimum :: Ord a => Identity a -> a Source # | |
Foldable First | Since: base-4.8.0.0 |
Defined in Data.Foldable Methods fold :: Monoid m => First m -> m Source # foldMap :: Monoid m => (a -> m) -> First a -> m Source # foldMap' :: Monoid m => (a -> m) -> First a -> m Source # foldr :: (a -> b -> b) -> b -> First a -> b Source # foldr' :: (a -> b -> b) -> b -> First a -> b Source # foldl :: (b -> a -> b) -> b -> First a -> b Source # foldl' :: (b -> a -> b) -> b -> First a -> b Source # foldr1 :: (a -> a -> a) -> First a -> a Source # foldl1 :: (a -> a -> a) -> First a -> a Source # toList :: First a -> [a] Source # null :: First a -> Bool Source # length :: First a -> Int Source # elem :: Eq a => a -> First a -> Bool Source # maximum :: Ord a => First a -> a Source # minimum :: Ord a => First a -> a Source # | |
Foldable Last | Since: base-4.8.0.0 |
Defined in Data.Foldable Methods fold :: Monoid m => Last m -> m Source # foldMap :: Monoid m => (a -> m) -> Last a -> m Source # foldMap' :: Monoid m => (a -> m) -> Last a -> m Source # foldr :: (a -> b -> b) -> b -> Last a -> b Source # foldr' :: (a -> b -> b) -> b -> Last a -> b Source # foldl :: (b -> a -> b) -> b -> Last a -> b Source # foldl' :: (b -> a -> b) -> b -> Last a -> b Source # foldr1 :: (a -> a -> a) -> Last a -> a Source # foldl1 :: (a -> a -> a) -> Last a -> a Source # toList :: Last a -> [a] Source # null :: Last a -> Bool Source # length :: Last a -> Int Source # elem :: Eq a => a -> Last a -> Bool Source # maximum :: Ord a => Last a -> a Source # minimum :: Ord a => Last a -> a Source # | |
Foldable Down | Since: base-4.12.0.0 |
Defined in Data.Foldable Methods fold :: Monoid m => Down m -> m Source # foldMap :: Monoid m => (a -> m) -> Down a -> m Source # foldMap' :: Monoid m => (a -> m) -> Down a -> m Source # foldr :: (a -> b -> b) -> b -> Down a -> b Source # foldr' :: (a -> b -> b) -> b -> Down a -> b Source # foldl :: (b -> a -> b) -> b -> Down a -> b Source # foldl' :: (b -> a -> b) -> b -> Down a -> b Source # foldr1 :: (a -> a -> a) -> Down a -> a Source # foldl1 :: (a -> a -> a) -> Down a -> a Source # toList :: Down a -> [a] Source # null :: Down a -> Bool Source # length :: Down a -> Int Source # elem :: Eq a => a -> Down a -> Bool Source # maximum :: Ord a => Down a -> a Source # minimum :: Ord a => Down a -> a Source # | |
Foldable First | Since: base-4.9.0.0 |
Defined in Data.Semigroup Methods fold :: Monoid m => First m -> m Source # foldMap :: Monoid m => (a -> m) -> First a -> m Source # foldMap' :: Monoid m => (a -> m) -> First a -> m Source # foldr :: (a -> b -> b) -> b -> First a -> b Source # foldr' :: (a -> b -> b) -> b -> First a -> b Source # foldl :: (b -> a -> b) -> b -> First a -> b Source # foldl' :: (b -> a -> b) -> b -> First a -> b Source # foldr1 :: (a -> a -> a) -> First a -> a Source # foldl1 :: (a -> a -> a) -> First a -> a Source # toList :: First a -> [a] Source # null :: First a -> Bool Source # length :: First a -> Int Source # elem :: Eq a => a -> First a -> Bool Source # maximum :: Ord a => First a -> a Source # minimum :: Ord a => First a -> a Source # | |
Foldable Last | Since: base-4.9.0.0 |
Defined in Data.Semigroup Methods fold :: Monoid m => Last m -> m Source # foldMap :: Monoid m => (a -> m) -> Last a -> m Source # foldMap' :: Monoid m => (a -> m) -> Last a -> m Source # foldr :: (a -> b -> b) -> b -> Last a -> b Source # foldr' :: (a -> b -> b) -> b -> Last a -> b Source # foldl :: (b -> a -> b) -> b -> Last a -> b Source # foldl' :: (b -> a -> b) -> b -> Last a -> b Source # foldr1 :: (a -> a -> a) -> Last a -> a Source # foldl1 :: (a -> a -> a) -> Last a -> a Source # toList :: Last a -> [a] Source # null :: Last a -> Bool Source # length :: Last a -> Int Source # elem :: Eq a => a -> Last a -> Bool Source # maximum :: Ord a => Last a -> a Source # minimum :: Ord a => Last a -> a Source # | |
Foldable Max | Since: base-4.9.0.0 |
Defined in Data.Semigroup Methods fold :: Monoid m => Max m -> m Source # foldMap :: Monoid m => (a -> m) -> Max a -> m Source # foldMap' :: Monoid m => (a -> m) -> Max a -> m Source # foldr :: (a -> b -> b) -> b -> Max a -> b Source # foldr' :: (a -> b -> b) -> b -> Max a -> b Source # foldl :: (b -> a -> b) -> b -> Max a -> b Source # foldl' :: (b -> a -> b) -> b -> Max a -> b Source # foldr1 :: (a -> a -> a) -> Max a -> a Source # foldl1 :: (a -> a -> a) -> Max a -> a Source # toList :: Max a -> [a] Source # null :: Max a -> Bool Source # length :: Max a -> Int Source # elem :: Eq a => a -> Max a -> Bool Source # maximum :: Ord a => Max a -> a Source # minimum :: Ord a => Max a -> a Source # | |
Foldable Min | Since: base-4.9.0.0 |
Defined in Data.Semigroup Methods fold :: Monoid m => Min m -> m Source # foldMap :: Monoid m => (a -> m) -> Min a -> m Source # foldMap' :: Monoid m => (a -> m) -> Min a -> m Source # foldr :: (a -> b -> b) -> b -> Min a -> b Source # foldr' :: (a -> b -> b) -> b -> Min a -> b Source # foldl :: (b -> a -> b) -> b -> Min a -> b Source # foldl' :: (b -> a -> b) -> b -> Min a -> b Source # foldr1 :: (a -> a -> a) -> Min a -> a Source # foldl1 :: (a -> a -> a) -> Min a -> a Source # toList :: Min a -> [a] Source # null :: Min a -> Bool Source # length :: Min a -> Int Source # elem :: Eq a => a -> Min a -> Bool Source # maximum :: Ord a => Min a -> a Source # minimum :: Ord a => Min a -> a Source # | |
Foldable Dual | Since: base-4.8.0.0 |
Defined in Data.Foldable Methods fold :: Monoid m => Dual m -> m Source # foldMap :: Monoid m => (a -> m) -> Dual a -> m Source # foldMap' :: Monoid m => (a -> m) -> Dual a -> m Source # foldr :: (a -> b -> b) -> b -> Dual a -> b Source # foldr' :: (a -> b -> b) -> b -> Dual a -> b Source # foldl :: (b -> a -> b) -> b -> Dual a -> b Source # foldl' :: (b -> a -> b) -> b -> Dual a -> b Source # foldr1 :: (a -> a -> a) -> Dual a -> a Source # foldl1 :: (a -> a -> a) -> Dual a -> a Source # toList :: Dual a -> [a] Source # null :: Dual a -> Bool Source # length :: Dual a -> Int Source # elem :: Eq a => a -> Dual a -> Bool Source # maximum :: Ord a => Dual a -> a Source # minimum :: Ord a => Dual a -> a Source # | |
Foldable Product | Since: base-4.8.0.0 |
Defined in Data.Foldable Methods fold :: Monoid m => Product m -> m Source # foldMap :: Monoid m => (a -> m) -> Product a -> m Source # foldMap' :: Monoid m => (a -> m) -> Product a -> m Source # foldr :: (a -> b -> b) -> b -> Product a -> b Source # foldr' :: (a -> b -> b) -> b -> Product a -> b Source # foldl :: (b -> a -> b) -> b -> Product a -> b Source # foldl' :: (b -> a -> b) -> b -> Product a -> b Source # foldr1 :: (a -> a -> a) -> Product a -> a Source # foldl1 :: (a -> a -> a) -> Product a -> a Source # toList :: Product a -> [a] Source # null :: Product a -> Bool Source # length :: Product a -> Int Source # elem :: Eq a => a -> Product a -> Bool Source # maximum :: Ord a => Product a -> a Source # minimum :: Ord a => Product a -> a Source # | |
Foldable Sum | Since: base-4.8.0.0 |
Defined in Data.Foldable Methods fold :: Monoid m => Sum m -> m Source # foldMap :: Monoid m => (a -> m) -> Sum a -> m Source # foldMap' :: Monoid m => (a -> m) -> Sum a -> m Source # foldr :: (a -> b -> b) -> b -> Sum a -> b Source # foldr' :: (a -> b -> b) -> b -> Sum a -> b Source # foldl :: (b -> a -> b) -> b -> Sum a -> b Source # foldl' :: (b -> a -> b) -> b -> Sum a -> b Source # foldr1 :: (a -> a -> a) -> Sum a -> a Source # foldl1 :: (a -> a -> a) -> Sum a -> a Source # toList :: Sum a -> [a] Source # null :: Sum a -> Bool Source # length :: Sum a -> Int Source # elem :: Eq a => a -> Sum a -> Bool Source # maximum :: Ord a => Sum a -> a Source # minimum :: Ord a => Sum a -> a Source # | |
Foldable NonEmpty | Since: base-4.9.0.0 |
Defined in Data.Foldable Methods fold :: Monoid m => NonEmpty m -> m Source # foldMap :: Monoid m => (a -> m) -> NonEmpty a -> m Source # foldMap' :: Monoid m => (a -> m) -> NonEmpty a -> m Source # foldr :: (a -> b -> b) -> b -> NonEmpty a -> b Source # foldr' :: (a -> b -> b) -> b -> NonEmpty a -> b Source # foldl :: (b -> a -> b) -> b -> NonEmpty a -> b Source # foldl' :: (b -> a -> b) -> b -> NonEmpty a -> b Source # foldr1 :: (a -> a -> a) -> NonEmpty a -> a Source # foldl1 :: (a -> a -> a) -> NonEmpty a -> a Source # toList :: NonEmpty a -> [a] Source # null :: NonEmpty a -> Bool Source # length :: NonEmpty a -> Int Source # elem :: Eq a => a -> NonEmpty a -> Bool Source # maximum :: Ord a => NonEmpty a -> a Source # minimum :: Ord a => NonEmpty a -> a Source # | |
Foldable Par1 | Since: base-4.9.0.0 |
Defined in Data.Foldable Methods fold :: Monoid m => Par1 m -> m Source # foldMap :: Monoid m => (a -> m) -> Par1 a -> m Source # foldMap' :: Monoid m => (a -> m) -> Par1 a -> m Source # foldr :: (a -> b -> b) -> b -> Par1 a -> b Source # foldr' :: (a -> b -> b) -> b -> Par1 a -> b Source # foldl :: (b -> a -> b) -> b -> Par1 a -> b Source # foldl' :: (b -> a -> b) -> b -> Par1 a -> b Source # foldr1 :: (a -> a -> a) -> Par1 a -> a Source # foldl1 :: (a -> a -> a) -> Par1 a -> a Source # toList :: Par1 a -> [a] Source # null :: Par1 a -> Bool Source # length :: Par1 a -> Int Source # elem :: Eq a => a -> Par1 a -> Bool Source # maximum :: Ord a => Par1 a -> a Source # minimum :: Ord a => Par1 a -> a Source # | |
Foldable SCC | Since: containers-0.5.9 |
Defined in Data.Graph Methods fold :: Monoid m => SCC m -> m Source # foldMap :: Monoid m => (a -> m) -> SCC a -> m Source # foldMap' :: Monoid m => (a -> m) -> SCC a -> m Source # foldr :: (a -> b -> b) -> b -> SCC a -> b Source # foldr' :: (a -> b -> b) -> b -> SCC a -> b Source # foldl :: (b -> a -> b) -> b -> SCC a -> b Source # foldl' :: (b -> a -> b) -> b -> SCC a -> b Source # foldr1 :: (a -> a -> a) -> SCC a -> a Source # foldl1 :: (a -> a -> a) -> SCC a -> a Source # toList :: SCC a -> [a] Source # null :: SCC a -> Bool Source # length :: SCC a -> Int Source # elem :: Eq a => a -> SCC a -> Bool Source # maximum :: Ord a => SCC a -> a Source # minimum :: Ord a => SCC a -> a Source # | |
Foldable IntMap | Folds in order of increasing key. |
Defined in Data.IntMap.Internal Methods fold :: Monoid m => IntMap m -> m Source # foldMap :: Monoid m => (a -> m) -> IntMap a -> m Source # foldMap' :: Monoid m => (a -> m) -> IntMap a -> m Source # foldr :: (a -> b -> b) -> b -> IntMap a -> b Source # foldr' :: (a -> b -> b) -> b -> IntMap a -> b Source # foldl :: (b -> a -> b) -> b -> IntMap a -> b Source # foldl' :: (b -> a -> b) -> b -> IntMap a -> b Source # foldr1 :: (a -> a -> a) -> IntMap a -> a Source # foldl1 :: (a -> a -> a) -> IntMap a -> a Source # toList :: IntMap a -> [a] Source # null :: IntMap a -> Bool Source # length :: IntMap a -> Int Source # elem :: Eq a => a -> IntMap a -> Bool Source # maximum :: Ord a => IntMap a -> a Source # minimum :: Ord a => IntMap a -> a Source # | |
Foldable Digit | |
Defined in Data.Sequence.Internal Methods fold :: Monoid m => Digit m -> m Source # foldMap :: Monoid m => (a -> m) -> Digit a -> m Source # foldMap' :: Monoid m => (a -> m) -> Digit a -> m Source # foldr :: (a -> b -> b) -> b -> Digit a -> b Source # foldr' :: (a -> b -> b) -> b -> Digit a -> b Source # foldl :: (b -> a -> b) -> b -> Digit a -> b Source # foldl' :: (b -> a -> b) -> b -> Digit a -> b Source # foldr1 :: (a -> a -> a) -> Digit a -> a Source # foldl1 :: (a -> a -> a) -> Digit a -> a Source # toList :: Digit a -> [a] Source # null :: Digit a -> Bool Source # length :: Digit a -> Int Source # elem :: Eq a => a -> Digit a -> Bool Source # maximum :: Ord a => Digit a -> a Source # minimum :: Ord a => Digit a -> a Source # | |
Foldable Elem | |
Defined in Data.Sequence.Internal Methods fold :: Monoid m => Elem m -> m Source # foldMap :: Monoid m => (a -> m) -> Elem a -> m Source # foldMap' :: Monoid m => (a -> m) -> Elem a -> m Source # foldr :: (a -> b -> b) -> b -> Elem a -> b Source # foldr' :: (a -> b -> b) -> b -> Elem a -> b Source # foldl :: (b -> a -> b) -> b -> Elem a -> b Source # foldl' :: (b -> a -> b) -> b -> Elem a -> b Source # foldr1 :: (a -> a -> a) -> Elem a -> a Source # foldl1 :: (a -> a -> a) -> Elem a -> a Source # toList :: Elem a -> [a] Source # null :: Elem a -> Bool Source # length :: Elem a -> Int Source # elem :: Eq a => a -> Elem a -> Bool Source # maximum :: Ord a => Elem a -> a Source # minimum :: Ord a => Elem a -> a Source # | |
Foldable FingerTree | |
Defined in Data.Sequence.Internal Methods fold :: Monoid m => FingerTree m -> m Source # foldMap :: Monoid m => (a -> m) -> FingerTree a -> m Source # foldMap' :: Monoid m => (a -> m) -> FingerTree a -> m Source # foldr :: (a -> b -> b) -> b -> FingerTree a -> b Source # foldr' :: (a -> b -> b) -> b -> FingerTree a -> b Source # foldl :: (b -> a -> b) -> b -> FingerTree a -> b Source # foldl' :: (b -> a -> b) -> b -> FingerTree a -> b Source # foldr1 :: (a -> a -> a) -> FingerTree a -> a Source # foldl1 :: (a -> a -> a) -> FingerTree a -> a Source # toList :: FingerTree a -> [a] Source # null :: FingerTree a -> Bool Source # length :: FingerTree a -> Int Source # elem :: Eq a => a -> FingerTree a -> Bool Source # maximum :: Ord a => FingerTree a -> a Source # minimum :: Ord a => FingerTree a -> a Source # sum :: Num a => FingerTree a -> a Source # product :: Num a => FingerTree a -> a Source # | |
Foldable Node | |
Defined in Data.Sequence.Internal Methods fold :: Monoid m => Node m -> m Source # foldMap :: Monoid m => (a -> m) -> Node a -> m Source # foldMap' :: Monoid m => (a -> m) -> Node a -> m Source # foldr :: (a -> b -> b) -> b -> Node a -> b Source # foldr' :: (a -> b -> b) -> b -> Node a -> b Source # foldl :: (b -> a -> b) -> b -> Node a -> b Source # foldl' :: (b -> a -> b) -> b -> Node a -> b Source # foldr1 :: (a -> a -> a) -> Node a -> a Source # foldl1 :: (a -> a -> a) -> Node a -> a Source # toList :: Node a -> [a] Source # null :: Node a -> Bool Source # length :: Node a -> Int Source # elem :: Eq a => a -> Node a -> Bool Source # maximum :: Ord a => Node a -> a Source # minimum :: Ord a => Node a -> a Source # | |
Foldable Seq | |
Defined in Data.Sequence.Internal Methods fold :: Monoid m => Seq m -> m Source # foldMap :: Monoid m => (a -> m) -> Seq a -> m Source # foldMap' :: Monoid m => (a -> m) -> Seq a -> m Source # foldr :: (a -> b -> b) -> b -> Seq a -> b Source # foldr' :: (a -> b -> b) -> b -> Seq a -> b Source # foldl :: (b -> a -> b) -> b -> Seq a -> b Source # foldl' :: (b -> a -> b) -> b -> Seq a -> b Source # foldr1 :: (a -> a -> a) -> Seq a -> a Source # foldl1 :: (a -> a -> a) -> Seq a -> a Source # toList :: Seq a -> [a] Source # null :: Seq a -> Bool Source # length :: Seq a -> Int Source # elem :: Eq a => a -> Seq a -> Bool Source # maximum :: Ord a => Seq a -> a Source # minimum :: Ord a => Seq a -> a Source # | |
Foldable ViewL | |
Defined in Data.Sequence.Internal Methods fold :: Monoid m => ViewL m -> m Source # foldMap :: Monoid m => (a -> m) -> ViewL a -> m Source # foldMap' :: Monoid m => (a -> m) -> ViewL a -> m Source # foldr :: (a -> b -> b) -> b -> ViewL a -> b Source # foldr' :: (a -> b -> b) -> b -> ViewL a -> b Source # foldl :: (b -> a -> b) -> b -> ViewL a -> b Source # foldl' :: (b -> a -> b) -> b -> ViewL a -> b Source # foldr1 :: (a -> a -> a) -> ViewL a -> a Source # foldl1 :: (a -> a -> a) -> ViewL a -> a Source # toList :: ViewL a -> [a] Source # null :: ViewL a -> Bool Source # length :: ViewL a -> Int Source # elem :: Eq a => a -> ViewL a -> Bool Source # maximum :: Ord a => ViewL a -> a Source # minimum :: Ord a => ViewL a -> a Source # | |
Foldable ViewR | |
Defined in Data.Sequence.Internal Methods fold :: Monoid m => ViewR m -> m Source # foldMap :: Monoid m => (a -> m) -> ViewR a -> m Source # foldMap' :: Monoid m => (a -> m) -> ViewR a -> m Source # foldr :: (a -> b -> b) -> b -> ViewR a -> b Source # foldr' :: (a -> b -> b) -> b -> ViewR a -> b Source # foldl :: (b -> a -> b) -> b -> ViewR a -> b Source # foldl' :: (b -> a -> b) -> b -> ViewR a -> b Source # foldr1 :: (a -> a -> a) -> ViewR a -> a Source # foldl1 :: (a -> a -> a) -> ViewR a -> a Source # toList :: ViewR a -> [a] Source # null :: ViewR a -> Bool Source # length :: ViewR a -> Int Source # elem :: Eq a => a -> ViewR a -> Bool Source # maximum :: Ord a => ViewR a -> a Source # minimum :: Ord a => ViewR a -> a Source # | |
Foldable Set | Folds in order of increasing key. |
Defined in Data.Set.Internal Methods fold :: Monoid m => Set m -> m Source # foldMap :: Monoid m => (a -> m) -> Set a -> m Source # foldMap' :: Monoid m => (a -> m) -> Set a -> m Source # foldr :: (a -> b -> b) -> b -> Set a -> b Source # foldr' :: (a -> b -> b) -> b -> Set a -> b Source # foldl :: (b -> a -> b) -> b -> Set a -> b Source # foldl' :: (b -> a -> b) -> b -> Set a -> b Source # foldr1 :: (a -> a -> a) -> Set a -> a Source # foldl1 :: (a -> a -> a) -> Set a -> a Source # toList :: Set a -> [a] Source # null :: Set a -> Bool Source # length :: Set a -> Int Source # elem :: Eq a => a -> Set a -> Bool Source # maximum :: Ord a => Set a -> a Source # minimum :: Ord a => Set a -> a Source # | |
Foldable Tree | Folds in preorder |
Defined in Data.Tree Methods fold :: Monoid m => Tree m -> m Source # foldMap :: Monoid m => (a -> m) -> Tree a -> m Source # foldMap' :: Monoid m => (a -> m) -> Tree a -> m Source # foldr :: (a -> b -> b) -> b -> Tree a -> b Source # foldr' :: (a -> b -> b) -> b -> Tree a -> b Source # foldl :: (b -> a -> b) -> b -> Tree a -> b Source # foldl' :: (b -> a -> b) -> b -> Tree a -> b Source # foldr1 :: (a -> a -> a) -> Tree a -> a Source # foldl1 :: (a -> a -> a) -> Tree a -> a Source # toList :: Tree a -> [a] Source # null :: Tree a -> Bool Source # length :: Tree a -> Int Source # elem :: Eq a => a -> Tree a -> Bool Source # maximum :: Ord a => Tree a -> a Source # minimum :: Ord a => Tree a -> a Source # | |
Foldable UniqueMap Source # | |
Defined in GHC.Cmm.Dataflow.Collections Methods fold :: Monoid m => UniqueMap m -> m Source # foldMap :: Monoid m => (a -> m) -> UniqueMap a -> m Source # foldMap' :: Monoid m => (a -> m) -> UniqueMap a -> m Source # foldr :: (a -> b -> b) -> b -> UniqueMap a -> b Source # foldr' :: (a -> b -> b) -> b -> UniqueMap a -> b Source # foldl :: (b -> a -> b) -> b -> UniqueMap a -> b Source # foldl' :: (b -> a -> b) -> b -> UniqueMap a -> b Source # foldr1 :: (a -> a -> a) -> UniqueMap a -> a Source # foldl1 :: (a -> a -> a) -> UniqueMap a -> a Source # toList :: UniqueMap a -> [a] Source # null :: UniqueMap a -> Bool Source # length :: UniqueMap a -> Int Source # elem :: Eq a => a -> UniqueMap a -> Bool Source # maximum :: Ord a => UniqueMap a -> a Source # minimum :: Ord a => UniqueMap a -> a Source # | |
Foldable LabelMap Source # | |
Defined in GHC.Cmm.Dataflow.Label Methods fold :: Monoid m => LabelMap m -> m Source # foldMap :: Monoid m => (a -> m) -> LabelMap a -> m Source # foldMap' :: Monoid m => (a -> m) -> LabelMap a -> m Source # foldr :: (a -> b -> b) -> b -> LabelMap a -> b Source # foldr' :: (a -> b -> b) -> b -> LabelMap a -> b Source # foldl :: (b -> a -> b) -> b -> LabelMap a -> b Source # foldl' :: (b -> a -> b) -> b -> LabelMap a -> b Source # foldr1 :: (a -> a -> a) -> LabelMap a -> a Source # foldl1 :: (a -> a -> a) -> LabelMap a -> a Source # toList :: LabelMap a -> [a] Source # null :: LabelMap a -> Bool Source # length :: LabelMap a -> Int Source # elem :: Eq a => a -> LabelMap a -> Bool Source # maximum :: Ord a => LabelMap a -> a Source # minimum :: Ord a => LabelMap a -> a Source # | |
Foldable Bag Source # | |
Defined in GHC.Data.Bag Methods fold :: Monoid m => Bag m -> m Source # foldMap :: Monoid m => (a -> m) -> Bag a -> m Source # foldMap' :: Monoid m => (a -> m) -> Bag a -> m Source # foldr :: (a -> b -> b) -> b -> Bag a -> b Source # foldr' :: (a -> b -> b) -> b -> Bag a -> b Source # foldl :: (b -> a -> b) -> b -> Bag a -> b Source # foldl' :: (b -> a -> b) -> b -> Bag a -> b Source # foldr1 :: (a -> a -> a) -> Bag a -> a Source # foldl1 :: (a -> a -> a) -> Bag a -> a Source # toList :: Bag a -> [a] Source # null :: Bag a -> Bool Source # length :: Bag a -> Int Source # elem :: Eq a => a -> Bag a -> Bool Source # maximum :: Ord a => Bag a -> a Source # minimum :: Ord a => Bag a -> a Source # | |
Foldable BooleanFormula Source # | |
Defined in GHC.Data.BooleanFormula Methods fold :: Monoid m => BooleanFormula m -> m Source # foldMap :: Monoid m => (a -> m) -> BooleanFormula a -> m Source # foldMap' :: Monoid m => (a -> m) -> BooleanFormula a -> m Source # foldr :: (a -> b -> b) -> b -> BooleanFormula a -> b Source # foldr' :: (a -> b -> b) -> b -> BooleanFormula a -> b Source # foldl :: (b -> a -> b) -> b -> BooleanFormula a -> b Source # foldl' :: (b -> a -> b) -> b -> BooleanFormula a -> b Source # foldr1 :: (a -> a -> a) -> BooleanFormula a -> a Source # foldl1 :: (a -> a -> a) -> BooleanFormula a -> a Source # toList :: BooleanFormula a -> [a] Source # null :: BooleanFormula a -> Bool Source # length :: BooleanFormula a -> Int Source # elem :: Eq a => a -> BooleanFormula a -> Bool Source # maximum :: Ord a => BooleanFormula a -> a Source # minimum :: Ord a => BooleanFormula a -> a Source # sum :: Num a => BooleanFormula a -> a Source # product :: Num a => BooleanFormula a -> a Source # | |
Foldable Infinite Source # | |
Defined in GHC.Data.List.Infinite Methods fold :: Monoid m => Infinite m -> m Source # foldMap :: Monoid m => (a -> m) -> Infinite a -> m Source # foldMap' :: Monoid m => (a -> m) -> Infinite a -> m Source # foldr :: (a -> b -> b) -> b -> Infinite a -> b Source # foldr' :: (a -> b -> b) -> b -> Infinite a -> b Source # foldl :: (b -> a -> b) -> b -> Infinite a -> b Source # foldl' :: (b -> a -> b) -> b -> Infinite a -> b Source # foldr1 :: (a -> a -> a) -> Infinite a -> a Source # foldl1 :: (a -> a -> a) -> Infinite a -> a Source # toList :: Infinite a -> [a] Source # null :: Infinite a -> Bool Source # length :: Infinite a -> Int Source # elem :: Eq a => a -> Infinite a -> Bool Source # maximum :: Ord a => Infinite a -> a Source # minimum :: Ord a => Infinite a -> a Source # | |
Foldable OrdList Source # | |
Defined in GHC.Data.OrdList Methods fold :: Monoid m => OrdList m -> m Source # foldMap :: Monoid m => (a -> m) -> OrdList a -> m Source # foldMap' :: Monoid m => (a -> m) -> OrdList a -> m Source # foldr :: (a -> b -> b) -> b -> OrdList a -> b Source # foldr' :: (a -> b -> b) -> b -> OrdList a -> b Source # foldl :: (b -> a -> b) -> b -> OrdList a -> b Source # foldl' :: (b -> a -> b) -> b -> OrdList a -> b Source # foldr1 :: (a -> a -> a) -> OrdList a -> a Source # foldl1 :: (a -> a -> a) -> OrdList a -> a Source # toList :: OrdList a -> [a] Source # null :: OrdList a -> Bool Source # length :: OrdList a -> Int Source # elem :: Eq a => a -> OrdList a -> Bool Source # maximum :: Ord a => OrdList a -> a Source # minimum :: Ord a => OrdList a -> a Source # | |
Foldable Pair Source # | |
Defined in GHC.Data.Pair Methods fold :: Monoid m => Pair m -> m Source # foldMap :: Monoid m => (a -> m) -> Pair a -> m Source # foldMap' :: Monoid m => (a -> m) -> Pair a -> m Source # foldr :: (a -> b -> b) -> b -> Pair a -> b Source # foldr' :: (a -> b -> b) -> b -> Pair a -> b Source # foldl :: (b -> a -> b) -> b -> Pair a -> b Source # foldl' :: (b -> a -> b) -> b -> Pair a -> b Source # foldr1 :: (a -> a -> a) -> Pair a -> a Source # foldl1 :: (a -> a -> a) -> Pair a -> a Source # toList :: Pair a -> [a] Source # null :: Pair a -> Bool Source # length :: Pair a -> Int Source # elem :: Eq a => a -> Pair a -> Bool Source # maximum :: Ord a => Pair a -> a Source # minimum :: Ord a => Pair a -> a Source # | |
Foldable Maybe Source # | |
Defined in GHC.Data.Strict Methods fold :: Monoid m => Maybe m -> m Source # foldMap :: Monoid m => (a -> m) -> Maybe a -> m Source # foldMap' :: Monoid m => (a -> m) -> Maybe a -> m Source # foldr :: (a -> b -> b) -> b -> Maybe a -> b Source # foldr' :: (a -> b -> b) -> b -> Maybe a -> b Source # foldl :: (b -> a -> b) -> b -> Maybe a -> b Source # foldl' :: (b -> a -> b) -> b -> Maybe a -> b Source # foldr1 :: (a -> a -> a) -> Maybe a -> a Source # foldl1 :: (a -> a -> a) -> Maybe a -> a Source # toList :: Maybe a -> [a] Source # null :: Maybe a -> Bool Source # length :: Maybe a -> Int Source # elem :: Eq a => a -> Maybe a -> Bool Source # maximum :: Ord a => Maybe a -> a Source # minimum :: Ord a => Maybe a -> a Source # | |
Foldable ModNodeMap Source # | |
Defined in GHC.Driver.Make Methods fold :: Monoid m => ModNodeMap m -> m Source # foldMap :: Monoid m => (a -> m) -> ModNodeMap a -> m Source # foldMap' :: Monoid m => (a -> m) -> ModNodeMap a -> m Source # foldr :: (a -> b -> b) -> b -> ModNodeMap a -> b Source # foldr' :: (a -> b -> b) -> b -> ModNodeMap a -> b Source # foldl :: (b -> a -> b) -> b -> ModNodeMap a -> b Source # foldl' :: (b -> a -> b) -> b -> ModNodeMap a -> b Source # foldr1 :: (a -> a -> a) -> ModNodeMap a -> a Source # foldl1 :: (a -> a -> a) -> ModNodeMap a -> a Source # toList :: ModNodeMap a -> [a] Source # null :: ModNodeMap a -> Bool Source # length :: ModNodeMap a -> Int Source # elem :: Eq a => a -> ModNodeMap a -> Bool Source # maximum :: Ord a => ModNodeMap a -> a Source # minimum :: Ord a => ModNodeMap a -> a Source # sum :: Num a => ModNodeMap a -> a Source # product :: Num a => ModNodeMap a -> a Source # | |
Foldable HieAST Source # | |
Defined in GHC.Iface.Ext.Types Methods fold :: Monoid m => HieAST m -> m Source # foldMap :: Monoid m => (a -> m) -> HieAST a -> m Source # foldMap' :: Monoid m => (a -> m) -> HieAST a -> m Source # foldr :: (a -> b -> b) -> b -> HieAST a -> b Source # foldr' :: (a -> b -> b) -> b -> HieAST a -> b Source # foldl :: (b -> a -> b) -> b -> HieAST a -> b Source # foldl' :: (b -> a -> b) -> b -> HieAST a -> b Source # foldr1 :: (a -> a -> a) -> HieAST a -> a Source # foldl1 :: (a -> a -> a) -> HieAST a -> a Source # toList :: HieAST a -> [a] Source # null :: HieAST a -> Bool Source # length :: HieAST a -> Int Source # elem :: Eq a => a -> HieAST a -> Bool Source # maximum :: Ord a => HieAST a -> a Source # minimum :: Ord a => HieAST a -> a Source # | |
Foldable HieASTs Source # | |
Defined in GHC.Iface.Ext.Types Methods fold :: Monoid m => HieASTs m -> m Source # foldMap :: Monoid m => (a -> m) -> HieASTs a -> m Source # foldMap' :: Monoid m => (a -> m) -> HieASTs a -> m Source # foldr :: (a -> b -> b) -> b -> HieASTs a -> b Source # foldr' :: (a -> b -> b) -> b -> HieASTs a -> b Source # foldl :: (b -> a -> b) -> b -> HieASTs a -> b Source # foldl' :: (b -> a -> b) -> b -> HieASTs a -> b Source # foldr1 :: (a -> a -> a) -> HieASTs a -> a Source # foldl1 :: (a -> a -> a) -> HieASTs a -> a Source # toList :: HieASTs a -> [a] Source # null :: HieASTs a -> Bool Source # length :: HieASTs a -> Int Source # elem :: Eq a => a -> HieASTs a -> Bool Source # maximum :: Ord a => HieASTs a -> a Source # minimum :: Ord a => HieASTs a -> a Source # | |
Foldable HieArgs Source # | |
Defined in GHC.Iface.Ext.Types Methods fold :: Monoid m => HieArgs m -> m Source # foldMap :: Monoid m => (a -> m) -> HieArgs a -> m Source # foldMap' :: Monoid m => (a -> m) -> HieArgs a -> m Source # foldr :: (a -> b -> b) -> b -> HieArgs a -> b Source # foldr' :: (a -> b -> b) -> b -> HieArgs a -> b Source # foldl :: (b -> a -> b) -> b -> HieArgs a -> b Source # foldl' :: (b -> a -> b) -> b -> HieArgs a -> b Source # foldr1 :: (a -> a -> a) -> HieArgs a -> a Source # foldl1 :: (a -> a -> a) -> HieArgs a -> a Source # toList :: HieArgs a -> [a] Source # null :: HieArgs a -> Bool Source # length :: HieArgs a -> Int Source # elem :: Eq a => a -> HieArgs a -> Bool Source # maximum :: Ord a => HieArgs a -> a Source # minimum :: Ord a => HieArgs a -> a Source # | |
Foldable HieType Source # | |
Defined in GHC.Iface.Ext.Types Methods fold :: Monoid m => HieType m -> m Source # foldMap :: Monoid m => (a -> m) -> HieType a -> m Source # foldMap' :: Monoid m => (a -> m) -> HieType a -> m Source # foldr :: (a -> b -> b) -> b -> HieType a -> b Source # foldr' :: (a -> b -> b) -> b -> HieType a -> b Source # foldl :: (b -> a -> b) -> b -> HieType a -> b Source # foldl' :: (b -> a -> b) -> b -> HieType a -> b Source # foldr1 :: (a -> a -> a) -> HieType a -> a Source # foldl1 :: (a -> a -> a) -> HieType a -> a Source # toList :: HieType a -> [a] Source # null :: HieType a -> Bool Source # length :: HieType a -> Int Source # elem :: Eq a => a -> HieType a -> Bool Source # maximum :: Ord a => HieType a -> a Source # minimum :: Ord a => HieType a -> a Source # | |
Foldable IdentifierDetails Source # | |
Defined in GHC.Iface.Ext.Types Methods fold :: Monoid m => IdentifierDetails m -> m Source # foldMap :: Monoid m => (a -> m) -> IdentifierDetails a -> m Source # foldMap' :: Monoid m => (a -> m) -> IdentifierDetails a -> m Source # foldr :: (a -> b -> b) -> b -> IdentifierDetails a -> b Source # foldr' :: (a -> b -> b) -> b -> IdentifierDetails a -> b Source # foldl :: (b -> a -> b) -> b -> IdentifierDetails a -> b Source # foldl' :: (b -> a -> b) -> b -> IdentifierDetails a -> b Source # foldr1 :: (a -> a -> a) -> IdentifierDetails a -> a Source # foldl1 :: (a -> a -> a) -> IdentifierDetails a -> a Source # toList :: IdentifierDetails a -> [a] Source # null :: IdentifierDetails a -> Bool Source # length :: IdentifierDetails a -> Int Source # elem :: Eq a => a -> IdentifierDetails a -> Bool Source # maximum :: Ord a => IdentifierDetails a -> a Source # minimum :: Ord a => IdentifierDetails a -> a Source # sum :: Num a => IdentifierDetails a -> a Source # product :: Num a => IdentifierDetails a -> a Source # | |
Foldable NodeInfo Source # | |
Defined in GHC.Iface.Ext.Types Methods fold :: Monoid m => NodeInfo m -> m Source # foldMap :: Monoid m => (a -> m) -> NodeInfo a -> m Source # foldMap' :: Monoid m => (a -> m) -> NodeInfo a -> m Source # foldr :: (a -> b -> b) -> b -> NodeInfo a -> b Source # foldr' :: (a -> b -> b) -> b -> NodeInfo a -> b Source # foldl :: (b -> a -> b) -> b -> NodeInfo a -> b Source # foldl' :: (b -> a -> b) -> b -> NodeInfo a -> b Source # foldr1 :: (a -> a -> a) -> NodeInfo a -> a Source # foldl1 :: (a -> a -> a) -> NodeInfo a -> a Source # toList :: NodeInfo a -> [a] Source # null :: NodeInfo a -> Bool Source # length :: NodeInfo a -> Int Source # elem :: Eq a => a -> NodeInfo a -> Bool Source # maximum :: Ord a => NodeInfo a -> a Source # minimum :: Ord a => NodeInfo a -> a Source # | |
Foldable SourcedNodeInfo Source # | |
Defined in GHC.Iface.Ext.Types Methods fold :: Monoid m => SourcedNodeInfo m -> m Source # foldMap :: Monoid m => (a -> m) -> SourcedNodeInfo a -> m Source # foldMap' :: Monoid m => (a -> m) -> SourcedNodeInfo a -> m Source # foldr :: (a -> b -> b) -> b -> SourcedNodeInfo a -> b Source # foldr' :: (a -> b -> b) -> b -> SourcedNodeInfo a -> b Source # foldl :: (b -> a -> b) -> b -> SourcedNodeInfo a -> b Source # foldl' :: (b -> a -> b) -> b -> SourcedNodeInfo a -> b Source # foldr1 :: (a -> a -> a) -> SourcedNodeInfo a -> a Source # foldl1 :: (a -> a -> a) -> SourcedNodeInfo a -> a Source # toList :: SourcedNodeInfo a -> [a] Source # null :: SourcedNodeInfo a -> Bool Source # length :: SourcedNodeInfo a -> Int Source # elem :: Eq a => a -> SourcedNodeInfo a -> Bool Source # maximum :: Ord a => SourcedNodeInfo a -> a Source # minimum :: Ord a => SourcedNodeInfo a -> a Source # sum :: Num a => SourcedNodeInfo a -> a Source # product :: Num a => SourcedNodeInfo a -> a Source # | |
Foldable Messages Source # | |
Defined in GHC.Types.Error Methods fold :: Monoid m => Messages m -> m Source # foldMap :: Monoid m => (a -> m) -> Messages a -> m Source # foldMap' :: Monoid m => (a -> m) -> Messages a -> m Source # foldr :: (a -> b -> b) -> b -> Messages a -> b Source # foldr' :: (a -> b -> b) -> b -> Messages a -> b Source # foldl :: (b -> a -> b) -> b -> Messages a -> b Source # foldl' :: (b -> a -> b) -> b -> Messages a -> b Source # foldr1 :: (a -> a -> a) -> Messages a -> a Source # foldl1 :: (a -> a -> a) -> Messages a -> a Source # toList :: Messages a -> [a] Source # null :: Messages a -> Bool Source # length :: Messages a -> Int Source # elem :: Eq a => a -> Messages a -> Bool Source # maximum :: Ord a => Messages a -> a Source # minimum :: Ord a => Messages a -> a Source # | |
Foldable MsgEnvelope Source # | |
Defined in GHC.Types.Error Methods fold :: Monoid m => MsgEnvelope m -> m Source # foldMap :: Monoid m => (a -> m) -> MsgEnvelope a -> m Source # foldMap' :: Monoid m => (a -> m) -> MsgEnvelope a -> m Source # foldr :: (a -> b -> b) -> b -> MsgEnvelope a -> b Source # foldr' :: (a -> b -> b) -> b -> MsgEnvelope a -> b Source # foldl :: (b -> a -> b) -> b -> MsgEnvelope a -> b Source # foldl' :: (b -> a -> b) -> b -> MsgEnvelope a -> b Source # foldr1 :: (a -> a -> a) -> MsgEnvelope a -> a Source # foldl1 :: (a -> a -> a) -> MsgEnvelope a -> a Source # toList :: MsgEnvelope a -> [a] Source # null :: MsgEnvelope a -> Bool Source # length :: MsgEnvelope a -> Int Source # elem :: Eq a => a -> MsgEnvelope a -> Bool Source # maximum :: Ord a => MsgEnvelope a -> a Source # minimum :: Ord a => MsgEnvelope a -> a Source # sum :: Num a => MsgEnvelope a -> a Source # product :: Num a => MsgEnvelope a -> a Source # | |
Foldable UnitEnvGraph Source # | |
Defined in GHC.Unit.Env Methods fold :: Monoid m => UnitEnvGraph m -> m Source # foldMap :: Monoid m => (a -> m) -> UnitEnvGraph a -> m Source # foldMap' :: Monoid m => (a -> m) -> UnitEnvGraph a -> m Source # foldr :: (a -> b -> b) -> b -> UnitEnvGraph a -> b Source # foldr' :: (a -> b -> b) -> b -> UnitEnvGraph a -> b Source # foldl :: (b -> a -> b) -> b -> UnitEnvGraph a -> b Source # foldl' :: (b -> a -> b) -> b -> UnitEnvGraph a -> b Source # foldr1 :: (a -> a -> a) -> UnitEnvGraph a -> a Source # foldl1 :: (a -> a -> a) -> UnitEnvGraph a -> a Source # toList :: UnitEnvGraph a -> [a] Source # null :: UnitEnvGraph a -> Bool Source # length :: UnitEnvGraph a -> Int Source # elem :: Eq a => a -> UnitEnvGraph a -> Bool Source # maximum :: Ord a => UnitEnvGraph a -> a Source # minimum :: Ord a => UnitEnvGraph a -> a Source # sum :: Num a => UnitEnvGraph a -> a Source # product :: Num a => UnitEnvGraph a -> a Source # | |
Foldable GenWithIsBoot Source # | |
Defined in GHC.Unit.Types Methods fold :: Monoid m => GenWithIsBoot m -> m Source # foldMap :: Monoid m => (a -> m) -> GenWithIsBoot a -> m Source # foldMap' :: Monoid m => (a -> m) -> GenWithIsBoot a -> m Source # foldr :: (a -> b -> b) -> b -> GenWithIsBoot a -> b Source # foldr' :: (a -> b -> b) -> b -> GenWithIsBoot a -> b Source # foldl :: (b -> a -> b) -> b -> GenWithIsBoot a -> b Source # foldl' :: (b -> a -> b) -> b -> GenWithIsBoot a -> b Source # foldr1 :: (a -> a -> a) -> GenWithIsBoot a -> a Source # foldl1 :: (a -> a -> a) -> GenWithIsBoot a -> a Source # toList :: GenWithIsBoot a -> [a] Source # null :: GenWithIsBoot a -> Bool Source # length :: GenWithIsBoot a -> Int Source # elem :: Eq a => a -> GenWithIsBoot a -> Bool Source # maximum :: Ord a => GenWithIsBoot a -> a Source # minimum :: Ord a => GenWithIsBoot a -> a Source # sum :: Num a => GenWithIsBoot a -> a Source # product :: Num a => GenWithIsBoot a -> a Source # | |
Foldable DataDefnCons Source # | |
Defined in Language.Haskell.Syntax.Decls Methods fold :: Monoid m => DataDefnCons m -> m Source # foldMap :: Monoid m => (a -> m) -> DataDefnCons a -> m Source # foldMap' :: Monoid m => (a -> m) -> DataDefnCons a -> m Source # foldr :: (a -> b -> b) -> b -> DataDefnCons a -> b Source # foldr' :: (a -> b -> b) -> b -> DataDefnCons a -> b Source # foldl :: (b -> a -> b) -> b -> DataDefnCons a -> b Source # foldl' :: (b -> a -> b) -> b -> DataDefnCons a -> b Source # foldr1 :: (a -> a -> a) -> DataDefnCons a -> a Source # foldl1 :: (a -> a -> a) -> DataDefnCons a -> a Source # toList :: DataDefnCons a -> [a] Source # null :: DataDefnCons a -> Bool Source # length :: DataDefnCons a -> Int Source # elem :: Eq a => a -> DataDefnCons a -> Bool Source # maximum :: Ord a => DataDefnCons a -> a Source # minimum :: Ord a => DataDefnCons a -> a Source # sum :: Num a => DataDefnCons a -> a Source # product :: Num a => DataDefnCons a -> a Source # | |
Foldable SizedSeq | |
Defined in GHC.Data.SizedSeq Methods fold :: Monoid m => SizedSeq m -> m Source # foldMap :: Monoid m => (a -> m) -> SizedSeq a -> m Source # foldMap' :: Monoid m => (a -> m) -> SizedSeq a -> m Source # foldr :: (a -> b -> b) -> b -> SizedSeq a -> b Source # foldr' :: (a -> b -> b) -> b -> SizedSeq a -> b Source # foldl :: (b -> a -> b) -> b -> SizedSeq a -> b Source # foldl' :: (b -> a -> b) -> b -> SizedSeq a -> b Source # foldr1 :: (a -> a -> a) -> SizedSeq a -> a Source # foldl1 :: (a -> a -> a) -> SizedSeq a -> a Source # toList :: SizedSeq a -> [a] Source # null :: SizedSeq a -> Bool Source # length :: SizedSeq a -> Int Source # elem :: Eq a => a -> SizedSeq a -> Bool Source # maximum :: Ord a => SizedSeq a -> a Source # minimum :: Ord a => SizedSeq a -> a Source # | |
Foldable GenClosure | |
Defined in GHC.Exts.Heap.Closures Methods fold :: Monoid m => GenClosure m -> m Source # foldMap :: Monoid m => (a -> m) -> GenClosure a -> m Source # foldMap' :: Monoid m => (a -> m) -> GenClosure a -> m Source # foldr :: (a -> b -> b) -> b -> GenClosure a -> b Source # foldr' :: (a -> b -> b) -> b -> GenClosure a -> b Source # foldl :: (b -> a -> b) -> b -> GenClosure a -> b Source # foldl' :: (b -> a -> b) -> b -> GenClosure a -> b Source # foldr1 :: (a -> a -> a) -> GenClosure a -> a Source # foldl1 :: (a -> a -> a) -> GenClosure a -> a Source # toList :: GenClosure a -> [a] Source # null :: GenClosure a -> Bool Source # length :: GenClosure a -> Int Source # elem :: Eq a => a -> GenClosure a -> Bool Source # maximum :: Ord a => GenClosure a -> a Source # minimum :: Ord a => GenClosure a -> a Source # sum :: Num a => GenClosure a -> a Source # product :: Num a => GenClosure a -> a Source # | |
Foldable TyVarBndr | |
Defined in Language.Haskell.TH.Syntax Methods fold :: Monoid m => TyVarBndr m -> m Source # foldMap :: Monoid m => (a -> m) -> TyVarBndr a -> m Source # foldMap' :: Monoid m => (a -> m) -> TyVarBndr a -> m Source # foldr :: (a -> b -> b) -> b -> TyVarBndr a -> b Source # foldr' :: (a -> b -> b) -> b -> TyVarBndr a -> b Source # foldl :: (b -> a -> b) -> b -> TyVarBndr a -> b Source # foldl' :: (b -> a -> b) -> b -> TyVarBndr a -> b Source # foldr1 :: (a -> a -> a) -> TyVarBndr a -> a Source # foldl1 :: (a -> a -> a) -> TyVarBndr a -> a Source # toList :: TyVarBndr a -> [a] Source # null :: TyVarBndr a -> Bool Source # length :: TyVarBndr a -> Int Source # elem :: Eq a => a -> TyVarBndr a -> Bool Source # maximum :: Ord a => TyVarBndr a -> a Source # minimum :: Ord a => TyVarBndr a -> a Source # | |
Foldable Maybe | Since: base-2.1 |
Defined in Data.Foldable Methods fold :: Monoid m => Maybe m -> m Source # foldMap :: Monoid m => (a -> m) -> Maybe a -> m Source # foldMap' :: Monoid m => (a -> m) -> Maybe a -> m Source # foldr :: (a -> b -> b) -> b -> Maybe a -> b Source # foldr' :: (a -> b -> b) -> b -> Maybe a -> b Source # foldl :: (b -> a -> b) -> b -> Maybe a -> b Source # foldl' :: (b -> a -> b) -> b -> Maybe a -> b Source # foldr1 :: (a -> a -> a) -> Maybe a -> a Source # foldl1 :: (a -> a -> a) -> Maybe a -> a Source # toList :: Maybe a -> [a] Source # null :: Maybe a -> Bool Source # length :: Maybe a -> Int Source # elem :: Eq a => a -> Maybe a -> Bool Source # maximum :: Ord a => Maybe a -> a Source # minimum :: Ord a => Maybe a -> a Source # | |
Foldable Solo | Since: base-4.15 |
Defined in Data.Foldable Methods fold :: Monoid m => Solo m -> m Source # foldMap :: Monoid m => (a -> m) -> Solo a -> m Source # foldMap' :: Monoid m => (a -> m) -> Solo a -> m Source # foldr :: (a -> b -> b) -> b -> Solo a -> b Source # foldr' :: (a -> b -> b) -> b -> Solo a -> b Source # foldl :: (b -> a -> b) -> b -> Solo a -> b Source # foldl' :: (b -> a -> b) -> b -> Solo a -> b Source # foldr1 :: (a -> a -> a) -> Solo a -> a Source # foldl1 :: (a -> a -> a) -> Solo a -> a Source # toList :: Solo a -> [a] Source # null :: Solo a -> Bool Source # length :: Solo a -> Int Source # elem :: Eq a => a -> Solo a -> Bool Source # maximum :: Ord a => Solo a -> a Source # minimum :: Ord a => Solo a -> a Source # | |
Foldable [] | Since: base-2.1 |
Defined in Data.Foldable Methods fold :: Monoid m => [m] -> m Source # foldMap :: Monoid m => (a -> m) -> [a] -> m Source # foldMap' :: Monoid m => (a -> m) -> [a] -> m Source # foldr :: (a -> b -> b) -> b -> [a] -> b Source # foldr' :: (a -> b -> b) -> b -> [a] -> b Source # foldl :: (b -> a -> b) -> b -> [a] -> b Source # foldl' :: (b -> a -> b) -> b -> [a] -> b Source # foldr1 :: (a -> a -> a) -> [a] -> a Source # foldl1 :: (a -> a -> a) -> [a] -> a Source # elem :: Eq a => a -> [a] -> Bool Source # maximum :: Ord a => [a] -> a Source # minimum :: Ord a => [a] -> a Source # | |
Foldable (Either a) | Since: base-4.7.0.0 |
Defined in Data.Foldable Methods fold :: Monoid m => Either a m -> m Source # foldMap :: Monoid m => (a0 -> m) -> Either a a0 -> m Source # foldMap' :: Monoid m => (a0 -> m) -> Either a a0 -> m Source # foldr :: (a0 -> b -> b) -> b -> Either a a0 -> b Source # foldr' :: (a0 -> b -> b) -> b -> Either a a0 -> b Source # foldl :: (b -> a0 -> b) -> b -> Either a a0 -> b Source # foldl' :: (b -> a0 -> b) -> b -> Either a a0 -> b Source # foldr1 :: (a0 -> a0 -> a0) -> Either a a0 -> a0 Source # foldl1 :: (a0 -> a0 -> a0) -> Either a a0 -> a0 Source # toList :: Either a a0 -> [a0] Source # null :: Either a a0 -> Bool Source # length :: Either a a0 -> Int Source # elem :: Eq a0 => a0 -> Either a a0 -> Bool Source # maximum :: Ord a0 => Either a a0 -> a0 Source # minimum :: Ord a0 => Either a a0 -> a0 Source # | |
Foldable (Proxy :: Type -> Type) | Since: base-4.7.0.0 |
Defined in Data.Foldable Methods fold :: Monoid m => Proxy m -> m Source # foldMap :: Monoid m => (a -> m) -> Proxy a -> m Source # foldMap' :: Monoid m => (a -> m) -> Proxy a -> m Source # foldr :: (a -> b -> b) -> b -> Proxy a -> b Source # foldr' :: (a -> b -> b) -> b -> Proxy a -> b Source # foldl :: (b -> a -> b) -> b -> Proxy a -> b Source # foldl' :: (b -> a -> b) -> b -> Proxy a -> b Source # foldr1 :: (a -> a -> a) -> Proxy a -> a Source # foldl1 :: (a -> a -> a) -> Proxy a -> a Source # toList :: Proxy a -> [a] Source # null :: Proxy a -> Bool Source # length :: Proxy a -> Int Source # elem :: Eq a => a -> Proxy a -> Bool Source # maximum :: Ord a => Proxy a -> a Source # minimum :: Ord a => Proxy a -> a Source # | |
Foldable (Arg a) | Since: base-4.9.0.0 |
Defined in Data.Semigroup Methods fold :: Monoid m => Arg a m -> m Source # foldMap :: Monoid m => (a0 -> m) -> Arg a a0 -> m Source # foldMap' :: Monoid m => (a0 -> m) -> Arg a a0 -> m Source # foldr :: (a0 -> b -> b) -> b -> Arg a a0 -> b Source # foldr' :: (a0 -> b -> b) -> b -> Arg a a0 -> b Source # foldl :: (b -> a0 -> b) -> b -> Arg a a0 -> b Source # foldl' :: (b -> a0 -> b) -> b -> Arg a a0 -> b Source # foldr1 :: (a0 -> a0 -> a0) -> Arg a a0 -> a0 Source # foldl1 :: (a0 -> a0 -> a0) -> Arg a a0 -> a0 Source # toList :: Arg a a0 -> [a0] Source # null :: Arg a a0 -> Bool Source # length :: Arg a a0 -> Int Source # elem :: Eq a0 => a0 -> Arg a a0 -> Bool Source # maximum :: Ord a0 => Arg a a0 -> a0 Source # minimum :: Ord a0 => Arg a a0 -> a0 Source # | |
Foldable (Array i) | Since: base-4.8.0.0 |
Defined in Data.Foldable Methods fold :: Monoid m => Array i m -> m Source # foldMap :: Monoid m => (a -> m) -> Array i a -> m Source # foldMap' :: Monoid m => (a -> m) -> Array i a -> m Source # foldr :: (a -> b -> b) -> b -> Array i a -> b Source # foldr' :: (a -> b -> b) -> b -> Array i a -> b Source # foldl :: (b -> a -> b) -> b -> Array i a -> b Source # foldl' :: (b -> a -> b) -> b -> Array i a -> b Source # foldr1 :: (a -> a -> a) -> Array i a -> a Source # foldl1 :: (a -> a -> a) -> Array i a -> a Source # toList :: Array i a -> [a] Source # null :: Array i a -> Bool Source # length :: Array i a -> Int Source # elem :: Eq a => a -> Array i a -> Bool Source # maximum :: Ord a => Array i a -> a Source # minimum :: Ord a => Array i a -> a Source # | |
Foldable (U1 :: Type -> Type) | Since: base-4.9.0.0 |
Defined in Data.Foldable Methods fold :: Monoid m => U1 m -> m Source # foldMap :: Monoid m => (a -> m) -> U1 a -> m Source # foldMap' :: Monoid m => (a -> m) -> U1 a -> m Source # foldr :: (a -> b -> b) -> b -> U1 a -> b Source # foldr' :: (a -> b -> b) -> b -> U1 a -> b Source # foldl :: (b -> a -> b) -> b -> U1 a -> b Source # foldl' :: (b -> a -> b) -> b -> U1 a -> b Source # foldr1 :: (a -> a -> a) -> U1 a -> a Source # foldl1 :: (a -> a -> a) -> U1 a -> a Source # toList :: U1 a -> [a] Source # length :: U1 a -> Int Source # elem :: Eq a => a -> U1 a -> Bool Source # maximum :: Ord a => U1 a -> a Source # minimum :: Ord a => U1 a -> a Source # | |
Foldable (UAddr :: Type -> Type) | Since: base-4.9.0.0 |
Defined in Data.Foldable Methods fold :: Monoid m => UAddr m -> m Source # foldMap :: Monoid m => (a -> m) -> UAddr a -> m Source # foldMap' :: Monoid m => (a -> m) -> UAddr a -> m Source # foldr :: (a -> b -> b) -> b -> UAddr a -> b Source # foldr' :: (a -> b -> b) -> b -> UAddr a -> b Source # foldl :: (b -> a -> b) -> b -> UAddr a -> b Source # foldl' :: (b -> a -> b) -> b -> UAddr a -> b Source # foldr1 :: (a -> a -> a) -> UAddr a -> a Source # foldl1 :: (a -> a -> a) -> UAddr a -> a Source # toList :: UAddr a -> [a] Source # null :: UAddr a -> Bool Source # length :: UAddr a -> Int Source # elem :: Eq a => a -> UAddr a -> Bool Source # maximum :: Ord a => UAddr a -> a Source # minimum :: Ord a => UAddr a -> a Source # | |
Foldable (UChar :: Type -> Type) | Since: base-4.9.0.0 |
Defined in Data.Foldable Methods fold :: Monoid m => UChar m -> m Source # foldMap :: Monoid m => (a -> m) -> UChar a -> m Source # foldMap' :: Monoid m => (a -> m) -> UChar a -> m Source # foldr :: (a -> b -> b) -> b -> UChar a -> b Source # foldr' :: (a -> b -> b) -> b -> UChar a -> b Source # foldl :: (b -> a -> b) -> b -> UChar a -> b Source # foldl' :: (b -> a -> b) -> b -> UChar a -> b Source # foldr1 :: (a -> a -> a) -> UChar a -> a Source # foldl1 :: (a -> a -> a) -> UChar a -> a Source # toList :: UChar a -> [a] Source # null :: UChar a -> Bool Source # length :: UChar a -> Int Source # elem :: Eq a => a -> UChar a -> Bool Source # maximum :: Ord a => UChar a -> a Source # minimum :: Ord a => UChar a -> a Source # | |
Foldable (UDouble :: Type -> Type) | Since: base-4.9.0.0 |
Defined in Data.Foldable Methods fold :: Monoid m => UDouble m -> m Source # foldMap :: Monoid m => (a -> m) -> UDouble a -> m Source # foldMap' :: Monoid m => (a -> m) -> UDouble a -> m Source # foldr :: (a -> b -> b) -> b -> UDouble a -> b Source # foldr' :: (a -> b -> b) -> b -> UDouble a -> b Source # foldl :: (b -> a -> b) -> b -> UDouble a -> b Source # foldl' :: (b -> a -> b) -> b -> UDouble a -> b Source # foldr1 :: (a -> a -> a) -> UDouble a -> a Source # foldl1 :: (a -> a -> a) -> UDouble a -> a Source # toList :: UDouble a -> [a] Source # null :: UDouble a -> Bool Source # length :: UDouble a -> Int Source # elem :: Eq a => a -> UDouble a -> Bool Source # maximum :: Ord a => UDouble a -> a Source # minimum :: Ord a => UDouble a -> a Source # | |
Foldable (UFloat :: Type -> Type) | Since: base-4.9.0.0 |
Defined in Data.Foldable Methods fold :: Monoid m => UFloat m -> m Source # foldMap :: Monoid m => (a -> m) -> UFloat a -> m Source # foldMap' :: Monoid m => (a -> m) -> UFloat a -> m Source # foldr :: (a -> b -> b) -> b -> UFloat a -> b Source # foldr' :: (a -> b -> b) -> b -> UFloat a -> b Source # foldl :: (b -> a -> b) -> b -> UFloat a -> b Source # foldl' :: (b -> a -> b) -> b -> UFloat a -> b Source # foldr1 :: (a -> a -> a) -> UFloat a -> a Source # foldl1 :: (a -> a -> a) -> UFloat a -> a Source # toList :: UFloat a -> [a] Source # null :: UFloat a -> Bool Source # length :: UFloat a -> Int Source # elem :: Eq a => a -> UFloat a -> Bool Source # maximum :: Ord a => UFloat a -> a Source # minimum :: Ord a => UFloat a -> a Source # | |
Foldable (UInt :: Type -> Type) | Since: base-4.9.0.0 |
Defined in Data.Foldable Methods fold :: Monoid m => UInt m -> m Source # foldMap :: Monoid m => (a -> m) -> UInt a -> m Source # foldMap' :: Monoid m => (a -> m) -> UInt a -> m Source # foldr :: (a -> b -> b) -> b -> UInt a -> b Source # foldr' :: (a -> b -> b) -> b -> UInt a -> b Source # foldl :: (b -> a -> b) -> b -> UInt a -> b Source # foldl' :: (b -> a -> b) -> b -> UInt a -> b Source # foldr1 :: (a -> a -> a) -> UInt a -> a Source # foldl1 :: (a -> a -> a) -> UInt a -> a Source # toList :: UInt a -> [a] Source # null :: UInt a -> Bool Source # length :: UInt a -> Int Source # elem :: Eq a => a -> UInt a -> Bool Source # maximum :: Ord a => UInt a -> a Source # minimum :: Ord a => UInt a -> a Source # | |
Foldable (UWord :: Type -> Type) | Since: base-4.9.0.0 |
Defined in Data.Foldable Methods fold :: Monoid m => UWord m -> m Source # foldMap :: Monoid m => (a -> m) -> UWord a -> m Source # foldMap' :: Monoid m => (a -> m) -> UWord a -> m Source # foldr :: (a -> b -> b) -> b -> UWord a -> b Source # foldr' :: (a -> b -> b) -> b -> UWord a -> b Source # foldl :: (b -> a -> b) -> b -> UWord a -> b Source # foldl' :: (b -> a -> b) -> b -> UWord a -> b Source # foldr1 :: (a -> a -> a) -> UWord a -> a Source # foldl1 :: (a -> a -> a) -> UWord a -> a Source # toList :: UWord a -> [a] Source # null :: UWord a -> Bool Source # length :: UWord a -> Int Source # elem :: Eq a => a -> UWord a -> Bool Source # maximum :: Ord a => UWord a -> a Source # minimum :: Ord a => UWord a -> a Source # | |
Foldable (V1 :: Type -> Type) | Since: base-4.9.0.0 |
Defined in Data.Foldable Methods fold :: Monoid m => V1 m -> m Source # foldMap :: Monoid m => (a -> m) -> V1 a -> m Source # foldMap' :: Monoid m => (a -> m) -> V1 a -> m Source # foldr :: (a -> b -> b) -> b -> V1 a -> b Source # foldr' :: (a -> b -> b) -> b -> V1 a -> b Source # foldl :: (b -> a -> b) -> b -> V1 a -> b Source # foldl' :: (b -> a -> b) -> b -> V1 a -> b Source # foldr1 :: (a -> a -> a) -> V1 a -> a Source # foldl1 :: (a -> a -> a) -> V1 a -> a Source # toList :: V1 a -> [a] Source # length :: V1 a -> Int Source # elem :: Eq a => a -> V1 a -> Bool Source # maximum :: Ord a => V1 a -> a Source # minimum :: Ord a => V1 a -> a Source # | |
Foldable (Map k) | Folds in order of increasing key. |
Defined in Data.Map.Internal Methods fold :: Monoid m => Map k m -> m Source # foldMap :: Monoid m => (a -> m) -> Map k a -> m Source # foldMap' :: Monoid m => (a -> m) -> Map k a -> m Source # foldr :: (a -> b -> b) -> b -> Map k a -> b Source # foldr' :: (a -> b -> b) -> b -> Map k a -> b Source # foldl :: (b -> a -> b) -> b -> Map k a -> b Source # foldl' :: (b -> a -> b) -> b -> Map k a -> b Source # foldr1 :: (a -> a -> a) -> Map k a -> a Source # foldl1 :: (a -> a -> a) -> Map k a -> a Source # toList :: Map k a -> [a] Source # null :: Map k a -> Bool Source # length :: Map k a -> Int Source # elem :: Eq a => a -> Map k a -> Bool Source # maximum :: Ord a => Map k a -> a Source # minimum :: Ord a => Map k a -> a Source # | |
Foldable m => Foldable (CatchT m) | |
Defined in Control.Monad.Catch.Pure Methods fold :: Monoid m0 => CatchT m m0 -> m0 Source # foldMap :: Monoid m0 => (a -> m0) -> CatchT m a -> m0 Source # foldMap' :: Monoid m0 => (a -> m0) -> CatchT m a -> m0 Source # foldr :: (a -> b -> b) -> b -> CatchT m a -> b Source # foldr' :: (a -> b -> b) -> b -> CatchT m a -> b Source # foldl :: (b -> a -> b) -> b -> CatchT m a -> b Source # foldl' :: (b -> a -> b) -> b -> CatchT m a -> b Source # foldr1 :: (a -> a -> a) -> CatchT m a -> a Source # foldl1 :: (a -> a -> a) -> CatchT m a -> a Source # toList :: CatchT m a -> [a] Source # null :: CatchT m a -> Bool Source # length :: CatchT m a -> Int Source # elem :: Eq a => a -> CatchT m a -> Bool Source # maximum :: Ord a => CatchT m a -> a Source # minimum :: Ord a => CatchT m a -> a Source # | |
Foldable (Pair a) Source # | |
Defined in GHC.Data.Strict Methods fold :: Monoid m => Pair a m -> m Source # foldMap :: Monoid m => (a0 -> m) -> Pair a a0 -> m Source # foldMap' :: Monoid m => (a0 -> m) -> Pair a a0 -> m Source # foldr :: (a0 -> b -> b) -> b -> Pair a a0 -> b Source # foldr' :: (a0 -> b -> b) -> b -> Pair a a0 -> b Source # foldl :: (b -> a0 -> b) -> b -> Pair a a0 -> b Source # foldl' :: (b -> a0 -> b) -> b -> Pair a a0 -> b Source # foldr1 :: (a0 -> a0 -> a0) -> Pair a a0 -> a0 Source # foldl1 :: (a0 -> a0 -> a0) -> Pair a a0 -> a0 Source # toList :: Pair a a0 -> [a0] Source # null :: Pair a a0 -> Bool Source # length :: Pair a a0 -> Int Source # elem :: Eq a0 => a0 -> Pair a a0 -> Bool Source # maximum :: Ord a0 => Pair a a0 -> a0 Source # minimum :: Ord a0 => Pair a a0 -> a0 Source # | |
(Eq (Key m), TrieMap m) => Foldable (GenMap m) Source # | |
Defined in GHC.Data.TrieMap Methods fold :: Monoid m0 => GenMap m m0 -> m0 Source # foldMap :: Monoid m0 => (a -> m0) -> GenMap m a -> m0 Source # foldMap' :: Monoid m0 => (a -> m0) -> GenMap m a -> m0 Source # foldr :: (a -> b -> b) -> b -> GenMap m a -> b Source # foldr' :: (a -> b -> b) -> b -> GenMap m a -> b Source # foldl :: (b -> a -> b) -> b -> GenMap m a -> b Source # foldl' :: (b -> a -> b) -> b -> GenMap m a -> b Source # foldr1 :: (a -> a -> a) -> GenMap m a -> a Source # foldl1 :: (a -> a -> a) -> GenMap m a -> a Source # toList :: GenMap m a -> [a] Source # null :: GenMap m a -> Bool Source # length :: GenMap m a -> Int Source # elem :: Eq a => a -> GenMap m a -> Bool Source # maximum :: Ord a => GenMap m a -> a Source # minimum :: Ord a => GenMap m a -> a Source # | |
TrieMap m => Foldable (ListMap m) Source # | |
Defined in GHC.Data.TrieMap Methods fold :: Monoid m0 => ListMap m m0 -> m0 Source # foldMap :: Monoid m0 => (a -> m0) -> ListMap m a -> m0 Source # foldMap' :: Monoid m0 => (a -> m0) -> ListMap m a -> m0 Source # foldr :: (a -> b -> b) -> b -> ListMap m a -> b Source # foldr' :: (a -> b -> b) -> b -> ListMap m a -> b Source # foldl :: (b -> a -> b) -> b -> ListMap m a -> b Source # foldl' :: (b -> a -> b) -> b -> ListMap m a -> b Source # foldr1 :: (a -> a -> a) -> ListMap m a -> a Source # foldl1 :: (a -> a -> a) -> ListMap m a -> a Source # toList :: ListMap m a -> [a] Source # null :: ListMap m a -> Bool Source # length :: ListMap m a -> Int Source # elem :: Eq a => a -> ListMap m a -> Bool Source # maximum :: Ord a => ListMap m a -> a Source # minimum :: Ord a => ListMap m a -> a Source # | |
TrieMap m => Foldable (MaybeMap m) Source # | |
Defined in GHC.Data.TrieMap Methods fold :: Monoid m0 => MaybeMap m m0 -> m0 Source # foldMap :: Monoid m0 => (a -> m0) -> MaybeMap m a -> m0 Source # foldMap' :: Monoid m0 => (a -> m0) -> MaybeMap m a -> m0 Source # foldr :: (a -> b -> b) -> b -> MaybeMap m a -> b Source # foldr' :: (a -> b -> b) -> b -> MaybeMap m a -> b Source # foldl :: (b -> a -> b) -> b -> MaybeMap m a -> b Source # foldl' :: (b -> a -> b) -> b -> MaybeMap m a -> b Source # foldr1 :: (a -> a -> a) -> MaybeMap m a -> a Source # foldl1 :: (a -> a -> a) -> MaybeMap m a -> a Source # toList :: MaybeMap m a -> [a] Source # null :: MaybeMap m a -> Bool Source # length :: MaybeMap m a -> Int Source # elem :: Eq a => a -> MaybeMap m a -> Bool Source # maximum :: Ord a => MaybeMap m a -> a Source # minimum :: Ord a => MaybeMap m a -> a Source # | |
Foldable (IfaceBindingX r) Source # | |
Defined in GHC.Iface.Syntax Methods fold :: Monoid m => IfaceBindingX r m -> m Source # foldMap :: Monoid m => (a -> m) -> IfaceBindingX r a -> m Source # foldMap' :: Monoid m => (a -> m) -> IfaceBindingX r a -> m Source # foldr :: (a -> b -> b) -> b -> IfaceBindingX r a -> b Source # foldr' :: (a -> b -> b) -> b -> IfaceBindingX r a -> b Source # foldl :: (b -> a -> b) -> b -> IfaceBindingX r a -> b Source # foldl' :: (b -> a -> b) -> b -> IfaceBindingX r a -> b Source # foldr1 :: (a -> a -> a) -> IfaceBindingX r a -> a Source # foldl1 :: (a -> a -> a) -> IfaceBindingX r a -> a Source # toList :: IfaceBindingX r a -> [a] Source # null :: IfaceBindingX r a -> Bool Source # length :: IfaceBindingX r a -> Int Source # elem :: Eq a => a -> IfaceBindingX r a -> Bool Source # maximum :: Ord a => IfaceBindingX r a -> a Source # minimum :: Ord a => IfaceBindingX r a -> a Source # sum :: Num a => IfaceBindingX r a -> a Source # product :: Num a => IfaceBindingX r a -> a Source # | |
Foldable (GenLocated l) Source # | |
Defined in GHC.Types.SrcLoc Methods fold :: Monoid m => GenLocated l m -> m Source # foldMap :: Monoid m => (a -> m) -> GenLocated l a -> m Source # foldMap' :: Monoid m => (a -> m) -> GenLocated l a -> m Source # foldr :: (a -> b -> b) -> b -> GenLocated l a -> b Source # foldr' :: (a -> b -> b) -> b -> GenLocated l a -> b Source # foldl :: (b -> a -> b) -> b -> GenLocated l a -> b Source # foldl' :: (b -> a -> b) -> b -> GenLocated l a -> b Source # foldr1 :: (a -> a -> a) -> GenLocated l a -> a Source # foldl1 :: (a -> a -> a) -> GenLocated l a -> a Source # toList :: GenLocated l a -> [a] Source # null :: GenLocated l a -> Bool Source # length :: GenLocated l a -> Int Source # elem :: Eq a => a -> GenLocated l a -> Bool Source # maximum :: Ord a => GenLocated l a -> a Source # minimum :: Ord a => GenLocated l a -> a Source # sum :: Num a => GenLocated l a -> a Source # product :: Num a => GenLocated l a -> a Source # | |
Foldable (UniqDFM key) Source # | Deterministic, in O(n log n). |
Defined in GHC.Types.Unique.DFM Methods fold :: Monoid m => UniqDFM key m -> m Source # foldMap :: Monoid m => (a -> m) -> UniqDFM key a -> m Source # foldMap' :: Monoid m => (a -> m) -> UniqDFM key a -> m Source # foldr :: (a -> b -> b) -> b -> UniqDFM key a -> b Source # foldr' :: (a -> b -> b) -> b -> UniqDFM key a -> b Source # foldl :: (b -> a -> b) -> b -> UniqDFM key a -> b Source # foldl' :: (b -> a -> b) -> b -> UniqDFM key a -> b Source # foldr1 :: (a -> a -> a) -> UniqDFM key a -> a Source # foldl1 :: (a -> a -> a) -> UniqDFM key a -> a Source # toList :: UniqDFM key a -> [a] Source # null :: UniqDFM key a -> Bool Source # length :: UniqDFM key a -> Int Source # elem :: Eq a => a -> UniqDFM key a -> Bool Source # maximum :: Ord a => UniqDFM key a -> a Source # minimum :: Ord a => UniqDFM key a -> a Source # | |
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 Source # foldMap :: Monoid m => (a -> m) -> NonDetUniqFM key a -> m Source # foldMap' :: Monoid m => (a -> m) -> NonDetUniqFM key a -> m Source # foldr :: (a -> b -> b) -> b -> NonDetUniqFM key a -> b Source # foldr' :: (a -> b -> b) -> b -> NonDetUniqFM key a -> b Source # foldl :: (b -> a -> b) -> b -> NonDetUniqFM key a -> b Source # foldl' :: (b -> a -> b) -> b -> NonDetUniqFM key a -> b Source # foldr1 :: (a -> a -> a) -> NonDetUniqFM key a -> a Source # foldl1 :: (a -> a -> a) -> NonDetUniqFM key a -> a Source # toList :: NonDetUniqFM key a -> [a] Source # null :: NonDetUniqFM key a -> Bool Source # length :: NonDetUniqFM key a -> Int Source # elem :: Eq a => a -> NonDetUniqFM key a -> Bool Source # maximum :: Ord a => NonDetUniqFM key a -> a Source # minimum :: Ord a => NonDetUniqFM key a -> a Source # sum :: Num a => NonDetUniqFM key a -> a Source # product :: Num a => NonDetUniqFM key a -> a Source # | |
Foldable (HsFieldBind lhs) Source # | |
Defined in Language.Haskell.Syntax.Pat Methods fold :: Monoid m => HsFieldBind lhs m -> m Source # foldMap :: Monoid m => (a -> m) -> HsFieldBind lhs a -> m Source # foldMap' :: Monoid m => (a -> m) -> HsFieldBind lhs a -> m Source # foldr :: (a -> b -> b) -> b -> HsFieldBind lhs a -> b Source # foldr' :: (a -> b -> b) -> b -> HsFieldBind lhs a -> b Source # foldl :: (b -> a -> b) -> b -> HsFieldBind lhs a -> b Source # foldl' :: (b -> a -> b) -> b -> HsFieldBind lhs a -> b Source # foldr1 :: (a -> a -> a) -> HsFieldBind lhs a -> a Source # foldl1 :: (a -> a -> a) -> HsFieldBind lhs a -> a Source # toList :: HsFieldBind lhs a -> [a] Source # null :: HsFieldBind lhs a -> Bool Source # length :: HsFieldBind lhs a -> Int Source # elem :: Eq a => a -> HsFieldBind lhs a -> Bool Source # maximum :: Ord a => HsFieldBind lhs a -> a Source # minimum :: Ord a => HsFieldBind lhs a -> a Source # sum :: Num a => HsFieldBind lhs a -> a Source # product :: Num a => HsFieldBind lhs a -> a Source # | |
Foldable (DbOpenMode mode) | |
Defined in GHC.Unit.Database Methods fold :: Monoid m => DbOpenMode mode m -> m Source # foldMap :: Monoid m => (a -> m) -> DbOpenMode mode a -> m Source # foldMap' :: Monoid m => (a -> m) -> DbOpenMode mode a -> m Source # foldr :: (a -> b -> b) -> b -> DbOpenMode mode a -> b Source # foldr' :: (a -> b -> b) -> b -> DbOpenMode mode a -> b Source # foldl :: (b -> a -> b) -> b -> DbOpenMode mode a -> b Source # foldl' :: (b -> a -> b) -> b -> DbOpenMode mode a -> b Source # foldr1 :: (a -> a -> a) -> DbOpenMode mode a -> a Source # foldl1 :: (a -> a -> a) -> DbOpenMode mode a -> a Source # toList :: DbOpenMode mode a -> [a] Source # null :: DbOpenMode mode a -> Bool Source # length :: DbOpenMode mode a -> Int Source # elem :: Eq a => a -> DbOpenMode mode a -> Bool Source # maximum :: Ord a => DbOpenMode mode a -> a Source # minimum :: Ord a => DbOpenMode mode a -> a Source # sum :: Num a => DbOpenMode mode a -> a Source # product :: Num a => DbOpenMode mode a -> a Source # | |
Foldable f => Foldable (Lift f) | |
Defined in Control.Applicative.Lift Methods fold :: Monoid m => Lift f m -> m Source # foldMap :: Monoid m => (a -> m) -> Lift f a -> m Source # foldMap' :: Monoid m => (a -> m) -> Lift f a -> m Source # foldr :: (a -> b -> b) -> b -> Lift f a -> b Source # foldr' :: (a -> b -> b) -> b -> Lift f a -> b Source # foldl :: (b -> a -> b) -> b -> Lift f a -> b Source # foldl' :: (b -> a -> b) -> b -> Lift f a -> b Source # foldr1 :: (a -> a -> a) -> Lift f a -> a Source # foldl1 :: (a -> a -> a) -> Lift f a -> a Source # toList :: Lift f a -> [a] Source # null :: Lift f a -> Bool Source # length :: Lift f a -> Int Source # elem :: Eq a => a -> Lift f a -> Bool Source # maximum :: Ord a => Lift f a -> a Source # minimum :: Ord a => Lift f a -> a Source # | |
Foldable f => Foldable (MaybeT f) | |
Defined in Control.Monad.Trans.Maybe Methods fold :: Monoid m => MaybeT f m -> m Source # foldMap :: Monoid m => (a -> m) -> MaybeT f a -> m Source # foldMap' :: Monoid m => (a -> m) -> MaybeT f a -> m Source # foldr :: (a -> b -> b) -> b -> MaybeT f a -> b Source # foldr' :: (a -> b -> b) -> b -> MaybeT f a -> b Source # foldl :: (b -> a -> b) -> b -> MaybeT f a -> b Source # foldl' :: (b -> a -> b) -> b -> MaybeT f a -> b Source # foldr1 :: (a -> a -> a) -> MaybeT f a -> a Source # foldl1 :: (a -> a -> a) -> MaybeT f a -> a Source # toList :: MaybeT f a -> [a] Source # null :: MaybeT f a -> Bool Source # length :: MaybeT f a -> Int Source # elem :: Eq a => a -> MaybeT f a -> Bool Source # maximum :: Ord a => MaybeT f a -> a Source # minimum :: Ord a => MaybeT f a -> a Source # | |
Foldable ((,) a) | Since: base-4.7.0.0 |
Defined in Data.Foldable Methods fold :: Monoid m => (a, m) -> m Source # foldMap :: Monoid m => (a0 -> m) -> (a, a0) -> m Source # foldMap' :: Monoid m => (a0 -> m) -> (a, a0) -> m Source # foldr :: (a0 -> b -> b) -> b -> (a, a0) -> b Source # foldr' :: (a0 -> b -> b) -> b -> (a, a0) -> b Source # foldl :: (b -> a0 -> b) -> b -> (a, a0) -> b Source # foldl' :: (b -> a0 -> b) -> b -> (a, a0) -> b Source # foldr1 :: (a0 -> a0 -> a0) -> (a, a0) -> a0 Source # foldl1 :: (a0 -> a0 -> a0) -> (a, a0) -> a0 Source # toList :: (a, a0) -> [a0] Source # null :: (a, a0) -> Bool Source # length :: (a, a0) -> Int Source # elem :: Eq a0 => a0 -> (a, a0) -> Bool Source # maximum :: Ord a0 => (a, a0) -> a0 Source # minimum :: Ord a0 => (a, a0) -> a0 Source # | |
Foldable (Const m :: Type -> Type) | Since: base-4.7.0.0 |
Defined in Data.Functor.Const Methods fold :: Monoid m0 => Const m m0 -> m0 Source # foldMap :: Monoid m0 => (a -> m0) -> Const m a -> m0 Source # foldMap' :: Monoid m0 => (a -> m0) -> Const m a -> m0 Source # foldr :: (a -> b -> b) -> b -> Const m a -> b Source # foldr' :: (a -> b -> b) -> b -> Const m a -> b Source # foldl :: (b -> a -> b) -> b -> Const m a -> b Source # foldl' :: (b -> a -> b) -> b -> Const m a -> b Source # foldr1 :: (a -> a -> a) -> Const m a -> a Source # foldl1 :: (a -> a -> a) -> Const m a -> a Source # toList :: Const m a -> [a] Source # null :: Const m a -> Bool Source # length :: Const m a -> Int Source # elem :: Eq a => a -> Const m a -> Bool Source # maximum :: Ord a => Const m a -> a Source # minimum :: Ord a => Const m a -> a Source # | |
Foldable f => Foldable (Ap f) | Since: base-4.12.0.0 |
Defined in Data.Foldable Methods fold :: Monoid m => Ap f m -> m Source # foldMap :: Monoid m => (a -> m) -> Ap f a -> m Source # foldMap' :: Monoid m => (a -> m) -> Ap f a -> m Source # foldr :: (a -> b -> b) -> b -> Ap f a -> b Source # foldr' :: (a -> b -> b) -> b -> Ap f a -> b Source # foldl :: (b -> a -> b) -> b -> Ap f a -> b Source # foldl' :: (b -> a -> b) -> b -> Ap f a -> b Source # foldr1 :: (a -> a -> a) -> Ap f a -> a Source # foldl1 :: (a -> a -> a) -> Ap f a -> a Source # toList :: Ap f a -> [a] Source # null :: Ap f a -> Bool Source # length :: Ap f a -> Int Source # elem :: Eq a => a -> Ap f a -> Bool Source # maximum :: Ord a => Ap f a -> a Source # minimum :: Ord a => Ap f a -> a Source # | |
Foldable f => Foldable (Alt f) | Since: base-4.12.0.0 |
Defined in Data.Foldable Methods fold :: Monoid m => Alt f m -> m Source # foldMap :: Monoid m => (a -> m) -> Alt f a -> m Source # foldMap' :: Monoid m => (a -> m) -> Alt f a -> m Source # foldr :: (a -> b -> b) -> b -> Alt f a -> b Source # foldr' :: (a -> b -> b) -> b -> Alt f a -> b Source # foldl :: (b -> a -> b) -> b -> Alt f a -> b Source # foldl' :: (b -> a -> b) -> b -> Alt f a -> b Source # foldr1 :: (a -> a -> a) -> Alt f a -> a Source # foldl1 :: (a -> a -> a) -> Alt f a -> a Source # toList :: Alt f a -> [a] Source # null :: Alt f a -> Bool Source # length :: Alt f a -> Int Source # elem :: Eq a => a -> Alt f a -> Bool Source # maximum :: Ord a => Alt f a -> a Source # minimum :: Ord a => Alt f a -> a Source # | |
Foldable f => Foldable (Rec1 f) | Since: base-4.9.0.0 |
Defined in Data.Foldable Methods fold :: Monoid m => Rec1 f m -> m Source # foldMap :: Monoid m => (a -> m) -> Rec1 f a -> m Source # foldMap' :: Monoid m => (a -> m) -> Rec1 f a -> m Source # foldr :: (a -> b -> b) -> b -> Rec1 f a -> b Source # foldr' :: (a -> b -> b) -> b -> Rec1 f a -> b Source # foldl :: (b -> a -> b) -> b -> Rec1 f a -> b Source # foldl' :: (b -> a -> b) -> b -> Rec1 f a -> b Source # foldr1 :: (a -> a -> a) -> Rec1 f a -> a Source # foldl1 :: (a -> a -> a) -> Rec1 f a -> a Source # toList :: Rec1 f a -> [a] Source # null :: Rec1 f a -> Bool Source # length :: Rec1 f a -> Int Source # elem :: Eq a => a -> Rec1 f a -> Bool Source # maximum :: Ord a => Rec1 f a -> a Source # minimum :: Ord a => Rec1 f a -> a Source # | |
Foldable f => Foldable (Backwards f) | Derived instance. |
Defined in Control.Applicative.Backwards Methods fold :: Monoid m => Backwards f m -> m Source # foldMap :: Monoid m => (a -> m) -> Backwards f a -> m Source # foldMap' :: Monoid m => (a -> m) -> Backwards f a -> m Source # foldr :: (a -> b -> b) -> b -> Backwards f a -> b Source # foldr' :: (a -> b -> b) -> b -> Backwards f a -> b Source # foldl :: (b -> a -> b) -> b -> Backwards f a -> b Source # foldl' :: (b -> a -> b) -> b -> Backwards f a -> b Source # foldr1 :: (a -> a -> a) -> Backwards f a -> a Source # foldl1 :: (a -> a -> a) -> Backwards f a -> a Source # toList :: Backwards f a -> [a] Source # null :: Backwards f a -> Bool Source # length :: Backwards f a -> Int Source # elem :: Eq a => a -> Backwards f a -> Bool Source # maximum :: Ord a => Backwards f a -> a Source # minimum :: Ord a => Backwards f a -> a Source # | |
Foldable f => Foldable (ExceptT e f) | |
Defined in Control.Monad.Trans.Except Methods fold :: Monoid m => ExceptT e f m -> m Source # foldMap :: Monoid m => (a -> m) -> ExceptT e f a -> m Source # foldMap' :: Monoid m => (a -> m) -> ExceptT e f a -> m Source # foldr :: (a -> b -> b) -> b -> ExceptT e f a -> b Source # foldr' :: (a -> b -> b) -> b -> ExceptT e f a -> b Source # foldl :: (b -> a -> b) -> b -> ExceptT e f a -> b Source # foldl' :: (b -> a -> b) -> b -> ExceptT e f a -> b Source # foldr1 :: (a -> a -> a) -> ExceptT e f a -> a Source # foldl1 :: (a -> a -> a) -> ExceptT e f a -> a Source # toList :: ExceptT e f a -> [a] Source # null :: ExceptT e f a -> Bool Source # length :: ExceptT e f a -> Int Source # elem :: Eq a => a -> ExceptT e f a -> Bool Source # maximum :: Ord a => ExceptT e f a -> a Source # minimum :: Ord a => ExceptT e f a -> a Source # | |
Foldable f => Foldable (IdentityT f) | |
Defined in Control.Monad.Trans.Identity Methods fold :: Monoid m => IdentityT f m -> m Source # foldMap :: Monoid m => (a -> m) -> IdentityT f a -> m Source # foldMap' :: Monoid m => (a -> m) -> IdentityT f a -> m Source # foldr :: (a -> b -> b) -> b -> IdentityT f a -> b Source # foldr' :: (a -> b -> b) -> b -> IdentityT f a -> b Source # foldl :: (b -> a -> b) -> b -> IdentityT f a -> b Source # foldl' :: (b -> a -> b) -> b -> IdentityT f a -> b Source # foldr1 :: (a -> a -> a) -> IdentityT f a -> a Source # foldl1 :: (a -> a -> a) -> IdentityT f a -> a Source # toList :: IdentityT f a -> [a] Source # null :: IdentityT f a -> Bool Source # length :: IdentityT f a -> Int Source # elem :: Eq a => a -> IdentityT f a -> Bool Source # maximum :: Ord a => IdentityT f a -> a Source # minimum :: Ord a => IdentityT f a -> a Source # | |
Foldable f => Foldable (WriterT w f) | |
Defined in Control.Monad.Trans.Writer.Lazy Methods fold :: Monoid m => WriterT w f m -> m Source # foldMap :: Monoid m => (a -> m) -> WriterT w f a -> m Source # foldMap' :: Monoid m => (a -> m) -> WriterT w f a -> m Source # foldr :: (a -> b -> b) -> b -> WriterT w f a -> b Source # foldr' :: (a -> b -> b) -> b -> WriterT w f a -> b Source # foldl :: (b -> a -> b) -> b -> WriterT w f a -> b Source # foldl' :: (b -> a -> b) -> b -> WriterT w f a -> b Source # foldr1 :: (a -> a -> a) -> WriterT w f a -> a Source # foldl1 :: (a -> a -> a) -> WriterT w f a -> a Source # toList :: WriterT w f a -> [a] Source # null :: WriterT w f a -> Bool Source # length :: WriterT w f a -> Int Source # elem :: Eq a => a -> WriterT w f a -> Bool Source # maximum :: Ord a => WriterT w f a -> a Source # minimum :: Ord a => WriterT w f a -> a Source # | |
Foldable f => Foldable (WriterT w f) | |
Defined in Control.Monad.Trans.Writer.Strict Methods fold :: Monoid m => WriterT w f m -> m Source # foldMap :: Monoid m => (a -> m) -> WriterT w f a -> m Source # foldMap' :: Monoid m => (a -> m) -> WriterT w f a -> m Source # foldr :: (a -> b -> b) -> b -> WriterT w f a -> b Source # foldr' :: (a -> b -> b) -> b -> WriterT w f a -> b Source # foldl :: (b -> a -> b) -> b -> WriterT w f a -> b Source # foldl' :: (b -> a -> b) -> b -> WriterT w f a -> b Source # foldr1 :: (a -> a -> a) -> WriterT w f a -> a Source # foldl1 :: (a -> a -> a) -> WriterT w f a -> a Source # toList :: WriterT w f a -> [a] Source # null :: WriterT w f a -> Bool Source # length :: WriterT w f a -> Int Source # elem :: Eq a => a -> WriterT w f a -> Bool Source # maximum :: Ord a => WriterT w f a -> a Source # minimum :: Ord a => WriterT w f a -> a Source # | |
Foldable (Constant a :: Type -> Type) | |
Defined in Data.Functor.Constant Methods fold :: Monoid m => Constant a m -> m Source # foldMap :: Monoid m => (a0 -> m) -> Constant a a0 -> m Source # foldMap' :: Monoid m => (a0 -> m) -> Constant a a0 -> m Source # foldr :: (a0 -> b -> b) -> b -> Constant a a0 -> b Source # foldr' :: (a0 -> b -> b) -> b -> Constant a a0 -> b Source # foldl :: (b -> a0 -> b) -> b -> Constant a a0 -> b Source # foldl' :: (b -> a0 -> b) -> b -> Constant a a0 -> b Source # foldr1 :: (a0 -> a0 -> a0) -> Constant a a0 -> a0 Source # foldl1 :: (a0 -> a0 -> a0) -> Constant a a0 -> a0 Source # toList :: Constant a a0 -> [a0] Source # null :: Constant a a0 -> Bool Source # length :: Constant a a0 -> Int Source # elem :: Eq a0 => a0 -> Constant a a0 -> Bool Source # maximum :: Ord a0 => Constant a a0 -> a0 Source # minimum :: Ord a0 => Constant a a0 -> a0 Source # | |
Foldable f => Foldable (Reverse f) | Fold from right to left. |
Defined in Data.Functor.Reverse Methods fold :: Monoid m => Reverse f m -> m Source # foldMap :: Monoid m => (a -> m) -> Reverse f a -> m Source # foldMap' :: Monoid m => (a -> m) -> Reverse f a -> m Source # foldr :: (a -> b -> b) -> b -> Reverse f a -> b Source # foldr' :: (a -> b -> b) -> b -> Reverse f a -> b Source # foldl :: (b -> a -> b) -> b -> Reverse f a -> b Source # foldl' :: (b -> a -> b) -> b -> Reverse f a -> b Source # foldr1 :: (a -> a -> a) -> Reverse f a -> a Source # foldl1 :: (a -> a -> a) -> Reverse f a -> a Source # toList :: Reverse f a -> [a] Source # null :: Reverse f a -> Bool Source # length :: Reverse f a -> Int Source # elem :: Eq a => a -> Reverse f a -> Bool Source # maximum :: Ord a => Reverse f a -> a Source # minimum :: Ord a => Reverse f a -> a Source # | |
(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 Source # foldMap :: Monoid m => (a -> m) -> Product f g a -> m Source # foldMap' :: Monoid m => (a -> m) -> Product f g a -> m Source # foldr :: (a -> b -> b) -> b -> Product f g a -> b Source # foldr' :: (a -> b -> b) -> b -> Product f g a -> b Source # foldl :: (b -> a -> b) -> b -> Product f g a -> b Source # foldl' :: (b -> a -> b) -> b -> Product f g a -> b Source # foldr1 :: (a -> a -> a) -> Product f g a -> a Source # foldl1 :: (a -> a -> a) -> Product f g a -> a Source # toList :: Product f g a -> [a] Source # null :: Product f g a -> Bool Source # length :: Product f g a -> Int Source # elem :: Eq a => a -> Product f g a -> Bool Source # maximum :: Ord a => Product f g a -> a Source # minimum :: Ord a => Product f g a -> a Source # | |
(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 Source # foldMap :: Monoid m => (a -> m) -> Sum f g a -> m Source # foldMap' :: Monoid m => (a -> m) -> Sum f g a -> m Source # foldr :: (a -> b -> b) -> b -> Sum f g a -> b Source # foldr' :: (a -> b -> b) -> b -> Sum f g a -> b Source # foldl :: (b -> a -> b) -> b -> Sum f g a -> b Source # foldl' :: (b -> a -> b) -> b -> Sum f g a -> b Source # foldr1 :: (a -> a -> a) -> Sum f g a -> a Source # foldl1 :: (a -> a -> a) -> Sum f g a -> a Source # toList :: Sum f g a -> [a] Source # null :: Sum f g a -> Bool Source # length :: Sum f g a -> Int Source # elem :: Eq a => a -> Sum f g a -> Bool Source # maximum :: Ord a => Sum f g a -> a Source # minimum :: Ord a => Sum f g a -> a Source # | |
(Foldable f, Foldable g) => Foldable (f :*: g) | Since: base-4.9.0.0 |
Defined in Data.Foldable Methods fold :: Monoid m => (f :*: g) m -> m Source # foldMap :: Monoid m => (a -> m) -> (f :*: g) a -> m Source # foldMap' :: Monoid m => (a -> m) -> (f :*: g) a -> m Source # foldr :: (a -> b -> b) -> b -> (f :*: g) a -> b Source # foldr' :: (a -> b -> b) -> b -> (f :*: g) a -> b Source # foldl :: (b -> a -> b) -> b -> (f :*: g) a -> b Source # foldl' :: (b -> a -> b) -> b -> (f :*: g) a -> b Source # foldr1 :: (a -> a -> a) -> (f :*: g) a -> a Source # foldl1 :: (a -> a -> a) -> (f :*: g) a -> a Source # toList :: (f :*: g) a -> [a] Source # null :: (f :*: g) a -> Bool Source # length :: (f :*: g) a -> Int Source # elem :: Eq a => a -> (f :*: g) a -> Bool Source # maximum :: Ord a => (f :*: g) a -> a Source # minimum :: Ord a => (f :*: g) a -> a Source # | |
(Foldable f, Foldable g) => Foldable (f :+: g) | Since: base-4.9.0.0 |
Defined in Data.Foldable Methods fold :: Monoid m => (f :+: g) m -> m Source # foldMap :: Monoid m => (a -> m) -> (f :+: g) a -> m Source # foldMap' :: Monoid m => (a -> m) -> (f :+: g) a -> m Source # foldr :: (a -> b -> b) -> b -> (f :+: g) a -> b Source # foldr' :: (a -> b -> b) -> b -> (f :+: g) a -> b Source # foldl :: (b -> a -> b) -> b -> (f :+: g) a -> b Source # foldl' :: (b -> a -> b) -> b -> (f :+: g) a -> b Source # foldr1 :: (a -> a -> a) -> (f :+: g) a -> a Source # foldl1 :: (a -> a -> a) -> (f :+: g) a -> a Source # toList :: (f :+: g) a -> [a] Source # null :: (f :+: g) a -> Bool Source # length :: (f :+: g) a -> Int Source # elem :: Eq a => a -> (f :+: g) a -> Bool Source # maximum :: Ord a => (f :+: g) a -> a Source # minimum :: Ord a => (f :+: g) a -> a Source # | |
Foldable (K1 i c :: Type -> Type) | Since: base-4.9.0.0 |
Defined in Data.Foldable Methods fold :: Monoid m => K1 i c m -> m Source # foldMap :: Monoid m => (a -> m) -> K1 i c a -> m Source # foldMap' :: Monoid m => (a -> m) -> K1 i c a -> m Source # foldr :: (a -> b -> b) -> b -> K1 i c a -> b Source # foldr' :: (a -> b -> b) -> b -> K1 i c a -> b Source # foldl :: (b -> a -> b) -> b -> K1 i c a -> b Source # foldl' :: (b -> a -> b) -> b -> K1 i c a -> b Source # foldr1 :: (a -> a -> a) -> K1 i c a -> a Source # foldl1 :: (a -> a -> a) -> K1 i c a -> a Source # toList :: K1 i c a -> [a] Source # null :: K1 i c a -> Bool Source # length :: K1 i c a -> Int Source # elem :: Eq a => a -> K1 i c a -> Bool Source # maximum :: Ord a => K1 i c a -> a Source # minimum :: Ord a => K1 i c a -> a Source # | |
(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 Source # foldMap :: Monoid m => (a -> m) -> Compose f g a -> m Source # foldMap' :: Monoid m => (a -> m) -> Compose f g a -> m Source # foldr :: (a -> b -> b) -> b -> Compose f g a -> b Source # foldr' :: (a -> b -> b) -> b -> Compose f g a -> b Source # foldl :: (b -> a -> b) -> b -> Compose f g a -> b Source # foldl' :: (b -> a -> b) -> b -> Compose f g a -> b Source # foldr1 :: (a -> a -> a) -> Compose f g a -> a Source # foldl1 :: (a -> a -> a) -> Compose f g a -> a Source # toList :: Compose f g a -> [a] Source # null :: Compose f g a -> Bool Source # length :: Compose f g a -> Int Source # elem :: Eq a => a -> Compose f g a -> Bool Source # maximum :: Ord a => Compose f g a -> a Source # minimum :: Ord a => Compose f g a -> a Source # | |
(Foldable f, Foldable g) => Foldable (f :.: g) | Since: base-4.9.0.0 |
Defined in Data.Foldable Methods fold :: Monoid m => (f :.: g) m -> m Source # foldMap :: Monoid m => (a -> m) -> (f :.: g) a -> m Source # foldMap' :: Monoid m => (a -> m) -> (f :.: g) a -> m Source # foldr :: (a -> b -> b) -> b -> (f :.: g) a -> b Source # foldr' :: (a -> b -> b) -> b -> (f :.: g) a -> b Source # foldl :: (b -> a -> b) -> b -> (f :.: g) a -> b Source # foldl' :: (b -> a -> b) -> b -> (f :.: g) a -> b Source # foldr1 :: (a -> a -> a) -> (f :.: g) a -> a Source # foldl1 :: (a -> a -> a) -> (f :.: g) a -> a Source # toList :: (f :.: g) a -> [a] Source # null :: (f :.: g) a -> Bool Source # length :: (f :.: g) a -> Int Source # elem :: Eq a => a -> (f :.: g) a -> Bool Source # maximum :: Ord a => (f :.: g) a -> a Source # minimum :: Ord a => (f :.: g) a -> a Source # | |
Foldable f => Foldable (M1 i c f) | Since: base-4.9.0.0 |
Defined in Data.Foldable Methods fold :: Monoid m => M1 i c f m -> m Source # foldMap :: Monoid m => (a -> m) -> M1 i c f a -> m Source # foldMap' :: Monoid m => (a -> m) -> M1 i c f a -> m Source # foldr :: (a -> b -> b) -> b -> M1 i c f a -> b Source # foldr' :: (a -> b -> b) -> b -> M1 i c f a -> b Source # foldl :: (b -> a -> b) -> b -> M1 i c f a -> b Source # foldl' :: (b -> a -> b) -> b -> M1 i c f a -> b Source # foldr1 :: (a -> a -> a) -> M1 i c f a -> a Source # foldl1 :: (a -> a -> a) -> M1 i c f a -> a Source # toList :: M1 i c f a -> [a] Source # null :: M1 i c f a -> Bool Source # length :: M1 i c f a -> Int Source # elem :: Eq a => a -> M1 i c f a -> Bool Source # maximum :: Ord a => M1 i c f a -> a Source # minimum :: Ord a => M1 i c f a -> a Source # |
Conversion of values to readable String
s.
Derived instances of Show
have the following properties, which
are compatible with derived instances of Read
:
- The result of
show
is a syntactically correct Haskell expression containing only constants, given the fixity declarations in force at the point where the type is declared. It contains only the constructor names defined in the data type, parentheses, and spaces. When labelled constructor fields are used, braces, commas, field names, and equal signs are also used. - If the constructor is defined to be an infix operator, then
showsPrec
will produce infix applications of the constructor. - the representation will be enclosed in parentheses if the
precedence of the top-level constructor in
x
is less thand
(associativity is ignored). Thus, ifd
is0
then the result is never surrounded in parentheses; ifd
is11
it is always surrounded in parentheses, unless it is an atomic expression. - If the constructor is defined using record syntax, then
show
will produce the record-syntax form, with the fields given in the same order as the original declaration.
For example, given the declarations
infixr 5 :^: data Tree a = Leaf a | Tree a :^: Tree a
the derived instance of Show
is equivalent to
instance (Show a) => Show (Tree a) where showsPrec d (Leaf m) = showParen (d > app_prec) $ showString "Leaf " . showsPrec (app_prec+1) m where app_prec = 10 showsPrec d (u :^: v) = showParen (d > up_prec) $ showsPrec (up_prec+1) u . showString " :^: " . showsPrec (up_prec+1) v where up_prec = 5
Note that right-associativity of :^:
is ignored. For example,
produces the stringshow
(Leaf 1 :^: Leaf 2 :^: Leaf 3)"Leaf 1 :^: (Leaf 2 :^: Leaf 3)"
.
Methods
Arguments
:: Int | the operator precedence of the enclosing
context (a number from |
-> a | the value to be converted to a |
-> ShowS |
Convert a value to a readable String
.
showsPrec
should satisfy the law
showsPrec d x r ++ s == showsPrec d x (r ++ s)
Derived instances of Read
and Show
satisfy the following:
That is, readsPrec
parses the string produced by
showsPrec
, and delivers the value that showsPrec
started with.
Instances
Show NestedAtomically | Since: base-4.0 |
Defined in Control.Exception.Base | |
Show NoMatchingContinuationPrompt | Since: base-4.18 |
Defined in Control.Exception.Base | |
Show NoMethodError | Since: base-4.0 |
Defined in Control.Exception.Base | |
Show NonTermination | Since: base-4.0 |
Defined in Control.Exception.Base | |
Show PatternMatchFail | Since: base-4.0 |
Defined in Control.Exception.Base | |
Show RecConError | Since: base-4.0 |
Defined in Control.Exception.Base | |
Show RecSelError | Since: base-4.0 |
Defined in Control.Exception.Base | |
Show RecUpdError | Since: base-4.0 |
Defined in Control.Exception.Base | |
Show TypeError | Since: base-4.9.0.0 |
Show ByteArray | Since: base-4.17.0.0 |
Show Constr | Since: base-4.0.0.0 |
Show ConstrRep | Since: base-4.0.0.0 |
Show DataRep | Since: base-4.0.0.0 |
Show DataType | Since: base-4.0.0.0 |
Show Fixity | Since: base-4.0.0.0 |
Show Dynamic | Since: base-2.1 |
Show All | Since: base-2.1 |
Show Any | Since: base-2.1 |
Show SomeTypeRep | Since: base-4.10.0.0 |
Defined in Data.Typeable.Internal | |
Show Version | Since: base-2.1 |
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 Foreign.C.Types | |
Show CShort | |
Show CSigAtomic | |
Defined in Foreign.C.Types | |
Show CSize | |
Show CTime | |
Show CUChar | |
Show CUInt | |
Show CUIntMax | |
Show CUIntPtr | |
Show CULLong | |
Show CULong | |
Show CUSeconds | |
Show CUShort | |
Show CWchar | |
Show IntPtr | |
Show WordPtr | |
Show Void | Since: base-4.8.0.0 |
Show ByteOrder | Since: base-4.11.0.0 |
Show BlockReason | Since: base-4.3.0.0 |
Defined in GHC.Conc.Sync | |
Show ThreadId | Since: base-4.2.0.0 |
Show ThreadStatus | Since: base-4.3.0.0 |
Defined in GHC.Conc.Sync | |
Show ErrorCall | Since: base-4.0.0.0 |
Show ArithException | Since: base-4.0.0.0 |
Defined in GHC.Exception.Type | |
Show SomeException | Since: base-3.0 |
Defined in GHC.Exception.Type | |
Show Fingerprint | Since: base-4.7.0.0 |
Defined in GHC.Fingerprint.Type | |
Show Associativity | Since: base-4.6.0.0 |
Defined in GHC.Generics | |
Show DecidedStrictness | Since: base-4.9.0.0 |
Defined in GHC.Generics | |
Show Fixity | Since: base-4.6.0.0 |
Show SourceStrictness | Since: base-4.9.0.0 |
Defined in GHC.Generics | |
Show SourceUnpackedness | Since: base-4.9.0.0 |
Defined in GHC.Generics | |
Show MaskingState | Since: base-4.3.0.0 |
Show SeekMode | Since: base-4.2.0.0 |
Show CodingFailureMode | Since: base-4.4.0.0 |
Defined in GHC.IO.Encoding.Failure | |
Show CodingProgress | Since: base-4.4.0.0 |
Defined in GHC.IO.Encoding.Types | |
Show TextEncoding | Since: base-4.3.0.0 |
Defined in GHC.IO.Encoding.Types | |
Show AllocationLimitExceeded | Since: base-4.7.1.0 |
Defined in GHC.IO.Exception | |
Show ArrayException | Since: base-4.1.0.0 |
Defined in GHC.IO.Exception | |
Show AssertionFailed | Since: base-4.1.0.0 |
Defined in GHC.IO.Exception | |
Show AsyncException | Since: base-4.1.0.0 |
Defined in GHC.IO.Exception | |
Show BlockedIndefinitelyOnMVar | Since: base-4.1.0.0 |
Defined in GHC.IO.Exception | |
Show BlockedIndefinitelyOnSTM | Since: base-4.1.0.0 |
Defined in GHC.IO.Exception | |
Show CompactionFailed | Since: base-4.10.0.0 |
Defined in GHC.IO.Exception | |
Show Deadlock | Since: base-4.1.0.0 |
Show ExitCode | |
Show FixIOException | Since: base-4.11.0.0 |
Defined in GHC.IO.Exception | |
Show IOErrorType | Since: base-4.1.0.0 |
Defined in GHC.IO.Exception | |
Show IOException | Since: base-4.1.0.0 |
Defined in GHC.IO.Exception | |
Show SomeAsyncException | Since: base-4.7.0.0 |
Defined in GHC.IO.Exception | |
Show FD | Since: base-4.1.0.0 |
Show HandlePosn | Since: base-4.1.0.0 |
Defined in GHC.IO.Handle | |
Show BufferMode | Since: base-4.2.0.0 |
Defined in GHC.IO.Handle.Types | |
Show Handle | Since: base-4.1.0.0 |
Show HandleType | Since: base-4.1.0.0 |
Defined in GHC.IO.Handle.Types | |
Show Newline | Since: base-4.3.0.0 |
Show NewlineMode | Since: base-4.3.0.0 |
Defined in GHC.IO.Handle.Types | |
Show IOMode | Since: base-4.2.0.0 |
Show IOPortException | |
Show InfoProv | |
Show Int16 | Since: base-2.1 |
Show Int32 | Since: base-2.1 |
Show Int64 | Since: base-2.1 |
Show Int8 | Since: base-2.1 |
Show CCFlags | Since: base-4.8.0.0 |
Show ConcFlags | Since: base-4.8.0.0 |
Show DebugFlags | Since: base-4.8.0.0 |
Defined in GHC.RTS.Flags | |
Show DoCostCentres | Since: base-4.8.0.0 |
Defined in GHC.RTS.Flags | |
Show DoHeapProfile | Since: base-4.8.0.0 |
Defined in GHC.RTS.Flags | |
Show DoTrace | Since: base-4.8.0.0 |
Show GCFlags | Since: base-4.8.0.0 |
Show GiveGCStats | Since: base-4.8.0.0 |
Defined in GHC.RTS.Flags | |
Show IoSubSystem | |
Defined in GHC.RTS.Flags | |
Show MiscFlags | Since: base-4.8.0.0 |
Show ParFlags | Since: base-4.8.0.0 |
Show ProfFlags | Since: base-4.8.0.0 |
Show RTSFlags | Since: base-4.8.0.0 |
Show TickyFlags | Since: base-4.8.0.0 |
Defined in GHC.RTS.Flags | |
Show TraceFlags | Since: base-4.8.0.0 |
Defined in GHC.RTS.Flags | |
Show FractionalExponentBase | |
Show StackEntry | |
Defined in GHC.Stack.CloneStack | |
Show CallStack | Since: base-4.9.0.0 |
Show SrcLoc | Since: base-4.9.0.0 |
Show StaticPtrInfo | Since: base-4.8.0.0 |
Defined in GHC.StaticPtr | |
Show GCDetails | Since: base-4.10.0.0 |
Show RTSStats | Since: base-4.10.0.0 |
Show SomeChar | |
Show SomeSymbol | Since: base-4.7.0.0 |
Defined in GHC.TypeLits | |
Show SomeNat | Since: base-4.7.0.0 |
Show GeneralCategory | Since: base-2.1 |
Defined in GHC.Unicode | |
Show Word16 | Since: base-2.1 |
Show Word32 | Since: base-2.1 |
Show Word64 | Since: base-2.1 |
Show Word8 | Since: base-2.1 |
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 Timeout | Since: base-4.0 |
Show Lexeme | Since: base-2.1 |
Show Number | Since: base-4.6.0.0 |
Show FormatMode | |
Show ByteString | |
Defined in Data.ByteString.Internal.Type | |
Show SizeOverflowException | |
Defined in Data.ByteString.Internal.Type | |
Show ByteString | |
Defined in Data.ByteString.Lazy.Internal | |
Show ShortByteString | |
Defined in Data.ByteString.Short.Internal | |
Show IntSet | |
Show BitQueue | |
Show BitQueueB | |
Show FileType | |
Show Permissions | |
Defined in System.Directory.Internal.Common | |
Show XdgDirectory | |
Defined in System.Directory.Internal.Common | |
Show XdgDirectoryList | |
Defined in System.Directory.Internal.Common | |
Show EncodingException | |
Defined in System.OsPath.Encoding.Internal | |
Show OsChar | |
Show OsString | On windows, decodes as UCS-2. On unix prints the raw bytes without decoding. |
Show PosixChar | |
Show PosixString | Prints the raw bytes without decoding. |
Defined in System.OsString.Internal.Types | |
Show WindowsChar | |
Defined in System.OsString.Internal.Types | |
Show WindowsString | Decodes as UCS-2. |
Defined in System.OsString.Internal.Types | |
Show GhcApiError Source # | |
Show ByteOff Source # | |
Show FFIInfo Source # | |
Show HalfWord Source # | |
Show ItblPtr Source # | |
Show RegBitmap Source # | |
Show WordOff Source # | |
Show SectionType Source # | |
Show CLabel Source # | |
Show UniqueSet Source # | |
Show Label Source # | |
Show LabelSet Source # | |
Show RPNum Source # | |
Show AlignmentSpec Source # | |
Defined in GHC.Cmm.Expr | |
Show Area Source # | |
Show CmmExpr Source # | |
Show CmmLit Source # | |
Show CmmToken Source # | |
Show AtomicMachOp Source # | |
Defined in GHC.Cmm.MachOp | |
Show CallishMachOp Source # | |
Defined in GHC.Cmm.MachOp | |
Show FMASign Source # | |
Show MachOp Source # | |
Show MemoryOrdering Source # | |
Defined in GHC.Cmm.MachOp | |
Show Reducibility Source # | |
Defined in GHC.Cmm.Reducibility | |
Show CmmReg Source # | |
Show GlobalReg Source # | |
Show GlobalRegUse Source # | |
Defined in GHC.Cmm.Reg | |
Show LocalReg Source # | |
Show SwitchPlan Source # | |
Defined in GHC.Cmm.Switch | |
Show SwitchTargets Source # | |
Defined in GHC.Cmm.Switch | |
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 | |
Show SymName Source # | |
Show IsSubmult Source # | |
Show IsRecDataConResult Source # | |
Defined in GHC.Core.Opt.WorkWrap.Utils | |
Show PrimElemRep Source # | |
Defined in GHC.Core.TyCon | |
Show PrimRep Source # | |
Show OverridingBool Source # | |
Defined in GHC.Data.Bool | |
Show FastString Source # | |
Defined in GHC.Data.FastString | |
Show LexicalFastString Source # | |
Defined in GHC.Data.FastString | |
Show NonDetFastString Source # | |
Defined in GHC.Data.FastString | |
Show IOEnvFailure Source # | |
Defined in GHC.Data.IOEnv | |
Show StringBuffer Source # | |
Defined in GHC.Data.StringBuffer | |
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 | |
Show BackendName Source # | |
Defined in GHC.Driver.Backend.Internal | |
Show DynamicTooState Source # | |
Defined in GHC.Driver.DynFlags | |
Show GhcLink Source # | |
Show IncludeSpecs Source # | |
Defined in GHC.Driver.DynFlags | |
Show PackageArg Source # | |
Defined in GHC.Driver.DynFlags | |
Show RtsOptsEnabled Source # | |
Defined in GHC.Driver.DynFlags | |
Show DumpFlag Source # | |
Show GeneralFlag Source # | |
Defined in GHC.Driver.Flags | |
Show Language Source # | |
Show WarningFlag Source # | |
Defined in GHC.Driver.Flags | |
Show Phase Source # | |
Show PipelineOutput Source # | |
Defined in GHC.Driver.Pipeline.Monad | |
Show HsDocString Source # | |
Defined in GHC.Hs.DocString | |
Show HsDocStringChunk Source # | |
Defined in GHC.Hs.DocString | |
Show HsDocStringDecorator Source # | |
Defined in GHC.Hs.DocString | |
Show BlankEpAnnotations Source # | |
Defined in GHC.Hs.Dump | |
Show BlankSrcSpan Source # | |
Defined in GHC.Hs.Dump | |
Show GenerateInhabitingPatternsMode Source # | |
Defined in GHC.HsToCore.Pmc.Solver | |
Show PmEquality Source # | |
Defined in GHC.HsToCore.Pmc.Solver.Types | |
Show Precision Source # | |
Show UnfoldingExposure Source # | |
Defined in GHC.Iface.Tidy | |
Show AOp Source # | |
Show Op Source # | |
Show UOp Source # | |
Show Ident Source # | |
Show JOp Source # | |
Show JUOp Source # | |
Show LlvmAtomicOp Source # | |
Defined in GHC.Llvm.Syntax | |
Show LlvmSyncOrdering Source # | |
Defined in GHC.Llvm.Syntax | |
Show LlvmCallType Source # | |
Defined in GHC.Llvm.Types | |
Show LlvmParameterListType Source # | |
Defined in GHC.Llvm.Types | |
Show Anchor Source # | |
Show AnchorOperation Source # | |
Defined in GHC.Parser.Annotation | |
Show AnnKeywordId Source # | |
Defined in GHC.Parser.Annotation | |
Show DeltaPos Source # | |
Show EpaComment Source # | |
Defined in GHC.Parser.Annotation | |
Show EpaCommentTok Source # | |
Defined in GHC.Parser.Annotation | |
Show HasE Source # | |
Show IsUnicodeSyntax Source # | |
Defined in GHC.Parser.Annotation | |
Show LexErrKind Source # | |
Defined in GHC.Parser.Errors.Types | |
Show NumUnderscoreReason Source # | |
Defined in GHC.Parser.Errors.Types | |
Show HdkComment Source # | |
Defined in GHC.Parser.Lexer | |
Show Token Source # | |
Show Platform Source # | |
Show PlatformWordSize Source # | |
Defined in GHC.Platform | |
Show PlatformConstants Source # | |
Defined in GHC.Platform.Constants | |
Show Profile Source # | |
Show RealReg Source # | |
Show Reg Source # | |
Show VirtualReg Source # | |
Defined in GHC.Platform.Reg | |
Show Way Source # | |
Show StgLiftConfig Source # | |
Defined in GHC.Stg.Lift.Config | |
Show StgToDo Source # | |
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 | |
Show ClosureType Source # | |
Defined in GHC.StgToJS.Types | |
Show ExpFun Source # | |
Show JSFFIType Source # | |
Show StaticArg Source # | |
Show StaticInfo Source # | |
Defined in GHC.StgToJS.Types | |
Show StaticLit Source # | |
Show StaticUnboxed Source # | |
Defined in GHC.StgToJS.Types | |
Show StaticVal Source # | |
Show ThreadStatus Source # | |
Defined in GHC.StgToJS.Types | |
Show VarType Source # | |
Show SlotCount Source # | |
Show Archive Source # | |
Show ArchiveEntry Source # | |
Defined in GHC.SysTools.Ar | |
Show HasKinds Source # | |
Show SuggestPartialTypeSignatures Source # | |
Defined in GHC.Tc.Errors.Types | |
Show SuggestUndecidableInstances Source # | |
Defined in GHC.Tc.Errors.Types | |
Show InlineSpec Source # | |
Defined in GHC.Types.Basic | |
Show Levity Source # | |
Show PprPrec Source # | |
Show RuleMatchInfo Source # | |
Defined in GHC.Types.Basic | |
Show Card Source # | |
Show DiagnosticReason Source # | |
Defined in GHC.Types.Error | |
Show Severity Source # | |
Show DuplicateRecordFields Source # | |
Defined in GHC.Types.FieldLabel | |
Show FieldSelectors Source # | |
Defined in GHC.Types.FieldLabel | |
Show Safety Source # | |
Show FieldsOrSelectors Source # | |
Defined in GHC.Types.Name.Reader | |
Show SafeHaskellMode Source # | |
Defined in GHC.Types.SafeHaskell | |
Show SaneDouble Source # | |
Defined in GHC.Types.SaneDouble | |
Show SourceError Source # | |
Defined in GHC.Types.SourceError | |
Show HsBootOrSig Source # | |
Defined in GHC.Types.SourceFile | |
Show HscSource Source # | |
Show FractionalExponentBase Source # | |
Defined in GHC.Types.SourceText | |
Show FractionalLit Source # | |
Defined in GHC.Types.SourceText | |
Show IntegralLit Source # | |
Defined in GHC.Types.SourceText | |
Show SourceText Source # | |
Defined in GHC.Types.SourceText | |
Show BufPos Source # | |
Show BufSpan Source # | |
Show PsLoc Source # | |
Show PsSpan Source # | |
Show RealSrcLoc Source # | |
Defined in GHC.Types.SrcLoc | |
Show RealSrcSpan Source # | |
Defined in GHC.Types.SrcLoc | |
Show SrcLoc Source # | |
Show SrcSpan Source # | |
Show UnhelpfulSpanReason Source # | |
Defined in GHC.Types.SrcLoc | |
Show TickishPlacement Source # | |
Defined in GHC.Types.Tickish | |
Show Unique Source # | |
Show FinderOpts Source # | |
Defined in GHC.Unit.Finder.Types | |
Show ModLocation Source # | |
Defined in GHC.Unit.Module.Location | |
Show WarningCategory Source # | |
Defined in GHC.Unit.Module.Warnings | |
Show Unit Source # | |
Show DumpFormat Source # | |
Defined in GHC.Utils.Logger | |
Show GhcException Source # | |
Defined in GHC.Utils.Panic | |
Show PlainGhcException Source # | |
Defined in GHC.Utils.Panic.Plain | |
Show Doc Source # | |
Show TempFileLifetime Source # | |
Defined in GHC.Utils.TmpFs | |
Show SpliceDecoration Source # | |
Defined in Language.Haskell.Syntax.Decls | |
Show IsBootInterface Source # | |
Defined in Language.Haskell.Syntax.ImpExp | |
Show ModuleName Source # | |
Defined in Language.Haskell.Syntax.Module.Name | |
Show ShortText | |
Show Arch | |
Show ArchOS | |
Show ArmABI | |
Show ArmISA | |
Show ArmISAExt | |
Show OS | |
Show PPC_64ABI | |
Show DbInstUnitId | |
Defined in GHC.Unit.Database | |
Show DbModule | |
Show ForeignSrcLang | |
Defined in GHC.ForeignSrcLang.Type | |
Show Extension | |
Show ClosureType | |
Defined in GHC.Exts.Heap.ClosureTypes | |
Show Box | |
Show PrimType | |
Show TsoFlags | |
Show WhatNext | |
Show WhyBlocked | |
Defined in GHC.Exts.Heap.Closures | |
Show StgInfoTable | |
Defined in GHC.Exts.Heap.InfoTable.Types | |
Show CostCentre | |
Defined in GHC.Exts.Heap.ProfInfo.Types | |
Show CostCentreStack | |
Defined in GHC.Exts.Heap.ProfInfo.Types | |
Show IndexTable | |
Defined in GHC.Exts.Heap.ProfInfo.Types | |
Show StgTSOProfInfo | |
Defined in GHC.Exts.Heap.ProfInfo.Types | |
Show KindRep | |
Show Module | Since: base-4.9.0.0 |
Show Ordering | Since: base-2.1 |
Show TrName | Since: base-4.9.0.0 |
Show TyCon | Since: base-2.1 |
Show TypeLitSort | Since: base-4.11.0.0 |
Show FFIConv | |
Show FFIType | |
Show EvalOpts | |
Show QState | |
Show SerializableException | |
Defined in GHCi.Message | |
Show THResultType | |
Defined in GHCi.Message | |
Show HValue | |
Show ResolvedBCO | |
Defined in GHCi.ResolvedBCO | |
Show ResolvedBCOPtr | |
Defined in GHCi.ResolvedBCO | |
Show GHCiQException | |
Show BoxLabel | |
Show CondBox | |
Show Mix | |
Show Tix | |
Show TixModule | |
Show Hash | |
Show HpcPos | |
Show Mode | |
Show Style | |
Show TextDetails | |
Show Doc | |
Show CmdSpec | |
Show CreateProcess | |
Defined in System.Process.Common | |
Show StdStream | |
Show ForallVisFlag | |
Defined in Language.Haskell.TH.Ppr | |
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 | |
Show DerivClause | |
Defined in Language.Haskell.TH.Syntax | |
Show DerivStrategy | |
Defined in Language.Haskell.TH.Syntax | |
Show DocLoc | |
Show Exp | |
Show FamilyResultSig | |
Defined in Language.Haskell.TH.Syntax | |
Show Fixity | |
Show FixityDirection | |
Defined in Language.Haskell.TH.Syntax | |
Show Foreign | |
Show FunDep | |
Show Guard | |
Show Info | |
Show InjectivityAnn | |
Defined in Language.Haskell.TH.Syntax | |
Show Inline | |
Show Lit | |
Show Loc | |
Show Match | |
Show ModName | |
Show Module | |
Show ModuleInfo | |
Defined in Language.Haskell.TH.Syntax | |
Show Name | |
Show NameFlavour | |
Defined in Language.Haskell.TH.Syntax | |
Show NameSpace | |
Show OccName | |
Show Overlap | |
Show Pat | |
Show PatSynArgs | |
Defined in Language.Haskell.TH.Syntax | |
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 | |
Show SourceUnpackedness | |
Defined in Language.Haskell.TH.Syntax | |
Show Specificity | |
Defined in Language.Haskell.TH.Syntax | |
Show Stmt | |
Show TyLit | |
Show TySynEqn | |
Show Type | |
Show TypeFamilyHead | |
Defined in Language.Haskell.TH.Syntax | |
Show Month | Show as |
Show Quarter | Show as |
Show QuarterOfYear | |
Defined in Data.Time.Calendar.Quarter | |
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 | |
Show StatxFlags | |
Defined in System.Posix.Files.Common | |
Show StatxMask | |
Show OpenFileFlags | |
Defined in System.Posix.IO.Common | |
Show OpenMode | |
Show ProcessStatus | |
Defined in System.Posix.Process.Internals | |
Show Resource | |
Show ResourceLimit | |
Defined in System.Posix.Resource | |
Show ResourceLimits | |
Defined in System.Posix.Resource | |
Show Integer | Since: base-2.1 |
Show Natural | Since: base-4.8.0.0 |
Show () | Since: base-2.1 |
Show Bool | Since: base-2.1 |
Show Char | Since: base-2.1 |
Show Int | Since: base-2.1 |
Show Levity | Since: base-4.15.0.0 |
Show RuntimeRep | Since: base-4.11.0.0 |
Show VecCount | Since: base-4.11.0.0 |
Show VecElem | Since: base-4.11.0.0 |
Show Word | Since: base-2.1 |
Show a => Show (ZipList a) | Since: base-4.7.0.0 |
Show a => Show (And a) | Since: base-4.16 |
Show a => Show (Iff a) | Since: base-4.16 |
Show a => Show (Ior a) | Since: base-4.16 |
Show a => Show (Xor a) | Since: base-4.16 |
Show a => Show (Complex a) | Since: base-2.1 |
Show a => Show (Identity a) | This instance would be equivalent to the derived instances of the
Since: base-4.8.0.0 |
Show a => Show (First a) | Since: base-2.1 |
Show a => Show (Last a) | Since: base-2.1 |
Show a => Show (Down a) | This instance would be equivalent to the derived instances of the
Since: base-4.7.0.0 |
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 | |
Show a => Show (Dual a) | Since: base-2.1 |
Show a => Show (Product a) | Since: base-2.1 |
Show a => Show (Sum a) | Since: base-2.1 |
Show (ConstPtr a) | |
Show a => Show (NonEmpty a) | Since: base-4.11.0.0 |
Show (ForeignPtr a) | Since: base-2.1 |
Defined in GHC.ForeignPtr | |
Show p => Show (Par1 p) | Since: base-4.7.0.0 |
Show (FunPtr a) | Since: base-2.1 |
Show (Ptr a) | Since: base-2.1 |
Show a => Show (Ratio a) | Since: base-2.0.1 |
Show (SChar c) | Since: base-4.18.0.0 |
Show (SSymbol s) | Since: base-4.18.0.0 |
Show (SNat n) | Since: base-4.18.0.0 |
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 | |
Show a => Show (Set a) | |
Show a => Show (Tree a) | |
Show a => Show (ExitCase a) | |
Show v => Show (UniqueMap v) Source # | |
Show v => Show (LabelMap v) Source # | |
Show (WasmTypeTag t) Source # | |
Defined in GHC.CmmToAsm.Wasm.Types | |
Show a => Show (LPath a) Source # | |
Show a => Show (Maybe a) Source # | |
Show a => Show (OnOff a) Source # | |
Show a => Show (IdentSupply a) Source # | |
Defined in GHC.JS.Unsat.Syntax | |
Show a => Show (NonVoid a) Source # | |
Show (MsgEnvelope DiagnosticMessage) Source # | |
Defined in GHC.Types.Error Methods showsPrec :: Int -> MsgEnvelope DiagnosticMessage -> ShowS Source # show :: MsgEnvelope DiagnosticMessage -> String Source # showList :: [MsgEnvelope DiagnosticMessage] -> ShowS Source # | |
Show mod => Show (GenWithIsBoot mod) Source # | |
Defined in GHC.Unit.Types | |
Show a => Show (FixedLengthEncoding a) Source # | |
Defined in GHC.Utils.Binary | |
Show a => Show (SizedSeq a) | |
Show b => Show (GenClosure b) | |
Defined in GHC.Exts.Heap.Closures | |
Show a => Show (EvalExpr a) | |
Show a => Show (EvalResult a) | |
Defined in GHCi.Message | |
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) | Since: base-2.1 |
Show a => Show (Solo a) | Since: base-4.15 |
Show a => Show [a] | Since: base-2.1 |
(Ix ix, Show ix, Show e, IArray UArray e) => Show (UArray ix e) | |
(Show a, Show b) => Show (Either a b) | Since: base-3.0 |
HasResolution a => Show (Fixed a) | Since: base-2.1 |
Show (Proxy s) | Since: base-4.7.0.0 |
(Show a, Show b) => Show (Arg a b) | Since: base-4.9.0.0 |
Show (TypeRep a) | |
(Ix a, Show a, Show b) => Show (Array a b) | Since: base-2.1 |
Show (U1 p) | Since: base-4.9.0.0 |
Show (V1 p) | Since: base-4.9.0.0 |
Show (ST s a) | Since: base-2.1 |
(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 | |
Show (Bin a) Source # | |
Show a => Show (EvalStatus_ a b) | |
Defined in GHCi.Message | |
(Show1 f, Show a) => Show (Lift f a) | |
(Show1 m, Show a) => Show (MaybeT m a) | |
(Show a, Show b) => Show (a, b) | Since: base-2.1 |
Show a => Show (Const a b) | This instance would be equivalent to the derived instances of the
Since: base-4.8.0.0 |
Show (f a) => Show (Ap f a) | Since: base-4.12.0.0 |
Show (f a) => Show (Alt f a) | Since: base-4.8.0.0 |
Show (Coercion a b) | Since: base-4.7.0.0 |
Show (a :~: b) | Since: base-4.7.0.0 |
Show (OrderingI a b) | |
Show (f p) => Show (Rec1 f p) | Since: base-4.7.0.0 |
Show (URec Char p) | Since: base-4.9.0.0 |
Show (URec Double p) | Since: base-4.9.0.0 |
Show (URec Float p) | |
Show (URec Int p) | Since: base-4.9.0.0 |
Show (URec Word p) | Since: base-4.9.0.0 |
Show (gr a b) => Show (OrdGr gr a b) Source # | |
(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) | Since: base-2.1 |
(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) | Since: base-4.10.0.0 |
(Show (f p), Show (g p)) => Show ((f :*: g) p) | Since: base-4.7.0.0 |
(Show (f p), Show (g p)) => Show ((f :+: g) p) | Since: base-4.7.0.0 |
Show c => Show (K1 i c p) | Since: base-4.7.0.0 |
(Show a, Show b, Show c, Show d) => Show (a, b, c, d) | Since: base-2.1 |
Show (f (g a)) => Show (Compose f g a) | Since: base-4.18.0.0 |
Show (f (g p)) => Show ((f :.: g) p) | Since: base-4.7.0.0 |
Show (f p) => Show (M1 i c f p) | Since: base-4.7.0.0 |
(Show uid, Show modulename, Show mod, Show srcpkgid, Show srcpkgname) => Show (GenericUnitInfo srcpkgid srcpkgname uid modulename mod) | |
Defined in GHC.Unit.Database | |
(Show a, Show b, Show c, Show d, Show e) => Show (a, b, c, d, e) | Since: base-2.1 |
(Show a, Show b, Show c, Show d, Show e, Show f) => Show (a, b, c, d, e, f) | Since: base-2.1 |
(Show a, Show b, Show c, Show d, Show e, Show f, Show g) => Show (a, b, c, d, e, f, g) | Since: base-2.1 |
(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h) => Show (a, b, c, d, e, f, g, h) | Since: base-2.1 |
(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i) => Show (a, b, c, d, e, f, g, h, i) | Since: base-2.1 |
(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j) => Show (a, b, c, d, e, f, g, h, i, j) | Since: base-2.1 |
(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k) => Show (a, b, c, d, e, f, g, h, i, j, k) | Since: base-2.1 |
(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k, Show l) => Show (a, b, c, d, e, f, g, h, i, j, k, l) | Since: base-2.1 |
(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k, Show l, Show m) => Show (a, b, c, d, e, f, g, h, i, j, k, l, m) | Since: base-2.1 |
(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k, Show l, Show m, Show n) => Show (a, b, c, d, e, f, g, h, i, j, k, l, m, n) | Since: base-2.1 |
(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k, Show l, Show m, Show n, Show o) => Show (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) | Since: base-2.1 |
(<$>) :: Functor f => (a -> b) -> f a -> f b infixl 4 Source #
An infix synonym for fmap
.
The name of this operator is an allusion to $
.
Note the similarities between their types:
($) :: (a -> b) -> a -> b (<$>) :: Functor f => (a -> b) -> f a -> f b
Whereas $
is function application, <$>
is function
application lifted over a Functor
.
Examples
Convert from a
to a Maybe
Int
using Maybe
String
show
:
>>>
show <$> Nothing
Nothing>>>
show <$> Just 3
Just "3"
Convert from an
to an
Either
Int
Int
Either
Int
String
using show
:
>>>
show <$> Left 17
Left 17>>>
show <$> Right 17
Right "17"
Double each element of a list:
>>>
(*2) <$> [1,2,3]
[2,4,6]
Apply even
to the second element of a pair:
>>>
even <$> (2,2)
(2,True)
Class Enum
defines operations on sequentially ordered types.
The enumFrom
... methods are used in Haskell's translation of
arithmetic sequences.
Instances of Enum
may be derived for any enumeration type (types
whose constructors have no fields). The nullary constructors are
assumed to be numbered left-to-right by fromEnum
from 0
through n-1
.
See Chapter 10 of the Haskell Report for more details.
For any type that is an instance of class Bounded
as well as Enum
,
the following should hold:
- The calls
andsucc
maxBound
should result in a runtime error.pred
minBound
fromEnum
andtoEnum
should give a runtime error if the result value is not representable in the result type. For example,
is an error.toEnum
7 ::Bool
enumFrom
andenumFromThen
should be defined with an implicit bound, thus:
enumFrom x = enumFromTo x maxBound enumFromThen x y = enumFromThenTo x y bound where bound | fromEnum y >= fromEnum x = maxBound | otherwise = minBound
Methods
the successor of a value. For numeric types, succ
adds 1.
the predecessor of a value. For numeric types, pred
subtracts 1.
Convert from an Int
.
Convert to an Int
.
It is implementation-dependent what fromEnum
returns when
applied to a value that is too large to fit in an Int
.
Used in Haskell's translation of [n..]
with [n..] = enumFrom n
,
a possible implementation being enumFrom n = n : enumFrom (succ n)
.
For example:
enumFrom 4 :: [Integer] = [4,5,6,7,...]
enumFrom 6 :: [Int] = [6,7,8,9,...,maxBound :: Int]
enumFromThen :: a -> a -> [a] Source #
Used in Haskell's translation of [n,n'..]
with [n,n'..] = enumFromThen n n'
, a possible implementation being
enumFromThen n n' = n : n' : worker (f x) (f x n')
,
worker s v = v : worker s (s v)
, x = fromEnum n' - fromEnum n
and
f n y
| n > 0 = f (n - 1) (succ y)
| n < 0 = f (n + 1) (pred y)
| otherwise = y
For example:
enumFromThen 4 6 :: [Integer] = [4,6,8,10...]
enumFromThen 6 2 :: [Int] = [6,2,-2,-6,...,minBound :: Int]
enumFromTo :: a -> a -> [a] Source #
Used in Haskell's translation of [n..m]
with
[n..m] = enumFromTo n m
, a possible implementation being
enumFromTo n m
| n <= m = n : enumFromTo (succ n) m
| otherwise = []
.
For example:
enumFromTo 6 10 :: [Int] = [6,7,8,9,10]
enumFromTo 42 1 :: [Integer] = []
enumFromThenTo :: a -> a -> a -> [a] Source #
Used in Haskell's translation of [n,n'..m]
with
[n,n'..m] = enumFromThenTo n n' m
, a possible implementation
being enumFromThenTo n n' m = worker (f x) (c x) n m
,
x = fromEnum n' - fromEnum n
, c x = bool (>=) ((x 0)
f n y
| n > 0 = f (n - 1) (succ y)
| n < 0 = f (n + 1) (pred y)
| otherwise = y
and
worker s c v m
| c v m = v : worker s c (s v) m
| otherwise = []
For example:
enumFromThenTo 4 2 -6 :: [Integer] = [4,2,0,-2,-4,-6]
enumFromThenTo 6 8 2 :: [Int] = []
Instances
Enum CBool | |
Defined in Foreign.C.Types Methods succ :: CBool -> CBool Source # pred :: CBool -> CBool Source # toEnum :: Int -> CBool Source # fromEnum :: CBool -> Int Source # enumFrom :: CBool -> [CBool] Source # enumFromThen :: CBool -> CBool -> [CBool] Source # enumFromTo :: CBool -> CBool -> [CBool] Source # enumFromThenTo :: CBool -> CBool -> CBool -> [CBool] Source # | |
Enum CChar | |
Defined in Foreign.C.Types Methods succ :: CChar -> CChar Source # pred :: CChar -> CChar Source # toEnum :: Int -> CChar Source # fromEnum :: CChar -> Int Source # enumFrom :: CChar -> [CChar] Source # enumFromThen :: CChar -> CChar -> [CChar] Source # enumFromTo :: CChar -> CChar -> [CChar] Source # enumFromThenTo :: CChar -> CChar -> CChar -> [CChar] Source # | |
Enum CClock | |
Defined in Foreign.C.Types Methods succ :: CClock -> CClock Source # pred :: CClock -> CClock Source # toEnum :: Int -> CClock Source # fromEnum :: CClock -> Int Source # enumFrom :: CClock -> [CClock] Source # enumFromThen :: CClock -> CClock -> [CClock] Source # enumFromTo :: CClock -> CClock -> [CClock] Source # enumFromThenTo :: CClock -> CClock -> CClock -> [CClock] Source # | |
Enum CDouble | |
Defined in Foreign.C.Types Methods succ :: CDouble -> CDouble Source # pred :: CDouble -> CDouble Source # toEnum :: Int -> CDouble Source # fromEnum :: CDouble -> Int Source # enumFrom :: CDouble -> [CDouble] Source # enumFromThen :: CDouble -> CDouble -> [CDouble] Source # enumFromTo :: CDouble -> CDouble -> [CDouble] Source # enumFromThenTo :: CDouble -> CDouble -> CDouble -> [CDouble] Source # | |
Enum CFloat | |
Defined in Foreign.C.Types Methods succ :: CFloat -> CFloat Source # pred :: CFloat -> CFloat Source # toEnum :: Int -> CFloat Source # fromEnum :: CFloat -> Int Source # enumFrom :: CFloat -> [CFloat] Source # enumFromThen :: CFloat -> CFloat -> [CFloat] Source # enumFromTo :: CFloat -> CFloat -> [CFloat] Source # enumFromThenTo :: CFloat -> CFloat -> CFloat -> [CFloat] Source # | |
Enum CInt | |
Enum CIntMax | |
Defined in Foreign.C.Types Methods succ :: CIntMax -> CIntMax Source # pred :: CIntMax -> CIntMax Source # toEnum :: Int -> CIntMax Source # fromEnum :: CIntMax -> Int Source # enumFrom :: CIntMax -> [CIntMax] Source # enumFromThen :: CIntMax -> CIntMax -> [CIntMax] Source # enumFromTo :: CIntMax -> CIntMax -> [CIntMax] Source # enumFromThenTo :: CIntMax -> CIntMax -> CIntMax -> [CIntMax] Source # | |
Enum CIntPtr | |
Defined in Foreign.C.Types Methods succ :: CIntPtr -> CIntPtr Source # pred :: CIntPtr -> CIntPtr Source # toEnum :: Int -> CIntPtr Source # fromEnum :: CIntPtr -> Int Source # enumFrom :: CIntPtr -> [CIntPtr] Source # enumFromThen :: CIntPtr -> CIntPtr -> [CIntPtr] Source # enumFromTo :: CIntPtr -> CIntPtr -> [CIntPtr] Source # enumFromThenTo :: CIntPtr -> CIntPtr -> CIntPtr -> [CIntPtr] Source # | |
Enum CLLong | |
Defined in Foreign.C.Types Methods succ :: CLLong -> CLLong Source # pred :: CLLong -> CLLong Source # toEnum :: Int -> CLLong Source # fromEnum :: CLLong -> Int Source # enumFrom :: CLLong -> [CLLong] Source # enumFromThen :: CLLong -> CLLong -> [CLLong] Source # enumFromTo :: CLLong -> CLLong -> [CLLong] Source # enumFromThenTo :: CLLong -> CLLong -> CLLong -> [CLLong] Source # | |
Enum CLong | |
Defined in Foreign.C.Types Methods succ :: CLong -> CLong Source # pred :: CLong -> CLong Source # toEnum :: Int -> CLong Source # fromEnum :: CLong -> Int Source # enumFrom :: CLong -> [CLong] Source # enumFromThen :: CLong -> CLong -> [CLong] Source # enumFromTo :: CLong -> CLong -> [CLong] Source # enumFromThenTo :: CLong -> CLong -> CLong -> [CLong] Source # | |
Enum CPtrdiff | |
Defined in Foreign.C.Types Methods succ :: CPtrdiff -> CPtrdiff Source # pred :: CPtrdiff -> CPtrdiff Source # toEnum :: Int -> CPtrdiff Source # fromEnum :: CPtrdiff -> Int Source # enumFrom :: CPtrdiff -> [CPtrdiff] Source # enumFromThen :: CPtrdiff -> CPtrdiff -> [CPtrdiff] Source # enumFromTo :: CPtrdiff -> CPtrdiff -> [CPtrdiff] Source # enumFromThenTo :: CPtrdiff -> CPtrdiff -> CPtrdiff -> [CPtrdiff] Source # | |
Enum CSChar | |
Defined in Foreign.C.Types Methods succ :: CSChar -> CSChar Source # pred :: CSChar -> CSChar Source # toEnum :: Int -> CSChar Source # fromEnum :: CSChar -> Int Source # enumFrom :: CSChar -> [CSChar] Source # enumFromThen :: CSChar -> CSChar -> [CSChar] Source # enumFromTo :: CSChar -> CSChar -> [CSChar] Source # enumFromThenTo :: CSChar -> CSChar -> CSChar -> [CSChar] Source # | |
Enum CSUSeconds | |
Defined in Foreign.C.Types Methods succ :: CSUSeconds -> CSUSeconds Source # pred :: CSUSeconds -> CSUSeconds Source # toEnum :: Int -> CSUSeconds Source # fromEnum :: CSUSeconds -> Int Source # enumFrom :: CSUSeconds -> [CSUSeconds] Source # enumFromThen :: CSUSeconds -> CSUSeconds -> [CSUSeconds] Source # enumFromTo :: CSUSeconds -> CSUSeconds -> [CSUSeconds] Source # enumFromThenTo :: CSUSeconds -> CSUSeconds -> CSUSeconds -> [CSUSeconds] Source # | |
Enum CShort | |
Defined in Foreign.C.Types Methods succ :: CShort -> CShort Source # pred :: CShort -> CShort Source # toEnum :: Int -> CShort Source # fromEnum :: CShort -> Int Source # enumFrom :: CShort -> [CShort] Source # enumFromThen :: CShort -> CShort -> [CShort] Source # enumFromTo :: CShort -> CShort -> [CShort] Source # enumFromThenTo :: CShort -> CShort -> CShort -> [CShort] Source # | |
Enum CSigAtomic | |
Defined in Foreign.C.Types Methods succ :: CSigAtomic -> CSigAtomic Source # pred :: CSigAtomic -> CSigAtomic Source # toEnum :: Int -> CSigAtomic Source # fromEnum :: CSigAtomic -> Int Source # enumFrom :: CSigAtomic -> [CSigAtomic] Source # enumFromThen :: CSigAtomic -> CSigAtomic -> [CSigAtomic] Source # enumFromTo :: CSigAtomic -> CSigAtomic -> [CSigAtomic] Source # enumFromThenTo :: CSigAtomic -> CSigAtomic -> CSigAtomic -> [CSigAtomic] Source # | |
Enum CSize | |
Defined in Foreign.C.Types Methods succ :: CSize -> CSize Source # pred :: CSize -> CSize Source # toEnum :: Int -> CSize Source # fromEnum :: CSize -> Int Source # enumFrom :: CSize -> [CSize] Source # enumFromThen :: CSize -> CSize -> [CSize] Source # enumFromTo :: CSize -> CSize -> [CSize] Source # enumFromThenTo :: CSize -> CSize -> CSize -> [CSize] Source # | |
Enum CTime | |
Defined in Foreign.C.Types Methods succ :: CTime -> CTime Source # pred :: CTime -> CTime Source # toEnum :: Int -> CTime Source # fromEnum :: CTime -> Int Source # enumFrom :: CTime -> [CTime] Source # enumFromThen :: CTime -> CTime -> [CTime] Source # enumFromTo :: CTime -> CTime -> [CTime] Source # enumFromThenTo :: CTime -> CTime -> CTime -> [CTime] Source # | |
Enum CUChar | |
Defined in Foreign.C.Types Methods succ :: CUChar -> CUChar Source # pred :: CUChar -> CUChar Source # toEnum :: Int -> CUChar Source # fromEnum :: CUChar -> Int Source # enumFrom :: CUChar -> [CUChar] Source # enumFromThen :: CUChar -> CUChar -> [CUChar] Source # enumFromTo :: CUChar -> CUChar -> [CUChar] Source # enumFromThenTo :: CUChar -> CUChar -> CUChar -> [CUChar] Source # | |
Enum CUInt | |
Defined in Foreign.C.Types Methods succ :: CUInt -> CUInt Source # pred :: CUInt -> CUInt Source # toEnum :: Int -> CUInt Source # fromEnum :: CUInt -> Int Source # enumFrom :: CUInt -> [CUInt] Source # enumFromThen :: CUInt -> CUInt -> [CUInt] Source # enumFromTo :: CUInt -> CUInt -> [CUInt] Source # enumFromThenTo :: CUInt -> CUInt -> CUInt -> [CUInt] Source # | |
Enum CUIntMax | |
Defined in Foreign.C.Types Methods succ :: CUIntMax -> CUIntMax Source # pred :: CUIntMax -> CUIntMax Source # toEnum :: Int -> CUIntMax Source # fromEnum :: CUIntMax -> Int Source # enumFrom :: CUIntMax -> [CUIntMax] Source # enumFromThen :: CUIntMax -> CUIntMax -> [CUIntMax] Source # enumFromTo :: CUIntMax -> CUIntMax -> [CUIntMax] Source # enumFromThenTo :: CUIntMax -> CUIntMax -> CUIntMax -> [CUIntMax] Source # | |
Enum CUIntPtr | |
Defined in Foreign.C.Types Methods succ :: CUIntPtr -> CUIntPtr Source # pred :: CUIntPtr -> CUIntPtr Source # toEnum :: Int -> CUIntPtr Source # fromEnum :: CUIntPtr -> Int Source # enumFrom :: CUIntPtr -> [CUIntPtr] Source # enumFromThen :: CUIntPtr -> CUIntPtr -> [CUIntPtr] Source # enumFromTo :: CUIntPtr -> CUIntPtr -> [CUIntPtr] Source # enumFromThenTo :: CUIntPtr -> CUIntPtr -> CUIntPtr -> [CUIntPtr] Source # | |
Enum CULLong | |
Defined in Foreign.C.Types Methods succ :: CULLong -> CULLong Source # pred :: CULLong -> CULLong Source # toEnum :: Int -> CULLong Source # fromEnum :: CULLong -> Int Source # enumFrom :: CULLong -> [CULLong] Source # enumFromThen :: CULLong -> CULLong -> [CULLong] Source # enumFromTo :: CULLong -> CULLong -> [CULLong] Source # enumFromThenTo :: CULLong -> CULLong -> CULLong -> [CULLong] Source # | |
Enum CULong | |
Defined in Foreign.C.Types Methods succ :: CULong -> CULong Source # pred :: CULong -> CULong Source # toEnum :: Int -> CULong Source # fromEnum :: CULong -> Int Source # enumFrom :: CULong -> [CULong] Source # enumFromThen :: CULong -> CULong -> [CULong] Source # enumFromTo :: CULong -> CULong -> [CULong] Source # enumFromThenTo :: CULong -> CULong -> CULong -> [CULong] Source # | |
Enum CUSeconds | |
Defined in Foreign.C.Types Methods succ :: CUSeconds -> CUSeconds Source # pred :: CUSeconds -> CUSeconds Source # toEnum :: Int -> CUSeconds Source # fromEnum :: CUSeconds -> Int Source # enumFrom :: CUSeconds -> [CUSeconds] Source # enumFromThen :: CUSeconds -> CUSeconds -> [CUSeconds] Source # enumFromTo :: CUSeconds -> CUSeconds -> [CUSeconds] Source # enumFromThenTo :: CUSeconds -> CUSeconds -> CUSeconds -> [CUSeconds] Source # | |
Enum CUShort | |
Defined in Foreign.C.Types Methods succ :: CUShort -> CUShort Source # pred :: CUShort -> CUShort Source # toEnum :: Int -> CUShort Source # fromEnum :: CUShort -> Int Source # enumFrom :: CUShort -> [CUShort] Source # enumFromThen :: CUShort -> CUShort -> [CUShort] Source # enumFromTo :: CUShort -> CUShort -> [CUShort] Source # enumFromThenTo :: CUShort -> CUShort -> CUShort -> [CUShort] Source # | |
Enum CWchar | |
Defined in Foreign.C.Types Methods succ :: CWchar -> CWchar Source # pred :: CWchar -> CWchar Source # toEnum :: Int -> CWchar Source # fromEnum :: CWchar -> Int Source # enumFrom :: CWchar -> [CWchar] Source # enumFromThen :: CWchar -> CWchar -> [CWchar] Source # enumFromTo :: CWchar -> CWchar -> [CWchar] Source # enumFromThenTo :: CWchar -> CWchar -> CWchar -> [CWchar] Source # | |
Enum IntPtr | |
Defined in Foreign.Ptr Methods succ :: IntPtr -> IntPtr Source # pred :: IntPtr -> IntPtr Source # toEnum :: Int -> IntPtr Source # fromEnum :: IntPtr -> Int Source # enumFrom :: IntPtr -> [IntPtr] Source # enumFromThen :: IntPtr -> IntPtr -> [IntPtr] Source # enumFromTo :: IntPtr -> IntPtr -> [IntPtr] Source # enumFromThenTo :: IntPtr -> IntPtr -> IntPtr -> [IntPtr] Source # | |
Enum WordPtr | |
Defined in Foreign.Ptr Methods succ :: WordPtr -> WordPtr Source # pred :: WordPtr -> WordPtr Source # toEnum :: Int -> WordPtr Source # fromEnum :: WordPtr -> Int Source # enumFrom :: WordPtr -> [WordPtr] Source # enumFromThen :: WordPtr -> WordPtr -> [WordPtr] Source # enumFromTo :: WordPtr -> WordPtr -> [WordPtr] Source # enumFromThenTo :: WordPtr -> WordPtr -> WordPtr -> [WordPtr] Source # | |
Enum ByteOrder | Since: base-4.11.0.0 |
Defined in GHC.ByteOrder Methods succ :: ByteOrder -> ByteOrder Source # pred :: ByteOrder -> ByteOrder Source # toEnum :: Int -> ByteOrder Source # fromEnum :: ByteOrder -> Int Source # enumFrom :: ByteOrder -> [ByteOrder] Source # enumFromThen :: ByteOrder -> ByteOrder -> [ByteOrder] Source # enumFromTo :: ByteOrder -> ByteOrder -> [ByteOrder] Source # enumFromThenTo :: ByteOrder -> ByteOrder -> ByteOrder -> [ByteOrder] Source # | |
Enum Associativity | Since: base-4.9.0.0 |
Defined in GHC.Generics Methods succ :: Associativity -> Associativity Source # pred :: Associativity -> Associativity Source # toEnum :: Int -> Associativity Source # fromEnum :: Associativity -> Int Source # enumFrom :: Associativity -> [Associativity] Source # enumFromThen :: Associativity -> Associativity -> [Associativity] Source # enumFromTo :: Associativity -> Associativity -> [Associativity] Source # enumFromThenTo :: Associativity -> Associativity -> Associativity -> [Associativity] Source # | |
Enum DecidedStrictness | Since: base-4.9.0.0 |
Defined in GHC.Generics Methods succ :: DecidedStrictness -> DecidedStrictness Source # pred :: DecidedStrictness -> DecidedStrictness Source # toEnum :: Int -> DecidedStrictness Source # fromEnum :: DecidedStrictness -> Int Source # enumFrom :: DecidedStrictness -> [DecidedStrictness] Source # enumFromThen :: DecidedStrictness -> DecidedStrictness -> [DecidedStrictness] Source # enumFromTo :: DecidedStrictness -> DecidedStrictness -> [DecidedStrictness] Source # enumFromThenTo :: DecidedStrictness -> DecidedStrictness -> DecidedStrictness -> [DecidedStrictness] Source # | |
Enum SourceStrictness | Since: base-4.9.0.0 |
Defined in GHC.Generics Methods succ :: SourceStrictness -> SourceStrictness Source # pred :: SourceStrictness -> SourceStrictness Source # toEnum :: Int -> SourceStrictness Source # fromEnum :: SourceStrictness -> Int Source # enumFrom :: SourceStrictness -> [SourceStrictness] Source # enumFromThen :: SourceStrictness -> SourceStrictness -> [SourceStrictness] Source # enumFromTo :: SourceStrictness -> SourceStrictness -> [SourceStrictness] Source # enumFromThenTo :: SourceStrictness -> SourceStrictness -> SourceStrictness -> [SourceStrictness] Source # | |
Enum SourceUnpackedness | Since: base-4.9.0.0 |
Defined in GHC.Generics Methods succ :: SourceUnpackedness -> SourceUnpackedness Source # pred :: SourceUnpackedness -> SourceUnpackedness Source # toEnum :: Int -> SourceUnpackedness Source # fromEnum :: SourceUnpackedness -> Int Source # enumFrom :: SourceUnpackedness -> [SourceUnpackedness] Source # enumFromThen :: SourceUnpackedness -> SourceUnpackedness -> [SourceUnpackedness] Source # enumFromTo :: SourceUnpackedness -> SourceUnpackedness -> [SourceUnpackedness] Source # enumFromThenTo :: SourceUnpackedness -> SourceUnpackedness -> SourceUnpackedness -> [SourceUnpackedness] Source # | |
Enum SeekMode | Since: base-4.2.0.0 |
Defined in GHC.IO.Device Methods succ :: SeekMode -> SeekMode Source # pred :: SeekMode -> SeekMode Source # toEnum :: Int -> SeekMode Source # fromEnum :: SeekMode -> Int Source # enumFrom :: SeekMode -> [SeekMode] Source # enumFromThen :: SeekMode -> SeekMode -> [SeekMode] Source # enumFromTo :: SeekMode -> SeekMode -> [SeekMode] Source # enumFromThenTo :: SeekMode -> SeekMode -> SeekMode -> [SeekMode] Source # | |
Enum IOMode | Since: base-4.2.0.0 |
Defined in GHC.IO.IOMode Methods succ :: IOMode -> IOMode Source # pred :: IOMode -> IOMode Source # toEnum :: Int -> IOMode Source # fromEnum :: IOMode -> Int Source # enumFrom :: IOMode -> [IOMode] Source # enumFromThen :: IOMode -> IOMode -> [IOMode] Source # enumFromTo :: IOMode -> IOMode -> [IOMode] Source # enumFromThenTo :: IOMode -> IOMode -> IOMode -> [IOMode] Source # | |
Enum Int16 | Since: base-2.1 |
Defined in GHC.Int Methods succ :: Int16 -> Int16 Source # pred :: Int16 -> Int16 Source # toEnum :: Int -> Int16 Source # fromEnum :: Int16 -> Int Source # enumFrom :: Int16 -> [Int16] Source # enumFromThen :: Int16 -> Int16 -> [Int16] Source # enumFromTo :: Int16 -> Int16 -> [Int16] Source # enumFromThenTo :: Int16 -> Int16 -> Int16 -> [Int16] Source # | |
Enum Int32 | Since: base-2.1 |
Defined in GHC.Int Methods succ :: Int32 -> Int32 Source # pred :: Int32 -> Int32 Source # toEnum :: Int -> Int32 Source # fromEnum :: Int32 -> Int Source # enumFrom :: Int32 -> [Int32] Source # enumFromThen :: Int32 -> Int32 -> [Int32] Source # enumFromTo :: Int32 -> Int32 -> [Int32] Source # enumFromThenTo :: Int32 -> Int32 -> Int32 -> [Int32] Source # | |
Enum Int64 | Since: base-2.1 |
Defined in GHC.Int Methods succ :: Int64 -> Int64 Source # pred :: Int64 -> Int64 Source # toEnum :: Int -> Int64 Source # fromEnum :: Int64 -> Int Source # enumFrom :: Int64 -> [Int64] Source # enumFromThen :: Int64 -> Int64 -> [Int64] Source # enumFromTo :: Int64 -> Int64 -> [Int64] Source # enumFromThenTo :: Int64 -> Int64 -> Int64 -> [Int64] Source # | |
Enum Int8 | Since: base-2.1 |
Enum DoCostCentres | Since: base-4.8.0.0 |
Defined in GHC.RTS.Flags Methods succ :: DoCostCentres -> DoCostCentres Source # pred :: DoCostCentres -> DoCostCentres Source # toEnum :: Int -> DoCostCentres Source # fromEnum :: DoCostCentres -> Int Source # enumFrom :: DoCostCentres -> [DoCostCentres] Source # enumFromThen :: DoCostCentres -> DoCostCentres -> [DoCostCentres] Source # enumFromTo :: DoCostCentres -> DoCostCentres -> [DoCostCentres] Source # enumFromThenTo :: DoCostCentres -> DoCostCentres -> DoCostCentres -> [DoCostCentres] Source # | |
Enum DoHeapProfile | Since: base-4.8.0.0 |
Defined in GHC.RTS.Flags Methods succ :: DoHeapProfile -> DoHeapProfile Source # pred :: DoHeapProfile -> DoHeapProfile Source # toEnum :: Int -> DoHeapProfile Source # fromEnum :: DoHeapProfile -> Int Source # enumFrom :: DoHeapProfile -> [DoHeapProfile] Source # enumFromThen :: DoHeapProfile -> DoHeapProfile -> [DoHeapProfile] Source # enumFromTo :: DoHeapProfile -> DoHeapProfile -> [DoHeapProfile] Source # enumFromThenTo :: DoHeapProfile -> DoHeapProfile -> DoHeapProfile -> [DoHeapProfile] Source # | |
Enum DoTrace | Since: base-4.8.0.0 |
Defined in GHC.RTS.Flags Methods succ :: DoTrace -> DoTrace Source # pred :: DoTrace -> DoTrace Source # toEnum :: Int -> DoTrace Source # fromEnum :: DoTrace -> Int Source # enumFrom :: DoTrace -> [DoTrace] Source # enumFromThen :: DoTrace -> DoTrace -> [DoTrace] Source # enumFromTo :: DoTrace -> DoTrace -> [DoTrace] Source # enumFromThenTo :: DoTrace -> DoTrace -> DoTrace -> [DoTrace] Source # | |
Enum GiveGCStats | Since: base-4.8.0.0 |
Defined in GHC.RTS.Flags Methods succ :: GiveGCStats -> GiveGCStats Source # pred :: GiveGCStats -> GiveGCStats Source # toEnum :: Int -> GiveGCStats Source # fromEnum :: GiveGCStats -> Int Source # enumFrom :: GiveGCStats -> [GiveGCStats] Source # enumFromThen :: GiveGCStats -> GiveGCStats -> [GiveGCStats] Source # enumFromTo :: GiveGCStats -> GiveGCStats -> [GiveGCStats] Source # enumFromThenTo :: GiveGCStats -> GiveGCStats -> GiveGCStats -> [GiveGCStats] Source # | |
Enum IoSubSystem | Since: base-4.9.0.0 |
Defined in GHC.RTS.Flags Methods succ :: IoSubSystem -> IoSubSystem Source # pred :: IoSubSystem -> IoSubSystem Source # toEnum :: Int -> IoSubSystem Source # fromEnum :: IoSubSystem -> Int Source # enumFrom :: IoSubSystem -> [IoSubSystem] Source # enumFromThen :: IoSubSystem -> IoSubSystem -> [IoSubSystem] Source # enumFromTo :: IoSubSystem -> IoSubSystem -> [IoSubSystem] Source # enumFromThenTo :: IoSubSystem -> IoSubSystem -> IoSubSystem -> [IoSubSystem] Source # | |
Enum GeneralCategory | Since: base-2.1 |
Defined in GHC.Unicode Methods succ :: GeneralCategory -> GeneralCategory Source # pred :: GeneralCategory -> GeneralCategory Source # toEnum :: Int -> GeneralCategory Source # fromEnum :: GeneralCategory -> Int Source # enumFrom :: GeneralCategory -> [GeneralCategory] Source # enumFromThen :: GeneralCategory -> GeneralCategory -> [GeneralCategory] Source # enumFromTo :: GeneralCategory -> GeneralCategory -> [GeneralCategory] Source # enumFromThenTo :: GeneralCategory -> GeneralCategory -> GeneralCategory -> [GeneralCategory] Source # | |
Enum Word16 | Since: base-2.1 |
Defined in GHC.Word Methods succ :: Word16 -> Word16 Source # pred :: Word16 -> Word16 Source # toEnum :: Int -> Word16 Source # fromEnum :: Word16 -> Int Source # enumFrom :: Word16 -> [Word16] Source # enumFromThen :: Word16 -> Word16 -> [Word16] Source # enumFromTo :: Word16 -> Word16 -> [Word16] Source # enumFromThenTo :: Word16 -> Word16 -> Word16 -> [Word16] Source # | |
Enum Word32 | Since: base-2.1 |
Defined in GHC.Word Methods succ :: Word32 -> Word32 Source # pred :: Word32 -> Word32 Source # toEnum :: Int -> Word32 Source # fromEnum :: Word32 -> Int Source # enumFrom :: Word32 -> [Word32] Source # enumFromThen :: Word32 -> Word32 -> [Word32] Source # enumFromTo :: Word32 -> Word32 -> [Word32] Source # enumFromThenTo :: Word32 -> Word32 -> Word32 -> [Word32] Source # | |
Enum Word64 | Since: base-2.1 |
Defined in GHC.Word Methods succ :: Word64 -> Word64 Source # pred :: Word64 -> Word64 Source # toEnum :: Int -> Word64 Source # fromEnum :: Word64 -> Int Source # enumFrom :: Word64 -> [Word64] Source # enumFromThen :: Word64 -> Word64 -> [Word64] Source # enumFromTo :: Word64 -> Word64 -> [Word64] Source # enumFromThenTo :: Word64 -> Word64 -> Word64 -> [Word64] Source # | |
Enum Word8 | Since: base-2.1 |
Defined in GHC.Word Methods succ :: Word8 -> Word8 Source # pred :: Word8 -> Word8 Source # toEnum :: Int -> Word8 Source # fromEnum :: Word8 -> Int Source # enumFrom :: Word8 -> [Word8] Source # enumFromThen :: Word8 -> Word8 -> [Word8] Source # enumFromTo :: Word8 -> Word8 -> [Word8] Source # enumFromThenTo :: Word8 -> Word8 -> Word8 -> [Word8] Source # | |
Enum CBlkCnt | |
Defined in System.Posix.Types Methods succ :: CBlkCnt -> CBlkCnt Source # pred :: CBlkCnt -> CBlkCnt Source # toEnum :: Int -> CBlkCnt Source # fromEnum :: CBlkCnt -> Int Source # enumFrom :: CBlkCnt -> [CBlkCnt] Source # enumFromThen :: CBlkCnt -> CBlkCnt -> [CBlkCnt] Source # enumFromTo :: CBlkCnt -> CBlkCnt -> [CBlkCnt] Source # enumFromThenTo :: CBlkCnt -> CBlkCnt -> CBlkCnt -> [CBlkCnt] Source # | |
Enum CBlkSize | |
Defined in System.Posix.Types Methods succ :: CBlkSize -> CBlkSize Source # pred :: CBlkSize -> CBlkSize Source # toEnum :: Int -> CBlkSize Source # fromEnum :: CBlkSize -> Int Source # enumFrom :: CBlkSize -> [CBlkSize] Source # enumFromThen :: CBlkSize -> CBlkSize -> [CBlkSize] Source # enumFromTo :: CBlkSize -> CBlkSize -> [CBlkSize] Source # enumFromThenTo :: CBlkSize -> CBlkSize -> CBlkSize -> [CBlkSize] Source # | |
Enum CCc | |
Defined in System.Posix.Types | |
Enum CClockId | |
Defined in System.Posix.Types Methods succ :: CClockId -> CClockId Source # pred :: CClockId -> CClockId Source # toEnum :: Int -> CClockId Source # fromEnum :: CClockId -> Int Source # enumFrom :: CClockId -> [CClockId] Source # enumFromThen :: CClockId -> CClockId -> [CClockId] Source # enumFromTo :: CClockId -> CClockId -> [CClockId] Source # enumFromThenTo :: CClockId -> CClockId -> CClockId -> [CClockId] Source # | |
Enum CDev | |
Enum CFsBlkCnt | |
Defined in System.Posix.Types Methods succ :: CFsBlkCnt -> CFsBlkCnt Source # pred :: CFsBlkCnt -> CFsBlkCnt Source # toEnum :: Int -> CFsBlkCnt Source # fromEnum :: CFsBlkCnt -> Int Source # enumFrom :: CFsBlkCnt -> [CFsBlkCnt] Source # enumFromThen :: CFsBlkCnt -> CFsBlkCnt -> [CFsBlkCnt] Source # enumFromTo :: CFsBlkCnt -> CFsBlkCnt -> [CFsBlkCnt] Source # enumFromThenTo :: CFsBlkCnt -> CFsBlkCnt -> CFsBlkCnt -> [CFsBlkCnt] Source # | |
Enum CFsFilCnt | |
Defined in System.Posix.Types Methods succ :: CFsFilCnt -> CFsFilCnt Source # pred :: CFsFilCnt -> CFsFilCnt Source # toEnum :: Int -> CFsFilCnt Source # fromEnum :: CFsFilCnt -> Int Source # enumFrom :: CFsFilCnt -> [CFsFilCnt] Source # enumFromThen :: CFsFilCnt -> CFsFilCnt -> [CFsFilCnt] Source # enumFromTo :: CFsFilCnt -> CFsFilCnt -> [CFsFilCnt] Source # enumFromThenTo :: CFsFilCnt -> CFsFilCnt -> CFsFilCnt -> [CFsFilCnt] Source # | |
Enum CGid | |
Enum CId | |
Defined in System.Posix.Types | |
Enum CIno | |
Enum CKey | |
Enum CMode | |
Defined in System.Posix.Types Methods succ :: CMode -> CMode Source # pred :: CMode -> CMode Source # toEnum :: Int -> CMode Source # fromEnum :: CMode -> Int Source # enumFrom :: CMode -> [CMode] Source # enumFromThen :: CMode -> CMode -> [CMode] Source # enumFromTo :: CMode -> CMode -> [CMode] Source # enumFromThenTo :: CMode -> CMode -> CMode -> [CMode] Source # | |
Enum CNfds | |
Defined in System.Posix.Types Methods succ :: CNfds -> CNfds Source # pred :: CNfds -> CNfds Source # toEnum :: Int -> CNfds Source # fromEnum :: CNfds -> Int Source # enumFrom :: CNfds -> [CNfds] Source # enumFromThen :: CNfds -> CNfds -> [CNfds] Source # enumFromTo :: CNfds -> CNfds -> [CNfds] Source # enumFromThenTo :: CNfds -> CNfds -> CNfds -> [CNfds] Source # | |
Enum CNlink | |
Defined in System.Posix.Types Methods succ :: CNlink -> CNlink Source # pred :: CNlink -> CNlink Source # toEnum :: Int -> CNlink Source # fromEnum :: CNlink -> Int Source # enumFrom :: CNlink -> [CNlink] Source # enumFromThen :: CNlink -> CNlink -> [CNlink] Source # enumFromTo :: CNlink -> CNlink -> [CNlink] Source # enumFromThenTo :: CNlink -> CNlink -> CNlink -> [CNlink] Source # | |
Enum COff | |
Enum CPid | |
Enum CRLim | |
Defined in System.Posix.Types Methods succ :: CRLim -> CRLim Source # pred :: CRLim -> CRLim Source # toEnum :: Int -> CRLim Source # fromEnum :: CRLim -> Int Source # enumFrom :: CRLim -> [CRLim] Source # enumFromThen :: CRLim -> CRLim -> [CRLim] Source # enumFromTo :: CRLim -> CRLim -> [CRLim] Source # enumFromThenTo :: CRLim -> CRLim -> CRLim -> [CRLim] Source # | |
Enum CSocklen | |
Defined in System.Posix.Types Methods succ :: CSocklen -> CSocklen Source # pred :: CSocklen -> CSocklen Source # toEnum :: Int -> CSocklen Source # fromEnum :: CSocklen -> Int Source # enumFrom :: CSocklen -> [CSocklen] Source # enumFromThen :: CSocklen -> CSocklen -> [CSocklen] Source # enumFromTo :: CSocklen -> CSocklen -> [CSocklen] Source # enumFromThenTo :: CSocklen -> CSocklen -> CSocklen -> [CSocklen] Source # | |
Enum CSpeed | |
Defined in System.Posix.Types Methods succ :: CSpeed -> CSpeed Source # pred :: CSpeed -> CSpeed Source # toEnum :: Int -> CSpeed Source # fromEnum :: CSpeed -> Int Source # enumFrom :: CSpeed -> [CSpeed] Source # enumFromThen :: CSpeed -> CSpeed -> [CSpeed] Source # enumFromTo :: CSpeed -> CSpeed -> [CSpeed] Source # enumFromThenTo :: CSpeed -> CSpeed -> CSpeed -> [CSpeed] Source # | |
Enum CSsize | |
Defined in System.Posix.Types Methods succ :: CSsize -> CSsize Source # pred :: CSsize -> CSsize Source # toEnum :: Int -> CSsize Source # fromEnum :: CSsize -> Int Source # enumFrom :: CSsize -> [CSsize] Source # enumFromThen :: CSsize -> CSsize -> [CSsize] Source # enumFromTo :: CSsize -> CSsize -> [CSsize] Source # enumFromThenTo :: CSsize -> CSsize -> CSsize -> [CSsize] Source # | |
Enum CTcflag | |
Defined in System.Posix.Types Methods succ :: CTcflag -> CTcflag Source # pred :: CTcflag -> CTcflag Source # toEnum :: Int -> CTcflag Source # fromEnum :: CTcflag -> Int Source # enumFrom :: CTcflag -> [CTcflag] Source # enumFromThen :: CTcflag -> CTcflag -> [CTcflag] Source # enumFromTo :: CTcflag -> CTcflag -> [CTcflag] Source # enumFromThenTo :: CTcflag -> CTcflag -> CTcflag -> [CTcflag] Source # | |
Enum CUid | |
Enum Fd | |
Defined in System.Posix.Types | |
Enum FileType | |
Defined in System.Directory.Internal.Common Methods succ :: FileType -> FileType Source # pred :: FileType -> FileType Source # toEnum :: Int -> FileType Source # fromEnum :: FileType -> Int Source # enumFrom :: FileType -> [FileType] Source # enumFromThen :: FileType -> FileType -> [FileType] Source # enumFromTo :: FileType -> FileType -> [FileType] Source # enumFromThenTo :: FileType -> FileType -> FileType -> [FileType] Source # | |
Enum XdgDirectory | |
Defined in System.Directory.Internal.Common Methods succ :: XdgDirectory -> XdgDirectory Source # pred :: XdgDirectory -> XdgDirectory Source # toEnum :: Int -> XdgDirectory Source # fromEnum :: XdgDirectory -> Int Source # enumFrom :: XdgDirectory -> [XdgDirectory] Source # enumFromThen :: XdgDirectory -> XdgDirectory -> [XdgDirectory] Source # enumFromTo :: XdgDirectory -> XdgDirectory -> [XdgDirectory] Source # enumFromThenTo :: XdgDirectory -> XdgDirectory -> XdgDirectory -> [XdgDirectory] Source # | |
Enum XdgDirectoryList | |
Defined in System.Directory.Internal.Common Methods succ :: XdgDirectoryList -> XdgDirectoryList Source # pred :: XdgDirectoryList -> XdgDirectoryList Source # toEnum :: Int -> XdgDirectoryList Source # fromEnum :: XdgDirectoryList -> Int Source # enumFrom :: XdgDirectoryList -> [XdgDirectoryList] Source # enumFromThen :: XdgDirectoryList -> XdgDirectoryList -> [XdgDirectoryList] Source # enumFromTo :: XdgDirectoryList -> XdgDirectoryList -> [XdgDirectoryList] Source # enumFromThenTo :: XdgDirectoryList -> XdgDirectoryList -> XdgDirectoryList -> [XdgDirectoryList] Source # | |
Enum ByteOff Source # | |
Defined in GHC.ByteCode.Types Methods succ :: ByteOff -> ByteOff Source # pred :: ByteOff -> ByteOff Source # toEnum :: Int -> ByteOff Source # fromEnum :: ByteOff -> Int Source # enumFrom :: ByteOff -> [ByteOff] Source # enumFromThen :: ByteOff -> ByteOff -> [ByteOff] Source # enumFromTo :: ByteOff -> ByteOff -> [ByteOff] Source # enumFromThenTo :: ByteOff -> ByteOff -> ByteOff -> [ByteOff] Source # | |
Enum HalfWord Source # | |
Defined in GHC.ByteCode.Types Methods succ :: HalfWord -> HalfWord Source # pred :: HalfWord -> HalfWord Source # toEnum :: Int -> HalfWord Source # fromEnum :: HalfWord -> Int Source # enumFrom :: HalfWord -> [HalfWord] Source # enumFromThen :: HalfWord -> HalfWord -> [HalfWord] Source # enumFromTo :: HalfWord -> HalfWord -> [HalfWord] Source # enumFromThenTo :: HalfWord -> HalfWord -> HalfWord -> [HalfWord] Source # | |
Enum RegBitmap Source # | |
Defined in GHC.ByteCode.Types Methods succ :: RegBitmap -> RegBitmap Source # pred :: RegBitmap -> RegBitmap Source # toEnum :: Int -> RegBitmap Source # fromEnum :: RegBitmap -> Int Source # enumFrom :: RegBitmap -> [RegBitmap] Source # enumFromThen :: RegBitmap -> RegBitmap -> [RegBitmap] Source # enumFromTo :: RegBitmap -> RegBitmap -> [RegBitmap] Source # enumFromThenTo :: RegBitmap -> RegBitmap -> RegBitmap -> [RegBitmap] Source # | |
Enum WordOff Source # | |
Defined in GHC.ByteCode.Types Methods succ :: WordOff -> WordOff Source # pred :: WordOff -> WordOff Source # toEnum :: Int -> WordOff Source # fromEnum :: WordOff -> Int Source # enumFrom :: WordOff -> [WordOff] Source # enumFromThen :: WordOff -> WordOff -> [WordOff] Source # enumFromTo :: WordOff -> WordOff -> [WordOff] Source # enumFromThenTo :: WordOff -> WordOff -> WordOff -> [WordOff] Source # | |
Enum EdgeWeight Source # | |
Defined in GHC.CmmToAsm.CFG Methods succ :: EdgeWeight -> EdgeWeight Source # pred :: EdgeWeight -> EdgeWeight Source # toEnum :: Int -> EdgeWeight Source # fromEnum :: EdgeWeight -> Int Source # enumFrom :: EdgeWeight -> [EdgeWeight] Source # enumFromThen :: EdgeWeight -> EdgeWeight -> [EdgeWeight] Source # enumFromTo :: EdgeWeight -> EdgeWeight -> [EdgeWeight] Source # enumFromThenTo :: EdgeWeight -> EdgeWeight -> EdgeWeight -> [EdgeWeight] Source # | |
Enum RegClass Source # | |
Defined in GHC.CmmToAsm.Reg.Graph.Base Methods succ :: RegClass -> RegClass Source # pred :: RegClass -> RegClass Source # toEnum :: Int -> RegClass Source # fromEnum :: RegClass -> Int Source # enumFrom :: RegClass -> [RegClass] Source # enumFromThen :: RegClass -> RegClass -> [RegClass] Source # enumFromTo :: RegClass -> RegClass -> [RegClass] Source # enumFromThenTo :: RegClass -> RegClass -> RegClass -> [RegClass] Source # | |
Enum RegSub Source # | |
Defined in GHC.CmmToAsm.Reg.Graph.Base Methods succ :: RegSub -> RegSub Source # pred :: RegSub -> RegSub Source # toEnum :: Int -> RegSub Source # fromEnum :: RegSub -> Int Source # enumFrom :: RegSub -> [RegSub] Source # enumFromThen :: RegSub -> RegSub -> [RegSub] Source # enumFromTo :: RegSub -> RegSub -> [RegSub] Source # enumFromThenTo :: RegSub -> RegSub -> RegSub -> [RegSub] Source # | |
Enum PrimElemRep Source # | |
Defined in GHC.Core.TyCon Methods succ :: PrimElemRep -> PrimElemRep Source # pred :: PrimElemRep -> PrimElemRep Source # toEnum :: Int -> PrimElemRep Source # fromEnum :: PrimElemRep -> Int Source # enumFrom :: PrimElemRep -> [PrimElemRep] Source # enumFromThen :: PrimElemRep -> PrimElemRep -> [PrimElemRep] Source # enumFromTo :: PrimElemRep -> PrimElemRep -> [PrimElemRep] Source # enumFromThenTo :: PrimElemRep -> PrimElemRep -> PrimElemRep -> [PrimElemRep] Source # | |
Enum OverridingBool Source # | Since: ghc-9.4.1 |
Defined in GHC.Data.Bool Methods succ :: OverridingBool -> OverridingBool Source # pred :: OverridingBool -> OverridingBool Source # toEnum :: Int -> OverridingBool Source # fromEnum :: OverridingBool -> Int Source # enumFrom :: OverridingBool -> [OverridingBool] Source # enumFromThen :: OverridingBool -> OverridingBool -> [OverridingBool] Source # enumFromTo :: OverridingBool -> OverridingBool -> [OverridingBool] Source # enumFromThenTo :: OverridingBool -> OverridingBool -> OverridingBool -> [OverridingBool] Source # | |
Enum DumpFlag Source # | |
Defined in GHC.Driver.Flags Methods succ :: DumpFlag -> DumpFlag Source # pred :: DumpFlag -> DumpFlag Source # toEnum :: Int -> DumpFlag Source # fromEnum :: DumpFlag -> Int Source # enumFrom :: DumpFlag -> [DumpFlag] Source # enumFromThen :: DumpFlag -> DumpFlag -> [DumpFlag] Source # enumFromTo :: DumpFlag -> DumpFlag -> [DumpFlag] Source # enumFromThenTo :: DumpFlag -> DumpFlag -> DumpFlag -> [DumpFlag] Source # | |
Enum GeneralFlag Source # | |
Defined in GHC.Driver.Flags Methods succ :: GeneralFlag -> GeneralFlag Source # pred :: GeneralFlag -> GeneralFlag Source # toEnum :: Int -> GeneralFlag Source # fromEnum :: GeneralFlag -> Int Source # enumFrom :: GeneralFlag -> [GeneralFlag] Source # enumFromThen :: GeneralFlag -> GeneralFlag -> [GeneralFlag] Source # enumFromTo :: GeneralFlag -> GeneralFlag -> [GeneralFlag] Source # enumFromThenTo :: GeneralFlag -> GeneralFlag -> GeneralFlag -> [GeneralFlag] Source # | |
Enum Language Source # | |
Defined in GHC.Driver.Flags Methods succ :: Language -> Language Source # pred :: Language -> Language Source # toEnum :: Int -> Language Source # fromEnum :: Language -> Int Source # enumFrom :: Language -> [Language] Source # enumFromThen :: Language -> Language -> [Language] Source # enumFromTo :: Language -> Language -> [Language] Source # enumFromThenTo :: Language -> Language -> Language -> [Language] Source # | |
Enum WarningFlag Source # | |
Defined in GHC.Driver.Flags Methods succ :: WarningFlag -> WarningFlag Source # pred :: WarningFlag -> WarningFlag Source # toEnum :: Int -> WarningFlag Source # fromEnum :: WarningFlag -> Int Source # enumFrom :: WarningFlag -> [WarningFlag] Source # enumFromThen :: WarningFlag -> WarningFlag -> [WarningFlag] Source # enumFromTo :: WarningFlag -> WarningFlag -> [WarningFlag] Source # enumFromThenTo :: WarningFlag -> WarningFlag -> WarningFlag -> [WarningFlag] Source # | |
Enum WarningGroup Source # | |
Defined in GHC.Driver.Flags Methods succ :: WarningGroup -> WarningGroup Source # pred :: WarningGroup -> WarningGroup Source # toEnum :: Int -> WarningGroup Source # fromEnum :: WarningGroup -> Int Source # enumFrom :: WarningGroup -> [WarningGroup] Source # enumFromThen :: WarningGroup -> WarningGroup -> [WarningGroup] Source # enumFromTo :: WarningGroup -> WarningGroup -> [WarningGroup] Source # enumFromThenTo :: WarningGroup -> WarningGroup -> WarningGroup -> [WarningGroup] Source # | |
Enum BindType Source # | |
Defined in GHC.Iface.Ext.Types Methods succ :: BindType -> BindType Source # pred :: BindType -> BindType Source # toEnum :: Int -> BindType Source # fromEnum :: BindType -> Int Source # enumFrom :: BindType -> [BindType] Source # enumFromThen :: BindType -> BindType -> [BindType] Source # enumFromTo :: BindType -> BindType -> [BindType] Source # enumFromThenTo :: BindType -> BindType -> BindType -> [BindType] Source # | |
Enum DeclType Source # | |
Defined in GHC.Iface.Ext.Types Methods succ :: DeclType -> DeclType Source # pred :: DeclType -> DeclType Source # toEnum :: Int -> DeclType Source # fromEnum :: DeclType -> Int Source # enumFrom :: DeclType -> [DeclType] Source # enumFromThen :: DeclType -> DeclType -> [DeclType] Source # enumFromTo :: DeclType -> DeclType -> [DeclType] Source # enumFromThenTo :: DeclType -> DeclType -> DeclType -> [DeclType] Source # | |
Enum IEType Source # | |
Defined in GHC.Iface.Ext.Types Methods succ :: IEType -> IEType Source # pred :: IEType -> IEType Source # toEnum :: Int -> IEType Source # fromEnum :: IEType -> Int Source # enumFrom :: IEType -> [IEType] Source # enumFromThen :: IEType -> IEType -> [IEType] Source # enumFromTo :: IEType -> IEType -> [IEType] Source # enumFromThenTo :: IEType -> IEType -> IEType -> [IEType] Source # | |
Enum NodeOrigin Source # | |
Defined in GHC.Iface.Ext.Types Methods succ :: NodeOrigin -> NodeOrigin Source # pred :: NodeOrigin -> NodeOrigin Source # toEnum :: Int -> NodeOrigin Source # fromEnum :: NodeOrigin -> Int Source # enumFrom :: NodeOrigin -> [NodeOrigin] Source # enumFromThen :: NodeOrigin -> NodeOrigin -> [NodeOrigin] Source # enumFromTo :: NodeOrigin -> NodeOrigin -> [NodeOrigin] Source # enumFromThenTo :: NodeOrigin -> NodeOrigin -> NodeOrigin -> [NodeOrigin] Source # | |
Enum RecFieldContext Source # | |
Defined in GHC.Iface.Ext.Types Methods succ :: RecFieldContext -> RecFieldContext Source # pred :: RecFieldContext -> RecFieldContext Source # toEnum :: Int -> RecFieldContext Source # fromEnum :: RecFieldContext -> Int Source # enumFrom :: RecFieldContext -> [RecFieldContext] Source # enumFromThen :: RecFieldContext -> RecFieldContext -> [RecFieldContext] Source # enumFromTo :: RecFieldContext -> RecFieldContext -> [RecFieldContext] Source # enumFromThenTo :: RecFieldContext -> RecFieldContext -> RecFieldContext -> [RecFieldContext] Source # | |
Enum AOp Source # | |
Defined in GHC.JS.Syntax | |
Enum Op Source # | |
Defined in GHC.JS.Syntax | |
Enum UOp Source # | |
Defined in GHC.JS.Syntax | |
Enum JOp Source # | |
Defined in GHC.JS.Unsat.Syntax | |
Enum JUOp Source # | |
Enum MetaId Source # | |
Defined in GHC.Llvm.MetaData Methods succ :: MetaId -> MetaId Source # pred :: MetaId -> MetaId Source # toEnum :: Int -> MetaId Source # fromEnum :: MetaId -> Int Source # enumFrom :: MetaId -> [MetaId] Source # enumFromThen :: MetaId -> MetaId -> [MetaId] Source # enumFromTo :: MetaId -> MetaId -> [MetaId] Source # enumFromThenTo :: MetaId -> MetaId -> MetaId -> [MetaId] Source # | |
Enum ExtBits Source # | |
Defined in GHC.Parser.Lexer Methods succ :: ExtBits -> ExtBits Source # pred :: ExtBits -> ExtBits Source # toEnum :: Int -> ExtBits Source # fromEnum :: ExtBits -> Int Source # enumFrom :: ExtBits -> [ExtBits] Source # enumFromThen :: ExtBits -> ExtBits -> [ExtBits] Source # enumFromTo :: ExtBits -> ExtBits -> [ExtBits] Source # enumFromThenTo :: ExtBits -> ExtBits -> ExtBits -> [ExtBits] Source # | |
Enum StgReg Source # | |
Defined in GHC.StgToJS.Regs Methods succ :: StgReg -> StgReg Source # pred :: StgReg -> StgReg Source # toEnum :: Int -> StgReg Source # fromEnum :: StgReg -> Int Source # enumFrom :: StgReg -> [StgReg] Source # enumFromThen :: StgReg -> StgReg -> [StgReg] Source # enumFromTo :: StgReg -> StgReg -> [StgReg] Source # enumFromThenTo :: StgReg -> StgReg -> StgReg -> [StgReg] Source # | |
Enum StgRet Source # | |
Defined in GHC.StgToJS.Regs Methods succ :: StgRet -> StgRet Source # pred :: StgRet -> StgRet Source # toEnum :: Int -> StgRet Source # fromEnum :: StgRet -> Int Source # enumFrom :: StgRet -> [StgRet] Source # enumFromThen :: StgRet -> StgRet -> [StgRet] Source # enumFromTo :: StgRet -> StgRet -> [StgRet] Source # enumFromThenTo :: StgRet -> StgRet -> StgRet -> [StgRet] Source # | |
Enum ClosureType Source # | |
Defined in GHC.StgToJS.Types Methods succ :: ClosureType -> ClosureType Source # pred :: ClosureType -> ClosureType Source # toEnum :: Int -> ClosureType Source # fromEnum :: ClosureType -> Int Source # enumFrom :: ClosureType -> [ClosureType] Source # enumFromThen :: ClosureType -> ClosureType -> [ClosureType] Source # enumFromTo :: ClosureType -> ClosureType -> [ClosureType] Source # enumFromThenTo :: ClosureType -> ClosureType -> ClosureType -> [ClosureType] Source # | |
Enum IdType Source # | |
Defined in GHC.StgToJS.Types Methods succ :: IdType -> IdType Source # pred :: IdType -> IdType Source # toEnum :: Int -> IdType Source # fromEnum :: IdType -> Int Source # enumFrom :: IdType -> [IdType] Source # enumFromThen :: IdType -> IdType -> [IdType] Source # enumFromTo :: IdType -> IdType -> [IdType] Source # enumFromThenTo :: IdType -> IdType -> IdType -> [IdType] Source # | |
Enum JSFFIType Source # | |
Defined in GHC.StgToJS.Types Methods succ :: JSFFIType -> JSFFIType Source # pred :: JSFFIType -> JSFFIType Source # toEnum :: Int -> JSFFIType Source # fromEnum :: JSFFIType -> Int Source # enumFrom :: JSFFIType -> [JSFFIType] Source # enumFromThen :: JSFFIType -> JSFFIType -> [JSFFIType] Source # enumFromTo :: JSFFIType -> JSFFIType -> [JSFFIType] Source # enumFromThenTo :: JSFFIType -> JSFFIType -> JSFFIType -> [JSFFIType] Source # | |
Enum ThreadStatus Source # | |
Defined in GHC.StgToJS.Types Methods succ :: ThreadStatus -> ThreadStatus Source # pred :: ThreadStatus -> ThreadStatus Source # toEnum :: Int -> ThreadStatus Source # fromEnum :: ThreadStatus -> Int Source # enumFrom :: ThreadStatus -> [ThreadStatus] Source # enumFromThen :: ThreadStatus -> ThreadStatus -> [ThreadStatus] Source # enumFromTo :: ThreadStatus -> ThreadStatus -> [ThreadStatus] Source # enumFromThenTo :: ThreadStatus -> ThreadStatus -> ThreadStatus -> [ThreadStatus] Source # | |
Enum VarType Source # | |
Defined in GHC.StgToJS.Types Methods succ :: VarType -> VarType Source # pred :: VarType -> VarType Source # toEnum :: Int -> VarType Source # fromEnum :: VarType -> Int Source # enumFrom :: VarType -> [VarType] Source # enumFromThen :: VarType -> VarType -> [VarType] Source # enumFromTo :: VarType -> VarType -> [VarType] Source # enumFromThenTo :: VarType -> VarType -> VarType -> [VarType] Source # | |
Enum CCallConv Source # | |
Defined in GHC.Types.ForeignCall Methods succ :: CCallConv -> CCallConv Source # pred :: CCallConv -> CCallConv Source # toEnum :: Int -> CCallConv Source # fromEnum :: CCallConv -> Int Source # enumFrom :: CCallConv -> [CCallConv] Source # enumFromThen :: CCallConv -> CCallConv -> [CCallConv] Source # enumFromTo :: CCallConv -> CCallConv -> [CCallConv] Source # enumFromThenTo :: CCallConv -> CCallConv -> CCallConv -> [CCallConv] Source # | |
Enum Safety Source # | |
Defined in GHC.Types.ForeignCall Methods succ :: Safety -> Safety Source # pred :: Safety -> Safety Source # toEnum :: Int -> Safety Source # fromEnum :: Safety -> Int Source # enumFrom :: Safety -> [Safety] Source # enumFromThen :: Safety -> Safety -> [Safety] Source # enumFromTo :: Safety -> Safety -> [Safety] Source # enumFromThenTo :: Safety -> Safety -> Safety -> [Safety] Source # | |
Enum LitNumType Source # | |
Defined in GHC.Types.Literal Methods succ :: LitNumType -> LitNumType Source # pred :: LitNumType -> LitNumType Source # toEnum :: Int -> LitNumType Source # fromEnum :: LitNumType -> Int Source # enumFrom :: LitNumType -> [LitNumType] Source # enumFromThen :: LitNumType -> LitNumType -> [LitNumType] Source # enumFromTo :: LitNumType -> LitNumType -> [LitNumType] Source # enumFromThenTo :: LitNumType -> LitNumType -> LitNumType -> [LitNumType] Source # | |
Enum ProfAuto Source # | |
Defined in GHC.Types.ProfAuto Methods succ :: ProfAuto -> ProfAuto Source # pred :: ProfAuto -> ProfAuto Source # toEnum :: Int -> ProfAuto Source # fromEnum :: ProfAuto -> Int Source # enumFrom :: ProfAuto -> [ProfAuto] Source # enumFromThen :: ProfAuto -> ProfAuto -> [ProfAuto] Source # enumFromTo :: ProfAuto -> ProfAuto -> [ProfAuto] Source # enumFromThenTo :: ProfAuto -> ProfAuto -> ProfAuto -> [ProfAuto] Source # | |
Enum Extension | |
Defined in GHC.LanguageExtensions.Type Methods succ :: Extension -> Extension Source # pred :: Extension -> Extension Source # toEnum :: Int -> Extension Source # fromEnum :: Extension -> Int Source # enumFrom :: Extension -> [Extension] Source # enumFromThen :: Extension -> Extension -> [Extension] Source # enumFromTo :: Extension -> Extension -> [Extension] Source # enumFromThenTo :: Extension -> Extension -> Extension -> [Extension] Source # | |
Enum ClosureType | |
Defined in GHC.Exts.Heap.ClosureTypes Methods succ :: ClosureType -> ClosureType Source # pred :: ClosureType -> ClosureType Source # toEnum :: Int -> ClosureType Source # fromEnum :: ClosureType -> Int Source # enumFrom :: ClosureType -> [ClosureType] Source # enumFromThen :: ClosureType -> ClosureType -> [ClosureType] Source # enumFromTo :: ClosureType -> ClosureType -> [ClosureType] Source # enumFromThenTo :: ClosureType -> ClosureType -> ClosureType -> [ClosureType] Source # | |
Enum Ordering | Since: base-2.1 |
Defined in GHC.Enum Methods succ :: Ordering -> Ordering Source # pred :: Ordering -> Ordering Source # toEnum :: Int -> Ordering Source # fromEnum :: Ordering -> Int Source # enumFrom :: Ordering -> [Ordering] Source # enumFromThen :: Ordering -> Ordering -> [Ordering] Source # enumFromTo :: Ordering -> Ordering -> [Ordering] Source # enumFromThenTo :: Ordering -> Ordering -> Ordering -> [Ordering] Source # | |
Enum THResultType | |
Defined in GHCi.Message Methods succ :: THResultType -> THResultType Source # pred :: THResultType -> THResultType Source # toEnum :: Int -> THResultType Source # fromEnum :: THResultType -> Int Source # enumFrom :: THResultType -> [THResultType] Source # enumFromThen :: THResultType -> THResultType -> [THResultType] Source # enumFromTo :: THResultType -> THResultType -> [THResultType] Source # enumFromThenTo :: THResultType -> THResultType -> THResultType -> [THResultType] Source # | |
Enum Day | |
Defined in Data.Time.Calendar.Days | |
Enum Month | |
Defined in Data.Time.Calendar.Month Methods succ :: Month -> Month Source # pred :: Month -> Month Source # toEnum :: Int -> Month Source # fromEnum :: Month -> Int Source # enumFrom :: Month -> [Month] Source # enumFromThen :: Month -> Month -> [Month] Source # enumFromTo :: Month -> Month -> [Month] Source # enumFromThenTo :: Month -> Month -> Month -> [Month] Source # | |
Enum Quarter | |
Defined in Data.Time.Calendar.Quarter Methods succ :: Quarter -> Quarter Source # pred :: Quarter -> Quarter Source # toEnum :: Int -> Quarter Source # fromEnum :: Quarter -> Int Source # enumFrom :: Quarter -> [Quarter] Source # enumFromThen :: Quarter -> Quarter -> [Quarter] Source # enumFromTo :: Quarter -> Quarter -> [Quarter] Source # enumFromThenTo :: Quarter -> Quarter -> Quarter -> [Quarter] Source # | |
Enum QuarterOfYear | maps Q1..Q4 to 1..4 |
Defined in Data.Time.Calendar.Quarter Methods succ :: QuarterOfYear -> QuarterOfYear Source # pred :: QuarterOfYear -> QuarterOfYear Source # toEnum :: Int -> QuarterOfYear Source # fromEnum :: QuarterOfYear -> Int Source # enumFrom :: QuarterOfYear -> [QuarterOfYear] Source # enumFromThen :: QuarterOfYear -> QuarterOfYear -> [QuarterOfYear] Source # enumFromTo :: QuarterOfYear -> QuarterOfYear -> [QuarterOfYear] Source # enumFromThenTo :: QuarterOfYear -> QuarterOfYear -> QuarterOfYear -> [QuarterOfYear] Source # | |
Enum DiffTime | |
Defined in Data.Time.Clock.Internal.DiffTime Methods succ :: DiffTime -> DiffTime Source # pred :: DiffTime -> DiffTime Source # toEnum :: Int -> DiffTime Source # fromEnum :: DiffTime -> Int Source # enumFrom :: DiffTime -> [DiffTime] Source # enumFromThen :: DiffTime -> DiffTime -> [DiffTime] Source # enumFromTo :: DiffTime -> DiffTime -> [DiffTime] Source # enumFromThenTo :: DiffTime -> DiffTime -> DiffTime -> [DiffTime] Source # | |
Enum StatxFlags | |
Defined in System.Posix.Files.Common Methods succ :: StatxFlags -> StatxFlags Source # pred :: StatxFlags -> StatxFlags Source # toEnum :: Int -> StatxFlags Source # fromEnum :: StatxFlags -> Int Source # enumFrom :: StatxFlags -> [StatxFlags] Source # enumFromThen :: StatxFlags -> StatxFlags -> [StatxFlags] Source # enumFromTo :: StatxFlags -> StatxFlags -> [StatxFlags] Source # enumFromThenTo :: StatxFlags -> StatxFlags -> StatxFlags -> [StatxFlags] Source # | |
Enum StatxMask | |
Defined in System.Posix.Files.Common Methods succ :: StatxMask -> StatxMask Source # pred :: StatxMask -> StatxMask Source # toEnum :: Int -> StatxMask Source # fromEnum :: StatxMask -> Int Source # enumFrom :: StatxMask -> [StatxMask] Source # enumFromThen :: StatxMask -> StatxMask -> [StatxMask] Source # enumFromTo :: StatxMask -> StatxMask -> [StatxMask] Source # enumFromThenTo :: StatxMask -> StatxMask -> StatxMask -> [StatxMask] Source # | |
Enum Integer | Since: base-2.1 |
Defined in GHC.Enum Methods succ :: Integer -> Integer Source # pred :: Integer -> Integer Source # toEnum :: Int -> Integer Source # fromEnum :: Integer -> Int Source # enumFrom :: Integer -> [Integer] Source # enumFromThen :: Integer -> Integer -> [Integer] Source # enumFromTo :: Integer -> Integer -> [Integer] Source # enumFromThenTo :: Integer -> Integer -> Integer -> [Integer] Source # | |
Enum Natural | Since: base-4.8.0.0 |
Defined in GHC.Enum Methods succ :: Natural -> Natural Source # pred :: Natural -> Natural Source # toEnum :: Int -> Natural Source # fromEnum :: Natural -> Int Source # enumFrom :: Natural -> [Natural] Source # enumFromThen :: Natural -> Natural -> [Natural] Source # enumFromTo :: Natural -> Natural -> [Natural] Source # enumFromThenTo :: Natural -> Natural -> Natural -> [Natural] Source # | |
Enum () | Since: base-2.1 |
Enum Bool | Since: base-2.1 |
Enum Char | Since: base-2.1 |
Enum Int | Since: base-2.1 |
Defined in GHC.Enum | |
Enum Levity | Since: base-4.16.0.0 |
Defined in GHC.Enum Methods succ :: Levity -> Levity Source # pred :: Levity -> Levity Source # toEnum :: Int -> Levity Source # fromEnum :: Levity -> Int Source # enumFrom :: Levity -> [Levity] Source # enumFromThen :: Levity -> Levity -> [Levity] Source # enumFromTo :: Levity -> Levity -> [Levity] Source # enumFromThenTo :: Levity -> Levity -> Levity -> [Levity] Source # | |
Enum VecCount | Since: base-4.10.0.0 |
Defined in GHC.Enum Methods succ :: VecCount -> VecCount Source # pred :: VecCount -> VecCount Source # toEnum :: Int -> VecCount Source # fromEnum :: VecCount -> Int Source # enumFrom :: VecCount -> [VecCount] Source # enumFromThen :: VecCount -> VecCount -> [VecCount] Source # enumFromTo :: VecCount -> VecCount -> [VecCount] Source # enumFromThenTo :: VecCount -> VecCount -> VecCount -> [VecCount] Source # | |
Enum VecElem | Since: base-4.10.0.0 |
Defined in GHC.Enum Methods succ :: VecElem -> VecElem Source # pred :: VecElem -> VecElem Source # toEnum :: Int -> VecElem Source # fromEnum :: VecElem -> Int Source # enumFrom :: VecElem -> [VecElem] Source # enumFromThen :: VecElem -> VecElem -> [VecElem] Source # enumFromTo :: VecElem -> VecElem -> [VecElem] Source # enumFromThenTo :: VecElem -> VecElem -> VecElem -> [VecElem] Source # | |
Enum Word | Since: base-2.1 |
Enum a => Enum (And a) | Since: base-4.16 |
Defined in Data.Bits Methods succ :: And a -> And a Source # pred :: And a -> And a Source # toEnum :: Int -> And a Source # fromEnum :: And a -> Int Source # enumFrom :: And a -> [And a] Source # enumFromThen :: And a -> And a -> [And a] Source # enumFromTo :: And a -> And a -> [And a] Source # enumFromThenTo :: And a -> And a -> And a -> [And a] Source # | |
Enum a => Enum (Iff a) | Since: base-4.16 |
Defined in Data.Bits Methods succ :: Iff a -> Iff a Source # pred :: Iff a -> Iff a Source # toEnum :: Int -> Iff a Source # fromEnum :: Iff a -> Int Source # enumFrom :: Iff a -> [Iff a] Source # enumFromThen :: Iff a -> Iff a -> [Iff a] Source # enumFromTo :: Iff a -> Iff a -> [Iff a] Source # enumFromThenTo :: Iff a -> Iff a -> Iff a -> [Iff a] Source # | |
Enum a => Enum (Ior a) | Since: base-4.16 |
Defined in Data.Bits Methods succ :: Ior a -> Ior a Source # pred :: Ior a -> Ior a Source # toEnum :: Int -> Ior a Source # fromEnum :: Ior a -> Int Source # enumFrom :: Ior a -> [Ior a] Source # enumFromThen :: Ior a -> Ior a -> [Ior a] Source # enumFromTo :: Ior a -> Ior a -> [Ior a] Source # enumFromThenTo :: Ior a -> Ior a -> Ior a -> [Ior a] Source # | |
Enum a => Enum (Xor a) | Since: base-4.16 |
Defined in Data.Bits Methods succ :: Xor a -> Xor a Source # pred :: Xor a -> Xor a Source # toEnum :: Int -> Xor a Source # fromEnum :: Xor a -> Int Source # enumFrom :: Xor a -> [Xor a] Source # enumFromThen :: Xor a -> Xor a -> [Xor a] Source # enumFromTo :: Xor a -> Xor a -> [Xor a] Source # enumFromThenTo :: Xor a -> Xor a -> Xor a -> [Xor a] Source # | |
Enum a => Enum (Identity a) | Since: base-4.9.0.0 |
Defined in Data.Functor.Identity Methods succ :: Identity a -> Identity a Source # pred :: Identity a -> Identity a Source # toEnum :: Int -> Identity a Source # fromEnum :: Identity a -> Int Source # enumFrom :: Identity a -> [Identity a] Source # enumFromThen :: Identity a -> Identity a -> [Identity a] Source # enumFromTo :: Identity a -> Identity a -> [Identity a] Source # enumFromThenTo :: Identity a -> Identity a -> Identity a -> [Identity a] Source # | |
(Enum a, Bounded a, Eq a) => Enum (Down a) | Swaps Since: base-4.18.0.0 |
Defined in Data.Ord Methods succ :: Down a -> Down a Source # pred :: Down a -> Down a Source # toEnum :: Int -> Down a Source # fromEnum :: Down a -> Int Source # enumFrom :: Down a -> [Down a] Source # enumFromThen :: Down a -> Down a -> [Down a] Source # enumFromTo :: Down a -> Down a -> [Down a] Source # enumFromThenTo :: Down a -> Down a -> Down a -> [Down a] Source # | |
Enum a => Enum (First a) | Since: base-4.9.0.0 |
Defined in Data.Semigroup Methods succ :: First a -> First a Source # pred :: First a -> First a Source # toEnum :: Int -> First a Source # fromEnum :: First a -> Int Source # enumFrom :: First a -> [First a] Source # enumFromThen :: First a -> First a -> [First a] Source # enumFromTo :: First a -> First a -> [First a] Source # enumFromThenTo :: First a -> First a -> First a -> [First a] Source # | |
Enum a => Enum (Last a) | Since: base-4.9.0.0 |
Defined in Data.Semigroup Methods succ :: Last a -> Last a Source # pred :: Last a -> Last a Source # toEnum :: Int -> Last a Source # fromEnum :: Last a -> Int Source # enumFrom :: Last a -> [Last a] Source # enumFromThen :: Last a -> Last a -> [Last a] Source # enumFromTo :: Last a -> Last a -> [Last a] Source # enumFromThenTo :: Last a -> Last a -> Last a -> [Last a] Source # | |
Enum a => Enum (Max a) | Since: base-4.9.0.0 |
Defined in Data.Semigroup Methods succ :: Max a -> Max a Source # pred :: Max a -> Max a Source # toEnum :: Int -> Max a Source # fromEnum :: Max a -> Int Source # enumFrom :: Max a -> [Max a] Source # enumFromThen :: Max a -> Max a -> [Max a] Source # enumFromTo :: Max a -> Max a -> [Max a] Source # enumFromThenTo :: Max a -> Max a -> Max a -> [Max a] Source # | |
Enum a => Enum (Min a) | Since: base-4.9.0.0 |
Defined in Data.Semigroup Methods succ :: Min a -> Min a Source # pred :: Min a -> Min a Source # toEnum :: Int -> Min a Source # fromEnum :: Min a -> Int Source # enumFrom :: Min a -> [Min a] Source # enumFromThen :: Min a -> Min a -> [Min a] Source # enumFromTo :: Min a -> Min a -> [Min a] Source # enumFromThenTo :: Min a -> Min a -> Min a -> [Min a] Source # | |
Enum a => Enum (WrappedMonoid a) | Since: base-4.9.0.0 |
Defined in Data.Semigroup Methods succ :: WrappedMonoid a -> WrappedMonoid a Source # pred :: WrappedMonoid a -> WrappedMonoid a Source # toEnum :: Int -> WrappedMonoid a Source # fromEnum :: WrappedMonoid a -> Int Source # enumFrom :: WrappedMonoid a -> [WrappedMonoid a] Source # enumFromThen :: WrappedMonoid a -> WrappedMonoid a -> [WrappedMonoid a] Source # enumFromTo :: WrappedMonoid a -> WrappedMonoid a -> [WrappedMonoid a] Source # enumFromThenTo :: WrappedMonoid a -> WrappedMonoid a -> WrappedMonoid a -> [WrappedMonoid a] Source # | |
Integral a => Enum (Ratio a) | Since: base-2.0.1 |
Defined in GHC.Real Methods succ :: Ratio a -> Ratio a Source # pred :: Ratio a -> Ratio a Source # toEnum :: Int -> Ratio a Source # fromEnum :: Ratio a -> Int Source # enumFrom :: Ratio a -> [Ratio a] Source # enumFromThen :: Ratio a -> Ratio a -> [Ratio a] Source # enumFromTo :: Ratio a -> Ratio a -> [Ratio a] Source # enumFromThenTo :: Ratio a -> Ratio a -> Ratio a -> [Ratio a] Source # | |
Enum a => Enum (Solo a) | |
Defined in GHC.Enum Methods succ :: Solo a -> Solo a Source # pred :: Solo a -> Solo a Source # toEnum :: Int -> Solo a Source # fromEnum :: Solo a -> Int Source # enumFrom :: Solo a -> [Solo a] Source # enumFromThen :: Solo a -> Solo a -> [Solo a] Source # enumFromTo :: Solo a -> Solo a -> [Solo a] Source # enumFromThenTo :: Solo a -> Solo a -> Solo a -> [Solo a] Source # | |
Enum (Fixed a) | Recall that, for numeric types, succ (0.000 :: Milli) == 0.001 and likewise pred (0.000 :: Milli) == -0.001 In other words, succ (0.000000000000 :: Pico) == 0.000000000001 and similarly pred (0.000000000000 :: Pico) == -0.000000000001 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 |
Defined in Data.Fixed Methods succ :: Fixed a -> Fixed a Source # pred :: Fixed a -> Fixed a Source # toEnum :: Int -> Fixed a Source # fromEnum :: Fixed a -> Int Source # enumFrom :: Fixed a -> [Fixed a] Source # enumFromThen :: Fixed a -> Fixed a -> [Fixed a] Source # enumFromTo :: Fixed a -> Fixed a -> [Fixed a] Source # enumFromThenTo :: Fixed a -> Fixed a -> Fixed a -> [Fixed a] Source # | |
Enum (Proxy s) | Since: base-4.7.0.0 |
Defined in Data.Proxy Methods succ :: Proxy s -> Proxy s Source # pred :: Proxy s -> Proxy s Source # toEnum :: Int -> Proxy s Source # fromEnum :: Proxy s -> Int Source # enumFrom :: Proxy s -> [Proxy s] Source # enumFromThen :: Proxy s -> Proxy s -> [Proxy s] Source # enumFromTo :: Proxy s -> Proxy s -> [Proxy s] Source # enumFromThenTo :: Proxy s -> Proxy s -> Proxy s -> [Proxy s] Source # | |
Enum a => Enum (Const a b) | Since: base-4.9.0.0 |
Defined in Data.Functor.Const Methods succ :: Const a b -> Const a b Source # pred :: Const a b -> Const a b Source # toEnum :: Int -> Const a b Source # fromEnum :: Const a b -> Int Source # enumFrom :: Const a b -> [Const a b] Source # enumFromThen :: Const a b -> Const a b -> [Const a b] Source # enumFromTo :: Const a b -> Const a b -> [Const a b] Source # enumFromThenTo :: Const a b -> Const a b -> Const a b -> [Const a b] Source # | |
Enum (f a) => Enum (Ap f a) | Since: base-4.12.0.0 |
Defined in Data.Monoid Methods succ :: Ap f a -> Ap f a Source # pred :: Ap f a -> Ap f a Source # toEnum :: Int -> Ap f a Source # fromEnum :: Ap f a -> Int Source # enumFrom :: Ap f a -> [Ap f a] Source # enumFromThen :: Ap f a -> Ap f a -> [Ap f a] Source # enumFromTo :: Ap f a -> Ap f a -> [Ap f a] Source # enumFromThenTo :: Ap f a -> Ap f a -> Ap f a -> [Ap f a] Source # | |
Enum (f a) => Enum (Alt f a) | Since: base-4.8.0.0 |
Defined in Data.Semigroup.Internal Methods succ :: Alt f a -> Alt f a Source # pred :: Alt f a -> Alt f a Source # toEnum :: Int -> Alt f a Source # fromEnum :: Alt f a -> Int Source # enumFrom :: Alt f a -> [Alt f a] Source # enumFromThen :: Alt f a -> Alt f a -> [Alt f a] Source # enumFromTo :: Alt f a -> Alt f a -> [Alt f a] Source # enumFromThenTo :: Alt f a -> Alt f a -> Alt f a -> [Alt f a] Source # | |
Coercible a b => Enum (Coercion a b) | Since: base-4.7.0.0 |
Defined in Data.Type.Coercion Methods succ :: Coercion a b -> Coercion a b Source # pred :: Coercion a b -> Coercion a b Source # toEnum :: Int -> Coercion a b Source # fromEnum :: Coercion a b -> Int Source # enumFrom :: Coercion a b -> [Coercion a b] Source # enumFromThen :: Coercion a b -> Coercion a b -> [Coercion a b] Source # enumFromTo :: Coercion a b -> Coercion a b -> [Coercion a b] Source # enumFromThenTo :: Coercion a b -> Coercion a b -> Coercion a b -> [Coercion a b] Source # | |
a ~ b => Enum (a :~: b) | Since: base-4.7.0.0 |
Defined in Data.Type.Equality Methods succ :: (a :~: b) -> a :~: b Source # pred :: (a :~: b) -> a :~: b Source # toEnum :: Int -> a :~: b Source # fromEnum :: (a :~: b) -> Int Source # enumFrom :: (a :~: b) -> [a :~: b] Source # enumFromThen :: (a :~: b) -> (a :~: b) -> [a :~: b] Source # enumFromTo :: (a :~: b) -> (a :~: b) -> [a :~: b] Source # enumFromThenTo :: (a :~: b) -> (a :~: b) -> (a :~: b) -> [a :~: b] Source # | |
a ~~ b => Enum (a :~~: b) | Since: base-4.10.0.0 |
Defined in Data.Type.Equality Methods succ :: (a :~~: b) -> a :~~: b Source # pred :: (a :~~: b) -> a :~~: b Source # toEnum :: Int -> a :~~: b Source # fromEnum :: (a :~~: b) -> Int Source # enumFrom :: (a :~~: b) -> [a :~~: b] Source # enumFromThen :: (a :~~: b) -> (a :~~: b) -> [a :~~: b] Source # enumFromTo :: (a :~~: b) -> (a :~~: b) -> [a :~~: b] Source # enumFromThenTo :: (a :~~: b) -> (a :~~: b) -> (a :~~: b) -> [a :~~: b] Source # | |
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 Source # pred :: Compose f g a -> Compose f g a Source # toEnum :: Int -> Compose f g a Source # fromEnum :: Compose f g a -> Int Source # enumFrom :: Compose f g a -> [Compose f g a] Source # enumFromThen :: Compose f g a -> Compose f g a -> [Compose f g a] Source # enumFromTo :: Compose f g a -> Compose f g a -> [Compose f g a] Source # enumFromThenTo :: Compose f g a -> Compose f g a -> Compose f g a -> [Compose f g a] Source # |
class (Real a, Enum a) => Integral a where Source #
Integral numbers, supporting integer division.
The Haskell Report defines no laws for Integral
. However, Integral
instances are customarily expected to define a Euclidean domain and have the
following properties for the div
/mod
and quot
/rem
pairs, given
suitable Euclidean functions f
and g
:
x
=y * quot x y + rem x y
withrem x y
=fromInteger 0
org (rem x y)
<g y
x
=y * div x y + mod x y
withmod x y
=fromInteger 0
orf (mod x y)
<f y
An example of a suitable Euclidean function, for Integer
's instance, is
abs
.
In addition, toInteger
should be total, and fromInteger
should be a left
inverse for it, i.e. fromInteger (toInteger i) = i
.
Methods
quot :: a -> a -> a infixl 7 Source #
integer division truncated toward zero
WARNING: This function is partial (because it throws when 0 is passed as
the divisor) for all the integer types in base
.
rem :: a -> a -> a infixl 7 Source #
integer remainder, satisfying
(x `quot` y)*y + (x `rem` y) == x
WARNING: This function is partial (because it throws when 0 is passed as
the divisor) for all the integer types in base
.
div :: a -> a -> a infixl 7 Source #
integer division truncated toward negative infinity
WARNING: This function is partial (because it throws when 0 is passed as
the divisor) for all the integer types in base
.
mod :: a -> a -> a infixl 7 Source #
integer modulus, satisfying
(x `div` y)*y + (x `mod` y) == x
WARNING: This function is partial (because it throws when 0 is passed as
the divisor) for all the integer types in base
.
quotRem :: a -> a -> (a, a) Source #
WARNING: This function is partial (because it throws when 0 is passed as
the divisor) for all the integer types in base
.
divMod :: a -> a -> (a, a) Source #
WARNING: This function is partial (because it throws when 0 is passed as
the divisor) for all the integer types in base
.
toInteger :: a -> Integer Source #
conversion to Integer
Instances
Integral CBool | |
Integral CChar | |
Integral CInt | |
Defined in Foreign.C.Types | |
Integral CIntMax | |
Defined in Foreign.C.Types Methods quot :: CIntMax -> CIntMax -> CIntMax Source # rem :: CIntMax -> CIntMax -> CIntMax Source # div :: CIntMax -> CIntMax -> CIntMax Source # mod :: CIntMax -> CIntMax -> CIntMax Source # quotRem :: CIntMax -> CIntMax -> (CIntMax, CIntMax) Source # | |
Integral CIntPtr | |
Defined in Foreign.C.Types Methods quot :: CIntPtr -> CIntPtr -> CIntPtr Source # rem :: CIntPtr -> CIntPtr -> CIntPtr Source # div :: CIntPtr -> CIntPtr -> CIntPtr Source # mod :: CIntPtr -> CIntPtr -> CIntPtr Source # quotRem :: CIntPtr -> CIntPtr -> (CIntPtr, CIntPtr) Source # | |
Integral CLLong | |
Defined in Foreign.C.Types | |
Integral CLong | |
Integral CPtrdiff | |
Defined in Foreign.C.Types Methods quot :: CPtrdiff -> CPtrdiff -> CPtrdiff Source # rem :: CPtrdiff -> CPtrdiff -> CPtrdiff Source # div :: CPtrdiff -> CPtrdiff -> CPtrdiff Source # mod :: CPtrdiff -> CPtrdiff -> CPtrdiff Source # quotRem :: CPtrdiff -> CPtrdiff -> (CPtrdiff, CPtrdiff) Source # divMod :: CPtrdiff -> CPtrdiff -> (CPtrdiff, CPtrdiff) Source # | |
Integral CSChar | |
Defined in Foreign.C.Types | |
Integral CShort | |
Defined in Foreign.C.Types | |
Integral CSigAtomic | |
Defined in Foreign.C.Types Methods quot :: CSigAtomic -> CSigAtomic -> CSigAtomic Source # rem :: CSigAtomic -> CSigAtomic -> CSigAtomic Source # div :: CSigAtomic -> CSigAtomic -> CSigAtomic Source # mod :: CSigAtomic -> CSigAtomic -> CSigAtomic Source # quotRem :: CSigAtomic -> CSigAtomic -> (CSigAtomic, CSigAtomic) Source # divMod :: CSigAtomic -> CSigAtomic -> (CSigAtomic, CSigAtomic) Source # toInteger :: CSigAtomic -> Integer Source # | |
Integral CSize | |
Integral CUChar | |
Defined in Foreign.C.Types | |
Integral CUInt | |
Integral CUIntMax | |
Defined in Foreign.C.Types Methods quot :: CUIntMax -> CUIntMax -> CUIntMax Source # rem :: CUIntMax -> CUIntMax -> CUIntMax Source # div :: CUIntMax -> CUIntMax -> CUIntMax Source # mod :: CUIntMax -> CUIntMax -> CUIntMax Source # quotRem :: CUIntMax -> CUIntMax -> (CUIntMax, CUIntMax) Source # divMod :: CUIntMax -> CUIntMax -> (CUIntMax, CUIntMax) Source # | |
Integral CUIntPtr | |
Defined in Foreign.C.Types Methods quot :: CUIntPtr -> CUIntPtr -> CUIntPtr Source # rem :: CUIntPtr -> CUIntPtr -> CUIntPtr Source # div :: CUIntPtr -> CUIntPtr -> CUIntPtr Source # mod :: CUIntPtr -> CUIntPtr -> CUIntPtr Source # quotRem :: CUIntPtr -> CUIntPtr -> (CUIntPtr, CUIntPtr) Source # divMod :: CUIntPtr -> CUIntPtr -> (CUIntPtr, CUIntPtr) Source # | |
Integral CULLong | |
Defined in Foreign.C.Types Methods quot :: CULLong -> CULLong -> CULLong Source # rem :: CULLong -> CULLong -> CULLong Source # div :: CULLong -> CULLong -> CULLong Source # mod :: CULLong -> CULLong -> CULLong Source # quotRem :: CULLong -> CULLong -> (CULLong, CULLong) Source # | |
Integral CULong | |
Defined in Foreign.C.Types | |
Integral CUShort | |
Defined in Foreign.C.Types Methods quot :: CUShort -> CUShort -> CUShort Source # rem :: CUShort -> CUShort -> CUShort Source # div :: CUShort -> CUShort -> CUShort Source # mod :: CUShort -> CUShort -> CUShort Source # quotRem :: CUShort -> CUShort -> (CUShort, CUShort) Source # | |
Integral CWchar | |
Defined in Foreign.C.Types | |
Integral IntPtr | |
Defined in Foreign.Ptr | |
Integral WordPtr | |
Defined in Foreign.Ptr Methods quot :: WordPtr -> WordPtr -> WordPtr Source # rem :: WordPtr -> WordPtr -> WordPtr Source # div :: WordPtr -> WordPtr -> WordPtr Source # mod :: WordPtr -> WordPtr -> WordPtr Source # quotRem :: WordPtr -> WordPtr -> (WordPtr, WordPtr) Source # | |
Integral Int16 | Since: base-2.1 |
Integral Int32 | Since: base-2.1 |
Integral Int64 | Since: base-2.1 |
Integral Int8 | Since: base-2.1 |
Defined in GHC.Int | |
Integral Word16 | Since: base-2.1 |
Defined in GHC.Word | |
Integral Word32 | Since: base-2.1 |
Defined in GHC.Word | |
Integral Word64 | Since: base-2.1 |
Defined in GHC.Word | |
Integral Word8 | Since: base-2.1 |
Integral CBlkCnt | |
Defined in System.Posix.Types Methods quot :: CBlkCnt -> CBlkCnt -> CBlkCnt Source # rem :: CBlkCnt -> CBlkCnt -> CBlkCnt Source # div :: CBlkCnt -> CBlkCnt -> CBlkCnt Source # mod :: CBlkCnt -> CBlkCnt -> CBlkCnt Source # quotRem :: CBlkCnt -> CBlkCnt -> (CBlkCnt, CBlkCnt) Source # | |
Integral CBlkSize | |
Defined in System.Posix.Types Methods quot :: CBlkSize -> CBlkSize -> CBlkSize Source # rem :: CBlkSize -> CBlkSize -> CBlkSize Source # div :: CBlkSize -> CBlkSize -> CBlkSize Source # mod :: CBlkSize -> CBlkSize -> CBlkSize Source # quotRem :: CBlkSize -> CBlkSize -> (CBlkSize, CBlkSize) Source # divMod :: CBlkSize -> CBlkSize -> (CBlkSize, CBlkSize) Source # | |
Integral CClockId | |
Defined in System.Posix.Types Methods quot :: CClockId -> CClockId -> CClockId Source # rem :: CClockId -> CClockId -> CClockId Source # div :: CClockId -> CClockId -> CClockId Source # mod :: CClockId -> CClockId -> CClockId Source # quotRem :: CClockId -> CClockId -> (CClockId, CClockId) Source # divMod :: CClockId -> CClockId -> (CClockId, CClockId) Source # | |
Integral CDev | |
Defined in System.Posix.Types | |
Integral CFsBlkCnt | |
Defined in System.Posix.Types Methods quot :: CFsBlkCnt -> CFsBlkCnt -> CFsBlkCnt Source # rem :: CFsBlkCnt -> CFsBlkCnt -> CFsBlkCnt Source # div :: CFsBlkCnt -> CFsBlkCnt -> CFsBlkCnt Source # mod :: CFsBlkCnt -> CFsBlkCnt -> CFsBlkCnt Source # quotRem :: CFsBlkCnt -> CFsBlkCnt -> (CFsBlkCnt, CFsBlkCnt) Source # divMod :: CFsBlkCnt -> CFsBlkCnt -> (CFsBlkCnt, CFsBlkCnt) Source # | |
Integral CFsFilCnt | |
Defined in System.Posix.Types Methods quot :: CFsFilCnt -> CFsFilCnt -> CFsFilCnt Source # rem :: CFsFilCnt -> CFsFilCnt -> CFsFilCnt Source # div :: CFsFilCnt -> CFsFilCnt -> CFsFilCnt Source # mod :: CFsFilCnt -> CFsFilCnt -> CFsFilCnt Source # quotRem :: CFsFilCnt -> CFsFilCnt -> (CFsFilCnt, CFsFilCnt) Source # divMod :: CFsFilCnt -> CFsFilCnt -> (CFsFilCnt, CFsFilCnt) Source # | |
Integral CGid | |
Defined in System.Posix.Types | |
Integral CId | |
Integral CIno | |
Defined in System.Posix.Types | |
Integral CKey | |
Defined in System.Posix.Types | |
Integral CMode | |
Integral CNfds | |
Integral CNlink | |
Defined in System.Posix.Types | |
Integral COff | |
Defined in System.Posix.Types | |
Integral CPid | |
Defined in System.Posix.Types | |
Integral CRLim | |
Integral CSocklen | |
Defined in System.Posix.Types Methods quot :: CSocklen -> CSocklen -> CSocklen Source # rem :: CSocklen -> CSocklen -> CSocklen Source # div :: CSocklen -> CSocklen -> CSocklen Source # mod :: CSocklen -> CSocklen -> CSocklen Source # quotRem :: CSocklen -> CSocklen -> (CSocklen, CSocklen) Source # divMod :: CSocklen -> CSocklen -> (CSocklen, CSocklen) Source # | |
Integral CSsize | |
Defined in System.Posix.Types | |
Integral CTcflag | |
Defined in System.Posix.Types Methods quot :: CTcflag -> CTcflag -> CTcflag Source # rem :: CTcflag -> CTcflag -> CTcflag Source # div :: CTcflag -> CTcflag -> CTcflag Source # mod :: CTcflag -> CTcflag -> CTcflag Source # quotRem :: CTcflag -> CTcflag -> (CTcflag, CTcflag) Source # | |
Integral CUid | |
Defined in System.Posix.Types | |
Integral Fd | |
Integral ByteOff Source # | |
Defined in GHC.ByteCode.Types Methods quot :: ByteOff -> ByteOff -> ByteOff Source # rem :: ByteOff -> ByteOff -> ByteOff Source # div :: ByteOff -> ByteOff -> ByteOff Source # mod :: ByteOff -> ByteOff -> ByteOff Source # quotRem :: ByteOff -> ByteOff -> (ByteOff, ByteOff) Source # | |
Integral HalfWord Source # | |
Defined in GHC.ByteCode.Types Methods quot :: HalfWord -> HalfWord -> HalfWord Source # rem :: HalfWord -> HalfWord -> HalfWord Source # div :: HalfWord -> HalfWord -> HalfWord Source # mod :: HalfWord -> HalfWord -> HalfWord Source # quotRem :: HalfWord -> HalfWord -> (HalfWord, HalfWord) Source # divMod :: HalfWord -> HalfWord -> (HalfWord, HalfWord) Source # | |
Integral RegBitmap Source # | |
Defined in GHC.ByteCode.Types Methods quot :: RegBitmap -> RegBitmap -> RegBitmap Source # rem :: RegBitmap -> RegBitmap -> RegBitmap Source # div :: RegBitmap -> RegBitmap -> RegBitmap Source # mod :: RegBitmap -> RegBitmap -> RegBitmap Source # quotRem :: RegBitmap -> RegBitmap -> (RegBitmap, RegBitmap) Source # divMod :: RegBitmap -> RegBitmap -> (RegBitmap, RegBitmap) Source # | |
Integral WordOff Source # | |
Defined in GHC.ByteCode.Types Methods quot :: WordOff -> WordOff -> WordOff Source # rem :: WordOff -> WordOff -> WordOff Source # div :: WordOff -> WordOff -> WordOff Source # mod :: WordOff -> WordOff -> WordOff Source # quotRem :: WordOff -> WordOff -> (WordOff, WordOff) Source # | |
Integral StatxFlags | |
Defined in System.Posix.Files.Common Methods quot :: StatxFlags -> StatxFlags -> StatxFlags Source # rem :: StatxFlags -> StatxFlags -> StatxFlags Source # div :: StatxFlags -> StatxFlags -> StatxFlags Source # mod :: StatxFlags -> StatxFlags -> StatxFlags Source # quotRem :: StatxFlags -> StatxFlags -> (StatxFlags, StatxFlags) Source # divMod :: StatxFlags -> StatxFlags -> (StatxFlags, StatxFlags) Source # toInteger :: StatxFlags -> Integer Source # | |
Integral StatxMask | |
Defined in System.Posix.Files.Common Methods quot :: StatxMask -> StatxMask -> StatxMask Source # rem :: StatxMask -> StatxMask -> StatxMask Source # div :: StatxMask -> StatxMask -> StatxMask Source # mod :: StatxMask -> StatxMask -> StatxMask Source # quotRem :: StatxMask -> StatxMask -> (StatxMask, StatxMask) Source # divMod :: StatxMask -> StatxMask -> (StatxMask, StatxMask) Source # | |
Integral Integer | Since: base-2.0.1 |
Defined in GHC.Real Methods quot :: Integer -> Integer -> Integer Source # rem :: Integer -> Integer -> Integer Source # div :: Integer -> Integer -> Integer Source # mod :: Integer -> Integer -> Integer Source # quotRem :: Integer -> Integer -> (Integer, Integer) Source # | |
Integral Natural | Since: base-4.8.0.0 |
Defined in GHC.Real Methods quot :: Natural -> Natural -> Natural Source # rem :: Natural -> Natural -> Natural Source # div :: Natural -> Natural -> Natural Source # mod :: Natural -> Natural -> Natural Source # quotRem :: Natural -> Natural -> (Natural, Natural) Source # | |
Integral Int | Since: base-2.0.1 |
Integral Word | Since: base-2.1 |
Defined in GHC.Real | |
Integral a => Integral (Identity a) | Since: base-4.9.0.0 |
Defined in Data.Functor.Identity Methods quot :: Identity a -> Identity a -> Identity a Source # rem :: Identity a -> Identity a -> Identity a Source # div :: Identity a -> Identity a -> Identity a Source # mod :: Identity a -> Identity a -> Identity a Source # quotRem :: Identity a -> Identity a -> (Identity a, Identity a) Source # divMod :: Identity a -> Identity a -> (Identity a, Identity a) Source # | |
Integral a => Integral (Const a b) | Since: base-4.9.0.0 |
Defined in Data.Functor.Const Methods quot :: Const a b -> Const a b -> Const a b Source # rem :: Const a b -> Const a b -> Const a b Source # div :: Const a b -> Const a b -> Const a b Source # mod :: Const a b -> Const a b -> Const a b Source # quotRem :: Const a b -> Const a b -> (Const a b, Const a b) Source # divMod :: Const a b -> Const a b -> (Const a b, Const a b) Source # | |
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 Source # rem :: Compose f g a -> Compose f g a -> Compose f g a Source # div :: Compose f g a -> Compose f g a -> Compose f g a Source # mod :: Compose f g a -> Compose f g a -> Compose f g a Source # quotRem :: Compose f g a -> Compose f g a -> (Compose f g a, Compose f g a) Source # divMod :: Compose f g a -> Compose f g a -> (Compose f g a, Compose f g a) Source # |
($) :: (a -> b) -> a -> b infixr 0 Source #
($)
is the function application operator.
Applying ($)
to a function f
and an argument x
gives the same result as applying f
to x
directly. The definition is akin to this:
($) :: (a -> b) -> a -> b ($) f x = f x
On the face of it, this may appear pointless! But it's actually one of the most useful and important operators in Haskell.
The order of operations is very different between ($)
and normal function application. Normal function application has precedence 10 - higher than any operator - and associates to the left. So these two definitions are equivalent:
expr = min 5 1 + 5 expr = ((min 5) 1) + 5
($)
has precedence 0 (the lowest) and associates to the right, so these are equivalent:
expr = min 5 $ 1 + 5 expr = (min 5) (1 + 5)
Uses
A common use cases of ($)
is to avoid parentheses in complex expressions.
For example, instead of using nested parentheses in the following Haskell function:
-- | Sum numbers in a string: strSum "100 5 -7" == 98 strSum ::String
->Int
strSum s =sum
(mapMaybe
readMaybe
(words
s))
we can deploy the function application operator:
-- | Sum numbers in a string: strSum "100 5 -7" == 98 strSum ::String
->Int
strSum s =sum
$
mapMaybe
readMaybe
$
words
s
($)
is also used as a section (a partially applied operator), in order to indicate that we wish to apply some yet-unspecified function to a given value. For example, to apply the argument 5
to a list of functions:
applyFive :: [Int] applyFive = map ($ 5) [(+1), (2^)] >>> [6, 32]
Technical Remark (Representation Polymorphism)
($)
is fully representation-polymorphic. This allows it to also be used with arguments of unlifted and even unboxed kinds, such as unboxed integers:
fastMod :: Int -> Int -> Int fastMod (I# x) (I# m) = I# $ remInt# x m
unzip :: [(a, b)] -> ([a], [b]) Source #
unzip
transforms a list of pairs into a list of first components
and a list of second components.
>>>
unzip []
([],[])>>>
unzip [(1, 'a'), (2, 'b')]
([1,2],"ab")
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 All | Since: base-2.1 |
Ord Any | Since: base-2.1 |
Ord SomeTypeRep | |
Defined in Data.Typeable.Internal Methods compare :: SomeTypeRep -> SomeTypeRep -> Ordering # (<) :: SomeTypeRep -> SomeTypeRep -> Bool # (<=) :: SomeTypeRep -> SomeTypeRep -> Bool # (>) :: SomeTypeRep -> SomeTypeRep -> Bool # (>=) :: SomeTypeRep -> SomeTypeRep -> Bool # max :: SomeTypeRep -> SomeTypeRep -> SomeTypeRep # min :: SomeTypeRep -> SomeTypeRep -> SomeTypeRep # | |
Ord Unique | |
Ord Version | Since: base-2.1 |
Ord CBool | |
Ord CChar | |
Ord CClock | |
Ord CDouble | |
Ord CFloat | |
Ord CInt | |
Ord CIntMax | |
Ord CIntPtr | |
Ord CLLong | |
Ord CLong | |
Ord CPtrdiff | |
Defined in Foreign.C.Types | |
Ord CSChar | |
Ord CSUSeconds | |
Defined in Foreign.C.Types Methods compare :: CSUSeconds -> CSUSeconds -> Ordering # (<) :: CSUSeconds -> CSUSeconds -> Bool # (<=) :: CSUSeconds -> CSUSeconds -> Bool # (>) :: CSUSeconds -> CSUSeconds -> Bool # (>=) :: CSUSeconds -> CSUSeconds -> Bool # max :: CSUSeconds -> CSUSeconds -> CSUSeconds # min :: CSUSeconds -> CSUSeconds -> CSUSeconds # | |
Ord CShort | |
Ord CSigAtomic | |
Defined in Foreign.C.Types Methods compare :: CSigAtomic -> CSigAtomic -> Ordering # (<) :: CSigAtomic -> CSigAtomic -> Bool # (<=) :: CSigAtomic -> CSigAtomic -> Bool # (>) :: CSigAtomic -> CSigAtomic -> Bool # (>=) :: CSigAtomic -> CSigAtomic -> Bool # max :: CSigAtomic -> CSigAtomic -> CSigAtomic # min :: CSigAtomic -> CSigAtomic -> CSigAtomic # | |
Ord CSize | |
Ord CTime | |
Ord CUChar | |
Ord CUInt | |
Ord CUIntMax | |
Defined in Foreign.C.Types | |
Ord CUIntPtr | |
Defined in Foreign.C.Types | |
Ord CULLong | |
Ord CULong | |
Ord CUSeconds | |
Ord CUShort | |
Ord CWchar | |
Ord IntPtr | |
Ord WordPtr | |
Ord Void | Since: base-4.8.0.0 |
Ord ByteOrder | Since: base-4.11.0.0 |
Ord BlockReason | Since: base-4.3.0.0 |
Defined in GHC.Conc.Sync Methods compare :: BlockReason -> BlockReason -> Ordering # (<) :: BlockReason -> BlockReason -> Bool # (<=) :: BlockReason -> BlockReason -> Bool # (>) :: BlockReason -> BlockReason -> Bool # (>=) :: BlockReason -> BlockReason -> Bool # max :: BlockReason -> BlockReason -> BlockReason # min :: BlockReason -> BlockReason -> BlockReason # | |
Ord ThreadId | Since: base-4.2.0.0 |
Defined in GHC.Conc.Sync | |
Ord ThreadStatus | Since: base-4.3.0.0 |
Defined in GHC.Conc.Sync Methods compare :: ThreadStatus -> ThreadStatus -> Ordering # (<) :: ThreadStatus -> ThreadStatus -> Bool # (<=) :: ThreadStatus -> ThreadStatus -> Bool # (>) :: ThreadStatus -> ThreadStatus -> Bool # (>=) :: ThreadStatus -> ThreadStatus -> Bool # max :: ThreadStatus -> ThreadStatus -> ThreadStatus # min :: ThreadStatus -> ThreadStatus -> ThreadStatus # | |
Ord TimeoutKey | |
Defined in GHC.Event.TimeOut Methods compare :: TimeoutKey -> TimeoutKey -> Ordering # (<) :: TimeoutKey -> TimeoutKey -> Bool # (<=) :: TimeoutKey -> TimeoutKey -> Bool # (>) :: TimeoutKey -> TimeoutKey -> Bool # (>=) :: TimeoutKey -> TimeoutKey -> Bool # max :: TimeoutKey -> TimeoutKey -> TimeoutKey # min :: TimeoutKey -> TimeoutKey -> TimeoutKey # | |
Ord ErrorCall | Since: base-4.7.0.0 |
Ord ArithException | Since: base-3.0 |
Defined in GHC.Exception.Type Methods compare :: ArithException -> ArithException -> Ordering # (<) :: ArithException -> ArithException -> Bool # (<=) :: ArithException -> ArithException -> Bool # (>) :: ArithException -> ArithException -> Bool # (>=) :: ArithException -> ArithException -> Bool # max :: ArithException -> ArithException -> ArithException # min :: ArithException -> ArithException -> ArithException # | |
Ord Fingerprint | Since: base-4.4.0.0 |
Defined in GHC.Fingerprint.Type Methods compare :: Fingerprint -> Fingerprint -> Ordering # (<) :: Fingerprint -> Fingerprint -> Bool # (<=) :: Fingerprint -> Fingerprint -> Bool # (>) :: Fingerprint -> Fingerprint -> Bool # (>=) :: Fingerprint -> Fingerprint -> Bool # max :: Fingerprint -> Fingerprint -> Fingerprint # min :: Fingerprint -> Fingerprint -> Fingerprint # | |
Ord Associativity | Since: base-4.6.0.0 |
Defined in GHC.Generics Methods compare :: Associativity -> Associativity -> Ordering # (<) :: Associativity -> Associativity -> Bool # (<=) :: Associativity -> Associativity -> Bool # (>) :: Associativity -> Associativity -> Bool # (>=) :: Associativity -> Associativity -> Bool # max :: Associativity -> Associativity -> Associativity # min :: Associativity -> Associativity -> Associativity # | |
Ord DecidedStrictness | Since: base-4.9.0.0 |
Defined in GHC.Generics Methods compare :: DecidedStrictness -> DecidedStrictness -> Ordering # (<) :: DecidedStrictness -> DecidedStrictness -> Bool # (<=) :: DecidedStrictness -> DecidedStrictness -> Bool # (>) :: DecidedStrictness -> DecidedStrictness -> Bool # (>=) :: DecidedStrictness -> DecidedStrictness -> Bool # max :: DecidedStrictness -> DecidedStrictness -> DecidedStrictness # min :: DecidedStrictness -> DecidedStrictness -> DecidedStrictness # | |
Ord Fixity | Since: base-4.6.0.0 |
Ord SourceStrictness | Since: base-4.9.0.0 |
Defined in GHC.Generics Methods compare :: SourceStrictness -> SourceStrictness -> Ordering # (<) :: SourceStrictness -> SourceStrictness -> Bool # (<=) :: SourceStrictness -> SourceStrictness -> Bool # (>) :: SourceStrictness -> SourceStrictness -> Bool # (>=) :: SourceStrictness -> SourceStrictness -> Bool # max :: SourceStrictness -> SourceStrictness -> SourceStrictness # min :: SourceStrictness -> SourceStrictness -> SourceStrictness # | |
Ord SourceUnpackedness | Since: base-4.9.0.0 |
Defined in GHC.Generics Methods compare :: SourceUnpackedness -> SourceUnpackedness -> Ordering # (<) :: SourceUnpackedness -> SourceUnpackedness -> Bool # (<=) :: SourceUnpackedness -> SourceUnpackedness -> Bool # (>) :: SourceUnpackedness -> SourceUnpackedness -> Bool # (>=) :: SourceUnpackedness -> SourceUnpackedness -> Bool # max :: SourceUnpackedness -> SourceUnpackedness -> SourceUnpackedness # min :: SourceUnpackedness -> SourceUnpackedness -> SourceUnpackedness # | |
Ord SeekMode | Since: base-4.2.0.0 |
Defined in GHC.IO.Device | |
Ord ArrayException | Since: base-4.2.0.0 |
Defined in GHC.IO.Exception Methods compare :: ArrayException -> ArrayException -> Ordering # (<) :: ArrayException -> ArrayException -> Bool # (<=) :: ArrayException -> ArrayException -> Bool # (>) :: ArrayException -> ArrayException -> Bool # (>=) :: ArrayException -> ArrayException -> Bool # max :: ArrayException -> ArrayException -> ArrayException # min :: ArrayException -> ArrayException -> ArrayException # | |
Ord AsyncException | Since: base-4.2.0.0 |
Defined in GHC.IO.Exception Methods compare :: AsyncException -> AsyncException -> Ordering # (<) :: AsyncException -> AsyncException -> Bool # (<=) :: AsyncException -> AsyncException -> Bool # (>) :: AsyncException -> AsyncException -> Bool # (>=) :: AsyncException -> AsyncException -> Bool # max :: AsyncException -> AsyncException -> AsyncException # min :: AsyncException -> AsyncException -> AsyncException # | |
Ord ExitCode | |
Defined in GHC.IO.Exception | |
Ord BufferMode | Since: base-4.2.0.0 |
Defined in GHC.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 | Since: base-4.3.0.0 |
Ord NewlineMode | Since: base-4.3.0.0 |
Defined in GHC.IO.Handle.Types Methods compare :: NewlineMode -> NewlineMode -> Ordering # (<) :: NewlineMode -> NewlineMode -> Bool # (<=) :: NewlineMode -> NewlineMode -> Bool # (>) :: NewlineMode -> NewlineMode -> Bool # (>=) :: NewlineMode -> NewlineMode -> Bool # max :: NewlineMode -> NewlineMode -> NewlineMode # min :: NewlineMode -> NewlineMode -> NewlineMode # | |
Ord IOMode | Since: base-4.2.0.0 |
Ord Int16 | Since: base-2.1 |
Ord Int32 | Since: base-2.1 |
Ord Int64 | Since: base-2.1 |
Ord Int8 | Since: base-2.1 |
Ord SomeChar | |
Defined in GHC.TypeLits | |
Ord SomeSymbol | Since: base-4.7.0.0 |
Defined in GHC.TypeLits Methods compare :: SomeSymbol -> SomeSymbol -> Ordering # (<) :: SomeSymbol -> SomeSymbol -> Bool # (<=) :: SomeSymbol -> SomeSymbol -> Bool # (>) :: SomeSymbol -> SomeSymbol -> Bool # (>=) :: SomeSymbol -> SomeSymbol -> Bool # max :: SomeSymbol -> SomeSymbol -> SomeSymbol # min :: SomeSymbol -> SomeSymbol -> SomeSymbol # | |
Ord SomeNat | Since: base-4.7.0.0 |
Ord GeneralCategory | Since: base-2.1 |
Defined in GHC.Unicode Methods compare :: GeneralCategory -> GeneralCategory -> Ordering # (<) :: GeneralCategory -> GeneralCategory -> Bool # (<=) :: GeneralCategory -> GeneralCategory -> Bool # (>) :: GeneralCategory -> GeneralCategory -> Bool # (>=) :: GeneralCategory -> GeneralCategory -> Bool # max :: GeneralCategory -> GeneralCategory -> GeneralCategory # min :: GeneralCategory -> GeneralCategory -> GeneralCategory # | |
Ord Word16 | Since: base-2.1 |
Ord Word32 | Since: base-2.1 |
Ord Word64 | Since: base-2.1 |
Ord Word8 | Since: base-2.1 |
Ord CBlkCnt | |
Ord CBlkSize | |
Defined in System.Posix.Types | |
Ord CCc | |
Ord CClockId | |
Defined in 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 System.Posix.Types | |
Ord CSpeed | |
Ord CSsize | |
Ord CTcflag | |
Ord CTimer | |
Ord CUid | |
Ord Fd | |
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 OsChar | Byte ordering of the internal representation. |
Ord OsString | Byte ordering of the internal representation. |
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 PrimOp Source # | |
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 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 UniqueSet Source # | |
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.Config 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 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 JOp Source # | |
Ord JUOp Source # | |
Ord MetaId Source # | |
Ord Anchor 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 DeltaPos 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 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 JSOption Source # | |
Defined in GHC.StgToJS.Linker.Utils | |
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 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 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 VarType Source # | |
Ord SlotCount Source # | |
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 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 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 Arch | |
Ord ArchOS | |
Ord ArmABI | |
Ord ArmISA | |
Ord ArmISAExt | |
Ord OS | |
Ord PPC_64ABI | |
Ord Extension | |
Ord ClosureType | |
Defined in GHC.Exts.Heap.ClosureTypes Methods compare :: ClosureType -> ClosureType -> Ordering # (<) :: ClosureType -> ClosureType -> Bool # (<=) :: ClosureType -> ClosureType -> Bool # (>) :: ClosureType -> ClosureType -> Bool # (>=) :: ClosureType -> ClosureType -> Bool # max :: ClosureType -> ClosureType -> ClosureType # min :: ClosureType -> ClosureType -> ClosureType # | |
Ord PrimType | |
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 Ordering | |
Defined in GHC.Classes | |
Ord TyCon | |
Ord BoxLabel | |
Defined in Trace.Hpc.Mix | |
Ord CondBox | |
Ord HpcPos | |
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 -> |