Safe Haskell | Trustworthy |
---|---|
Language | Haskell2010 |
- Prelude
- Common type-classes
- Some types
- Data.Either
- Data.Maybe
- Data.List
- Data.List.NonEmpty
- Data.Foldable
- Data.Traversable
- Data.Function
- Data.Ord
- Control.Arrow
- Control.Monad
- Control.Exception
- Control.DeepSeq
- Data.Char
- Data.Void
- Data.Word & Data.Int
- Text.PrettyPrint
- System.Exit
- Text.Read
- Debug.Trace (as deprecated functions)
This module does two things:
- Acts as a compatibility layer, like
base-compat
. - Provides commonly used imports.
Synopsis
- ($) :: (a -> b) -> a -> b
- ($!) :: (a -> b) -> a -> b
- (++) :: [a] -> [a] -> [a]
- (.) :: (b -> c) -> (a -> b) -> a -> c
- (=<<) :: Monad m => (a -> m b) -> m a -> m b
- asTypeOf :: a -> a -> a
- const :: a -> b -> a
- flip :: (a -> b -> c) -> b -> a -> c
- id :: a -> a
- map :: (a -> b) -> [a] -> [b]
- otherwise :: Bool
- until :: (a -> Bool) -> (a -> a) -> a -> a
- either :: (a -> c) -> (b -> c) -> Either a b -> c
- and :: Foldable t => t Bool -> Bool
- concat :: Foldable t => t [a] -> [a]
- concatMap :: Foldable t => (a -> [b]) -> t a -> [b]
- notElem :: (Foldable t, Eq a) => a -> t a -> Bool
- or :: Foldable t => t Bool -> Bool
- sequence_ :: (Foldable t, Monad m) => t (m a) -> m ()
- (<$>) :: Functor f => (a -> b) -> f a -> f b
- maybe :: b -> (a -> b) -> Maybe a -> b
- lines :: String -> [String]
- unlines :: [String] -> String
- unwords :: [String] -> String
- words :: String -> [String]
- curry :: ((a, b) -> c) -> a -> b -> c
- fst :: (a, b) -> a
- snd :: (a, b) -> b
- uncurry :: (a -> b -> c) -> (a, b) -> c
- error :: HasCallStack => [Char] -> a
- errorWithoutStackTrace :: [Char] -> a
- undefined :: HasCallStack => a
- ioError :: HasCallStack => IOError -> IO a
- userError :: String -> IOError
- (!!) :: HasCallStack => [a] -> Int -> a
- break :: (a -> Bool) -> [a] -> ([a], [a])
- cycle :: HasCallStack => [a] -> [a]
- drop :: Int -> [a] -> [a]
- dropWhile :: (a -> Bool) -> [a] -> [a]
- filter :: (a -> Bool) -> [a] -> [a]
- iterate :: (a -> a) -> a -> [a]
- lookup :: Eq a => a -> [(a, b)] -> Maybe b
- repeat :: a -> [a]
- replicate :: Int -> a -> [a]
- reverse :: [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]
- span :: (a -> Bool) -> [a] -> ([a], [a])
- splitAt :: Int -> [a] -> ([a], [a])
- take :: Int -> [a] -> [a]
- takeWhile :: (a -> Bool) -> [a] -> [a]
- unzip :: [(a, b)] -> ([a], [b])
- unzip3 :: [(a, b, c)] -> ([a], [b], [c])
- zip :: [a] -> [b] -> [(a, b)]
- zip3 :: [a] -> [b] -> [c] -> [(a, b, c)]
- zipWith :: (a -> b -> c) -> [a] -> [b] -> [c]
- zipWith3 :: (a -> b -> c -> d) -> [a] -> [b] -> [c] -> [d]
- subtract :: Num a => a -> a -> a
- lex :: ReadS String
- readParen :: Bool -> ReadS a -> ReadS a
- (^) :: (Num a, Integral b) => a -> b -> a
- (^^) :: (Fractional a, Integral b) => a -> b -> a
- even :: Integral a => a -> Bool
- fromIntegral :: (Integral a, Num b) => a -> b
- gcd :: Integral a => a -> a -> a
- lcm :: Integral a => a -> a -> a
- odd :: Integral a => a -> Bool
- realToFrac :: (Real a, Fractional b) => a -> b
- showChar :: Char -> ShowS
- showParen :: Bool -> ShowS -> ShowS
- showString :: String -> ShowS
- shows :: Show a => a -> ShowS
- appendFile :: FilePath -> String -> IO ()
- getChar :: IO Char
- getContents :: IO String
- getLine :: IO String
- interact :: (String -> String) -> IO ()
- print :: Show a => a -> IO ()
- putChar :: Char -> IO ()
- putStr :: String -> IO ()
- putStrLn :: String -> IO ()
- readFile :: FilePath -> IO String
- readIO :: Read a => String -> IO a
- readLn :: Read a => IO a
- writeFile :: FilePath -> String -> IO ()
- reads :: Read a => ReadS a
- (&&) :: Bool -> Bool -> Bool
- not :: Bool -> Bool
- (||) :: Bool -> Bool -> Bool
- seq :: a -> b -> b
- class Functor f => Applicative (f :: Type -> Type) where
- class Functor (f :: Type -> Type) where
- class Applicative m => Monad (m :: Type -> Type) where
- class Semigroup a => Monoid a where
- class Monad m => MonadFail (m :: Type -> Type) where
- data Either a b
- elem :: (Foldable t, Eq a) => a -> t a -> Bool
- foldl :: Foldable t => (b -> a -> b) -> b -> t a -> b
- maximum :: (Foldable t, Ord a) => t a -> a
- minimum :: (Foldable t, Ord a) => t a -> a
- product :: (Foldable t, Num a) => t a -> a
- sum :: (Foldable t, Num a) => t a -> a
- class Bounded a where
- 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 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
- type FilePath = String
- type IOError = IOException
- class Num a where
- class Read a where
- class Num a => Fractional a where
- (/) :: a -> a -> a
- recip :: a -> a
- fromRational :: Rational -> a
- class (Real a, Enum a) => Integral a where
- type Rational = Ratio Integer
- class (Num a, Ord a) => Real a where
- toRational :: a -> Rational
- class (Real a, Fractional a) => RealFrac a where
- class Show a where
- type ShowS = String -> String
- type ReadS a = String -> [(a, String)]
- class Eq a where
- class Eq a => Ord a where
- data IO a
- data Ordering
- data Integer
- type String = [Char]
- data Maybe a
- data Bool
- data Char
- data Double
- data Float
- data Int
- class a ~# b => (a :: k) ~ (b :: k)
- class Semigroup a where
- (<>) :: a -> a -> a
- gmappend :: (Generic a, GSemigroup (Rep a)) => a -> a -> a
- gmempty :: (Generic a, GMonoid (Rep a)) => a
- class Typeable (a :: k)
- type TypeRep = SomeTypeRep
- typeRep :: forall {k} proxy (a :: k). Typeable a => proxy a -> TypeRep
- class Typeable a => Data a
- class Generic a
- class NFData a where
- rnf :: a -> ()
- genericRnf :: (Generic a, GNFData (Rep a)) => a -> ()
- class Binary t where
- class Typeable a => Structured a
- class Applicative f => Alternative (f :: Type -> Type) where
- class (Alternative m, Monad m) => MonadPlus (m :: Type -> Type) where
- class IsString a where
- fromString :: String -> a
- data Map k a
- data Set a
- data NonEmptySet a
- newtype Identity a = Identity {
- runIdentity :: a
- data Proxy (t :: k) = Proxy
- newtype Const a (b :: k) = Const {
- getConst :: a
- data Void
- partitionEithers :: [Either a b] -> ([a], [b])
- catMaybes :: [Maybe a] -> [a]
- mapMaybe :: (a -> Maybe b) -> [a] -> [b]
- fromMaybe :: a -> Maybe a -> a
- maybeToList :: Maybe a -> [a]
- listToMaybe :: [a] -> Maybe a
- isNothing :: Maybe a -> Bool
- isJust :: Maybe a -> Bool
- unfoldr :: (b -> Maybe (a, b)) -> b -> [a]
- isPrefixOf :: Eq a => [a] -> [a] -> Bool
- isSuffixOf :: Eq a => [a] -> [a] -> Bool
- intercalate :: [a] -> [[a]] -> [a]
- intersperse :: a -> [a] -> [a]
- sort :: Ord a => [a] -> [a]
- sortBy :: (a -> a -> Ordering) -> [a] -> [a]
- nub :: Eq a => [a] -> [a]
- nubBy :: (a -> a -> Bool) -> [a] -> [a]
- partition :: (a -> Bool) -> [a] -> ([a], [a])
- dropWhileEnd :: (a -> Bool) -> [a] -> [a]
- data NonEmpty a = a :| [a]
- nonEmpty :: [a] -> Maybe (NonEmpty a)
- foldl1 :: (a -> a -> a) -> NonEmpty a -> a
- foldr1 :: (a -> a -> a) -> NonEmpty a -> a
- head :: NonEmpty a -> a
- tail :: NonEmpty a -> [a]
- last :: NonEmpty a -> a
- init :: NonEmpty a -> [a]
- class Foldable (t :: Type -> Type)
- foldMap :: (Foldable t, Monoid m) => (a -> m) -> t a -> m
- foldr :: Foldable t => (a -> b -> b) -> b -> t a -> b
- null :: Foldable t => t a -> Bool
- length :: Foldable t => t a -> Int
- find :: Foldable t => (a -> Bool) -> t a -> Maybe a
- foldl' :: Foldable t => (b -> a -> b) -> b -> t a -> b
- traverse_ :: (Foldable t, Applicative f) => (a -> f b) -> t a -> f ()
- for_ :: (Foldable t, Applicative f) => t a -> (a -> f b) -> f ()
- any :: Foldable t => (a -> Bool) -> t a -> Bool
- all :: Foldable t => (a -> Bool) -> t a -> Bool
- toList :: Foldable t => t a -> [a]
- class (Functor t, Foldable t) => Traversable (t :: Type -> Type)
- traverse :: (Traversable t, Applicative f) => (a -> f b) -> t a -> f (t b)
- sequenceA :: (Traversable t, Applicative f) => t (f a) -> f (t a)
- for :: (Traversable t, Applicative f) => t a -> (a -> f b) -> f (t b)
- on :: (b -> b -> c) -> (a -> b) -> a -> a -> c
- comparing :: Ord a => (b -> a) -> b -> b -> Ordering
- first :: Arrow a => a b c -> a (b, d) (c, d)
- liftM :: Monad m => (a1 -> r) -> m a1 -> m r
- liftM2 :: Monad m => (a1 -> a2 -> r) -> m a1 -> m a2 -> m r
- unless :: Applicative f => Bool -> f () -> f ()
- when :: Applicative f => Bool -> f () -> f ()
- ap :: Monad m => m (a -> b) -> m a -> m b
- void :: Functor f => f a -> f ()
- foldM :: (Foldable t, Monad m) => (b -> a -> m b) -> b -> t a -> m b
- filterM :: Applicative m => (a -> m Bool) -> [a] -> m [a]
- join :: Monad m => m (m a) -> m a
- guard :: Alternative f => Bool -> f ()
- catch :: Exception e => IO a -> (e -> IO a) -> IO a
- throwIO :: (HasCallStack, Exception e) => e -> IO a
- evaluate :: a -> IO a
- class (Typeable e, Show e) => Exception e where
- toException :: e -> SomeException
- fromException :: SomeException -> Maybe e
- displayException :: e -> String
- backtraceDesired :: e -> Bool
- data IOException
- data SomeException = (Exception e, HasExceptionContext) => SomeException e
- tryIO :: IO a -> IO (Either IOException a)
- catchIO :: IO a -> (IOException -> IO a) -> IO a
- catchExit :: IO a -> (ExitCode -> IO a) -> IO a
- deepseq :: NFData a => a -> b -> b
- force :: NFData a => a -> a
- isSpace :: Char -> Bool
- isDigit :: Char -> Bool
- isUpper :: Char -> Bool
- isAlpha :: Char -> Bool
- isAlphaNum :: Char -> Bool
- chr :: Int -> Char
- ord :: Char -> Int
- toLower :: Char -> Char
- toUpper :: Char -> Char
- absurd :: Void -> a
- vacuous :: Functor f => f Void -> f a
- data Word
- data Word8
- data Word16
- data Word32
- data Word64
- data Int8
- data Int16
- data Int32
- data Int64
- (<<>>) :: Doc -> Doc -> Doc
- (<+>) :: Doc -> Doc -> Doc
- data ExitCode
- exitWith :: ExitCode -> IO a
- exitSuccess :: IO a
- exitFailure :: IO a
- readMaybe :: Read a => String -> Maybe a
- trace :: String -> a -> a
- traceShow :: Show a => a -> b -> b
- traceShowId :: Show a => a -> a
- traceM :: Applicative f => String -> f ()
- traceShowM :: (Show a, Applicative f) => a -> f ()
Prelude
error :: HasCallStack => [Char] -> a #
errorWithoutStackTrace :: [Char] -> a #
undefined :: HasCallStack => a #
ioError :: HasCallStack => IOError -> IO a #
(!!) :: HasCallStack => [a] -> Int -> a #
cycle :: HasCallStack => [a] -> [a] #
(^^) :: (Fractional a, Integral b) => a -> b -> a #
fromIntegral :: (Integral a, Num b) => a -> b #
realToFrac :: (Real a, Fractional b) => a -> b #
showString :: String -> ShowS #
appendFile :: FilePath -> String -> IO () #
getContents :: IO String #
class Functor f => Applicative (f :: Type -> Type) where #
Instances
class Functor (f :: Type -> Type) where #
Instances
class Applicative m => Monad (m :: Type -> Type) where #
Instances
class Semigroup a => Monoid a where #
Instances
class Monad m => MonadFail (m :: Type -> Type) where #
Instances
Instances
Instances
Bounded CabalSpecVersion Source # | |
Defined in Distribution.CabalSpecVersion | |
Bounded PWarnType Source # | |
Bounded LicenseExceptionId Source # | |
Bounded LicenseId Source # | |
Bounded LicenseListVersion Source # | |
Bounded KnownRepoType Source # | |
Defined in Distribution.Types.SourceRepo | |
Bounded KnownExtension Source # | |
Defined in Language.Haskell.Extension | |
Bounded All # | |
Bounded Any # | |
Bounded CBool # | |
Bounded CChar # | |
Bounded CInt # | |
Bounded CIntMax # | |
Bounded CIntPtr # | |
Bounded CLLong # | |
Bounded CLong # | |
Bounded CPtrdiff # | |
Bounded CSChar # | |
Bounded CShort # | |
Bounded CSigAtomic # | |
Defined in GHC.Internal.Foreign.C.Types minBound :: CSigAtomic # maxBound :: CSigAtomic # | |
Bounded CSize # | |
Bounded CUChar # | |
Bounded CUInt # | |
Bounded CUIntMax # | |
Bounded CUIntPtr # | |
Bounded CULLong # | |
Bounded CULong # | |
Bounded CUShort # | |
Bounded CWchar # | |
Bounded Associativity # | |
Defined in GHC.Internal.Generics | |
Bounded DecidedStrictness # | |
Defined in GHC.Internal.Generics | |
Bounded SourceStrictness # | |
Defined in GHC.Internal.Generics | |
Bounded SourceUnpackedness # | |
Defined in GHC.Internal.Generics | |
Bounded Int16 # | |
Bounded Int32 # | |
Bounded Int64 # | |
Bounded Int8 # | |
Bounded Extension # | |
Defined in GHC.Internal.LanguageExtensions | |
Bounded GeneralCategory # | |
Defined in GHC.Internal.Unicode | |
Bounded Word16 # | |
Bounded Word32 # | |
Bounded Word64 # | |
Bounded Word8 # | |
Bounded Ordering # | |
Bounded I8 Source # | |
Bounded FPFormat Source # | |
Bounded QuarterOfYear Source # | |
Defined in Data.Time.Calendar.Quarter | |
Bounded () # | |
Defined in GHC.Internal.Enum | |
Bounded Bool # | |
Bounded Char # | |
Bounded Int # | |
Bounded Levity # | |
Bounded VecCount # | |
Bounded VecElem # | |
Bounded Word # | |
Bounded a => Bounded (First a) Source # | Since: base-4.9.0.0 |
Bounded a => Bounded (Last a) Source # | Since: base-4.9.0.0 |
Bounded a => Bounded (Max a) Source # | Since: base-4.9.0.0 |
Bounded a => Bounded (Min a) Source # | Since: base-4.9.0.0 |
Bounded m => Bounded (WrappedMonoid m) Source # | Since: base-4.9.0.0 |
Defined in Data.Semigroup minBound :: WrappedMonoid m # maxBound :: WrappedMonoid m # | |
Bounded a => Bounded (Identity a) # | |
Bounded a => Bounded (Down a) # | |
Bounded a => Bounded (Dual a) # | |
Bounded a => Bounded (Product a) # | |
Bounded a => Bounded (Sum a) # | |
Bounded a => Bounded (Solo a) # | |
Bounded (Proxy t) # | |
(Bounded a, Bounded b) => Bounded (a, b) # | |
Defined in GHC.Internal.Enum | |
Bounded a => Bounded (Const a b) # | |
(Applicative f, Bounded a) => Bounded (Ap f a) # | |
(Bounded a, Bounded b, Bounded c) => Bounded (a, b, c) # | |
Defined in GHC.Internal.Enum | |
(Bounded a, Bounded b, Bounded c, Bounded d) => Bounded (a, b, c, d) # | |
Defined in GHC.Internal.Enum | |
Bounded (f (g a)) => Bounded (Compose f g a) Source # | Since: base-4.19.0.0 |
(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e) => Bounded (a, b, c, d, e) # | |
Defined in GHC.Internal.Enum | |
(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f) => Bounded (a, b, c, d, e, f) # | |
Defined in GHC.Internal.Enum | |
(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g) => Bounded (a, b, c, d, e, f, g) # | |
Defined in GHC.Internal.Enum | |
(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h) => Bounded (a, b, c, d, e, f, g, h) # | |
Defined in GHC.Internal.Enum | |
(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i) => Bounded (a, b, c, d, e, f, g, h, i) # | |
Defined in GHC.Internal.Enum | |
(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i, Bounded j) => Bounded (a, b, c, d, e, f, g, h, i, j) # | |
Defined in GHC.Internal.Enum | |
(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i, Bounded j, Bounded k) => Bounded (a, b, c, d, e, f, g, h, i, j, k) # | |
Defined in GHC.Internal.Enum | |
(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i, Bounded j, Bounded k, Bounded l) => Bounded (a, b, c, d, e, f, g, h, i, j, k, l) # | |
Defined in GHC.Internal.Enum | |
(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i, Bounded j, Bounded k, Bounded l, Bounded m) => Bounded (a, b, c, d, e, f, g, h, i, j, k, l, m) # | |
Defined in GHC.Internal.Enum | |
(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i, Bounded j, Bounded k, Bounded l, Bounded m, Bounded n) => Bounded (a, b, c, d, e, f, g, h, i, j, k, l, m, n) # | |
Defined in GHC.Internal.Enum | |
(Bounded a, Bounded b, Bounded c, Bounded d, Bounded e, Bounded f, Bounded g, Bounded h, Bounded i, Bounded j, Bounded k, Bounded l, Bounded m, Bounded n, Bounded o) => Bounded (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) # | |
Defined in GHC.Internal.Enum |
Instances
Enum CabalSpecVersion Source # | |
Defined in Distribution.CabalSpecVersion succ :: CabalSpecVersion -> CabalSpecVersion # pred :: CabalSpecVersion -> CabalSpecVersion # toEnum :: Int -> CabalSpecVersion # fromEnum :: CabalSpecVersion -> Int # enumFrom :: CabalSpecVersion -> [CabalSpecVersion] # enumFromThen :: CabalSpecVersion -> CabalSpecVersion -> [CabalSpecVersion] # enumFromTo :: CabalSpecVersion -> CabalSpecVersion -> [CabalSpecVersion] # enumFromThenTo :: CabalSpecVersion -> CabalSpecVersion -> CabalSpecVersion -> [CabalSpecVersion] # | |
Enum PWarnType Source # | |
Defined in Distribution.Parsec.Warning succ :: PWarnType -> PWarnType # pred :: PWarnType -> PWarnType # fromEnum :: PWarnType -> Int # enumFrom :: PWarnType -> [PWarnType] # enumFromThen :: PWarnType -> PWarnType -> [PWarnType] # enumFromTo :: PWarnType -> PWarnType -> [PWarnType] # enumFromThenTo :: PWarnType -> PWarnType -> PWarnType -> [PWarnType] # | |
Enum LicenseExceptionId Source # | |
Defined in Distribution.SPDX.LicenseExceptionId succ :: LicenseExceptionId -> LicenseExceptionId # pred :: LicenseExceptionId -> LicenseExceptionId # toEnum :: Int -> LicenseExceptionId # fromEnum :: LicenseExceptionId -> Int # enumFrom :: LicenseExceptionId -> [LicenseExceptionId] # enumFromThen :: LicenseExceptionId -> LicenseExceptionId -> [LicenseExceptionId] # enumFromTo :: LicenseExceptionId -> LicenseExceptionId -> [LicenseExceptionId] # enumFromThenTo :: LicenseExceptionId -> LicenseExceptionId -> LicenseExceptionId -> [LicenseExceptionId] # | |
Enum LicenseId Source # | |
Defined in Distribution.SPDX.LicenseId succ :: LicenseId -> LicenseId # pred :: LicenseId -> LicenseId # fromEnum :: LicenseId -> Int # enumFrom :: LicenseId -> [LicenseId] # enumFromThen :: LicenseId -> LicenseId -> [LicenseId] # enumFromTo :: LicenseId -> LicenseId -> [LicenseId] # enumFromThenTo :: LicenseId -> LicenseId -> LicenseId -> [LicenseId] # | |
Enum LicenseListVersion Source # | |
Defined in Distribution.SPDX.LicenseListVersion succ :: LicenseListVersion -> LicenseListVersion # pred :: LicenseListVersion -> LicenseListVersion # toEnum :: Int -> LicenseListVersion # fromEnum :: LicenseListVersion -> Int # enumFrom :: LicenseListVersion -> [LicenseListVersion] # enumFromThen :: LicenseListVersion -> LicenseListVersion -> [LicenseListVersion] # enumFromTo :: LicenseListVersion -> LicenseListVersion -> [LicenseListVersion] # enumFromThenTo :: LicenseListVersion -> LicenseListVersion -> LicenseListVersion -> [LicenseListVersion] # | |
Enum KnownRepoType Source # | |
Defined in Distribution.Types.SourceRepo succ :: KnownRepoType -> KnownRepoType # pred :: KnownRepoType -> KnownRepoType # toEnum :: Int -> KnownRepoType # fromEnum :: KnownRepoType -> Int # enumFrom :: KnownRepoType -> [KnownRepoType] # enumFromThen :: KnownRepoType -> KnownRepoType -> [KnownRepoType] # enumFromTo :: KnownRepoType -> KnownRepoType -> [KnownRepoType] # enumFromThenTo :: KnownRepoType -> KnownRepoType -> KnownRepoType -> [KnownRepoType] # | |
Enum KnownExtension Source # | |
Defined in Language.Haskell.Extension succ :: KnownExtension -> KnownExtension # pred :: KnownExtension -> KnownExtension # toEnum :: Int -> KnownExtension # fromEnum :: KnownExtension -> Int # enumFrom :: KnownExtension -> [KnownExtension] # enumFromThen :: KnownExtension -> KnownExtension -> [KnownExtension] # enumFromTo :: KnownExtension -> KnownExtension -> [KnownExtension] # enumFromThenTo :: KnownExtension -> KnownExtension -> KnownExtension -> [KnownExtension] # | |
Enum CBool # | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CChar # | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CClock # | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CDouble # | |
Enum CFloat # | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CInt # | |
Enum CIntMax # | |
Enum CIntPtr # | |
Enum CLLong # | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CLong # | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CPtrdiff # | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CSChar # | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CSUSeconds # | |
Defined in GHC.Internal.Foreign.C.Types succ :: CSUSeconds -> CSUSeconds # pred :: CSUSeconds -> CSUSeconds # toEnum :: Int -> CSUSeconds # fromEnum :: CSUSeconds -> Int # enumFrom :: CSUSeconds -> [CSUSeconds] # enumFromThen :: CSUSeconds -> CSUSeconds -> [CSUSeconds] # enumFromTo :: CSUSeconds -> CSUSeconds -> [CSUSeconds] # enumFromThenTo :: CSUSeconds -> CSUSeconds -> CSUSeconds -> [CSUSeconds] # | |
Enum CShort # | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CSigAtomic # | |
Defined in GHC.Internal.Foreign.C.Types succ :: CSigAtomic -> CSigAtomic # pred :: CSigAtomic -> CSigAtomic # toEnum :: Int -> CSigAtomic # fromEnum :: CSigAtomic -> Int # enumFrom :: CSigAtomic -> [CSigAtomic] # enumFromThen :: CSigAtomic -> CSigAtomic -> [CSigAtomic] # enumFromTo :: CSigAtomic -> CSigAtomic -> [CSigAtomic] # enumFromThenTo :: CSigAtomic -> CSigAtomic -> CSigAtomic -> [CSigAtomic] # | |
Enum CSize # | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CTime # | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CUChar # | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CUInt # | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CUIntMax # | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CUIntPtr # | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CULLong # | |
Enum CULong # | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum CUSeconds # | |
Defined in GHC.Internal.Foreign.C.Types succ :: CUSeconds -> CUSeconds # pred :: CUSeconds -> CUSeconds # fromEnum :: CUSeconds -> Int # enumFrom :: CUSeconds -> [CUSeconds] # enumFromThen :: CUSeconds -> CUSeconds -> [CUSeconds] # enumFromTo :: CUSeconds -> CUSeconds -> [CUSeconds] # enumFromThenTo :: CUSeconds -> CUSeconds -> CUSeconds -> [CUSeconds] # | |
Enum CUShort # | |
Enum CWchar # | |
Defined in GHC.Internal.Foreign.C.Types | |
Enum Associativity # | |
Defined in GHC.Internal.Generics succ :: Associativity -> Associativity # pred :: Associativity -> Associativity # toEnum :: Int -> Associativity # fromEnum :: Associativity -> Int # enumFrom :: Associativity -> [Associativity] # enumFromThen :: Associativity -> Associativity -> [Associativity] # enumFromTo :: Associativity -> Associativity -> [Associativity] # enumFromThenTo :: Associativity -> Associativity -> Associativity -> [Associativity] # | |
Enum DecidedStrictness # | |
Defined in GHC.Internal.Generics succ :: DecidedStrictness -> DecidedStrictness # pred :: DecidedStrictness -> DecidedStrictness # toEnum :: Int -> DecidedStrictness # fromEnum :: DecidedStrictness -> Int # enumFrom :: DecidedStrictness -> [DecidedStrictness] # enumFromThen :: DecidedStrictness -> DecidedStrictness -> [DecidedStrictness] # enumFromTo :: DecidedStrictness -> DecidedStrictness -> [DecidedStrictness] # enumFromThenTo :: DecidedStrictness -> DecidedStrictness -> DecidedStrictness -> [DecidedStrictness] # | |
Enum SourceStrictness # | |
Defined in GHC.Internal.Generics succ :: SourceStrictness -> SourceStrictness # pred :: SourceStrictness -> SourceStrictness # toEnum :: Int -> SourceStrictness # fromEnum :: SourceStrictness -> Int # enumFrom :: SourceStrictness -> [SourceStrictness] # enumFromThen :: SourceStrictness -> SourceStrictness -> [SourceStrictness] # enumFromTo :: SourceStrictness -> SourceStrictness -> [SourceStrictness] # enumFromThenTo :: SourceStrictness -> SourceStrictness -> SourceStrictness -> [SourceStrictness] # | |
Enum SourceUnpackedness # | |
Defined in GHC.Internal.Generics succ :: SourceUnpackedness -> SourceUnpackedness # pred :: SourceUnpackedness -> SourceUnpackedness # toEnum :: Int -> SourceUnpackedness # fromEnum :: SourceUnpackedness -> Int # enumFrom :: SourceUnpackedness -> [SourceUnpackedness] # enumFromThen :: SourceUnpackedness -> SourceUnpackedness -> [SourceUnpackedness] # enumFromTo :: SourceUnpackedness -> SourceUnpackedness -> [SourceUnpackedness] # enumFromThenTo :: SourceUnpackedness -> SourceUnpackedness -> SourceUnpackedness -> [SourceUnpackedness] # | |
Enum IOMode # | |
Defined in GHC.Internal.IO.IOMode | |
Enum Int16 # | |
Enum Int32 # | |
Enum Int64 # | |
Enum Int8 # | |
Enum Extension # | |
Defined in GHC.Internal.LanguageExtensions succ :: Extension -> Extension # pred :: Extension -> Extension # fromEnum :: Extension -> Int # enumFrom :: Extension -> [Extension] # enumFromThen :: Extension -> Extension -> [Extension] # enumFromTo :: Extension -> Extension -> [Extension] # enumFromThenTo :: Extension -> Extension -> Extension -> [Extension] # | |
Enum GeneralCategory # | |
Defined in GHC.Internal.Unicode succ :: GeneralCategory -> GeneralCategory # pred :: GeneralCategory -> GeneralCategory # toEnum :: Int -> GeneralCategory # fromEnum :: GeneralCategory -> Int # enumFrom :: GeneralCategory -> [GeneralCategory] # enumFromThen :: GeneralCategory -> GeneralCategory -> [GeneralCategory] # enumFromTo :: GeneralCategory -> GeneralCategory -> [GeneralCategory] # enumFromThenTo :: GeneralCategory -> GeneralCategory -> GeneralCategory -> [GeneralCategory] # | |
Enum Word16 # | |
Defined in GHC.Internal.Word | |
Enum Word32 # | |
Defined in GHC.Internal.Word | |
Enum Word64 # | |
Defined in GHC.Internal.Word | |
Enum Word8 # | |
Enum Ordering # | |
Enum Message Source # | |
Enum I8 Source # | |
Enum FPFormat Source # | |
Defined in Data.Text.Lazy.Builder.RealFloat | |
Enum Day Source # | |
Enum Month Source # | |
Defined in Data.Time.Calendar.Month | |
Enum Quarter Source # | |
Enum QuarterOfYear Source # | maps Q1..Q4 to 1..4 |
Defined in Data.Time.Calendar.Quarter succ :: QuarterOfYear -> QuarterOfYear # pred :: QuarterOfYear -> QuarterOfYear # toEnum :: Int -> QuarterOfYear # fromEnum :: QuarterOfYear -> Int # enumFrom :: QuarterOfYear -> [QuarterOfYear] # enumFromThen :: QuarterOfYear -> QuarterOfYear -> [QuarterOfYear] # enumFromTo :: QuarterOfYear -> QuarterOfYear -> [QuarterOfYear] # enumFromThenTo :: QuarterOfYear -> QuarterOfYear -> QuarterOfYear -> [QuarterOfYear] # | |
Enum DayOfWeek Source # | "Circular", so for example |
Defined in Data.Time.Calendar.Week succ :: DayOfWeek -> DayOfWeek # pred :: DayOfWeek -> DayOfWeek # fromEnum :: DayOfWeek -> Int # enumFrom :: DayOfWeek -> [DayOfWeek] # enumFromThen :: DayOfWeek -> DayOfWeek -> [DayOfWeek] # enumFromTo :: DayOfWeek -> DayOfWeek -> [DayOfWeek] # enumFromThenTo :: DayOfWeek -> DayOfWeek -> DayOfWeek -> [DayOfWeek] # | |
Enum DiffTime Source # | |
Defined in Data.Time.Clock.Internal.DiffTime | |
Enum NominalDiffTime Source # | |
Defined in Data.Time.Clock.Internal.NominalDiffTime succ :: NominalDiffTime -> NominalDiffTime # pred :: NominalDiffTime -> NominalDiffTime # toEnum :: Int -> NominalDiffTime # fromEnum :: NominalDiffTime -> Int # enumFrom :: NominalDiffTime -> [NominalDiffTime] # enumFromThen :: NominalDiffTime -> NominalDiffTime -> [NominalDiffTime] # enumFromTo :: NominalDiffTime -> NominalDiffTime -> [NominalDiffTime] # enumFromThenTo :: NominalDiffTime -> NominalDiffTime -> NominalDiffTime -> [NominalDiffTime] # | |
Enum Integer # | |
Enum Natural # | |
Enum () # | |
Defined in GHC.Internal.Enum | |
Enum Bool # | |
Enum Char # | |
Enum Int # | |
Enum Levity # | |
Defined in GHC.Internal.Enum | |
Enum VecCount # | |
Enum VecElem # | |
Enum Word # | |
Enum a => Enum (First a) Source # | Since: base-4.9.0.0 |
Enum a => Enum (Last a) Source # | Since: base-4.9.0.0 |
Defined in Data.Semigroup | |
Enum a => Enum (Max a) Source # | Since: base-4.9.0.0 |
Enum a => Enum (Min a) Source # | Since: base-4.9.0.0 |
Enum a => Enum (WrappedMonoid a) Source # | Since: base-4.9.0.0 |
Defined in Data.Semigroup succ :: WrappedMonoid a -> WrappedMonoid a # pred :: WrappedMonoid a -> WrappedMonoid a # toEnum :: Int -> WrappedMonoid a # fromEnum :: WrappedMonoid a -> Int # enumFrom :: WrappedMonoid a -> [WrappedMonoid a] # enumFromThen :: WrappedMonoid a -> WrappedMonoid a -> [WrappedMonoid a] # enumFromTo :: WrappedMonoid a -> WrappedMonoid a -> [WrappedMonoid a] # enumFromThenTo :: WrappedMonoid a -> WrappedMonoid a -> WrappedMonoid a -> [WrappedMonoid a] # | |
Enum a => Enum (Identity a) # | |
Defined in GHC.Internal.Data.Functor.Identity succ :: Identity a -> Identity a # pred :: Identity a -> Identity a # fromEnum :: Identity a -> Int # enumFrom :: Identity a -> [Identity a] # enumFromThen :: Identity a -> Identity a -> [Identity a] # enumFromTo :: Identity a -> Identity a -> [Identity a] # enumFromThenTo :: Identity a -> Identity a -> Identity a -> [Identity a] # | |
(Enum a, Bounded a, Eq a) => Enum (Down a) # | |
Defined in GHC.Internal.Data.Ord | |
Integral a => Enum (Ratio a) # | |
Enum a => Enum (Solo a) # | |
Defined in GHC.Internal.Enum | |
Enum (Fixed a) Source # | Recall that, for numeric types,
and likewise
In other words,
and similarly
This is worth bearing in mind when defining [1..10] :: [Pico] evaluates to However, this is not true. On the contrary, similarly to the above
implementations of [1.000000000000, 1.00000000001, 1.00000000002, ..., 10.000000000000] and contains Since: base-2.1 |
Enum (Proxy s) # | |
Enum a => Enum (Const a b) # | |
Defined in GHC.Internal.Data.Functor.Const succ :: Const a b -> Const a b # pred :: Const a b -> Const a b # fromEnum :: Const a b -> Int # enumFrom :: Const a b -> [Const a b] # enumFromThen :: Const a b -> Const a b -> [Const a b] # enumFromTo :: Const a b -> Const a b -> [Const a b] # enumFromThenTo :: Const a b -> Const a b -> Const a b -> [Const a b] # | |
Enum (f a) => Enum (Ap f a) # | |
Defined in GHC.Internal.Data.Monoid | |
Enum (f a) => Enum (Alt f a) # | |
Enum (f (g a)) => Enum (Compose f g a) Source # | Since: base-4.19.0.0 |
Defined in Data.Functor.Compose succ :: Compose f g a -> Compose f g a # pred :: Compose f g a -> Compose f g a # toEnum :: Int -> Compose f g a # fromEnum :: Compose f g a -> Int # enumFrom :: Compose f g a -> [Compose f g a] # enumFromThen :: Compose f g a -> Compose f g a -> [Compose f g a] # enumFromTo :: Compose f g a -> Compose f g a -> [Compose f g a] # enumFromThenTo :: Compose f g a -> Compose f g a -> Compose f g a -> [Compose f g a] # |
class Fractional a => Floating a where #
Instances
Floating CDouble # | |
Floating CFloat # | |
Floating Double # | |
Floating Float # | |
RealFloat a => Floating (Complex a) Source # | Since: base-2.1 |
Defined in Data.Complex exp :: Complex a -> Complex a # log :: Complex a -> Complex a # sqrt :: Complex a -> Complex a # (**) :: Complex a -> Complex a -> Complex a # logBase :: Complex a -> Complex a -> Complex a # sin :: Complex a -> Complex a # cos :: Complex a -> Complex a # tan :: Complex a -> Complex a # asin :: Complex a -> Complex a # acos :: Complex a -> Complex a # atan :: Complex a -> Complex a # sinh :: Complex a -> Complex a # cosh :: Complex a -> Complex a # tanh :: Complex a -> Complex a # asinh :: Complex a -> Complex a # acosh :: Complex a -> Complex a # atanh :: Complex a -> Complex a # log1p :: Complex a -> Complex a # expm1 :: Complex a -> Complex a # | |
Floating a => Floating (Identity a) # | |
Defined in GHC.Internal.Data.Functor.Identity exp :: Identity a -> Identity a # log :: Identity a -> Identity a # sqrt :: Identity a -> Identity a # (**) :: Identity a -> Identity a -> Identity a # logBase :: Identity a -> Identity a -> Identity a # sin :: Identity a -> Identity a # cos :: Identity a -> Identity a # tan :: Identity a -> Identity a # asin :: Identity a -> Identity a # acos :: Identity a -> Identity a # atan :: Identity a -> Identity a # sinh :: Identity a -> Identity a # cosh :: Identity a -> Identity a # tanh :: Identity a -> Identity a # asinh :: Identity a -> Identity a # acosh :: Identity a -> Identity a # atanh :: Identity a -> Identity a # log1p :: Identity a -> Identity a # expm1 :: Identity a -> Identity a # | |
Floating a => Floating (Down a) # | |
Floating a => Floating (Op a b) Source # | |
Floating a => Floating (Const a b) # | |
Defined in GHC.Internal.Data.Functor.Const exp :: Const a b -> Const a b # log :: Const a b -> Const a b # sqrt :: Const a b -> Const a b # (**) :: Const a b -> Const a b -> Const a b # logBase :: Const a b -> Const a b -> Const a b # sin :: Const a b -> Const a b # cos :: Const a b -> Const a b # tan :: Const a b -> Const a b # asin :: Const a b -> Const a b # acos :: Const a b -> Const a b # atan :: Const a b -> Const a b # sinh :: Const a b -> Const a b # cosh :: Const a b -> Const a b # tanh :: Const a b -> Const a b # asinh :: Const a b -> Const a b # acosh :: Const a b -> Const a b # atanh :: Const a b -> Const a b # log1p :: Const a b -> Const a b # expm1 :: Const a b -> Const a b # | |
Floating (f (g a)) => Floating (Compose f g a) Source # | Since: base-4.20.0.0 |
Defined in Data.Functor.Compose exp :: Compose f g a -> Compose f g a # log :: Compose f g a -> Compose f g a # sqrt :: Compose f g a -> Compose f g a # (**) :: Compose f g a -> Compose f g a -> Compose f g a # logBase :: Compose f g a -> Compose f g a -> Compose f g a # sin :: Compose f g a -> Compose f g a # cos :: Compose f g a -> Compose f g a # tan :: Compose f g a -> Compose f g a # asin :: Compose f g a -> Compose f g a # acos :: Compose f g a -> Compose f g a # atan :: Compose f g a -> Compose f g a # sinh :: Compose f g a -> Compose f g a # cosh :: Compose f g a -> Compose f g a # tanh :: Compose f g a -> Compose f g a # asinh :: Compose f g a -> Compose f g a # acosh :: Compose f g a -> Compose f g a # atanh :: Compose f g a -> Compose f g a # log1p :: Compose f g a -> Compose f g a # expm1 :: Compose f g a -> Compose f g a # |
class (RealFrac a, Floating a) => RealFloat a where #
floatRadix, floatDigits, floatRange, decodeFloat, encodeFloat, isNaN, isInfinite, isDenormalized, isNegativeZero, isIEEE
floatRadix :: a -> Integer #
floatDigits :: a -> Int #
floatRange :: a -> (Int, Int) #
decodeFloat :: a -> (Integer, Int) #
encodeFloat :: Integer -> Int -> a #
significand :: a -> a #
scaleFloat :: Int -> a -> a #
isInfinite :: a -> Bool #
isDenormalized :: a -> Bool #
isNegativeZero :: a -> Bool #
Instances
RealFloat CDouble # | |
Defined in GHC.Internal.Foreign.C.Types floatRadix :: CDouble -> Integer # floatDigits :: CDouble -> Int # floatRange :: CDouble -> (Int, Int) # decodeFloat :: CDouble -> (Integer, Int) # encodeFloat :: Integer -> Int -> CDouble # significand :: CDouble -> CDouble # scaleFloat :: Int -> CDouble -> CDouble # isInfinite :: CDouble -> Bool # isDenormalized :: CDouble -> Bool # isNegativeZero :: CDouble -> Bool # | |
RealFloat CFloat # | |
Defined in GHC.Internal.Foreign.C.Types floatRadix :: CFloat -> Integer # floatDigits :: CFloat -> Int # floatRange :: CFloat -> (Int, Int) # decodeFloat :: CFloat -> (Integer, Int) # encodeFloat :: Integer -> Int -> CFloat # significand :: CFloat -> CFloat # scaleFloat :: Int -> CFloat -> CFloat # isInfinite :: CFloat -> Bool # isDenormalized :: CFloat -> Bool # isNegativeZero :: CFloat -> Bool # | |
RealFloat Double # | |
Defined in GHC.Internal.Float floatRadix :: Double -> Integer # floatDigits :: Double -> Int # floatRange :: Double -> (Int, Int) # decodeFloat :: Double -> (Integer, Int) # encodeFloat :: Integer -> Int -> Double # significand :: Double -> Double # scaleFloat :: Int -> Double -> Double # isInfinite :: Double -> Bool # isDenormalized :: Double -> Bool # isNegativeZero :: Double -> Bool # | |
RealFloat Float # | |
Defined in GHC.Internal.Float floatRadix :: Float -> Integer # floatDigits :: Float -> Int # floatRange :: Float -> (Int, Int) # decodeFloat :: Float -> (Integer, Int) # encodeFloat :: Integer -> Int -> Float # significand :: Float -> Float # scaleFloat :: Int -> Float -> Float # isInfinite :: Float -> Bool # isDenormalized :: Float -> Bool # isNegativeZero :: Float -> Bool # | |
RealFloat a => RealFloat (Identity a) # | |
Defined in GHC.Internal.Data.Functor.Identity floatRadix :: Identity a -> Integer # floatDigits :: Identity a -> Int # floatRange :: Identity a -> (Int, Int) # decodeFloat :: Identity a -> (Integer, Int) # encodeFloat :: Integer -> Int -> Identity a # exponent :: Identity a -> Int # significand :: Identity a -> Identity a # scaleFloat :: Int -> Identity a -> Identity a # isInfinite :: Identity a -> Bool # isDenormalized :: Identity a -> Bool # isNegativeZero :: Identity a -> Bool # | |
RealFloat a => RealFloat (Down a) # | |
Defined in GHC.Internal.Data.Ord floatRadix :: Down a -> Integer # floatDigits :: Down a -> Int # floatRange :: Down a -> (Int, Int) # decodeFloat :: Down a -> (Integer, Int) # encodeFloat :: Integer -> Int -> Down a # significand :: Down a -> Down a # scaleFloat :: Int -> Down a -> Down a # isInfinite :: Down a -> Bool # isDenormalized :: Down a -> Bool # isNegativeZero :: Down a -> Bool # | |
RealFloat a => RealFloat (Const a b) # | |
Defined in GHC.Internal.Data.Functor.Const floatRadix :: Const a b -> Integer # floatDigits :: Const a b -> Int # floatRange :: Const a b -> (Int, Int) # decodeFloat :: Const a b -> (Integer, Int) # encodeFloat :: Integer -> Int -> Const a b # exponent :: Const a b -> Int # significand :: Const a b -> Const a b # scaleFloat :: Int -> Const a b -> Const a b # isInfinite :: Const a b -> Bool # isDenormalized :: Const a b -> Bool # isNegativeZero :: Const a b -> Bool # | |
RealFloat (f (g a)) => RealFloat (Compose f g a) Source # | Since: base-4.20.0.0 |
Defined in Data.Functor.Compose floatRadix :: Compose f g a -> Integer # floatDigits :: Compose f g a -> Int # floatRange :: Compose f g a -> (Int, Int) # decodeFloat :: Compose f g a -> (Integer, Int) # encodeFloat :: Integer -> Int -> Compose f g a # exponent :: Compose f g a -> Int # significand :: Compose f g a -> Compose f g a # scaleFloat :: Int -> Compose f g a -> Compose f g a # isNaN :: Compose f g a -> Bool # isInfinite :: Compose f g a -> Bool # isDenormalized :: Compose f g a -> Bool # isNegativeZero :: Compose f g a -> Bool # |
type IOError = IOException #
fromInteger :: Integer -> a #
Instances
Num CBool # | |
Num CChar # | |
Num CClock # | |
Num CDouble # | |
Num CFloat # | |
Num CInt # | |
Num CIntMax # | |
Num CIntPtr # | |
Num CLLong # | |
Num CLong # | |
Num CPtrdiff # | |
Num CSChar # | |
Num CSUSeconds # | |
Defined in GHC.Internal.Foreign.C.Types (+) :: CSUSeconds -> CSUSeconds -> CSUSeconds # (-) :: CSUSeconds -> CSUSeconds -> CSUSeconds # (*) :: CSUSeconds -> CSUSeconds -> CSUSeconds # negate :: CSUSeconds -> CSUSeconds # abs :: CSUSeconds -> CSUSeconds # signum :: CSUSeconds -> CSUSeconds # fromInteger :: Integer -> CSUSeconds # | |
Num CShort # | |
Num CSigAtomic # | |
Defined in GHC.Internal.Foreign.C.Types (+) :: CSigAtomic -> CSigAtomic -> CSigAtomic # (-) :: CSigAtomic -> CSigAtomic -> CSigAtomic # (*) :: CSigAtomic -> CSigAtomic -> CSigAtomic # negate :: CSigAtomic -> CSigAtomic # abs :: CSigAtomic -> CSigAtomic # signum :: CSigAtomic -> CSigAtomic # fromInteger :: Integer -> CSigAtomic # | |
Num CSize # | |
Num CTime # | |
Num CUChar # | |
Num CUInt # | |
Num CUIntMax # | |
Num CUIntPtr # | |
Num CULLong # | |
Num CULong # | |
Num CUSeconds # | |
Defined in GHC.Internal.Foreign.C.Types | |
Num CUShort # | |
Num CWchar # | |
Num Int16 # | |
Num Int32 # | |
Num Int64 # | |
Num Int8 # | |
Num Word16 # | |
Num Word32 # | |
Num Word64 # | |
Num Word8 # | |
Num I8 Source # | |
Num Size Source # | |
Num DiffTime Source # | |
Num NominalDiffTime Source # | |
Defined in Data.Time.Clock.Internal.NominalDiffTime (+) :: NominalDiffTime -> NominalDiffTime -> NominalDiffTime # (-) :: NominalDiffTime -> NominalDiffTime -> NominalDiffTime # (*) :: NominalDiffTime -> NominalDiffTime -> NominalDiffTime # negate :: NominalDiffTime -> NominalDiffTime # abs :: NominalDiffTime -> NominalDiffTime # signum :: NominalDiffTime -> NominalDiffTime # fromInteger :: Integer -> NominalDiffTime # | |
Num Integer # | |
Num Natural # | |
Num Int # | |
Num Word # | |
RealFloat a => Num (Complex a) Source # | Since: base-2.1 |
Num a => Num (Max a) Source # | Since: base-4.9.0.0 |
Num a => Num (Min a) Source # | Since: base-4.9.0.0 |
Num a => Num (Identity a) # | |
Defined in GHC.Internal.Data.Functor.Identity | |
Num a => Num (Down a) # | |
Num a => Num (Product a) # | |
Defined in GHC.Internal.Data.Semigroup.Internal | |
Num a => Num (Sum a) # | |
Integral a => Num (Ratio a) # | |
HasResolution a => Num (Fixed a) Source # | Multiplication is not associative or distributive:
Since: base-2.1 |
Num a => Num (Op a b) Source # | |
Num a => Num (Const a b) # | |
Defined in GHC.Internal.Data.Functor.Const | |
(Applicative f, Num a) => Num (Ap f a) # | |
Num (f a) => Num (Alt f a) # | |
Num (f (g a)) => Num (Compose f g a) Source # | Since: base-4.19.0.0 |
Defined in Data.Functor.Compose (+) :: Compose f g a -> Compose f g a -> Compose f g a # (-) :: Compose f g a -> Compose f g a -> Compose f g a # (*) :: Compose f g a -> Compose f g a -> Compose f g a # negate :: Compose f g a -> Compose f g a # abs :: Compose f g a -> Compose f g a # signum :: Compose f g a -> Compose f g a # fromInteger :: Integer -> Compose f g a # |
Instances
Read OpenModule Source # | |
Defined in Distribution.Backpack readsPrec :: Int -> ReadS OpenModule # readList :: ReadS [OpenModule] # readPrec :: ReadPrec OpenModule # readListPrec :: ReadPrec [OpenModule] # | |
Read OpenUnitId Source # | |
Defined in Distribution.Backpack readsPrec :: Int -> ReadS OpenUnitId # readList :: ReadS [OpenUnitId] # readPrec :: ReadPrec OpenUnitId # readListPrec :: ReadPrec [OpenUnitId] # | |
Read CabalSpecVersion Source # | |
Defined in Distribution.CabalSpecVersion | |
Read AbiTag Source # | |
Read CompilerFlavor Source # | |
Defined in Distribution.Compiler readsPrec :: Int -> ReadS CompilerFlavor # readList :: ReadS [CompilerFlavor] # | |
Read CompilerId Source # | |
Defined in Distribution.Compiler readsPrec :: Int -> ReadS CompilerId # readList :: ReadS [CompilerId] # readPrec :: ReadPrec CompilerId # readListPrec :: ReadPrec [CompilerId] # | |
Read CompilerInfo Source # | |
Defined in Distribution.Compiler readsPrec :: Int -> ReadS CompilerInfo # readList :: ReadS [CompilerInfo] # | |
Read License Source # | |
Read ModuleName Source # | |
Defined in Distribution.ModuleName readsPrec :: Int -> ReadS ModuleName # readList :: ReadS [ModuleName] # readPrec :: ReadPrec ModuleName # readListPrec :: ReadPrec [ModuleName] # | |
Read License Source # | |
Read LicenseExceptionId Source # | |
Read LicenseExpression Source # | |
Defined in Distribution.SPDX.LicenseExpression | |
Read SimpleLicenseExpression Source # | |
Read LicenseId Source # | |
Read LicenseRef Source # | |
Defined in Distribution.SPDX.LicenseReference readsPrec :: Int -> ReadS LicenseRef # readList :: ReadS [LicenseRef] # readPrec :: ReadPrec LicenseRef # readListPrec :: ReadPrec [LicenseRef] # | |
Read Arch Source # | |
Read OS Source # | |
Read Platform Source # | |
Read AbiDependency Source # | |
Defined in Distribution.Types.AbiDependency readsPrec :: Int -> ReadS AbiDependency # readList :: ReadS [AbiDependency] # | |
Read AbiHash Source # | |
Read Benchmark Source # | |
Read BenchmarkInterface Source # | |
Read BenchmarkType Source # | |
Defined in Distribution.Types.BenchmarkType readsPrec :: Int -> ReadS BenchmarkType # readList :: ReadS [BenchmarkType] # | |
Read BuildInfo Source # | |
Read BuildType Source # | |
Read Component Source # | |
Read ComponentId Source # | |
Defined in Distribution.Types.ComponentId readsPrec :: Int -> ReadS ComponentId # readList :: ReadS [ComponentId] # readPrec :: ReadPrec ComponentId # readListPrec :: ReadPrec [ComponentId] # | |
Read ComponentName Source # | |
Defined in Distribution.Types.ComponentName readsPrec :: Int -> ReadS ComponentName # readList :: ReadS [ComponentName] # | |
Read ComponentRequestedSpec Source # | |
Read Dependency Source # | |
Defined in Distribution.Types.Dependency readsPrec :: Int -> ReadS Dependency # readList :: ReadS [Dependency] # readPrec :: ReadPrec Dependency # readListPrec :: ReadPrec [Dependency] # | |
Read DependencyMap Source # | |
Defined in Distribution.Types.DependencyMap readsPrec :: Int -> ReadS DependencyMap # readList :: ReadS [DependencyMap] # | |
Read ExeDependency Source # | |
Defined in Distribution.Types.ExeDependency readsPrec :: Int -> ReadS ExeDependency # readList :: ReadS [ExeDependency] # | |
Read Executable Source # | |
Defined in Distribution.Types.Executable readsPrec :: Int -> ReadS Executable # readList :: ReadS [Executable] # readPrec :: ReadPrec Executable # readListPrec :: ReadPrec [Executable] # | |
Read ExecutableScope Source # | |
Defined in Distribution.Types.ExecutableScope | |
Read ExposedModule Source # | |
Defined in Distribution.Types.ExposedModule readsPrec :: Int -> ReadS ExposedModule # readList :: ReadS [ExposedModule] # | |
Read FlagAssignment Source # | Since: Cabal-syntax-2.2.0 |
Defined in Distribution.Types.Flag readsPrec :: Int -> ReadS FlagAssignment # readList :: ReadS [FlagAssignment] # | |
Read FlagName Source # | |
Read ForeignLib Source # | |
Defined in Distribution.Types.ForeignLib readsPrec :: Int -> ReadS ForeignLib # readList :: ReadS [ForeignLib] # readPrec :: ReadPrec ForeignLib # readListPrec :: ReadPrec [ForeignLib] # | |
Read LibVersionInfo Source # | |
Defined in Distribution.Types.ForeignLib readsPrec :: Int -> ReadS LibVersionInfo # readList :: ReadS [LibVersionInfo] # | |
Read ForeignLibOption Source # | |
Defined in Distribution.Types.ForeignLibOption | |
Read ForeignLibType Source # | |
Defined in Distribution.Types.ForeignLibType readsPrec :: Int -> ReadS ForeignLibType # readList :: ReadS [ForeignLibType] # | |
Read IncludeRenaming Source # | |
Defined in Distribution.Types.IncludeRenaming | |
Read InstalledPackageInfo Source # | |
Read LegacyExeDependency Source # | |
Read Library Source # | |
Read LibraryName Source # | |
Defined in Distribution.Types.LibraryName readsPrec :: Int -> ReadS LibraryName # readList :: ReadS [LibraryName] # readPrec :: ReadPrec LibraryName # readListPrec :: ReadPrec [LibraryName] # | |
Read LibraryVisibility Source # | |
Defined in Distribution.Types.LibraryVisibility | |
Read Mixin Source # | |
Read Module Source # | |
Read ModuleReexport Source # | |
Defined in Distribution.Types.ModuleReexport readsPrec :: Int -> ReadS ModuleReexport # readList :: ReadS [ModuleReexport] # | |
Read ModuleRenaming Source # | |
Defined in Distribution.Types.ModuleRenaming readsPrec :: Int -> ReadS ModuleRenaming # readList :: ReadS [ModuleRenaming] # | |
Read MungedPackageId Source # | |
Defined in Distribution.Types.MungedPackageId | |
Read MungedPackageName Source # | |
Defined in Distribution.Types.MungedPackageName | |
Read PackageDescription Source # | |
Read PackageIdentifier Source # | |
Defined in Distribution.Types.PackageId | |
Read PackageName Source # | |
Defined in Distribution.Types.PackageName readsPrec :: Int -> ReadS PackageName # readList :: ReadS [PackageName] # readPrec :: ReadPrec PackageName # readListPrec :: ReadPrec [PackageName] # | |
Read PackageVersionConstraint Source # | |
Read PkgconfigDependency Source # | |
Read PkgconfigName Source # | |
Defined in Distribution.Types.PkgconfigName readsPrec :: Int -> ReadS PkgconfigName # readList :: ReadS [PkgconfigName] # | |
Read PkgconfigVersion Source # | |
Defined in Distribution.Types.PkgconfigVersion | |
Read PkgconfigVersionRange Source # | |
Read SetupBuildInfo Source # | |
Defined in Distribution.Types.SetupBuildInfo readsPrec :: Int -> ReadS SetupBuildInfo # readList :: ReadS [SetupBuildInfo] # | |
Read KnownRepoType Source # | |
Defined in Distribution.Types.SourceRepo readsPrec :: Int -> ReadS KnownRepoType # readList :: ReadS [KnownRepoType] # | |
Read RepoKind Source # | |
Read RepoType Source # | |
Read SourceRepo Source # | |
Defined in Distribution.Types.SourceRepo readsPrec :: Int -> ReadS SourceRepo # readList :: ReadS [SourceRepo] # readPrec :: ReadPrec SourceRepo # readListPrec :: ReadPrec [SourceRepo] # | |
Read TestSuite Source # | |
Read TestSuiteInterface Source # | |
Read TestType Source # | |
Read DefUnitId Source # | |
Read UnitId Source # | |
Read UnqualComponentName Source # | |
Read Version Source # | |
Read VersionRange Source # | |
Defined in Distribution.Types.VersionRange.Internal readsPrec :: Int -> ReadS VersionRange # readList :: ReadS [VersionRange] # | |
Read ShortText Source # | |
Read Extension Source # | |
Read KnownExtension Source # | |
Defined in Language.Haskell.Extension readsPrec :: Int -> ReadS KnownExtension # readList :: ReadS [KnownExtension] # | |
Read Language Source # | |
Read ByteString Source # | |
Defined in Data.ByteString.Internal.Type readsPrec :: Int -> ReadS ByteString # readList :: ReadS [ByteString] # readPrec :: ReadPrec ByteString # readListPrec :: ReadPrec [ByteString] # | |
Read ByteString Source # | |
Defined in Data.ByteString.Lazy.Internal readsPrec :: Int -> ReadS ByteString # readList :: ReadS [ByteString] # readPrec :: ReadPrec ByteString # readListPrec :: ReadPrec [ByteString] # | |
Read ShortByteString Source # | |
Defined in Data.ByteString.Short.Internal | |
Read IntSet Source # | |
Read Void # | |
Read All # | |
Read Any # | |
Read Version # | |
Read CBool # | |
Read CChar # | |
Read CClock # | |
Read CDouble # | |
Read CFloat # | |
Read CInt # | |
Read CIntMax # | |
Read CIntPtr # | |
Read CLLong # | |
Read CLong # | |
Read CPtrdiff # | |
Read CSChar # | |
Read CSUSeconds # | |
Defined in GHC.Internal.Foreign.C.Types readsPrec :: Int -> ReadS CSUSeconds # readList :: ReadS [CSUSeconds] # readPrec :: ReadPrec CSUSeconds # readListPrec :: ReadPrec [CSUSeconds] # | |
Read CShort # | |
Read CSigAtomic # | |
Defined in GHC.Internal.Foreign.C.Types readsPrec :: Int -> ReadS CSigAtomic # readList :: ReadS [CSigAtomic] # readPrec :: ReadPrec CSigAtomic # readListPrec :: ReadPrec [CSigAtomic] # | |
Read CSize # | |
Read CTime # | |
Read CUChar # | |
Read CUInt # | |
Read CUIntMax # | |
Read CUIntPtr # | |
Read CULLong # | |
Read CULong # | |
Read CUSeconds # | |
Read CUShort # | |
Read CWchar # | |
Read Associativity # | |
Defined in GHC.Internal.Generics readsPrec :: Int -> ReadS Associativity # readList :: ReadS [Associativity] # | |
Read DecidedStrictness # | |
Defined in GHC.Internal.Generics | |
Read Fixity # | |
Read SourceStrictness # | |
Defined in GHC.Internal.Generics | |
Read SourceUnpackedness # | |
Defined in GHC.Internal.Generics | |
Read ExitCode # | |
Read BufferMode # | |
Defined in GHC.Internal.IO.Handle.Types readsPrec :: Int -> ReadS BufferMode # readList :: ReadS [BufferMode] # readPrec :: ReadPrec BufferMode # readListPrec :: ReadPrec [BufferMode] # | |
Read Newline # | |
Read NewlineMode # | |
Defined in GHC.Internal.IO.Handle.Types readsPrec :: Int -> ReadS NewlineMode # readList :: ReadS [NewlineMode] # readPrec :: ReadPrec NewlineMode # readListPrec :: ReadPrec [NewlineMode] # | |
Read IOMode # | |
Read Int16 # | |
Read Int32 # | |
Read Int64 # | |
Read Int8 # | |
Read Lexeme # | |
Read SomeChar # | |
Read SomeSymbol # | |
Defined in GHC.Internal.TypeLits readsPrec :: Int -> ReadS SomeSymbol # readList :: ReadS [SomeSymbol] # readPrec :: ReadPrec SomeSymbol # readListPrec :: ReadPrec [SomeSymbol] # | |
Read GeneralCategory # | |
Defined in GHC.Internal.Read | |
Read Word16 # | |
Read Word32 # | |
Read Word64 # | |
Read Word8 # | |
Read Ordering # | |
Read I8 Source # | |
Read FPFormat Source # | |
Read Month Source # | Read as |
Read Quarter Source # | Read as |
Read QuarterOfYear Source # | |
Defined in Data.Time.Calendar.Quarter readsPrec :: Int -> ReadS QuarterOfYear # readList :: ReadS [QuarterOfYear] # | |
Read DayOfWeek Source # | |
Read DiffTime Source # | |
Read NominalDiffTime Source # | |
Defined in Data.Time.Clock.Internal.NominalDiffTime | |
Read Integer # | |
Read Natural # | |
Read () # | |
Read Bool # | |
Read Char # | |
Read Double # | |
Read Float # | |
Read Int # | |
Read Word # | |
(IsNode a, Read a, Show (Key a)) => Read (Graph a) Source # | |
(Read a, Ord a) => Read (NonEmptySet a) Source # | |
Defined in Distribution.Compat.NonEmptySet readsPrec :: Int -> ReadS (NonEmptySet a) # readList :: ReadS [NonEmptySet a] # readPrec :: ReadPrec (NonEmptySet a) # readListPrec :: ReadPrec [NonEmptySet a] # | |
Read a => Read (Last' a) Source # | |
Read a => Read (Option' a) Source # | |
Read v => Read (PerCompilerFlavor v) Source # | |
Defined in Distribution.Compiler readsPrec :: Int -> ReadS (PerCompilerFlavor v) # readList :: ReadS [PerCompilerFlavor v] # readPrec :: ReadPrec (PerCompilerFlavor v) # readListPrec :: ReadPrec [PerCompilerFlavor v] # | |
Read a => Read (VersionRangeF a) Source # | |
Defined in Distribution.Types.VersionRange.Internal readsPrec :: Int -> ReadS (VersionRangeF a) # readList :: ReadS [VersionRangeF a] # readPrec :: ReadPrec (VersionRangeF a) # readListPrec :: ReadPrec [VersionRangeF a] # | |
Read a => Read (Complex a) Source # | Since: base-2.1 |
Read a => Read (First a) Source # | Since: base-4.9.0.0 |
Read a => Read (Last a) Source # | Since: base-4.9.0.0 |
Read a => Read (Max a) Source # | Since: base-4.9.0.0 |
Read a => Read (Min a) Source # | Since: base-4.9.0.0 |
Read m => Read (WrappedMonoid m) Source # | Since: base-4.9.0.0 |
Defined in Data.Semigroup readsPrec :: Int -> ReadS (WrappedMonoid m) # readList :: ReadS [WrappedMonoid m] # readPrec :: ReadPrec (WrappedMonoid m) # readListPrec :: ReadPrec [WrappedMonoid m] # | |
Read vertex => Read (SCC vertex) Source # | Since: containers-0.5.9 |
Read e => Read (IntMap e) Source # | |
Read a => Read (Seq a) Source # | |
Read a => Read (ViewL a) Source # | |
Read a => Read (ViewR a) Source # | |
(Read a, Ord a) => Read (Set a) Source # | |
Read a => Read (Tree a) Source # | |
Read a => Read (NonEmpty a) # | |
Read a => Read (Identity a) # | |
Read a => Read (First a) # | |
Read a => Read (Last a) # | |
Read a => Read (Down a) # | |
Read a => Read (Dual a) # | |
Read a => Read (Product a) # | |
Read a => Read (Sum a) # | |
Read a => Read (ZipList a) # | |
Read p => Read (Par1 p) # | |
(Integral a, Read a) => Read (Ratio a) # | |
Read a => Read (Maybe a) # | |
Read a => Read (Solo a) # | |
Read a => Read [a] # | |
(Ix ix, Read ix, Read e, IArray UArray e) => Read (UArray ix e) Source # | |
HasResolution a => Read (Fixed a) Source # | Since: base-4.3.0.0 |
(Read a, Read b) => Read (Arg a b) Source # | Since: base-4.9.0.0 |
(Ord k, Read k, Read e) => Read (Map k e) Source # | |
(Ix a, Read a, Read b) => Read (Array a b) # | |
(Read a, Read b) => Read (Either a b) # | |
Read (Proxy t) # | |
Read (U1 p) # | |
Read (V1 p) # | |
(Read1 f, Read a) => Read (Lift f a) Source # | |
(Read1 m, Read a) => Read (MaybeT m a) Source # | |
(Read a, Read b) => Read (a, b) # | |
Read (SymbolicPathX allowAbsolute from to) Source # | |
Defined in Distribution.Utils.Path readsPrec :: Int -> ReadS (SymbolicPathX allowAbsolute from to) # readList :: ReadS [SymbolicPathX allowAbsolute from to] # readPrec :: ReadPrec (SymbolicPathX allowAbsolute from to) # readListPrec :: ReadPrec [SymbolicPathX allowAbsolute from to] # | |
Read a => Read (Const a b) # | |
Read (f a) => Read (Ap f a) # | |
Read (f a) => Read (Alt f a) # | |
Read (f p) => Read (Rec1 f p) # | |
(Read1 f, Read a) => Read (Backwards f a) Source # | |
(Read e, Read1 m, Read a) => Read (ExceptT e m a) Source # | |
(Read1 f, Read a) => Read (IdentityT f a) Source # | |
(Read w, Read1 m, Read a) => Read (WriterT w m a) Source # | |
(Read w, Read1 m, Read a) => Read (WriterT w m a) Source # | |
Read a => Read (Constant a b) Source # | |
(Read1 f, Read a) => Read (Reverse f a) Source # | |
(Read a, Read b, Read c) => Read (a, b, c) # | |
(Read (f a), Read (g a)) => Read (Product f g a) Source # | Since: base-4.18.0.0 |
(Read (f a), Read (g a)) => Read (Sum f g a) Source # | Since: base-4.18.0.0 |
(Read (f p), Read (g p)) => Read ((f :*: g) p) # | |
(Read (f p), Read (g p)) => Read ((f :+: g) p) # | |
Read c => Read (K1 i c p) # | |
(Read a, Read b, Read c, Read d) => Read (a, b, c, d) # | |
Read (f (g a)) => Read (Compose f g a) Source # | Since: base-4.18.0.0 |
Read (f (g p)) => Read ((f :.: g) p) # | |
Read (f p) => Read (M1 i c f p) # | |
(Read a, Read b, Read c, Read d, Read e) => Read (a, b, c, d, e) # | |
(Read a, Read b, Read c, Read d, Read e, Read f) => Read (a, b, c, d, e, f) # | |
(Read a, Read b, Read c, Read d, Read e, Read f, Read g) => Read (a, b, c, d, e, f, g) # | |
(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h) => Read (a, b, c, d, e, f, g, h) # | |
(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i) => Read (a, b, c, d, e, f, g, h, i) # | |
(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j) => Read (a, b, c, d, e, f, g, h, i, j) # | |
(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j, Read k) => Read (a, b, c, d, e, f, g, h, i, j, k) # | |
(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j, Read k, Read l) => Read (a, b, c, d, e, f, g, h, i, j, k, l) # | |
(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j, Read k, Read l, Read m) => Read (a, b, c, d, e, f, g, h, i, j, k, l, m) # | |
(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j, Read k, Read l, Read m, Read n) => Read (a, b, c, d, e, f, g, h, i, j, k, l, m, n) # | |
(Read a, Read b, Read c, Read d, Read e, Read f, Read g, Read h, Read i, Read j, Read k, Read l, Read m, Read n, Read o) => Read (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) # | |
Defined in GHC.Internal.Read |
class Num a => Fractional a where #
fromRational, (recip | (/))
Instances
Fractional CDouble # | |
Fractional CFloat # | |
Fractional DiffTime Source # | |
Fractional NominalDiffTime Source # | |
Defined in Data.Time.Clock.Internal.NominalDiffTime (/) :: NominalDiffTime -> NominalDiffTime -> NominalDiffTime # recip :: NominalDiffTime -> NominalDiffTime # fromRational :: Rational -> NominalDiffTime # | |
RealFloat a => Fractional (Complex a) Source # | Since: base-2.1 |
Fractional a => Fractional (Identity a) # | |
Fractional a => Fractional (Down a) # | |
Integral a => Fractional (Ratio a) # | |
HasResolution a => Fractional (Fixed a) Source # | Since: base-2.1 |
Fractional a => Fractional (Op a b) Source # | |
Fractional a => Fractional (Const a b) # | |
Fractional (f (g a)) => Fractional (Compose f g a) Source # | Since: base-4.20.0.0 |
class (Real a, Enum a) => Integral a where #
Instances
Integral CBool # | |
Integral CChar # | |
Integral CInt # | |
Integral CIntMax # | |
Defined in GHC.Internal.Foreign.C.Types | |
Integral CIntPtr # | |
Defined in GHC.Internal.Foreign.C.Types | |
Integral CLLong # | |
Defined in GHC.Internal.Foreign.C.Types | |
Integral CLong # | |
Integral CPtrdiff # | |
Defined in GHC.Internal.Foreign.C.Types | |
Integral CSChar # | |
Defined in GHC.Internal.Foreign.C.Types | |
Integral CShort # | |
Defined in GHC.Internal.Foreign.C.Types | |
Integral CSigAtomic # | |
Defined in GHC.Internal.Foreign.C.Types quot :: CSigAtomic -> CSigAtomic -> CSigAtomic # rem :: CSigAtomic -> CSigAtomic -> CSigAtomic # div :: CSigAtomic -> CSigAtomic -> CSigAtomic # mod :: CSigAtomic -> CSigAtomic -> CSigAtomic # quotRem :: CSigAtomic -> CSigAtomic -> (CSigAtomic, CSigAtomic) # divMod :: CSigAtomic -> CSigAtomic -> (CSigAtomic, CSigAtomic) # toInteger :: CSigAtomic -> Integer # | |
Integral CSize # | |
Integral CUChar # | |
Defined in GHC.Internal.Foreign.C.Types | |
Integral CUInt # | |
Integral CUIntMax # | |
Defined in GHC.Internal.Foreign.C.Types | |
Integral CUIntPtr # | |
Defined in GHC.Internal.Foreign.C.Types | |
Integral CULLong # | |
Defined in GHC.Internal.Foreign.C.Types | |
Integral CULong # | |
Defined in GHC.Internal.Foreign.C.Types | |
Integral CUShort # | |
Defined in GHC.Internal.Foreign.C.Types | |
Integral CWchar # | |
Defined in GHC.Internal.Foreign.C.Types | |
Integral Int16 # | |
Integral Int32 # | |
Integral Int64 # | |
Integral Int8 # | |
Integral Word16 # | |
Integral Word32 # | |
Integral Word64 # | |
Integral Word8 # | |
Integral I8 Source # | |
Integral Integer # | |
Defined in GHC.Internal.Real | |
Integral Natural # | |
Defined in GHC.Internal.Real | |
Integral Int # | |
Integral Word # | |
Integral a => Integral (Identity a) # | |
Defined in GHC.Internal.Data.Functor.Identity quot :: Identity a -> Identity a -> Identity a # rem :: Identity a -> Identity a -> Identity a # div :: Identity a -> Identity a -> Identity a # mod :: Identity a -> Identity a -> Identity a # quotRem :: Identity a -> Identity a -> (Identity a, Identity a) # divMod :: Identity a -> Identity a -> (Identity a, Identity a) # | |
Integral a => Integral (Const a b) # | |
Defined in GHC.Internal.Data.Functor.Const | |
Integral (f (g a)) => Integral (Compose f g a) Source # | Since: base-4.19.0.0 |
Defined in Data.Functor.Compose quot :: Compose f g a -> Compose f g a -> Compose f g a # rem :: Compose f g a -> Compose f g a -> Compose f g a # div :: Compose f g a -> Compose f g a -> Compose f g a # mod :: Compose f g a -> Compose f g a -> Compose f g a # quotRem :: Compose f g a -> Compose f g a -> (Compose f g a, Compose f g a) # divMod :: Compose f g a -> Compose f g a -> (Compose f g a, Compose f g a) # |
class (Num a, Ord a) => Real a where #
toRational :: a -> Rational #
Instances
Real CBool # | |
Defined in GHC.Internal.Foreign.C.Types toRational :: CBool -> Rational # | |
Real CChar # | |
Defined in GHC.Internal.Foreign.C.Types toRational :: CChar -> Rational # | |
Real CClock # | |
Defined in GHC.Internal.Foreign.C.Types toRational :: CClock -> Rational # | |
Real CDouble # | |
Defined in GHC.Internal.Foreign.C.Types toRational :: CDouble -> Rational # | |
Real CFloat # | |
Defined in GHC.Internal.Foreign.C.Types toRational :: CFloat -> Rational # | |
Real CInt # | |
Defined in GHC.Internal.Foreign.C.Types toRational :: CInt -> Rational # | |
Real CIntMax # | |
Defined in GHC.Internal.Foreign.C.Types toRational :: CIntMax -> Rational # | |
Real CIntPtr # | |
Defined in GHC.Internal.Foreign.C.Types toRational :: CIntPtr -> Rational # | |
Real CLLong # | |
Defined in GHC.Internal.Foreign.C.Types toRational :: CLLong -> Rational # | |
Real CLong # | |
Defined in GHC.Internal.Foreign.C.Types toRational :: CLong -> Rational # | |
Real CPtrdiff # | |
Defined in GHC.Internal.Foreign.C.Types toRational :: CPtrdiff -> Rational # | |
Real CSChar # | |
Defined in GHC.Internal.Foreign.C.Types toRational :: CSChar -> Rational # | |
Real CSUSeconds # | |
Defined in GHC.Internal.Foreign.C.Types toRational :: CSUSeconds -> Rational # | |
Real CShort # | |
Defined in GHC.Internal.Foreign.C.Types toRational :: CShort -> Rational # | |
Real CSigAtomic # | |
Defined in GHC.Internal.Foreign.C.Types toRational :: CSigAtomic -> Rational # | |
Real CSize # | |
Defined in GHC.Internal.Foreign.C.Types toRational :: CSize -> Rational # | |
Real CTime # | |
Defined in GHC.Internal.Foreign.C.Types toRational :: CTime -> Rational # | |
Real CUChar # | |
Defined in GHC.Internal.Foreign.C.Types toRational :: CUChar -> Rational # | |
Real CUInt # | |
Defined in GHC.Internal.Foreign.C.Types toRational :: CUInt -> Rational # | |
Real CUIntMax # | |
Defined in GHC.Internal.Foreign.C.Types toRational :: CUIntMax -> Rational # | |
Real CUIntPtr # | |
Defined in GHC.Internal.Foreign.C.Types toRational :: CUIntPtr -> Rational # | |
Real CULLong # | |
Defined in GHC.Internal.Foreign.C.Types toRational :: CULLong -> Rational # | |
Real CULong # | |
Defined in GHC.Internal.Foreign.C.Types toRational :: CULong -> Rational # | |
Real CUSeconds # | |
Defined in GHC.Internal.Foreign.C.Types toRational :: CUSeconds -> Rational # | |
Real CUShort # | |
Defined in GHC.Internal.Foreign.C.Types toRational :: CUShort -> Rational # | |
Real CWchar # | |
Defined in GHC.Internal.Foreign.C.Types toRational :: CWchar -> Rational # | |
Real Int16 # | |
Defined in GHC.Internal.Int toRational :: Int16 -> Rational # | |
Real Int32 # | |
Defined in GHC.Internal.Int toRational :: Int32 -> Rational # | |
Real Int64 # | |
Defined in GHC.Internal.Int toRational :: Int64 -> Rational # | |
Real Int8 # | |
Defined in GHC.Internal.Int toRational :: Int8 -> Rational # | |
Real Word16 # | |
Defined in GHC.Internal.Word toRational :: Word16 -> Rational # | |
Real Word32 # | |
Defined in GHC.Internal.Word toRational :: Word32 -> Rational # | |
Real Word64 # | |
Defined in GHC.Internal.Word toRational :: Word64 -> Rational # | |
Real Word8 # | |
Defined in GHC.Internal.Word toRational :: Word8 -> Rational # | |
Real I8 Source # | |
Defined in Data.Text.Foreign toRational :: I8 -> Rational # | |
Real DiffTime Source # | |
Defined in Data.Time.Clock.Internal.DiffTime toRational :: DiffTime -> Rational # | |
Real NominalDiffTime Source # | |
Defined in Data.Time.Clock.Internal.NominalDiffTime toRational :: NominalDiffTime -> Rational # | |
Real Integer # | |
Defined in GHC.Internal.Real toRational :: Integer -> Rational # | |
Real Natural # | |
Defined in GHC.Internal.Real toRational :: Natural -> Rational # | |
Real Int # | |
Defined in GHC.Internal.Real toRational :: Int -> Rational # | |
Real Word # | |
Defined in GHC.Internal.Real toRational :: Word -> Rational # | |
Real a => Real (Identity a) # | |
Defined in GHC.Internal.Data.Functor.Identity toRational :: Identity a -> Rational # | |
Real a => Real (Down a) # | |
Defined in GHC.Internal.Data.Ord toRational :: Down a -> Rational # | |
Integral a => Real (Ratio a) # | |
Defined in GHC.Internal.Real toRational :: Ratio a -> Rational # | |
HasResolution a => Real (Fixed a) Source # | Since: base-2.1 |
Defined in Data.Fixed toRational :: Fixed a -> Rational # | |
Real a => Real (Const a b) # | |
Defined in GHC.Internal.Data.Functor.Const toRational :: Const a b -> Rational # | |
Real (f (g a)) => Real (Compose f g a) Source # | Since: base-4.19.0.0 |
Defined in Data.Functor.Compose toRational :: Compose f g a -> Rational # |
class (Real a, Fractional a) => RealFrac a where #
properFraction :: Integral b => a -> (b, a) #
truncate :: Integral b => a -> b #
round :: Integral b => a -> b #
Instances
RealFrac CDouble # | |
RealFrac CFloat # | |
RealFrac DiffTime Source # | |
RealFrac NominalDiffTime Source # | |
Defined in Data.Time.Clock.Internal.NominalDiffTime properFraction :: Integral b => NominalDiffTime -> (b, NominalDiffTime) # truncate :: Integral b => NominalDiffTime -> b # round :: Integral b => NominalDiffTime -> b # ceiling :: Integral b => NominalDiffTime -> b # floor :: Integral b => NominalDiffTime -> b # | |
RealFrac a => RealFrac (Identity a) # | |
RealFrac a => RealFrac (Down a) # | |
Integral a => RealFrac (Ratio a) # | |
HasResolution a => RealFrac (Fixed a) Source # | Since: base-2.1 |
RealFrac a => RealFrac (Const a b) # | |
RealFrac (f (g a)) => RealFrac (Compose f g a) Source # | Since: base-4.20.0.0 |
Instances
Show OpenModule Source # | |
Defined in Distribution.Backpack showsPrec :: Int -> OpenModule -> ShowS # show :: OpenModule -> String # showList :: [OpenModule] -> ShowS # | |
Show OpenUnitId Source # | |
Defined in Distribution.Backpack showsPrec :: Int -> OpenUnitId -> ShowS # show :: OpenUnitId -> String # showList :: [OpenUnitId] -> ShowS # | |
Show CabalSpecVersion Source # | |
Defined in Distribution.CabalSpecVersion showsPrec :: Int -> CabalSpecVersion -> ShowS # show :: CabalSpecVersion -> String # showList :: [CabalSpecVersion] -> ShowS # | |
Show HasCommonStanzas Source # | |
Defined in Distribution.CabalSpecVersion showsPrec :: Int -> HasCommonStanzas -> ShowS # show :: HasCommonStanzas -> String # showList :: [HasCommonStanzas] -> ShowS # | |
Show HasElif Source # | |
Show AbiTag Source # | |
Show CompilerFlavor Source # | |
Defined in Distribution.Compiler showsPrec :: Int -> CompilerFlavor -> ShowS # show :: CompilerFlavor -> String # showList :: [CompilerFlavor] -> ShowS # | |
Show CompilerId Source # | |
Defined in Distribution.Compiler showsPrec :: Int -> CompilerId -> ShowS # show :: CompilerId -> String # showList :: [CompilerId] -> ShowS # | |
Show CompilerInfo Source # | |
Defined in Distribution.Compiler showsPrec :: Int -> CompilerInfo -> ShowS # show :: CompilerInfo -> String # showList :: [CompilerInfo] -> ShowS # | |
Show SpecLicense Source # | |
Defined in Distribution.FieldGrammar.Newtypes showsPrec :: Int -> SpecLicense -> ShowS # show :: SpecLicense -> String # showList :: [SpecLicense] -> ShowS # | |
Show SpecVersion Source # | |
Defined in Distribution.FieldGrammar.Newtypes showsPrec :: Int -> SpecVersion -> ShowS # show :: SpecVersion -> String # showList :: [SpecVersion] -> ShowS # | |
Show LToken Source # | |
Show Token Source # | |
Show LexWarning Source # | |
Defined in Distribution.Fields.LexerMonad showsPrec :: Int -> LexWarning -> ShowS # show :: LexWarning -> String # showList :: [LexWarning] -> ShowS # | |
Show LexWarningType Source # | |
Defined in Distribution.Fields.LexerMonad showsPrec :: Int -> LexWarningType -> ShowS # show :: LexWarningType -> String # showList :: [LexWarningType] -> ShowS # | |
Show License Source # | |
Show ModuleName Source # | |
Defined in Distribution.ModuleName showsPrec :: Int -> ModuleName -> ShowS # show :: ModuleName -> String # showList :: [ModuleName] -> ShowS # | |
Show PError Source # | |
Show FieldLineStream Source # | |
Defined in Distribution.Parsec.FieldLineStream showsPrec :: Int -> FieldLineStream -> ShowS # show :: FieldLineStream -> String # showList :: [FieldLineStream] -> ShowS # | |
Show Position Source # | |
Show PWarnType Source # | |
Show PWarning Source # | |
Show License Source # | |
Show LicenseExceptionId Source # | |
Defined in Distribution.SPDX.LicenseExceptionId showsPrec :: Int -> LicenseExceptionId -> ShowS # show :: LicenseExceptionId -> String # showList :: [LicenseExceptionId] -> ShowS # | |
Show LicenseExpression Source # | |
Defined in Distribution.SPDX.LicenseExpression showsPrec :: Int -> LicenseExpression -> ShowS # show :: LicenseExpression -> String # showList :: [LicenseExpression] -> ShowS # | |
Show SimpleLicenseExpression Source # | |
Defined in Distribution.SPDX.LicenseExpression showsPrec :: Int -> SimpleLicenseExpression -> ShowS # show :: SimpleLicenseExpression -> String # showList :: [SimpleLicenseExpression] -> ShowS # | |
Show LicenseId Source # | |
Show LicenseListVersion Source # | |
Defined in Distribution.SPDX.LicenseListVersion showsPrec :: Int -> LicenseListVersion -> ShowS # show :: LicenseListVersion -> String # showList :: [LicenseListVersion] -> ShowS # | |
Show LicenseRef Source # | |
Defined in Distribution.SPDX.LicenseReference showsPrec :: Int -> LicenseRef -> ShowS # show :: LicenseRef -> String # showList :: [LicenseRef] -> ShowS # | |
Show Arch Source # | |
Show OS Source # | |
Show Platform Source # | |
Show AbiDependency Source # | |
Defined in Distribution.Types.AbiDependency showsPrec :: Int -> AbiDependency -> ShowS # show :: AbiDependency -> String # showList :: [AbiDependency] -> ShowS # | |
Show AbiHash Source # | |
Show Benchmark Source # | |
Show BenchmarkInterface Source # | |
Defined in Distribution.Types.BenchmarkInterface showsPrec :: Int -> BenchmarkInterface -> ShowS # show :: BenchmarkInterface -> String # showList :: [BenchmarkInterface] -> ShowS # | |
Show BenchmarkType Source # | |
Defined in Distribution.Types.BenchmarkType showsPrec :: Int -> BenchmarkType -> ShowS # show :: BenchmarkType -> String # showList :: [BenchmarkType] -> ShowS # | |
Show BuildInfo Source # | |
Show BuildType Source # | |
Show Component Source # | |
Show ComponentId Source # | |
Defined in Distribution.Types.ComponentId showsPrec :: Int -> ComponentId -> ShowS # show :: ComponentId -> String # showList :: [ComponentId] -> ShowS # | |
Show ComponentName Source # | |
Defined in Distribution.Types.ComponentName showsPrec :: Int -> ComponentName -> ShowS # show :: ComponentName -> String # showList :: [ComponentName] -> ShowS # | |
Show ComponentRequestedSpec Source # | |
Defined in Distribution.Types.ComponentRequestedSpec showsPrec :: Int -> ComponentRequestedSpec -> ShowS # show :: ComponentRequestedSpec -> String # showList :: [ComponentRequestedSpec] -> ShowS # | |
Show ConfVar Source # | |
Show Dependency Source # | |
Defined in Distribution.Types.Dependency showsPrec :: Int -> Dependency -> ShowS # show :: Dependency -> String # showList :: [Dependency] -> ShowS # | |
Show DependencyMap Source # | |
Defined in Distribution.Types.DependencyMap showsPrec :: Int -> DependencyMap -> ShowS # show :: DependencyMap -> String # showList :: [DependencyMap] -> ShowS # | |
Show ExeDependency Source # | |
Defined in Distribution.Types.ExeDependency showsPrec :: Int -> ExeDependency -> ShowS # show :: ExeDependency -> String # showList :: [ExeDependency] -> ShowS # | |
Show Executable Source # | |
Defined in Distribution.Types.Executable showsPrec :: Int -> Executable -> ShowS # show :: Executable -> String # showList :: [Executable] -> ShowS # | |
Show ExecutableScope Source # | |
Defined in Distribution.Types.ExecutableScope showsPrec :: Int -> ExecutableScope -> ShowS # show :: ExecutableScope -> String # showList :: [ExecutableScope] -> ShowS # | |
Show ExposedModule Source # | |
Defined in Distribution.Types.ExposedModule showsPrec :: Int -> ExposedModule -> ShowS # show :: ExposedModule -> String # showList :: [ExposedModule] -> ShowS # | |
Show FlagAssignment Source # | Since: Cabal-syntax-2.2.0 |
Defined in Distribution.Types.Flag showsPrec :: Int -> FlagAssignment -> ShowS # show :: FlagAssignment -> String # showList :: [FlagAssignment] -> ShowS # | |
Show FlagName Source # | |
Show PackageFlag Source # | |
Defined in Distribution.Types.Flag showsPrec :: Int -> PackageFlag -> ShowS # show :: PackageFlag -> String # showList :: [PackageFlag] -> ShowS # | |
Show ForeignLib Source # | |
Defined in Distribution.Types.ForeignLib showsPrec :: Int -> ForeignLib -> ShowS # show :: ForeignLib -> String # showList :: [ForeignLib] -> ShowS # | |
Show LibVersionInfo Source # | |
Defined in Distribution.Types.ForeignLib showsPrec :: Int -> LibVersionInfo -> ShowS # show :: LibVersionInfo -> String # showList :: [LibVersionInfo] -> ShowS # | |
Show ForeignLibOption Source # | |
Defined in Distribution.Types.ForeignLibOption showsPrec :: Int -> ForeignLibOption -> ShowS # show :: ForeignLibOption -> String # showList :: [ForeignLibOption] -> ShowS # | |
Show ForeignLibType Source # | |
Defined in Distribution.Types.ForeignLibType showsPrec :: Int -> ForeignLibType -> ShowS # show :: ForeignLibType -> String # showList :: [ForeignLibType] -> ShowS # | |
Show GenericPackageDescription Source # | |
Defined in Distribution.Types.GenericPackageDescription showsPrec :: Int -> GenericPackageDescription -> ShowS # show :: GenericPackageDescription -> String # showList :: [GenericPackageDescription] -> ShowS # | |
Show IncludeRenaming Source # | |
Defined in Distribution.Types.IncludeRenaming showsPrec :: Int -> IncludeRenaming -> ShowS # show :: IncludeRenaming -> String # showList :: [IncludeRenaming] -> ShowS # | |
Show InstalledPackageInfo Source # | |
Defined in Distribution.Types.InstalledPackageInfo showsPrec :: Int -> InstalledPackageInfo -> ShowS # show :: InstalledPackageInfo -> String # showList :: [InstalledPackageInfo] -> ShowS # | |
Show LegacyExeDependency Source # | |
Defined in Distribution.Types.LegacyExeDependency showsPrec :: Int -> LegacyExeDependency -> ShowS # show :: LegacyExeDependency -> String # showList :: [LegacyExeDependency] -> ShowS # | |
Show Library Source # | |
Show LibraryName Source # | |
Defined in Distribution.Types.LibraryName showsPrec :: Int -> LibraryName -> ShowS # show :: LibraryName -> String # showList :: [LibraryName] -> ShowS # | |
Show LibraryVisibility Source # | |
Defined in Distribution.Types.LibraryVisibility showsPrec :: Int -> LibraryVisibility -> ShowS # show :: LibraryVisibility -> String # showList :: [LibraryVisibility] -> ShowS # | |
Show Mixin Source # | |
Show Module Source # | |
Show ModuleReexport Source # | |
Defined in Distribution.Types.ModuleReexport showsPrec :: Int -> ModuleReexport -> ShowS # show :: ModuleReexport -> String # showList :: [ModuleReexport] -> ShowS # | |
Show ModuleRenaming Source # | |
Defined in Distribution.Types.ModuleRenaming showsPrec :: Int -> ModuleRenaming -> ShowS # show :: ModuleRenaming -> String # showList :: [ModuleRenaming] -> ShowS # | |
Show MungedPackageId Source # | |
Defined in Distribution.Types.MungedPackageId showsPrec :: Int -> MungedPackageId -> ShowS # show :: MungedPackageId -> String # showList :: [MungedPackageId] -> ShowS # | |
Show MungedPackageName Source # | |
Defined in Distribution.Types.MungedPackageName showsPrec :: Int -> MungedPackageName -> ShowS # show :: MungedPackageName -> String # showList :: [MungedPackageName] -> ShowS # | |
Show PackageDescription Source # | |
Defined in Distribution.Types.PackageDescription showsPrec :: Int -> PackageDescription -> ShowS # show :: PackageDescription -> String # showList :: [PackageDescription] -> ShowS # | |
Show PackageIdentifier Source # | |
Defined in Distribution.Types.PackageId showsPrec :: Int -> PackageIdentifier -> ShowS # show :: PackageIdentifier -> String # showList :: [PackageIdentifier] -> ShowS # | |
Show PackageName Source # | |
Defined in Distribution.Types.PackageName showsPrec :: Int -> PackageName -> ShowS # show :: PackageName -> String # showList :: [PackageName] -> ShowS # | |
Show PackageVersionConstraint Source # | |
Defined in Distribution.Types.PackageVersionConstraint showsPrec :: Int -> PackageVersionConstraint -> ShowS # show :: PackageVersionConstraint -> String # showList :: [PackageVersionConstraint] -> ShowS # | |
Show PkgconfigDependency Source # | |
Defined in Distribution.Types.PkgconfigDependency showsPrec :: Int -> PkgconfigDependency -> ShowS # show :: PkgconfigDependency -> String # showList :: [PkgconfigDependency] -> ShowS # | |
Show PkgconfigName Source # | |
Defined in Distribution.Types.PkgconfigName showsPrec :: Int -> PkgconfigName -> ShowS # show :: PkgconfigName -> String # showList :: [PkgconfigName] -> ShowS # | |
Show PkgconfigVersion Source # | |
Defined in Distribution.Types.PkgconfigVersion showsPrec :: Int -> PkgconfigVersion -> ShowS # show :: PkgconfigVersion -> String # showList :: [PkgconfigVersion] -> ShowS # | |
Show PkgconfigVersionRange Source # | |
Defined in Distribution.Types.PkgconfigVersionRange showsPrec :: Int -> PkgconfigVersionRange -> ShowS # show :: PkgconfigVersionRange -> String # showList :: [PkgconfigVersionRange] -> ShowS # | |
Show SetupBuildInfo Source # | |
Defined in Distribution.Types.SetupBuildInfo showsPrec :: Int -> SetupBuildInfo -> ShowS # show :: SetupBuildInfo -> String # showList :: [SetupBuildInfo] -> ShowS # | |
Show KnownRepoType Source # | |
Defined in Distribution.Types.SourceRepo showsPrec :: Int -> KnownRepoType -> ShowS # show :: KnownRepoType -> String # showList :: [KnownRepoType] -> ShowS # | |
Show RepoKind Source # | |
Show RepoType Source # | |
Show SourceRepo Source # | |
Defined in Distribution.Types.SourceRepo showsPrec :: Int -> SourceRepo -> ShowS # show :: SourceRepo -> String # showList :: [SourceRepo] -> ShowS # | |
Show TestSuite Source # | |
Show TestSuiteInterface Source # | |
Defined in Distribution.Types.TestSuiteInterface showsPrec :: Int -> TestSuiteInterface -> ShowS # show :: TestSuiteInterface -> String # showList :: [TestSuiteInterface] -> ShowS # | |
Show TestType Source # | |
Show DefUnitId Source # | |
Show UnitId Source # | |
Show UnqualComponentName Source # | |
Defined in Distribution.Types.UnqualComponentName showsPrec :: Int -> UnqualComponentName -> ShowS # show :: UnqualComponentName -> String # showList :: [UnqualComponentName] -> ShowS # | |
Show Version Source # | |
Show Bound Source # | |
Show LowerBound Source # | |
Defined in Distribution.Types.VersionInterval showsPrec :: Int -> LowerBound -> ShowS # show :: LowerBound -> String # showList :: [LowerBound] -> ShowS # | |
Show UpperBound Source # | |
Defined in Distribution.Types.VersionInterval showsPrec :: Int -> UpperBound -> ShowS # show :: UpperBound -> String # showList :: [UpperBound] -> ShowS # | |
Show VersionInterval Source # | |
Defined in Distribution.Types.VersionInterval showsPrec :: Int -> VersionInterval -> ShowS # show :: VersionInterval -> String # showList :: [VersionInterval] -> ShowS # | |
Show VersionIntervals Source # | |
Defined in Distribution.Types.VersionInterval showsPrec :: Int -> VersionIntervals -> ShowS # show :: VersionIntervals -> String # showList :: [VersionIntervals] -> ShowS # | |
Show Bound Source # | |
Show LowerBound Source # | |
Defined in Distribution.Types.VersionInterval.Legacy showsPrec :: Int -> LowerBound -> ShowS # show :: LowerBound -> String # showList :: [LowerBound] -> ShowS # | |
Show UpperBound Source # | |
Defined in Distribution.Types.VersionInterval.Legacy showsPrec :: Int -> UpperBound -> ShowS # show :: UpperBound -> String # showList :: [UpperBound] -> ShowS # | |
Show VersionIntervals Source # | |
Defined in Distribution.Types.VersionInterval.Legacy showsPrec :: Int -> VersionIntervals -> ShowS # show :: VersionIntervals -> String # showList :: [VersionIntervals] -> ShowS # | |
Show VersionRange Source # | |
Defined in Distribution.Types.VersionRange.Internal showsPrec :: Int -> VersionRange -> ShowS # show :: VersionRange -> String # showList :: [VersionRange] -> ShowS # | |
Show ShortText Source # | |
Show Structure Source # | |
Show Extension Source # | |
Show KnownExtension Source # | |
Defined in Language.Haskell.Extension showsPrec :: Int -> KnownExtension -> ShowS # show :: KnownExtension -> String # showList :: [KnownExtension] -> ShowS # | |
Show Language Source # | |
Show ByteArray Source # | Since: base-4.17.0.0 |
Show Timeout Source # | Since: base-4.0 |
Show FormatMode Source # | |
Show ByteString Source # | |
Defined in Data.ByteString.Internal.Type showsPrec :: Int -> ByteString -> ShowS # show :: ByteString -> String # showList :: [ByteString] -> ShowS # | |
Show SizeOverflowException Source # | |
Defined in Data.ByteString.Internal.Type showsPrec :: Int -> SizeOverflowException -> ShowS # show :: SizeOverflowException -> String # showList :: [SizeOverflowException] -> ShowS # | |
Show ByteString Source # | |
Defined in Data.ByteString.Lazy.Internal showsPrec :: Int -> ByteString -> ShowS # show :: ByteString -> String # showList :: [ByteString] -> ShowS # | |
Show ShortByteString Source # | |
Defined in Data.ByteString.Short.Internal showsPrec :: Int -> ShortByteString -> ShowS # show :: ShortByteString -> String # showList :: [ShortByteString] -> ShowS # | |
Show IntSet Source # | |
Show BitQueue Source # | |
Show BitQueueB Source # | |
Show Void # | |
Show NestedAtomically # | |
Defined in GHC.Internal.Control.Exception.Base showsPrec :: Int -> NestedAtomically -> ShowS # show :: NestedAtomically -> String # showList :: [NestedAtomically] -> ShowS # | |
Show NoMatchingContinuationPrompt # | |
Defined in GHC.Internal.Control.Exception.Base showsPrec :: Int -> NoMatchingContinuationPrompt -> ShowS # show :: NoMatchingContinuationPrompt -> String # showList :: [NoMatchingContinuationPrompt] -> ShowS # | |
Show NoMethodError # | |
Defined in GHC.Internal.Control.Exception.Base showsPrec :: Int -> NoMethodError -> ShowS # show :: NoMethodError -> String # showList :: [NoMethodError] -> ShowS # | |
Show NonTermination # | |
Defined in GHC.Internal.Control.Exception.Base showsPrec :: Int -> NonTermination -> ShowS # show :: NonTermination -> String # showList :: [NonTermination] -> ShowS # | |
Show PatternMatchFail # | |
Defined in GHC.Internal.Control.Exception.Base showsPrec :: Int -> PatternMatchFail -> ShowS # show :: PatternMatchFail -> String # showList :: [PatternMatchFail] -> ShowS # | |
Show RecConError # | |
Defined in GHC.Internal.Control.Exception.Base showsPrec :: Int -> RecConError -> ShowS # show :: RecConError -> String # showList :: [RecConError] -> ShowS # | |
Show RecSelError # | |
Defined in GHC.Internal.Control.Exception.Base showsPrec :: Int -> RecSelError -> ShowS # show :: RecSelError -> String # showList :: [RecSelError] -> ShowS # | |
Show RecUpdError # | |
Defined in GHC.Internal.Control.Exception.Base showsPrec :: Int -> RecUpdError -> ShowS # show :: RecUpdError -> String # showList :: [RecUpdError] -> ShowS # | |
Show TypeError # | |
Show Constr # | |
Show ConstrRep # | |
Show DataRep # | |
Show DataType # | |
Show Fixity # | |
Show All # | |
Show Any # | |
Show SomeTypeRep # | |
Defined in GHC.Internal.Data.Typeable.Internal showsPrec :: Int -> SomeTypeRep -> ShowS # show :: SomeTypeRep -> String # showList :: [SomeTypeRep] -> ShowS # | |
Show Version # | |
Show ErrorCall # | |
Show ArithException # | |
Defined in GHC.Internal.Exception.Type showsPrec :: Int -> ArithException -> ShowS # show :: ArithException -> String # showList :: [ArithException] -> ShowS # | |
Show SomeException # | |
Defined in GHC.Internal.Exception.Type showsPrec :: Int -> SomeException -> ShowS # show :: SomeException -> String # showList :: [SomeException] -> ShowS # | |
Show WhileHandling # | |
Defined in GHC.Internal.Exception.Type showsPrec :: Int -> WhileHandling -> ShowS # show :: WhileHandling -> String # showList :: [WhileHandling] -> ShowS # | |
Show Fingerprint # | |
Defined in GHC.Internal.Fingerprint.Type showsPrec :: Int -> Fingerprint -> ShowS # show :: Fingerprint -> String # showList :: [Fingerprint] -> ShowS # | |
Show CBool # | |
Show CChar # | |
Show CClock # | |
Show CDouble # | |
Show CFloat # | |
Show CInt # | |
Show CIntMax # | |
Show CIntPtr # | |
Show CLLong # | |
Show CLong # | |
Show CPtrdiff # | |
Show CSChar # | |
Show CSUSeconds # | |
Defined in GHC.Internal.Foreign.C.Types showsPrec :: Int -> CSUSeconds -> ShowS # show :: CSUSeconds -> String # showList :: [CSUSeconds] -> ShowS # | |
Show CShort # | |
Show CSigAtomic # | |
Defined in GHC.Internal.Foreign.C.Types showsPrec :: Int -> CSigAtomic -> ShowS # show :: CSigAtomic -> String # showList :: [CSigAtomic] -> ShowS # | |
Show CSize # | |
Show CTime # | |
Show CUChar # | |
Show CUInt # | |
Show CUIntMax # | |
Show CUIntPtr # | |
Show CULLong # | |
Show CULong # | |
Show CUSeconds # | |
Show CUShort # | |
Show CWchar # | |
Show ForeignSrcLang # | |
Show Associativity # | |
Defined in GHC.Internal.Generics showsPrec :: Int -> Associativity -> ShowS # show :: Associativity -> String # showList :: [Associativity] -> ShowS # | |
Show DecidedStrictness # | |
Defined in GHC.Internal.Generics showsPrec :: Int -> DecidedStrictness -> ShowS # show :: DecidedStrictness -> String # showList :: [DecidedStrictness] -> ShowS # | |
Show Fixity # | |
Show SourceStrictness # | |
Defined in GHC.Internal.Generics showsPrec :: Int -> SourceStrictness -> ShowS # show :: SourceStrictness -> String # showList :: [SourceStrictness] -> ShowS # | |
Show SourceUnpackedness # | |
Defined in GHC.Internal.Generics showsPrec :: Int -> SourceUnpackedness -> ShowS # show :: SourceUnpackedness -> String # showList :: [SourceUnpackedness] -> ShowS # | |
Show MaskingState # | |
Defined in GHC.Internal.IO showsPrec :: Int -> MaskingState -> ShowS # show :: MaskingState -> String # showList :: [MaskingState] -> ShowS # | |
Show AllocationLimitExceeded # | |
Defined in GHC.Internal.IO.Exception showsPrec :: Int -> AllocationLimitExceeded -> ShowS # show :: AllocationLimitExceeded -> String # showList :: [AllocationLimitExceeded] -> ShowS # | |
Show ArrayException # | |
Defined in GHC.Internal.IO.Exception showsPrec :: Int -> ArrayException -> ShowS # show :: ArrayException -> String # showList :: [ArrayException] -> ShowS # | |
Show AssertionFailed # | |
Defined in GHC.Internal.IO.Exception showsPrec :: Int -> AssertionFailed -> ShowS # show :: AssertionFailed -> String # showList :: [AssertionFailed] -> ShowS # | |
Show AsyncException # | |
Defined in GHC.Internal.IO.Exception showsPrec :: Int -> AsyncException -> ShowS # show :: AsyncException -> String # showList :: [AsyncException] -> ShowS # | |
Show BlockedIndefinitelyOnMVar # | |
Defined in GHC.Internal.IO.Exception showsPrec :: Int -> BlockedIndefinitelyOnMVar -> ShowS # show :: BlockedIndefinitelyOnMVar -> String # showList :: [BlockedIndefinitelyOnMVar] -> ShowS # | |
Show BlockedIndefinitelyOnSTM # | |
Defined in GHC.Internal.IO.Exception showsPrec :: Int -> BlockedIndefinitelyOnSTM -> ShowS # show :: BlockedIndefinitelyOnSTM -> String # showList :: [BlockedIndefinitelyOnSTM] -> ShowS # | |
Show CompactionFailed # | |
Defined in GHC.Internal.IO.Exception showsPrec :: Int -> CompactionFailed -> ShowS # show :: CompactionFailed -> String # showList :: [CompactionFailed] -> ShowS # | |
Show Deadlock # | |
Show ExitCode # | |
Show FixIOException # | |
Defined in GHC.Internal.IO.Exception showsPrec :: Int -> FixIOException -> ShowS # show :: FixIOException -> String # showList :: [FixIOException] -> ShowS # | |
Show IOErrorType # | |
Defined in GHC.Internal.IO.Exception showsPrec :: Int -> IOErrorType -> ShowS # show :: IOErrorType -> String # showList :: [IOErrorType] -> ShowS # | |
Show IOException # | |
Defined in GHC.Internal.IO.Exception showsPrec :: Int -> IOException -> ShowS # show :: IOException -> String # showList :: [IOException] -> ShowS # | |
Show SomeAsyncException # | |
Defined in GHC.Internal.IO.Exception showsPrec :: Int -> SomeAsyncException -> ShowS # show :: SomeAsyncException -> String # showList :: [SomeAsyncException] -> ShowS # | |
Show HandlePosn # | |
Defined in GHC.Internal.IO.Handle showsPrec :: Int -> HandlePosn -> ShowS # show :: HandlePosn -> String # showList :: [HandlePosn] -> ShowS # | |
Show BufferMode # | |
Defined in GHC.Internal.IO.Handle.Types showsPrec :: Int -> BufferMode -> ShowS # show :: BufferMode -> String # showList :: [BufferMode] -> ShowS # | |
Show Handle # | |
Show HandleType # | |
Defined in GHC.Internal.IO.Handle.Types showsPrec :: Int -> HandleType -> ShowS # show :: HandleType -> String # showList :: [HandleType] -> ShowS # | |
Show Newline # | |
Show NewlineMode # | |
Defined in GHC.Internal.IO.Handle.Types showsPrec :: Int -> NewlineMode -> ShowS # show :: NewlineMode -> String # showList :: [NewlineMode] -> ShowS # | |
Show IOMode # | |
Show Int16 # | |
Show Int32 # | |
Show Int64 # | |
Show Int8 # | |
Show Extension # | |
Show FractionalExponentBase # | |
Defined in GHC.Internal.Real showsPrec :: Int -> FractionalExponentBase -> ShowS # show :: FractionalExponentBase -> String # showList :: [FractionalExponentBase] -> ShowS # | |
Show CallStack # | |
Show SrcLoc # | |
Show AnnLookup # | |
Show AnnTarget # | |
Show Bang # | |
Show BndrVis # | |
Show Body # | |
Show Bytes # | |
Show Callconv # | |
Show Clause # | |
Show Con # | |
Show Dec # | |
Show DecidedStrictness # | |
Show DerivClause # | |
Show DerivStrategy # | |
Show DocLoc # | |
Show Exp # | |
Show FamilyResultSig # | |
Show Fixity # | |
Show FixityDirection # | |
Show Foreign # | |
Show FunDep # | |
Show Guard # | |
Show Info # | |
Show InjectivityAnn # | |
Show Inline # | |
Show Lit # | |
Show Loc # | |
Show Match # | |
Show ModName # | |
Show Module # | |
Show ModuleInfo # | |
Show Name # | |
Show NameFlavour # | |
Show NameSpace # | |
Show NamespaceSpecifier # | |
Show OccName # | |
Show Overlap # | |
Show Pat # | |
Show PatSynArgs # | |
Show PatSynDir # | |
Show Phases # | |
Show PkgName # | |
Show Pragma # | |
Show Range # | |
Show Role # | |
Show RuleBndr # | |
Show RuleMatch # | |
Show Safety # | |
Show SourceStrictness # | |
Show SourceUnpackedness # | |
Show Specificity # | |
Show Stmt # | |
Show TyLit # | |
Show TySynEqn # | |
Show Type # | |
Show TypeFamilyHead # | |
Show Lexeme # | |
Show Number # | |
Show SomeChar # | |
Show SomeSymbol # | |
Defined in GHC.Internal.TypeLits showsPrec :: Int -> SomeSymbol -> ShowS # show :: SomeSymbol -> String # showList :: [SomeSymbol] -> ShowS # | |
Show GeneralCategory # | |
Defined in GHC.Internal.Unicode showsPrec :: Int -> GeneralCategory -> ShowS # show :: GeneralCategory -> String # showList :: [GeneralCategory] -> ShowS # | |
Show Word16 # | |
Show Word32 # | |
Show Word64 # | |
Show Word8 # | |
Show KindRep # | |
Show Module # | |
Show Ordering # | |
Show TrName # | |
Show TyCon # | |
Show TypeLitSort # | |
Defined in GHC.Internal.Show showsPrec :: Int -> TypeLitSort -> ShowS # show :: TypeLitSort -> String # showList :: [TypeLitSort] -> ShowS # | |
Show OsChar # | |
Show OsString # | |
Show PosixChar # | |
Show PosixString # | |
Defined in System.OsString.Internal.Types showsPrec :: Int -> PosixString -> ShowS # show :: PosixString -> String # showList :: [PosixString] -> ShowS # | |
Show WindowsChar # | |
Defined in System.OsString.Internal.Types showsPrec :: Int -> WindowsChar -> ShowS # show :: WindowsChar -> String # showList :: [WindowsChar] -> ShowS # | |
Show WindowsString # | |
Defined in System.OsString.Internal.Types showsPrec :: Int -> WindowsString -> ShowS # show :: WindowsString -> String # showList :: [WindowsString] -> ShowS # | |
Show ParseError Source # | |
Defined in Text.Parsec.Error showsPrec :: Int -> ParseError -> ShowS # show :: ParseError -> String # showList :: [ParseError] -> ShowS # | |
Show SourcePos Source # | |
Show Mode Source # | |
Show Style Source # | |
Show TextDetails Source # | |
Defined in Text.PrettyPrint.Annotated.HughesPJ showsPrec :: Int -> TextDetails -> ShowS # show :: TextDetails -> String # showList :: [TextDetails] -> ShowS # | |
Show PrettyLevel Source # | |
Defined in Text.PrettyPrint.Annotated.HughesPJClass showsPrec :: Int -> PrettyLevel -> ShowS # show :: PrettyLevel -> String # showList :: [PrettyLevel] -> ShowS # | |
Show Doc Source # | |
Show PrettyLevel Source # | |
Defined in Text.PrettyPrint.HughesPJClass showsPrec :: Int -> PrettyLevel -> ShowS # show :: PrettyLevel -> String # showList :: [PrettyLevel] -> ShowS # | |
Show Decoding Source # | |
Show UnicodeException Source # | |
Defined in Data.Text.Encoding.Error showsPrec :: Int -> UnicodeException -> ShowS # show :: UnicodeException -> String # showList :: [UnicodeException] -> ShowS # | |
Show I8 Source # | |
Show Builder Source # | |
Show PartialUtf8CodePoint Source # | |
Show Utf8State Source # | |
Show DecoderState Source # | |
Defined in Data.Text.Internal.Encoding.Utf8 showsPrec :: Int -> DecoderState -> ShowS # show :: DecoderState -> String # showList :: [DecoderState] -> ShowS # | |
Show Size Source # | |
Show FPFormat Source # | |
Show Iter Source # | |
Show Month Source # | Show as |
Show Quarter Source # | Show as |
Show QuarterOfYear Source # | |
Defined in Data.Time.Calendar.Quarter showsPrec :: Int -> QuarterOfYear -> ShowS # show :: QuarterOfYear -> String # showList :: [QuarterOfYear] -> ShowS # | |
Show DayOfWeek Source # | |
Show DiffTime Source # | |
Show NominalDiffTime Source # | |
Defined in Data.Time.Clock.Internal.NominalDiffTime showsPrec :: Int -> NominalDiffTime -> ShowS # show :: NominalDiffTime -> String # showList :: [NominalDiffTime] -> ShowS # | |
Show SystemTime Source # | |
Defined in Data.Time.Clock.Internal.SystemTime showsPrec :: Int -> SystemTime -> ShowS # show :: SystemTime -> String # showList :: [SystemTime] -> ShowS # | |
Show LocalTime Source # | |
Show TimeOfDay Source # | |
Show TimeZone Source # | This only shows the time zone name, or offset if the name is empty. |
Show ZonedTime Source # | For the time zone, this only shows the name, or offset if the name is empty. |
Show Integer # | |
Show Natural # | |
Show () # | |
Show Bool # | |
Show Char # | |
Show Int # | |
Show Levity # | |
Show RuntimeRep # | |
Defined in GHC.Internal.Show showsPrec :: Int -> RuntimeRep -> ShowS # show :: RuntimeRep -> String # showList :: [RuntimeRep] -> ShowS # | |
Show VecCount # | |
Show VecElem # | |
Show Word # | |
Show a => Show (Graph a) Source # | |
Show a => Show (NonEmptySet a) Source # | |
Defined in Distribution.Compat.NonEmptySet showsPrec :: Int -> NonEmptySet a -> ShowS # show :: NonEmptySet a -> String # showList :: [NonEmptySet a] -> ShowS # | |
Show a => Show (First' a) Source # | |
Show a => Show (Last' a) Source # | |
Show a => Show (Option' a) Source # | |
Show v => Show (PerCompilerFlavor v) Source # | |
Defined in Distribution.Compiler showsPrec :: Int -> PerCompilerFlavor v -> ShowS # show :: PerCompilerFlavor v -> String # showList :: [PerCompilerFlavor v] -> ShowS # | |
Show ann => Show (NamelessField ann) Source # | |
Defined in Distribution.FieldGrammar.Parsec showsPrec :: Int -> NamelessField ann -> ShowS # show :: NamelessField ann -> String # showList :: [NamelessField ann] -> ShowS # | |
Show ann => Show (Section ann) Source # | |
Show ann => Show (Field ann) Source # | |
Show ann => Show (FieldLine ann) Source # | |
Show ann => Show (Name ann) Source # | |
Show ann => Show (SectionArg ann) Source # | |
Defined in Distribution.Fields.Field showsPrec :: Int -> SectionArg ann -> ShowS # show :: SectionArg ann -> String # showList :: [SectionArg ann] -> ShowS # | |
Show c => Show (Condition c) Source # | |
Show a => Show (VersionRangeF a) Source # | |
Defined in Distribution.Types.VersionRange.Internal showsPrec :: Int -> VersionRangeF a -> ShowS # show :: VersionRangeF a -> String # showList :: [VersionRangeF a] -> ShowS # | |
Show a => Show (Complex a) Source # | Since: base-2.1 |
Show a => Show (First a) Source # | Since: base-4.9.0.0 |
Show a => Show (Last a) Source # | Since: base-4.9.0.0 |
Show a => Show (Max a) Source # | Since: base-4.9.0.0 |
Show a => Show (Min a) Source # | Since: base-4.9.0.0 |
Show m => Show (WrappedMonoid m) Source # | Since: base-4.9.0.0 |
Defined in Data.Semigroup showsPrec :: Int -> WrappedMonoid m -> ShowS # show :: WrappedMonoid m -> String # showList :: [WrappedMonoid m] -> ShowS # | |
Show a => Show (Decoder a) Source # | |
Show vertex => Show (SCC vertex) Source # | Since: containers-0.5.9 |
Show a => Show (IntMap a) Source # | |
Show a => Show (Seq a) Source # | |
Show a => Show (ViewL a) Source # | |
Show a => Show (ViewR a) Source # | |
Show a => Show (Intersection a) Source # | |
Defined in Data.Set.Internal showsPrec :: Int -> Intersection a -> ShowS # show :: Intersection a -> String # showList :: [Intersection a] -> ShowS # | |
Show a => Show (Set a) Source # | |
Show a => Show (Tree a) Source # | |
Show a => Show (NonEmpty a) # | |
Show a => Show (Identity a) # | |
Show a => Show (First a) # | |
Show a => Show (Last a) # | |
Show a => Show (Down a) # | |
Show a => Show (Dual a) # | |
Show a => Show (Product a) # | |
Show a => Show (Sum a) # | |
Show a => Show (ExceptionWithContext a) # | |
Defined in GHC.Internal.Exception.Type showsPrec :: Int -> ExceptionWithContext a -> ShowS # show :: ExceptionWithContext a -> String # showList :: [ExceptionWithContext a] -> ShowS # | |
Show e => Show (NoBacktrace e) # | |
Show (ForeignPtr a) # | |
Defined in GHC.Internal.ForeignPtr showsPrec :: Int -> ForeignPtr a -> ShowS # show :: ForeignPtr a -> String # showList :: [ForeignPtr a] -> ShowS # | |
Show a => Show (ZipList a) # | |
Show p => Show (Par1 p) # | |
Show (FunPtr a) # | |
Show (Ptr a) # | |
Show a => Show (Ratio a) # | |
Show flag => Show (TyVarBndr flag) # | |
Show (SChar c) # | |
Show (SSymbol s) # | |
Show a => Show (AnnotDetails a) Source # | |
Defined in Text.PrettyPrint.Annotated.HughesPJ showsPrec :: Int -> AnnotDetails a -> ShowS # show :: AnnotDetails a -> String # showList :: [AnnotDetails a] -> ShowS # | |
Show (Doc a) Source # | |
Show a => Show (Span a) Source # | |
Show a => Show (Maybe a) # | |
Show a => Show (Solo a) # | |
Show a => Show [a] # | |
(Show a, Show k) => Show (Node k a) Source # | |
(Ix ix, Show ix, Show e, IArray UArray e) => Show (UArray ix e) Source # | |
HasResolution a => Show (Fixed a) Source # | Since: base-2.1 |
(Show a, Show b) => Show (Arg a b) Source # | Since: base-4.9.0.0 |
(Show k, Show a) => Show (Map k a) Source # | |
(Ix a, Show a, Show b) => Show (Array a b) # | |
(Show a, Show b) => Show (Either a b) # | |
Show (Proxy s) # | |
Show (TypeRep a) # | |
Show (U1 p) # | |
Show (UAddr p) # | |
Show (V1 p) # | |
(Show1 f, Show a) => Show (Lift f a) Source # | |
(Show1 m, Show a) => Show (MaybeT m a) Source # | |
(Show a, Show b) => Show (a, b) # | |
(Show v, Show a, Show c) => Show (CondBranch v c a) Source # | |
Defined in Distribution.Types.CondTree showsPrec :: Int -> CondBranch v c a -> ShowS # show :: CondBranch v c a -> String # showList :: [CondBranch v c a] -> ShowS # | |
(Show a, Show c, Show v) => Show (CondTree v c a) Source # | |
Show (SymbolicPathX allowAbsolute from to) Source # | |
Defined in Distribution.Utils.Path showsPrec :: Int -> SymbolicPathX allowAbsolute from to -> ShowS # show :: SymbolicPathX allowAbsolute from to -> String # showList :: [SymbolicPathX allowAbsolute from to] -> ShowS # | |
Show a => Show (Const a b) # | |
Show (f a) => Show (Ap f a) # | |
Show (f a) => Show (Alt f a) # | |
Show (OrderingI a b) # | |
Show (f p) => Show (Rec1 f p) # | |
Show (URec Char p) # | |
Show (URec Double p) # | |
Show (URec Float p) # | |
Show (URec Int p) # | |
Show (URec Word p) # | |
(Show1 f, Show a) => Show (Backwards f a) Source # | |
(Show e, Show1 m, Show a) => Show (ExceptT e m a) Source # | |
(Show1 f, Show a) => Show (IdentityT f a) Source # | |
(Show w, Show1 m, Show a) => Show (WriterT w m a) Source # | |
(Show w, Show1 m, Show a) => Show (WriterT w m a) Source # | |
Show a => Show (Constant a b) Source # | |
(Show1 f, Show a) => Show (Reverse f a) Source # | |
(Show a, Show b, Show c) => Show (a, b, c) # | |
(Show (f a), Show (g a)) => Show (Product f g a) Source # | Since: base-4.18.0.0 |
(Show (f a), Show (g a)) => Show (Sum f g a) Source # | Since: base-4.18.0.0 |
(Show (f p), Show (g p)) => Show ((f :*: g) p) # | |
(Show (f p), Show (g p)) => Show ((f :+: g) p) # | |
Show c => Show (K1 i c p) # | |
(Show a, Show b, Show c, Show d) => Show (a, b, c, d) # | |
Show (f (g a)) => Show (Compose f g a) Source # | Since: base-4.18.0.0 |
Show (f (g p)) => Show ((f :.: g) p) # | |
Show (f p) => Show (M1 i c f p) # | |
(Show a, Show b, Show c, Show d, Show e) => Show (a, b, c, d, e) # | |
(Show a, Show b, Show c, Show d, Show e, Show f) => Show (a, b, c, d, e, f) # | |
(Show a, Show b, Show c, Show d, Show e, Show f, Show g) => Show (a, b, c, d, e, f, g) # | |
(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h) => Show (a, b, c, d, e, f, g, h) # | |
(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i) => Show (a, b, c, d, e, f, g, h, i) # | |
(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j) => Show (a, b, c, d, e, f, g, h, i, j) # | |
(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k) => Show (a, b, c, d, e, f, g, h, i, j, k) # | |
(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k, Show l) => Show (a, b, c, d, e, f, g, h, i, j, k, l) # | |
(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k, Show l, Show m) => Show (a, b, c, d, e, f, g, h, i, j, k, l, m) # | |
(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k, Show l, Show m, Show n) => Show (a, b, c, d, e, f, g, h, i, j, k, l, m, n) # | |
(Show a, Show b, Show c, Show d, Show e, Show f, Show g, Show h, Show i, Show j, Show k, Show l, Show m, Show n, Show o) => Show (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) # | |
Instances
Eq OpenModule Source # | |
Defined in Distribution.Backpack (==) :: OpenModule -> OpenModule -> Bool # (/=) :: OpenModule -> OpenModule -> Bool # | |
Eq OpenUnitId Source # | |
Defined in Distribution.Backpack (==) :: OpenUnitId -> OpenUnitId -> Bool # (/=) :: OpenUnitId -> OpenUnitId -> Bool # | |
Eq CabalSpecVersion Source # | |
Defined in Distribution.CabalSpecVersion (==) :: CabalSpecVersion -> CabalSpecVersion -> Bool # (/=) :: CabalSpecVersion -> CabalSpecVersion -> Bool # | |
Eq HasCommonStanzas Source # | |
Defined in Distribution.CabalSpecVersion (==) :: HasCommonStanzas -> HasCommonStanzas -> Bool # (/=) :: HasCommonStanzas -> HasCommonStanzas -> Bool # | |
Eq HasElif Source # | |
Eq AbiTag Source # | |
Eq CompilerFlavor Source # | |
Defined in Distribution.Compiler (==) :: CompilerFlavor -> CompilerFlavor -> Bool # (/=) :: CompilerFlavor -> CompilerFlavor -> Bool # | |
Eq CompilerId Source # | |
Defined in Distribution.Compiler (==) :: CompilerId -> CompilerId -> Bool # (/=) :: CompilerId -> CompilerId -> Bool # | |
Eq SpecLicense Source # | |
Defined in Distribution.FieldGrammar.Newtypes (==) :: SpecLicense -> SpecLicense -> Bool # (/=) :: SpecLicense -> SpecLicense -> Bool # | |
Eq SpecVersion Source # | |
Defined in Distribution.FieldGrammar.Newtypes (==) :: SpecVersion -> SpecVersion -> Bool # (/=) :: SpecVersion -> SpecVersion -> Bool # | |
Eq LexWarningType Source # | |
Defined in Distribution.Fields.LexerMonad (==) :: LexWarningType -> LexWarningType -> Bool # (/=) :: LexWarningType -> LexWarningType -> Bool # | |
Eq License Source # | |
Eq ModuleName Source # | |
Defined in Distribution.ModuleName (==) :: ModuleName -> ModuleName -> Bool # (/=) :: ModuleName -> ModuleName -> Bool # | |
Eq Position Source # | |
Eq PWarnType Source # | |
Eq PWarning Source # | |
Eq License Source # | |
Eq LicenseExceptionId Source # | |
Defined in Distribution.SPDX.LicenseExceptionId (==) :: LicenseExceptionId -> LicenseExceptionId -> Bool # (/=) :: LicenseExceptionId -> LicenseExceptionId -> Bool # | |
Eq LicenseExpression Source # | |
Defined in Distribution.SPDX.LicenseExpression (==) :: LicenseExpression -> LicenseExpression -> Bool # (/=) :: LicenseExpression -> LicenseExpression -> Bool # | |
Eq SimpleLicenseExpression Source # | |
Defined in Distribution.SPDX.LicenseExpression | |
Eq LicenseId Source # | |
Eq LicenseListVersion Source # | |
Defined in Distribution.SPDX.LicenseListVersion (==) :: LicenseListVersion -> LicenseListVersion -> Bool # (/=) :: LicenseListVersion -> LicenseListVersion -> Bool # | |
Eq LicenseRef Source # | |
Defined in Distribution.SPDX.LicenseReference (==) :: LicenseRef -> LicenseRef -> Bool # (/=) :: LicenseRef -> LicenseRef -> Bool # | |
Eq Arch Source # | |
Eq OS Source # | |
Eq Platform Source # | |
Eq AbiDependency Source # | |
Defined in Distribution.Types.AbiDependency (==) :: AbiDependency -> AbiDependency -> Bool # (/=) :: AbiDependency -> AbiDependency -> Bool # | |
Eq AbiHash Source # | |
Eq Benchmark Source # | |
Eq BenchmarkInterface Source # | |
Defined in Distribution.Types.BenchmarkInterface (==) :: BenchmarkInterface -> BenchmarkInterface -> Bool # (/=) :: BenchmarkInterface -> BenchmarkInterface -> Bool # | |
Eq BenchmarkType Source # | |
Defined in Distribution.Types.BenchmarkType (==) :: BenchmarkType -> BenchmarkType -> Bool # (/=) :: BenchmarkType -> BenchmarkType -> Bool # | |
Eq BuildInfo Source # | |
Eq BuildType Source # | |
Eq Component Source # | |
Eq ComponentId Source # | |
Defined in Distribution.Types.ComponentId (==) :: ComponentId -> ComponentId -> Bool # (/=) :: ComponentId -> ComponentId -> Bool # | |
Eq ComponentName Source # | |
Defined in Distribution.Types.ComponentName (==) :: ComponentName -> ComponentName -> Bool # (/=) :: ComponentName -> ComponentName -> Bool # | |
Eq ComponentRequestedSpec Source # | |
Defined in Distribution.Types.ComponentRequestedSpec | |
Eq ConfVar Source # | |
Eq Dependency Source # | |
Defined in Distribution.Types.Dependency (==) :: Dependency -> Dependency -> Bool # (/=) :: Dependency -> Dependency -> Bool # | |
Eq DependencyMap Source # | |
Defined in Distribution.Types.DependencyMap (==) :: DependencyMap -> DependencyMap -> Bool # (/=) :: DependencyMap -> DependencyMap -> Bool # | |
Eq ExeDependency Source # | |
Defined in Distribution.Types.ExeDependency (==) :: ExeDependency -> ExeDependency -> Bool # (/=) :: ExeDependency -> ExeDependency -> Bool # | |
Eq Executable Source # | |
Defined in Distribution.Types.Executable (==) :: Executable -> Executable -> Bool # (/=) :: Executable -> Executable -> Bool # | |
Eq ExecutableScope Source # | |
Defined in Distribution.Types.ExecutableScope (==) :: ExecutableScope -> ExecutableScope -> Bool # (/=) :: ExecutableScope -> ExecutableScope -> Bool # | |
Eq ExposedModule Source # | |
Defined in Distribution.Types.ExposedModule (==) :: ExposedModule -> ExposedModule -> Bool # (/=) :: ExposedModule -> ExposedModule -> Bool # | |
Eq FlagAssignment Source # | |
Defined in Distribution.Types.Flag (==) :: FlagAssignment -> FlagAssignment -> Bool # (/=) :: FlagAssignment -> FlagAssignment -> Bool # | |
Eq FlagName Source # | |
Eq PackageFlag Source # | |
Defined in Distribution.Types.Flag (==) :: PackageFlag -> PackageFlag -> Bool # (/=) :: PackageFlag -> PackageFlag -> Bool # | |
Eq ForeignLib Source # | |
Defined in Distribution.Types.ForeignLib (==) :: ForeignLib -> ForeignLib -> Bool # (/=) :: ForeignLib -> ForeignLib -> Bool # | |
Eq LibVersionInfo Source # | |
Defined in Distribution.Types.ForeignLib (==) :: LibVersionInfo -> LibVersionInfo -> Bool # (/=) :: LibVersionInfo -> LibVersionInfo -> Bool # | |
Eq ForeignLibOption Source # | |
Defined in Distribution.Types.ForeignLibOption (==) :: ForeignLibOption -> ForeignLibOption -> Bool # (/=) :: ForeignLibOption -> ForeignLibOption -> Bool # | |
Eq ForeignLibType Source # | |
Defined in Distribution.Types.ForeignLibType (==) :: ForeignLibType -> ForeignLibType -> Bool # (/=) :: ForeignLibType -> ForeignLibType -> Bool # | |
Eq GenericPackageDescription Source # | |
Eq IncludeRenaming Source # | |
Defined in Distribution.Types.IncludeRenaming (==) :: IncludeRenaming -> IncludeRenaming -> Bool # (/=) :: IncludeRenaming -> IncludeRenaming -> Bool # | |
Eq InstalledPackageInfo Source # | |
Defined in Distribution.Types.InstalledPackageInfo (==) :: InstalledPackageInfo -> InstalledPackageInfo -> Bool # (/=) :: InstalledPackageInfo -> InstalledPackageInfo -> Bool # | |
Eq LegacyExeDependency Source # | |
Defined in Distribution.Types.LegacyExeDependency (==) :: LegacyExeDependency -> LegacyExeDependency -> Bool # (/=) :: LegacyExeDependency -> LegacyExeDependency -> Bool # | |
Eq Library Source # | |
Eq LibraryName Source # | |
Defined in Distribution.Types.LibraryName (==) :: LibraryName -> LibraryName -> Bool # (/=) :: LibraryName -> LibraryName -> Bool # | |
Eq LibraryVisibility Source # | |
Defined in Distribution.Types.LibraryVisibility (==) :: LibraryVisibility -> LibraryVisibility -> Bool # (/=) :: LibraryVisibility -> LibraryVisibility -> Bool # | |
Eq Mixin Source # | |
Eq Module Source # | |
Eq ModuleReexport Source # | |
Defined in Distribution.Types.ModuleReexport (==) :: ModuleReexport -> ModuleReexport -> Bool # (/=) :: ModuleReexport -> ModuleReexport -> Bool # | |
Eq ModuleRenaming Source # | |
Defined in Distribution.Types.ModuleRenaming (==) :: ModuleRenaming -> ModuleRenaming -> Bool # (/=) :: ModuleRenaming -> ModuleRenaming -> Bool # | |
Eq MungedPackageId Source # | |
Defined in Distribution.Types.MungedPackageId (==) :: MungedPackageId -> MungedPackageId -> Bool # (/=) :: MungedPackageId -> MungedPackageId -> Bool # | |
Eq MungedPackageName Source # | |
Defined in Distribution.Types.MungedPackageName (==) :: MungedPackageName -> MungedPackageName -> Bool # (/=) :: MungedPackageName -> MungedPackageName -> Bool # | |
Eq PackageDescription Source # | |
Defined in Distribution.Types.PackageDescription (==) :: PackageDescription -> PackageDescription -> Bool # (/=) :: PackageDescription -> PackageDescription -> Bool # | |
Eq PackageIdentifier Source # | |
Defined in Distribution.Types.PackageId (==) :: PackageIdentifier -> PackageIdentifier -> Bool # (/=) :: PackageIdentifier -> PackageIdentifier -> Bool # | |
Eq PackageName Source # | |
Defined in Distribution.Types.PackageName (==) :: PackageName -> PackageName -> Bool # (/=) :: PackageName -> PackageName -> Bool # | |
Eq PackageVersionConstraint Source # | |
Eq PkgconfigDependency Source # | |
Defined in Distribution.Types.PkgconfigDependency (==) :: PkgconfigDependency -> PkgconfigDependency -> Bool # (/=) :: PkgconfigDependency -> PkgconfigDependency -> Bool # | |
Eq PkgconfigName Source # | |
Defined in Distribution.Types.PkgconfigName (==) :: PkgconfigName -> PkgconfigName -> Bool # (/=) :: PkgconfigName -> PkgconfigName -> Bool # | |
Eq PkgconfigVersion Source # | |
Defined in Distribution.Types.PkgconfigVersion (==) :: PkgconfigVersion -> PkgconfigVersion -> Bool # (/=) :: PkgconfigVersion -> PkgconfigVersion -> Bool # | |
Eq PkgconfigVersionRange Source # | |
Defined in Distribution.Types.PkgconfigVersionRange (==) :: PkgconfigVersionRange -> PkgconfigVersionRange -> Bool # (/=) :: PkgconfigVersionRange -> PkgconfigVersionRange -> Bool # | |
Eq SetupBuildInfo Source # | |
Defined in Distribution.Types.SetupBuildInfo (==) :: SetupBuildInfo -> SetupBuildInfo -> Bool # (/=) :: SetupBuildInfo -> SetupBuildInfo -> Bool # | |
Eq KnownRepoType Source # | |
Defined in Distribution.Types.SourceRepo (==) :: KnownRepoType -> KnownRepoType -> Bool # (/=) :: KnownRepoType -> KnownRepoType -> Bool # | |
Eq RepoKind Source # | |
Eq RepoType Source # | |
Eq SourceRepo Source # | |
Defined in Distribution.Types.SourceRepo (==) :: SourceRepo -> SourceRepo -> Bool # (/=) :: SourceRepo -> SourceRepo -> Bool # | |
Eq TestSuite Source # | |
Eq TestSuiteInterface Source # | |
Defined in Distribution.Types.TestSuiteInterface (==) :: TestSuiteInterface -> TestSuiteInterface -> Bool # (/=) :: TestSuiteInterface -> TestSuiteInterface -> Bool # | |
Eq TestType Source # | |
Eq DefUnitId Source # | |
Eq UnitId Source # | |
Eq UnqualComponentName Source # | |
Defined in Distribution.Types.UnqualComponentName (==) :: UnqualComponentName -> UnqualComponentName -> Bool # (/=) :: UnqualComponentName -> UnqualComponentName -> Bool # | |
Eq Version Source # | |
Eq Bound Source # | |
Eq LowerBound Source # | |
Defined in Distribution.Types.VersionInterval (==) :: LowerBound -> LowerBound -> Bool # (/=) :: LowerBound -> LowerBound -> Bool # | |
Eq UpperBound Source # | |
Defined in Distribution.Types.VersionInterval (==) :: UpperBound -> UpperBound -> Bool # (/=) :: UpperBound -> UpperBound -> Bool # | |
Eq VersionInterval Source # | |
Defined in Distribution.Types.VersionInterval (==) :: VersionInterval -> VersionInterval -> Bool # (/=) :: VersionInterval -> VersionInterval -> Bool # | |
Eq VersionIntervals Source # | |
Defined in Distribution.Types.VersionInterval (==) :: VersionIntervals -> VersionIntervals -> Bool # (/=) :: VersionIntervals -> VersionIntervals -> Bool # | |
Eq Bound Source # | |
Eq LowerBound Source # | |
Defined in Distribution.Types.VersionInterval.Legacy (==) :: LowerBound -> LowerBound -> Bool # (/=) :: LowerBound -> LowerBound -> Bool # | |
Eq UpperBound Source # | |
Defined in Distribution.Types.VersionInterval.Legacy (==) :: UpperBound -> UpperBound -> Bool # (/=) :: UpperBound -> UpperBound -> Bool # | |
Eq VersionIntervals Source # | |
Defined in Distribution.Types.VersionInterval.Legacy (==) :: VersionIntervals -> VersionIntervals -> Bool # (/=) :: VersionIntervals -> VersionIntervals -> Bool # | |
Eq VersionRange Source # | |
Defined in Distribution.Types.VersionRange.Internal (==) :: VersionRange -> VersionRange -> Bool # (/=) :: VersionRange -> VersionRange -> Bool # | |
Eq ShortText Source # | |
Eq Structure Source # | |
Eq Extension Source # | |
Eq KnownExtension Source # | |
Defined in Language.Haskell.Extension (==) :: KnownExtension -> KnownExtension -> Bool # (/=) :: KnownExtension -> KnownExtension -> Bool # | |
Eq Language Source # | |
Eq ByteArray Source # | Since: base-4.17.0.0 |
Eq Timeout Source # | |
Eq ByteString Source # | |
Defined in Data.ByteString.Internal.Type (==) :: ByteString -> ByteString -> Bool # (/=) :: ByteString -> ByteString -> Bool # | |
Eq ByteString Source # | |
Defined in Data.ByteString.Lazy.Internal (==) :: ByteString -> ByteString -> Bool # (/=) :: ByteString -> ByteString -> Bool # | |
Eq ShortByteString Source # | |
Defined in Data.ByteString.Short.Internal (==) :: ShortByteString -> ShortByteString -> Bool # (/=) :: ShortByteString -> ShortByteString -> Bool # | |
Eq IntSet Source # | |
Eq BigNat # | |
Eq Void # | |
Eq Constr # | |
Eq ConstrRep # | |
Eq DataRep # | |
Eq Fixity # | |
Eq All # | |
Eq Any # | |
Eq SomeTypeRep # | |
Defined in GHC.Internal.Data.Typeable.Internal (==) :: SomeTypeRep -> SomeTypeRep -> Bool # (/=) :: SomeTypeRep -> SomeTypeRep -> Bool # | |
Eq Version # | |
Eq ErrorCall # | |
Eq ArithException # | |
Defined in GHC.Internal.Exception.Type (==) :: ArithException -> ArithException -> Bool # (/=) :: ArithException -> ArithException -> Bool # | |
Eq Fingerprint # | |
Defined in GHC.Internal.Fingerprint.Type (==) :: Fingerprint -> Fingerprint -> Bool # (/=) :: Fingerprint -> Fingerprint -> Bool # | |
Eq CBool # | |
Eq CChar # | |
Eq CClock # | |
Eq CDouble # | |
Eq CFloat # | |
Eq CInt # | |
Eq CIntMax # | |
Eq CIntPtr # | |
Eq CLLong # | |
Eq CLong # | |
Eq CPtrdiff # | |
Eq CSChar # | |
Eq CSUSeconds # | |
Defined in GHC.Internal.Foreign.C.Types (==) :: CSUSeconds -> CSUSeconds -> Bool # (/=) :: CSUSeconds -> CSUSeconds -> Bool # | |
Eq CShort # | |
Eq CSigAtomic # | |
Defined in GHC.Internal.Foreign.C.Types (==) :: CSigAtomic -> CSigAtomic -> Bool # (/=) :: CSigAtomic -> CSigAtomic -> Bool # | |
Eq CSize # | |
Eq CTime # | |
Eq CUChar # | |
Eq CUInt # | |
Eq CUIntMax # | |
Eq CUIntPtr # | |
Eq CULLong # | |
Eq CULong # | |
Eq CUSeconds # | |
Eq CUShort # | |
Eq CWchar # | |
Eq ForeignSrcLang # | |
Eq Associativity # | |
Defined in GHC.Internal.Generics (==) :: Associativity -> Associativity -> Bool # (/=) :: Associativity -> Associativity -> Bool # | |
Eq DecidedStrictness # | |
Defined in GHC.Internal.Generics (==) :: DecidedStrictness -> DecidedStrictness -> Bool # (/=) :: DecidedStrictness -> DecidedStrictness -> Bool # | |
Eq Fixity # | |
Eq SourceStrictness # | |
Defined in GHC.Internal.Generics (==) :: SourceStrictness -> SourceStrictness -> Bool # (/=) :: SourceStrictness -> SourceStrictness -> Bool # | |
Eq SourceUnpackedness # | |
Defined in GHC.Internal.Generics (==) :: SourceUnpackedness -> SourceUnpackedness -> Bool # (/=) :: SourceUnpackedness -> SourceUnpackedness -> Bool # | |
Eq MaskingState # | |
Defined in GHC.Internal.IO (==) :: MaskingState -> MaskingState -> Bool # (/=) :: MaskingState -> MaskingState -> Bool # | |
Eq ArrayException # | |
Defined in GHC.Internal.IO.Exception (==) :: ArrayException -> ArrayException -> Bool # (/=) :: ArrayException -> ArrayException -> Bool # | |
Eq AsyncException # | |
Defined in GHC.Internal.IO.Exception (==) :: AsyncException -> AsyncException -> Bool # (/=) :: AsyncException -> AsyncException -> Bool # | |
Eq ExitCode # | |
Eq IOErrorType # | |
Defined in GHC.Internal.IO.Exception (==) :: IOErrorType -> IOErrorType -> Bool # (/=) :: IOErrorType -> IOErrorType -> Bool # | |
Eq IOException # | |
Defined in GHC.Internal.IO.Exception (==) :: IOException -> IOException -> Bool # (/=) :: IOException -> IOException -> Bool # | |
Eq HandlePosn # | |
Defined in GHC.Internal.IO.Handle (==) :: HandlePosn -> HandlePosn -> Bool # (/=) :: HandlePosn -> HandlePosn -> Bool # | |
Eq BufferMode # | |
Defined in GHC.Internal.IO.Handle.Types (==) :: BufferMode -> BufferMode -> Bool # (/=) :: BufferMode -> BufferMode -> Bool # | |
Eq Handle # | |
Eq Newline # | |
Eq NewlineMode # | |
Defined in GHC.Internal.IO.Handle.Types (==) :: NewlineMode -> NewlineMode -> Bool # (/=) :: NewlineMode -> NewlineMode -> Bool # | |
Eq IOMode # | |
Eq Int16 # | |
Eq Int32 # | |
Eq Int64 # | |
Eq Int8 # | |
Eq Extension # | |
Eq SrcLoc # | |
Eq AnnLookup # | |
Eq AnnTarget # | |
Eq Bang # | |
Eq BndrVis # | |
Eq Body # | |
Eq Bytes # | |
Eq Callconv # | |
Eq Clause # | |
Eq Con # | |
Eq Dec # | |
Eq DecidedStrictness # | |
Eq DerivClause # | |
Eq DerivStrategy # | |
Eq DocLoc # | |
Eq Exp # | |
Eq FamilyResultSig # | |
Eq Fixity # | |
Eq FixityDirection # | |
Eq Foreign # | |
Eq FunDep # | |
Eq Guard # | |
Eq Info # | |
Eq InjectivityAnn # | |
Eq Inline # | |
Eq Lit # | |
Eq Loc # | |
Eq Match # | |
Eq ModName # | |
Eq Module # | |
Eq ModuleInfo # | |
Eq Name # | |
Eq NameFlavour # | |
Eq NameSpace # | |
Eq NamespaceSpecifier # | |
Eq OccName # | |
Eq Overlap # | |
Eq Pat # | |
Eq PatSynArgs # | |
Eq PatSynDir # | |
Eq Phases # | |
Eq PkgName # | |
Eq Pragma # | |
Eq Range # | |
Eq Role # | |
Eq RuleBndr # | |
Eq RuleMatch # | |
Eq Safety # | |
Eq SourceStrictness # | |
Eq SourceUnpackedness # | |
Eq Specificity # | |
Eq Stmt # | |
Eq TyLit # | |
Eq TySynEqn # | |
Eq Type # | |
Eq TypeFamilyHead # | |
Eq Lexeme # | |
Eq Number # | |
Eq SomeChar # | |
Eq SomeSymbol # | |
Defined in GHC.Internal.TypeLits (==) :: SomeSymbol -> SomeSymbol -> Bool # (/=) :: SomeSymbol -> SomeSymbol -> Bool # | |
Eq GeneralCategory # | |
Defined in GHC.Internal.Unicode (==) :: GeneralCategory -> GeneralCategory -> Bool # (/=) :: GeneralCategory -> GeneralCategory -> Bool # | |
Eq Word16 # | |
Eq Word32 # | |
Eq Word64 # | |
Eq Word8 # | |
Eq Module # | |
Eq Ordering # | |
Eq TrName # | |
Eq TyCon # | |
Eq OsChar # | |
Eq OsString # | |
Eq PosixChar # | |
Eq PosixString # | |
Defined in System.OsString.Internal.Types (==) :: PosixString -> PosixString -> Bool # (/=) :: PosixString -> PosixString -> Bool # | |
Eq WindowsChar # | |
Defined in System.OsString.Internal.Types (==) :: WindowsChar -> WindowsChar -> Bool # (/=) :: WindowsChar -> WindowsChar -> Bool # | |
Eq WindowsString # | |
Defined in System.OsString.Internal.Types (==) :: WindowsString -> WindowsString -> Bool # (/=) :: WindowsString -> WindowsString -> Bool # | |
Eq Message Source # | |
Eq ParseError Source # | |
Defined in Text.Parsec.Error (==) :: ParseError -> ParseError -> Bool # (/=) :: ParseError -> ParseError -> Bool # | |
Eq SourcePos Source # | |
Eq Mode Source # | |
Eq Style Source # | |
Eq TextDetails Source # | |
Defined in Text.PrettyPrint.Annotated.HughesPJ (==) :: TextDetails -> TextDetails -> Bool # (/=) :: TextDetails -> TextDetails -> Bool # | |
Eq PrettyLevel Source # | |
Defined in Text.PrettyPrint.Annotated.HughesPJClass (==) :: PrettyLevel -> PrettyLevel -> Bool # (/=) :: PrettyLevel -> PrettyLevel -> Bool # | |
Eq Doc Source # | |
Eq PrettyLevel Source # | |
Defined in Text.PrettyPrint.HughesPJClass (==) :: PrettyLevel -> PrettyLevel -> Bool # (/=) :: PrettyLevel -> PrettyLevel -> Bool # | |
Eq UnicodeException Source # | |
Defined in Data.Text.Encoding.Error (==) :: UnicodeException -> UnicodeException -> Bool # (/=) :: UnicodeException -> UnicodeException -> Bool # | |
Eq I8 Source # | |
Eq Builder Source # | |
Eq PartialUtf8CodePoint Source # | |
Eq Utf8State Source # | |
Eq DecoderState Source # | |
Defined in Data.Text.Internal.Encoding.Utf8 (==) :: DecoderState -> DecoderState -> Bool # (/=) :: DecoderState -> DecoderState -> Bool # | |
Eq Size Source # | |
Eq CalendarDiffDays Source # | |
Defined in Data.Time.Calendar.CalendarDiffDays (==) :: CalendarDiffDays -> CalendarDiffDays -> Bool # (/=) :: CalendarDiffDays -> CalendarDiffDays -> Bool # | |
Eq Day Source # | |
Eq Month Source # | |
Eq Quarter Source # | |
Eq QuarterOfYear Source # | |
Defined in Data.Time.Calendar.Quarter (==) :: QuarterOfYear -> QuarterOfYear -> Bool # (/=) :: QuarterOfYear -> QuarterOfYear -> Bool # | |
Eq DayOfWeek Source # | |
Eq FirstWeekType Source # | |
Defined in Data.Time.Calendar.WeekDate (==) :: FirstWeekType -> FirstWeekType -> Bool # (/=) :: FirstWeekType -> FirstWeekType -> Bool # | |
Eq DiffTime Source # | |
Eq NominalDiffTime Source # | |
Defined in Data.Time.Clock.Internal.NominalDiffTime (==) :: NominalDiffTime -> NominalDiffTime -> Bool # (/=) :: NominalDiffTime -> NominalDiffTime -> Bool # | |
Eq SystemTime Source # | |
Defined in Data.Time.Clock.Internal.SystemTime (==) :: SystemTime -> SystemTime -> Bool # (/=) :: SystemTime -> SystemTime -> Bool # | |
Eq UTCTime Source # | |
Eq UniversalTime Source # | |
Defined in Data.Time.Clock.Internal.UniversalTime (==) :: UniversalTime -> UniversalTime -> Bool # (/=) :: UniversalTime -> UniversalTime -> Bool # | |
Eq CalendarDiffTime Source # | |
Defined in Data.Time.LocalTime.Internal.CalendarDiffTime (==) :: CalendarDiffTime -> CalendarDiffTime -> Bool # (/=) :: CalendarDiffTime -> CalendarDiffTime -> Bool # | |
Eq LocalTime Source # | |
Eq TimeOfDay Source # | |
Eq TimeZone Source # | |
Eq Integer # | |
Eq Natural # | |
Eq () # | |
Eq Bool # | |
Eq Char # | |
Eq Double # | |
Eq Float # | |
Eq Int # | |
Eq Word # | |
(Eq (Key a), Eq a) => Eq (Graph a) Source # | |
Eq a => Eq (NonEmptySet a) Source # | |
Defined in Distribution.Compat.NonEmptySet (==) :: NonEmptySet a -> NonEmptySet a -> Bool # (/=) :: NonEmptySet a -> NonEmptySet a -> Bool # | |
Eq a => Eq (First' a) Source # | |
Eq a => Eq (Last' a) Source # | |
Eq a => Eq (Option' a) Source # | |
Eq v => Eq (PerCompilerFlavor v) Source # | |
Defined in Distribution.Compiler (==) :: PerCompilerFlavor v -> PerCompilerFlavor v -> Bool # (/=) :: PerCompilerFlavor v -> PerCompilerFlavor v -> Bool # | |
Eq ann => Eq (NamelessField ann) Source # | |
Defined in Distribution.FieldGrammar.Parsec (==) :: NamelessField ann -> NamelessField ann -> Bool # (/=) :: NamelessField ann -> NamelessField ann -> Bool # | |
Eq ann => Eq (Section ann) Source # | |
Eq ann => Eq (Field ann) Source # | |
Eq ann => Eq (FieldLine ann) Source # | |
Eq ann => Eq (Name ann) Source # | |
Eq ann => Eq (SectionArg ann) Source # | |
Defined in Distribution.Fields.Field (==) :: SectionArg ann -> SectionArg ann -> Bool # (/=) :: SectionArg ann -> SectionArg ann -> Bool # | |
Eq c => Eq (Condition c) Source # | |
Eq a => Eq (VersionRangeF a) Source # | |
Defined in Distribution.Types.VersionRange.Internal (==) :: VersionRangeF a -> VersionRangeF a -> Bool # (/=) :: VersionRangeF a -> VersionRangeF a -> Bool # | |
Eq (Chan a) Source # | Since: base-4.4.0.0 |
Eq (MutableByteArray s) Source # | Since: base-4.17.0.0 |
Defined in Data.Array.Byte (==) :: MutableByteArray s -> MutableByteArray s -> Bool # (/=) :: MutableByteArray s -> MutableByteArray s -> Bool # | |
Eq a => Eq (Complex a) Source # | Since: base-2.1 |
Eq a => Eq (First a) Source # | Since: base-4.9.0.0 |
Eq a => Eq (Last a) Source # | Since: base-4.9.0.0 |
Eq a => Eq (Max a) Source # | Since: base-4.9.0.0 |
Eq a => Eq (Min a) Source # | Since: base-4.9.0.0 |
Eq m => Eq (WrappedMonoid m) Source # | Since: base-4.9.0.0 |
Defined in Data.Semigroup (==) :: WrappedMonoid m -> WrappedMonoid m -> Bool # (/=) :: WrappedMonoid m -> WrappedMonoid m -> Bool # | |
Eq vertex => Eq (SCC vertex) Source # | Since: containers-0.5.9 |
Eq a => Eq (IntMap a) Source # | |
Eq a => Eq (Seq a) Source # | |
Eq a => Eq (ViewL a) Source # | |
Eq a => Eq (ViewR a) Source # | |
Eq a => Eq (Intersection a) Source # | |
Defined in Data.Set.Internal (==) :: Intersection a -> Intersection a -> Bool # (/=) :: Intersection a -> Intersection a -> Bool # | |
Eq a => Eq (Set a) Source # | |
Eq a => Eq (Tree a) Source # | |
Eq a => Eq (NonEmpty a) # | |
Eq a => Eq (Identity a) # | |
Eq a => Eq (First a) # | |
Eq a => Eq (Last a) # | |
Eq a => Eq (Down a) # | |
Eq a => Eq (Dual a) # | |
Eq a => Eq (Product a) # | |
Eq a => Eq (Sum a) # | |
Eq (ForeignPtr a) # | |
Defined in GHC.Internal.ForeignPtr (==) :: ForeignPtr a -> ForeignPtr a -> Bool # (/=) :: ForeignPtr a -> ForeignPtr a -> Bool # | |
Eq a => Eq (ZipList a) # | |
Eq p => Eq (Par1 p) # | |
Eq (FunPtr a) # | |
Eq (Ptr a) # | |
Eq a => Eq (Ratio a) # | |
Eq flag => Eq (TyVarBndr flag) # | |
Eq (SChar c) # | |
Eq (SSymbol s) # | |
Eq a => Eq (AnnotDetails a) Source # | |
Defined in Text.PrettyPrint.Annotated.HughesPJ (==) :: AnnotDetails a -> AnnotDetails a -> Bool # (/=) :: AnnotDetails a -> AnnotDetails a -> Bool # | |
Eq (Doc a) Source # | |
Eq a => Eq (Span a) Source # | |
Eq a => Eq (Stream a) Source # | |
Eq a => Eq (Maybe a) # | |
Eq a => Eq (Solo a) # | |
Eq a => Eq [a] # | |
(Eq a, Eq k) => Eq (Node k a) Source # | |
(Ix ix, Eq e, IArray UArray e) => Eq (UArray ix e) Source # | |
Eq (IOUArray i e) Source # | |
Eq (Fixed a) Source # | Since: base-2.1 |
Eq a => Eq (Arg a b) Source # | Note that
Since: base-4.9.0.0 |
(Eq k, Eq a) => Eq (Map k a) Source # | |
(Ix i, Eq e) => Eq (Array i e) # | |
(Eq a, Eq b) => Eq (Either a b) # | |
Eq (Proxy s) # | |
Eq (TypeRep a) # | |
Eq (U1 p) # | |
Eq (V1 p) # | |
(Eq1 f, Eq a) => Eq (Lift f a) Source # | |
(Eq1 m, Eq a) => Eq (MaybeT m a) Source # | |
(Eq a, Eq b) => Eq (a, b) # | |
(Eq v, Eq a, Eq c) => Eq (CondBranch v c a) Source # | |
Defined in Distribution.Types.CondTree (==) :: CondBranch v c a -> CondBranch v c a -> Bool # (/=) :: CondBranch v c a -> CondBranch v c a -> Bool # | |
(Eq a, Eq c, Eq v) => Eq (CondTree v c a) Source # | |
Eq (SymbolicPathX allowAbsolute from to) Source # | |
Defined in Distribution.Utils.Path (==) :: SymbolicPathX allowAbsolute from to -> SymbolicPathX allowAbsolute from to -> Bool # (/=) :: SymbolicPathX allowAbsolute from to -> SymbolicPathX allowAbsolute from to -> Bool # | |
Eq (STUArray s i e) Source # | |
Eq (STArray s i e) # | |
Eq a => Eq (Const a b) # | |
Eq (f a) => Eq (Ap f a) # | |
Eq (f a) => Eq (Alt f a) # | |
Eq (OrderingI a b) # | |
(Generic1 f, Eq (Rep1 f a)) => Eq (Generically1 f a) # | |
Defined in GHC.Internal.Generics (==) :: Generically1 f a -> Generically1 f a -> Bool # (/=) :: Generically1 f a -> Generically1 f a -> Bool # | |
Eq (f p) => Eq (Rec1 f p) # | |
Eq (URec (Ptr ()) p) # | |
Eq (URec Char p) # | |
Eq (URec Double p) # | |
Eq (URec Float p) # | |
Eq (URec Int p) # | |
Eq (URec Word p) # | |
(Eq1 f, Eq a) => Eq (Backwards f a) Source # | |
(Eq e, Eq1 m, Eq a) => Eq (ExceptT e m a) Source # | |
(Eq1 f, Eq a) => Eq (IdentityT f a) Source # | |
(Eq w, Eq1 m, Eq a) => Eq (WriterT w m a) Source # | |
(Eq w, Eq1 m, Eq a) => Eq (WriterT w m a) Source # | |
Eq a => Eq (Constant a b) Source # | |
(Eq1 f, Eq a) => Eq (Reverse f a) Source # | |
(Eq a, Eq b, Eq c) => Eq (a, b, c) # | |
(Eq (f a), Eq (g a)) => Eq (Product f g a) Source # | Since: base-4.18.0.0 |
(Eq (f a), Eq (g a)) => Eq (Sum f g a) Source # | Since: base-4.18.0.0 |
(Eq (f p), Eq (g p)) => Eq ((f :*: g) p) # | |
(Eq (f p), Eq (g p)) => Eq ((f :+: g) p) # | |
Eq c => Eq (K1 i c p) # | |
(Eq a, Eq b, Eq c, Eq d) => Eq (a, b, c, d) # | |
Eq (f (g a)) => Eq (Compose f g a) Source # | Since: base-4.18.0.0 |
Eq (f (g p)) => Eq ((f :.: g) p) # | |
Eq (f p) => Eq (M1 i c f p) # | |
(Eq a, Eq b, Eq c, Eq d, Eq e) => Eq (a, b, c, d, e) # | |
(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f) => Eq (a, b, c, d, e, f) # | |
(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g) => Eq (a, b, c, d, e, f, g) # | |
(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h) => Eq (a, b, c, d, e, f, g, h) # | |
(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i) => Eq (a, b, c, d, e, f, g, h, i) # | |
(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j) => Eq (a, b, c, d, e, f, g, h, i, j) # | |
(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j, Eq k) => Eq (a, b, c, d, e, f, g, h, i, j, k) # | |
(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j, Eq k, Eq l) => Eq (a, b, c, d, e, f, g, h, i, j, k, l) # | |
(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j, Eq k, Eq l, Eq m) => Eq (a, b, c, d, e, f, g, h, i, j, k, l, m) # | |
(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j, Eq k, Eq l, Eq m, Eq n) => Eq (a, b, c, d, e, f, g, h, i, j, k, l, m, n) # | |
(Eq a, Eq b, Eq c, Eq d, Eq e, Eq f, Eq g, Eq h, Eq i, Eq j, Eq k, Eq l, Eq m, Eq n, Eq o) => Eq (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) # | |
Instances
Ord OpenModule Source # | |
Defined in Distribution.Backpack compare :: OpenModule -> OpenModule -> Ordering # (<) :: OpenModule -> OpenModule -> Bool # (<=) :: OpenModule -> OpenModule -> Bool # (>) :: OpenModule -> OpenModule -> Bool # (>=) :: OpenModule -> OpenModule -> Bool # max :: OpenModule -> OpenModule -> OpenModule # min :: OpenModule -> OpenModule -> OpenModule # | |
Ord OpenUnitId Source # | |
Defined in Distribution.Backpack compare :: OpenUnitId -> OpenUnitId -> Ordering # (<) :: OpenUnitId -> OpenUnitId -> Bool # (<=) :: OpenUnitId -> OpenUnitId -> Bool # (>) :: OpenUnitId -> OpenUnitId -> Bool # (>=) :: OpenUnitId -> OpenUnitId -> Bool # max :: OpenUnitId -> OpenUnitId -> OpenUnitId # min :: OpenUnitId -> OpenUnitId -> OpenUnitId # | |
Ord CabalSpecVersion Source # | |
Defined in Distribution.CabalSpecVersion compare :: CabalSpecVersion -> CabalSpecVersion -> Ordering # (<) :: CabalSpecVersion -> CabalSpecVersion -> Bool # (<=) :: CabalSpecVersion -> CabalSpecVersion -> Bool # (>) :: CabalSpecVersion -> CabalSpecVersion -> Bool # (>=) :: CabalSpecVersion -> CabalSpecVersion -> Bool # max :: CabalSpecVersion -> CabalSpecVersion -> CabalSpecVersion # min :: CabalSpecVersion -> CabalSpecVersion -> CabalSpecVersion # | |
Ord CompilerFlavor Source # | |
Defined in Distribution.Compiler compare :: CompilerFlavor -> CompilerFlavor -> Ordering # (<) :: CompilerFlavor -> CompilerFlavor -> Bool # (<=) :: CompilerFlavor -> CompilerFlavor -> Bool # (>) :: CompilerFlavor -> CompilerFlavor -> Bool # (>=) :: CompilerFlavor -> CompilerFlavor -> Bool # max :: CompilerFlavor -> CompilerFlavor -> CompilerFlavor # min :: CompilerFlavor -> CompilerFlavor -> CompilerFlavor # | |
Ord CompilerId Source # | |
Defined in Distribution.Compiler compare :: CompilerId -> CompilerId -> Ordering # (<) :: CompilerId -> CompilerId -> Bool # (<=) :: CompilerId -> CompilerId -> Bool # (>) :: CompilerId -> CompilerId -> Bool # (>=) :: CompilerId -> CompilerId -> Bool # max :: CompilerId -> CompilerId -> CompilerId # min :: CompilerId -> CompilerId -> CompilerId # | |
Ord LexWarningType Source # | |
Defined in Distribution.Fields.LexerMonad compare :: LexWarningType -> LexWarningType -> Ordering # (<) :: LexWarningType -> LexWarningType -> Bool # (<=) :: LexWarningType -> LexWarningType -> Bool # (>) :: LexWarningType -> LexWarningType -> Bool # (>=) :: LexWarningType -> LexWarningType -> Bool # max :: LexWarningType -> LexWarningType -> LexWarningType # min :: LexWarningType -> LexWarningType -> LexWarningType # | |
Ord License Source # | |
Ord ModuleName Source # | |
Defined in Distribution.ModuleName compare :: ModuleName -> ModuleName -> Ordering # (<) :: ModuleName -> ModuleName -> Bool # (<=) :: ModuleName -> ModuleName -> Bool # (>) :: ModuleName -> ModuleName -> Bool # (>=) :: ModuleName -> ModuleName -> Bool # max :: ModuleName -> ModuleName -> ModuleName # min :: ModuleName -> ModuleName -> ModuleName # | |
Ord Position Source # | |
Defined in Distribution.Parsec.Position | |
Ord PWarnType Source # | |
Defined in Distribution.Parsec.Warning | |
Ord PWarning Source # | |
Defined in Distribution.Parsec.Warning | |
Ord License Source # | |
Ord LicenseExceptionId Source # | |
Defined in Distribution.SPDX.LicenseExceptionId compare :: LicenseExceptionId -> LicenseExceptionId -> Ordering # (<) :: LicenseExceptionId -> LicenseExceptionId -> Bool # (<=) :: LicenseExceptionId -> LicenseExceptionId -> Bool # (>) :: LicenseExceptionId -> LicenseExceptionId -> Bool # (>=) :: LicenseExceptionId -> LicenseExceptionId -> Bool # max :: LicenseExceptionId -> LicenseExceptionId -> LicenseExceptionId # min :: LicenseExceptionId -> LicenseExceptionId -> LicenseExceptionId # | |
Ord LicenseExpression Source # | |
Defined in Distribution.SPDX.LicenseExpression compare :: LicenseExpression -> LicenseExpression -> Ordering # (<) :: LicenseExpression -> LicenseExpression -> Bool # (<=) :: LicenseExpression -> LicenseExpression -> Bool # (>) :: LicenseExpression -> LicenseExpression -> Bool # (>=) :: LicenseExpression -> LicenseExpression -> Bool # max :: LicenseExpression -> LicenseExpression -> LicenseExpression # min :: LicenseExpression -> LicenseExpression -> LicenseExpression # | |
Ord SimpleLicenseExpression Source # | |
Defined in Distribution.SPDX.LicenseExpression compare :: SimpleLicenseExpression -> SimpleLicenseExpression -> Ordering # (<) :: SimpleLicenseExpression -> SimpleLicenseExpression -> Bool # (<=) :: SimpleLicenseExpression -> SimpleLicenseExpression -> Bool # (>) :: SimpleLicenseExpression -> SimpleLicenseExpression -> Bool # (>=) :: SimpleLicenseExpression -> SimpleLicenseExpression -> Bool # max :: SimpleLicenseExpression -> SimpleLicenseExpression -> SimpleLicenseExpression # min :: SimpleLicenseExpression -> SimpleLicenseExpression -> SimpleLicenseExpression # | |
Ord LicenseId Source # | |
Defined in Distribution.SPDX.LicenseId | |
Ord LicenseListVersion Source # | |
Defined in Distribution.SPDX.LicenseListVersion compare :: LicenseListVersion -> LicenseListVersion -> Ordering # (<) :: LicenseListVersion -> LicenseListVersion -> Bool # (<=) :: LicenseListVersion -> LicenseListVersion -> Bool # (>) :: LicenseListVersion -> LicenseListVersion -> Bool # (>=) :: LicenseListVersion -> LicenseListVersion -> Bool # max :: LicenseListVersion -> LicenseListVersion -> LicenseListVersion # min :: LicenseListVersion -> LicenseListVersion -> LicenseListVersion # | |
Ord LicenseRef Source # | |
Defined in Distribution.SPDX.LicenseReference compare :: LicenseRef -> LicenseRef -> Ordering # (<) :: LicenseRef -> LicenseRef -> Bool # (<=) :: LicenseRef -> LicenseRef -> Bool # (>) :: LicenseRef -> LicenseRef -> Bool # (>=) :: LicenseRef -> LicenseRef -> Bool # max :: LicenseRef -> LicenseRef -> LicenseRef # min :: LicenseRef -> LicenseRef -> LicenseRef # | |
Ord Arch Source # | |
Ord OS Source # | |
Ord Platform Source # | |
Defined in Distribution.System | |
Ord Benchmark Source # | |
Defined in Distribution.Types.Benchmark | |
Ord BenchmarkInterface Source # | |
Defined in Distribution.Types.BenchmarkInterface compare :: BenchmarkInterface -> BenchmarkInterface -> Ordering # (<) :: BenchmarkInterface -> BenchmarkInterface -> Bool # (<=) :: BenchmarkInterface -> BenchmarkInterface -> Bool # (>) :: BenchmarkInterface -> BenchmarkInterface -> Bool # (>=) :: BenchmarkInterface -> BenchmarkInterface -> Bool # max :: BenchmarkInterface -> BenchmarkInterface -> BenchmarkInterface # min :: BenchmarkInterface -> BenchmarkInterface -> BenchmarkInterface # | |
Ord BenchmarkType Source # | |
Defined in Distribution.Types.BenchmarkType compare :: BenchmarkType -> BenchmarkType -> Ordering # (<) :: BenchmarkType -> BenchmarkType -> Bool # (<=) :: BenchmarkType -> BenchmarkType -> Bool # (>) :: BenchmarkType -> BenchmarkType -> Bool # (>=) :: BenchmarkType -> BenchmarkType -> Bool # max :: BenchmarkType -> BenchmarkType -> BenchmarkType # min :: BenchmarkType -> BenchmarkType -> BenchmarkType # | |
Ord BuildInfo Source # | |
Defined in Distribution.Types.BuildInfo | |
Ord BuildType Source # | |
Defined in Distribution.Types.BuildType | |
Ord ComponentId Source # | |
Defined in Distribution.Types.ComponentId compare :: ComponentId -> ComponentId -> Ordering # (<) :: ComponentId -> ComponentId -> Bool # (<=) :: ComponentId -> ComponentId -> Bool # (>) :: ComponentId -> ComponentId -> Bool # (>=) :: ComponentId -> ComponentId -> Bool # max :: ComponentId -> ComponentId -> ComponentId # min :: ComponentId -> ComponentId -> ComponentId # | |
Ord ComponentName Source # | |
Defined in Distribution.Types.ComponentName compare :: ComponentName -> ComponentName -> Ordering # (<) :: ComponentName -> ComponentName -> Bool # (<=) :: ComponentName -> ComponentName -> Bool # (>) :: ComponentName -> ComponentName -> Bool # (>=) :: ComponentName -> ComponentName -> Bool # max :: ComponentName -> ComponentName -> ComponentName # min :: ComponentName -> ComponentName -> ComponentName # | |
Ord Dependency Source # | |
Defined in Distribution.Types.Dependency compare :: Dependency -> Dependency -> Ordering # (<) :: Dependency -> Dependency -> Bool # (<=) :: Dependency -> Dependency -> Bool # (>) :: Dependency -> Dependency -> Bool # (>=) :: Dependency -> Dependency -> Bool # max :: Dependency -> Dependency -> Dependency # min :: Dependency -> Dependency -> Dependency # | |
Ord ExeDependency Source # | |
Defined in Distribution.Types.ExeDependency compare :: ExeDependency -> ExeDependency -> Ordering # (<) :: ExeDependency -> ExeDependency -> Bool # (<=) :: ExeDependency -> ExeDependency -> Bool # (>) :: ExeDependency -> ExeDependency -> Bool # (>=) :: ExeDependency -> ExeDependency -> Bool # max :: ExeDependency -> ExeDependency -> ExeDependency # min :: ExeDependency -> ExeDependency -> ExeDependency # | |
Ord Executable Source # | |
Defined in Distribution.Types.Executable compare :: Executable -> Executable -> Ordering # (<) :: Executable -> Executable -> Bool # (<=) :: Executable -> Executable -> Bool # (>) :: Executable -> Executable -> Bool # (>=) :: Executable -> Executable -> Bool # max :: Executable -> Executable -> Executable # min :: Executable -> Executable -> Executable # | |
Ord ExecutableScope Source # | |
Defined in Distribution.Types.ExecutableScope compare :: ExecutableScope -> ExecutableScope -> Ordering # (<) :: ExecutableScope -> ExecutableScope -> Bool # (<=) :: ExecutableScope -> ExecutableScope -> Bool # (>) :: ExecutableScope -> ExecutableScope -> Bool # (>=) :: ExecutableScope -> ExecutableScope -> Bool # max :: ExecutableScope -> ExecutableScope -> ExecutableScope # min :: ExecutableScope -> ExecutableScope -> ExecutableScope # | |
Ord FlagAssignment Source # | |
Defined in Distribution.Types.Flag compare :: FlagAssignment -> FlagAssignment -> Ordering # (<) :: FlagAssignment -> FlagAssignment -> Bool # (<=) :: FlagAssignment -> FlagAssignment -> Bool # (>) :: FlagAssignment -> FlagAssignment -> Bool # (>=) :: FlagAssignment -> FlagAssignment -> Bool # max :: FlagAssignment -> FlagAssignment -> FlagAssignment # min :: FlagAssignment -> FlagAssignment -> FlagAssignment # | |
Ord FlagName Source # | |
Defined in Distribution.Types.Flag | |
Ord ForeignLib Source # | |
Defined in Distribution.Types.ForeignLib compare :: ForeignLib -> ForeignLib -> Ordering # (<) :: ForeignLib -> ForeignLib -> Bool # (<=) :: ForeignLib -> ForeignLib -> Bool # (>) :: ForeignLib -> ForeignLib -> Bool # (>=) :: ForeignLib -> ForeignLib -> Bool # max :: ForeignLib -> ForeignLib -> ForeignLib # min :: ForeignLib -> ForeignLib -> ForeignLib # | |
Ord LibVersionInfo Source # | |
Defined in Distribution.Types.ForeignLib compare :: LibVersionInfo -> LibVersionInfo -> Ordering # (<) :: LibVersionInfo -> LibVersionInfo -> Bool # (<=) :: LibVersionInfo -> LibVersionInfo -> Bool # (>) :: LibVersionInfo -> LibVersionInfo -> Bool # (>=) :: LibVersionInfo -> LibVersionInfo -> Bool # max :: LibVersionInfo -> LibVersionInfo -> LibVersionInfo # min :: LibVersionInfo -> LibVersionInfo -> LibVersionInfo # | |
Ord ForeignLibOption Source # | |
Defined in Distribution.Types.ForeignLibOption compare :: ForeignLibOption -> ForeignLibOption -> Ordering # (<) :: ForeignLibOption -> ForeignLibOption -> Bool # (<=) :: ForeignLibOption -> ForeignLibOption -> Bool # (>) :: ForeignLibOption -> ForeignLibOption -> Bool # (>=) :: ForeignLibOption -> ForeignLibOption -> Bool # max :: ForeignLibOption -> ForeignLibOption -> ForeignLibOption # min :: ForeignLibOption -> ForeignLibOption -> ForeignLibOption # | |
Ord ForeignLibType Source # | |
Defined in Distribution.Types.ForeignLibType compare :: ForeignLibType -> ForeignLibType -> Ordering # (<) :: ForeignLibType -> ForeignLibType -> Bool # (<=) :: ForeignLibType -> ForeignLibType -> Bool # (>) :: ForeignLibType -> ForeignLibType -> Bool # (>=) :: ForeignLibType -> ForeignLibType -> Bool # max :: ForeignLibType -> ForeignLibType -> ForeignLibType # min :: ForeignLibType -> ForeignLibType -> ForeignLibType # | |
Ord IncludeRenaming Source # | |
Defined in Distribution.Types.IncludeRenaming compare :: IncludeRenaming -> IncludeRenaming -> Ordering # (<) :: IncludeRenaming -> IncludeRenaming -> Bool # (<=) :: IncludeRenaming -> IncludeRenaming -> Bool # (>) :: IncludeRenaming -> IncludeRenaming -> Bool # (>=) :: IncludeRenaming -> IncludeRenaming -> Bool # max :: IncludeRenaming -> IncludeRenaming -> IncludeRenaming # min :: IncludeRenaming -> IncludeRenaming -> IncludeRenaming # | |
Ord LegacyExeDependency Source # | |
Defined in Distribution.Types.LegacyExeDependency compare :: LegacyExeDependency -> LegacyExeDependency -> Ordering # (<) :: LegacyExeDependency -> LegacyExeDependency -> Bool # (<=) :: LegacyExeDependency -> LegacyExeDependency -> Bool # (>) :: LegacyExeDependency -> LegacyExeDependency -> Bool # (>=) :: LegacyExeDependency -> LegacyExeDependency -> Bool # max :: LegacyExeDependency -> LegacyExeDependency -> LegacyExeDependency # min :: LegacyExeDependency -> LegacyExeDependency -> LegacyExeDependency # | |
Ord Library Source # | |
Ord LibraryName Source # | |
Defined in Distribution.Types.LibraryName compare :: LibraryName -> LibraryName -> Ordering # (<) :: LibraryName -> LibraryName -> Bool # (<=) :: LibraryName -> LibraryName -> Bool # (>) :: LibraryName -> LibraryName -> Bool # (>=) :: LibraryName -> LibraryName -> Bool # max :: LibraryName -> LibraryName -> LibraryName # min :: LibraryName -> LibraryName -> LibraryName # | |
Ord LibraryVisibility Source # | |
Defined in Distribution.Types.LibraryVisibility compare :: LibraryVisibility -> LibraryVisibility -> Ordering # (<) :: LibraryVisibility -> LibraryVisibility -> Bool # (<=) :: LibraryVisibility -> LibraryVisibility -> Bool # (>) :: LibraryVisibility -> LibraryVisibility -> Bool # (>=) :: LibraryVisibility -> LibraryVisibility -> Bool # max :: LibraryVisibility -> LibraryVisibility -> LibraryVisibility # min :: LibraryVisibility -> LibraryVisibility -> LibraryVisibility # | |
Ord Mixin Source # | |
Ord Module Source # | |
Ord ModuleReexport Source # | |
Defined in Distribution.Types.ModuleReexport compare :: ModuleReexport -> ModuleReexport -> Ordering # (<) :: ModuleReexport -> ModuleReexport -> Bool # (<=) :: ModuleReexport -> ModuleReexport -> Bool # (>) :: ModuleReexport -> ModuleReexport -> Bool # (>=) :: ModuleReexport -> ModuleReexport -> Bool # max :: ModuleReexport -> ModuleReexport -> ModuleReexport # min :: ModuleReexport -> ModuleReexport -> ModuleReexport # | |
Ord ModuleRenaming Source # | |
Defined in Distribution.Types.ModuleRenaming compare :: ModuleRenaming -> ModuleRenaming -> Ordering # (<) :: ModuleRenaming -> ModuleRenaming -> Bool # (<=) :: ModuleRenaming -> ModuleRenaming -> Bool # (>) :: ModuleRenaming -> ModuleRenaming -> Bool # (>=) :: ModuleRenaming -> ModuleRenaming -> Bool # max :: ModuleRenaming -> ModuleRenaming -> ModuleRenaming # min :: ModuleRenaming -> ModuleRenaming -> ModuleRenaming # | |
Ord MungedPackageId Source # | |
Defined in Distribution.Types.MungedPackageId compare :: MungedPackageId -> MungedPackageId -> Ordering # (<) :: MungedPackageId -> MungedPackageId -> Bool # (<=) :: MungedPackageId -> MungedPackageId -> Bool # (>) :: MungedPackageId -> MungedPackageId -> Bool # (>=) :: MungedPackageId -> MungedPackageId -> Bool # max :: MungedPackageId -> MungedPackageId -> MungedPackageId # min :: MungedPackageId -> MungedPackageId -> MungedPackageId # | |
Ord MungedPackageName Source # | |
Defined in Distribution.Types.MungedPackageName compare :: MungedPackageName -> MungedPackageName -> Ordering # (<) :: MungedPackageName -> MungedPackageName -> Bool # (<=) :: MungedPackageName -> MungedPackageName -> Bool # (>) :: MungedPackageName -> MungedPackageName -> Bool # (>=) :: MungedPackageName -> MungedPackageName -> Bool # max :: MungedPackageName -> MungedPackageName -> MungedPackageName # min :: MungedPackageName -> MungedPackageName -> MungedPackageName # | |
Ord PackageDescription Source # | |
Defined in Distribution.Types.PackageDescription compare :: PackageDescription -> PackageDescription -> Ordering # (<) :: PackageDescription -> PackageDescription -> Bool # (<=) :: PackageDescription -> PackageDescription -> Bool # (>) :: PackageDescription -> PackageDescription -> Bool # (>=) :: PackageDescription -> PackageDescription -> Bool # max :: PackageDescription -> PackageDescription -> PackageDescription # min :: PackageDescription -> PackageDescription -> PackageDescription # | |
Ord PackageIdentifier Source # | |
Defined in Distribution.Types.PackageId compare :: PackageIdentifier -> PackageIdentifier -> Ordering # (<) :: PackageIdentifier -> PackageIdentifier -> Bool # (<=) :: PackageIdentifier -> PackageIdentifier -> Bool # (>) :: PackageIdentifier -> PackageIdentifier -> Bool # (>=) :: PackageIdentifier -> PackageIdentifier -> Bool # max :: PackageIdentifier -> PackageIdentifier -> PackageIdentifier # min :: PackageIdentifier -> PackageIdentifier -> PackageIdentifier # | |
Ord PackageName Source # | |
Defined in Distribution.Types.PackageName compare :: PackageName -> PackageName -> Ordering # (<) :: PackageName -> PackageName -> Bool # (<=) :: PackageName -> PackageName -> Bool # (>) :: PackageName -> PackageName -> Bool # (>=) :: PackageName -> PackageName -> Bool # max :: PackageName -> PackageName -> PackageName # min :: PackageName -> PackageName -> PackageName # | |
Ord PkgconfigDependency Source # | |
Defined in Distribution.Types.PkgconfigDependency compare :: PkgconfigDependency -> PkgconfigDependency -> Ordering # (<) :: PkgconfigDependency -> PkgconfigDependency -> Bool # (<=) :: PkgconfigDependency -> PkgconfigDependency -> Bool # (>) :: PkgconfigDependency -> PkgconfigDependency -> Bool # (>=) :: PkgconfigDependency -> PkgconfigDependency -> Bool # max :: PkgconfigDependency -> PkgconfigDependency -> PkgconfigDependency # min :: PkgconfigDependency -> PkgconfigDependency -> PkgconfigDependency # | |
Ord PkgconfigName Source # | |
Defined in Distribution.Types.PkgconfigName compare :: PkgconfigName -> PkgconfigName -> Ordering # (<) :: PkgconfigName -> PkgconfigName -> Bool # (<=) :: PkgconfigName -> PkgconfigName -> Bool # (>) :: PkgconfigName -> PkgconfigName -> Bool # (>=) :: PkgconfigName -> PkgconfigName -> Bool # max :: PkgconfigName -> PkgconfigName -> PkgconfigName # min :: PkgconfigName -> PkgconfigName -> PkgconfigName # | |
Ord PkgconfigVersion Source # | |
Defined in Distribution.Types.PkgconfigVersion compare :: PkgconfigVersion -> PkgconfigVersion -> Ordering # (<) :: PkgconfigVersion -> PkgconfigVersion -> Bool # (<=) :: PkgconfigVersion -> PkgconfigVersion -> Bool # (>) :: PkgconfigVersion -> PkgconfigVersion -> Bool # (>=) :: PkgconfigVersion -> PkgconfigVersion -> Bool # max :: PkgconfigVersion -> PkgconfigVersion -> PkgconfigVersion # min :: PkgconfigVersion -> PkgconfigVersion -> PkgconfigVersion # | |
Ord PkgconfigVersionRange Source # | |
Defined in Distribution.Types.PkgconfigVersionRange compare :: PkgconfigVersionRange -> PkgconfigVersionRange -> Ordering # (<) :: PkgconfigVersionRange -> PkgconfigVersionRange -> Bool # (<=) :: PkgconfigVersionRange -> PkgconfigVersionRange -> Bool # (>) :: PkgconfigVersionRange -> PkgconfigVersionRange -> Bool # (>=) :: PkgconfigVersionRange -> PkgconfigVersionRange -> Bool # max :: PkgconfigVersionRange -> PkgconfigVersionRange -> PkgconfigVersionRange # min :: PkgconfigVersionRange -> PkgconfigVersionRange -> PkgconfigVersionRange # | |
Ord SetupBuildInfo Source # | |
Defined in Distribution.Types.SetupBuildInfo compare :: SetupBuildInfo -> SetupBuildInfo -> Ordering # (<) :: SetupBuildInfo -> SetupBuildInfo -> Bool # (<=) :: SetupBuildInfo -> SetupBuildInfo -> Bool # (>) :: SetupBuildInfo -> SetupBuildInfo -> Bool # (>=) :: SetupBuildInfo -> SetupBuildInfo -> Bool # max :: SetupBuildInfo -> SetupBuildInfo -> SetupBuildInfo # min :: SetupBuildInfo -> SetupBuildInfo -> SetupBuildInfo # | |
Ord KnownRepoType Source # | |
Defined in Distribution.Types.SourceRepo compare :: KnownRepoType -> KnownRepoType -> Ordering # (<) :: KnownRepoType -> KnownRepoType -> Bool # (<=) :: KnownRepoType -> KnownRepoType -> Bool # (>) :: KnownRepoType -> KnownRepoType -> Bool # (>=) :: KnownRepoType -> KnownRepoType -> Bool # max :: KnownRepoType -> KnownRepoType -> KnownRepoType # min :: KnownRepoType -> KnownRepoType -> KnownRepoType # | |
Ord RepoKind Source # | |
Defined in Distribution.Types.SourceRepo | |
Ord RepoType Source # | |
Defined in Distribution.Types.SourceRepo | |
Ord SourceRepo Source # | |
Defined in Distribution.Types.SourceRepo compare :: SourceRepo -> SourceRepo -> Ordering # (<) :: SourceRepo -> SourceRepo -> Bool # (<=) :: SourceRepo -> SourceRepo -> Bool # (>) :: SourceRepo -> SourceRepo -> Bool # (>=) :: SourceRepo -> SourceRepo -> Bool # max :: SourceRepo -> SourceRepo -> SourceRepo # min :: SourceRepo -> SourceRepo -> SourceRepo # | |
Ord TestSuite Source # | |
Defined in Distribution.Types.TestSuite | |
Ord TestSuiteInterface Source # | |
Defined in Distribution.Types.TestSuiteInterface compare :: TestSuiteInterface -> TestSuiteInterface -> Ordering # (<) :: TestSuiteInterface -> TestSuiteInterface -> Bool # (<=) :: TestSuiteInterface -> TestSuiteInterface -> Bool # (>) :: TestSuiteInterface -> TestSuiteInterface -> Bool # (>=) :: TestSuiteInterface -> TestSuiteInterface -> Bool # max :: TestSuiteInterface -> TestSuiteInterface -> TestSuiteInterface # min :: TestSuiteInterface -> TestSuiteInterface -> TestSuiteInterface # | |
Ord TestType Source # | |
Defined in Distribution.Types.TestType | |
Ord DefUnitId Source # | |
Defined in Distribution.Types.UnitId | |
Ord UnitId Source # | |
Ord UnqualComponentName Source # | |
Defined in Distribution.Types.UnqualComponentName compare :: UnqualComponentName -> UnqualComponentName -> Ordering # (<) :: UnqualComponentName -> UnqualComponentName -> Bool # (<=) :: UnqualComponentName -> UnqualComponentName -> Bool # (>) :: UnqualComponentName -> UnqualComponentName -> Bool # (>=) :: UnqualComponentName -> UnqualComponentName -> Bool # max :: UnqualComponentName -> UnqualComponentName -> UnqualComponentName # min :: UnqualComponentName -> UnqualComponentName -> UnqualComponentName # | |
Ord Version Source # | |
Ord LowerBound Source # |
|
Defined in Distribution.Types.VersionInterval.Legacy compare :: LowerBound -> LowerBound -> Ordering # (<) :: LowerBound -> LowerBound -> Bool # (<=) :: LowerBound -> LowerBound -> Bool # (>) :: LowerBound -> LowerBound -> Bool # (>=) :: LowerBound -> LowerBound -> Bool # max :: LowerBound -> LowerBound -> LowerBound # min :: LowerBound -> LowerBound -> LowerBound # | |
Ord UpperBound Source # |
|
Defined in Distribution.Types.VersionInterval.Legacy compare :: UpperBound -> UpperBound -> Ordering # (<) :: UpperBound -> UpperBound -> Bool # (<=) :: UpperBound -> UpperBound -> Bool # (>) :: UpperBound -> UpperBound -> Bool # (>=) :: UpperBound -> UpperBound -> Bool # max :: UpperBound -> UpperBound -> UpperBound # min :: UpperBound -> UpperBound -> UpperBound # | |
Ord VersionRange Source # | |
Defined in Distribution.Types.VersionRange.Internal compare :: VersionRange -> VersionRange -> Ordering # (<) :: VersionRange -> VersionRange -> Bool # (<=) :: VersionRange -> VersionRange -> Bool # (>) :: VersionRange -> VersionRange -> Bool # (>=) :: VersionRange -> VersionRange -> Bool # max :: VersionRange -> VersionRange -> VersionRange # min :: VersionRange -> VersionRange -> VersionRange # | |
Ord ShortText Source # | |
Defined in Distribution.Utils.ShortText | |
Ord Structure Source # | |
Defined in Distribution.Utils.Structured | |
Ord Extension Source # | |
Defined in Language.Haskell.Extension | |
Ord KnownExtension Source # | |
Defined in Language.Haskell.Extension compare :: KnownExtension -> KnownExtension -> Ordering # (<) :: KnownExtension -> KnownExtension -> Bool # (<=) :: KnownExtension -> KnownExtension -> Bool # (>) :: KnownExtension -> KnownExtension -> Bool # (>=) :: KnownExtension -> KnownExtension -> Bool # max :: KnownExtension -> KnownExtension -> KnownExtension # min :: KnownExtension -> KnownExtension -> KnownExtension # | |
Ord Language Source # | |
Defined in Language.Haskell.Extension | |
Ord ByteArray Source # | 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 |
Defined in Data.Array.Byte | |
Ord ByteString Source # | |
Defined in Data.ByteString.Internal.Type 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 Source # | |
Defined in Data.ByteString.Lazy.Internal 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 Source # | Lexicographic order. |
Defined in Data.ByteString.Short.Internal 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 Source # | |
Ord BigNat # | |
Ord Void # | |
Ord All # | |
Ord Any # | |
Ord SomeTypeRep # | |
Defined in GHC.Internal.Data.Typeable.Internal compare :: SomeTypeRep -> SomeTypeRep -> Ordering # (<) :: SomeTypeRep -> SomeTypeRep -> Bool # (<=) :: SomeTypeRep -> SomeTypeRep -> Bool # (>) :: SomeTypeRep -> SomeTypeRep -> Bool # (>=) :: SomeTypeRep -> SomeTypeRep -> Bool # max :: SomeTypeRep -> SomeTypeRep -> SomeTypeRep # min :: SomeTypeRep -> SomeTypeRep -> SomeTypeRep # | |
Ord Version # | |
Ord ErrorCall # | |
Defined in GHC.Internal.Exception | |
Ord ArithException # | |
Defined in GHC.Internal.Exception.Type compare :: ArithException -> ArithException -> Ordering # (<) :: ArithException -> ArithException -> Bool # (<=) :: ArithException -> ArithException -> Bool # (>) :: ArithException -> ArithException -> Bool # (>=) :: ArithException -> ArithException -> Bool # max :: ArithException -> ArithException -> ArithException # min :: ArithException -> ArithException -> ArithException # | |
Ord Fingerprint # | |
Defined in GHC.Internal.Fingerprint.Type compare :: Fingerprint -> Fingerprint -> Ordering # (<) :: Fingerprint -> Fingerprint -> Bool # (<=) :: Fingerprint -> Fingerprint -> Bool # (>) :: Fingerprint -> Fingerprint -> Bool # (>=) :: Fingerprint -> Fingerprint -> Bool # max :: Fingerprint -> Fingerprint -> Fingerprint # min :: Fingerprint -> Fingerprint -> Fingerprint # | |
Ord CBool # | |
Ord CChar # | |
Ord CClock # | |
Ord CDouble # | |
Defined in GHC.Internal.Foreign.C.Types | |
Ord CFloat # | |
Ord CInt # | |
Ord CIntMax # | |
Defined in GHC.Internal.Foreign.C.Types | |
Ord CIntPtr # | |
Defined in GHC.Internal.Foreign.C.Types | |
Ord CLLong # | |
Ord CLong # | |
Ord CPtrdiff # | |
Defined in GHC.Internal.Foreign.C.Types | |
Ord CSChar # | |
Ord CSUSeconds # | |
Defined in GHC.Internal.Foreign.C.Types compare :: CSUSeconds -> CSUSeconds -> Ordering # (<) :: CSUSeconds -> CSUSeconds -> Bool # (<=) :: CSUSeconds -> CSUSeconds -> Bool # (>) :: CSUSeconds -> CSUSeconds -> Bool # (>=) :: CSUSeconds -> CSUSeconds -> Bool # max :: CSUSeconds -> CSUSeconds -> CSUSeconds # min :: CSUSeconds -> CSUSeconds -> CSUSeconds # | |
Ord CShort # | |
Ord CSigAtomic # | |
Defined in GHC.Internal.Foreign.C.Types compare :: CSigAtomic -> CSigAtomic -> Ordering # (<) :: CSigAtomic -> CSigAtomic -> Bool # (<=) :: CSigAtomic -> CSigAtomic -> Bool # (>) :: CSigAtomic -> CSigAtomic -> Bool # (>=) :: CSigAtomic -> CSigAtomic -> Bool # max :: CSigAtomic -> CSigAtomic -> CSigAtomic # min :: CSigAtomic -> CSigAtomic -> CSigAtomic # | |
Ord CSize # | |
Ord CTime # | |
Ord CUChar # | |
Ord CUInt # | |
Ord CUIntMax # | |
Defined in GHC.Internal.Foreign.C.Types | |
Ord CUIntPtr # | |
Defined in GHC.Internal.Foreign.C.Types | |
Ord CULLong # | |
Defined in GHC.Internal.Foreign.C.Types | |
Ord CULong # | |
Ord CUSeconds # | |
Defined in GHC.Internal.Foreign.C.Types | |
Ord CUShort # | |
Defined in GHC.Internal.Foreign.C.Types | |
Ord CWchar # | |
Ord Associativity # | |
Defined in GHC.Internal.Generics compare :: Associativity -> Associativity -> Ordering # (<) :: Associativity -> Associativity -> Bool # (<=) :: Associativity -> Associativity -> Bool # (>) :: Associativity -> Associativity -> Bool # (>=) :: Associativity -> Associativity -> Bool # max :: Associativity -> Associativity -> Associativity # min :: Associativity -> Associativity -> Associativity # | |
Ord DecidedStrictness # | |
Defined in GHC.Internal.Generics compare :: DecidedStrictness -> DecidedStrictness -> Ordering # (<) :: DecidedStrictness -> DecidedStrictness -> Bool # (<=) :: DecidedStrictness -> DecidedStrictness -> Bool # (>) :: DecidedStrictness -> DecidedStrictness -> Bool # (>=) :: DecidedStrictness -> DecidedStrictness -> Bool # max :: DecidedStrictness -> DecidedStrictness -> DecidedStrictness # min :: DecidedStrictness -> DecidedStrictness -> DecidedStrictness # | |
Ord Fixity # | |
Ord SourceStrictness # | |
Defined in GHC.Internal.Generics compare :: SourceStrictness -> SourceStrictness -> Ordering # (<) :: SourceStrictness -> SourceStrictness -> Bool # (<=) :: SourceStrictness -> SourceStrictness -> Bool # (>) :: SourceStrictness -> SourceStrictness -> Bool # (>=) :: SourceStrictness -> SourceStrictness -> Bool # max :: SourceStrictness -> SourceStrictness -> SourceStrictness # min :: SourceStrictness -> SourceStrictness -> SourceStrictness # | |
Ord SourceUnpackedness # | |
Defined in GHC.Internal.Generics compare :: SourceUnpackedness -> SourceUnpackedness -> Ordering # (<) :: SourceUnpackedness -> SourceUnpackedness -> Bool # (<=) :: SourceUnpackedness -> SourceUnpackedness -> Bool # (>) :: SourceUnpackedness -> SourceUnpackedness -> Bool # (>=) :: SourceUnpackedness -> SourceUnpackedness -> Bool # max :: SourceUnpackedness -> SourceUnpackedness -> SourceUnpackedness # min :: SourceUnpackedness -> SourceUnpackedness -> SourceUnpackedness # | |
Ord ArrayException # | |
Defined in GHC.Internal.IO.Exception compare :: ArrayException -> ArrayException -> Ordering # (<) :: ArrayException -> ArrayException -> Bool # (<=) :: ArrayException -> ArrayException -> Bool # (>) :: ArrayException -> ArrayException -> Bool # (>=) :: ArrayException -> ArrayException -> Bool # max :: ArrayException -> ArrayException -> ArrayException # min :: ArrayException -> ArrayException -> ArrayException # | |
Ord AsyncException # | |
Defined in GHC.Internal.IO.Exception compare :: AsyncException -> AsyncException -> Ordering # (<) :: AsyncException -> AsyncException -> Bool # (<=) :: AsyncException -> AsyncException -> Bool # (>) :: AsyncException -> AsyncException -> Bool # (>=) :: AsyncException -> AsyncException -> Bool # max :: AsyncException -> AsyncException -> AsyncException # min :: AsyncException -> AsyncException -> AsyncException # | |
Ord ExitCode # | |
Defined in GHC.Internal.IO.Exception | |
Ord BufferMode # | |
Defined in GHC.Internal.IO.Handle.Types compare :: BufferMode -> BufferMode -> Ordering # (<) :: BufferMode -> BufferMode -> Bool # (<=) :: BufferMode -> BufferMode -> Bool # (>) :: BufferMode -> BufferMode -> Bool # (>=) :: BufferMode -> BufferMode -> Bool # max :: BufferMode -> BufferMode -> BufferMode # min :: BufferMode -> BufferMode -> BufferMode # | |
Ord Newline # | |
Defined in GHC.Internal.IO.Handle.Types | |
Ord NewlineMode # | |
Defined in GHC.Internal.IO.Handle.Types compare :: NewlineMode -> NewlineMode -> Ordering # (<) :: NewlineMode -> NewlineMode -> Bool # (<=) :: NewlineMode -> NewlineMode -> Bool # (>) :: NewlineMode -> NewlineMode -> Bool # (>=) :: NewlineMode -> NewlineMode -> Bool # max :: NewlineMode -> NewlineMode -> NewlineMode # min :: NewlineMode -> NewlineMode -> NewlineMode # | |
Ord IOMode # | |
Ord Int16 # | |
Ord Int32 # | |
Ord Int64 # | |
Ord Int8 # | |
Ord Extension # | |
Defined in GHC.Internal.LanguageExtensions | |
Ord AnnLookup # | |
Defined in GHC.Internal.TH.Syntax | |
Ord AnnTarget # | |
Defined in GHC.Internal.TH.Syntax | |
Ord Bang # | |
Ord BndrVis # | |
Ord Body # | |
Ord Bytes # | |
Ord Callconv # | |
Defined in GHC.Internal.TH.Syntax | |
Ord Clause # | |
Ord Con # | |
Ord Dec # | |
Ord DecidedStrictness # | |
Defined in GHC.Internal.TH.Syntax 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 GHC.Internal.TH.Syntax | |
Ord DerivStrategy # | |
Defined in GHC.Internal.TH.Syntax compare :: DerivStrategy -> DerivStrategy -> Ordering # (<) :: DerivStrategy -> DerivStrategy -> Bool # (<=) :: DerivStrategy -> DerivStrategy -> Bool # (>) :: DerivStrategy -> DerivStrategy -> Bool # (>=) :: DerivStrategy -> DerivStrategy -> Bool # | |
Ord DocLoc # | |
Ord Exp # | |
Ord FamilyResultSig # | |
Defined in GHC.Internal.TH.Syntax 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 GHC.Internal.TH.Syntax 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 # | |
Ord FunDep # | |
Ord Guard # | |
Ord Info # | |
Ord InjectivityAnn # | |
Defined in GHC.Internal.TH.Syntax compare :: InjectivityAnn -> InjectivityAnn -> Ordering # (<) :: InjectivityAnn -> InjectivityAnn -> Bool # (<=) :: InjectivityAnn -> InjectivityAnn -> Bool # (>) :: InjectivityAnn -> InjectivityAnn -> Bool # (>=) :: InjectivityAnn -> InjectivityAnn -> Bool # | |
Ord Inline # | |
Ord Lit # | |
Ord Loc # | |
Ord Match # | |
Ord ModName # | |
Ord Module # | |
Ord ModuleInfo # | |
Ord Name # | |
Ord NameFlavour # | |
Defined in GHC.Internal.TH.Syntax | |
Ord NameSpace # | |
Defined in GHC.Internal.TH.Syntax | |
Ord NamespaceSpecifier # | |
Defined in GHC.Internal.TH.Syntax compare :: NamespaceSpecifier -> NamespaceSpecifier -> Ordering # (<) :: NamespaceSpecifier -> NamespaceSpecifier -> Bool # (<=) :: NamespaceSpecifier -> NamespaceSpecifier -> Bool # (>) :: NamespaceSpecifier -> NamespaceSpecifier -> Bool # (>=) :: NamespaceSpecifier -> NamespaceSpecifier -> Bool # max :: NamespaceSpecifier -> NamespaceSpecifier -> NamespaceSpecifier # min :: NamespaceSpecifier -> NamespaceSpecifier -> NamespaceSpecifier # | |
Ord OccName # | |
Ord Overlap # | |
Ord Pat # | |
Ord PatSynArgs # | |
Ord PatSynDir # | |
Defined in GHC.Internal.TH.Syntax | |
Ord Phases # | |
Ord PkgName # | |
Ord Pragma # | |
Ord Range # | |
Ord Role # | |
Ord RuleBndr # | |
Defined in GHC.Internal.TH.Syntax | |
Ord RuleMatch # | |
Defined in GHC.Internal.TH.Syntax | |
Ord Safety # | |
Ord SourceStrictness # | |
Defined in GHC.Internal.TH.Syntax compare :: SourceStrictness -> SourceStrictness -> Ordering # (<) :: SourceStrictness -> SourceStrictness -> Bool # (<=) :: SourceStrictness -> SourceStrictness -> Bool # (>) :: SourceStrictness -> SourceStrictness -> Bool # (>=) :: SourceStrictness -> SourceStrictness -> Bool # max :: SourceStrictness -> SourceStrictness -> SourceStrictness # min :: SourceStrictness -> SourceStrictness -> SourceStrictness # | |
Ord SourceUnpackedness # | |
Defined in GHC.Internal.TH.Syntax compare :: SourceUnpackedness -> SourceUnpackedness -> Ordering # (<) :: SourceUnpackedness -> SourceUnpackedness -> Bool # (<=) :: SourceUnpackedness -> SourceUnpackedness -> Bool # (>) :: SourceUnpackedness -> SourceUnpackedness -> Bool # (>=) :: SourceUnpackedness -> SourceUnpackedness -> Bool # max :: SourceUnpackedness -> SourceUnpackedness -> SourceUnpackedness # min :: SourceUnpackedness -> SourceUnpackedness -> SourceUnpackedness # | |
Ord Specificity # | |
Defined in GHC.Internal.TH.Syntax | |
Ord Stmt # | |
Ord TyLit # | |
Ord TySynEqn # | |
Defined in GHC.Internal.TH.Syntax | |
Ord Type # | |
Ord TypeFamilyHead # | |
Defined in GHC.Internal.TH.Syntax compare :: TypeFamilyHead -> TypeFamilyHead -> Ordering # (<) :: TypeFamilyHead -> TypeFamilyHead -> Bool # (<=) :: TypeFamilyHead -> TypeFamilyHead -> Bool # (>) :: TypeFamilyHead -> TypeFamilyHead -> Bool # (>=) :: TypeFamilyHead -> TypeFamilyHead -> Bool # | |
Ord SomeChar # | |
Defined in GHC.Internal.TypeLits | |
Ord SomeSymbol # | |
Defined in GHC.Internal.TypeLits 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 GeneralCategory # | |
Defined in GHC.Internal.Unicode compare :: GeneralCategory -> GeneralCategory -> Ordering # (<) :: GeneralCategory -> GeneralCategory -> Bool # (<=) :: GeneralCategory -> GeneralCategory -> Bool # (>) :: GeneralCategory -> GeneralCategory -> Bool # (>=) :: GeneralCategory -> GeneralCategory -> Bool # max :: GeneralCategory -> GeneralCategory -> GeneralCategory # min :: GeneralCategory -> GeneralCategory -> GeneralCategory # | |
Ord Word16 # | |
Ord Word32 # | |
Ord Word64 # | |
Ord Word8 # | |
Ord Ordering # | |
Defined in GHC.Classes | |
Ord TyCon # | |
Ord OsChar # | |
Ord OsString # | |
Defined in System.OsString.Internal.Types | |
Ord PosixChar # | |
Defined in System.OsString.Internal.Types | |
Ord PosixString # | |
Defined in System.OsString.Internal.Types 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 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 compare :: WindowsString -> WindowsString -> Ordering # (<) :: WindowsString -> WindowsString -> Bool # (<=) :: WindowsString -> WindowsString -> Bool # (>) :: WindowsString -> WindowsString -> Bool # (>=) :: WindowsString -> WindowsString -> Bool # max :: WindowsString -> WindowsString -> WindowsString # min :: WindowsString -> WindowsString -> WindowsString # | |
Ord Message Source # | |
Ord SourcePos Source # | |
Defined in Text.Parsec.Pos | |
Ord PrettyLevel Source # | |
Defined in Text.PrettyPrint.Annotated.HughesPJClass compare :: PrettyLevel -> PrettyLevel -> Ordering # (<) :: PrettyLevel -> PrettyLevel -> Bool # (<=) :: PrettyLevel -> PrettyLevel -> Bool # (>) :: PrettyLevel -> PrettyLevel -> Bool # (>=) :: PrettyLevel -> PrettyLevel -> Bool # max :: PrettyLevel -> PrettyLevel -> PrettyLevel # min :: PrettyLevel -> PrettyLevel -> PrettyLevel # | |
Ord PrettyLevel Source # | |
Defined in Text.PrettyPrint.HughesPJClass compare :: PrettyLevel -> PrettyLevel -> Ordering # (<) :: PrettyLevel -> PrettyLevel -> Bool # (<=) :: PrettyLevel -> PrettyLevel -> Bool # (>) :: PrettyLevel -> PrettyLevel -> Bool # (>=) :: PrettyLevel -> PrettyLevel -> Bool # max :: PrettyLevel -> PrettyLevel -> PrettyLevel # min :: PrettyLevel -> PrettyLevel -> PrettyLevel # | |
Ord I8 Source # | |
Ord Builder Source # | |
Ord Day Source # | |
Ord Month Source # | |
Ord Quarter Source # | |
Ord QuarterOfYear Source # | |
Defined in Data.Time.Calendar.Quarter compare :: QuarterOfYear -> QuarterOfYear -> Ordering # (<) :: QuarterOfYear -> QuarterOfYear -> Bool # (<=) :: QuarterOfYear -> QuarterOfYear -> Bool # (>) :: QuarterOfYear -> QuarterOfYear -> Bool # (>=) :: QuarterOfYear -> QuarterOfYear -> Bool # max :: QuarterOfYear -> QuarterOfYear -> QuarterOfYear # min :: QuarterOfYear -> QuarterOfYear -> QuarterOfYear # | |
Ord DayOfWeek Source # | |
Defined in Data.Time.Calendar.Week | |
Ord DiffTime Source # | |
Defined in Data.Time.Clock.Internal.DiffTime | |
Ord NominalDiffTime Source # | |
Defined in Data.Time.Clock.Internal.NominalDiffTime compare :: NominalDiffTime -> NominalDiffTime -> Ordering # (<) :: NominalDiffTime -> NominalDiffTime -> Bool # (<=) :: NominalDiffTime -> NominalDiffTime -> Bool # (>) :: NominalDiffTime -> NominalDiffTime -> Bool # (>=) :: NominalDiffTime -> NominalDiffTime -> Bool # max :: NominalDiffTime -> NominalDiffTime -> NominalDiffTime # min :: NominalDiffTime -> NominalDiffTime -> NominalDiffTime # | |
Ord SystemTime Source # | |
Defined in Data.Time.Clock.Internal.SystemTime compare :: SystemTime -> SystemTime -> Ordering # (<) :: SystemTime -> SystemTime -> Bool # (<=) :: SystemTime -> SystemTime -> Bool # (>) :: SystemTime -> SystemTime -> Bool # (>=) :: SystemTime -> SystemTime -> Bool # max :: SystemTime -> SystemTime -> SystemTime # min :: SystemTime -> SystemTime -> SystemTime # | |
Ord UTCTime Source # | |
Defined in Data.Time.Clock.Internal.UTCTime | |
Ord UniversalTime Source # | |
Defined in Data.Time.Clock.Internal.UniversalTime compare :: UniversalTime -> UniversalTime -> Ordering # (<) :: UniversalTime -> UniversalTime -> Bool # (<=) :: UniversalTime -> UniversalTime -> Bool # (>) :: UniversalTime -> UniversalTime -> Bool # (>=) :: UniversalTime -> UniversalTime -> Bool # max :: UniversalTime -> UniversalTime -> UniversalTime # min :: UniversalTime -> UniversalTime -> UniversalTime # | |
Ord LocalTime Source # | |
Defined in Data.Time.LocalTime.Internal.LocalTime | |
Ord TimeOfDay Source # | |
Defined in Data.Time.LocalTime.Internal.TimeOfDay | |
Ord TimeZone Source # | |
Defined in Data.Time.LocalTime.Internal.TimeZone | |
Ord Integer # | |
Ord Natural # | |
Ord () # | |
Ord Bool # | |
Ord Char # | |
Ord Double # | |
Ord Float # | |
Ord Int # | |
Ord Word # | |
Ord a => Ord (NonEmptySet a) Source # | |
Defined in Distribution.Compat.NonEmptySet compare :: NonEmptySet a -> NonEmptySet a -> Ordering # (<) :: NonEmptySet a -> NonEmptySet a -> Bool # (<=) :: NonEmptySet a -> NonEmptySet a -> Bool # (>) :: NonEmptySet a -> NonEmptySet a -> Bool # (>=) :: NonEmptySet a -> NonEmptySet a -> Bool # max :: NonEmptySet a -> NonEmptySet a -> NonEmptySet a # min :: NonEmptySet a -> NonEmptySet a -> NonEmptySet a # | |
Ord a => Ord (First' a) Source # | |
Defined in Distribution.Compat.Semigroup | |
Ord a => Ord (Last' a) Source # | |
Defined in Distribution.Compat.Semigroup | |
Ord a => Ord (Option' a) Source # | |
Defined in Distribution.Compat.Semigroup | |
Ord v => Ord (PerCompilerFlavor v) Source # | |
Defined in Distribution.Compiler compare :: PerCompilerFlavor v -> PerCompilerFlavor v -> Ordering # (<) :: PerCompilerFlavor v -> PerCompilerFlavor v -> Bool # (<=) :: PerCompilerFlavor v -> PerCompilerFlavor v -> Bool # (>) :: PerCompilerFlavor v -> PerCompilerFlavor v -> Bool # (>=) :: PerCompilerFlavor v -> PerCompilerFlavor v -> Bool # max :: PerCompilerFlavor v -> PerCompilerFlavor v -> PerCompilerFlavor v # min :: PerCompilerFlavor v -> PerCompilerFlavor v -> PerCompilerFlavor v # | |
Ord ann => Ord (Field ann) Source # | Since: Cabal-syntax-3.12.0.0 |
Defined in Distribution.Fields.Field | |
Ord ann => Ord (FieldLine ann) Source # | Since: Cabal-syntax-3.12.0.0 |
Defined in Distribution.Fields.Field compare :: FieldLine ann -> FieldLine ann -> Ordering # (<) :: FieldLine ann -> FieldLine ann -> Bool # (<=) :: FieldLine ann -> FieldLine ann -> Bool # (>) :: FieldLine ann -> FieldLine ann -> Bool # (>=) :: FieldLine ann -> FieldLine ann -> Bool # | |
Ord ann => Ord (Name ann) Source # | Since: Cabal-syntax-3.12.0.0 |
Defined in Distribution.Fields.Field | |
Ord ann => Ord (SectionArg ann) Source # | Since: Cabal-syntax-3.12.0.0 |
Defined in Distribution.Fields.Field compare :: SectionArg ann -> SectionArg ann -> Ordering # (<) :: SectionArg ann -> SectionArg ann -> Bool # (<=) :: SectionArg ann -> SectionArg ann -> Bool # (>) :: SectionArg ann -> SectionArg ann -> Bool # (>=) :: SectionArg ann -> SectionArg ann -> Bool # max :: SectionArg ann -> SectionArg ann -> SectionArg ann # min :: SectionArg ann -> SectionArg ann -> SectionArg ann # | |
Ord a => Ord (First a) Source # | Since: base-4.9.0.0 |
Ord a => Ord (Last a) Source # | Since: base-4.9.0.0 |
Ord a => Ord (Max a) Source # | Since: base-4.9.0.0 |
Ord a => Ord (Min a) Source # | Since: base-4.9.0.0 |
Ord m => Ord (WrappedMonoid m) Source # | Since: base-4.9.0.0 |
Defined in Data.Semigroup compare :: WrappedMonoid m -> WrappedMonoid m -> Ordering # (<) :: WrappedMonoid m -> WrappedMonoid m -> Bool # (<=) :: WrappedMonoid m -> WrappedMonoid m -> Bool # (>) :: WrappedMonoid m -> WrappedMonoid m -> Bool # (>=) :: WrappedMonoid m -> WrappedMonoid m -> Bool # max :: WrappedMonoid m -> WrappedMonoid m -> WrappedMonoid m # min :: WrappedMonoid m -> WrappedMonoid m -> WrappedMonoid m # | |
Ord a => Ord (IntMap a) Source # | |
Defined in Data.IntMap.Internal | |
Ord a => Ord (Seq a) Source # | |
Ord a => Ord (ViewL a) Source # | |
Ord a => Ord (ViewR a) Source # | |
Ord a => Ord (Intersection a) Source # | |
Defined in Data.Set.Internal compare :: Intersection a -> Intersection a -> Ordering # (<) :: Intersection a -> Intersection a -> Bool # (<=) :: Intersection a -> Intersection a -> Bool # (>) :: Intersection a -> Intersection a -> Bool # (>=) :: Intersection a -> Intersection a -> Bool # max :: Intersection a -> Intersection a -> Intersection a # min :: Intersection a -> Intersection a -> Intersection a # | |
Ord a => Ord (Set a) Source # | |
Ord a => Ord (Tree a) Source # | Since: containers-0.6.5 |
Ord a => Ord (NonEmpty a) # | |
Ord a => Ord (Identity a) # | |
Defined in GHC.Internal.Data.Functor.Identity | |
Ord a => Ord (First a) # | |
Ord a => Ord (Last a) # | |
Ord a => Ord (Down a) # | |
Ord a => Ord (Dual a) # | |
Ord a => Ord (Product a) # | |
Defined in GHC.Internal.Data.Semigroup.Internal | |
Ord a => Ord (Sum a) # | |
Ord (ForeignPtr a) # | |
Defined in GHC.Internal.ForeignPtr compare :: ForeignPtr a -> ForeignPtr a -> Ordering # (<) :: ForeignPtr a -> ForeignPtr a -> Bool # (<=) :: ForeignPtr a -> ForeignPtr a -> Bool # (>) :: ForeignPtr a -> ForeignPtr a -> Bool # (>=) :: ForeignPtr a -> ForeignPtr a -> Bool # max :: ForeignPtr a -> ForeignPtr a -> ForeignPtr a # min :: ForeignPtr a -> ForeignPtr a -> ForeignPtr a # | |
Ord a => Ord (ZipList a) # | |
Defined in GHC.Internal.Functor.ZipList | |
Ord p => Ord (Par1 p) # | |
Ord (FunPtr a) # | |
Defined in GHC.Internal.Ptr | |
Ord (Ptr a) # | |
Integral a => Ord (Ratio a) # | |
Ord flag => Ord (TyVarBndr flag) # | |
Defined in GHC.Internal.TH.Syntax compare :: TyVarBndr flag -> TyVarBndr flag -> Ordering # (<) :: TyVarBndr flag -> TyVarBndr flag -> Bool # (<=) :: TyVarBndr flag -> TyVarBndr flag -> Bool # (>) :: TyVarBndr flag -> TyVarBndr flag -> Bool # (>=) :: TyVarBndr flag -> TyVarBndr flag -> Bool # | |
Ord (SChar c) # | |
Ord (SSymbol s) # | |
Defined in GHC.Internal.TypeLits | |
Ord a => Ord (Stream a) Source # | |
Defined in Data.Text.Internal.Fusion.Types | |
Ord a => Ord (Maybe a) # | |
Ord a => Ord (Solo a) # | |
Ord a => Ord [a] # | |
(Ix ix, Ord e, IArray UArray e) => Ord (UArray ix e) Source # | |
Defined in Data.Array.Base | |
Ord (Fixed a) Source # | Since: base-2.1 |
Ord a => Ord (Arg a b) Source # | Note that Since: base-4.9.0.0 |
(Ord k, Ord v) => Ord (Map k v) Source # | |
(Ix i, Ord e) => Ord (Array i e) # | |
Defined in GHC.Internal.Arr | |
(Ord a, Ord b) => Ord (Either a b) # | |
Ord (Proxy s) # | |
Ord (TypeRep a) # | |
Defined in GHC.Internal.Data.Typeable.Internal | |
Ord (U1 p) # | |
Ord (V1 p) # | |
(Ord1 f, Ord a) => Ord (Lift f a) Source # | |
Defined in Control.Applicative.Lift | |
(Ord1 m, Ord a) => Ord (MaybeT m a) Source # | |
(Ord a, Ord b) => Ord (a, b) # | |
Ord (SymbolicPathX allowAbsolute from to) Source # | |
Defined in Distribution.Utils.Path compare :: SymbolicPathX allowAbsolute from to -> SymbolicPathX allowAbsolute from to -> Ordering # (<) :: SymbolicPathX allowAbsolute from to -> SymbolicPathX allowAbsolute from to -> Bool # (<=) :: SymbolicPathX allowAbsolute from to -> SymbolicPathX allowAbsolute from to -> Bool # (>) :: SymbolicPathX allowAbsolute from to -> SymbolicPathX allowAbsolute from to -> Bool # (>=) :: SymbolicPathX allowAbsolute from to -> SymbolicPathX allowAbsolute from to -> Bool # max :: SymbolicPathX allowAbsolute from to -> SymbolicPathX allowAbsolute from to -> SymbolicPathX allowAbsolute from to # min :: SymbolicPathX allowAbsolute from to -> SymbolicPathX allowAbsolute from to -> SymbolicPathX allowAbsolute from to # | |
Ord a => Ord (Const a b) # | |
Defined in GHC.Internal.Data.Functor.Const | |
Ord (f a) => Ord (Ap f a) # | |
Ord (f a) => Ord (Alt f a) # | |
Defined in GHC.Internal.Data.Semigroup.Internal | |
(Generic1 f, Ord (Rep1 f a)) => Ord (Generically1 f a) # | |
Defined in GHC.Internal.Generics compare :: Generically1 f a -> Generically1 f a -> Ordering # (<) :: Generically1 f a -> Generically1 f a -> Bool # (<=) :: Generically1 f a -> Generically1 f a -> Bool # (>) :: Generically1 f a -> Generically1 f a -> Bool # (>=) :: Generically1 f a -> Generically1 f a -> Bool # max :: Generically1 f a -> Generically1 f a -> Generically1 f a # min :: Generically1 f a -> Generically1 f a -> Generically1 f a # | |
Ord (f p) => Ord (Rec1 f p) # | |
Defined in GHC.Internal.Generics | |
Ord (URec (Ptr ()) p) # | |
Defined in GHC.Internal.Generics compare :: URec (Ptr ()) p -> URec (Ptr ()) p -> Ordering # (<) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool # (<=) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool # (>) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool # (>=) :: URec (Ptr ()) p -> URec (Ptr ()) p -> Bool # max :: URec (Ptr ()) p -> URec (Ptr ()) p -> URec (Ptr ()) p # min :: URec (Ptr ()) p -> URec (Ptr ()) p -> URec (Ptr ()) p # | |
Ord (URec Char p) # | |
Defined in GHC.Internal.Generics | |
Ord (URec Double p) # | |
Defined in GHC.Internal.Generics compare :: URec Double p -> URec Double p -> Ordering # (<) :: URec Double p -> URec Double p -> Bool # (<=) :: URec Double p -> URec Double p -> Bool # (>) :: URec Double p -> URec Double p -> Bool # (>=) :: URec Double p -> URec Double p -> Bool # | |
Ord (URec Float p) # | |
Defined in GHC.Internal.Generics | |
Ord (URec Int p) # | |
Ord (URec Word p) # | |
Defined in GHC.Internal.Generics | |
(Ord1 f, Ord a) => Ord (Backwards f a) Source # | |
Defined in Control.Applicative.Backwards compare :: Backwards f a -> Backwards f a -> Ordering # (<) :: Backwards f a -> Backwards f a -> Bool # (<=) :: Backwards f a -> Backwards f a -> Bool # (>) :: Backwards f a -> Backwards f a -> Bool # (>=) :: Backwards f a -> Backwards f a -> Bool # | |
(Ord e, Ord1 m, Ord a) => Ord (ExceptT e m a) Source # | |
Defined in Control.Monad.Trans.Except compare :: ExceptT e m a -> ExceptT e m a -> Ordering # (<) :: ExceptT e m a -> ExceptT e m a -> Bool # (<=) :: ExceptT e m a -> ExceptT e m a -> Bool # (>) :: ExceptT e m a -> ExceptT e m a -> Bool # (>=) :: ExceptT e m a -> ExceptT e m a -> Bool # | |
(Ord1 f, Ord a) => Ord (IdentityT f a) Source # | |
Defined in Control.Monad.Trans.Identity compare :: IdentityT f a -> IdentityT f a -> Ordering # (<) :: IdentityT f a -> IdentityT f a -> Bool # (<=) :: IdentityT f a -> IdentityT f a -> Bool # (>) :: IdentityT f a -> IdentityT f a -> Bool # (>=) :: IdentityT f a -> IdentityT f a -> Bool # | |
(Ord w, Ord1 m, Ord a) => Ord (WriterT w m a) Source # | |
Defined in Control.Monad.Trans.Writer.Lazy compare :: WriterT w m a -> WriterT w m a -> Ordering # (<) :: WriterT w m a -> WriterT w m a -> Bool # (<=) :: WriterT w m a -> WriterT w m a -> Bool # (>) :: WriterT w m a -> WriterT w m a -> Bool # (>=) :: WriterT w m a -> WriterT w m a -> Bool # | |
(Ord w, Ord1 m, Ord a) => Ord (WriterT w m a) Source # | |
Defined in Control.Monad.Trans.Writer.Strict compare :: WriterT w m a -> WriterT w m a -> Ordering # (<) :: WriterT w m a -> WriterT w m a -> Bool # (<=) :: WriterT w m a -> WriterT w m a -> Bool # (>) :: WriterT w m a -> WriterT w m a -> Bool # (>=) :: WriterT w m a -> WriterT w m a -> Bool # | |
Ord a => Ord (Constant a b) Source # | |
Defined in Data.Functor.Constant | |
(Ord1 f, Ord a) => Ord (Reverse f a) Source # | |
Defined in Data.Functor.Reverse | |
(Ord a, Ord b, Ord c) => Ord (a, b, c) # | |
Defined in GHC.Classes | |
(Ord (f a), Ord (g a)) => Ord (Product f g a) Source # | Since: base-4.18.0.0 |
Defined in Data.Functor.Product compare :: Product f g a -> Product f g a -> Ordering # (<) :: Product f g a -> Product f g a -> Bool # (<=) :: Product f g a -> Product f g a -> Bool # (>) :: Product f g a -> Product f g a -> Bool # (>=) :: Product f g a -> Product f g a -> Bool # | |
(Ord (f a), Ord (g a)) => Ord (Sum f g a) Source # | Since: base-4.18.0.0 |
Defined in Data.Functor.Sum | |
(Ord (f p), Ord (g p)) => Ord ((f :*: g) p) # | |
Defined in GHC.Internal.Generics | |
(Ord (f p), Ord (g p)) => Ord ((f :+: g) p) # | |
Defined in GHC.Internal.Generics | |
Ord c => Ord (K1 i c p) # | |
Defined in GHC.Internal.Generics | |
(Ord a, Ord b, Ord c, Ord d) => Ord (a, b, c, d) # | |
Defined in GHC.Classes | |
Ord (f (g a)) => Ord (Compose f g a) Source # | Since: base-4.18.0.0 |
Defined in Data.Functor.Compose compare :: Compose f g a -> Compose f g a -> Ordering # (<) :: Compose f g a -> Compose f g a -> Bool # (<=) :: Compose f g a -> Compose f g a -> Bool # (>) :: Compose f g a -> Compose f g a -> Bool # (>=) :: Compose f g a -> Compose f g a -> Bool # | |
Ord (f (g p)) => Ord ((f :.: g) p) # | |
Defined in GHC.Internal.Generics | |
Ord (f p) => Ord (M1 i c f p) # | |
(Ord a, Ord b, Ord c, Ord d, Ord e) => Ord (a, b, c, d, e) # | |
Defined in GHC.Classes compare :: (a, b, c, d, e) -> (a, b, c, d, e) -> Ordering # (<) :: (a, b, c, d, e) -> (a, b, c, d, e) -> Bool # (<=) :: (a, b, c, d, e) -> (a, b, c, d, e) -> Bool # (>) :: (a, b, c, d, e) -> (a, b, c, d, e) -> Bool # (>=) :: (a, b, c, d, e) -> (a, b, c, d, e) -> Bool # max :: (a, b, c, d, e) -> (a, b, c, d, e) -> (a, b, c, d, e) # min :: (a, b, c, d, e) -> (a, b, c, d, e) -> (a, b, c, d, e) # | |
(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f) => Ord (a, b, c, d, e, f) # | |
Defined in GHC.Classes compare :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> Ordering # (<) :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> Bool # (<=) :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> Bool # (>) :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> Bool # (>=) :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> Bool # max :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> (a, b, c, d, e, f) # min :: (a, b, c, d, e, f) -> (a, b, c, d, e, f) -> (a, b, c, d, e, f) # | |
(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g) => Ord (a, b, c, d, e, f, g) # | |
Defined in GHC.Classes compare :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> Ordering # (<) :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> Bool # (<=) :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> Bool # (>) :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> Bool # (>=) :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> Bool # max :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) # min :: (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) # | |
(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h) => Ord (a, b, c, d, e, f, g, h) # | |
Defined in GHC.Classes compare :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> Ordering # (<) :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> Bool # (<=) :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> Bool # (>) :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> Bool # (>=) :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> Bool # max :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) # min :: (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) -> (a, b, c, d, e, f, g, h) # | |
(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i) => Ord (a, b, c, d, e, f, g, h, i) # | |
Defined in GHC.Classes compare :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> Ordering # (<) :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> Bool # (<=) :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> Bool # (>) :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> Bool # (>=) :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> Bool # max :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) # min :: (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) -> (a, b, c, d, e, f, g, h, i) # | |
(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j) => Ord (a, b, c, d, e, f, g, h, i, j) # | |
Defined in GHC.Classes compare :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> Ordering # (<) :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> Bool # (<=) :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> Bool # (>) :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> Bool # (>=) :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> Bool # max :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) # min :: (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) -> (a, b, c, d, e, f, g, h, i, j) # | |
(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j, Ord k) => Ord (a, b, c, d, e, f, g, h, i, j, k) # | |
Defined in GHC.Classes compare :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> Ordering # (<) :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> Bool # (<=) :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> Bool # (>) :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> Bool # (>=) :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> Bool # max :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) # min :: (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) -> (a, b, c, d, e, f, g, h, i, j, k) # | |
(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j, Ord k, Ord l) => Ord (a, b, c, d, e, f, g, h, i, j, k, l) # | |
Defined in GHC.Classes compare :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> Ordering # (<) :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> Bool # (<=) :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> Bool # (>) :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> Bool # (>=) :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> Bool # max :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) # min :: (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) -> (a, b, c, d, e, f, g, h, i, j, k, l) # | |
(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j, Ord k, Ord l, Ord m) => Ord (a, b, c, d, e, f, g, h, i, j, k, l, m) # | |
Defined in GHC.Classes compare :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Ordering # (<) :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Bool # (<=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Bool # (>) :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Bool # (>=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> Bool # max :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) # min :: (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) -> (a, b, c, d, e, f, g, h, i, j, k, l, m) # | |
(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j, Ord k, Ord l, Ord m, Ord n) => Ord (a, b, c, d, e, f, g, h, i, j, k, l, m, n) # | |
Defined in GHC.Classes compare :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Ordering # (<) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Bool # (<=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Bool # (>) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Bool # (>=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> Bool # max :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) # min :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n) # | |
(Ord a, Ord b, Ord c, Ord d, Ord e, Ord f, Ord g, Ord h, Ord i, Ord j, Ord k, Ord l, Ord m, Ord n, Ord o) => Ord (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) # | |
Defined in GHC.Classes compare :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Ordering # (<) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Bool # (<=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Bool # (>) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Bool # (>=) :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> Bool # max :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) # min :: (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) -> (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) # |
Instances
Alternative IO # | |
Applicative IO # | |
Functor IO # | |
Monad IO # | |
MonadPlus IO # | |
MonadFail IO # | |
Defined in GHC.Internal.Control.Monad.Fail | |
Quasi IO # | |
Defined in GHC.Internal.TH.Syntax qReport :: Bool -> String -> IO () qRecover :: IO a -> IO a -> IO a qLookupName :: Bool -> String -> IO (Maybe Name) qReifyFixity :: Name -> IO (Maybe Fixity) qReifyType :: Name -> IO Type qReifyInstances :: Name -> [Type] -> IO [Dec] qReifyRoles :: Name -> IO [Role] qReifyAnnotations :: Data a => AnnLookup -> IO [a] qReifyModule :: Module -> IO ModuleInfo qReifyConStrictness :: Name -> IO [DecidedStrictness] qGetPackageRoot :: IO FilePath qAddDependentFile :: FilePath -> IO () qAddTempFile :: String -> IO FilePath qAddTopDecls :: [Dec] -> IO () qAddForeignFilePath :: ForeignSrcLang -> String -> IO () qAddModFinalizer :: Q () -> IO () qAddCorePlugin :: String -> IO () qGetQ :: Typeable a => IO (Maybe a) qPutQ :: Typeable a => a -> IO () qIsExtEnabled :: Extension -> IO Bool qExtsEnabled :: IO [Extension] | |
Quote IO # | |
Defined in GHC.Internal.TH.Syntax | |
MonadError IOException IO Source # | |
Defined in Control.Monad.Error.Class throwError :: IOException -> IO a Source # catchError :: IO a -> (IOException -> IO a) -> IO a Source # | |
MArray IOUArray Int16 IO Source # | |
Defined in Data.Array.IO.Internals 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 Source # | |
Defined in Data.Array.IO.Internals 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 Source # | |
Defined in Data.Array.IO.Internals 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 Source # | |
Defined in Data.Array.IO.Internals 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 Source # | |
Defined in Data.Array.IO.Internals 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 Source # | |
Defined in Data.Array.IO.Internals 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 Source # | |
Defined in Data.Array.IO.Internals 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 Source # | |
Defined in Data.Array.IO.Internals 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 Source # | |
Defined in Data.Array.IO.Internals 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 Source # | |
Defined in Data.Array.IO.Internals 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 Source # | |
Defined in Data.Array.IO.Internals 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 Source # | |
Defined in Data.Array.IO.Internals 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 Source # | |
Defined in Data.Array.IO.Internals 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 Source # | |
Defined in Data.Array.IO.Internals 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 Source # | |
Defined in Data.Array.Storable.Internals 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 Source # | |
Defined in Data.Array.Base 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 IOUArray (FunPtr a) IO Source # | |
Defined in Data.Array.IO.Internals 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 Source # | |
Defined in Data.Array.IO.Internals 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 Source # | |
Defined in Data.Array.IO.Internals getBounds :: Ix i => IOUArray i (StablePtr a) -> IO (i, i) Source # getNumElements :: Ix i => IOUArray i (StablePtr a) -> IO Int Source # newArray :: Ix i => (i, i) -> StablePtr a -> IO (IOUArray i (StablePtr a)) Source # newArray_ :: Ix i => (i, i) -> IO (IOUArray i (StablePtr a)) Source # unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i (StablePtr a)) Source # unsafeRead :: Ix i => IOUArray i (StablePtr a) -> Int -> IO (StablePtr a) Source # unsafeWrite :: Ix i => IOUArray i (StablePtr a) -> Int -> StablePtr a -> IO () Source # | |
a ~ () => HPrintfType (IO a) Source # | Since: base-4.7.0.0 |
Defined in Text.Printf | |
a ~ () => PrintfType (IO a) Source # | Since: base-4.7.0.0 |
Defined in Text.Printf | |
Monoid a => Monoid (IO a) # | |
Semigroup a => Semigroup (IO a) # | |
Instances
Structured Ordering Source # | |
Defined in Distribution.Utils.Structured | |
Binary Ordering Source # | |
NFData Ordering Source # | |
Defined in Control.DeepSeq | |
Monoid Ordering # | |
Semigroup Ordering # | |
Data Ordering # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Ordering -> c Ordering # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Ordering # toConstr :: Ordering -> Constr # dataTypeOf :: Ordering -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Ordering) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Ordering) # gmapT :: (forall b. Data b => b -> b) -> Ordering -> Ordering # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Ordering -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Ordering -> r # gmapQ :: (forall d. Data d => d -> u) -> Ordering -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Ordering -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Ordering -> m Ordering # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Ordering -> m Ordering # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Ordering -> m Ordering # | |
Bounded Ordering # | |
Enum Ordering # | |
Generic Ordering # | |
Defined in GHC.Internal.Generics | |
Ix Ordering # | |
Defined in GHC.Internal.Ix | |
Read Ordering # | |
Show Ordering # | |
Eq Ordering # | |
Ord Ordering # | |
Defined in GHC.Classes | |
Pretty Ordering Source # | |
Defined in Text.PrettyPrint.Annotated.HughesPJClass pPrintPrec :: PrettyLevel -> Rational -> Ordering -> Doc ann Source # pPrint :: Ordering -> Doc ann Source # pPrintList :: PrettyLevel -> [Ordering] -> Doc ann Source # | |
Pretty Ordering Source # | |
Defined in Text.PrettyPrint.HughesPJClass pPrintPrec :: PrettyLevel -> Rational -> Ordering -> Doc Source # pPrint :: Ordering -> Doc Source # pPrintList :: PrettyLevel -> [Ordering] -> Doc Source # | |
type Rep Ordering # | |
Instances
Structured Integer Source # | |
Defined in Distribution.Utils.Structured | |
PrintfArg Integer Source # | Since: base-2.1 |
Defined in Text.Printf formatArg :: Integer -> FieldFormatter Source # parseFormat :: Integer -> ModifierParser Source # | |
Binary Integer Source # | |
NFData Integer Source # | |
Defined in Control.DeepSeq | |
Bits Integer # | |
Defined in GHC.Internal.Bits (.&.) :: Integer -> Integer -> Integer # (.|.) :: Integer -> Integer -> Integer # xor :: Integer -> Integer -> Integer # complement :: Integer -> Integer # shift :: Integer -> Int -> Integer # rotate :: Integer -> Int -> Integer # setBit :: Integer -> Int -> Integer # clearBit :: Integer -> Int -> Integer # complementBit :: Integer -> Int -> Integer # testBit :: Integer -> Int -> Bool # bitSizeMaybe :: Integer -> Maybe Int # shiftL :: Integer -> Int -> Integer # unsafeShiftL :: Integer -> Int -> Integer # shiftR :: Integer -> Int -> Integer # unsafeShiftR :: Integer -> Int -> Integer # rotateL :: Integer -> Int -> Integer # | |
Data Integer # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Integer -> c Integer # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Integer # toConstr :: Integer -> Constr # dataTypeOf :: Integer -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Integer) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Integer) # gmapT :: (forall b. Data b => b -> b) -> Integer -> Integer # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Integer -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Integer -> r # gmapQ :: (forall d. Data d => d -> u) -> Integer -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Integer -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Integer -> m Integer # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Integer -> m Integer # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Integer -> m Integer # | |
Enum Integer # | |
Ix Integer # | |
Defined in GHC.Internal.Ix | |
Num Integer # | |
Read Integer # | |
Integral Integer # | |
Defined in GHC.Internal.Real | |
Real Integer # | |
Defined in GHC.Internal.Real toRational :: Integer -> Rational # | |
Show Integer # | |
Eq Integer # | |
Ord Integer # | |
Pretty Integer Source # | |
Defined in Text.PrettyPrint.Annotated.HughesPJClass pPrintPrec :: PrettyLevel -> Rational -> Integer -> Doc ann Source # pPrint :: Integer -> Doc ann Source # pPrintList :: PrettyLevel -> [Integer] -> Doc ann Source # | |
Pretty Integer Source # | |
Defined in Text.PrettyPrint.HughesPJClass pPrintPrec :: PrettyLevel -> Rational -> Integer -> Doc Source # pPrint :: Integer -> Doc Source # pPrintList :: PrettyLevel -> [Integer] -> Doc Source # |
Instances
Eq1 Maybe Source # | Since: base-4.9.0.0 | ||||
Ord1 Maybe Source # | Since: base-4.9.0.0 | ||||
Defined in Data.Functor.Classes | |||||
Read1 Maybe Source # | Since: base-4.9.0.0 | ||||
Defined in Data.Functor.Classes 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 Source # | Since: base-4.9.0.0 | ||||
NFData1 Maybe Source # | Since: deepseq-1.4.3.0 | ||||
Defined in Control.DeepSeq | |||||
Alternative Maybe # | |||||
Applicative Maybe # | |||||
Functor Maybe # | |||||
Monad Maybe # | |||||
MonadPlus Maybe # | |||||
MonadFail Maybe # | |||||
Defined in GHC.Internal.Control.Monad.Fail | |||||
Foldable Maybe # | |||||
Defined in GHC.Internal.Data.Foldable fold :: Monoid m => Maybe m -> m # foldMap :: Monoid m => (a -> m) -> Maybe a -> m # foldMap' :: Monoid m => (a -> m) -> Maybe a -> m # foldr :: (a -> b -> b) -> b -> Maybe a -> b # foldr' :: (a -> b -> b) -> b -> Maybe a -> b # foldl :: (b -> a -> b) -> b -> Maybe a -> b # foldl' :: (b -> a -> b) -> b -> Maybe a -> b # foldr1 :: (a -> a -> a) -> Maybe a -> a # foldl1 :: (a -> a -> a) -> Maybe a -> a # elem :: Eq a => a -> Maybe a -> Bool # maximum :: Ord a => Maybe a -> a # minimum :: Ord a => Maybe a -> a # | |||||
Traversable Maybe # | |||||
Generic1 Maybe # | |||||
Defined in GHC.Internal.Generics
| |||||
MonadError () Maybe Source # | Since: mtl-2.2.2 | ||||
Defined in Control.Monad.Error.Class throwError :: () -> Maybe a Source # catchError :: Maybe a -> (() -> Maybe a) -> Maybe a Source # | |||||
Structured a => Structured (Maybe a) Source # | |||||
Defined in Distribution.Utils.Structured | |||||
Binary a => Binary (Maybe a) Source # | |||||
NFData a => NFData (Maybe a) Source # | |||||
Defined in Control.DeepSeq | |||||
Semigroup a => Monoid (Maybe a) # | |||||
Semigroup a => Semigroup (Maybe a) # | |||||
Data a => Data (Maybe a) # | |||||
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Maybe a -> c (Maybe a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Maybe a) # toConstr :: Maybe a -> Constr # dataTypeOf :: Maybe a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Maybe a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Maybe a)) # gmapT :: (forall b. Data b => b -> b) -> Maybe a -> Maybe a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Maybe a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Maybe a -> r # gmapQ :: (forall d. Data d => d -> u) -> Maybe a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Maybe a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Maybe a -> m (Maybe a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Maybe a -> m (Maybe a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Maybe a -> m (Maybe a) # | |||||
Generic (Maybe a) # | |||||
Defined in GHC.Internal.Generics
| |||||
SingKind a => SingKind (Maybe a) # | |||||
Defined in GHC.Internal.Generics
| |||||
Read a => Read (Maybe a) # | |||||
Show a => Show (Maybe a) # | |||||
Eq a => Eq (Maybe a) # | |||||
Ord a => Ord (Maybe a) # | |||||
Pretty a => Pretty (Maybe a) Source # | |||||
Defined in Text.PrettyPrint.Annotated.HughesPJClass pPrintPrec :: PrettyLevel -> Rational -> Maybe a -> Doc ann Source # pPrint :: Maybe a -> Doc ann Source # pPrintList :: PrettyLevel -> [Maybe a] -> Doc ann Source # | |||||
Pretty a => Pretty (Maybe a) Source # | |||||
Defined in Text.PrettyPrint.HughesPJClass pPrintPrec :: PrettyLevel -> Rational -> Maybe a -> Doc Source # pPrint :: Maybe a -> Doc Source # pPrintList :: PrettyLevel -> [Maybe a] -> Doc Source # | |||||
SingI ('Nothing :: Maybe a) # | |||||
Defined in GHC.Internal.Generics | |||||
SingI a2 => SingI ('Just a2 :: Maybe a1) # | |||||
Defined in GHC.Internal.Generics | |||||
type Rep1 Maybe # | |||||
Defined in GHC.Internal.Generics | |||||
type DemoteRep (Maybe a) # | |||||
Defined in GHC.Internal.Generics | |||||
type Rep (Maybe a) # | |||||
Defined in GHC.Internal.Generics | |||||
data Sing (b :: Maybe a) # | |||||
Instances
Parsec Bool Source # | |||||
Defined in Distribution.Parsec parsec :: CabalParsing m => m Bool Source # | |||||
Pretty Bool Source # | |||||
Defined in Distribution.Pretty | |||||
Structured Bool Source # | |||||
Defined in Distribution.Utils.Structured | |||||
Binary Bool Source # | |||||
NFData Bool Source # | |||||
Defined in Control.DeepSeq | |||||
Bits Bool # | |||||
Defined in GHC.Internal.Bits (.&.) :: Bool -> Bool -> Bool # (.|.) :: Bool -> Bool -> Bool # complement :: Bool -> Bool # shift :: Bool -> Int -> Bool # rotate :: Bool -> Int -> Bool # setBit :: Bool -> Int -> Bool # clearBit :: Bool -> Int -> Bool # complementBit :: Bool -> Int -> Bool # testBit :: Bool -> Int -> Bool # bitSizeMaybe :: Bool -> Maybe Int # shiftL :: Bool -> Int -> Bool # unsafeShiftL :: Bool -> Int -> Bool # shiftR :: Bool -> Int -> Bool # unsafeShiftR :: Bool -> Int -> Bool # rotateL :: Bool -> Int -> Bool # | |||||
FiniteBits Bool # | |||||
Defined in GHC.Internal.Bits | |||||
Data Bool # | |||||
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Bool -> c Bool # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Bool # dataTypeOf :: Bool -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Bool) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Bool) # gmapT :: (forall b. Data b => b -> b) -> Bool -> Bool # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Bool -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Bool -> r # gmapQ :: (forall d. Data d => d -> u) -> Bool -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Bool -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Bool -> m Bool # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Bool -> m Bool # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Bool -> m Bool # | |||||
Bounded Bool # | |||||
Enum Bool # | |||||
Generic Bool # | |||||
Defined in GHC.Internal.Generics | |||||
SingKind Bool # | |||||
Defined in GHC.Internal.Generics
| |||||
Ix Bool # | |||||
Read Bool # | |||||
Show Bool # | |||||
Eq Bool # | |||||
Ord Bool # | |||||
Pretty Bool Source # | |||||
Defined in Text.PrettyPrint.Annotated.HughesPJClass pPrintPrec :: PrettyLevel -> Rational -> Bool -> Doc ann Source # pPrint :: Bool -> Doc ann Source # pPrintList :: PrettyLevel -> [Bool] -> Doc ann Source # | |||||
Pretty Bool Source # | |||||
Defined in Text.PrettyPrint.HughesPJClass pPrintPrec :: PrettyLevel -> Rational -> Bool -> Doc Source # pPrint :: Bool -> Doc Source # pPrintList :: PrettyLevel -> [Bool] -> Doc Source # | |||||
IArray UArray Bool Source # | |||||
Defined in Data.Array.Base bounds :: Ix i => UArray i Bool -> (i, i) Source # numElements :: Ix i => UArray i Bool -> Int Source # unsafeArray :: Ix i => (i, i) -> [(Int, Bool)] -> UArray i Bool Source # unsafeAt :: Ix i => UArray i Bool -> Int -> Bool Source # unsafeReplace :: Ix i => UArray i Bool -> [(Int, Bool)] -> UArray i Bool Source # unsafeAccum :: Ix i => (Bool -> e' -> Bool) -> UArray i Bool -> [(Int, e')] -> UArray i Bool Source # unsafeAccumArray :: Ix i => (Bool -> e' -> Bool) -> Bool -> (i, i) -> [(Int, e')] -> UArray i Bool Source # | |||||
SingI 'False # | |||||
Defined in GHC.Internal.Generics | |||||
SingI 'True # | |||||
Defined in GHC.Internal.Generics | |||||
MArray IOUArray Bool IO Source # | |||||
Defined in Data.Array.IO.Internals 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) Source # | |||||
Defined in Data.Array.Base 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.Internal.Generics | |||||
type Rep Bool # | |||||
data Sing (a :: Bool) # | |||||
Instances
Structured Char Source # | |||||
Defined in Distribution.Utils.Structured | |||||
IsChar Char Source # | Since: base-2.1 | ||||
PrintfArg Char Source # | Since: base-2.1 | ||||
Defined in Text.Printf formatArg :: Char -> FieldFormatter Source # parseFormat :: Char -> ModifierParser Source # | |||||
Binary Char Source # | |||||
NFData Char Source # | |||||
Defined in Control.DeepSeq | |||||
Data Char # | |||||
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Char -> c Char # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Char # dataTypeOf :: Char -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Char) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Char) # gmapT :: (forall b. Data b => b -> b) -> Char -> Char # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Char -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Char -> r # gmapQ :: (forall d. Data d => d -> u) -> Char -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Char -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Char -> m Char # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Char -> m Char # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Char -> m Char # | |||||
Bounded Char # | |||||
Enum Char # | |||||
Ix Char # | |||||
Read Char # | |||||
Show Char # | |||||
Eq Char # | |||||
Ord Char # | |||||
Pretty Char Source # | |||||
Defined in Text.PrettyPrint.Annotated.HughesPJClass pPrintPrec :: PrettyLevel -> Rational -> Char -> Doc ann Source # pPrint :: Char -> Doc ann Source # pPrintList :: PrettyLevel -> [Char] -> Doc ann Source # | |||||
Pretty Char Source # | |||||
Defined in Text.PrettyPrint.HughesPJClass pPrintPrec :: PrettyLevel -> Rational -> Char -> Doc Source # pPrint :: Char -> Doc Source # pPrintList :: PrettyLevel -> [Char] -> Doc Source # | |||||
Newtype String FilePathNT Source # | |||||
Defined in Distribution.FieldGrammar.Newtypes pack :: String -> FilePathNT Source # unpack :: FilePathNT -> String Source # | |||||
Newtype String Token Source # | |||||
Newtype String Token' Source # | |||||
IArray UArray Char Source # | |||||
Defined in Data.Array.Base bounds :: Ix i => UArray i Char -> (i, i) Source # numElements :: Ix i => UArray i Char -> Int Source # unsafeArray :: Ix i => (i, i) -> [(Int, Char)] -> UArray i Char Source # unsafeAt :: Ix i => UArray i Char -> Int -> Char Source # unsafeReplace :: Ix i => UArray i Char -> [(Int, Char)] -> UArray i Char Source # unsafeAccum :: Ix i => (Char -> e' -> Char) -> UArray i Char -> [(Int, e')] -> UArray i Char Source # unsafeAccumArray :: Ix i => (Char -> e' -> Char) -> Char -> (i, i) -> [(Int, e')] -> UArray i Char Source # | |||||
TestCoercion SChar # | |||||
Defined in GHC.Internal.TypeLits | |||||
TestEquality SChar # | |||||
Defined in GHC.Internal.TypeLits | |||||
MArray IOUArray Char IO Source # | |||||
Defined in Data.Array.IO.Internals 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 # | |||||
Monad m => Stream FieldLineStream m Char Source # | |||||
Defined in Distribution.Parsec.FieldLineStream uncons :: FieldLineStream -> m (Maybe (Char, FieldLineStream)) Source # | |||||
Monad m => Stream ByteString m Char Source # | |||||
Defined in Text.Parsec.Prim uncons :: ByteString -> m (Maybe (Char, ByteString)) Source # | |||||
Monad m => Stream ByteString m Char Source # | |||||
Defined in Text.Parsec.Prim uncons :: ByteString -> m (Maybe (Char, ByteString)) Source # | |||||
Monad m => Stream Text m Char Source # | |||||
Monad m => Stream Text m Char Source # | |||||
Generic1 (URec Char :: k -> Type) # | |||||
Defined in GHC.Internal.Generics
| |||||
Eq1 (UChar :: Type -> Type) Source # | Since: base-4.21.0.0 | ||||
Ord1 (UChar :: Type -> Type) Source # | Since: base-4.21.0.0 | ||||
Defined in Data.Functor.Classes | |||||
Show1 (UChar :: Type -> Type) Source # | Since: base-4.21.0.0 | ||||
Foldable (UChar :: Type -> Type) # | |||||
Defined in GHC.Internal.Data.Foldable fold :: Monoid m => UChar m -> m # foldMap :: Monoid m => (a -> m) -> UChar a -> m # foldMap' :: Monoid m => (a -> m) -> UChar a -> m # foldr :: (a -> b -> b) -> b -> UChar a -> b # foldr' :: (a -> b -> b) -> b -> UChar a -> b # foldl :: (b -> a -> b) -> b -> UChar a -> b # foldl' :: (b -> a -> b) -> b -> UChar a -> b # foldr1 :: (a -> a -> a) -> UChar a -> a # foldl1 :: (a -> a -> a) -> UChar a -> a # elem :: Eq a => a -> UChar a -> Bool # maximum :: Ord a => UChar a -> a # minimum :: Ord a => UChar a -> a # | |||||
Traversable (UChar :: Type -> Type) # | |||||
MArray (STUArray s) Char (ST s) Source # | |||||
Defined in Data.Array.Base 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) # | |||||
Generic (URec Char p) # | |||||
Defined in GHC.Internal.Generics
| |||||
Show (URec Char p) # | |||||
Eq (URec Char p) # | |||||
Ord (URec Char p) # | |||||
Defined in GHC.Internal.Generics | |||||
data URec Char (p :: k) # | |||||
type Compare (a :: Char) (b :: Char) # | |||||
Defined in GHC.Internal.Data.Type.Ord | |||||
type Rep1 (URec Char :: k -> Type) # | |||||
Defined in GHC.Internal.Generics | |||||
type Rep (URec Char p) # | |||||
Defined in GHC.Internal.Generics |
Instances
Structured Double Source # | |||||
Defined in Distribution.Utils.Structured | |||||
PrintfArg Double Source # | Since: base-2.1 | ||||
Defined in Text.Printf formatArg :: Double -> FieldFormatter Source # parseFormat :: Double -> ModifierParser Source # | |||||
Binary Double Source # | Uses non-IEEE754 encoding. Does not round-trip NaN. | ||||
NFData Double Source # | |||||
Defined in Control.DeepSeq | |||||
Data Double # | |||||
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Double -> c Double # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Double # toConstr :: Double -> Constr # dataTypeOf :: Double -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Double) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Double) # gmapT :: (forall b. Data b => b -> b) -> Double -> Double # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Double -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Double -> r # gmapQ :: (forall d. Data d => d -> u) -> Double -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Double -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Double -> m Double # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Double -> m Double # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Double -> m Double # | |||||
Floating Double # | |||||
RealFloat Double # | |||||
Defined in GHC.Internal.Float floatRadix :: Double -> Integer # floatDigits :: Double -> Int # floatRange :: Double -> (Int, Int) # decodeFloat :: Double -> (Integer, Int) # encodeFloat :: Integer -> Int -> Double # significand :: Double -> Double # scaleFloat :: Int -> Double -> Double # isInfinite :: Double -> Bool # isDenormalized :: Double -> Bool # isNegativeZero :: Double -> Bool # | |||||
Read Double # | |||||
Eq Double # | |||||
Ord Double # | |||||
Pretty Double Source # | |||||
Defined in Text.PrettyPrint.Annotated.HughesPJClass pPrintPrec :: PrettyLevel -> Rational -> Double -> Doc ann Source # pPrint :: Double -> Doc ann Source # pPrintList :: PrettyLevel -> [Double] -> Doc ann Source # | |||||
Pretty Double Source # | |||||
Defined in Text.PrettyPrint.HughesPJClass pPrintPrec :: PrettyLevel -> Rational -> Double -> Doc Source # pPrint :: Double -> Doc Source # pPrintList :: PrettyLevel -> [Double] -> Doc Source # | |||||
IArray UArray Double Source # | |||||
Defined in Data.Array.Base 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 # | |||||
MArray IOUArray Double IO Source # | |||||
Defined in Data.Array.IO.Internals getBounds :: Ix i => IOUArray i Double -> IO (i, i) Source # getNumElements :: Ix i => IOUArray i Double -> IO Int Source # newArray :: Ix i => (i, i) -> Double -> IO (IOUArray i Double) Source # newArray_ :: Ix i => (i, i) -> IO (IOUArray i Double) Source # unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Double) Source # unsafeRead :: Ix i => IOUArray i Double -> Int -> IO Double Source # unsafeWrite :: Ix i => IOUArray i Double -> Int -> Double -> IO () Source # | |||||
Generic1 (URec Double :: k -> Type) # | |||||
Defined in GHC.Internal.Generics
| |||||
Eq1 (UDouble :: Type -> Type) Source # | Since: base-4.21.0.0 | ||||
Ord1 (UDouble :: Type -> Type) Source # | Since: base-4.21.0.0 | ||||
Defined in Data.Functor.Classes | |||||
Show1 (UDouble :: Type -> Type) Source # | Since: base-4.21.0.0 | ||||
Foldable (UDouble :: Type -> Type) # | |||||
Defined in GHC.Internal.Data.Foldable fold :: Monoid m => UDouble m -> m # foldMap :: Monoid m => (a -> m) -> UDouble a -> m # foldMap' :: Monoid m => (a -> m) -> UDouble a -> m # foldr :: (a -> b -> b) -> b -> UDouble a -> b # foldr' :: (a -> b -> b) -> b -> UDouble a -> b # foldl :: (b -> a -> b) -> b -> UDouble a -> b # foldl' :: (b -> a -> b) -> b -> UDouble a -> b # foldr1 :: (a -> a -> a) -> UDouble a -> a # foldl1 :: (a -> a -> a) -> UDouble a -> a # elem :: Eq a => a -> UDouble a -> Bool # maximum :: Ord a => UDouble a -> a # minimum :: Ord a => UDouble a -> a # | |||||
Traversable (UDouble :: Type -> Type) # | |||||
MArray (STUArray s) Double (ST s) Source # | |||||
Defined in Data.Array.Base getBounds :: Ix i => STUArray s i Double -> ST s (i, i) Source # getNumElements :: Ix i => STUArray s i Double -> ST s Int Source # newArray :: Ix i => (i, i) -> Double -> ST s (STUArray s i Double) Source # newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Double) Source # unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Double) Source # unsafeRead :: Ix i => STUArray s i Double -> Int -> ST s Double Source # unsafeWrite :: Ix i => STUArray s i Double -> Int -> Double -> ST s () Source # | |||||
Functor (URec Double :: Type -> Type) # | |||||
Generic (URec Double p) # | |||||
Defined in GHC.Internal.Generics
| |||||
Show (URec Double p) # | |||||
Eq (URec Double p) # | |||||
Ord (URec Double p) # | |||||
Defined in GHC.Internal.Generics compare :: URec Double p -> URec Double p -> Ordering # (<) :: URec Double p -> URec Double p -> Bool # (<=) :: URec Double p -> URec Double p -> Bool # (>) :: URec Double p -> URec Double p -> Bool # (>=) :: URec Double p -> URec Double p -> Bool # | |||||
data URec Double (p :: k) # | |||||
type Rep1 (URec Double :: k -> Type) # | |||||
Defined in GHC.Internal.Generics | |||||
type Rep (URec Double p) # | |||||
Defined in GHC.Internal.Generics |
Instances
Structured Float Source # | |||||
Defined in Distribution.Utils.Structured | |||||
PrintfArg Float Source # | Since: base-2.1 | ||||
Defined in Text.Printf formatArg :: Float -> FieldFormatter Source # parseFormat :: Float -> ModifierParser Source # | |||||
Binary Float Source # | Uses non-IEEE754 encoding. Does not round-trip NaN. | ||||
NFData Float Source # | |||||
Defined in Control.DeepSeq | |||||
Data Float # | |||||
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Float -> c Float # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Float # dataTypeOf :: Float -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Float) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Float) # gmapT :: (forall b. Data b => b -> b) -> Float -> Float # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Float -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Float -> r # gmapQ :: (forall d. Data d => d -> u) -> Float -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Float -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Float -> m Float # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Float -> m Float # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Float -> m Float # | |||||
Floating Float # | |||||
RealFloat Float # | |||||
Defined in GHC.Internal.Float floatRadix :: Float -> Integer # floatDigits :: Float -> Int # floatRange :: Float -> (Int, Int) # decodeFloat :: Float -> (Integer, Int) # encodeFloat :: Integer -> Int -> Float # significand :: Float -> Float # scaleFloat :: Int -> Float -> Float # isInfinite :: Float -> Bool # isDenormalized :: Float -> Bool # isNegativeZero :: Float -> Bool # | |||||
Read Float # | |||||
Eq Float # | |||||
Ord Float # | |||||
Pretty Float Source # | |||||
Defined in Text.PrettyPrint.Annotated.HughesPJClass pPrintPrec :: PrettyLevel -> Rational -> Float -> Doc ann Source # pPrint :: Float -> Doc ann Source # pPrintList :: PrettyLevel -> [Float] -> Doc ann Source # | |||||
Pretty Float Source # | |||||
Defined in Text.PrettyPrint.HughesPJClass pPrintPrec :: PrettyLevel -> Rational -> Float -> Doc Source # pPrint :: Float -> Doc Source # pPrintList :: PrettyLevel -> [Float] -> Doc Source # | |||||
IArray UArray Float Source # | |||||
Defined in Data.Array.Base bounds :: Ix i => UArray i Float -> (i, i) Source # numElements :: Ix i => UArray i Float -> Int Source # unsafeArray :: Ix i => (i, i) -> [(Int, Float)] -> UArray i Float Source # unsafeAt :: Ix i => UArray i Float -> Int -> Float Source # unsafeReplace :: Ix i => UArray i Float -> [(Int, Float)] -> UArray i Float Source # unsafeAccum :: Ix i => (Float -> e' -> Float) -> UArray i Float -> [(Int, e')] -> UArray i Float Source # unsafeAccumArray :: Ix i => (Float -> e' -> Float) -> Float -> (i, i) -> [(Int, e')] -> UArray i Float Source # | |||||
MArray IOUArray Float IO Source # | |||||
Defined in Data.Array.IO.Internals getBounds :: Ix i => IOUArray i Float -> IO (i, i) Source # getNumElements :: Ix i => IOUArray i Float -> IO Int Source # newArray :: Ix i => (i, i) -> Float -> IO (IOUArray i Float) Source # newArray_ :: Ix i => (i, i) -> IO (IOUArray i Float) Source # unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Float) Source # unsafeRead :: Ix i => IOUArray i Float -> Int -> IO Float Source # unsafeWrite :: Ix i => IOUArray i Float -> Int -> Float -> IO () Source # | |||||
Generic1 (URec Float :: k -> Type) # | |||||
Defined in GHC.Internal.Generics
| |||||
Eq1 (UFloat :: Type -> Type) Source # | Since: base-4.21.0.0 | ||||
Ord1 (UFloat :: Type -> Type) Source # | Since: base-4.21.0.0 | ||||
Defined in Data.Functor.Classes | |||||
Show1 (UFloat :: Type -> Type) Source # | Since: base-4.21.0.0 | ||||
Foldable (UFloat :: Type -> Type) # | |||||
Defined in GHC.Internal.Data.Foldable fold :: Monoid m => UFloat m -> m # foldMap :: Monoid m => (a -> m) -> UFloat a -> m # foldMap' :: Monoid m => (a -> m) -> UFloat a -> m # foldr :: (a -> b -> b) -> b -> UFloat a -> b # foldr' :: (a -> b -> b) -> b -> UFloat a -> b # foldl :: (b -> a -> b) -> b -> UFloat a -> b # foldl' :: (b -> a -> b) -> b -> UFloat a -> b # foldr1 :: (a -> a -> a) -> UFloat a -> a # foldl1 :: (a -> a -> a) -> UFloat a -> a # elem :: Eq a => a -> UFloat a -> Bool # maximum :: Ord a => UFloat a -> a # minimum :: Ord a => UFloat a -> a # | |||||
Traversable (UFloat :: Type -> Type) # | |||||
MArray (STUArray s) Float (ST s) Source # | |||||
Defined in Data.Array.Base getBounds :: Ix i => STUArray s i Float -> ST s (i, i) Source # getNumElements :: Ix i => STUArray s i Float -> ST s Int Source # newArray :: Ix i => (i, i) -> Float -> ST s (STUArray s i Float) Source # newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Float) Source # unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Float) Source # unsafeRead :: Ix i => STUArray s i Float -> Int -> ST s Float Source # unsafeWrite :: Ix i => STUArray s i Float -> Int -> Float -> ST s () Source # | |||||
Functor (URec Float :: Type -> Type) # | |||||
Generic (URec Float p) # | |||||
Defined in GHC.Internal.Generics
| |||||
Show (URec Float p) # | |||||
Eq (URec Float p) # | |||||
Ord (URec Float p) # | |||||
Defined in GHC.Internal.Generics | |||||
data URec Float (p :: k) # | |||||
type Rep1 (URec Float :: k -> Type) # | |||||
Defined in GHC.Internal.Generics | |||||
type Rep (URec Float p) # | |||||
Defined in GHC.Internal.Generics |
Instances
Pretty Int Source # | |||||
Defined in Distribution.Pretty | |||||
Structured Int Source # | |||||
Defined in Distribution.Utils.Structured | |||||
PrintfArg Int Source # | Since: base-2.1 | ||||
Defined in Text.Printf formatArg :: Int -> FieldFormatter Source # parseFormat :: Int -> ModifierParser Source # | |||||
Binary Int Source # | |||||
NFData Int Source # | |||||
Defined in Control.DeepSeq | |||||
Bits Int # | |||||
Defined in GHC.Internal.Bits | |||||
FiniteBits Int # | |||||
Defined in GHC.Internal.Bits | |||||
Data Int # | |||||
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Int -> c Int # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Int # dataTypeOf :: Int -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Int) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Int) # gmapT :: (forall b. Data b => b -> b) -> Int -> Int # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Int -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Int -> r # gmapQ :: (forall d. Data d => d -> u) -> Int -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Int -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Int -> m Int # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Int -> m Int # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Int -> m Int # | |||||
Bounded Int # | |||||
Enum Int # | |||||
Ix Int # | |||||
Num Int # | |||||
Read Int # | |||||
Integral Int # | |||||
Real Int # | |||||
Defined in GHC.Internal.Real toRational :: Int -> Rational # | |||||
Show Int # | |||||
Eq Int # | |||||
Ord Int # | |||||
Pretty Int Source # | |||||
Defined in Text.PrettyPrint.Annotated.HughesPJClass pPrintPrec :: PrettyLevel -> Rational -> Int -> Doc ann Source # pPrint :: Int -> Doc ann Source # pPrintList :: PrettyLevel -> [Int] -> Doc ann Source # | |||||
Pretty Int Source # | |||||
Defined in Text.PrettyPrint.HughesPJClass pPrintPrec :: PrettyLevel -> Rational -> Int -> Doc Source # pPrintList :: PrettyLevel -> [Int] -> Doc Source # | |||||
IArray UArray Int Source # | |||||
Defined in Data.Array.Base 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 # | |||||
MArray IOUArray Int IO Source # | |||||
Defined in Data.Array.IO.Internals 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.Internal.Generics
| |||||
Eq1 (UInt :: Type -> Type) Source # | Since: base-4.21.0.0 | ||||
Ord1 (UInt :: Type -> Type) Source # | Since: base-4.21.0.0 | ||||
Defined in Data.Functor.Classes | |||||
Show1 (UInt :: Type -> Type) Source # | Since: base-4.21.0.0 | ||||
Foldable (UInt :: Type -> Type) # | |||||
Defined in GHC.Internal.Data.Foldable fold :: Monoid m => UInt m -> m # foldMap :: Monoid m => (a -> m) -> UInt a -> m # foldMap' :: Monoid m => (a -> m) -> UInt a -> m # foldr :: (a -> b -> b) -> b -> UInt a -> b # foldr' :: (a -> b -> b) -> b -> UInt a -> b # foldl :: (b -> a -> b) -> b -> UInt a -> b # foldl' :: (b -> a -> b) -> b -> UInt a -> b # foldr1 :: (a -> a -> a) -> UInt a -> a # foldl1 :: (a -> a -> a) -> UInt a -> a # elem :: Eq a => a -> UInt a -> Bool # maximum :: Ord a => UInt a -> a # | |||||
Traversable (UInt :: Type -> Type) # | |||||
MArray (STUArray s) Int (ST s) Source # | |||||
Defined in Data.Array.Base 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) # | |||||
Generic (URec Int p) # | |||||
Defined in GHC.Internal.Generics
| |||||
Show (URec Int p) # | |||||
Eq (URec Int p) # | |||||
Ord (URec Int p) # | |||||
data URec Int (p :: k) # | |||||
type Rep1 (URec Int :: k -> Type) # | |||||
Defined in GHC.Internal.Generics | |||||
type Rep (URec Int p) # | |||||
Defined in GHC.Internal.Generics |
Common type-classes
Instances
Semigroup Benchmark Source # | |
Semigroup BenchmarkInterface Source # | |
Defined in Distribution.Types.BenchmarkInterface (<>) :: BenchmarkInterface -> BenchmarkInterface -> BenchmarkInterface # sconcat :: NonEmpty BenchmarkInterface -> BenchmarkInterface # stimes :: Integral b => b -> BenchmarkInterface -> BenchmarkInterface # | |
Semigroup BuildInfo Source # | |
Semigroup Component Source # | |
Semigroup DependencyMap Source # | |
Defined in Distribution.Types.DependencyMap (<>) :: DependencyMap -> DependencyMap -> DependencyMap # sconcat :: NonEmpty DependencyMap -> DependencyMap # stimes :: Integral b => b -> DependencyMap -> DependencyMap # | |
Semigroup Executable Source # | |
Defined in Distribution.Types.Executable (<>) :: Executable -> Executable -> Executable # sconcat :: NonEmpty Executable -> Executable # stimes :: Integral b => b -> Executable -> Executable # | |
Semigroup ExecutableScope Source # |
|
Defined in Distribution.Types.ExecutableScope (<>) :: ExecutableScope -> ExecutableScope -> ExecutableScope # sconcat :: NonEmpty ExecutableScope -> ExecutableScope # stimes :: Integral b => b -> ExecutableScope -> ExecutableScope # | |
Semigroup FlagAssignment Source # | |
Defined in Distribution.Types.Flag (<>) :: FlagAssignment -> FlagAssignment -> FlagAssignment # sconcat :: NonEmpty FlagAssignment -> FlagAssignment # stimes :: Integral b => b -> FlagAssignment -> FlagAssignment # | |
Semigroup ForeignLib Source # | |
Defined in Distribution.Types.ForeignLib (<>) :: ForeignLib -> ForeignLib -> ForeignLib # sconcat :: NonEmpty ForeignLib -> ForeignLib # stimes :: Integral b => b -> ForeignLib -> ForeignLib # | |
Semigroup ForeignLibType Source # | |
Defined in Distribution.Types.ForeignLibType (<>) :: ForeignLibType -> ForeignLibType -> ForeignLibType # sconcat :: NonEmpty ForeignLibType -> ForeignLibType # stimes :: Integral b => b -> ForeignLibType -> ForeignLibType # | |
Semigroup Library Source # | |
Semigroup LibraryVisibility Source # | |
Defined in Distribution.Types.LibraryVisibility (<>) :: LibraryVisibility -> LibraryVisibility -> LibraryVisibility # sconcat :: NonEmpty LibraryVisibility -> LibraryVisibility # stimes :: Integral b => b -> LibraryVisibility -> LibraryVisibility # | |
Semigroup SetupBuildInfo Source # | |
Defined in Distribution.Types.SetupBuildInfo (<>) :: SetupBuildInfo -> SetupBuildInfo -> SetupBuildInfo # sconcat :: NonEmpty SetupBuildInfo -> SetupBuildInfo # stimes :: Integral b => b -> SetupBuildInfo -> SetupBuildInfo # | |
Semigroup TestSuite Source # | |
Semigroup TestSuiteInterface Source # | |
Defined in Distribution.Types.TestSuiteInterface (<>) :: TestSuiteInterface -> TestSuiteInterface -> TestSuiteInterface # sconcat :: NonEmpty TestSuiteInterface -> TestSuiteInterface # stimes :: Integral b => b -> TestSuiteInterface -> TestSuiteInterface # | |
Semigroup UnqualComponentName Source # | |
Defined in Distribution.Types.UnqualComponentName (<>) :: UnqualComponentName -> UnqualComponentName -> UnqualComponentName # sconcat :: NonEmpty UnqualComponentName -> UnqualComponentName # stimes :: Integral b => b -> UnqualComponentName -> UnqualComponentName # | |
Semigroup ShortText Source # | |
Semigroup ByteArray Source # | Since: base-4.17.0.0 |
Semigroup Builder Source # | |
Semigroup ByteString Source # | |
Defined in Data.ByteString.Internal.Type (<>) :: ByteString -> ByteString -> ByteString # sconcat :: NonEmpty ByteString -> ByteString # stimes :: Integral b => b -> ByteString -> ByteString # | |
Semigroup ByteString Source # | |
Defined in Data.ByteString.Lazy.Internal (<>) :: ByteString -> ByteString -> ByteString # sconcat :: NonEmpty ByteString -> ByteString # stimes :: Integral b => b -> ByteString -> ByteString # | |
Semigroup ShortByteString Source # | |
Defined in Data.ByteString.Short.Internal (<>) :: ShortByteString -> ShortByteString -> ShortByteString # sconcat :: NonEmpty ShortByteString -> ShortByteString # stimes :: Integral b => b -> ShortByteString -> ShortByteString # | |
Semigroup IntSet Source # | Since: containers-0.5.7 |
Semigroup Unit Source # | |
Semigroup Void # | |
Semigroup All # | |
Semigroup Any # | |
Semigroup Ordering # | |
Semigroup OsString # | |
Semigroup PosixString # | |
Defined in System.OsString.Internal.Types (<>) :: PosixString -> PosixString -> PosixString # sconcat :: NonEmpty PosixString -> PosixString # stimes :: Integral b => b -> PosixString -> PosixString # | |
Semigroup WindowsString # | |
Defined in System.OsString.Internal.Types (<>) :: WindowsString -> WindowsString -> WindowsString # sconcat :: NonEmpty WindowsString -> WindowsString # stimes :: Integral b => b -> WindowsString -> WindowsString # | |
Semigroup Doc Source # | |
Semigroup Builder Source # | |
Semigroup StrictBuilder Source # | Concatenation of |
Defined in Data.Text.Internal.StrictBuilder (<>) :: StrictBuilder -> StrictBuilder -> StrictBuilder # sconcat :: NonEmpty StrictBuilder -> StrictBuilder # stimes :: Integral b => b -> StrictBuilder -> StrictBuilder # | |
Semigroup CalendarDiffDays Source # | Additive |
Defined in Data.Time.Calendar.CalendarDiffDays (<>) :: CalendarDiffDays -> CalendarDiffDays -> CalendarDiffDays # sconcat :: NonEmpty CalendarDiffDays -> CalendarDiffDays # stimes :: Integral b => b -> CalendarDiffDays -> CalendarDiffDays # | |
Semigroup CalendarDiffTime Source # | Additive |
Defined in Data.Time.LocalTime.Internal.CalendarDiffTime (<>) :: CalendarDiffTime -> CalendarDiffTime -> CalendarDiffTime # sconcat :: NonEmpty CalendarDiffTime -> CalendarDiffTime # stimes :: Integral b => b -> CalendarDiffTime -> CalendarDiffTime # | |
Semigroup () # | |
Semigroup (DList a) Source # | |
Ord a => Semigroup (NonEmptySet a) Source # | Note: there aren't |
Defined in Distribution.Compat.NonEmptySet (<>) :: NonEmptySet a -> NonEmptySet a -> NonEmptySet a # sconcat :: NonEmpty (NonEmptySet a) -> NonEmptySet a # stimes :: Integral b => b -> NonEmptySet a -> NonEmptySet a # | |
Semigroup (First' a) Source # | |
Semigroup (Last' a) Source # | |
Semigroup a => Semigroup (Option' a) Source # | |
Semigroup a => Semigroup (PerCompilerFlavor a) Source # | |
Defined in Distribution.Compiler (<>) :: PerCompilerFlavor a -> PerCompilerFlavor a -> PerCompilerFlavor a # sconcat :: NonEmpty (PerCompilerFlavor a) -> PerCompilerFlavor a # stimes :: Integral b => b -> PerCompilerFlavor a -> PerCompilerFlavor a # | |
Semigroup (Condition a) Source # | |
Semigroup (FromMaybe b) Source # | |
Semigroup a => Semigroup (JoinWith a) Source # | |
Semigroup (NonEmptyDList a) Source # | |
Semigroup (Comparison a) Source # |
(<>) :: Comparison a -> Comparison a -> Comparison a Comparison cmp <> Comparison cmp' = Comparison a a' -> cmp a a' <> cmp a a' |
Defined in Data.Functor.Contravariant (<>) :: Comparison a -> Comparison a -> Comparison a # sconcat :: NonEmpty (Comparison a) -> Comparison a # stimes :: Integral b => b -> Comparison a -> Comparison a # | |
Semigroup (Equivalence a) Source # |
(<>) :: Equivalence a -> Equivalence a -> Equivalence a Equivalence equiv <> Equivalence equiv' = Equivalence a b -> equiv a b && equiv' a b |
Defined in Data.Functor.Contravariant (<>) :: Equivalence a -> Equivalence a -> Equivalence a # sconcat :: NonEmpty (Equivalence a) -> Equivalence a # stimes :: Integral b => b -> Equivalence a -> Equivalence a # | |
Semigroup (Predicate a) Source # |
(<>) :: Predicate a -> Predicate a -> Predicate a Predicate pred <> Predicate pred' = Predicate a -> pred a && pred' a |
Semigroup (First a) Source # | Since: base-4.9.0.0 |
Semigroup (Last a) Source # | Since: base-4.9.0.0 |
Ord a => Semigroup (Max a) Source # | Since: base-4.9.0.0 |
Ord a => Semigroup (Min a) Source # | Since: base-4.9.0.0 |
Monoid m => Semigroup (WrappedMonoid m) Source # | Since: base-4.9.0.0 |
Defined in Data.Semigroup (<>) :: WrappedMonoid m -> WrappedMonoid m -> WrappedMonoid m # sconcat :: NonEmpty (WrappedMonoid m) -> WrappedMonoid m # stimes :: Integral b => b -> WrappedMonoid m -> WrappedMonoid m # | |
Semigroup (PutM ()) Source # | |
Semigroup (IntMap a) Source # | Since: containers-0.5.7 |
Semigroup (Seq a) Source # | Since: containers-0.5.7 |
Ord a => Semigroup (Intersection a) Source # | |
Defined in Data.Set.Internal (<>) :: Intersection a -> Intersection a -> Intersection a # sconcat :: NonEmpty (Intersection a) -> Intersection a # stimes :: Integral b => b -> Intersection a -> Intersection a # | |
Semigroup (MergeSet a) Source # | |
Ord a => Semigroup (Set a) Source # | Since: containers-0.5.7 |
Semigroup (NonEmpty a) # | |
Semigroup a => Semigroup (Identity a) # | |
Semigroup (First a) # | |
Semigroup (Last a) # | |
Semigroup a => Semigroup (Down a) # | |
Semigroup a => Semigroup (Dual a) # | |
Semigroup (Endo a) # | |
Num a => Semigroup (Product a) # | |
Num a => Semigroup (Sum a) # | |
(Generic a, Semigroup (Rep a ())) => Semigroup (Generically a) # | |
Defined in GHC.Internal.Generics (<>) :: Generically a -> Generically a -> Generically a # sconcat :: NonEmpty (Generically a) -> Generically a # stimes :: Integral b => b -> Generically a -> Generically a # | |
Semigroup p => Semigroup (Par1 p) # | |
Semigroup a => Semigroup (Q a) # | |
Semigroup a => Semigroup (IO a) # | |
Semigroup (Doc a) Source # | |
Semigroup a => Semigroup (Maybe a) # | |
Semigroup a => Semigroup (Solo a) # | |
Semigroup [a] # | |
Semigroup a => Semigroup (Op a b) Source # |
(<>) :: Op a b -> Op a b -> Op a b Op f <> Op g = Op a -> f a <> g a |
Ord k => Semigroup (Map k v) Source # | |
Semigroup (Either a b) # | |
Semigroup (Proxy s) # | |
Semigroup (U1 p) # | |
Semigroup (V1 p) # | |
(Semigroup a, Semigroup b) => Semigroup (a, b) # | |
Semigroup b => Semigroup (a -> b) # | |
(Semigroup a, Semigroup c) => Semigroup (CondTree v c a) Source # | |
Semigroup a => Semigroup (Const a b) # | |
(Applicative f, Semigroup a) => Semigroup (Ap f a) # | |
Alternative f => Semigroup (Alt f a) # | |
Semigroup (f p) => Semigroup (Rec1 f p) # | |
Semigroup a => Semigroup (Constant a b) Source # | |
(Semigroup a, Semigroup b, Semigroup c) => Semigroup (a, b, c) # | |
(Semigroup (f a), Semigroup (g a)) => Semigroup (Product f g a) Source # | Since: base-4.16.0.0 |
(Semigroup (f p), Semigroup (g p)) => Semigroup ((f :*: g) p) # | |
Semigroup c => Semigroup (K1 i c p) # | |
Semigroup a => Semigroup (ParsecT s u m a) Source # | The (many $ char The above will parse a string like (many $ char Since: parsec-3.1.12 |
(Semigroup a, Semigroup b, Semigroup c, Semigroup d) => Semigroup (a, b, c, d) # | |
Semigroup (f (g a)) => Semigroup (Compose f g a) Source # | Since: base-4.16.0.0 |
Semigroup (f (g p)) => Semigroup ((f :.: g) p) # | |
Semigroup (f p) => Semigroup (M1 i c f p) # | |
(Semigroup a, Semigroup b, Semigroup c, Semigroup d, Semigroup e) => Semigroup (a, b, c, d, e) # | |
type TypeRep = SomeTypeRep #
Instances
Data OpenModule Source # | |
Defined in Distribution.Backpack gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OpenModule -> c OpenModule # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OpenModule # toConstr :: OpenModule -> Constr # dataTypeOf :: OpenModule -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OpenModule) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OpenModule) # gmapT :: (forall b. Data b => b -> b) -> OpenModule -> OpenModule # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OpenModule -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OpenModule -> r # gmapQ :: (forall d. Data d => d -> u) -> OpenModule -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> OpenModule -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> OpenModule -> m OpenModule # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OpenModule -> m OpenModule # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OpenModule -> m OpenModule # | |
Data OpenUnitId Source # | |
Defined in Distribution.Backpack gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OpenUnitId -> c OpenUnitId # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OpenUnitId # toConstr :: OpenUnitId -> Constr # dataTypeOf :: OpenUnitId -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OpenUnitId) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OpenUnitId) # gmapT :: (forall b. Data b => b -> b) -> OpenUnitId -> OpenUnitId # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OpenUnitId -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OpenUnitId -> r # gmapQ :: (forall d. Data d => d -> u) -> OpenUnitId -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> OpenUnitId -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> OpenUnitId -> m OpenUnitId # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OpenUnitId -> m OpenUnitId # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OpenUnitId -> m OpenUnitId # | |
Data CabalSpecVersion Source # | |
Defined in Distribution.CabalSpecVersion gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CabalSpecVersion -> c CabalSpecVersion # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CabalSpecVersion # toConstr :: CabalSpecVersion -> Constr # dataTypeOf :: CabalSpecVersion -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CabalSpecVersion) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CabalSpecVersion) # gmapT :: (forall b. Data b => b -> b) -> CabalSpecVersion -> CabalSpecVersion # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CabalSpecVersion -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CabalSpecVersion -> r # gmapQ :: (forall d. Data d => d -> u) -> CabalSpecVersion -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> CabalSpecVersion -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> CabalSpecVersion -> m CabalSpecVersion # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CabalSpecVersion -> m CabalSpecVersion # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CabalSpecVersion -> m CabalSpecVersion # | |
Data CompilerFlavor Source # | |
Defined in Distribution.Compiler gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CompilerFlavor -> c CompilerFlavor # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CompilerFlavor # toConstr :: CompilerFlavor -> Constr # dataTypeOf :: CompilerFlavor -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CompilerFlavor) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CompilerFlavor) # gmapT :: (forall b. Data b => b -> b) -> CompilerFlavor -> CompilerFlavor # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CompilerFlavor -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CompilerFlavor -> r # gmapQ :: (forall d. Data d => d -> u) -> CompilerFlavor -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> CompilerFlavor -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> CompilerFlavor -> m CompilerFlavor # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CompilerFlavor -> m CompilerFlavor # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CompilerFlavor -> m CompilerFlavor # | |
Data License Source # | |
Defined in Distribution.License gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> License -> c License # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c License # toConstr :: License -> Constr # dataTypeOf :: License -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c License) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c License) # gmapT :: (forall b. Data b => b -> b) -> License -> License # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> License -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> License -> r # gmapQ :: (forall d. Data d => d -> u) -> License -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> License -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> License -> m License # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> License -> m License # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> License -> m License # | |
Data ModuleName Source # | |
Defined in Distribution.ModuleName gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ModuleName -> c ModuleName # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ModuleName # toConstr :: ModuleName -> Constr # dataTypeOf :: ModuleName -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ModuleName) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ModuleName) # gmapT :: (forall b. Data b => b -> b) -> ModuleName -> ModuleName # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ModuleName -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ModuleName -> r # gmapQ :: (forall d. Data d => d -> u) -> ModuleName -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> ModuleName -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> ModuleName -> m ModuleName # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ModuleName -> m ModuleName # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ModuleName -> m ModuleName # | |
Data License Source # | |
Defined in Distribution.SPDX.License gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> License -> c License # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c License # toConstr :: License -> Constr # dataTypeOf :: License -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c License) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c License) # gmapT :: (forall b. Data b => b -> b) -> License -> License # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> License -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> License -> r # gmapQ :: (forall d. Data d => d -> u) -> License -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> License -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> License -> m License # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> License -> m License # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> License -> m License # | |
Data LicenseExceptionId Source # | |
Defined in Distribution.SPDX.LicenseExceptionId gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LicenseExceptionId -> c LicenseExceptionId # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c LicenseExceptionId # toConstr :: LicenseExceptionId -> Constr # dataTypeOf :: LicenseExceptionId -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LicenseExceptionId) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c LicenseExceptionId) # gmapT :: (forall b. Data b => b -> b) -> LicenseExceptionId -> LicenseExceptionId # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LicenseExceptionId -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LicenseExceptionId -> r # gmapQ :: (forall d. Data d => d -> u) -> LicenseExceptionId -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> LicenseExceptionId -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> LicenseExceptionId -> m LicenseExceptionId # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LicenseExceptionId -> m LicenseExceptionId # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LicenseExceptionId -> m LicenseExceptionId # | |
Data LicenseExpression Source # | |
Defined in Distribution.SPDX.LicenseExpression gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LicenseExpression -> c LicenseExpression # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c LicenseExpression # toConstr :: LicenseExpression -> Constr # dataTypeOf :: LicenseExpression -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LicenseExpression) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c LicenseExpression) # gmapT :: (forall b. Data b => b -> b) -> LicenseExpression -> LicenseExpression # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LicenseExpression -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LicenseExpression -> r # gmapQ :: (forall d. Data d => d -> u) -> LicenseExpression -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> LicenseExpression -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> LicenseExpression -> m LicenseExpression # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LicenseExpression -> m LicenseExpression # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LicenseExpression -> m LicenseExpression # | |
Data SimpleLicenseExpression Source # | |
Defined in Distribution.SPDX.LicenseExpression gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SimpleLicenseExpression -> c SimpleLicenseExpression # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SimpleLicenseExpression # toConstr :: SimpleLicenseExpression -> Constr # dataTypeOf :: SimpleLicenseExpression -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SimpleLicenseExpression) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SimpleLicenseExpression) # gmapT :: (forall b. Data b => b -> b) -> SimpleLicenseExpression -> SimpleLicenseExpression # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SimpleLicenseExpression -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SimpleLicenseExpression -> r # gmapQ :: (forall d. Data d => d -> u) -> SimpleLicenseExpression -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> SimpleLicenseExpression -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> SimpleLicenseExpression -> m SimpleLicenseExpression # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SimpleLicenseExpression -> m SimpleLicenseExpression # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SimpleLicenseExpression -> m SimpleLicenseExpression # | |
Data LicenseId Source # | |
Defined in Distribution.SPDX.LicenseId gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LicenseId -> c LicenseId # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c LicenseId # toConstr :: LicenseId -> Constr # dataTypeOf :: LicenseId -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LicenseId) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c LicenseId) # gmapT :: (forall b. Data b => b -> b) -> LicenseId -> LicenseId # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LicenseId -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LicenseId -> r # gmapQ :: (forall d. Data d => d -> u) -> LicenseId -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> LicenseId -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> LicenseId -> m LicenseId # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LicenseId -> m LicenseId # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LicenseId -> m LicenseId # | |
Data LicenseRef Source # | |
Defined in Distribution.SPDX.LicenseReference gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LicenseRef -> c LicenseRef # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c LicenseRef # toConstr :: LicenseRef -> Constr # dataTypeOf :: LicenseRef -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LicenseRef) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c LicenseRef) # gmapT :: (forall b. Data b => b -> b) -> LicenseRef -> LicenseRef # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LicenseRef -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LicenseRef -> r # gmapQ :: (forall d. Data d => d -> u) -> LicenseRef -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> LicenseRef -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> LicenseRef -> m LicenseRef # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LicenseRef -> m LicenseRef # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LicenseRef -> m LicenseRef # | |
Data Arch Source # | |
Defined in Distribution.System gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Arch -> c Arch # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Arch # dataTypeOf :: Arch -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Arch) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Arch) # gmapT :: (forall b. Data b => b -> b) -> Arch -> Arch # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Arch -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Arch -> r # gmapQ :: (forall d. Data d => d -> u) -> Arch -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Arch -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Arch -> m Arch # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Arch -> m Arch # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Arch -> m Arch # | |
Data OS Source # | |
Defined in Distribution.System gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OS -> c OS # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OS # dataTypeOf :: OS -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OS) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OS) # gmapT :: (forall b. Data b => b -> b) -> OS -> OS # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OS -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OS -> r # gmapQ :: (forall d. Data d => d -> u) -> OS -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> OS -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> OS -> m OS # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OS -> m OS # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OS -> m OS # | |
Data Platform Source # | |
Defined in Distribution.System gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Platform -> c Platform # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Platform # toConstr :: Platform -> Constr # dataTypeOf :: Platform -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Platform) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Platform) # gmapT :: (forall b. Data b => b -> b) -> Platform -> Platform # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Platform -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Platform -> r # gmapQ :: (forall d. Data d => d -> u) -> Platform -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Platform -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Platform -> m Platform # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Platform -> m Platform # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Platform -> m Platform # | |
Data Benchmark Source # | |
Defined in Distribution.Types.Benchmark gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Benchmark -> c Benchmark # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Benchmark # toConstr :: Benchmark -> Constr # dataTypeOf :: Benchmark -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Benchmark) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Benchmark) # gmapT :: (forall b. Data b => b -> b) -> Benchmark -> Benchmark # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Benchmark -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Benchmark -> r # gmapQ :: (forall d. Data d => d -> u) -> Benchmark -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Benchmark -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Benchmark -> m Benchmark # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Benchmark -> m Benchmark # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Benchmark -> m Benchmark # | |
Data BenchmarkInterface Source # | |
Defined in Distribution.Types.BenchmarkInterface gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BenchmarkInterface -> c BenchmarkInterface # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BenchmarkInterface # toConstr :: BenchmarkInterface -> Constr # dataTypeOf :: BenchmarkInterface -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BenchmarkInterface) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BenchmarkInterface) # gmapT :: (forall b. Data b => b -> b) -> BenchmarkInterface -> BenchmarkInterface # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BenchmarkInterface -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BenchmarkInterface -> r # gmapQ :: (forall d. Data d => d -> u) -> BenchmarkInterface -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> BenchmarkInterface -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> BenchmarkInterface -> m BenchmarkInterface # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BenchmarkInterface -> m BenchmarkInterface # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BenchmarkInterface -> m BenchmarkInterface # | |
Data BenchmarkType Source # | |
Defined in Distribution.Types.BenchmarkType gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BenchmarkType -> c BenchmarkType # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BenchmarkType # toConstr :: BenchmarkType -> Constr # dataTypeOf :: BenchmarkType -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BenchmarkType) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BenchmarkType) # gmapT :: (forall b. Data b => b -> b) -> BenchmarkType -> BenchmarkType # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BenchmarkType -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BenchmarkType -> r # gmapQ :: (forall d. Data d => d -> u) -> BenchmarkType -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> BenchmarkType -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> BenchmarkType -> m BenchmarkType # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BenchmarkType -> m BenchmarkType # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BenchmarkType -> m BenchmarkType # | |
Data BuildInfo Source # | |
Defined in Distribution.Types.BuildInfo gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BuildInfo -> c BuildInfo # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BuildInfo # toConstr :: BuildInfo -> Constr # dataTypeOf :: BuildInfo -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BuildInfo) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BuildInfo) # gmapT :: (forall b. Data b => b -> b) -> BuildInfo -> BuildInfo # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BuildInfo -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BuildInfo -> r # gmapQ :: (forall d. Data d => d -> u) -> BuildInfo -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> BuildInfo -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> BuildInfo -> m BuildInfo # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildInfo -> m BuildInfo # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildInfo -> m BuildInfo # | |
Data BuildType Source # | |
Defined in Distribution.Types.BuildType gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BuildType -> c BuildType # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BuildType # toConstr :: BuildType -> Constr # dataTypeOf :: BuildType -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BuildType) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BuildType) # gmapT :: (forall b. Data b => b -> b) -> BuildType -> BuildType # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BuildType -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BuildType -> r # gmapQ :: (forall d. Data d => d -> u) -> BuildType -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> BuildType -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> BuildType -> m BuildType # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildType -> m BuildType # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BuildType -> m BuildType # | |
Data ComponentId Source # | |
Defined in Distribution.Types.ComponentId gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ComponentId -> c ComponentId # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ComponentId # toConstr :: ComponentId -> Constr # dataTypeOf :: ComponentId -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ComponentId) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ComponentId) # gmapT :: (forall b. Data b => b -> b) -> ComponentId -> ComponentId # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ComponentId -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ComponentId -> r # gmapQ :: (forall d. Data d => d -> u) -> ComponentId -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> ComponentId -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> ComponentId -> m ComponentId # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ComponentId -> m ComponentId # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ComponentId -> m ComponentId # | |
Data ConfVar Source # | |
Defined in Distribution.Types.ConfVar gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ConfVar -> c ConfVar # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ConfVar # toConstr :: ConfVar -> Constr # dataTypeOf :: ConfVar -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ConfVar) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ConfVar) # gmapT :: (forall b. Data b => b -> b) -> ConfVar -> ConfVar # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ConfVar -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ConfVar -> r # gmapQ :: (forall d. Data d => d -> u) -> ConfVar -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> ConfVar -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> ConfVar -> m ConfVar # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ConfVar -> m ConfVar # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ConfVar -> m ConfVar # | |
Data Dependency Source # | |
Defined in Distribution.Types.Dependency gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Dependency -> c Dependency # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Dependency # toConstr :: Dependency -> Constr # dataTypeOf :: Dependency -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Dependency) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Dependency) # gmapT :: (forall b. Data b => b -> b) -> Dependency -> Dependency # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Dependency -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Dependency -> r # gmapQ :: (forall d. Data d => d -> u) -> Dependency -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Dependency -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Dependency -> m Dependency # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Dependency -> m Dependency # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Dependency -> m Dependency # | |
Data ExeDependency Source # | |
Defined in Distribution.Types.ExeDependency gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ExeDependency -> c ExeDependency # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ExeDependency # toConstr :: ExeDependency -> Constr # dataTypeOf :: ExeDependency -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ExeDependency) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ExeDependency) # gmapT :: (forall b. Data b => b -> b) -> ExeDependency -> ExeDependency # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ExeDependency -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ExeDependency -> r # gmapQ :: (forall d. Data d => d -> u) -> ExeDependency -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> ExeDependency -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> ExeDependency -> m ExeDependency # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ExeDependency -> m ExeDependency # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ExeDependency -> m ExeDependency # | |
Data Executable Source # | |
Defined in Distribution.Types.Executable gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Executable -> c Executable # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Executable # toConstr :: Executable -> Constr # dataTypeOf :: Executable -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Executable) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Executable) # gmapT :: (forall b. Data b => b -> b) -> Executable -> Executable # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Executable -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Executable -> r # gmapQ :: (forall d. Data d => d -> u) -> Executable -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Executable -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Executable -> m Executable # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Executable -> m Executable # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Executable -> m Executable # | |
Data ExecutableScope Source # | |
Defined in Distribution.Types.ExecutableScope gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ExecutableScope -> c ExecutableScope # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ExecutableScope # toConstr :: ExecutableScope -> Constr # dataTypeOf :: ExecutableScope -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ExecutableScope) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ExecutableScope) # gmapT :: (forall b. Data b => b -> b) -> ExecutableScope -> ExecutableScope # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ExecutableScope -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ExecutableScope -> r # gmapQ :: (forall d. Data d => d -> u) -> ExecutableScope -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> ExecutableScope -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> ExecutableScope -> m ExecutableScope # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ExecutableScope -> m ExecutableScope # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ExecutableScope -> m ExecutableScope # | |
Data FlagName Source # | |
Defined in Distribution.Types.Flag gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FlagName -> c FlagName # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FlagName # toConstr :: FlagName -> Constr # dataTypeOf :: FlagName -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c FlagName) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FlagName) # gmapT :: (forall b. Data b => b -> b) -> FlagName -> FlagName # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FlagName -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FlagName -> r # gmapQ :: (forall d. Data d => d -> u) -> FlagName -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> FlagName -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> FlagName -> m FlagName # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FlagName -> m FlagName # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FlagName -> m FlagName # | |
Data PackageFlag Source # | |
Defined in Distribution.Types.Flag gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PackageFlag -> c PackageFlag # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PackageFlag # toConstr :: PackageFlag -> Constr # dataTypeOf :: PackageFlag -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PackageFlag) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PackageFlag) # gmapT :: (forall b. Data b => b -> b) -> PackageFlag -> PackageFlag # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PackageFlag -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PackageFlag -> r # gmapQ :: (forall d. Data d => d -> u) -> PackageFlag -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> PackageFlag -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> PackageFlag -> m PackageFlag # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PackageFlag -> m PackageFlag # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PackageFlag -> m PackageFlag # | |
Data ForeignLib Source # | |
Defined in Distribution.Types.ForeignLib gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ForeignLib -> c ForeignLib # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ForeignLib # toConstr :: ForeignLib -> Constr # dataTypeOf :: ForeignLib -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ForeignLib) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ForeignLib) # gmapT :: (forall b. Data b => b -> b) -> ForeignLib -> ForeignLib # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ForeignLib -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ForeignLib -> r # gmapQ :: (forall d. Data d => d -> u) -> ForeignLib -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> ForeignLib -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> ForeignLib -> m ForeignLib # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ForeignLib -> m ForeignLib # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ForeignLib -> m ForeignLib # | |
Data LibVersionInfo Source # | |
Defined in Distribution.Types.ForeignLib gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LibVersionInfo -> c LibVersionInfo # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c LibVersionInfo # toConstr :: LibVersionInfo -> Constr # dataTypeOf :: LibVersionInfo -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LibVersionInfo) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c LibVersionInfo) # gmapT :: (forall b. Data b => b -> b) -> LibVersionInfo -> LibVersionInfo # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LibVersionInfo -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LibVersionInfo -> r # gmapQ :: (forall d. Data d => d -> u) -> LibVersionInfo -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> LibVersionInfo -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> LibVersionInfo -> m LibVersionInfo # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LibVersionInfo -> m LibVersionInfo # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LibVersionInfo -> m LibVersionInfo # | |
Data ForeignLibOption Source # | |
Defined in Distribution.Types.ForeignLibOption gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ForeignLibOption -> c ForeignLibOption # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ForeignLibOption # toConstr :: ForeignLibOption -> Constr # dataTypeOf :: ForeignLibOption -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ForeignLibOption) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ForeignLibOption) # gmapT :: (forall b. Data b => b -> b) -> ForeignLibOption -> ForeignLibOption # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ForeignLibOption -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ForeignLibOption -> r # gmapQ :: (forall d. Data d => d -> u) -> ForeignLibOption -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> ForeignLibOption -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> ForeignLibOption -> m ForeignLibOption # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ForeignLibOption -> m ForeignLibOption # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ForeignLibOption -> m ForeignLibOption # | |
Data ForeignLibType Source # | |
Defined in Distribution.Types.ForeignLibType gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ForeignLibType -> c ForeignLibType # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ForeignLibType # toConstr :: ForeignLibType -> Constr # dataTypeOf :: ForeignLibType -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ForeignLibType) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ForeignLibType) # gmapT :: (forall b. Data b => b -> b) -> ForeignLibType -> ForeignLibType # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ForeignLibType -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ForeignLibType -> r # gmapQ :: (forall d. Data d => d -> u) -> ForeignLibType -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> ForeignLibType -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> ForeignLibType -> m ForeignLibType # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ForeignLibType -> m ForeignLibType # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ForeignLibType -> m ForeignLibType # | |
Data GenericPackageDescription Source # | |
Defined in Distribution.Types.GenericPackageDescription gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GenericPackageDescription -> c GenericPackageDescription # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c GenericPackageDescription # toConstr :: GenericPackageDescription -> Constr # dataTypeOf :: GenericPackageDescription -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c GenericPackageDescription) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c GenericPackageDescription) # gmapT :: (forall b. Data b => b -> b) -> GenericPackageDescription -> GenericPackageDescription # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GenericPackageDescription -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GenericPackageDescription -> r # gmapQ :: (forall d. Data d => d -> u) -> GenericPackageDescription -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> GenericPackageDescription -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> GenericPackageDescription -> m GenericPackageDescription # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GenericPackageDescription -> m GenericPackageDescription # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GenericPackageDescription -> m GenericPackageDescription # | |
Data IncludeRenaming Source # | |
Defined in Distribution.Types.IncludeRenaming gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IncludeRenaming -> c IncludeRenaming # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IncludeRenaming # toConstr :: IncludeRenaming -> Constr # dataTypeOf :: IncludeRenaming -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IncludeRenaming) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IncludeRenaming) # gmapT :: (forall b. Data b => b -> b) -> IncludeRenaming -> IncludeRenaming # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IncludeRenaming -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IncludeRenaming -> r # gmapQ :: (forall d. Data d => d -> u) -> IncludeRenaming -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> IncludeRenaming -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> IncludeRenaming -> m IncludeRenaming # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IncludeRenaming -> m IncludeRenaming # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IncludeRenaming -> m IncludeRenaming # | |
Data LegacyExeDependency Source # | |
Defined in Distribution.Types.LegacyExeDependency gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LegacyExeDependency -> c LegacyExeDependency # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c LegacyExeDependency # toConstr :: LegacyExeDependency -> Constr # dataTypeOf :: LegacyExeDependency -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LegacyExeDependency) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c LegacyExeDependency) # gmapT :: (forall b. Data b => b -> b) -> LegacyExeDependency -> LegacyExeDependency # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LegacyExeDependency -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LegacyExeDependency -> r # gmapQ :: (forall d. Data d => d -> u) -> LegacyExeDependency -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> LegacyExeDependency -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> LegacyExeDependency -> m LegacyExeDependency # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LegacyExeDependency -> m LegacyExeDependency # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LegacyExeDependency -> m LegacyExeDependency # | |
Data Library Source # | |
Defined in Distribution.Types.Library gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Library -> c Library # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Library # toConstr :: Library -> Constr # dataTypeOf :: Library -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Library) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Library) # gmapT :: (forall b. Data b => b -> b) -> Library -> Library # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Library -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Library -> r # gmapQ :: (forall d. Data d => d -> u) -> Library -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Library -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Library -> m Library # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Library -> m Library # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Library -> m Library # | |
Data LibraryName Source # | |
Defined in Distribution.Types.LibraryName gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LibraryName -> c LibraryName # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c LibraryName # toConstr :: LibraryName -> Constr # dataTypeOf :: LibraryName -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LibraryName) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c LibraryName) # gmapT :: (forall b. Data b => b -> b) -> LibraryName -> LibraryName # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LibraryName -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LibraryName -> r # gmapQ :: (forall d. Data d => d -> u) -> LibraryName -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> LibraryName -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> LibraryName -> m LibraryName # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LibraryName -> m LibraryName # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LibraryName -> m LibraryName # | |
Data LibraryVisibility Source # | |
Defined in Distribution.Types.LibraryVisibility gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LibraryVisibility -> c LibraryVisibility # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c LibraryVisibility # toConstr :: LibraryVisibility -> Constr # dataTypeOf :: LibraryVisibility -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LibraryVisibility) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c LibraryVisibility) # gmapT :: (forall b. Data b => b -> b) -> LibraryVisibility -> LibraryVisibility # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LibraryVisibility -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LibraryVisibility -> r # gmapQ :: (forall d. Data d => d -> u) -> LibraryVisibility -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> LibraryVisibility -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> LibraryVisibility -> m LibraryVisibility # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LibraryVisibility -> m LibraryVisibility # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LibraryVisibility -> m LibraryVisibility # | |
Data Mixin Source # | |
Defined in Distribution.Types.Mixin gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Mixin -> c Mixin # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Mixin # dataTypeOf :: Mixin -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Mixin) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Mixin) # gmapT :: (forall b. Data b => b -> b) -> Mixin -> Mixin # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Mixin -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Mixin -> r # gmapQ :: (forall d. Data d => d -> u) -> Mixin -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Mixin -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Mixin -> m Mixin # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Mixin -> m Mixin # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Mixin -> m Mixin # | |
Data Module Source # | |
Defined in Distribution.Types.Module gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Module -> c Module # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Module # toConstr :: Module -> Constr # dataTypeOf :: Module -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Module) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Module) # gmapT :: (forall b. Data b => b -> b) -> Module -> Module # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Module -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Module -> r # gmapQ :: (forall d. Data d => d -> u) -> Module -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Module -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Module -> m Module # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Module -> m Module # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Module -> m Module # | |
Data ModuleReexport Source # | |
Defined in Distribution.Types.ModuleReexport gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ModuleReexport -> c ModuleReexport # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ModuleReexport # toConstr :: ModuleReexport -> Constr # dataTypeOf :: ModuleReexport -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ModuleReexport) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ModuleReexport) # gmapT :: (forall b. Data b => b -> b) -> ModuleReexport -> ModuleReexport # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ModuleReexport -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ModuleReexport -> r # gmapQ :: (forall d. Data d => d -> u) -> ModuleReexport -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> ModuleReexport -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> ModuleReexport -> m ModuleReexport # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ModuleReexport -> m ModuleReexport # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ModuleReexport -> m ModuleReexport # | |
Data ModuleRenaming Source # | |
Defined in Distribution.Types.ModuleRenaming gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ModuleRenaming -> c ModuleRenaming # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ModuleRenaming # toConstr :: ModuleRenaming -> Constr # dataTypeOf :: ModuleRenaming -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ModuleRenaming) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ModuleRenaming) # gmapT :: (forall b. Data b => b -> b) -> ModuleRenaming -> ModuleRenaming # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ModuleRenaming -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ModuleRenaming -> r # gmapQ :: (forall d. Data d => d -> u) -> ModuleRenaming -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> ModuleRenaming -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> ModuleRenaming -> m ModuleRenaming # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ModuleRenaming -> m ModuleRenaming # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ModuleRenaming -> m ModuleRenaming # | |
Data MungedPackageId Source # | |
Defined in Distribution.Types.MungedPackageId gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> MungedPackageId -> c MungedPackageId # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c MungedPackageId # toConstr :: MungedPackageId -> Constr # dataTypeOf :: MungedPackageId -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c MungedPackageId) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c MungedPackageId) # gmapT :: (forall b. Data b => b -> b) -> MungedPackageId -> MungedPackageId # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> MungedPackageId -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> MungedPackageId -> r # gmapQ :: (forall d. Data d => d -> u) -> MungedPackageId -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> MungedPackageId -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> MungedPackageId -> m MungedPackageId # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> MungedPackageId -> m MungedPackageId # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> MungedPackageId -> m MungedPackageId # | |
Data MungedPackageName Source # | |
Defined in Distribution.Types.MungedPackageName gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> MungedPackageName -> c MungedPackageName # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c MungedPackageName # toConstr :: MungedPackageName -> Constr # dataTypeOf :: MungedPackageName -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c MungedPackageName) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c MungedPackageName) # gmapT :: (forall b. Data b => b -> b) -> MungedPackageName -> MungedPackageName # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> MungedPackageName -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> MungedPackageName -> r # gmapQ :: (forall d. Data d => d -> u) -> MungedPackageName -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> MungedPackageName -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> MungedPackageName -> m MungedPackageName # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> MungedPackageName -> m MungedPackageName # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> MungedPackageName -> m MungedPackageName # | |
Data PackageDescription Source # | |
Defined in Distribution.Types.PackageDescription gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PackageDescription -> c PackageDescription # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PackageDescription # toConstr :: PackageDescription -> Constr # dataTypeOf :: PackageDescription -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PackageDescription) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PackageDescription) # gmapT :: (forall b. Data b => b -> b) -> PackageDescription -> PackageDescription # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PackageDescription -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PackageDescription -> r # gmapQ :: (forall d. Data d => d -> u) -> PackageDescription -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> PackageDescription -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> PackageDescription -> m PackageDescription # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PackageDescription -> m PackageDescription # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PackageDescription -> m PackageDescription # | |
Data PackageIdentifier Source # | |
Defined in Distribution.Types.PackageId gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PackageIdentifier -> c PackageIdentifier # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PackageIdentifier # toConstr :: PackageIdentifier -> Constr # dataTypeOf :: PackageIdentifier -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PackageIdentifier) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PackageIdentifier) # gmapT :: (forall b. Data b => b -> b) -> PackageIdentifier -> PackageIdentifier # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PackageIdentifier -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PackageIdentifier -> r # gmapQ :: (forall d. Data d => d -> u) -> PackageIdentifier -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> PackageIdentifier -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> PackageIdentifier -> m PackageIdentifier # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PackageIdentifier -> m PackageIdentifier # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PackageIdentifier -> m PackageIdentifier # | |
Data PackageName Source # | |
Defined in Distribution.Types.PackageName gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PackageName -> c PackageName # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PackageName # toConstr :: PackageName -> Constr # dataTypeOf :: PackageName -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PackageName) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PackageName) # gmapT :: (forall b. Data b => b -> b) -> PackageName -> PackageName # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PackageName -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PackageName -> r # gmapQ :: (forall d. Data d => d -> u) -> PackageName -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> PackageName -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> PackageName -> m PackageName # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PackageName -> m PackageName # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PackageName -> m PackageName # | |
Data PackageVersionConstraint Source # | |
Defined in Distribution.Types.PackageVersionConstraint gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PackageVersionConstraint -> c PackageVersionConstraint # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PackageVersionConstraint # toConstr :: PackageVersionConstraint -> Constr # dataTypeOf :: PackageVersionConstraint -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PackageVersionConstraint) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PackageVersionConstraint) # gmapT :: (forall b. Data b => b -> b) -> PackageVersionConstraint -> PackageVersionConstraint # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PackageVersionConstraint -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PackageVersionConstraint -> r # gmapQ :: (forall d. Data d => d -> u) -> PackageVersionConstraint -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> PackageVersionConstraint -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> PackageVersionConstraint -> m PackageVersionConstraint # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PackageVersionConstraint -> m PackageVersionConstraint # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PackageVersionConstraint -> m PackageVersionConstraint # | |
Data PkgconfigDependency Source # | |
Defined in Distribution.Types.PkgconfigDependency gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PkgconfigDependency -> c PkgconfigDependency # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PkgconfigDependency # toConstr :: PkgconfigDependency -> Constr # dataTypeOf :: PkgconfigDependency -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PkgconfigDependency) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PkgconfigDependency) # gmapT :: (forall b. Data b => b -> b) -> PkgconfigDependency -> PkgconfigDependency # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PkgconfigDependency -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PkgconfigDependency -> r # gmapQ :: (forall d. Data d => d -> u) -> PkgconfigDependency -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> PkgconfigDependency -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> PkgconfigDependency -> m PkgconfigDependency # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PkgconfigDependency -> m PkgconfigDependency # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PkgconfigDependency -> m PkgconfigDependency # | |
Data PkgconfigName Source # | |
Defined in Distribution.Types.PkgconfigName gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PkgconfigName -> c PkgconfigName # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PkgconfigName # toConstr :: PkgconfigName -> Constr # dataTypeOf :: PkgconfigName -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PkgconfigName) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PkgconfigName) # gmapT :: (forall b. Data b => b -> b) -> PkgconfigName -> PkgconfigName # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PkgconfigName -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PkgconfigName -> r # gmapQ :: (forall d. Data d => d -> u) -> PkgconfigName -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> PkgconfigName -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> PkgconfigName -> m PkgconfigName # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PkgconfigName -> m PkgconfigName # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PkgconfigName -> m PkgconfigName # | |
Data PkgconfigVersion Source # | |
Defined in Distribution.Types.PkgconfigVersion gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PkgconfigVersion -> c PkgconfigVersion # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PkgconfigVersion # toConstr :: PkgconfigVersion -> Constr # dataTypeOf :: PkgconfigVersion -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PkgconfigVersion) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PkgconfigVersion) # gmapT :: (forall b. Data b => b -> b) -> PkgconfigVersion -> PkgconfigVersion # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PkgconfigVersion -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PkgconfigVersion -> r # gmapQ :: (forall d. Data d => d -> u) -> PkgconfigVersion -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> PkgconfigVersion -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> PkgconfigVersion -> m PkgconfigVersion # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PkgconfigVersion -> m PkgconfigVersion # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PkgconfigVersion -> m PkgconfigVersion # | |
Data PkgconfigVersionRange Source # | |
Defined in Distribution.Types.PkgconfigVersionRange gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PkgconfigVersionRange -> c PkgconfigVersionRange # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PkgconfigVersionRange # toConstr :: PkgconfigVersionRange -> Constr # dataTypeOf :: PkgconfigVersionRange -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PkgconfigVersionRange) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PkgconfigVersionRange) # gmapT :: (forall b. Data b => b -> b) -> PkgconfigVersionRange -> PkgconfigVersionRange # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PkgconfigVersionRange -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PkgconfigVersionRange -> r # gmapQ :: (forall d. Data d => d -> u) -> PkgconfigVersionRange -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> PkgconfigVersionRange -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> PkgconfigVersionRange -> m PkgconfigVersionRange # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PkgconfigVersionRange -> m PkgconfigVersionRange # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PkgconfigVersionRange -> m PkgconfigVersionRange # | |
Data SetupBuildInfo Source # | |
Defined in Distribution.Types.SetupBuildInfo gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SetupBuildInfo -> c SetupBuildInfo # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SetupBuildInfo # toConstr :: SetupBuildInfo -> Constr # dataTypeOf :: SetupBuildInfo -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SetupBuildInfo) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SetupBuildInfo) # gmapT :: (forall b. Data b => b -> b) -> SetupBuildInfo -> SetupBuildInfo # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SetupBuildInfo -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SetupBuildInfo -> r # gmapQ :: (forall d. Data d => d -> u) -> SetupBuildInfo -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> SetupBuildInfo -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> SetupBuildInfo -> m SetupBuildInfo # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SetupBuildInfo -> m SetupBuildInfo # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SetupBuildInfo -> m SetupBuildInfo # | |
Data KnownRepoType Source # | |
Defined in Distribution.Types.SourceRepo gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> KnownRepoType -> c KnownRepoType # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c KnownRepoType # toConstr :: KnownRepoType -> Constr # dataTypeOf :: KnownRepoType -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c KnownRepoType) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c KnownRepoType) # gmapT :: (forall b. Data b => b -> b) -> KnownRepoType -> KnownRepoType # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> KnownRepoType -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> KnownRepoType -> r # gmapQ :: (forall d. Data d => d -> u) -> KnownRepoType -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> KnownRepoType -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> KnownRepoType -> m KnownRepoType # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> KnownRepoType -> m KnownRepoType # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> KnownRepoType -> m KnownRepoType # | |
Data RepoKind Source # | |
Defined in Distribution.Types.SourceRepo gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RepoKind -> c RepoKind # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RepoKind # toConstr :: RepoKind -> Constr # dataTypeOf :: RepoKind -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RepoKind) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RepoKind) # gmapT :: (forall b. Data b => b -> b) -> RepoKind -> RepoKind # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RepoKind -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RepoKind -> r # gmapQ :: (forall d. Data d => d -> u) -> RepoKind -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> RepoKind -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> RepoKind -> m RepoKind # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RepoKind -> m RepoKind # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RepoKind -> m RepoKind # | |
Data RepoType Source # | |
Defined in Distribution.Types.SourceRepo gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RepoType -> c RepoType # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RepoType # toConstr :: RepoType -> Constr # dataTypeOf :: RepoType -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RepoType) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RepoType) # gmapT :: (forall b. Data b => b -> b) -> RepoType -> RepoType # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RepoType -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RepoType -> r # gmapQ :: (forall d. Data d => d -> u) -> RepoType -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> RepoType -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> RepoType -> m RepoType # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RepoType -> m RepoType # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RepoType -> m RepoType # | |
Data SourceRepo Source # | |
Defined in Distribution.Types.SourceRepo gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SourceRepo -> c SourceRepo # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SourceRepo # toConstr :: SourceRepo -> Constr # dataTypeOf :: SourceRepo -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SourceRepo) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SourceRepo) # gmapT :: (forall b. Data b => b -> b) -> SourceRepo -> SourceRepo # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SourceRepo -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SourceRepo -> r # gmapQ :: (forall d. Data d => d -> u) -> SourceRepo -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> SourceRepo -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> SourceRepo -> m SourceRepo # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SourceRepo -> m SourceRepo # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SourceRepo -> m SourceRepo # | |
Data TestSuite Source # | |
Defined in Distribution.Types.TestSuite gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TestSuite -> c TestSuite # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TestSuite # toConstr :: TestSuite -> Constr # dataTypeOf :: TestSuite -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TestSuite) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TestSuite) # gmapT :: (forall b. Data b => b -> b) -> TestSuite -> TestSuite # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TestSuite -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TestSuite -> r # gmapQ :: (forall d. Data d => d -> u) -> TestSuite -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> TestSuite -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> TestSuite -> m TestSuite # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TestSuite -> m TestSuite # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TestSuite -> m TestSuite # | |
Data TestSuiteInterface Source # | |
Defined in Distribution.Types.TestSuiteInterface gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TestSuiteInterface -> c TestSuiteInterface # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TestSuiteInterface # toConstr :: TestSuiteInterface -> Constr # dataTypeOf :: TestSuiteInterface -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TestSuiteInterface) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TestSuiteInterface) # gmapT :: (forall b. Data b => b -> b) -> TestSuiteInterface -> TestSuiteInterface # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TestSuiteInterface -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TestSuiteInterface -> r # gmapQ :: (forall d. Data d => d -> u) -> TestSuiteInterface -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> TestSuiteInterface -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> TestSuiteInterface -> m TestSuiteInterface # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TestSuiteInterface -> m TestSuiteInterface # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TestSuiteInterface -> m TestSuiteInterface # | |
Data TestType Source # | |
Defined in Distribution.Types.TestType gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TestType -> c TestType # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TestType # toConstr :: TestType -> Constr # dataTypeOf :: TestType -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TestType) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TestType) # gmapT :: (forall b. Data b => b -> b) -> TestType -> TestType # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TestType -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TestType -> r # gmapQ :: (forall d. Data d => d -> u) -> TestType -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> TestType -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> TestType -> m TestType # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TestType -> m TestType # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TestType -> m TestType # | |
Data DefUnitId Source # | |
Defined in Distribution.Types.UnitId gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DefUnitId -> c DefUnitId # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DefUnitId # toConstr :: DefUnitId -> Constr # dataTypeOf :: DefUnitId -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DefUnitId) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DefUnitId) # gmapT :: (forall b. Data b => b -> b) -> DefUnitId -> DefUnitId # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DefUnitId -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DefUnitId -> r # gmapQ :: (forall d. Data d => d -> u) -> DefUnitId -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> DefUnitId -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> DefUnitId -> m DefUnitId # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DefUnitId -> m DefUnitId # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DefUnitId -> m DefUnitId # | |
Data UnitId Source # | |
Defined in Distribution.Types.UnitId gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UnitId -> c UnitId # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UnitId # toConstr :: UnitId -> Constr # dataTypeOf :: UnitId -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UnitId) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UnitId) # gmapT :: (forall b. Data b => b -> b) -> UnitId -> UnitId # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UnitId -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UnitId -> r # gmapQ :: (forall d. Data d => d -> u) -> UnitId -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> UnitId -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> UnitId -> m UnitId # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UnitId -> m UnitId # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UnitId -> m UnitId # | |
Data UnqualComponentName Source # | |
Defined in Distribution.Types.UnqualComponentName gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UnqualComponentName -> c UnqualComponentName # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UnqualComponentName # toConstr :: UnqualComponentName -> Constr # dataTypeOf :: UnqualComponentName -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UnqualComponentName) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UnqualComponentName) # gmapT :: (forall b. Data b => b -> b) -> UnqualComponentName -> UnqualComponentName # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UnqualComponentName -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UnqualComponentName -> r # gmapQ :: (forall d. Data d => d -> u) -> UnqualComponentName -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> UnqualComponentName -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> UnqualComponentName -> m UnqualComponentName # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UnqualComponentName -> m UnqualComponentName # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UnqualComponentName -> m UnqualComponentName # | |
Data Version Source # | |
Defined in Distribution.Types.Version gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Version -> c Version # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Version # toConstr :: Version -> Constr # dataTypeOf :: Version -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Version) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Version) # gmapT :: (forall b. Data b => b -> b) -> Version -> Version # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Version -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Version -> r # gmapQ :: (forall d. Data d => d -> u) -> Version -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Version -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Version -> m Version # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Version -> m Version # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Version -> m Version # | |
Data VersionRange Source # | |
Defined in Distribution.Types.VersionRange.Internal gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> VersionRange -> c VersionRange # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c VersionRange # toConstr :: VersionRange -> Constr # dataTypeOf :: VersionRange -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c VersionRange) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c VersionRange) # gmapT :: (forall b. Data b => b -> b) -> VersionRange -> VersionRange # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> VersionRange -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> VersionRange -> r # gmapQ :: (forall d. Data d => d -> u) -> VersionRange -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> VersionRange -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> VersionRange -> m VersionRange # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> VersionRange -> m VersionRange # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> VersionRange -> m VersionRange # | |
Data ShortText Source # | |
Defined in Distribution.Utils.ShortText gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ShortText -> c ShortText # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ShortText # toConstr :: ShortText -> Constr # dataTypeOf :: ShortText -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ShortText) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ShortText) # gmapT :: (forall b. Data b => b -> b) -> ShortText -> ShortText # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ShortText -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ShortText -> r # gmapQ :: (forall d. Data d => d -> u) -> ShortText -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> ShortText -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> ShortText -> m ShortText # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ShortText -> m ShortText # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ShortText -> m ShortText # | |
Data Extension Source # | |
Defined in Language.Haskell.Extension gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Extension -> c Extension # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Extension # toConstr :: Extension -> Constr # dataTypeOf :: Extension -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Extension) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Extension) # gmapT :: (forall b. Data b => b -> b) -> Extension -> Extension # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Extension -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Extension -> r # gmapQ :: (forall d. Data d => d -> u) -> Extension -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Extension -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Extension -> m Extension # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Extension -> m Extension # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Extension -> m Extension # | |
Data KnownExtension Source # | |
Defined in Language.Haskell.Extension gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> KnownExtension -> c KnownExtension # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c KnownExtension # toConstr :: KnownExtension -> Constr # dataTypeOf :: KnownExtension -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c KnownExtension) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c KnownExtension) # gmapT :: (forall b. Data b => b -> b) -> KnownExtension -> KnownExtension # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> KnownExtension -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> KnownExtension -> r # gmapQ :: (forall d. Data d => d -> u) -> KnownExtension -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> KnownExtension -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> KnownExtension -> m KnownExtension # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> KnownExtension -> m KnownExtension # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> KnownExtension -> m KnownExtension # | |
Data Language Source # | |
Defined in Language.Haskell.Extension gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Language -> c Language # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Language # toConstr :: Language -> Constr # dataTypeOf :: Language -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Language) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Language) # gmapT :: (forall b. Data b => b -> b) -> Language -> Language # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Language -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Language -> r # gmapQ :: (forall d. Data d => d -> u) -> Language -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Language -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Language -> m Language # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Language -> m Language # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Language -> m Language # | |
Data ByteArray Source # | Since: base-4.17.0.0 |
Defined in Data.Array.Byte gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ByteArray -> c ByteArray # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ByteArray # toConstr :: ByteArray -> Constr # dataTypeOf :: ByteArray -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ByteArray) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ByteArray) # gmapT :: (forall b. Data b => b -> b) -> ByteArray -> ByteArray # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ByteArray -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ByteArray -> r # gmapQ :: (forall d. Data d => d -> u) -> ByteArray -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> ByteArray -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> ByteArray -> m ByteArray # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ByteArray -> m ByteArray # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ByteArray -> m ByteArray # | |
Data ByteString Source # | |
Defined in Data.ByteString.Internal.Type gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ByteString -> c ByteString # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ByteString # toConstr :: ByteString -> Constr # dataTypeOf :: ByteString -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ByteString) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ByteString) # gmapT :: (forall b. Data b => b -> b) -> ByteString -> ByteString # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ByteString -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ByteString -> r # gmapQ :: (forall d. Data d => d -> u) -> ByteString -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> ByteString -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> ByteString -> m ByteString # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ByteString -> m ByteString # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ByteString -> m ByteString # | |
Data ByteString Source # | |
Defined in Data.ByteString.Lazy.Internal gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ByteString -> c ByteString # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ByteString # toConstr :: ByteString -> Constr # dataTypeOf :: ByteString -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ByteString) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ByteString) # gmapT :: (forall b. Data b => b -> b) -> ByteString -> ByteString # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ByteString -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ByteString -> r # gmapQ :: (forall d. Data d => d -> u) -> ByteString -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> ByteString -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> ByteString -> m ByteString # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ByteString -> m ByteString # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ByteString -> m ByteString # | |
Data ShortByteString Source # | |
Defined in Data.ByteString.Short.Internal gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ShortByteString -> c ShortByteString # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ShortByteString # toConstr :: ShortByteString -> Constr # dataTypeOf :: ShortByteString -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ShortByteString) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ShortByteString) # gmapT :: (forall b. Data b => b -> b) -> ShortByteString -> ShortByteString # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ShortByteString -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ShortByteString -> r # gmapQ :: (forall d. Data d => d -> u) -> ShortByteString -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> ShortByteString -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> ShortByteString -> m ShortByteString # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ShortByteString -> m ShortByteString # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ShortByteString -> m ShortByteString # | |
Data IntSet Source # | |
Defined in Data.IntSet.Internal gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IntSet -> c IntSet # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IntSet # toConstr :: IntSet -> Constr # dataTypeOf :: IntSet -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IntSet) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IntSet) # gmapT :: (forall b. Data b => b -> b) -> IntSet -> IntSet # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IntSet -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IntSet -> r # gmapQ :: (forall d. Data d => d -> u) -> IntSet -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> IntSet -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> IntSet -> m IntSet # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IntSet -> m IntSet # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IntSet -> m IntSet # | |
Data Void # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Void -> c Void # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Void # dataTypeOf :: Void -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Void) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Void) # gmapT :: (forall b. Data b => b -> b) -> Void -> Void # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Void -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Void -> r # gmapQ :: (forall d. Data d => d -> u) -> Void -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Void -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Void -> m Void # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Void -> m Void # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Void -> m Void # | |
Data All # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> All -> c All # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c All # dataTypeOf :: All -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c All) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c All) # gmapT :: (forall b. Data b => b -> b) -> All -> All # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> All -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> All -> r # gmapQ :: (forall d. Data d => d -> u) -> All -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> All -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> All -> m All # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> All -> m All # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> All -> m All # | |
Data Any # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Any -> c Any # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Any # dataTypeOf :: Any -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Any) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Any) # gmapT :: (forall b. Data b => b -> b) -> Any -> Any # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Any -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Any -> r # gmapQ :: (forall d. Data d => d -> u) -> Any -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Any -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Any -> m Any # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Any -> m Any # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Any -> m Any # | |
Data Version # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Version -> c Version # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Version # toConstr :: Version -> Constr # dataTypeOf :: Version -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Version) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Version) # gmapT :: (forall b. Data b => b -> b) -> Version -> Version # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Version -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Version -> r # gmapQ :: (forall d. Data d => d -> u) -> Version -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Version -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Version -> m Version # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Version -> m Version # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Version -> m Version # | |
Data IntPtr # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IntPtr -> c IntPtr # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IntPtr # toConstr :: IntPtr -> Constr # dataTypeOf :: IntPtr -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IntPtr) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IntPtr) # gmapT :: (forall b. Data b => b -> b) -> IntPtr -> IntPtr # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IntPtr -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IntPtr -> r # gmapQ :: (forall d. Data d => d -> u) -> IntPtr -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> IntPtr -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> IntPtr -> m IntPtr # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IntPtr -> m IntPtr # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IntPtr -> m IntPtr # | |
Data WordPtr # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> WordPtr -> c WordPtr # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c WordPtr # toConstr :: WordPtr -> Constr # dataTypeOf :: WordPtr -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c WordPtr) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c WordPtr) # gmapT :: (forall b. Data b => b -> b) -> WordPtr -> WordPtr # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WordPtr -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WordPtr -> r # gmapQ :: (forall d. Data d => d -> u) -> WordPtr -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> WordPtr -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> WordPtr -> m WordPtr # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> WordPtr -> m WordPtr # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> WordPtr -> m WordPtr # | |
Data Associativity # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Associativity -> c Associativity # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Associativity # toConstr :: Associativity -> Constr # dataTypeOf :: Associativity -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Associativity) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Associativity) # gmapT :: (forall b. Data b => b -> b) -> Associativity -> Associativity # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Associativity -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Associativity -> r # gmapQ :: (forall d. Data d => d -> u) -> Associativity -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Associativity -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Associativity -> m Associativity # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Associativity -> m Associativity # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Associativity -> m Associativity # | |
Data DecidedStrictness # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DecidedStrictness -> c DecidedStrictness # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DecidedStrictness # toConstr :: DecidedStrictness -> Constr # dataTypeOf :: DecidedStrictness -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DecidedStrictness) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DecidedStrictness) # gmapT :: (forall b. Data b => b -> b) -> DecidedStrictness -> DecidedStrictness # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DecidedStrictness -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DecidedStrictness -> r # gmapQ :: (forall d. Data d => d -> u) -> DecidedStrictness -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> DecidedStrictness -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> DecidedStrictness -> m DecidedStrictness # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DecidedStrictness -> m DecidedStrictness # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DecidedStrictness -> m DecidedStrictness # | |
Data Fixity # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Fixity -> c Fixity # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Fixity # toConstr :: Fixity -> Constr # dataTypeOf :: Fixity -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Fixity) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Fixity) # gmapT :: (forall b. Data b => b -> b) -> Fixity -> Fixity # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Fixity -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Fixity -> r # gmapQ :: (forall d. Data d => d -> u) -> Fixity -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Fixity -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Fixity -> m Fixity # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Fixity -> m Fixity # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Fixity -> m Fixity # | |
Data SourceStrictness # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SourceStrictness -> c SourceStrictness # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SourceStrictness # toConstr :: SourceStrictness -> Constr # dataTypeOf :: SourceStrictness -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SourceStrictness) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SourceStrictness) # gmapT :: (forall b. Data b => b -> b) -> SourceStrictness -> SourceStrictness # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SourceStrictness -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SourceStrictness -> r # gmapQ :: (forall d. Data d => d -> u) -> SourceStrictness -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> SourceStrictness -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> SourceStrictness -> m SourceStrictness # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SourceStrictness -> m SourceStrictness # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SourceStrictness -> m SourceStrictness # | |
Data SourceUnpackedness # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SourceUnpackedness -> c SourceUnpackedness # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SourceUnpackedness # toConstr :: SourceUnpackedness -> Constr # dataTypeOf :: SourceUnpackedness -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SourceUnpackedness) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SourceUnpackedness) # gmapT :: (forall b. Data b => b -> b) -> SourceUnpackedness -> SourceUnpackedness # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SourceUnpackedness -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SourceUnpackedness -> r # gmapQ :: (forall d. Data d => d -> u) -> SourceUnpackedness -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> SourceUnpackedness -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> SourceUnpackedness -> m SourceUnpackedness # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SourceUnpackedness -> m SourceUnpackedness # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SourceUnpackedness -> m SourceUnpackedness # | |
Data Int16 # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Int16 -> c Int16 # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Int16 # dataTypeOf :: Int16 -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Int16) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Int16) # gmapT :: (forall b. Data b => b -> b) -> Int16 -> Int16 # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Int16 -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Int16 -> r # gmapQ :: (forall d. Data d => d -> u) -> Int16 -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Int16 -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Int16 -> m Int16 # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Int16 -> m Int16 # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Int16 -> m Int16 # | |
Data Int32 # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Int32 -> c Int32 # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Int32 # dataTypeOf :: Int32 -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Int32) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Int32) # gmapT :: (forall b. Data b => b -> b) -> Int32 -> Int32 # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Int32 -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Int32 -> r # gmapQ :: (forall d. Data d => d -> u) -> Int32 -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Int32 -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Int32 -> m Int32 # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Int32 -> m Int32 # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Int32 -> m Int32 # | |
Data Int64 # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Int64 -> c Int64 # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Int64 # dataTypeOf :: Int64 -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Int64) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Int64) # gmapT :: (forall b. Data b => b -> b) -> Int64 -> Int64 # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Int64 -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Int64 -> r # gmapQ :: (forall d. Data d => d -> u) -> Int64 -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Int64 -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Int64 -> m Int64 # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Int64 -> m Int64 # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Int64 -> m Int64 # | |
Data Int8 # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Int8 -> c Int8 # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Int8 # dataTypeOf :: Int8 -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Int8) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Int8) # gmapT :: (forall b. Data b => b -> b) -> Int8 -> Int8 # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Int8 -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Int8 -> r # gmapQ :: (forall d. Data d => d -> u) -> Int8 -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Int8 -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Int8 -> m Int8 # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Int8 -> m Int8 # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Int8 -> m Int8 # | |
Data AnnLookup # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AnnLookup -> c AnnLookup # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AnnLookup # toConstr :: AnnLookup -> Constr # dataTypeOf :: AnnLookup -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AnnLookup) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AnnLookup) # gmapT :: (forall b. Data b => b -> b) -> AnnLookup -> AnnLookup # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AnnLookup -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AnnLookup -> r # gmapQ :: (forall d. Data d => d -> u) -> AnnLookup -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> AnnLookup -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> AnnLookup -> m AnnLookup # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnLookup -> m AnnLookup # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnLookup -> m AnnLookup # | |
Data AnnTarget # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AnnTarget -> c AnnTarget # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AnnTarget # toConstr :: AnnTarget -> Constr # dataTypeOf :: AnnTarget -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AnnTarget) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AnnTarget) # gmapT :: (forall b. Data b => b -> b) -> AnnTarget -> AnnTarget # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AnnTarget -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AnnTarget -> r # gmapQ :: (forall d. Data d => d -> u) -> AnnTarget -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> AnnTarget -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> AnnTarget -> m AnnTarget # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnTarget -> m AnnTarget # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnTarget -> m AnnTarget # | |
Data Bang # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Bang -> c Bang # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Bang # dataTypeOf :: Bang -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Bang) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Bang) # gmapT :: (forall b. Data b => b -> b) -> Bang -> Bang # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Bang -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Bang -> r # gmapQ :: (forall d. Data d => d -> u) -> Bang -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Bang -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Bang -> m Bang # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Bang -> m Bang # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Bang -> m Bang # | |
Data BndrVis # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BndrVis -> c BndrVis # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BndrVis # toConstr :: BndrVis -> Constr # dataTypeOf :: BndrVis -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BndrVis) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BndrVis) # gmapT :: (forall b. Data b => b -> b) -> BndrVis -> BndrVis # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BndrVis -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BndrVis -> r # gmapQ :: (forall d. Data d => d -> u) -> BndrVis -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> BndrVis -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> BndrVis -> m BndrVis # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BndrVis -> m BndrVis # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BndrVis -> m BndrVis # | |
Data Body # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Body -> c Body # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Body # dataTypeOf :: Body -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Body) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Body) # gmapT :: (forall b. Data b => b -> b) -> Body -> Body # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Body -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Body -> r # gmapQ :: (forall d. Data d => d -> u) -> Body -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Body -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Body -> m Body # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Body -> m Body # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Body -> m Body # | |
Data Bytes # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Bytes -> c Bytes # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Bytes # dataTypeOf :: Bytes -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Bytes) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Bytes) # gmapT :: (forall b. Data b => b -> b) -> Bytes -> Bytes # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Bytes -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Bytes -> r # gmapQ :: (forall d. Data d => d -> u) -> Bytes -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Bytes -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Bytes -> m Bytes # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Bytes -> m Bytes # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Bytes -> m Bytes # | |
Data Callconv # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Callconv -> c Callconv # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Callconv # toConstr :: Callconv -> Constr # dataTypeOf :: Callconv -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Callconv) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Callconv) # gmapT :: (forall b. Data b => b -> b) -> Callconv -> Callconv # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Callconv -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Callconv -> r # gmapQ :: (forall d. Data d => d -> u) -> Callconv -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Callconv -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Callconv -> m Callconv # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Callconv -> m Callconv # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Callconv -> m Callconv # | |
Data Clause # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Clause -> c Clause # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Clause # toConstr :: Clause -> Constr # dataTypeOf :: Clause -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Clause) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Clause) # gmapT :: (forall b. Data b => b -> b) -> Clause -> Clause # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Clause -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Clause -> r # gmapQ :: (forall d. Data d => d -> u) -> Clause -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Clause -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Clause -> m Clause # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Clause -> m Clause # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Clause -> m Clause # | |
Data Con # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Con -> c Con # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Con # dataTypeOf :: Con -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Con) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Con) # gmapT :: (forall b. Data b => b -> b) -> Con -> Con # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Con -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Con -> r # gmapQ :: (forall d. Data d => d -> u) -> Con -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Con -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Con -> m Con # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Con -> m Con # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Con -> m Con # | |
Data Dec # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Dec -> c Dec # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Dec # dataTypeOf :: Dec -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Dec) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Dec) # gmapT :: (forall b. Data b => b -> b) -> Dec -> Dec # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Dec -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Dec -> r # gmapQ :: (forall d. Data d => d -> u) -> Dec -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Dec -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Dec -> m Dec # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Dec -> m Dec # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Dec -> m Dec # | |
Data DecidedStrictness # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DecidedStrictness -> c DecidedStrictness # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DecidedStrictness # toConstr :: DecidedStrictness -> Constr # dataTypeOf :: DecidedStrictness -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DecidedStrictness) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DecidedStrictness) # gmapT :: (forall b. Data b => b -> b) -> DecidedStrictness -> DecidedStrictness # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DecidedStrictness -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DecidedStrictness -> r # gmapQ :: (forall d. Data d => d -> u) -> DecidedStrictness -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> DecidedStrictness -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> DecidedStrictness -> m DecidedStrictness # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DecidedStrictness -> m DecidedStrictness # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DecidedStrictness -> m DecidedStrictness # | |
Data DerivClause # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DerivClause -> c DerivClause # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DerivClause # toConstr :: DerivClause -> Constr # dataTypeOf :: DerivClause -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DerivClause) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DerivClause) # gmapT :: (forall b. Data b => b -> b) -> DerivClause -> DerivClause # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DerivClause -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DerivClause -> r # gmapQ :: (forall d. Data d => d -> u) -> DerivClause -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> DerivClause -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> DerivClause -> m DerivClause # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DerivClause -> m DerivClause # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DerivClause -> m DerivClause # | |
Data DerivStrategy # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DerivStrategy -> c DerivStrategy # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DerivStrategy # toConstr :: DerivStrategy -> Constr # dataTypeOf :: DerivStrategy -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DerivStrategy) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DerivStrategy) # gmapT :: (forall b. Data b => b -> b) -> DerivStrategy -> DerivStrategy # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DerivStrategy -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DerivStrategy -> r # gmapQ :: (forall d. Data d => d -> u) -> DerivStrategy -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> DerivStrategy -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> DerivStrategy -> m DerivStrategy # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DerivStrategy -> m DerivStrategy # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DerivStrategy -> m DerivStrategy # | |
Data DocLoc # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DocLoc -> c DocLoc # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DocLoc # toConstr :: DocLoc -> Constr # dataTypeOf :: DocLoc -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DocLoc) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DocLoc) # gmapT :: (forall b. Data b => b -> b) -> DocLoc -> DocLoc # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DocLoc -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DocLoc -> r # gmapQ :: (forall d. Data d => d -> u) -> DocLoc -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> DocLoc -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> DocLoc -> m DocLoc # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DocLoc -> m DocLoc # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DocLoc -> m DocLoc # | |
Data Exp # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Exp -> c Exp # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Exp # dataTypeOf :: Exp -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Exp) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Exp) # gmapT :: (forall b. Data b => b -> b) -> Exp -> Exp # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Exp -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Exp -> r # gmapQ :: (forall d. Data d => d -> u) -> Exp -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Exp -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Exp -> m Exp # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Exp -> m Exp # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Exp -> m Exp # | |
Data FamilyResultSig # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FamilyResultSig -> c FamilyResultSig # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FamilyResultSig # toConstr :: FamilyResultSig -> Constr # dataTypeOf :: FamilyResultSig -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c FamilyResultSig) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FamilyResultSig) # gmapT :: (forall b. Data b => b -> b) -> FamilyResultSig -> FamilyResultSig # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FamilyResultSig -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FamilyResultSig -> r # gmapQ :: (forall d. Data d => d -> u) -> FamilyResultSig -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> FamilyResultSig -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> FamilyResultSig -> m FamilyResultSig # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FamilyResultSig -> m FamilyResultSig # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FamilyResultSig -> m FamilyResultSig # | |
Data Fixity # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Fixity -> c Fixity # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Fixity # toConstr :: Fixity -> Constr # dataTypeOf :: Fixity -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Fixity) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Fixity) # gmapT :: (forall b. Data b => b -> b) -> Fixity -> Fixity # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Fixity -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Fixity -> r # gmapQ :: (forall d. Data d => d -> u) -> Fixity -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Fixity -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Fixity -> m Fixity # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Fixity -> m Fixity # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Fixity -> m Fixity # | |
Data FixityDirection # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FixityDirection -> c FixityDirection # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FixityDirection # toConstr :: FixityDirection -> Constr # dataTypeOf :: FixityDirection -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c FixityDirection) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FixityDirection) # gmapT :: (forall b. Data b => b -> b) -> FixityDirection -> FixityDirection # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FixityDirection -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FixityDirection -> r # gmapQ :: (forall d. Data d => d -> u) -> FixityDirection -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> FixityDirection -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> FixityDirection -> m FixityDirection # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FixityDirection -> m FixityDirection # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FixityDirection -> m FixityDirection # | |
Data Foreign # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Foreign -> c Foreign # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Foreign # toConstr :: Foreign -> Constr # dataTypeOf :: Foreign -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Foreign) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Foreign) # gmapT :: (forall b. Data b => b -> b) -> Foreign -> Foreign # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Foreign -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Foreign -> r # gmapQ :: (forall d. Data d => d -> u) -> Foreign -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Foreign -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Foreign -> m Foreign # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Foreign -> m Foreign # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Foreign -> m Foreign # | |
Data FunDep # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FunDep -> c FunDep # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FunDep # toConstr :: FunDep -> Constr # dataTypeOf :: FunDep -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c FunDep) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FunDep) # gmapT :: (forall b. Data b => b -> b) -> FunDep -> FunDep # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FunDep -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FunDep -> r # gmapQ :: (forall d. Data d => d -> u) -> FunDep -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> FunDep -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> FunDep -> m FunDep # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FunDep -> m FunDep # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FunDep -> m FunDep # | |
Data Guard # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Guard -> c Guard # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Guard # dataTypeOf :: Guard -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Guard) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Guard) # gmapT :: (forall b. Data b => b -> b) -> Guard -> Guard # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Guard -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Guard -> r # gmapQ :: (forall d. Data d => d -> u) -> Guard -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Guard -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Guard -> m Guard # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Guard -> m Guard # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Guard -> m Guard # | |
Data Info # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Info -> c Info # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Info # dataTypeOf :: Info -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Info) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Info) # gmapT :: (forall b. Data b => b -> b) -> Info -> Info # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Info -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Info -> r # gmapQ :: (forall d. Data d => d -> u) -> Info -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Info -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Info -> m Info # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Info -> m Info # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Info -> m Info # | |
Data InjectivityAnn # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> InjectivityAnn -> c InjectivityAnn # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c InjectivityAnn # toConstr :: InjectivityAnn -> Constr # dataTypeOf :: InjectivityAnn -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c InjectivityAnn) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c InjectivityAnn) # gmapT :: (forall b. Data b => b -> b) -> InjectivityAnn -> InjectivityAnn # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> InjectivityAnn -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> InjectivityAnn -> r # gmapQ :: (forall d. Data d => d -> u) -> InjectivityAnn -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> InjectivityAnn -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> InjectivityAnn -> m InjectivityAnn # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> InjectivityAnn -> m InjectivityAnn # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> InjectivityAnn -> m InjectivityAnn # | |
Data Inline # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Inline -> c Inline # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Inline # toConstr :: Inline -> Constr # dataTypeOf :: Inline -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Inline) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Inline) # gmapT :: (forall b. Data b => b -> b) -> Inline -> Inline # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Inline -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Inline -> r # gmapQ :: (forall d. Data d => d -> u) -> Inline -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Inline -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Inline -> m Inline # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Inline -> m Inline # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Inline -> m Inline # | |
Data Lit # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Lit -> c Lit # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Lit # dataTypeOf :: Lit -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Lit) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Lit) # gmapT :: (forall b. Data b => b -> b) -> Lit -> Lit # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Lit -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Lit -> r # gmapQ :: (forall d. Data d => d -> u) -> Lit -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Lit -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Lit -> m Lit # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Lit -> m Lit # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Lit -> m Lit # | |
Data Loc # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Loc -> c Loc # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Loc # dataTypeOf :: Loc -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Loc) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Loc) # gmapT :: (forall b. Data b => b -> b) -> Loc -> Loc # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Loc -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Loc -> r # gmapQ :: (forall d. Data d => d -> u) -> Loc -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Loc -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Loc -> m Loc # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Loc -> m Loc # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Loc -> m Loc # | |
Data Match # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Match -> c Match # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Match # dataTypeOf :: Match -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Match) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Match) # gmapT :: (forall b. Data b => b -> b) -> Match -> Match # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Match -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Match -> r # gmapQ :: (forall d. Data d => d -> u) -> Match -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Match -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Match -> m Match # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Match -> m Match # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Match -> m Match # | |
Data ModName # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ModName -> c ModName # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ModName # toConstr :: ModName -> Constr # dataTypeOf :: ModName -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ModName) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ModName) # gmapT :: (forall b. Data b => b -> b) -> ModName -> ModName # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ModName -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ModName -> r # gmapQ :: (forall d. Data d => d -> u) -> ModName -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> ModName -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> ModName -> m ModName # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ModName -> m ModName # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ModName -> m ModName # | |
Data Module # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Module -> c Module # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Module # toConstr :: Module -> Constr # dataTypeOf :: Module -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Module) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Module) # gmapT :: (forall b. Data b => b -> b) -> Module -> Module # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Module -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Module -> r # gmapQ :: (forall d. Data d => d -> u) -> Module -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Module -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Module -> m Module # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Module -> m Module # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Module -> m Module # | |
Data ModuleInfo # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ModuleInfo -> c ModuleInfo # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ModuleInfo # toConstr :: ModuleInfo -> Constr # dataTypeOf :: ModuleInfo -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ModuleInfo) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ModuleInfo) # gmapT :: (forall b. Data b => b -> b) -> ModuleInfo -> ModuleInfo # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ModuleInfo -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ModuleInfo -> r # gmapQ :: (forall d. Data d => d -> u) -> ModuleInfo -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> ModuleInfo -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> ModuleInfo -> m ModuleInfo # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ModuleInfo -> m ModuleInfo # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ModuleInfo -> m ModuleInfo # | |
Data Name # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Name -> c Name # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Name # dataTypeOf :: Name -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Name) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Name) # gmapT :: (forall b. Data b => b -> b) -> Name -> Name # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Name -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Name -> r # gmapQ :: (forall d. Data d => d -> u) -> Name -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Name -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Name -> m Name # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Name -> m Name # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Name -> m Name # | |
Data NameFlavour # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NameFlavour -> c NameFlavour # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NameFlavour # toConstr :: NameFlavour -> Constr # dataTypeOf :: NameFlavour -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NameFlavour) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NameFlavour) # gmapT :: (forall b. Data b => b -> b) -> NameFlavour -> NameFlavour # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NameFlavour -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NameFlavour -> r # gmapQ :: (forall d. Data d => d -> u) -> NameFlavour -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> NameFlavour -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> NameFlavour -> m NameFlavour # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NameFlavour -> m NameFlavour # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NameFlavour -> m NameFlavour # | |
Data NameSpace # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NameSpace -> c NameSpace # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NameSpace # toConstr :: NameSpace -> Constr # dataTypeOf :: NameSpace -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NameSpace) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NameSpace) # gmapT :: (forall b. Data b => b -> b) -> NameSpace -> NameSpace # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NameSpace -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NameSpace -> r # gmapQ :: (forall d. Data d => d -> u) -> NameSpace -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> NameSpace -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> NameSpace -> m NameSpace # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NameSpace -> m NameSpace # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NameSpace -> m NameSpace # | |
Data NamespaceSpecifier # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NamespaceSpecifier -> c NamespaceSpecifier # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NamespaceSpecifier # toConstr :: NamespaceSpecifier -> Constr # dataTypeOf :: NamespaceSpecifier -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NamespaceSpecifier) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NamespaceSpecifier) # gmapT :: (forall b. Data b => b -> b) -> NamespaceSpecifier -> NamespaceSpecifier # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NamespaceSpecifier -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NamespaceSpecifier -> r # gmapQ :: (forall d. Data d => d -> u) -> NamespaceSpecifier -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> NamespaceSpecifier -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> NamespaceSpecifier -> m NamespaceSpecifier # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NamespaceSpecifier -> m NamespaceSpecifier # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NamespaceSpecifier -> m NamespaceSpecifier # | |
Data OccName # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OccName -> c OccName # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OccName # toConstr :: OccName -> Constr # dataTypeOf :: OccName -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OccName) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OccName) # gmapT :: (forall b. Data b => b -> b) -> OccName -> OccName # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OccName -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OccName -> r # gmapQ :: (forall d. Data d => d -> u) -> OccName -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> OccName -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> OccName -> m OccName # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OccName -> m OccName # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OccName -> m OccName # | |
Data Overlap # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Overlap -> c Overlap # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Overlap # toConstr :: Overlap -> Constr # dataTypeOf :: Overlap -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Overlap) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Overlap) # gmapT :: (forall b. Data b => b -> b) -> Overlap -> Overlap # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Overlap -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Overlap -> r # gmapQ :: (forall d. Data d => d -> u) -> Overlap -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Overlap -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Overlap -> m Overlap # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Overlap -> m Overlap # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Overlap -> m Overlap # | |
Data Pat # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Pat -> c Pat # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Pat # dataTypeOf :: Pat -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Pat) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Pat) # gmapT :: (forall b. Data b => b -> b) -> Pat -> Pat # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Pat -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Pat -> r # gmapQ :: (forall d. Data d => d -> u) -> Pat -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Pat -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Pat -> m Pat # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Pat -> m Pat # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Pat -> m Pat # | |
Data PatSynArgs # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PatSynArgs -> c PatSynArgs # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PatSynArgs # toConstr :: PatSynArgs -> Constr # dataTypeOf :: PatSynArgs -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PatSynArgs) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PatSynArgs) # gmapT :: (forall b. Data b => b -> b) -> PatSynArgs -> PatSynArgs # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PatSynArgs -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PatSynArgs -> r # gmapQ :: (forall d. Data d => d -> u) -> PatSynArgs -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> PatSynArgs -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> PatSynArgs -> m PatSynArgs # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PatSynArgs -> m PatSynArgs # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PatSynArgs -> m PatSynArgs # | |
Data PatSynDir # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PatSynDir -> c PatSynDir # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PatSynDir # toConstr :: PatSynDir -> Constr # dataTypeOf :: PatSynDir -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PatSynDir) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PatSynDir) # gmapT :: (forall b. Data b => b -> b) -> PatSynDir -> PatSynDir # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PatSynDir -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PatSynDir -> r # gmapQ :: (forall d. Data d => d -> u) -> PatSynDir -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> PatSynDir -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> PatSynDir -> m PatSynDir # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PatSynDir -> m PatSynDir # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PatSynDir -> m PatSynDir # | |
Data Phases # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Phases -> c Phases # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Phases # toConstr :: Phases -> Constr # dataTypeOf :: Phases -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Phases) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Phases) # gmapT :: (forall b. Data b => b -> b) -> Phases -> Phases # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Phases -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Phases -> r # gmapQ :: (forall d. Data d => d -> u) -> Phases -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Phases -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Phases -> m Phases # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Phases -> m Phases # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Phases -> m Phases # | |
Data PkgName # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PkgName -> c PkgName # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PkgName # toConstr :: PkgName -> Constr # dataTypeOf :: PkgName -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PkgName) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PkgName) # gmapT :: (forall b. Data b => b -> b) -> PkgName -> PkgName # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PkgName -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PkgName -> r # gmapQ :: (forall d. Data d => d -> u) -> PkgName -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> PkgName -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> PkgName -> m PkgName # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PkgName -> m PkgName # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PkgName -> m PkgName # | |
Data Pragma # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Pragma -> c Pragma # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Pragma # toConstr :: Pragma -> Constr # dataTypeOf :: Pragma -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Pragma) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Pragma) # gmapT :: (forall b. Data b => b -> b) -> Pragma -> Pragma # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Pragma -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Pragma -> r # gmapQ :: (forall d. Data d => d -> u) -> Pragma -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Pragma -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Pragma -> m Pragma # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Pragma -> m Pragma # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Pragma -> m Pragma # | |
Data Range # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Range -> c Range # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Range # dataTypeOf :: Range -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Range) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Range) # gmapT :: (forall b. Data b => b -> b) -> Range -> Range # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Range -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Range -> r # gmapQ :: (forall d. Data d => d -> u) -> Range -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Range -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Range -> m Range # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Range -> m Range # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Range -> m Range # | |
Data Role # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Role -> c Role # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Role # dataTypeOf :: Role -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Role) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Role) # gmapT :: (forall b. Data b => b -> b) -> Role -> Role # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Role -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Role -> r # gmapQ :: (forall d. Data d => d -> u) -> Role -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Role -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Role -> m Role # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Role -> m Role # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Role -> m Role # | |
Data RuleBndr # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RuleBndr -> c RuleBndr # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RuleBndr # toConstr :: RuleBndr -> Constr # dataTypeOf :: RuleBndr -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RuleBndr) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RuleBndr) # gmapT :: (forall b. Data b => b -> b) -> RuleBndr -> RuleBndr # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RuleBndr -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RuleBndr -> r # gmapQ :: (forall d. Data d => d -> u) -> RuleBndr -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> RuleBndr -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> RuleBndr -> m RuleBndr # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RuleBndr -> m RuleBndr # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RuleBndr -> m RuleBndr # | |
Data RuleMatch # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RuleMatch -> c RuleMatch # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RuleMatch # toConstr :: RuleMatch -> Constr # dataTypeOf :: RuleMatch -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RuleMatch) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RuleMatch) # gmapT :: (forall b. Data b => b -> b) -> RuleMatch -> RuleMatch # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RuleMatch -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RuleMatch -> r # gmapQ :: (forall d. Data d => d -> u) -> RuleMatch -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> RuleMatch -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> RuleMatch -> m RuleMatch # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RuleMatch -> m RuleMatch # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RuleMatch -> m RuleMatch # | |
Data Safety # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Safety -> c Safety # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Safety # toConstr :: Safety -> Constr # dataTypeOf :: Safety -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Safety) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Safety) # gmapT :: (forall b. Data b => b -> b) -> Safety -> Safety # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Safety -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Safety -> r # gmapQ :: (forall d. Data d => d -> u) -> Safety -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Safety -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Safety -> m Safety # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Safety -> m Safety # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Safety -> m Safety # | |
Data SourceStrictness # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SourceStrictness -> c SourceStrictness # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SourceStrictness # toConstr :: SourceStrictness -> Constr # dataTypeOf :: SourceStrictness -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SourceStrictness) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SourceStrictness) # gmapT :: (forall b. Data b => b -> b) -> SourceStrictness -> SourceStrictness # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SourceStrictness -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SourceStrictness -> r # gmapQ :: (forall d. Data d => d -> u) -> SourceStrictness -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> SourceStrictness -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> SourceStrictness -> m SourceStrictness # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SourceStrictness -> m SourceStrictness # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SourceStrictness -> m SourceStrictness # | |
Data SourceUnpackedness # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SourceUnpackedness -> c SourceUnpackedness # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SourceUnpackedness # toConstr :: SourceUnpackedness -> Constr # dataTypeOf :: SourceUnpackedness -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SourceUnpackedness) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SourceUnpackedness) # gmapT :: (forall b. Data b => b -> b) -> SourceUnpackedness -> SourceUnpackedness # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SourceUnpackedness -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SourceUnpackedness -> r # gmapQ :: (forall d. Data d => d -> u) -> SourceUnpackedness -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> SourceUnpackedness -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> SourceUnpackedness -> m SourceUnpackedness # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SourceUnpackedness -> m SourceUnpackedness # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SourceUnpackedness -> m SourceUnpackedness # | |
Data Specificity # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Specificity -> c Specificity # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Specificity # toConstr :: Specificity -> Constr # dataTypeOf :: Specificity -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Specificity) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Specificity) # gmapT :: (forall b. Data b => b -> b) -> Specificity -> Specificity # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Specificity -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Specificity -> r # gmapQ :: (forall d. Data d => d -> u) -> Specificity -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Specificity -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Specificity -> m Specificity # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Specificity -> m Specificity # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Specificity -> m Specificity # | |
Data Stmt # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Stmt -> c Stmt # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Stmt # dataTypeOf :: Stmt -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Stmt) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Stmt) # gmapT :: (forall b. Data b => b -> b) -> Stmt -> Stmt # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Stmt -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Stmt -> r # gmapQ :: (forall d. Data d => d -> u) -> Stmt -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Stmt -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Stmt -> m Stmt # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Stmt -> m Stmt # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Stmt -> m Stmt # | |
Data TyLit # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TyLit -> c TyLit # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TyLit # dataTypeOf :: TyLit -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TyLit) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TyLit) # gmapT :: (forall b. Data b => b -> b) -> TyLit -> TyLit # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TyLit -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TyLit -> r # gmapQ :: (forall d. Data d => d -> u) -> TyLit -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> TyLit -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> TyLit -> m TyLit # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TyLit -> m TyLit # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TyLit -> m TyLit # | |
Data TySynEqn # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TySynEqn -> c TySynEqn # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TySynEqn # toConstr :: TySynEqn -> Constr # dataTypeOf :: TySynEqn -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TySynEqn) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TySynEqn) # gmapT :: (forall b. Data b => b -> b) -> TySynEqn -> TySynEqn # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TySynEqn -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TySynEqn -> r # gmapQ :: (forall d. Data d => d -> u) -> TySynEqn -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> TySynEqn -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> TySynEqn -> m TySynEqn # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TySynEqn -> m TySynEqn # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TySynEqn -> m TySynEqn # | |
Data Type # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Type -> c Type # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Type # dataTypeOf :: Type -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Type) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Type) # gmapT :: (forall b. Data b => b -> b) -> Type -> Type # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Type -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Type -> r # gmapQ :: (forall d. Data d => d -> u) -> Type -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Type -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Type -> m Type # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Type -> m Type # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Type -> m Type # | |
Data TypeFamilyHead # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TypeFamilyHead -> c TypeFamilyHead # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TypeFamilyHead # toConstr :: TypeFamilyHead -> Constr # dataTypeOf :: TypeFamilyHead -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TypeFamilyHead) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TypeFamilyHead) # gmapT :: (forall b. Data b => b -> b) -> TypeFamilyHead -> TypeFamilyHead # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TypeFamilyHead -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TypeFamilyHead -> r # gmapQ :: (forall d. Data d => d -> u) -> TypeFamilyHead -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> TypeFamilyHead -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> TypeFamilyHead -> m TypeFamilyHead # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TypeFamilyHead -> m TypeFamilyHead # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TypeFamilyHead -> m TypeFamilyHead # | |
Data Word16 # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Word16 -> c Word16 # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Word16 # toConstr :: Word16 -> Constr # dataTypeOf :: Word16 -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Word16) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Word16) # gmapT :: (forall b. Data b => b -> b) -> Word16 -> Word16 # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Word16 -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Word16 -> r # gmapQ :: (forall d. Data d => d -> u) -> Word16 -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Word16 -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Word16 -> m Word16 # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Word16 -> m Word16 # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Word16 -> m Word16 # | |
Data Word32 # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Word32 -> c Word32 # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Word32 # toConstr :: Word32 -> Constr # dataTypeOf :: Word32 -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Word32) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Word32) # gmapT :: (forall b. Data b => b -> b) -> Word32 -> Word32 # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Word32 -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Word32 -> r # gmapQ :: (forall d. Data d => d -> u) -> Word32 -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Word32 -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Word32 -> m Word32 # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Word32 -> m Word32 # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Word32 -> m Word32 # | |
Data Word64 # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Word64 -> c Word64 # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Word64 # toConstr :: Word64 -> Constr # dataTypeOf :: Word64 -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Word64) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Word64) # gmapT :: (forall b. Data b => b -> b) -> Word64 -> Word64 # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Word64 -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Word64 -> r # gmapQ :: (forall d. Data d => d -> u) -> Word64 -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Word64 -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Word64 -> m Word64 # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Word64 -> m Word64 # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Word64 -> m Word64 # | |
Data Word8 # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Word8 -> c Word8 # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Word8 # dataTypeOf :: Word8 -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Word8) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Word8) # gmapT :: (forall b. Data b => b -> b) -> Word8 -> Word8 # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Word8 -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Word8 -> r # gmapQ :: (forall d. Data d => d -> u) -> Word8 -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Word8 -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Word8 -> m Word8 # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Word8 -> m Word8 # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Word8 -> m Word8 # | |
Data Ordering # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Ordering -> c Ordering # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Ordering # toConstr :: Ordering -> Constr # dataTypeOf :: Ordering -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Ordering) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Ordering) # gmapT :: (forall b. Data b => b -> b) -> Ordering -> Ordering # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Ordering -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Ordering -> r # gmapQ :: (forall d. Data d => d -> u) -> Ordering -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Ordering -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Ordering -> m Ordering # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Ordering -> m Ordering # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Ordering -> m Ordering # | |
Data SourcePos Source # | |
Defined in Text.Parsec.Pos gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SourcePos -> c SourcePos # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SourcePos # toConstr :: SourcePos -> Constr # dataTypeOf :: SourcePos -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SourcePos) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SourcePos) # gmapT :: (forall b. Data b => b -> b) -> SourcePos -> SourcePos # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SourcePos -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SourcePos -> r # gmapQ :: (forall d. Data d => d -> u) -> SourcePos -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> SourcePos -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> SourcePos -> m SourcePos # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SourcePos -> m SourcePos # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SourcePos -> m SourcePos # | |
Data CalendarDiffDays Source # | Since: time-1.9.2 |
Defined in Data.Time.Calendar.CalendarDiffDays gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CalendarDiffDays -> c CalendarDiffDays # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CalendarDiffDays # toConstr :: CalendarDiffDays -> Constr # dataTypeOf :: CalendarDiffDays -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CalendarDiffDays) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CalendarDiffDays) # gmapT :: (forall b. Data b => b -> b) -> CalendarDiffDays -> CalendarDiffDays # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CalendarDiffDays -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CalendarDiffDays -> r # gmapQ :: (forall d. Data d => d -> u) -> CalendarDiffDays -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> CalendarDiffDays -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> CalendarDiffDays -> m CalendarDiffDays # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CalendarDiffDays -> m CalendarDiffDays # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CalendarDiffDays -> m CalendarDiffDays # | |
Data Day Source # | |
Defined in Data.Time.Calendar.Days gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Day -> c Day # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Day # dataTypeOf :: Day -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Day) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Day) # gmapT :: (forall b. Data b => b -> b) -> Day -> Day # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Day -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Day -> r # gmapQ :: (forall d. Data d => d -> u) -> Day -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Day -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Day -> m Day # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Day -> m Day # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Day -> m Day # | |
Data Month Source # | |
Defined in Data.Time.Calendar.Month gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Month -> c Month # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Month # dataTypeOf :: Month -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Month) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Month) # gmapT :: (forall b. Data b => b -> b) -> Month -> Month # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Month -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Month -> r # gmapQ :: (forall d. Data d => d -> u) -> Month -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Month -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Month -> m Month # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Month -> m Month # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Month -> m Month # | |
Data Quarter Source # | |
Defined in Data.Time.Calendar.Quarter gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Quarter -> c Quarter # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Quarter # toConstr :: Quarter -> Constr # dataTypeOf :: Quarter -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Quarter) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Quarter) # gmapT :: (forall b. Data b => b -> b) -> Quarter -> Quarter # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Quarter -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Quarter -> r # gmapQ :: (forall d. Data d => d -> u) -> Quarter -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Quarter -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Quarter -> m Quarter # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Quarter -> m Quarter # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Quarter -> m Quarter # | |
Data QuarterOfYear Source # | |
Defined in Data.Time.Calendar.Quarter gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> QuarterOfYear -> c QuarterOfYear # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c QuarterOfYear # toConstr :: QuarterOfYear -> Constr # dataTypeOf :: QuarterOfYear -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c QuarterOfYear) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c QuarterOfYear) # gmapT :: (forall b. Data b => b -> b) -> QuarterOfYear -> QuarterOfYear # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> QuarterOfYear -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> QuarterOfYear -> r # gmapQ :: (forall d. Data d => d -> u) -> QuarterOfYear -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> QuarterOfYear -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> QuarterOfYear -> m QuarterOfYear # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> QuarterOfYear -> m QuarterOfYear # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> QuarterOfYear -> m QuarterOfYear # | |
Data DayOfWeek Source # | |
Defined in Data.Time.Calendar.Week gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DayOfWeek -> c DayOfWeek # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DayOfWeek # toConstr :: DayOfWeek -> Constr # dataTypeOf :: DayOfWeek -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DayOfWeek) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DayOfWeek) # gmapT :: (forall b. Data b => b -> b) -> DayOfWeek -> DayOfWeek # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DayOfWeek -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DayOfWeek -> r # gmapQ :: (forall d. Data d => d -> u) -> DayOfWeek -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> DayOfWeek -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> DayOfWeek -> m DayOfWeek # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DayOfWeek -> m DayOfWeek # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DayOfWeek -> m DayOfWeek # | |
Data DiffTime Source # | |
Defined in Data.Time.Clock.Internal.DiffTime gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DiffTime -> c DiffTime # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DiffTime # toConstr :: DiffTime -> Constr # dataTypeOf :: DiffTime -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DiffTime) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DiffTime) # gmapT :: (forall b. Data b => b -> b) -> DiffTime -> DiffTime # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DiffTime -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DiffTime -> r # gmapQ :: (forall d. Data d => d -> u) -> DiffTime -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> DiffTime -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> DiffTime -> m DiffTime # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DiffTime -> m DiffTime # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DiffTime -> m DiffTime # | |
Data NominalDiffTime Source # | |
Defined in Data.Time.Clock.Internal.NominalDiffTime gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NominalDiffTime -> c NominalDiffTime # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NominalDiffTime # toConstr :: NominalDiffTime -> Constr # dataTypeOf :: NominalDiffTime -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NominalDiffTime) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NominalDiffTime) # gmapT :: (forall b. Data b => b -> b) -> NominalDiffTime -> NominalDiffTime # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NominalDiffTime -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NominalDiffTime -> r # gmapQ :: (forall d. Data d => d -> u) -> NominalDiffTime -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> NominalDiffTime -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> NominalDiffTime -> m NominalDiffTime # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NominalDiffTime -> m NominalDiffTime # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NominalDiffTime -> m NominalDiffTime # | |
Data SystemTime Source # | |
Defined in Data.Time.Clock.Internal.SystemTime gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SystemTime -> c SystemTime # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SystemTime # toConstr :: SystemTime -> Constr # dataTypeOf :: SystemTime -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SystemTime) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SystemTime) # gmapT :: (forall b. Data b => b -> b) -> SystemTime -> SystemTime # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SystemTime -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SystemTime -> r # gmapQ :: (forall d. Data d => d -> u) -> SystemTime -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> SystemTime -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> SystemTime -> m SystemTime # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SystemTime -> m SystemTime # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SystemTime -> m SystemTime # | |
Data UTCTime Source # | |
Defined in Data.Time.Clock.Internal.UTCTime gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UTCTime -> c UTCTime # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UTCTime # toConstr :: UTCTime -> Constr # dataTypeOf :: UTCTime -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UTCTime) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UTCTime) # gmapT :: (forall b. Data b => b -> b) -> UTCTime -> UTCTime # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UTCTime -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UTCTime -> r # gmapQ :: (forall d. Data d => d -> u) -> UTCTime -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> UTCTime -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> UTCTime -> m UTCTime # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UTCTime -> m UTCTime # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UTCTime -> m UTCTime # | |
Data UniversalTime Source # | |
Defined in Data.Time.Clock.Internal.UniversalTime gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UniversalTime -> c UniversalTime # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UniversalTime # toConstr :: UniversalTime -> Constr # dataTypeOf :: UniversalTime -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UniversalTime) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UniversalTime) # gmapT :: (forall b. Data b => b -> b) -> UniversalTime -> UniversalTime # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UniversalTime -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UniversalTime -> r # gmapQ :: (forall d. Data d => d -> u) -> UniversalTime -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> UniversalTime -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> UniversalTime -> m UniversalTime # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UniversalTime -> m UniversalTime # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UniversalTime -> m UniversalTime # | |
Data CalendarDiffTime Source # | Since: time-1.9.2 |
Defined in Data.Time.LocalTime.Internal.CalendarDiffTime gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CalendarDiffTime -> c CalendarDiffTime # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CalendarDiffTime # toConstr :: CalendarDiffTime -> Constr # dataTypeOf :: CalendarDiffTime -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CalendarDiffTime) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CalendarDiffTime) # gmapT :: (forall b. Data b => b -> b) -> CalendarDiffTime -> CalendarDiffTime # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CalendarDiffTime -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CalendarDiffTime -> r # gmapQ :: (forall d. Data d => d -> u) -> CalendarDiffTime -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> CalendarDiffTime -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> CalendarDiffTime -> m CalendarDiffTime # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CalendarDiffTime -> m CalendarDiffTime # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CalendarDiffTime -> m CalendarDiffTime # | |
Data LocalTime Source # | |
Defined in Data.Time.LocalTime.Internal.LocalTime gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LocalTime -> c LocalTime # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c LocalTime # toConstr :: LocalTime -> Constr # dataTypeOf :: LocalTime -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LocalTime) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c LocalTime) # gmapT :: (forall b. Data b => b -> b) -> LocalTime -> LocalTime # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LocalTime -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LocalTime -> r # gmapQ :: (forall d. Data d => d -> u) -> LocalTime -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> LocalTime -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> LocalTime -> m LocalTime # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LocalTime -> m LocalTime # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LocalTime -> m LocalTime # | |
Data TimeOfDay Source # | |
Defined in Data.Time.LocalTime.Internal.TimeOfDay gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TimeOfDay -> c TimeOfDay # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TimeOfDay # toConstr :: TimeOfDay -> Constr # dataTypeOf :: TimeOfDay -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TimeOfDay) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TimeOfDay) # gmapT :: (forall b. Data b => b -> b) -> TimeOfDay -> TimeOfDay # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TimeOfDay -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TimeOfDay -> r # gmapQ :: (forall d. Data d => d -> u) -> TimeOfDay -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> TimeOfDay -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> TimeOfDay -> m TimeOfDay # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TimeOfDay -> m TimeOfDay # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TimeOfDay -> m TimeOfDay # | |
Data TimeZone Source # | |
Defined in Data.Time.LocalTime.Internal.TimeZone gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TimeZone -> c TimeZone # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TimeZone # toConstr :: TimeZone -> Constr # dataTypeOf :: TimeZone -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TimeZone) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TimeZone) # gmapT :: (forall b. Data b => b -> b) -> TimeZone -> TimeZone # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TimeZone -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TimeZone -> r # gmapQ :: (forall d. Data d => d -> u) -> TimeZone -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> TimeZone -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> TimeZone -> m TimeZone # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TimeZone -> m TimeZone # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TimeZone -> m TimeZone # | |
Data ZonedTime Source # | |
Defined in Data.Time.LocalTime.Internal.ZonedTime gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ZonedTime -> c ZonedTime # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ZonedTime # toConstr :: ZonedTime -> Constr # dataTypeOf :: ZonedTime -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ZonedTime) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ZonedTime) # gmapT :: (forall b. Data b => b -> b) -> ZonedTime -> ZonedTime # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ZonedTime -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ZonedTime -> r # gmapQ :: (forall d. Data d => d -> u) -> ZonedTime -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> ZonedTime -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> ZonedTime -> m ZonedTime # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ZonedTime -> m ZonedTime # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ZonedTime -> m ZonedTime # | |
Data Integer # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Integer -> c Integer # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Integer # toConstr :: Integer -> Constr # dataTypeOf :: Integer -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Integer) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Integer) # gmapT :: (forall b. Data b => b -> b) -> Integer -> Integer # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Integer -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Integer -> r # gmapQ :: (forall d. Data d => d -> u) -> Integer -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Integer -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Integer -> m Integer # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Integer -> m Integer # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Integer -> m Integer # | |
Data Natural # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Natural -> c Natural # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Natural # toConstr :: Natural -> Constr # dataTypeOf :: Natural -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Natural) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Natural) # gmapT :: (forall b. Data b => b -> b) -> Natural -> Natural # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Natural -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Natural -> r # gmapQ :: (forall d. Data d => d -> u) -> Natural -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Natural -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Natural -> m Natural # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Natural -> m Natural # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Natural -> m Natural # | |
Data () # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> () -> c () # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c () # dataTypeOf :: () -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ()) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ()) # gmapT :: (forall b. Data b => b -> b) -> () -> () # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> () -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> () -> r # gmapQ :: (forall d. Data d => d -> u) -> () -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> () -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> () -> m () # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> () -> m () # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> () -> m () # | |
Data Bool # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Bool -> c Bool # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Bool # dataTypeOf :: Bool -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Bool) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Bool) # gmapT :: (forall b. Data b => b -> b) -> Bool -> Bool # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Bool -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Bool -> r # gmapQ :: (forall d. Data d => d -> u) -> Bool -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Bool -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Bool -> m Bool # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Bool -> m Bool # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Bool -> m Bool # | |
Data Char # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Char -> c Char # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Char # dataTypeOf :: Char -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Char) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Char) # gmapT :: (forall b. Data b => b -> b) -> Char -> Char # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Char -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Char -> r # gmapQ :: (forall d. Data d => d -> u) -> Char -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Char -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Char -> m Char # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Char -> m Char # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Char -> m Char # | |
Data Double # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Double -> c Double # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Double # toConstr :: Double -> Constr # dataTypeOf :: Double -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Double) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Double) # gmapT :: (forall b. Data b => b -> b) -> Double -> Double # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Double -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Double -> r # gmapQ :: (forall d. Data d => d -> u) -> Double -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Double -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Double -> m Double # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Double -> m Double # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Double -> m Double # | |
Data Float # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Float -> c Float # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Float # dataTypeOf :: Float -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Float) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Float) # gmapT :: (forall b. Data b => b -> b) -> Float -> Float # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Float -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Float -> r # gmapQ :: (forall d. Data d => d -> u) -> Float -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Float -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Float -> m Float # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Float -> m Float # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Float -> m Float # | |
Data Int # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Int -> c Int # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Int # dataTypeOf :: Int -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Int) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Int) # gmapT :: (forall b. Data b => b -> b) -> Int -> Int # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Int -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Int -> r # gmapQ :: (forall d. Data d => d -> u) -> Int -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Int -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Int -> m Int # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Int -> m Int # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Int -> m Int # | |
Data Word # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Word -> c Word # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Word # dataTypeOf :: Word -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Word) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Word) # gmapT :: (forall b. Data b => b -> b) -> Word -> Word # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Word -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Word -> r # gmapQ :: (forall d. Data d => d -> u) -> Word -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Word -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Word -> m Word # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Word -> m Word # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Word -> m Word # | |
(Data a, Ord a) => Data (NonEmptySet a) Source # | |
Defined in Distribution.Compat.NonEmptySet gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NonEmptySet a -> c (NonEmptySet a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (NonEmptySet a) # toConstr :: NonEmptySet a -> Constr # dataTypeOf :: NonEmptySet a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (NonEmptySet a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (NonEmptySet a)) # gmapT :: (forall b. Data b => b -> b) -> NonEmptySet a -> NonEmptySet a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NonEmptySet a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NonEmptySet a -> r # gmapQ :: (forall d. Data d => d -> u) -> NonEmptySet a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> NonEmptySet a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> NonEmptySet a -> m (NonEmptySet a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NonEmptySet a -> m (NonEmptySet a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NonEmptySet a -> m (NonEmptySet a) # | |
Data v => Data (PerCompilerFlavor v) Source # | |
Defined in Distribution.Compiler gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PerCompilerFlavor v -> c (PerCompilerFlavor v) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (PerCompilerFlavor v) # toConstr :: PerCompilerFlavor v -> Constr # dataTypeOf :: PerCompilerFlavor v -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (PerCompilerFlavor v)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (PerCompilerFlavor v)) # gmapT :: (forall b. Data b => b -> b) -> PerCompilerFlavor v -> PerCompilerFlavor v # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PerCompilerFlavor v -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PerCompilerFlavor v -> r # gmapQ :: (forall d. Data d => d -> u) -> PerCompilerFlavor v -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> PerCompilerFlavor v -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> PerCompilerFlavor v -> m (PerCompilerFlavor v) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PerCompilerFlavor v -> m (PerCompilerFlavor v) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PerCompilerFlavor v -> m (PerCompilerFlavor v) # | |
Data c => Data (Condition c) Source # | |
Defined in Distribution.Types.Condition gfoldl :: (forall d b. Data d => c0 (d -> b) -> d -> c0 b) -> (forall g. g -> c0 g) -> Condition c -> c0 (Condition c) # gunfold :: (forall b r. Data b => c0 (b -> r) -> c0 r) -> (forall r. r -> c0 r) -> Constr -> c0 (Condition c) # toConstr :: Condition c -> Constr # dataTypeOf :: Condition c -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c0 (t d)) -> Maybe (c0 (Condition c)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c0 (t d e)) -> Maybe (c0 (Condition c)) # gmapT :: (forall b. Data b => b -> b) -> Condition c -> Condition c # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Condition c -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Condition c -> r # gmapQ :: (forall d. Data d => d -> u) -> Condition c -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Condition c -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Condition c -> m (Condition c) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Condition c -> m (Condition c) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Condition c -> m (Condition c) # | |
Data a => Data (VersionRangeF a) Source # | |
Defined in Distribution.Types.VersionRange.Internal gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> VersionRangeF a -> c (VersionRangeF a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (VersionRangeF a) # toConstr :: VersionRangeF a -> Constr # dataTypeOf :: VersionRangeF a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (VersionRangeF a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (VersionRangeF a)) # gmapT :: (forall b. Data b => b -> b) -> VersionRangeF a -> VersionRangeF a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> VersionRangeF a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> VersionRangeF a -> r # gmapQ :: (forall d. Data d => d -> u) -> VersionRangeF a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> VersionRangeF a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> VersionRangeF a -> m (VersionRangeF a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> VersionRangeF a -> m (VersionRangeF a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> VersionRangeF a -> m (VersionRangeF a) # | |
Typeable s => Data (MutableByteArray s) Source # | Since: base-4.17.0.0 |
Defined in Data.Array.Byte gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> MutableByteArray s -> c (MutableByteArray s) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (MutableByteArray s) # toConstr :: MutableByteArray s -> Constr # dataTypeOf :: MutableByteArray s -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (MutableByteArray s)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (MutableByteArray s)) # gmapT :: (forall b. Data b => b -> b) -> MutableByteArray s -> MutableByteArray s # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> MutableByteArray s -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> MutableByteArray s -> r # gmapQ :: (forall d. Data d => d -> u) -> MutableByteArray s -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> MutableByteArray s -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> MutableByteArray s -> m (MutableByteArray s) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> MutableByteArray s -> m (MutableByteArray s) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> MutableByteArray s -> m (MutableByteArray s) # | |
Data a => Data (Complex a) Source # | Since: base-2.1 |
Defined in Data.Complex gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Complex a -> c (Complex a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Complex a) # toConstr :: Complex a -> Constr # dataTypeOf :: Complex a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Complex a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Complex a)) # gmapT :: (forall b. Data b => b -> b) -> Complex a -> Complex a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Complex a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Complex a -> r # gmapQ :: (forall d. Data d => d -> u) -> Complex a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Complex a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Complex a -> m (Complex a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Complex a -> m (Complex a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Complex a -> m (Complex a) # | |
Data a => Data (First a) Source # | Since: base-4.9.0.0 |
Defined in Data.Semigroup gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> First a -> c (First a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (First a) # toConstr :: First a -> Constr # dataTypeOf :: First a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (First a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (First a)) # gmapT :: (forall b. Data b => b -> b) -> First a -> First a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> First a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> First a -> r # gmapQ :: (forall d. Data d => d -> u) -> First a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> First a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> First a -> m (First a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> First a -> m (First a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> First a -> m (First a) # | |
Data a => Data (Last a) Source # | Since: base-4.9.0.0 |
Defined in Data.Semigroup gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Last a -> c (Last a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Last a) # toConstr :: Last a -> Constr # dataTypeOf :: Last a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Last a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Last a)) # gmapT :: (forall b. Data b => b -> b) -> Last a -> Last a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Last a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Last a -> r # gmapQ :: (forall d. Data d => d -> u) -> Last a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Last a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Last a -> m (Last a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Last a -> m (Last a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Last a -> m (Last a) # | |
Data a => Data (Max a) Source # | Since: base-4.9.0.0 |
Defined in Data.Semigroup gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Max a -> c (Max a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Max a) # dataTypeOf :: Max a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Max a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Max a)) # gmapT :: (forall b. Data b => b -> b) -> Max a -> Max a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Max a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Max a -> r # gmapQ :: (forall d. Data d => d -> u) -> Max a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Max a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Max a -> m (Max a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Max a -> m (Max a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Max a -> m (Max a) # | |
Data a => Data (Min a) Source # | Since: base-4.9.0.0 |
Defined in Data.Semigroup gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Min a -> c (Min a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Min a) # dataTypeOf :: Min a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Min a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Min a)) # gmapT :: (forall b. Data b => b -> b) -> Min a -> Min a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Min a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Min a -> r # gmapQ :: (forall d. Data d => d -> u) -> Min a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Min a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Min a -> m (Min a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Min a -> m (Min a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Min a -> m (Min a) # | |
Data m => Data (WrappedMonoid m) Source # | Since: base-4.9.0.0 |
Defined in Data.Semigroup gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> WrappedMonoid m -> c (WrappedMonoid m) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (WrappedMonoid m) # toConstr :: WrappedMonoid m -> Constr # dataTypeOf :: WrappedMonoid m -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (WrappedMonoid m)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (WrappedMonoid m)) # gmapT :: (forall b. Data b => b -> b) -> WrappedMonoid m -> WrappedMonoid m # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WrappedMonoid m -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WrappedMonoid m -> r # gmapQ :: (forall d. Data d => d -> u) -> WrappedMonoid m -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> WrappedMonoid m -> u # gmapM :: Monad m0 => (forall d. Data d => d -> m0 d) -> WrappedMonoid m -> m0 (WrappedMonoid m) # gmapMp :: MonadPlus m0 => (forall d. Data d => d -> m0 d) -> WrappedMonoid m -> m0 (WrappedMonoid m) # gmapMo :: MonadPlus m0 => (forall d. Data d => d -> m0 d) -> WrappedMonoid m -> m0 (WrappedMonoid m) # | |
Data vertex => Data (SCC vertex) Source # | Since: containers-0.5.9 |
Defined in Data.Graph gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SCC vertex -> c (SCC vertex) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (SCC vertex) # toConstr :: SCC vertex -> Constr # dataTypeOf :: SCC vertex -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (SCC vertex)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (SCC vertex)) # gmapT :: (forall b. Data b => b -> b) -> SCC vertex -> SCC vertex # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SCC vertex -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SCC vertex -> r # gmapQ :: (forall d. Data d => d -> u) -> SCC vertex -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> SCC vertex -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> SCC vertex -> m (SCC vertex) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SCC vertex -> m (SCC vertex) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SCC vertex -> m (SCC vertex) # | |
Data a => Data (IntMap a) Source # | |
Defined in Data.IntMap.Internal gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IntMap a -> c (IntMap a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (IntMap a) # toConstr :: IntMap a -> Constr # dataTypeOf :: IntMap a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (IntMap a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (IntMap a)) # gmapT :: (forall b. Data b => b -> b) -> IntMap a -> IntMap a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IntMap a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IntMap a -> r # gmapQ :: (forall d. Data d => d -> u) -> IntMap a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> IntMap a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> IntMap a -> m (IntMap a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IntMap a -> m (IntMap a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IntMap a -> m (IntMap a) # | |
Data a => Data (Seq a) Source # | |
Defined in Data.Sequence.Internal gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Seq a -> c (Seq a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Seq a) # dataTypeOf :: Seq a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Seq a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Seq a)) # gmapT :: (forall b. Data b => b -> b) -> Seq a -> Seq a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Seq a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Seq a -> r # gmapQ :: (forall d. Data d => d -> u) -> Seq a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Seq a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Seq a -> m (Seq a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Seq a -> m (Seq a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Seq a -> m (Seq a) # | |
Data a => Data (ViewL a) Source # | |
Defined in Data.Sequence.Internal gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ViewL a -> c (ViewL a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ViewL a) # toConstr :: ViewL a -> Constr # dataTypeOf :: ViewL a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (ViewL a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ViewL a)) # gmapT :: (forall b. Data b => b -> b) -> ViewL a -> ViewL a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ViewL a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ViewL a -> r # gmapQ :: (forall d. Data d => d -> u) -> ViewL a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> ViewL a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> ViewL a -> m (ViewL a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ViewL a -> m (ViewL a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ViewL a -> m (ViewL a) # | |
Data a => Data (ViewR a) Source # | |
Defined in Data.Sequence.Internal gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ViewR a -> c (ViewR a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ViewR a) # toConstr :: ViewR a -> Constr # dataTypeOf :: ViewR a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (ViewR a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ViewR a)) # gmapT :: (forall b. Data b => b -> b) -> ViewR a -> ViewR a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ViewR a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ViewR a -> r # gmapQ :: (forall d. Data d => d -> u) -> ViewR a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> ViewR a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> ViewR a -> m (ViewR a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ViewR a -> m (ViewR a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ViewR a -> m (ViewR a) # | |
(Data a, Ord a) => Data (Set a) Source # | |
Defined in Data.Set.Internal gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Set a -> c (Set a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Set a) # dataTypeOf :: Set a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Set a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Set a)) # gmapT :: (forall b. Data b => b -> b) -> Set a -> Set a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Set a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Set a -> r # gmapQ :: (forall d. Data d => d -> u) -> Set a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Set a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Set a -> m (Set a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Set a -> m (Set a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Set a -> m (Set a) # | |
Data a => Data (Tree a) Source # | |
Defined in Data.Tree gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Tree a -> c (Tree a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Tree a) # toConstr :: Tree a -> Constr # dataTypeOf :: Tree a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Tree a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Tree a)) # gmapT :: (forall b. Data b => b -> b) -> Tree a -> Tree a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Tree a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Tree a -> r # gmapQ :: (forall d. Data d => d -> u) -> Tree a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Tree a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Tree a -> m (Tree a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Tree a -> m (Tree a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Tree a -> m (Tree a) # | |
Data a => Data (NonEmpty a) # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NonEmpty a -> c (NonEmpty a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (NonEmpty a) # toConstr :: NonEmpty a -> Constr # dataTypeOf :: NonEmpty a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (NonEmpty a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (NonEmpty a)) # gmapT :: (forall b. Data b => b -> b) -> NonEmpty a -> NonEmpty a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NonEmpty a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NonEmpty a -> r # gmapQ :: (forall d. Data d => d -> u) -> NonEmpty a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> NonEmpty a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> NonEmpty a -> m (NonEmpty a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NonEmpty a -> m (NonEmpty a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NonEmpty a -> m (NonEmpty a) # | |
Data a => Data (Identity a) # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Identity a -> c (Identity a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Identity a) # toConstr :: Identity a -> Constr # dataTypeOf :: Identity a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Identity a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Identity a)) # gmapT :: (forall b. Data b => b -> b) -> Identity a -> Identity a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Identity a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Identity a -> r # gmapQ :: (forall d. Data d => d -> u) -> Identity a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Identity a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Identity a -> m (Identity a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Identity a -> m (Identity a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Identity a -> m (Identity a) # | |
Data a => Data (First a) # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> First a -> c (First a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (First a) # toConstr :: First a -> Constr # dataTypeOf :: First a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (First a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (First a)) # gmapT :: (forall b. Data b => b -> b) -> First a -> First a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> First a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> First a -> r # gmapQ :: (forall d. Data d => d -> u) -> First a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> First a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> First a -> m (First a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> First a -> m (First a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> First a -> m (First a) # | |
Data a => Data (Last a) # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Last a -> c (Last a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Last a) # toConstr :: Last a -> Constr # dataTypeOf :: Last a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Last a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Last a)) # gmapT :: (forall b. Data b => b -> b) -> Last a -> Last a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Last a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Last a -> r # gmapQ :: (forall d. Data d => d -> u) -> Last a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Last a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Last a -> m (Last a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Last a -> m (Last a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Last a -> m (Last a) # | |
Data a => Data (Down a) # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Down a -> c (Down a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Down a) # toConstr :: Down a -> Constr # dataTypeOf :: Down a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Down a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Down a)) # gmapT :: (forall b. Data b => b -> b) -> Down a -> Down a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Down a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Down a -> r # gmapQ :: (forall d. Data d => d -> u) -> Down a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Down a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Down a -> m (Down a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Down a -> m (Down a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Down a -> m (Down a) # | |
Data a => Data (Dual a) # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Dual a -> c (Dual a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Dual a) # toConstr :: Dual a -> Constr # dataTypeOf :: Dual a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Dual a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Dual a)) # gmapT :: (forall b. Data b => b -> b) -> Dual a -> Dual a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Dual a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Dual a -> r # gmapQ :: (forall d. Data d => d -> u) -> Dual a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Dual a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Dual a -> m (Dual a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Dual a -> m (Dual a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Dual a -> m (Dual a) # | |
Data a => Data (Product a) # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Product a -> c (Product a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Product a) # toConstr :: Product a -> Constr # dataTypeOf :: Product a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Product a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Product a)) # gmapT :: (forall b. Data b => b -> b) -> Product a -> Product a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Product a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Product a -> r # gmapQ :: (forall d. Data d => d -> u) -> Product a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Product a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Product a -> m (Product a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Product a -> m (Product a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Product a -> m (Product a) # | |
Data a => Data (Sum a) # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Sum a -> c (Sum a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Sum a) # dataTypeOf :: Sum a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Sum a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Sum a)) # gmapT :: (forall b. Data b => b -> b) -> Sum a -> Sum a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Sum a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Sum a -> r # gmapQ :: (forall d. Data d => d -> u) -> Sum a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Sum a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Sum a -> m (Sum a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Sum a -> m (Sum a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Sum a -> m (Sum a) # | |
Data a => Data (ConstPtr a) # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ConstPtr a -> c (ConstPtr a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ConstPtr a) # toConstr :: ConstPtr a -> Constr # dataTypeOf :: ConstPtr a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (ConstPtr a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ConstPtr a)) # gmapT :: (forall b. Data b => b -> b) -> ConstPtr a -> ConstPtr a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ConstPtr a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ConstPtr a -> r # gmapQ :: (forall d. Data d => d -> u) -> ConstPtr a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> ConstPtr a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> ConstPtr a -> m (ConstPtr a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ConstPtr a -> m (ConstPtr a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ConstPtr a -> m (ConstPtr a) # | |
Data a => Data (ForeignPtr a) # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ForeignPtr a -> c (ForeignPtr a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ForeignPtr a) # toConstr :: ForeignPtr a -> Constr # dataTypeOf :: ForeignPtr a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (ForeignPtr a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ForeignPtr a)) # gmapT :: (forall b. Data b => b -> b) -> ForeignPtr a -> ForeignPtr a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ForeignPtr a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ForeignPtr a -> r # gmapQ :: (forall d. Data d => d -> u) -> ForeignPtr a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> ForeignPtr a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> ForeignPtr a -> m (ForeignPtr a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ForeignPtr a -> m (ForeignPtr a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ForeignPtr a -> m (ForeignPtr a) # | |
Data a => Data (ZipList a) # | |
Defined in GHC.Internal.Functor.ZipList gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ZipList a -> c (ZipList a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (ZipList a) # toConstr :: ZipList a -> Constr # dataTypeOf :: ZipList a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (ZipList a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (ZipList a)) # gmapT :: (forall b. Data b => b -> b) -> ZipList a -> ZipList a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ZipList a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ZipList a -> r # gmapQ :: (forall d. Data d => d -> u) -> ZipList a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> ZipList a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> ZipList a -> m (ZipList a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ZipList a -> m (ZipList a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ZipList a -> m (ZipList a) # | |
Data p => Data (Par1 p) # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Par1 p -> c (Par1 p) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Par1 p) # toConstr :: Par1 p -> Constr # dataTypeOf :: Par1 p -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Par1 p)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Par1 p)) # gmapT :: (forall b. Data b => b -> b) -> Par1 p -> Par1 p # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Par1 p -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Par1 p -> r # gmapQ :: (forall d. Data d => d -> u) -> Par1 p -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Par1 p -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Par1 p -> m (Par1 p) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Par1 p -> m (Par1 p) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Par1 p -> m (Par1 p) # | |
Data a => Data (Ptr a) # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Ptr a -> c (Ptr a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Ptr a) # dataTypeOf :: Ptr a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Ptr a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Ptr a)) # gmapT :: (forall b. Data b => b -> b) -> Ptr a -> Ptr a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Ptr a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Ptr a -> r # gmapQ :: (forall d. Data d => d -> u) -> Ptr a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Ptr a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Ptr a -> m (Ptr a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Ptr a -> m (Ptr a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Ptr a -> m (Ptr a) # | |
(Data a, Integral a) => Data (Ratio a) # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Ratio a -> c (Ratio a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Ratio a) # toConstr :: Ratio a -> Constr # dataTypeOf :: Ratio a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Ratio a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Ratio a)) # gmapT :: (forall b. Data b => b -> b) -> Ratio a -> Ratio a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Ratio a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Ratio a -> r # gmapQ :: (forall d. Data d => d -> u) -> Ratio a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Ratio a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Ratio a -> m (Ratio a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Ratio a -> m (Ratio a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Ratio a -> m (Ratio a) # | |
Data flag => Data (TyVarBndr flag) # | |
Defined in GHC.Internal.TH.Syntax gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TyVarBndr flag -> c (TyVarBndr flag) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (TyVarBndr flag) # toConstr :: TyVarBndr flag -> Constr # dataTypeOf :: TyVarBndr flag -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (TyVarBndr flag)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (TyVarBndr flag)) # gmapT :: (forall b. Data b => b -> b) -> TyVarBndr flag -> TyVarBndr flag # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TyVarBndr flag -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TyVarBndr flag -> r # gmapQ :: (forall d. Data d => d -> u) -> TyVarBndr flag -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> TyVarBndr flag -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> TyVarBndr flag -> m (TyVarBndr flag) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TyVarBndr flag -> m (TyVarBndr flag) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TyVarBndr flag -> m (TyVarBndr flag) # | |
Data a => Data (Maybe a) # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Maybe a -> c (Maybe a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Maybe a) # toConstr :: Maybe a -> Constr # dataTypeOf :: Maybe a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Maybe a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Maybe a)) # gmapT :: (forall b. Data b => b -> b) -> Maybe a -> Maybe a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Maybe a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Maybe a -> r # gmapQ :: (forall d. Data d => d -> u) -> Maybe a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Maybe a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Maybe a -> m (Maybe a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Maybe a -> m (Maybe a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Maybe a -> m (Maybe a) # | |
Data a => Data (Solo a) # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Solo a -> c (Solo a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Solo a) # toConstr :: Solo a -> Constr # dataTypeOf :: Solo a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Solo a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Solo a)) # gmapT :: (forall b. Data b => b -> b) -> Solo a -> Solo a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Solo a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Solo a -> r # gmapQ :: (forall d. Data d => d -> u) -> Solo a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Solo a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Solo a -> m (Solo a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Solo a -> m (Solo a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Solo a -> m (Solo a) # | |
Data a => Data [a] # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> [a] -> c [a] # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c [a] # dataTypeOf :: [a] -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c [a]) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c [a]) # gmapT :: (forall b. Data b => b -> b) -> [a] -> [a] # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> [a] -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> [a] -> r # gmapQ :: (forall d. Data d => d -> u) -> [a] -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> [a] -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> [a] -> m [a] # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> [a] -> m [a] # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> [a] -> m [a] # | |
(Typeable m, Typeable a, Data (m a)) => Data (WrappedMonad m a) Source # | Since: base-4.14.0.0 |
Defined in Control.Applicative gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> WrappedMonad m a -> c (WrappedMonad m a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (WrappedMonad m a) # toConstr :: WrappedMonad m a -> Constr # dataTypeOf :: WrappedMonad m a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (WrappedMonad m a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (WrappedMonad m a)) # gmapT :: (forall b. Data b => b -> b) -> WrappedMonad m a -> WrappedMonad m a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WrappedMonad m a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WrappedMonad m a -> r # gmapQ :: (forall d. Data d => d -> u) -> WrappedMonad m a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> WrappedMonad m a -> u # gmapM :: Monad m0 => (forall d. Data d => d -> m0 d) -> WrappedMonad m a -> m0 (WrappedMonad m a) # gmapMp :: MonadPlus m0 => (forall d. Data d => d -> m0 d) -> WrappedMonad m a -> m0 (WrappedMonad m a) # gmapMo :: MonadPlus m0 => (forall d. Data d => d -> m0 d) -> WrappedMonad m a -> m0 (WrappedMonad m a) # | |
(Typeable k, Typeable a) => Data (Fixed a) Source # | Since: base-4.1.0.0 |
Defined in Data.Fixed gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Fixed a -> c (Fixed a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Fixed a) # toConstr :: Fixed a -> Constr # dataTypeOf :: Fixed a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Fixed a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Fixed a)) # gmapT :: (forall b. Data b => b -> b) -> Fixed a -> Fixed a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Fixed a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Fixed a -> r # gmapQ :: (forall d. Data d => d -> u) -> Fixed a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Fixed a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Fixed a -> m (Fixed a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Fixed a -> m (Fixed a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Fixed a -> m (Fixed a) # | |
(Data a, Data b) => Data (Arg a b) Source # | Since: base-4.9.0.0 |
Defined in Data.Semigroup gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> Arg a b -> c (Arg a b) # gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Arg a b) # toConstr :: Arg a b -> Constr # dataTypeOf :: Arg a b -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Arg a b)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Arg a b)) # gmapT :: (forall b0. Data b0 => b0 -> b0) -> Arg a b -> Arg a b # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Arg a b -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Arg a b -> r # gmapQ :: (forall d. Data d => d -> u) -> Arg a b -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Arg a b -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Arg a b -> m (Arg a b) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Arg a b -> m (Arg a b) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Arg a b -> m (Arg a b) # | |
(Data k, Data a, Ord k) => Data (Map k a) Source # | |
Defined in Data.Map.Internal gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Map k a -> c (Map k a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Map k a) # toConstr :: Map k a -> Constr # dataTypeOf :: Map k a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Map k a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Map k a)) # gmapT :: (forall b. Data b => b -> b) -> Map k a -> Map k a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Map k a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Map k a -> r # gmapQ :: (forall d. Data d => d -> u) -> Map k a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Map k a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Map k a -> m (Map k a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Map k a -> m (Map k a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Map k a -> m (Map k a) # | |
(Data a, Data b, Ix a) => Data (Array a b) # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> Array a b -> c (Array a b) # gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Array a b) # toConstr :: Array a b -> Constr # dataTypeOf :: Array a b -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Array a b)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Array a b)) # gmapT :: (forall b0. Data b0 => b0 -> b0) -> Array a b -> Array a b # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Array a b -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Array a b -> r # gmapQ :: (forall d. Data d => d -> u) -> Array a b -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Array a b -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Array a b -> m (Array a b) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Array a b -> m (Array a b) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Array a b -> m (Array a b) # | |
(Data a, Data b) => Data (Either a b) # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> Either a b -> c (Either a b) # gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Either a b) # toConstr :: Either a b -> Constr # dataTypeOf :: Either a b -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Either a b)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Either a b)) # gmapT :: (forall b0. Data b0 => b0 -> b0) -> Either a b -> Either a b # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Either a b -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Either a b -> r # gmapQ :: (forall d. Data d => d -> u) -> Either a b -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Either a b -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Either a b -> m (Either a b) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Either a b -> m (Either a b) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Either a b -> m (Either a b) # | |
Data t => Data (Proxy t) # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Proxy t -> c (Proxy t) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Proxy t) # toConstr :: Proxy t -> Constr # dataTypeOf :: Proxy t -> DataType # dataCast1 :: Typeable t0 => (forall d. Data d => c (t0 d)) -> Maybe (c (Proxy t)) # dataCast2 :: Typeable t0 => (forall d e. (Data d, Data e) => c (t0 d e)) -> Maybe (c (Proxy t)) # gmapT :: (forall b. Data b => b -> b) -> Proxy t -> Proxy t # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Proxy t -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Proxy t -> r # gmapQ :: (forall d. Data d => d -> u) -> Proxy t -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Proxy t -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Proxy t -> m (Proxy t) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Proxy t -> m (Proxy t) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Proxy t -> m (Proxy t) # | |
Data p => Data (U1 p) # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> U1 p -> c (U1 p) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (U1 p) # dataTypeOf :: U1 p -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (U1 p)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (U1 p)) # gmapT :: (forall b. Data b => b -> b) -> U1 p -> U1 p # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> U1 p -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> U1 p -> r # gmapQ :: (forall d. Data d => d -> u) -> U1 p -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> U1 p -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> U1 p -> m (U1 p) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> U1 p -> m (U1 p) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> U1 p -> m (U1 p) # | |
Data p => Data (V1 p) # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> V1 p -> c (V1 p) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (V1 p) # dataTypeOf :: V1 p -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (V1 p)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (V1 p)) # gmapT :: (forall b. Data b => b -> b) -> V1 p -> V1 p # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> V1 p -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> V1 p -> r # gmapQ :: (forall d. Data d => d -> u) -> V1 p -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> V1 p -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> V1 p -> m (V1 p) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> V1 p -> m (V1 p) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> V1 p -> m (V1 p) # | |
(Data a, Data b) => Data (a, b) # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> (a, b) -> c (a, b) # gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (a, b) # toConstr :: (a, b) -> Constr # dataTypeOf :: (a, b) -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (a, b)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (a, b)) # gmapT :: (forall b0. Data b0 => b0 -> b0) -> (a, b) -> (a, b) # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> (a, b) -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> (a, b) -> r # gmapQ :: (forall d. Data d => d -> u) -> (a, b) -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> (a, b) -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> (a, b) -> m (a, b) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> (a, b) -> m (a, b) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> (a, b) -> m (a, b) # | |
(Data v, Data c, Data a) => Data (CondBranch v c a) Source # | |
Defined in Distribution.Types.CondTree gfoldl :: (forall d b. Data d => c0 (d -> b) -> d -> c0 b) -> (forall g. g -> c0 g) -> CondBranch v c a -> c0 (CondBranch v c a) # gunfold :: (forall b r. Data b => c0 (b -> r) -> c0 r) -> (forall r. r -> c0 r) -> Constr -> c0 (CondBranch v c a) # toConstr :: CondBranch v c a -> Constr # dataTypeOf :: CondBranch v c a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c0 (t d)) -> Maybe (c0 (CondBranch v c a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c0 (t d e)) -> Maybe (c0 (CondBranch v c a)) # gmapT :: (forall b. Data b => b -> b) -> CondBranch v c a -> CondBranch v c a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CondBranch v c a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CondBranch v c a -> r # gmapQ :: (forall d. Data d => d -> u) -> CondBranch v c a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> CondBranch v c a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> CondBranch v c a -> m (CondBranch v c a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CondBranch v c a -> m (CondBranch v c a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CondBranch v c a -> m (CondBranch v c a) # | |
(Data v, Data a, Data c) => Data (CondTree v c a) Source # | |
Defined in Distribution.Types.CondTree gfoldl :: (forall d b. Data d => c0 (d -> b) -> d -> c0 b) -> (forall g. g -> c0 g) -> CondTree v c a -> c0 (CondTree v c a) # gunfold :: (forall b r. Data b => c0 (b -> r) -> c0 r) -> (forall r. r -> c0 r) -> Constr -> c0 (CondTree v c a) # toConstr :: CondTree v c a -> Constr # dataTypeOf :: CondTree v c a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c0 (t d)) -> Maybe (c0 (CondTree v c a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c0 (t d e)) -> Maybe (c0 (CondTree v c a)) # gmapT :: (forall b. Data b => b -> b) -> CondTree v c a -> CondTree v c a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CondTree v c a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CondTree v c a -> r # gmapQ :: (forall d. Data d => d -> u) -> CondTree v c a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> CondTree v c a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> CondTree v c a -> m (CondTree v c a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CondTree v c a -> m (CondTree v c a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CondTree v c a -> m (CondTree v c a) # | |
(Typeable from, Typeable allowAbsolute, Typeable to) => Data (SymbolicPathX allowAbsolute from to) Source # | |
Defined in Distribution.Utils.Path gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SymbolicPathX allowAbsolute from to -> c (SymbolicPathX allowAbsolute from to) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (SymbolicPathX allowAbsolute from to) # toConstr :: SymbolicPathX allowAbsolute from to -> Constr # dataTypeOf :: SymbolicPathX allowAbsolute from to -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (SymbolicPathX allowAbsolute from to)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (SymbolicPathX allowAbsolute from to)) # gmapT :: (forall b. Data b => b -> b) -> SymbolicPathX allowAbsolute from to -> SymbolicPathX allowAbsolute from to # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SymbolicPathX allowAbsolute from to -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SymbolicPathX allowAbsolute from to -> r # gmapQ :: (forall d. Data d => d -> u) -> SymbolicPathX allowAbsolute from to -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> SymbolicPathX allowAbsolute from to -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> SymbolicPathX allowAbsolute from to -> m (SymbolicPathX allowAbsolute from to) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SymbolicPathX allowAbsolute from to -> m (SymbolicPathX allowAbsolute from to) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SymbolicPathX allowAbsolute from to -> m (SymbolicPathX allowAbsolute from to) # | |
(Typeable a, Typeable b, Typeable c, Data (a b c)) => Data (WrappedArrow a b c) Source # | Since: base-4.14.0.0 |
Defined in Control.Applicative gfoldl :: (forall d b0. Data d => c0 (d -> b0) -> d -> c0 b0) -> (forall g. g -> c0 g) -> WrappedArrow a b c -> c0 (WrappedArrow a b c) # gunfold :: (forall b0 r. Data b0 => c0 (b0 -> r) -> c0 r) -> (forall r. r -> c0 r) -> Constr -> c0 (WrappedArrow a b c) # toConstr :: WrappedArrow a b c -> Constr # dataTypeOf :: WrappedArrow a b c -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c0 (t d)) -> Maybe (c0 (WrappedArrow a b c)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c0 (t d e)) -> Maybe (c0 (WrappedArrow a b c)) # gmapT :: (forall b0. Data b0 => b0 -> b0) -> WrappedArrow a b c -> WrappedArrow a b c # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WrappedArrow a b c -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WrappedArrow a b c -> r # gmapQ :: (forall d. Data d => d -> u) -> WrappedArrow a b c -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> WrappedArrow a b c -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> WrappedArrow a b c -> m (WrappedArrow a b c) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> WrappedArrow a b c -> m (WrappedArrow a b c) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> WrappedArrow a b c -> m (WrappedArrow a b c) # | |
(Typeable k, Data a, Typeable b) => Data (Const a b) # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> Const a b -> c (Const a b) # gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Const a b) # toConstr :: Const a b -> Constr # dataTypeOf :: Const a b -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Const a b)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Const a b)) # gmapT :: (forall b0. Data b0 => b0 -> b0) -> Const a b -> Const a b # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Const a b -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Const a b -> r # gmapQ :: (forall d. Data d => d -> u) -> Const a b -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Const a b -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Const a b -> m (Const a b) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Const a b -> m (Const a b) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Const a b -> m (Const a b) # | |
(Data (f a), Data a, Typeable f) => Data (Ap f a) # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Ap f a -> c (Ap f a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Ap f a) # toConstr :: Ap f a -> Constr # dataTypeOf :: Ap f a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Ap f a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Ap f a)) # gmapT :: (forall b. Data b => b -> b) -> Ap f a -> Ap f a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Ap f a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Ap f a -> r # gmapQ :: (forall d. Data d => d -> u) -> Ap f a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Ap f a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Ap f a -> m (Ap f a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Ap f a -> m (Ap f a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Ap f a -> m (Ap f a) # | |
(Data (f a), Data a, Typeable f) => Data (Alt f a) # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Alt f a -> c (Alt f a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Alt f a) # toConstr :: Alt f a -> Constr # dataTypeOf :: Alt f a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Alt f a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Alt f a)) # gmapT :: (forall b. Data b => b -> b) -> Alt f a -> Alt f a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Alt f a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Alt f a -> r # gmapQ :: (forall d. Data d => d -> u) -> Alt f a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Alt f a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Alt f a -> m (Alt f a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Alt f a -> m (Alt f a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Alt f a -> m (Alt f a) # | |
(Coercible a b, Data a, Data b) => Data (Coercion a b) # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> Coercion a b -> c (Coercion a b) # gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Coercion a b) # toConstr :: Coercion a b -> Constr # dataTypeOf :: Coercion a b -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Coercion a b)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Coercion a b)) # gmapT :: (forall b0. Data b0 => b0 -> b0) -> Coercion a b -> Coercion a b # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Coercion a b -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Coercion a b -> r # gmapQ :: (forall d. Data d => d -> u) -> Coercion a b -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Coercion a b -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Coercion a b -> m (Coercion a b) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Coercion a b -> m (Coercion a b) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Coercion a b -> m (Coercion a b) # | |
(a ~ b, Data a) => Data (a :~: b) # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> (a :~: b) -> c (a :~: b) # gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (a :~: b) # toConstr :: (a :~: b) -> Constr # dataTypeOf :: (a :~: b) -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (a :~: b)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (a :~: b)) # gmapT :: (forall b0. Data b0 => b0 -> b0) -> (a :~: b) -> a :~: b # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> (a :~: b) -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> (a :~: b) -> r # gmapQ :: (forall d. Data d => d -> u) -> (a :~: b) -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> (a :~: b) -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> (a :~: b) -> m (a :~: b) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> (a :~: b) -> m (a :~: b) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> (a :~: b) -> m (a :~: b) # | |
(Data (f p), Typeable f, Data p) => Data (Rec1 f p) # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Rec1 f p -> c (Rec1 f p) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Rec1 f p) # toConstr :: Rec1 f p -> Constr # dataTypeOf :: Rec1 f p -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Rec1 f p)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Rec1 f p)) # gmapT :: (forall b. Data b => b -> b) -> Rec1 f p -> Rec1 f p # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Rec1 f p -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Rec1 f p -> r # gmapQ :: (forall d. Data d => d -> u) -> Rec1 f p -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Rec1 f p -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Rec1 f p -> m (Rec1 f p) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Rec1 f p -> m (Rec1 f p) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Rec1 f p -> m (Rec1 f p) # | |
(Typeable b, Typeable k, Data a) => Data (Constant a b) Source # | |
Defined in Data.Functor.Constant gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> Constant a b -> c (Constant a b) # gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Constant a b) # toConstr :: Constant a b -> Constr # dataTypeOf :: Constant a b -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Constant a b)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Constant a b)) # gmapT :: (forall b0. Data b0 => b0 -> b0) -> Constant a b -> Constant a b # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Constant a b -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Constant a b -> r # gmapQ :: (forall d. Data d => d -> u) -> Constant a b -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Constant a b -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Constant a b -> m (Constant a b) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Constant a b -> m (Constant a b) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Constant a b -> m (Constant a b) # | |
(Data a, Data b, Data c) => Data (a, b, c) # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b0. Data d => c0 (d -> b0) -> d -> c0 b0) -> (forall g. g -> c0 g) -> (a, b, c) -> c0 (a, b, c) # gunfold :: (forall b0 r. Data b0 => c0 (b0 -> r) -> c0 r) -> (forall r. r -> c0 r) -> Constr -> c0 (a, b, c) # toConstr :: (a, b, c) -> Constr # dataTypeOf :: (a, b, c) -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c0 (t d)) -> Maybe (c0 (a, b, c)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c0 (t d e)) -> Maybe (c0 (a, b, c)) # gmapT :: (forall b0. Data b0 => b0 -> b0) -> (a, b, c) -> (a, b, c) # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> (a, b, c) -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> (a, b, c) -> r # gmapQ :: (forall d. Data d => d -> u) -> (a, b, c) -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> (a, b, c) -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> (a, b, c) -> m (a, b, c) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> (a, b, c) -> m (a, b, c) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> (a, b, c) -> m (a, b, c) # | |
(Typeable a, Typeable f, Typeable g, Typeable k, Data (f a), Data (g a)) => Data (Product f g a) Source # | Since: base-4.9.0.0 |
Defined in Data.Functor.Product gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g0. g0 -> c g0) -> Product f g a -> c (Product f g a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Product f g a) # toConstr :: Product f g a -> Constr # dataTypeOf :: Product f g a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Product f g a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Product f g a)) # gmapT :: (forall b. Data b => b -> b) -> Product f g a -> Product f g a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Product f g a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Product f g a -> r # gmapQ :: (forall d. Data d => d -> u) -> Product f g a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Product f g a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Product f g a -> m (Product f g a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Product f g a -> m (Product f g a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Product f g a -> m (Product f g a) # | |
(Typeable a, Typeable f, Typeable g, Typeable k, Data (f a), Data (g a)) => Data (Sum f g a) Source # | Since: base-4.9.0.0 |
Defined in Data.Functor.Sum gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g0. g0 -> c g0) -> Sum f g a -> c (Sum f g a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Sum f g a) # toConstr :: Sum f g a -> Constr # dataTypeOf :: Sum f g a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Sum f g a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Sum f g a)) # gmapT :: (forall b. Data b => b -> b) -> Sum f g a -> Sum f g a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Sum f g a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Sum f g a -> r # gmapQ :: (forall d. Data d => d -> u) -> Sum f g a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Sum f g a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Sum f g a -> m (Sum f g a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Sum f g a -> m (Sum f g a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Sum f g a -> m (Sum f g a) # | |
(Typeable i, Typeable j, Typeable a, Typeable b, a ~~ b) => Data (a :~~: b) # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> (a :~~: b) -> c (a :~~: b) # gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (a :~~: b) # toConstr :: (a :~~: b) -> Constr # dataTypeOf :: (a :~~: b) -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (a :~~: b)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (a :~~: b)) # gmapT :: (forall b0. Data b0 => b0 -> b0) -> (a :~~: b) -> a :~~: b # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> (a :~~: b) -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> (a :~~: b) -> r # gmapQ :: (forall d. Data d => d -> u) -> (a :~~: b) -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> (a :~~: b) -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> (a :~~: b) -> m (a :~~: b) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> (a :~~: b) -> m (a :~~: b) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> (a :~~: b) -> m (a :~~: b) # | |
(Typeable f, Typeable g, Data p, Data (f p), Data (g p)) => Data ((f :*: g) p) # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g0. g0 -> c g0) -> (f :*: g) p -> c ((f :*: g) p) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ((f :*: g) p) # toConstr :: (f :*: g) p -> Constr # dataTypeOf :: (f :*: g) p -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ((f :*: g) p)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ((f :*: g) p)) # gmapT :: (forall b. Data b => b -> b) -> (f :*: g) p -> (f :*: g) p # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> (f :*: g) p -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> (f :*: g) p -> r # gmapQ :: (forall d. Data d => d -> u) -> (f :*: g) p -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> (f :*: g) p -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> (f :*: g) p -> m ((f :*: g) p) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> (f :*: g) p -> m ((f :*: g) p) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> (f :*: g) p -> m ((f :*: g) p) # | |
(Typeable f, Typeable g, Data p, Data (f p), Data (g p)) => Data ((f :+: g) p) # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g0. g0 -> c g0) -> (f :+: g) p -> c ((f :+: g) p) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ((f :+: g) p) # toConstr :: (f :+: g) p -> Constr # dataTypeOf :: (f :+: g) p -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ((f :+: g) p)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ((f :+: g) p)) # gmapT :: (forall b. Data b => b -> b) -> (f :+: g) p -> (f :+: g) p # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> (f :+: g) p -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> (f :+: g) p -> r # gmapQ :: (forall d. Data d => d -> u) -> (f :+: g) p -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> (f :+: g) p -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> (f :+: g) p -> m ((f :+: g) p) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> (f :+: g) p -> m ((f :+: g) p) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> (f :+: g) p -> m ((f :+: g) p) # | |
(Typeable i, Data p, Data c) => Data (K1 i c p) # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c0 (d -> b) -> d -> c0 b) -> (forall g. g -> c0 g) -> K1 i c p -> c0 (K1 i c p) # gunfold :: (forall b r. Data b => c0 (b -> r) -> c0 r) -> (forall r. r -> c0 r) -> Constr -> c0 (K1 i c p) # toConstr :: K1 i c p -> Constr # dataTypeOf :: K1 i c p -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c0 (t d)) -> Maybe (c0 (K1 i c p)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c0 (t d e)) -> Maybe (c0 (K1 i c p)) # gmapT :: (forall b. Data b => b -> b) -> K1 i c p -> K1 i c p # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> K1 i c p -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> K1 i c p -> r # gmapQ :: (forall d. Data d => d -> u) -> K1 i c p -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> K1 i c p -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> K1 i c p -> m (K1 i c p) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> K1 i c p -> m (K1 i c p) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> K1 i c p -> m (K1 i c p) # | |
(Data a, Data b, Data c, Data d) => Data (a, b, c, d) # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d0 b0. Data d0 => c0 (d0 -> b0) -> d0 -> c0 b0) -> (forall g. g -> c0 g) -> (a, b, c, d) -> c0 (a, b, c, d) # gunfold :: (forall b0 r. Data b0 => c0 (b0 -> r) -> c0 r) -> (forall r. r -> c0 r) -> Constr -> c0 (a, b, c, d) # toConstr :: (a, b, c, d) -> Constr # dataTypeOf :: (a, b, c, d) -> DataType # dataCast1 :: Typeable t => (forall d0. Data d0 => c0 (t d0)) -> Maybe (c0 (a, b, c, d)) # dataCast2 :: Typeable t => (forall d0 e. (Data d0, Data e) => c0 (t d0 e)) -> Maybe (c0 (a, b, c, d)) # gmapT :: (forall b0. Data b0 => b0 -> b0) -> (a, b, c, d) -> (a, b, c, d) # gmapQl :: (r -> r' -> r) -> r -> (forall d0. Data d0 => d0 -> r') -> (a, b, c, d) -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d0. Data d0 => d0 -> r') -> (a, b, c, d) -> r # gmapQ :: (forall d0. Data d0 => d0 -> u) -> (a, b, c, d) -> [u] # gmapQi :: Int -> (forall d0. Data d0 => d0 -> u) -> (a, b, c, d) -> u # gmapM :: Monad m => (forall d0. Data d0 => d0 -> m d0) -> (a, b, c, d) -> m (a, b, c, d) # gmapMp :: MonadPlus m => (forall d0. Data d0 => d0 -> m d0) -> (a, b, c, d) -> m (a, b, c, d) # gmapMo :: MonadPlus m => (forall d0. Data d0 => d0 -> m d0) -> (a, b, c, d) -> m (a, b, c, d) # | |
(Typeable a, Typeable f, Typeable g, Typeable k1, Typeable k2, Data (f (g a))) => Data (Compose f g a) Source # | Since: base-4.9.0.0 |
Defined in Data.Functor.Compose gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g0. g0 -> c g0) -> Compose f g a -> c (Compose f g a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Compose f g a) # toConstr :: Compose f g a -> Constr # dataTypeOf :: Compose f g a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Compose f g a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Compose f g a)) # gmapT :: (forall b. Data b => b -> b) -> Compose f g a -> Compose f g a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Compose f g a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Compose f g a -> r # gmapQ :: (forall d. Data d => d -> u) -> Compose f g a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Compose f g a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Compose f g a -> m (Compose f g a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Compose f g a -> m (Compose f g a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Compose f g a -> m (Compose f g a) # | |
(Typeable f, Typeable g, Data p, Data (f (g p))) => Data ((f :.: g) p) # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g0. g0 -> c g0) -> (f :.: g) p -> c ((f :.: g) p) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ((f :.: g) p) # toConstr :: (f :.: g) p -> Constr # dataTypeOf :: (f :.: g) p -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ((f :.: g) p)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ((f :.: g) p)) # gmapT :: (forall b. Data b => b -> b) -> (f :.: g) p -> (f :.: g) p # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> (f :.: g) p -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> (f :.: g) p -> r # gmapQ :: (forall d. Data d => d -> u) -> (f :.: g) p -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> (f :.: g) p -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> (f :.: g) p -> m ((f :.: g) p) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> (f :.: g) p -> m ((f :.: g) p) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> (f :.: g) p -> m ((f :.: g) p) # | |
(Data p, Data (f p), Typeable c, Typeable i, Typeable f) => Data (M1 i c f p) # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c0 (d -> b) -> d -> c0 b) -> (forall g. g -> c0 g) -> M1 i c f p -> c0 (M1 i c f p) # gunfold :: (forall b r. Data b => c0 (b -> r) -> c0 r) -> (forall r. r -> c0 r) -> Constr -> c0 (M1 i c f p) # toConstr :: M1 i c f p -> Constr # dataTypeOf :: M1 i c f p -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c0 (t d)) -> Maybe (c0 (M1 i c f p)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c0 (t d e)) -> Maybe (c0 (M1 i c f p)) # gmapT :: (forall b. Data b => b -> b) -> M1 i c f p -> M1 i c f p # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> M1 i c f p -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> M1 i c f p -> r # gmapQ :: (forall d. Data d => d -> u) -> M1 i c f p -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> M1 i c f p -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> M1 i c f p -> m (M1 i c f p) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> M1 i c f p -> m (M1 i c f p) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> M1 i c f p -> m (M1 i c f p) # | |
(Data a, Data b, Data c, Data d, Data e) => Data (a, b, c, d, e) # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d0 b0. Data d0 => c0 (d0 -> b0) -> d0 -> c0 b0) -> (forall g. g -> c0 g) -> (a, b, c, d, e) -> c0 (a, b, c, d, e) # gunfold :: (forall b0 r. Data b0 => c0 (b0 -> r) -> c0 r) -> (forall r. r -> c0 r) -> Constr -> c0 (a, b, c, d, e) # toConstr :: (a, b, c, d, e) -> Constr # dataTypeOf :: (a, b, c, d, e) -> DataType # dataCast1 :: Typeable t => (forall d0. Data d0 => c0 (t d0)) -> Maybe (c0 (a, b, c, d, e)) # dataCast2 :: Typeable t => (forall d0 e0. (Data d0, Data e0) => c0 (t d0 e0)) -> Maybe (c0 (a, b, c, d, e)) # gmapT :: (forall b0. Data b0 => b0 -> b0) -> (a, b, c, d, e) -> (a, b, c, d, e) # gmapQl :: (r -> r' -> r) -> r -> (forall d0. Data d0 => d0 -> r') -> (a, b, c, d, e) -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d0. Data d0 => d0 -> r') -> (a, b, c, d, e) -> r # gmapQ :: (forall d0. Data d0 => d0 -> u) -> (a, b, c, d, e) -> [u] # gmapQi :: Int -> (forall d0. Data d0 => d0 -> u) -> (a, b, c, d, e) -> u # gmapM :: Monad m => (forall d0. Data d0 => d0 -> m d0) -> (a, b, c, d, e) -> m (a, b, c, d, e) # gmapMp :: MonadPlus m => (forall d0. Data d0 => d0 -> m d0) -> (a, b, c, d, e) -> m (a, b, c, d, e) # gmapMo :: MonadPlus m => (forall d0. Data d0 => d0 -> m d0) -> (a, b, c, d, e) -> m (a, b, c, d, e) # | |
(Data a, Data b, Data c, Data d, Data e, Data f) => Data (a, b, c, d, e, f) # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d0 b0. Data d0 => c0 (d0 -> b0) -> d0 -> c0 b0) -> (forall g. g -> c0 g) -> (a, b, c, d, e, f) -> c0 (a, b, c, d, e, f) # gunfold :: (forall b0 r. Data b0 => c0 (b0 -> r) -> c0 r) -> (forall r. r -> c0 r) -> Constr -> c0 (a, b, c, d, e, f) # toConstr :: (a, b, c, d, e, f) -> Constr # dataTypeOf :: (a, b, c, d, e, f) -> DataType # dataCast1 :: Typeable t => (forall d0. Data d0 => c0 (t d0)) -> Maybe (c0 (a, b, c, d, e, f)) # dataCast2 :: Typeable t => (forall d0 e0. (Data d0, Data e0) => c0 (t d0 e0)) -> Maybe (c0 (a, b, c, d, e, f)) # gmapT :: (forall b0. Data b0 => b0 -> b0) -> (a, b, c, d, e, f) -> (a, b, c, d, e, f) # gmapQl :: (r -> r' -> r) -> r -> (forall d0. Data d0 => d0 -> r') -> (a, b, c, d, e, f) -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d0. Data d0 => d0 -> r') -> (a, b, c, d, e, f) -> r # gmapQ :: (forall d0. Data d0 => d0 -> u) -> (a, b, c, d, e, f) -> [u] # gmapQi :: Int -> (forall d0. Data d0 => d0 -> u) -> (a, b, c, d, e, f) -> u # gmapM :: Monad m => (forall d0. Data d0 => d0 -> m d0) -> (a, b, c, d, e, f) -> m (a, b, c, d, e, f) # gmapMp :: MonadPlus m => (forall d0. Data d0 => d0 -> m d0) -> (a, b, c, d, e, f) -> m (a, b, c, d, e, f) # gmapMo :: MonadPlus m => (forall d0. Data d0 => d0 -> m d0) -> (a, b, c, d, e, f) -> m (a, b, c, d, e, f) # | |
(Data a, Data b, Data c, Data d, Data e, Data f, Data g) => Data (a, b, c, d, e, f, g) # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d0 b0. Data d0 => c0 (d0 -> b0) -> d0 -> c0 b0) -> (forall g0. g0 -> c0 g0) -> (a, b, c, d, e, f, g) -> c0 (a, b, c, d, e, f, g) # gunfold :: (forall b0 r. Data b0 => c0 (b0 -> r) -> c0 r) -> (forall r. r -> c0 r) -> Constr -> c0 (a, b, c, d, e, f, g) # toConstr :: (a, b, c, d, e, f, g) -> Constr # dataTypeOf :: (a, b, c, d, e, f, g) -> DataType # dataCast1 :: Typeable t => (forall d0. Data d0 => c0 (t d0)) -> Maybe (c0 (a, b, c, d, e, f, g)) # dataCast2 :: Typeable t => (forall d0 e0. (Data d0, Data e0) => c0 (t d0 e0)) -> Maybe (c0 (a, b, c, d, e, f, g)) # gmapT :: (forall b0. Data b0 => b0 -> b0) -> (a, b, c, d, e, f, g) -> (a, b, c, d, e, f, g) # gmapQl :: (r -> r' -> r) -> r -> (forall d0. Data d0 => d0 -> r') -> (a, b, c, d, e, f, g) -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d0. Data d0 => d0 -> r') -> (a, b, c, d, e, f, g) -> r # gmapQ :: (forall d0. Data d0 => d0 -> u) -> (a, b, c, d, e, f, g) -> [u] # gmapQi :: Int -> (forall d0. Data d0 => d0 -> u) -> (a, b, c, d, e, f, g) -> u # gmapM :: Monad m => (forall d0. Data d0 => d0 -> m d0) -> (a, b, c, d, e, f, g) -> m (a, b, c, d, e, f, g) # gmapMp :: MonadPlus m => (forall d0. Data d0 => d0 -> m d0) -> (a, b, c, d, e, f, g) -> m (a, b, c, d, e, f, g) # gmapMo :: MonadPlus m => (forall d0. Data d0 => d0 -> m d0) -> (a, b, c, d, e, f, g) -> m (a, b, c, d, e, f, g) # |
Instances
Generic OpenModule Source # | |||||
Defined in Distribution.Backpack
from :: OpenModule -> Rep OpenModule x # to :: Rep OpenModule x -> OpenModule # | |||||
Generic OpenUnitId Source # | |||||
Defined in Distribution.Backpack
from :: OpenUnitId -> Rep OpenUnitId x # to :: Rep OpenUnitId x -> OpenUnitId # | |||||
Generic CabalSpecVersion Source # | |||||
Defined in Distribution.CabalSpecVersion
from :: CabalSpecVersion -> Rep CabalSpecVersion x # to :: Rep CabalSpecVersion x -> CabalSpecVersion # | |||||
Generic AbiTag Source # | |||||
Defined in Distribution.Compiler
| |||||
Generic CompilerFlavor Source # | |||||
Defined in Distribution.Compiler
from :: CompilerFlavor -> Rep CompilerFlavor x # to :: Rep CompilerFlavor x -> CompilerFlavor # | |||||
Generic CompilerId Source # | |||||
Defined in Distribution.Compiler
from :: CompilerId -> Rep CompilerId x # to :: Rep CompilerId x -> CompilerId # | |||||
Generic CompilerInfo Source # | |||||
Defined in Distribution.Compiler
from :: CompilerInfo -> Rep CompilerInfo x # to :: Rep CompilerInfo x -> CompilerInfo # | |||||
Generic License Source # | |||||
Defined in Distribution.License
| |||||
Generic ModuleName Source # | |||||
Defined in Distribution.ModuleName
from :: ModuleName -> Rep ModuleName x # to :: Rep ModuleName x -> ModuleName # | |||||
Generic PError Source # | |||||
Defined in Distribution.Parsec.Error
| |||||
Generic Position Source # | |||||
Defined in Distribution.Parsec.Position
| |||||
Generic PWarnType Source # | |||||
Defined in Distribution.Parsec.Warning
| |||||
Generic PWarning Source # | |||||
Defined in Distribution.Parsec.Warning
| |||||
Generic License Source # | |||||
Defined in Distribution.SPDX.License
| |||||
Generic LicenseExceptionId Source # | |||||
Defined in Distribution.SPDX.LicenseExceptionId
from :: LicenseExceptionId -> Rep LicenseExceptionId x # to :: Rep LicenseExceptionId x -> LicenseExceptionId # | |||||
Generic LicenseExpression Source # | |||||
Defined in Distribution.SPDX.LicenseExpression
from :: LicenseExpression -> Rep LicenseExpression x # to :: Rep LicenseExpression x -> LicenseExpression # | |||||
Generic SimpleLicenseExpression Source # | |||||
Defined in Distribution.SPDX.LicenseExpression
| |||||
Generic LicenseRef Source # | |||||
Defined in Distribution.SPDX.LicenseReference
from :: LicenseRef -> Rep LicenseRef x # to :: Rep LicenseRef x -> LicenseRef # | |||||
Generic Arch Source # | |||||
Defined in Distribution.System
| |||||
Generic OS Source # | |||||
Defined in Distribution.System
| |||||
Generic Platform Source # | |||||
Defined in Distribution.System
| |||||
Generic AbiDependency Source # | |||||
Defined in Distribution.Types.AbiDependency
from :: AbiDependency -> Rep AbiDependency x # to :: Rep AbiDependency x -> AbiDependency # | |||||
Generic AbiHash Source # | |||||
Defined in Distribution.Types.AbiHash
| |||||
Generic Benchmark Source # | |||||
Defined in Distribution.Types.Benchmark
| |||||
Generic BenchmarkInterface Source # | |||||
Defined in Distribution.Types.BenchmarkInterface
from :: BenchmarkInterface -> Rep BenchmarkInterface x # to :: Rep BenchmarkInterface x -> BenchmarkInterface # | |||||
Generic BenchmarkType Source # | |||||
Defined in Distribution.Types.BenchmarkType
from :: BenchmarkType -> Rep BenchmarkType x # to :: Rep BenchmarkType x -> BenchmarkType # | |||||
Generic BuildInfo Source # | |||||
Defined in Distribution.Types.BuildInfo
| |||||
Generic BuildType Source # | |||||
Defined in Distribution.Types.BuildType
| |||||
Generic Component Source # | |||||
Defined in Distribution.Types.Component
| |||||
Generic ComponentId Source # | |||||
Defined in Distribution.Types.ComponentId
from :: ComponentId -> Rep ComponentId x # to :: Rep ComponentId x -> ComponentId # | |||||
Generic ComponentName Source # | |||||
Defined in Distribution.Types.ComponentName
from :: ComponentName -> Rep ComponentName x # to :: Rep ComponentName x -> ComponentName # | |||||
Generic ComponentRequestedSpec Source # | |||||
Defined in Distribution.Types.ComponentRequestedSpec
| |||||
Generic ConfVar Source # | |||||
Defined in Distribution.Types.ConfVar
| |||||
Generic Dependency Source # | |||||
Defined in Distribution.Types.Dependency
from :: Dependency -> Rep Dependency x # to :: Rep Dependency x -> Dependency # | |||||
Generic ExeDependency Source # | |||||
Defined in Distribution.Types.ExeDependency
from :: ExeDependency -> Rep ExeDependency x # to :: Rep ExeDependency x -> ExeDependency # | |||||
Generic Executable Source # | |||||
Defined in Distribution.Types.Executable
from :: Executable -> Rep Executable x # to :: Rep Executable x -> Executable # | |||||
Generic ExecutableScope Source # | |||||
Defined in Distribution.Types.ExecutableScope
from :: ExecutableScope -> Rep ExecutableScope x # to :: Rep ExecutableScope x -> ExecutableScope # | |||||
Generic ExposedModule Source # | |||||
Defined in Distribution.Types.ExposedModule
from :: ExposedModule -> Rep ExposedModule x # to :: Rep ExposedModule x -> ExposedModule # | |||||
Generic FlagAssignment Source # | |||||
Defined in Distribution.Types.Flag
from :: FlagAssignment -> Rep FlagAssignment x # to :: Rep FlagAssignment x -> FlagAssignment # | |||||
Generic FlagName Source # | |||||
Defined in Distribution.Types.Flag
| |||||
Generic PackageFlag Source # | |||||
Defined in Distribution.Types.Flag
from :: PackageFlag -> Rep PackageFlag x # to :: Rep PackageFlag x -> PackageFlag # | |||||
Generic ForeignLib Source # | |||||
Defined in Distribution.Types.ForeignLib
from :: ForeignLib -> Rep ForeignLib x # to :: Rep ForeignLib x -> ForeignLib # | |||||
Generic LibVersionInfo Source # | |||||
Defined in Distribution.Types.ForeignLib
from :: LibVersionInfo -> Rep LibVersionInfo x # to :: Rep LibVersionInfo x -> LibVersionInfo # | |||||
Generic ForeignLibOption Source # | |||||
Defined in Distribution.Types.ForeignLibOption
from :: ForeignLibOption -> Rep ForeignLibOption x # to :: Rep ForeignLibOption x -> ForeignLibOption # | |||||
Generic ForeignLibType Source # | |||||
Defined in Distribution.Types.ForeignLibType
from :: ForeignLibType -> Rep ForeignLibType x # to :: Rep ForeignLibType x -> ForeignLibType # | |||||
Generic GenericPackageDescription Source # | |||||
Defined in Distribution.Types.GenericPackageDescription
| |||||
Generic IncludeRenaming Source # | |||||
Defined in Distribution.Types.IncludeRenaming
from :: IncludeRenaming -> Rep IncludeRenaming x # to :: Rep IncludeRenaming x -> IncludeRenaming # | |||||
Generic InstalledPackageInfo Source # | |||||
Defined in Distribution.Types.InstalledPackageInfo
from :: InstalledPackageInfo -> Rep InstalledPackageInfo x # to :: Rep InstalledPackageInfo x -> InstalledPackageInfo # | |||||
Generic LegacyExeDependency Source # | |||||
Defined in Distribution.Types.LegacyExeDependency
from :: LegacyExeDependency -> Rep LegacyExeDependency x # to :: Rep LegacyExeDependency x -> LegacyExeDependency # | |||||
Generic Library Source # | |||||
Defined in Distribution.Types.Library
| |||||
Generic LibraryName Source # | |||||
Defined in Distribution.Types.LibraryName
from :: LibraryName -> Rep LibraryName x # to :: Rep LibraryName x -> LibraryName # | |||||
Generic LibraryVisibility Source # | |||||
Defined in Distribution.Types.LibraryVisibility
from :: LibraryVisibility -> Rep LibraryVisibility x # to :: Rep LibraryVisibility x -> LibraryVisibility # | |||||
Generic Mixin Source # | |||||
Defined in Distribution.Types.Mixin
| |||||
Generic Module Source # | |||||
Defined in Distribution.Types.Module
| |||||
Generic ModuleReexport Source # | |||||
Defined in Distribution.Types.ModuleReexport
from :: ModuleReexport -> Rep ModuleReexport x # to :: Rep ModuleReexport x -> ModuleReexport # | |||||
Generic ModuleRenaming Source # | |||||
Defined in Distribution.Types.ModuleRenaming
from :: ModuleRenaming -> Rep ModuleRenaming x # to :: Rep ModuleRenaming x -> ModuleRenaming # | |||||
Generic MungedPackageId Source # | |||||
Defined in Distribution.Types.MungedPackageId
from :: MungedPackageId -> Rep MungedPackageId x # to :: Rep MungedPackageId x -> MungedPackageId # | |||||
Generic MungedPackageName Source # | |||||
Defined in Distribution.Types.MungedPackageName
from :: MungedPackageName -> Rep MungedPackageName x # to :: Rep MungedPackageName x -> MungedPackageName # | |||||
Generic PackageDescription Source # | |||||
Defined in Distribution.Types.PackageDescription
from :: PackageDescription -> Rep PackageDescription x # to :: Rep PackageDescription x -> PackageDescription # | |||||
Generic PackageIdentifier Source # | |||||
Defined in Distribution.Types.PackageId
from :: PackageIdentifier -> Rep PackageIdentifier x # to :: Rep PackageIdentifier x -> PackageIdentifier # | |||||
Generic PackageName Source # | |||||
Defined in Distribution.Types.PackageName
from :: PackageName -> Rep PackageName x # to :: Rep PackageName x -> PackageName # | |||||
Generic PackageVersionConstraint Source # | |||||
Defined in Distribution.Types.PackageVersionConstraint
| |||||
Generic PkgconfigDependency Source # | |||||
Defined in Distribution.Types.PkgconfigDependency
from :: PkgconfigDependency -> Rep PkgconfigDependency x # to :: Rep PkgconfigDependency x -> PkgconfigDependency # | |||||
Generic PkgconfigName Source # | |||||
Defined in Distribution.Types.PkgconfigName
from :: PkgconfigName -> Rep PkgconfigName x # to :: Rep PkgconfigName x -> PkgconfigName # | |||||
Generic PkgconfigVersion Source # | |||||
Defined in Distribution.Types.PkgconfigVersion
from :: PkgconfigVersion -> Rep PkgconfigVersion x # to :: Rep PkgconfigVersion x -> PkgconfigVersion # | |||||
Generic PkgconfigVersionRange Source # | |||||
Defined in Distribution.Types.PkgconfigVersionRange
| |||||
Generic SetupBuildInfo Source # | |||||
Defined in Distribution.Types.SetupBuildInfo
from :: SetupBuildInfo -> Rep SetupBuildInfo x # to :: Rep SetupBuildInfo x -> SetupBuildInfo # | |||||
Generic KnownRepoType Source # | |||||
Defined in Distribution.Types.SourceRepo
from :: KnownRepoType -> Rep KnownRepoType x # to :: Rep KnownRepoType x -> KnownRepoType # | |||||
Generic RepoKind Source # | |||||
Defined in Distribution.Types.SourceRepo
| |||||
Generic RepoType Source # | |||||
Defined in Distribution.Types.SourceRepo
| |||||
Generic SourceRepo Source # | |||||
Defined in Distribution.Types.SourceRepo
from :: SourceRepo -> Rep SourceRepo x # to :: Rep SourceRepo x -> SourceRepo # | |||||
Generic TestSuite Source # | |||||
Defined in Distribution.Types.TestSuite
| |||||
Generic TestSuiteInterface Source # | |||||
Defined in Distribution.Types.TestSuiteInterface
from :: TestSuiteInterface -> Rep TestSuiteInterface x # to :: Rep TestSuiteInterface x -> TestSuiteInterface # | |||||
Generic TestType Source # | |||||
Defined in Distribution.Types.TestType
| |||||
Generic DefUnitId Source # | |||||
Defined in Distribution.Types.UnitId
| |||||
Generic UnitId Source # | |||||
Defined in Distribution.Types.UnitId
| |||||
Generic UnqualComponentName Source # | |||||
Defined in Distribution.Types.UnqualComponentName
from :: UnqualComponentName -> Rep UnqualComponentName x # to :: Rep UnqualComponentName x -> UnqualComponentName # | |||||
Generic Version Source # | |||||
Defined in Distribution.Types.Version
| |||||
Generic VersionRange Source # | |||||
Defined in Distribution.Types.VersionRange.Internal
from :: VersionRange -> Rep VersionRange x # to :: Rep VersionRange x -> VersionRange # | |||||
Generic ShortText Source # | |||||
Defined in Distribution.Utils.ShortText
| |||||
Generic Structure Source # | |||||
Defined in Distribution.Utils.Structured
| |||||
Generic Extension Source # | |||||
Defined in Language.Haskell.Extension
| |||||
Generic KnownExtension Source # | |||||
Defined in Language.Haskell.Extension
from :: KnownExtension -> Rep KnownExtension x # to :: Rep KnownExtension x -> KnownExtension # | |||||
Generic Language Source # | |||||
Defined in Language.Haskell.Extension
| |||||
Generic ShortByteString Source # | |||||
Defined in Data.ByteString.Short.Internal
from :: ShortByteString -> Rep ShortByteString x # to :: Rep ShortByteString x -> ShortByteString # | |||||
Generic Void # | |||||
Generic All # | |||||
Defined in GHC.Internal.Data.Semigroup.Internal
| |||||
Generic Any # | |||||
Defined in GHC.Internal.Data.Semigroup.Internal
| |||||
Generic Version # | |||||
Defined in GHC.Internal.Data.Version
| |||||
Generic Fingerprint # | |||||
Defined in GHC.Internal.Generics
from :: Fingerprint -> Rep Fingerprint x # to :: Rep Fingerprint x -> Fingerprint # | |||||
Generic ForeignSrcLang # | |||||
Defined in GHC.Internal.ForeignSrcLang
| |||||
Generic Associativity # | |||||
Defined in GHC.Internal.Generics
from :: Associativity -> Rep Associativity x # to :: Rep Associativity x -> Associativity # | |||||
Generic DecidedStrictness # | |||||
Defined in GHC.Internal.Generics
from :: DecidedStrictness -> Rep DecidedStrictness x # to :: Rep DecidedStrictness x -> DecidedStrictness # | |||||
Generic Fixity # | |||||
Defined in GHC.Internal.Generics
| |||||
Generic SourceStrictness # | |||||
Defined in GHC.Internal.Generics
from :: SourceStrictness -> Rep SourceStrictness x # to :: Rep SourceStrictness x -> SourceStrictness # | |||||
Generic SourceUnpackedness # | |||||
Defined in GHC.Internal.Generics
from :: SourceUnpackedness -> Rep SourceUnpackedness x # to :: Rep SourceUnpackedness x -> SourceUnpackedness # | |||||
Generic ExitCode # | |||||
Defined in GHC.Internal.IO.Exception
| |||||
Generic Extension # | |||||
Defined in GHC.Internal.LanguageExtensions
| |||||
Generic SrcLoc # | |||||
Defined in GHC.Internal.Generics
| |||||
Generic AnnLookup # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic AnnTarget # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic Bang # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic BndrVis # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic Body # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic Bytes # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic Callconv # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic Clause # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic Con # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic Dec # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic DecidedStrictness # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic DerivClause # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic DerivStrategy # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic DocLoc # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic Exp # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic FamilyResultSig # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic Fixity # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic FixityDirection # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic Foreign # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic FunDep # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic Guard # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic Info # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic InjectivityAnn # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic Inline # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic Lit # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic Loc # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic Match # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic ModName # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic Module # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic ModuleInfo # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic Name # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic NameFlavour # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic NameSpace # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic NamespaceSpecifier # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic OccName # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic Overlap # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic Pat # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic PatSynArgs # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic PatSynDir # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic Phases # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic PkgName # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic Pragma # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic Range # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic Role # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic RuleBndr # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic RuleMatch # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic Safety # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic SourceStrictness # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic SourceUnpackedness # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic Specificity # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic Stmt # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic TyLit # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic TySynEqn # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic Type # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic TypeFamilyHead # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic GeneralCategory # | |||||
Defined in GHC.Internal.Generics
from :: GeneralCategory -> Rep GeneralCategory x # to :: Rep GeneralCategory x -> GeneralCategory # | |||||
Generic Ordering # | |||||
Defined in GHC.Internal.Generics | |||||
Generic OsChar # | |||||
Defined in System.OsString.Internal.Types
| |||||
Generic OsString # | |||||
Defined in System.OsString.Internal.Types
| |||||
Generic PosixChar # | |||||
Defined in System.OsString.Internal.Types
| |||||
Generic PosixString # | |||||
Defined in System.OsString.Internal.Types
from :: PosixString -> Rep PosixString x # to :: Rep PosixString x -> PosixString # | |||||
Generic WindowsChar # | |||||
Defined in System.OsString.Internal.Types
from :: WindowsChar -> Rep WindowsChar x # to :: Rep WindowsChar x -> WindowsChar # | |||||
Generic WindowsString # | |||||
Defined in System.OsString.Internal.Types
from :: WindowsString -> Rep WindowsString x # to :: Rep WindowsString x -> WindowsString # | |||||
Generic Mode Source # | |||||
Defined in Text.PrettyPrint.Annotated.HughesPJ
| |||||
Generic Style Source # | |||||
Defined in Text.PrettyPrint.Annotated.HughesPJ
| |||||
Generic TextDetails Source # | |||||
Defined in Text.PrettyPrint.Annotated.HughesPJ
from :: TextDetails -> Rep TextDetails x # to :: Rep TextDetails x -> TextDetails # | |||||
Generic Doc Source # | |||||
Defined in Text.PrettyPrint.HughesPJ
| |||||
Generic CalendarDiffDays Source # | |||||
Defined in Data.Time.Calendar.CalendarDiffDays
from :: CalendarDiffDays -> Rep CalendarDiffDays x # to :: Rep CalendarDiffDays x -> CalendarDiffDays # | |||||
Generic Day Source # | |||||
Defined in Data.Time.Calendar.Days
| |||||
Generic Month Source # | |||||
Defined in Data.Time.Calendar.Month
| |||||
Generic Quarter Source # | |||||
Defined in Data.Time.Calendar.Quarter
| |||||
Generic QuarterOfYear Source # | |||||
Defined in Data.Time.Calendar.Quarter
from :: QuarterOfYear -> Rep QuarterOfYear x # to :: Rep QuarterOfYear x -> QuarterOfYear # | |||||
Generic DayOfWeek Source # | |||||
Defined in Data.Time.Calendar.Week
| |||||
Generic SystemTime Source # | |||||
Defined in Data.Time.Clock.Internal.SystemTime
from :: SystemTime -> Rep SystemTime x # to :: Rep SystemTime x -> SystemTime # | |||||
Generic UTCTime Source # | |||||
Defined in Data.Time.Clock.Internal.UTCTime
| |||||
Generic UniversalTime Source # | |||||
Defined in Data.Time.Clock.Internal.UniversalTime
from :: UniversalTime -> Rep UniversalTime x # to :: Rep UniversalTime x -> UniversalTime # | |||||
Generic CalendarDiffTime Source # | |||||
Defined in Data.Time.LocalTime.Internal.CalendarDiffTime
from :: CalendarDiffTime -> Rep CalendarDiffTime x # to :: Rep CalendarDiffTime x -> CalendarDiffTime # | |||||
Generic LocalTime Source # | |||||
Defined in Data.Time.LocalTime.Internal.LocalTime
| |||||
Generic TimeOfDay Source # | |||||
Defined in Data.Time.LocalTime.Internal.TimeOfDay
| |||||
Generic TimeZone Source # | |||||
Defined in Data.Time.LocalTime.Internal.TimeZone
| |||||
Generic ZonedTime Source # | |||||
Defined in Data.Time.LocalTime.Internal.ZonedTime
| |||||
Generic () # | |||||
Generic Bool # | |||||
Defined in GHC.Internal.Generics | |||||
Generic (Last' a) Source # | |||||
Defined in Distribution.Compat.Semigroup
| |||||
Generic (Option' a) Source # | |||||
Defined in Distribution.Compat.Semigroup
| |||||
Generic (PerCompilerFlavor v) Source # | |||||
Defined in Distribution.Compiler
from :: PerCompilerFlavor v -> Rep (PerCompilerFlavor v) x # to :: Rep (PerCompilerFlavor v) x -> PerCompilerFlavor v # | |||||
Generic (Condition c) Source # | |||||
Defined in Distribution.Types.Condition
| |||||
Generic (VersionRangeF a) Source # | |||||
Defined in Distribution.Types.VersionRange.Internal
from :: VersionRangeF a -> Rep (VersionRangeF a) x # to :: Rep (VersionRangeF a) x -> VersionRangeF a # | |||||
Generic (Complex a) Source # | |||||
Defined in Data.Complex
| |||||
Generic (First a) Source # | |||||
Defined in Data.Semigroup
| |||||
Generic (Last a) Source # | |||||
Defined in Data.Semigroup
| |||||
Generic (Max a) Source # | |||||
Defined in Data.Semigroup
| |||||
Generic (Min a) Source # | |||||
Defined in Data.Semigroup
| |||||
Generic (WrappedMonoid m) Source # | |||||
Defined in Data.Semigroup
from :: WrappedMonoid m -> Rep (WrappedMonoid m) x # to :: Rep (WrappedMonoid m) x -> WrappedMonoid m # | |||||
Generic (SCC vertex) Source # | |||||
Defined in Data.Graph
| |||||
Generic (Digit a) Source # | |||||
Defined in Data.Sequence.Internal
| |||||
Generic (Elem a) Source # | |||||
Defined in Data.Sequence.Internal
| |||||
Generic (FingerTree a) Source # | |||||
Defined in Data.Sequence.Internal
from :: FingerTree a -> Rep (FingerTree a) x # to :: Rep (FingerTree a) x -> FingerTree a # | |||||
Generic (Node a) Source # | |||||
Defined in Data.Sequence.Internal
| |||||
Generic (ViewL a) Source # | |||||
Defined in Data.Sequence.Internal
| |||||
Generic (ViewR a) Source # | |||||
Defined in Data.Sequence.Internal
| |||||
Generic (Tree a) Source # | |||||
Defined in Data.Tree
| |||||
Generic (NonEmpty a) # | |||||
Defined in GHC.Internal.Generics
| |||||
Generic (Identity a) # | |||||
Defined in GHC.Internal.Data.Functor.Identity
| |||||
Generic (First a) # | |||||
Defined in GHC.Internal.Data.Monoid
| |||||
Generic (Last a) # | |||||
Defined in GHC.Internal.Data.Monoid
| |||||
Generic (Down a) # | |||||
Defined in GHC.Internal.Generics
| |||||
Generic (Dual a) # | |||||
Defined in GHC.Internal.Data.Semigroup.Internal
| |||||
Generic (Endo a) # | |||||
Defined in GHC.Internal.Data.Semigroup.Internal
| |||||
Generic (Product a) # | |||||
Defined in GHC.Internal.Data.Semigroup.Internal
| |||||
Generic (Sum a) # | |||||
Defined in GHC.Internal.Data.Semigroup.Internal
| |||||
Generic (ZipList a) # | |||||
Defined in GHC.Internal.Functor.ZipList
| |||||
Generic (Par1 p) # | |||||
Defined in GHC.Internal.Generics
| |||||
Generic (TyVarBndr flag) # | |||||
Defined in GHC.Internal.TH.Syntax
| |||||
Generic (Doc a) Source # | |||||
Defined in Text.PrettyPrint.Annotated.HughesPJ
| |||||
Generic (Maybe a) # | |||||
Defined in GHC.Internal.Generics
| |||||
Generic (Solo a) # | |||||
Defined in GHC.Internal.Generics
| |||||
Generic [a] # | |||||
Defined in GHC.Internal.Generics
| |||||
Generic (WrappedMonad m a) Source # | |||||
Defined in Control.Applicative
from :: WrappedMonad m a -> Rep (WrappedMonad m a) x # to :: Rep (WrappedMonad m a) x -> WrappedMonad m a # | |||||
Generic (Arg a b) Source # | |||||
Defined in Data.Semigroup
| |||||
Generic (Either a b) # | |||||
Defined in GHC.Internal.Generics
| |||||
Generic (Proxy t) # | |||||
Defined in GHC.Internal.Generics | |||||
Generic (U1 p) # | |||||
Generic (V1 p) # | |||||
Generic (Lift f a) Source # | |||||
Defined in Control.Applicative.Lift
| |||||
Generic (MaybeT m a) Source # | |||||
Defined in Control.Monad.Trans.Maybe
| |||||
Generic (a, b) # | |||||
Defined in GHC.Internal.Generics
| |||||
Generic (CondBranch v c a) Source # | |||||
Defined in Distribution.Types.CondTree
from :: CondBranch v c a -> Rep (CondBranch v c a) x # to :: Rep (CondBranch v c a) x -> CondBranch v c a # | |||||
Generic (CondTree v c a) Source # | |||||
Defined in Distribution.Types.CondTree
| |||||
Generic (SymbolicPathX allowAbsolute from to) Source # | |||||
Defined in Distribution.Utils.Path
from :: SymbolicPathX allowAbsolute from to -> Rep (SymbolicPathX allowAbsolute from to) x # to :: Rep (SymbolicPathX allowAbsolute from to) x -> SymbolicPathX allowAbsolute from to # | |||||
Generic (WrappedArrow a b c) Source # | |||||
Defined in Control.Applicative
from :: WrappedArrow a b c -> Rep (WrappedArrow a b c) x # to :: Rep (WrappedArrow a b c) x -> WrappedArrow a b c # | |||||
Generic (Kleisli m a b) # | |||||
Defined in GHC.Internal.Control.Arrow
| |||||
Generic (Const a b) # | |||||
Defined in GHC.Internal.Data.Functor.Const
| |||||
Generic (Ap f a) # | |||||
Defined in GHC.Internal.Data.Monoid
| |||||
Generic (Alt f a) # | |||||
Defined in GHC.Internal.Data.Semigroup.Internal
| |||||
Generic (Rec1 f p) # | |||||
Defined in GHC.Internal.Generics
| |||||
Generic (URec (Ptr ()) p) # | |||||
Defined in GHC.Internal.Generics
| |||||
Generic (URec Char p) # | |||||
Defined in GHC.Internal.Generics
| |||||
Generic (URec Double p) # | |||||
Defined in GHC.Internal.Generics
| |||||
Generic (URec Float p) # | |||||
Defined in GHC.Internal.Generics
| |||||
Generic (URec Int p) # | |||||
Defined in GHC.Internal.Generics
| |||||
Generic (URec Word p) # | |||||
Defined in GHC.Internal.Generics
| |||||
Generic (Backwards f a) Source # | |||||
Defined in Control.Applicative.Backwards
| |||||
Generic (AccumT w m a) Source # | |||||
Defined in Control.Monad.Trans.Accum
| |||||
Generic (ExceptT e m a) Source # | |||||
Defined in Control.Monad.Trans.Except
| |||||
Generic (IdentityT f a) Source # | |||||
Defined in Control.Monad.Trans.Identity
| |||||
Generic (ReaderT r m a) Source # | |||||
Defined in Control.Monad.Trans.Reader
| |||||
Generic (SelectT r m a) Source # | |||||
Defined in Control.Monad.Trans.Select
| |||||
Generic (StateT s m a) Source # | |||||
Defined in Control.Monad.Trans.State.Lazy
| |||||
Generic (StateT s m a) Source # | |||||
Defined in Control.Monad.Trans.State.Strict
| |||||
Generic (WriterT w m a) Source # | |||||
Defined in Control.Monad.Trans.Writer.CPS
| |||||
Generic (WriterT w m a) Source # | |||||
Defined in Control.Monad.Trans.Writer.Lazy
| |||||
Generic (WriterT w m a) Source # | |||||
Defined in Control.Monad.Trans.Writer.Strict
| |||||
Generic (Constant a b) Source # | |||||
Defined in Data.Functor.Constant
| |||||
Generic (Reverse f a) Source # | |||||
Defined in Data.Functor.Reverse
| |||||
Generic (a, b, c) # | |||||
Defined in GHC.Internal.Generics
| |||||
Generic (Product f g a) Source # | |||||
Defined in Data.Functor.Product
| |||||
Generic (Sum f g a) Source # | |||||
Defined in Data.Functor.Sum
| |||||
Generic ((f :*: g) p) # | |||||
Defined in GHC.Internal.Generics
| |||||
Generic ((f :+: g) p) # | |||||
Defined in GHC.Internal.Generics
| |||||
Generic (K1 i c p) # | |||||
Defined in GHC.Internal.Generics
| |||||
Generic (ContT r m a) Source # | |||||
Defined in Control.Monad.Trans.Cont
| |||||
Generic (a, b, c, d) # | |||||
Defined in GHC.Internal.Generics
| |||||
Generic (Compose f g a) Source # | |||||
Defined in Data.Functor.Compose
| |||||
Generic ((f :.: g) p) # | |||||
Defined in GHC.Internal.Generics
| |||||
Generic (M1 i c f p) # | |||||
Defined in GHC.Internal.Generics
| |||||
Generic (RWST r w s m a) Source # | |||||
Defined in Control.Monad.Trans.RWS.CPS
| |||||
Generic (RWST r w s m a) Source # | |||||
Defined in Control.Monad.Trans.RWS.Lazy
| |||||
Generic (RWST r w s m a) Source # | |||||
Defined in Control.Monad.Trans.RWS.Strict
| |||||
Generic (a, b, c, d, e) # | |||||
Defined in GHC.Internal.Generics
| |||||
Generic (a, b, c, d, e, f) # | |||||
Defined in GHC.Internal.Generics
| |||||
Generic (a, b, c, d, e, f, g) # | |||||
Defined in GHC.Internal.Generics
| |||||
Generic (a, b, c, d, e, f, g, h) # | |||||
Defined in GHC.Internal.Generics
| |||||
Generic (a, b, c, d, e, f, g, h, i) # | |||||
Defined in GHC.Internal.Generics
| |||||
Generic (a, b, c, d, e, f, g, h, i, j) # | |||||
Defined in GHC.Internal.Generics
| |||||
Generic (a, b, c, d, e, f, g, h, i, j, k) # | |||||
Defined in GHC.Internal.Generics
| |||||
Generic (a, b, c, d, e, f, g, h, i, j, k, l) # | |||||
Defined in GHC.Internal.Generics
| |||||
Generic (a, b, c, d, e, f, g, h, i, j, k, l, m) # | |||||
Defined in GHC.Internal.Generics
| |||||
Generic (a, b, c, d, e, f, g, h, i, j, k, l, m, n) # | |||||
Defined in GHC.Internal.Generics
| |||||
Generic (a, b, c, d, e, f, g, h, i, j, k, l, m, n, o) # | |||||
Defined in GHC.Internal.Generics
|
A class of types that can be fully evaluated.
Since: deepseq-1.1.0.0
Nothing
rnf
should reduce its argument to normal form (that is, fully
evaluate all sub-components), and then return ()
.
Generic
NFData
deriving
Starting with GHC 7.2, you can automatically derive instances
for types possessing a Generic
instance.
Note: Generic1
can be auto-derived starting with GHC 7.4
{-# LANGUAGE DeriveGeneric #-} import GHC.Generics (Generic, Generic1) import Control.DeepSeq data Foo a = Foo a String deriving (Eq, Generic, Generic1) instance NFData a => NFData (Foo a) instance NFData1 Foo data Colour = Red | Green | Blue deriving Generic instance NFData Colour
Starting with GHC 7.10, the example above can be written more
concisely by enabling the new DeriveAnyClass
extension:
{-# LANGUAGE DeriveGeneric, DeriveAnyClass #-} import GHC.Generics (Generic) import Control.DeepSeq data Foo a = Foo a String deriving (Eq, Generic, Generic1, NFData, NFData1) data Colour = Red | Green | Blue deriving (Generic, NFData)
Compatibility with previous deepseq
versions
Prior to version 1.4.0.0, the default implementation of the rnf
method was defined as
rnf
a =seq
a ()
However, starting with deepseq-1.4.0.0
, the default
implementation is based on DefaultSignatures
allowing for
more accurate auto-derived NFData
instances. If you need the
previously used exact default rnf
method implementation
semantics, use
instance NFData Colour where rnf x = seq x ()
or alternatively
instance NFData Colour where rnf = rwhnf
or
{-# LANGUAGE BangPatterns #-} instance NFData Colour where rnf !_ = ()
Instances
NFData OpenModule Source # | |
Defined in Distribution.Backpack rnf :: OpenModule -> () Source # | |
NFData OpenUnitId Source # | |
Defined in Distribution.Backpack rnf :: OpenUnitId -> () Source # | |
NFData CabalSpecVersion Source # | |
Defined in Distribution.CabalSpecVersion rnf :: CabalSpecVersion -> () Source # | |
NFData CompilerFlavor Source # | |
Defined in Distribution.Compiler rnf :: CompilerFlavor -> () Source # | |
NFData CompilerId Source # | |
Defined in Distribution.Compiler rnf :: CompilerId -> () Source # | |
NFData License Source # | |
Defined in Distribution.License | |
NFData ModuleName Source # | |
Defined in Distribution.ModuleName rnf :: ModuleName -> () Source # | |
NFData PError Source # | |
Defined in Distribution.Parsec.Error | |
NFData Position Source # | |
Defined in Distribution.Parsec.Position | |
NFData PWarnType Source # | |
Defined in Distribution.Parsec.Warning | |
NFData PWarning Source # | |
Defined in Distribution.Parsec.Warning | |
NFData License Source # | |
Defined in Distribution.SPDX.License | |
NFData LicenseExceptionId Source # | |
Defined in Distribution.SPDX.LicenseExceptionId rnf :: LicenseExceptionId -> () Source # | |
NFData LicenseExpression Source # | |
Defined in Distribution.SPDX.LicenseExpression rnf :: LicenseExpression -> () Source # | |
NFData SimpleLicenseExpression Source # | |
Defined in Distribution.SPDX.LicenseExpression rnf :: SimpleLicenseExpression -> () Source # | |
NFData LicenseId Source # | |
Defined in Distribution.SPDX.LicenseId | |
NFData LicenseRef Source # | |
Defined in Distribution.SPDX.LicenseReference rnf :: LicenseRef -> () Source # | |
NFData Arch Source # | |
Defined in Distribution.System | |
NFData OS Source # | |
Defined in Distribution.System | |
NFData Platform Source # | |
Defined in Distribution.System | |
NFData AbiDependency Source # | |
Defined in Distribution.Types.AbiDependency rnf :: AbiDependency -> () Source # | |
NFData AbiHash Source # | |
Defined in Distribution.Types.AbiHash | |
NFData Benchmark Source # | |
Defined in Distribution.Types.Benchmark | |
NFData BenchmarkInterface Source # | |
Defined in Distribution.Types.BenchmarkInterface rnf :: BenchmarkInterface -> () Source # | |
NFData BenchmarkType Source # | |
Defined in Distribution.Types.BenchmarkType rnf :: BenchmarkType -> () Source # | |
NFData BuildInfo Source # | |
Defined in Distribution.Types.BuildInfo | |
NFData BuildType Source # | |
Defined in Distribution.Types.BuildType | |
NFData ComponentId Source # | |
Defined in Distribution.Types.ComponentId rnf :: ComponentId -> () Source # | |
NFData ConfVar Source # | |
Defined in Distribution.Types.ConfVar | |
NFData Dependency Source # | |
Defined in Distribution.Types.Dependency rnf :: Dependency -> () Source # | |
NFData ExeDependency Source # | |
Defined in Distribution.Types.ExeDependency rnf :: ExeDependency -> () Source # | |
NFData Executable Source # | |
Defined in Distribution.Types.Executable rnf :: Executable -> () Source # | |
NFData ExecutableScope Source # | |
Defined in Distribution.Types.ExecutableScope rnf :: ExecutableScope -> () Source # | |
NFData ExposedModule Source # | |
Defined in Distribution.Types.ExposedModule rnf :: ExposedModule -> () Source # | |
NFData FlagAssignment Source # | |
Defined in Distribution.Types.Flag rnf :: FlagAssignment -> () Source # | |
NFData FlagName Source # | |
Defined in Distribution.Types.Flag | |
NFData PackageFlag Source # | |
Defined in Distribution.Types.Flag rnf :: PackageFlag -> () Source # | |
NFData ForeignLib Source # | |
Defined in Distribution.Types.ForeignLib rnf :: ForeignLib -> () Source # | |
NFData LibVersionInfo Source # | |
Defined in Distribution.Types.ForeignLib rnf :: LibVersionInfo -> () Source # | |
NFData ForeignLibOption Source # | |
Defined in Distribution.Types.ForeignLibOption rnf :: ForeignLibOption -> () Source # | |
NFData ForeignLibType Source # | |
Defined in Distribution.Types.ForeignLibType rnf :: ForeignLibType -> () Source # | |
NFData GenericPackageDescription Source # | |
Defined in Distribution.Types.GenericPackageDescription rnf :: GenericPackageDescription -> () Source # | |
NFData IncludeRenaming Source # | |
Defined in Distribution.Types.IncludeRenaming rnf :: IncludeRenaming -> () Source # | |
NFData InstalledPackageInfo Source # | |
Defined in Distribution.Types.InstalledPackageInfo rnf :: InstalledPackageInfo -> () Source # | |
NFData LegacyExeDependency Source # | |
Defined in Distribution.Types.LegacyExeDependency rnf :: LegacyExeDependency -> () Source # | |
NFData Library Source # | |
Defined in Distribution.Types.Library | |
NFData LibraryName Source # | |
Defined in Distribution.Types.LibraryName rnf :: LibraryName -> () Source # | |
NFData LibraryVisibility Source # | |
Defined in Distribution.Types.LibraryVisibility rnf :: LibraryVisibility -> () Source # | |
NFData Mixin Source # | |
Defined in Distribution.Types.Mixin | |
NFData Module Source # | |
Defined in Distribution.Types.Module | |
NFData ModuleReexport Source # | |
Defined in Distribution.Types.ModuleReexport rnf :: ModuleReexport -> () Source # | |
NFData ModuleRenaming Source # | |
Defined in Distribution.Types.ModuleRenaming rnf :: ModuleRenaming -> () Source # | |
NFData MungedPackageId Source # | |
Defined in Distribution.Types.MungedPackageId rnf :: MungedPackageId -> () Source # | |
NFData MungedPackageName Source # | |
Defined in Distribution.Types.MungedPackageName rnf :: MungedPackageName -> () Source # | |
NFData PackageDescription Source # | |
Defined in Distribution.Types.PackageDescription rnf :: PackageDescription -> () Source # | |
NFData PackageIdentifier Source # | |
Defined in Distribution.Types.PackageId rnf :: PackageIdentifier -> () Source # | |
NFData PackageName Source # | |
Defined in Distribution.Types.PackageName rnf :: PackageName -> () Source # | |
NFData PackageVersionConstraint Source # | |
Defined in Distribution.Types.PackageVersionConstraint rnf :: PackageVersionConstraint -> () Source # | |
NFData PkgconfigDependency Source # | |
Defined in Distribution.Types.PkgconfigDependency rnf :: PkgconfigDependency -> () Source # | |
NFData PkgconfigName Source # | |
Defined in Distribution.Types.PkgconfigName rnf :: PkgconfigName -> () Source # | |
NFData PkgconfigVersion Source # | |
Defined in Distribution.Types.PkgconfigVersion rnf :: PkgconfigVersion -> () Source # | |
NFData PkgconfigVersionRange Source # | |
Defined in Distribution.Types.PkgconfigVersionRange rnf :: PkgconfigVersionRange -> () Source # | |
NFData SetupBuildInfo Source # | |
Defined in Distribution.Types.SetupBuildInfo rnf :: SetupBuildInfo -> () Source # | |
NFData KnownRepoType Source # | |
Defined in Distribution.Types.SourceRepo rnf :: KnownRepoType -> () Source # | |
NFData RepoKind Source # | |
Defined in Distribution.Types.SourceRepo | |
NFData RepoType Source # | |
Defined in Distribution.Types.SourceRepo | |
NFData SourceRepo Source # | |
Defined in Distribution.Types.SourceRepo rnf :: SourceRepo -> () Source # | |
NFData TestSuite Source # | |
Defined in Distribution.Types.TestSuite | |
NFData TestSuiteInterface Source # | |
Defined in Distribution.Types.TestSuiteInterface rnf :: TestSuiteInterface -> () Source # | |
NFData TestType Source # | |
Defined in Distribution.Types.TestType | |
NFData DefUnitId Source # | |
Defined in Distribution.Types.UnitId | |
NFData UnitId Source # | |
Defined in Distribution.Types.UnitId | |
NFData UnqualComponentName Source # | |
Defined in Distribution.Types.UnqualComponentName rnf :: UnqualComponentName -> () Source # | |
NFData Version Source # | |
Defined in Distribution.Types.Version | |
NFData VersionRange Source # | |
Defined in Distribution.Types.VersionRange.Internal rnf :: VersionRange -> () Source # | |
NFData ShortText Source # | |
Defined in Distribution.Utils.ShortText | |
NFData Extension Source # | |
Defined in Language.Haskell.Extension | |
NFData KnownExtension Source # | |
Defined in Language.Haskell.Extension rnf :: KnownExtension -> () Source # | |
NFData Language Source # | |
Defined in Language.Haskell.Extension | |
NFData ByteArray Source # | Since: deepseq-1.4.7.0 |
Defined in Control.DeepSeq | |
NFData ByteString Source # | |
Defined in Data.ByteString.Internal.Type rnf :: ByteString -> () Source # | |
NFData ByteString Source # | |
Defined in Data.ByteString.Lazy.Internal rnf :: ByteString -> () Source # | |
NFData ShortByteString Source # | |
Defined in Data.ByteString.Short.Internal rnf :: ShortByteString -> () Source # | |
NFData IntSet Source # | |
Defined in Data.IntSet.Internal | |
NFData Void Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
NFData ThreadId Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
NFData All Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
NFData Any Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
NFData TypeRep Source # | NOTE: Prior to Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
NFData Unique Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
NFData Version Source # | Since: deepseq-1.3.0.0 |
Defined in Control.DeepSeq | |
NFData Fingerprint Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq rnf :: Fingerprint -> () Source # | |
NFData CBool Source # | Since: deepseq-1.4.3.0 |
Defined in Control.DeepSeq | |
NFData CChar Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
NFData CClock Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
NFData CDouble Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
NFData CFile Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
NFData CFloat Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
NFData CFpos Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
NFData CInt Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
NFData CIntMax Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
NFData CIntPtr Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
NFData CJmpBuf Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
NFData CLLong Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
NFData CLong Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
NFData CPtrdiff Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
NFData CSChar Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
NFData CSUSeconds Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq rnf :: CSUSeconds -> () Source # | |
NFData CShort Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
NFData CSigAtomic Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq rnf :: CSigAtomic -> () Source # | |
NFData CSize Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
NFData CTime Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
NFData CUChar Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
NFData CUInt Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
NFData CUIntMax Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
NFData CUIntPtr Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
NFData CULLong Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
NFData CULong Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
NFData CUSeconds Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
NFData CUShort Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
NFData CWchar Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
NFData MaskingState Source # | Since: deepseq-1.4.4.0 |
Defined in Control.DeepSeq rnf :: MaskingState -> () Source # | |
NFData ExitCode Source # | Since: deepseq-1.4.2.0 |
Defined in Control.DeepSeq | |
NFData Int16 Source # | |
Defined in Control.DeepSeq | |
NFData Int32 Source # | |
Defined in Control.DeepSeq | |
NFData Int64 Source # | |
Defined in Control.DeepSeq | |
NFData Int8 Source # | |
Defined in Control.DeepSeq | |
NFData CallStack Source # | Since: deepseq-1.4.2.0 |
Defined in Control.DeepSeq | |
NFData SrcLoc Source # | Since: deepseq-1.4.2.0 |
Defined in Control.DeepSeq | |
NFData Word16 Source # | |
Defined in Control.DeepSeq | |
NFData Word32 Source # | |
Defined in Control.DeepSeq | |
NFData Word64 Source # | |
Defined in Control.DeepSeq | |
NFData Word8 Source # | |
Defined in Control.DeepSeq | |
NFData Module Source # | Since: deepseq-1.4.8.0 |
Defined in Control.DeepSeq | |
NFData Ordering Source # | |
Defined in Control.DeepSeq | |
NFData TyCon Source # | NOTE: Prior to Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
NFData OsChar # | |
Defined in System.OsString.Internal.Types | |
NFData OsString # | |
Defined in System.OsString.Internal.Types | |
NFData PosixChar # | |
Defined in System.OsString.Internal.Types | |
NFData PosixString # | |
Defined in System.OsString.Internal.Types rnf :: PosixString -> () Source # | |
NFData WindowsChar # | |
Defined in System.OsString.Internal.Types rnf :: WindowsChar -> () Source # | |
NFData WindowsString # | |
Defined in System.OsString.Internal.Types rnf :: WindowsString -> () Source # | |
NFData TextDetails Source # | |
Defined in Text.PrettyPrint.Annotated.HughesPJ rnf :: TextDetails -> () Source # | |
NFData Doc Source # | |
Defined in Text.PrettyPrint.HughesPJ | |
NFData UnicodeException Source # | |
Defined in Data.Text.Encoding.Error rnf :: UnicodeException -> () Source # | |
NFData CalendarDiffDays Source # | |
Defined in Data.Time.Calendar.CalendarDiffDays rnf :: CalendarDiffDays -> () Source # | |
NFData Day Source # | |
Defined in Data.Time.Calendar.Days | |
NFData Month Source # | |
Defined in Data.Time.Calendar.Month | |
NFData Quarter Source # | |
Defined in Data.Time.Calendar.Quarter | |
NFData QuarterOfYear Source # | |
Defined in Data.Time.Calendar.Quarter rnf :: QuarterOfYear -> () Source # | |
NFData DayOfWeek Source # | |
Defined in Data.Time.Calendar.Week | |
NFData DiffTime Source # | |
Defined in Data.Time.Clock.Internal.DiffTime | |
NFData NominalDiffTime Source # | |
Defined in Data.Time.Clock.Internal.NominalDiffTime rnf :: NominalDiffTime -> () Source # | |
NFData SystemTime Source # | |
Defined in Data.Time.Clock.Internal.SystemTime rnf :: SystemTime -> () Source # | |
NFData UTCTime Source # | |
Defined in Data.Time.Clock.Internal.UTCTime | |
NFData UniversalTime Source # | |
Defined in Data.Time.Clock.Internal.UniversalTime rnf :: UniversalTime -> () Source # | |
NFData CalendarDiffTime Source # | |
Defined in Data.Time.LocalTime.Internal.CalendarDiffTime rnf :: CalendarDiffTime -> () Source # | |
NFData LocalTime Source # | |
Defined in Data.Time.LocalTime.Internal.LocalTime | |
NFData TimeOfDay Source # | |
Defined in Data.Time.LocalTime.Internal.TimeOfDay | |
NFData TimeZone Source # | |
Defined in Data.Time.LocalTime.Internal.TimeZone | |
NFData ZonedTime Source # | |
Defined in Data.Time.LocalTime.Internal.ZonedTime | |
NFData Integer Source # | |
Defined in Control.DeepSeq | |
NFData Natural Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
NFData () Source # | |
Defined in Control.DeepSeq | |
NFData Bool Source # | |
Defined in Control.DeepSeq | |
NFData Char Source # | |
Defined in Control.DeepSeq | |
NFData Double Source # | |
Defined in Control.DeepSeq | |
NFData Float Source # | |
Defined in Control.DeepSeq | |
NFData Int Source # | |
Defined in Control.DeepSeq | |
NFData Word Source # | |
Defined in Control.DeepSeq | |
(NFData a, NFData (Key a)) => NFData (Graph a) Source # | |
Defined in Distribution.Compat.Graph | |
NFData a => NFData (NonEmptySet a) Source # | |
Defined in Distribution.Compat.NonEmptySet rnf :: NonEmptySet a -> () Source # | |
NFData a => NFData (PerCompilerFlavor a) Source # | |
Defined in Distribution.Compiler rnf :: PerCompilerFlavor a -> () Source # | |
NFData c => NFData (Condition c) Source # | |
Defined in Distribution.Types.Condition | |
NFData (MutableByteArray s) Source # | Since: deepseq-1.4.8.0 |
Defined in Control.DeepSeq rnf :: MutableByteArray s -> () Source # | |
NFData a => NFData (Complex a) Source # | |
Defined in Control.DeepSeq | |
NFData a => NFData (First a) Source # | Since: deepseq-1.4.2.0 |
Defined in Control.DeepSeq | |
NFData a => NFData (Last a) Source # | Since: deepseq-1.4.2.0 |
Defined in Control.DeepSeq | |
NFData a => NFData (Max a) Source # | Since: deepseq-1.4.2.0 |
Defined in Control.DeepSeq | |
NFData a => NFData (Min a) Source # | Since: deepseq-1.4.2.0 |
Defined in Control.DeepSeq | |
NFData m => NFData (WrappedMonoid m) Source # | Since: deepseq-1.4.2.0 |
Defined in Control.DeepSeq rnf :: WrappedMonoid m -> () Source # | |
NFData a => NFData (SCC a) Source # | |
Defined in Data.Graph | |
NFData a => NFData (IntMap a) Source # | |
Defined in Data.IntMap.Internal | |
NFData a => NFData (Digit a) Source # | |
Defined in Data.Sequence.Internal | |
NFData a => NFData (Elem a) Source # | |
Defined in Data.Sequence.Internal | |
NFData a => NFData (FingerTree a) Source # | |
Defined in Data.Sequence.Internal rnf :: FingerTree a -> () Source # | |
NFData a => NFData (Node a) Source # | |
Defined in Data.Sequence.Internal | |
NFData a => NFData (Seq a) Source # | |
Defined in Data.Sequence.Internal | |
NFData a => NFData (Set a) Source # | |
Defined in Data.Set.Internal | |
NFData a => NFData (Tree a) Source # | |
NFData a => NFData (NonEmpty a) Source # | Since: deepseq-1.4.2.0 |
Defined in Control.DeepSeq | |
NFData a => NFData (Identity a) Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
NFData a => NFData (First a) Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
NFData a => NFData (Last a) Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
NFData a => NFData (Down a) Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
NFData a => NFData (Dual a) Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
NFData a => NFData (Product a) Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
NFData a => NFData (Sum a) Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
NFData a => NFData (ZipList a) Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
NFData (IORef a) Source # | NOTE: Only strict in the reference and not the referenced value. Since: deepseq-1.4.2.0 |
Defined in Control.DeepSeq | |
NFData (MVar a) Source # | NOTE: Only strict in the reference and not the referenced value. Since: deepseq-1.4.2.0 |
Defined in Control.DeepSeq | |
NFData (FunPtr a) Source # | Since: deepseq-1.4.2.0 |
Defined in Control.DeepSeq | |
NFData (Ptr a) Source # | Since: deepseq-1.4.2.0 |
Defined in Control.DeepSeq | |
NFData a => NFData (Ratio a) Source # | |
Defined in Control.DeepSeq | |
NFData (StableName a) Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq rnf :: StableName a -> () Source # | |
NFData a => NFData (AnnotDetails a) Source # | |
Defined in Text.PrettyPrint.Annotated.HughesPJ rnf :: AnnotDetails a -> () Source # | |
NFData a => NFData (Doc a) Source # | |
Defined in Text.PrettyPrint.Annotated.HughesPJ | |
NFData a => NFData (Maybe a) Source # | |
Defined in Control.DeepSeq | |
NFData a => NFData (Solo a) Source # | Since: deepseq-1.4.6.0 |
Defined in Control.DeepSeq | |
NFData a => NFData [a] Source # | |
Defined in Control.DeepSeq | |
NFData (Fixed a) Source # | Since: deepseq-1.3.0.0 |
Defined in Control.DeepSeq | |
(NFData a, NFData b) => NFData (Arg a b) Source # | Since: deepseq-1.4.2.0 |
Defined in Control.DeepSeq | |
(NFData k, NFData a) => NFData (Map k a) Source # | |
Defined in Data.Map.Internal | |
(NFData a, NFData b) => NFData (Array a b) Source # | |
Defined in Control.DeepSeq | |
(NFData a, NFData b) => NFData (Either a b) Source # | |
Defined in Control.DeepSeq | |
NFData (Proxy a) Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
NFData (TypeRep a) Source # | Since: deepseq-1.4.8.0 |
Defined in Control.DeepSeq | |
NFData (STRef s a) Source # | NOTE: Only strict in the reference and not the referenced value. Since: deepseq-1.4.2.0 |
Defined in Control.DeepSeq | |
(NFData a, NFData b) => NFData (a, b) Source # | |
Defined in Control.DeepSeq | |
NFData (a -> b) Source # | This instance is for convenience and consistency with Since: deepseq-1.3.0.0 |
Defined in Control.DeepSeq | |
(NFData v, NFData c, NFData a) => NFData (CondBranch v c a) Source # | |
Defined in Distribution.Types.CondTree rnf :: CondBranch v c a -> () Source # | |
(NFData v, NFData c, NFData a) => NFData (CondTree v c a) Source # | |
Defined in Distribution.Types.CondTree | |
NFData (SymbolicPathX allowAbsolute from to) Source # | |
Defined in Distribution.Utils.Path rnf :: SymbolicPathX allowAbsolute from to -> () Source # | |
NFData a => NFData (Const a b) Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
NFData (a :~: b) Source # | Since: deepseq-1.4.3.0 |
Defined in Control.DeepSeq | |
(NFData a1, NFData a2, NFData a3) => NFData (a1, a2, a3) Source # | |
Defined in Control.DeepSeq | |
(NFData (f a), NFData (g a)) => NFData (Product f g a) Source # | Note: in Since: deepseq-1.4.3.0 |
Defined in Control.DeepSeq | |
(NFData (f a), NFData (g a)) => NFData (Sum f g a) Source # | Note: in Since: deepseq-1.4.3.0 |
Defined in Control.DeepSeq | |
NFData (a :~~: b) Source # | Since: deepseq-1.4.3.0 |
Defined in Control.DeepSeq | |
(NFData a1, NFData a2, NFData a3, NFData a4) => NFData (a1, a2, a3, a4) Source # | |
Defined in Control.DeepSeq | |
NFData (f (g a)) => NFData (Compose f g a) Source # | Note: in Since: deepseq-1.4.3.0 |
Defined in Control.DeepSeq | |
(NFData a1, NFData a2, NFData a3, NFData a4, NFData a5) => NFData (a1, a2, a3, a4, a5) Source # | |
Defined in Control.DeepSeq | |
(NFData a1, NFData a2, NFData a3, NFData a4, NFData a5, NFData a6) => NFData (a1, a2, a3, a4, a5, a6) Source # | |
Defined in Control.DeepSeq | |
(NFData a1, NFData a2, NFData a3, NFData a4, NFData a5, NFData a6, NFData a7) => NFData (a1, a2, a3, a4, a5, a6, a7) Source # | |
Defined in Control.DeepSeq | |
(NFData a1, NFData a2, NFData a3, NFData a4, NFData a5, NFData a6, NFData a7, NFData a8) => NFData (a1, a2, a3, a4, a5, a6, a7, a8) Source # | |
Defined in Control.DeepSeq | |
(NFData a1, NFData a2, NFData a3, NFData a4, NFData a5, NFData a6, NFData a7, NFData a8, NFData a9) => NFData (a1, a2, a3, a4, a5, a6, a7, a8, a9) Source # | |
Defined in Control.DeepSeq |
genericRnf :: (Generic a, GNFData (Rep a)) => a -> () Source #
GHC.Generics-based rnf
implementation
This is needed in order to support deepseq < 1.4
which didn't
have a Generic
-based default rnf
implementation yet.
In order to define instances, use e.g.
instance NFData MyType where rnf = genericRnf
The implementation has been taken from deepseq-1.4.2
's default
rnf
implementation.
The Binary
class provides put
and get
, methods to encode and
decode a Haskell value to a lazy ByteString
. It mirrors the Read
and
Show
classes for textual representation of Haskell types, and is
suitable for serialising Haskell values to disk, over the network.
For decoding and generating simple external binary formats (e.g. C
structures), Binary may be used, but in general is not suitable
for complex protocols. Instead use the Put
and Get
primitives
directly.
Instances of Binary should satisfy the following property:
decode . encode == id
That is, the get
and put
methods should be the inverse of each
other. A range of instances are provided for basic Haskell types.
Nothing
Encode a value in the Put monad.
Decode a value in the Get monad
putList :: [t] -> Put Source #
Encode a list of values in the Put monad. The default implementation may be overridden to be more efficient but must still have the same encoding format.
Instances
Binary OpenModule Source # | |
Defined in Distribution.Backpack put :: OpenModule -> Put Source # get :: Get OpenModule Source # putList :: [OpenModule] -> Put Source # | |
Binary OpenUnitId Source # | |
Defined in Distribution.Backpack put :: OpenUnitId -> Put Source # get :: Get OpenUnitId Source # putList :: [OpenUnitId] -> Put Source # | |
Binary CabalSpecVersion Source # | |
Defined in Distribution.CabalSpecVersion put :: CabalSpecVersion -> Put Source # get :: Get CabalSpecVersion Source # putList :: [CabalSpecVersion] -> Put Source # | |
Binary AbiTag Source # | |
Binary CompilerFlavor Source # | |
Defined in Distribution.Compiler put :: CompilerFlavor -> Put Source # get :: Get CompilerFlavor Source # putList :: [CompilerFlavor] -> Put Source # | |
Binary CompilerId Source # | |
Defined in Distribution.Compiler put :: CompilerId -> Put Source # get :: Get CompilerId Source # putList :: [CompilerId] -> Put Source # | |
Binary CompilerInfo Source # | |
Defined in Distribution.Compiler put :: CompilerInfo -> Put Source # get :: Get CompilerInfo Source # putList :: [CompilerInfo] -> Put Source # | |
Binary License Source # | |
Binary ModuleName Source # | |
Defined in Distribution.ModuleName put :: ModuleName -> Put Source # get :: Get ModuleName Source # putList :: [ModuleName] -> Put Source # | |
Binary PError Source # | |
Binary Position Source # | |
Binary PWarnType Source # | |
Binary PWarning Source # | |
Binary License Source # | |
Binary LicenseExceptionId Source # | |
Defined in Distribution.SPDX.LicenseExceptionId put :: LicenseExceptionId -> Put Source # get :: Get LicenseExceptionId Source # putList :: [LicenseExceptionId] -> Put Source # | |
Binary LicenseExpression Source # | |
Defined in Distribution.SPDX.LicenseExpression put :: LicenseExpression -> Put Source # get :: Get LicenseExpression Source # putList :: [LicenseExpression] -> Put Source # | |
Binary SimpleLicenseExpression Source # | |
Defined in Distribution.SPDX.LicenseExpression put :: SimpleLicenseExpression -> Put Source # get :: Get SimpleLicenseExpression Source # putList :: [SimpleLicenseExpression] -> Put Source # | |
Binary LicenseId Source # | |
Binary LicenseRef Source # | |
Defined in Distribution.SPDX.LicenseReference put :: LicenseRef -> Put Source # get :: Get LicenseRef Source # putList :: [LicenseRef] -> Put Source # | |
Binary Arch Source # | |
Binary OS Source # | |
Binary Platform Source # | |
Binary AbiDependency Source # | |
Defined in Distribution.Types.AbiDependency put :: AbiDependency -> Put Source # get :: Get AbiDependency Source # putList :: [AbiDependency] -> Put Source # | |
Binary AbiHash Source # | |
Binary Benchmark Source # | |
Binary BenchmarkInterface Source # | |
Defined in Distribution.Types.BenchmarkInterface put :: BenchmarkInterface -> Put Source # get :: Get BenchmarkInterface Source # putList :: [BenchmarkInterface] -> Put Source # | |
Binary BenchmarkType Source # | |
Defined in Distribution.Types.BenchmarkType put :: BenchmarkType -> Put Source # get :: Get BenchmarkType Source # putList :: [BenchmarkType] -> Put Source # | |
Binary BuildInfo Source # | |
Binary BuildType Source # | |
Binary Component Source # | |
Binary ComponentId Source # | |
Defined in Distribution.Types.ComponentId put :: ComponentId -> Put Source # get :: Get ComponentId Source # putList :: [ComponentId] -> Put Source # | |
Binary ComponentName Source # | |
Defined in Distribution.Types.ComponentName put :: ComponentName -> Put Source # get :: Get ComponentName Source # putList :: [ComponentName] -> Put Source # | |
Binary ComponentRequestedSpec Source # | |
Defined in Distribution.Types.ComponentRequestedSpec put :: ComponentRequestedSpec -> Put Source # get :: Get ComponentRequestedSpec Source # putList :: [ComponentRequestedSpec] -> Put Source # | |
Binary ConfVar Source # | |
Binary Dependency Source # | |
Defined in Distribution.Types.Dependency put :: Dependency -> Put Source # get :: Get Dependency Source # putList :: [Dependency] -> Put Source # | |
Binary ExeDependency Source # | |
Defined in Distribution.Types.ExeDependency put :: ExeDependency -> Put Source # get :: Get ExeDependency Source # putList :: [ExeDependency] -> Put Source # | |
Binary Executable Source # | |
Defined in Distribution.Types.Executable put :: Executable -> Put Source # get :: Get Executable Source # putList :: [Executable] -> Put Source # | |
Binary ExecutableScope Source # | |
Defined in Distribution.Types.ExecutableScope put :: ExecutableScope -> Put Source # get :: Get ExecutableScope Source # putList :: [ExecutableScope] -> Put Source # | |
Binary ExposedModule Source # | |
Defined in Distribution.Types.ExposedModule put :: ExposedModule -> Put Source # get :: Get ExposedModule Source # putList :: [ExposedModule] -> Put Source # | |
Binary FlagAssignment Source # | |
Defined in Distribution.Types.Flag put :: FlagAssignment -> Put Source # get :: Get FlagAssignment Source # putList :: [FlagAssignment] -> Put Source # | |
Binary FlagName Source # | |
Binary PackageFlag Source # | |
Defined in Distribution.Types.Flag put :: PackageFlag -> Put Source # get :: Get PackageFlag Source # putList :: [PackageFlag] -> Put Source # | |
Binary ForeignLib Source # | |
Defined in Distribution.Types.ForeignLib put :: ForeignLib -> Put Source # get :: Get ForeignLib Source # putList :: [ForeignLib] -> Put Source # | |
Binary LibVersionInfo Source # | |
Defined in Distribution.Types.ForeignLib put :: LibVersionInfo -> Put Source # get :: Get LibVersionInfo Source # putList :: [LibVersionInfo] -> Put Source # | |
Binary ForeignLibOption Source # | |
Defined in Distribution.Types.ForeignLibOption put :: ForeignLibOption -> Put Source # get :: Get ForeignLibOption Source # putList :: [ForeignLibOption] -> Put Source # | |
Binary ForeignLibType Source # | |
Defined in Distribution.Types.ForeignLibType put :: ForeignLibType -> Put Source # get :: Get ForeignLibType Source # putList :: [ForeignLibType] -> Put Source # | |
Binary GenericPackageDescription Source # | |
Defined in Distribution.Types.GenericPackageDescription | |
Binary IncludeRenaming Source # | |
Defined in Distribution.Types.IncludeRenaming put :: IncludeRenaming -> Put Source # get :: Get IncludeRenaming Source # putList :: [IncludeRenaming] -> Put Source # | |
Binary InstalledPackageInfo Source # | |
Defined in Distribution.Types.InstalledPackageInfo put :: InstalledPackageInfo -> Put Source # get :: Get InstalledPackageInfo Source # putList :: [InstalledPackageInfo] -> Put Source # | |
Binary LegacyExeDependency Source # | |
Defined in Distribution.Types.LegacyExeDependency put :: LegacyExeDependency -> Put Source # get :: Get LegacyExeDependency Source # putList :: [LegacyExeDependency] -> Put Source # | |
Binary Library Source # | |
Binary LibraryName Source # | |
Defined in Distribution.Types.LibraryName put :: LibraryName -> Put Source # get :: Get LibraryName Source # putList :: [LibraryName] -> Put Source # | |
Binary LibraryVisibility Source # | |
Defined in Distribution.Types.LibraryVisibility put :: LibraryVisibility -> Put Source # get :: Get LibraryVisibility Source # putList :: [LibraryVisibility] -> Put Source # | |
Binary Mixin Source # | |
Binary Module Source # | |
Binary ModuleReexport Source # | |
Defined in Distribution.Types.ModuleReexport put :: ModuleReexport -> Put Source # get :: Get ModuleReexport Source # putList :: [ModuleReexport] -> Put Source # | |
Binary ModuleRenaming Source # | |
Defined in Distribution.Types.ModuleRenaming put :: ModuleRenaming -> Put Source # get :: Get ModuleRenaming Source # putList :: [ModuleRenaming] -> Put Source # | |
Binary MungedPackageId Source # | |
Defined in Distribution.Types.MungedPackageId put :: MungedPackageId -> Put Source # get :: Get MungedPackageId Source # putList :: [MungedPackageId] -> Put Source # | |
Binary MungedPackageName Source # | |
Defined in Distribution.Types.MungedPackageName put :: MungedPackageName -> Put Source # get :: Get MungedPackageName Source # putList :: [MungedPackageName] -> Put Source # | |
Binary PackageDescription Source # | |
Defined in Distribution.Types.PackageDescription put :: PackageDescription -> Put Source # get :: Get PackageDescription Source # putList :: [PackageDescription] -> Put Source # | |
Binary PackageIdentifier Source # | |
Defined in Distribution.Types.PackageId put :: PackageIdentifier -> Put Source # get :: Get PackageIdentifier Source # putList :: [PackageIdentifier] -> Put Source # | |
Binary PackageName Source # | |
Defined in Distribution.Types.PackageName put :: PackageName -> Put Source # get :: Get PackageName Source # putList :: [PackageName] -> Put Source # | |
Binary PackageVersionConstraint Source # | |
Defined in Distribution.Types.PackageVersionConstraint put :: PackageVersionConstraint -> Put Source # get :: Get PackageVersionConstraint Source # putList :: [PackageVersionConstraint] -> Put Source # | |
Binary PkgconfigDependency Source # | |
Defined in Distribution.Types.PkgconfigDependency put :: PkgconfigDependency -> Put Source # get :: Get PkgconfigDependency Source # putList :: [PkgconfigDependency] -> Put Source # | |
Binary PkgconfigName Source # | |
Defined in Distribution.Types.PkgconfigName put :: PkgconfigName -> Put Source # get :: Get PkgconfigName Source # putList :: [PkgconfigName] -> Put Source # | |
Binary PkgconfigVersion Source # | |
Defined in Distribution.Types.PkgconfigVersion put :: PkgconfigVersion -> Put Source # get :: Get PkgconfigVersion Source # putList :: [PkgconfigVersion] -> Put Source # | |
Binary PkgconfigVersionRange Source # | |
Defined in Distribution.Types.PkgconfigVersionRange put :: PkgconfigVersionRange -> Put Source # get :: Get PkgconfigVersionRange Source # putList :: [PkgconfigVersionRange] -> Put Source # | |
Binary SetupBuildInfo Source # | |
Defined in Distribution.Types.SetupBuildInfo put :: SetupBuildInfo -> Put Source # get :: Get SetupBuildInfo Source # putList :: [SetupBuildInfo] -> Put Source # | |
Binary KnownRepoType Source # | |
Defined in Distribution.Types.SourceRepo put :: KnownRepoType -> Put Source # get :: Get KnownRepoType Source # putList :: [KnownRepoType] -> Put Source # | |
Binary RepoKind Source # | |
Binary RepoType Source # | |
Binary SourceRepo Source # | |
Defined in Distribution.Types.SourceRepo put :: SourceRepo -> Put Source # get :: Get SourceRepo Source # putList :: [SourceRepo] -> Put Source # | |
Binary TestSuite Source # | |
Binary TestSuiteInterface Source # | |
Defined in Distribution.Types.TestSuiteInterface put :: TestSuiteInterface -> Put Source # get :: Get TestSuiteInterface Source # putList :: [TestSuiteInterface] -> Put Source # | |
Binary TestType Source # | |
Binary DefUnitId Source # | |
Binary UnitId Source # | |
Binary UnqualComponentName Source # | |
Defined in Distribution.Types.UnqualComponentName put :: UnqualComponentName -> Put Source # get :: Get UnqualComponentName Source # putList :: [UnqualComponentName] -> Put Source # | |
Binary Version Source # | |
Binary VersionRange Source # | |
Defined in Distribution.Types.VersionRange.Internal put :: VersionRange -> Put Source # get :: Get VersionRange Source # putList :: [VersionRange] -> Put Source # | |
Binary ShortText Source # | |
Binary Extension Source # | |
Binary KnownExtension Source # | |
Defined in Language.Haskell.Extension put :: KnownExtension -> Put Source # get :: Get KnownExtension Source # putList :: [KnownExtension] -> Put Source # | |
Binary Language Source # | |
Binary ByteString Source # | |
Defined in Data.Binary.Class put :: ByteString -> Put Source # get :: Get ByteString Source # putList :: [ByteString] -> Put Source # | |
Binary ByteString Source # | |
Defined in Data.Binary.Class put :: ByteString -> Put Source # get :: Get ByteString Source # putList :: [ByteString] -> Put Source # | |
Binary ShortByteString Source # | |
Defined in Data.Binary.Class put :: ShortByteString -> Put Source # get :: Get ShortByteString Source # putList :: [ShortByteString] -> Put Source # | |
Binary IntSet Source # | |
Binary Void Source # | Since: binary-0.8.0.0 |
Binary All Source # | Since: binary-0.8.4.0 |
Binary Any Source # | Since: binary-0.8.4.0 |
Binary SomeTypeRep Source # | |
Defined in Data.Binary.Class put :: SomeTypeRep -> Put Source # get :: Get SomeTypeRep Source # putList :: [SomeTypeRep] -> Put Source # | |
Binary Version Source # | Since: binary-0.8.0.0 |
Binary Fingerprint Source # | Since: binary-0.7.6.0 |
Defined in Data.Binary.Class put :: Fingerprint -> Put Source # get :: Get Fingerprint Source # putList :: [Fingerprint] -> Put Source # | |
Binary Int16 Source # | |
Binary Int32 Source # | |
Binary Int64 Source # | |
Binary Int8 Source # | |
Binary Word16 Source # | |
Binary Word32 Source # | |
Binary Word64 Source # | |
Binary Word8 Source # | |
Binary KindRep Source # | Since: binary-0.8.5.0 |
Binary Ordering Source # | |
Binary TyCon Source # | Since: binary-0.8.5.0 |
Binary TypeLitSort Source # | Since: binary-0.8.5.0 |
Defined in Data.Binary.Class put :: TypeLitSort -> Put Source # get :: Get TypeLitSort Source # putList :: [TypeLitSort] -> Put Source # | |
Binary Integer Source # | |
Binary Natural Source # | Since: binary-0.7.3.0 |
Binary () Source # | |
Binary Bool Source # | |
Binary Char Source # | |
Binary Double Source # | Uses non-IEEE754 encoding. Does not round-trip NaN. |
Binary Float Source # | Uses non-IEEE754 encoding. Does not round-trip NaN. |
Binary Int Source # | |
Binary RuntimeRep Source # | Since: binary-0.8.5.0 |
Defined in Data.Binary.Class put :: RuntimeRep -> Put Source # get :: Get RuntimeRep Source # putList :: [RuntimeRep] -> Put Source # | |
Binary VecCount Source # | Since: binary-0.8.5.0 |
Binary VecElem Source # | Since: binary-0.8.5.0 |
Binary Word Source # | |
(IsNode a, Binary a, Show (Key a)) => Binary (Graph a) Source # | |
Binary a => Binary (NonEmptySet a) Source # | |
Defined in Distribution.Compat.NonEmptySet put :: NonEmptySet a -> Put Source # get :: Get (NonEmptySet a) Source # putList :: [NonEmptySet a] -> Put Source # | |
Binary a => Binary (Last' a) Source # | |
Binary a => Binary (Option' a) Source # | |
Binary a => Binary (PerCompilerFlavor a) Source # | |
Defined in Distribution.Compiler put :: PerCompilerFlavor a -> Put Source # get :: Get (PerCompilerFlavor a) Source # putList :: [PerCompilerFlavor a] -> Put Source # | |
Binary c => Binary (Condition c) Source # | |
Binary a => Binary (Complex a) Source # | |
Binary a => Binary (First a) Source # | Since: binary-0.8.4.0 |
Binary a => Binary (Last a) Source # | Since: binary-0.8.4.0 |
Binary a => Binary (Max a) Source # | Since: binary-0.8.4.0 |
Binary a => Binary (Min a) Source # | Since: binary-0.8.4.0 |
Binary m => Binary (WrappedMonoid m) Source # | Since: binary-0.8.4.0 |
Defined in Data.Binary.Class put :: WrappedMonoid m -> Put Source # get :: Get (WrappedMonoid m) Source # putList :: [WrappedMonoid m] -> Put Source # | |
Binary e => Binary (IntMap e) Source # | |
Binary e => Binary (Seq e) Source # | |
Binary a => Binary (Set a) Source # | |
Binary e => Binary (Tree e) Source # | |
Binary a => Binary (NonEmpty a) Source # | Since: binary-0.8.4.0 |
Binary a => Binary (Identity a) Source # | |
Binary a => Binary (First a) Source # | Since: binary-0.8.4.0 |
Binary a => Binary (Last a) Source # | Since: binary-0.8.4.0 |
Binary a => Binary (Dual a) Source # | Since: binary-0.8.4.0 |
Binary a => Binary (Product a) Source # | Since: binary-0.8.4.0 |
Binary a => Binary (Sum a) Source # | Since: binary-0.8.4.0 |
(Binary a, Integral a) => Binary (Ratio a) Source # | |
Binary a => Binary (Maybe a) Source # | |
Binary a => Binary [a] Source # | |
Structured a => Binary (Tag a) Source # | |
(Binary i, Ix i, Binary e, IArray UArray e) => Binary (UArray i e) Source # | |
Binary (Fixed a) Source # | Since: binary-0.8.0.0 |
(Binary a, Binary b) => Binary (Arg a b) Source # | Since: binary-0.8.4.0 |
(Binary k, Binary e) => Binary (Map k e) Source # | |
(Binary i, Ix i, Binary e) => Binary (Array i e) Source # | |
(Binary a, Binary b) => Binary (Either a b) Source # | |
Typeable a => Binary (TypeRep a) Source # | |
(Binary a, Binary b) => Binary (a, b) Source # | |
(Binary v, Binary c, Binary a) => Binary (CondBranch v c a) Source # | |
Defined in Distribution.Types.CondTree put :: CondBranch v c a -> Put Source # get :: Get (CondBranch v c a) Source # putList :: [CondBranch v c a] -> Put Source # | |
(Binary v, Binary c, Binary a) => Binary (CondTree v c a) Source # | |
Binary (SymbolicPathX allowAbsolute from to) Source # | |
Defined in Distribution.Utils.Path put :: SymbolicPathX allowAbsolute from to -> Put Source # get :: Get (SymbolicPathX allowAbsolute from to) Source # putList :: [SymbolicPathX allowAbsolute from to] -> Put Source # | |
Binary (f a) => Binary (Alt f a) Source # | Since: binary-0.8.4.0 |
(Binary a, Binary b, Binary c) => Binary (a, b, c) Source # | |
(Binary a, Binary b, Binary c, Binary d) => Binary (a, b, c, d) Source # | |
(Binary a, Binary b, Binary c, Binary d, Binary e) => Binary (a, b, c, d, e) Source # | |
(Binary a, Binary b, Binary c, Binary d, Binary e, Binary f) => Binary (a, b, c, d, e, f) Source # | |
(Binary a, Binary b, Binary c, Binary d, Binary e, Binary f, Binary g) => Binary (a, b, c, d, e, f, g) Source # | |
(Binary a, Binary b, Binary c, Binary d, Binary e, Binary f, Binary g, Binary h) => Binary (a, b, c, d, e, f, g, h) Source # | |
(Binary a, Binary b, Binary c, Binary d, Binary e, Binary f, Binary g, Binary h, Binary i) => Binary (a, b, c, d, e, f, g, h, i) Source # | |
(Binary a, Binary b, Binary c, Binary d, Binary e, Binary f, Binary g, Binary h, Binary i, Binary j) => Binary (a, b, c, d, e, f, g, h, i, j) Source # | |
class Typeable a => Structured a Source #
Class of types with a known Structure
.
For regular data types Structured
can be derived generically.
data Record = Record { a :: Int, b :: Bool, c :: [Char] } deriving (Generic
) instanceStructured
Record
Since: Cabal-syntax-3.2.0.0
Instances
Structured OpenModule Source # | |
Defined in Distribution.Backpack structure :: Proxy OpenModule -> Structure Source # structureHash' :: Tagged OpenModule MD5 | |
Structured OpenUnitId Source # | |
Defined in Distribution.Backpack structure :: Proxy OpenUnitId -> Structure Source # structureHash' :: Tagged OpenUnitId MD5 | |
Structured CabalSpecVersion Source # | |
Defined in Distribution.CabalSpecVersion structure :: Proxy CabalSpecVersion -> Structure Source # structureHash' :: Tagged CabalSpecVersion MD5 | |
Structured AbiTag Source # | |
Defined in Distribution.Compiler | |
Structured CompilerFlavor Source # | |
Defined in Distribution.Compiler structure :: Proxy CompilerFlavor -> Structure Source # structureHash' :: Tagged CompilerFlavor MD5 | |
Structured CompilerId Source # | |
Defined in Distribution.Compiler structure :: Proxy CompilerId -> Structure Source # structureHash' :: Tagged CompilerId MD5 | |
Structured License Source # | |
Defined in Distribution.License | |
Structured ModuleName Source # | |
Defined in Distribution.ModuleName structure :: Proxy ModuleName -> Structure Source # structureHash' :: Tagged ModuleName MD5 | |
Structured License Source # | |
Defined in Distribution.SPDX.License | |
Structured LicenseExceptionId Source # | |
Defined in Distribution.SPDX.LicenseExceptionId structure :: Proxy LicenseExceptionId -> Structure Source # structureHash' :: Tagged LicenseExceptionId MD5 | |
Structured LicenseExpression Source # | |
Defined in Distribution.SPDX.LicenseExpression structure :: Proxy LicenseExpression -> Structure Source # structureHash' :: Tagged LicenseExpression MD5 | |
Structured SimpleLicenseExpression Source # | |
Defined in Distribution.SPDX.LicenseExpression | |
Structured LicenseId Source # | |
Defined in Distribution.SPDX.LicenseId | |
Structured LicenseRef Source # | |
Defined in Distribution.SPDX.LicenseReference structure :: Proxy LicenseRef -> Structure Source # structureHash' :: Tagged LicenseRef MD5 | |
Structured Arch Source # | |
Defined in Distribution.System | |
Structured OS Source # | |
Defined in Distribution.System | |
Structured Platform Source # | |
Defined in Distribution.System | |
Structured AbiDependency Source # | |
Defined in Distribution.Types.AbiDependency structure :: Proxy AbiDependency -> Structure Source # structureHash' :: Tagged AbiDependency MD5 | |
Structured AbiHash Source # | |
Defined in Distribution.Types.AbiHash | |
Structured Benchmark Source # | |
Defined in Distribution.Types.Benchmark | |
Structured BenchmarkInterface Source # | |
Defined in Distribution.Types.BenchmarkInterface structure :: Proxy BenchmarkInterface -> Structure Source # structureHash' :: Tagged BenchmarkInterface MD5 | |
Structured BenchmarkType Source # | |
Defined in Distribution.Types.BenchmarkType structure :: Proxy BenchmarkType -> Structure Source # structureHash' :: Tagged BenchmarkType MD5 | |
Structured BuildInfo Source # | |
Defined in Distribution.Types.BuildInfo | |
Structured BuildType Source # | |
Defined in Distribution.Types.BuildType | |
Structured Component Source # | |
Defined in Distribution.Types.Component | |
Structured ComponentId Source # | |
Defined in Distribution.Types.ComponentId structure :: Proxy ComponentId -> Structure Source # structureHash' :: Tagged ComponentId MD5 | |
Structured ComponentName Source # | |
Defined in Distribution.Types.ComponentName structure :: Proxy ComponentName -> Structure Source # structureHash' :: Tagged ComponentName MD5 | |
Structured ComponentRequestedSpec Source # | |
Defined in Distribution.Types.ComponentRequestedSpec structure :: Proxy ComponentRequestedSpec -> Structure Source # structureHash' :: Tagged ComponentRequestedSpec MD5 | |
Structured ConfVar Source # | |
Defined in Distribution.Types.ConfVar | |
Structured Dependency Source # | |
Defined in Distribution.Types.Dependency structure :: Proxy Dependency -> Structure Source # structureHash' :: Tagged Dependency MD5 | |
Structured ExeDependency Source # | |
Defined in Distribution.Types.ExeDependency structure :: Proxy ExeDependency -> Structure Source # structureHash' :: Tagged ExeDependency MD5 | |
Structured Executable Source # | |
Defined in Distribution.Types.Executable structure :: Proxy Executable -> Structure Source # structureHash' :: Tagged Executable MD5 | |
Structured ExecutableScope Source # | |
Defined in Distribution.Types.ExecutableScope structure :: Proxy ExecutableScope -> Structure Source # structureHash' :: Tagged ExecutableScope MD5 | |
Structured ExposedModule Source # | |
Defined in Distribution.Types.ExposedModule structure :: Proxy ExposedModule -> Structure Source # structureHash' :: Tagged ExposedModule MD5 | |
Structured FlagAssignment Source # | |
Defined in Distribution.Types.Flag structure :: Proxy FlagAssignment -> Structure Source # structureHash' :: Tagged FlagAssignment MD5 | |
Structured FlagName Source # | |
Defined in Distribution.Types.Flag | |
Structured PackageFlag Source # | |
Defined in Distribution.Types.Flag structure :: Proxy PackageFlag -> Structure Source # structureHash' :: Tagged PackageFlag MD5 | |
Structured ForeignLib Source # | |
Defined in Distribution.Types.ForeignLib structure :: Proxy ForeignLib -> Structure Source # structureHash' :: Tagged ForeignLib MD5 | |
Structured LibVersionInfo Source # | |
Defined in Distribution.Types.ForeignLib structure :: Proxy LibVersionInfo -> Structure Source # structureHash' :: Tagged LibVersionInfo MD5 | |
Structured ForeignLibOption Source # | |
Defined in Distribution.Types.ForeignLibOption structure :: Proxy ForeignLibOption -> Structure Source # structureHash' :: Tagged ForeignLibOption MD5 | |
Structured ForeignLibType Source # | |
Defined in Distribution.Types.ForeignLibType structure :: Proxy ForeignLibType -> Structure Source # structureHash' :: Tagged ForeignLibType MD5 | |
Structured GenericPackageDescription Source # | |
Structured IncludeRenaming Source # | |
Defined in Distribution.Types.IncludeRenaming structure :: Proxy IncludeRenaming -> Structure Source # structureHash' :: Tagged IncludeRenaming MD5 | |
Structured InstalledPackageInfo Source # | |
Defined in Distribution.Types.InstalledPackageInfo structure :: Proxy InstalledPackageInfo -> Structure Source # structureHash' :: Tagged InstalledPackageInfo MD5 | |
Structured LegacyExeDependency Source # | |
Defined in Distribution.Types.LegacyExeDependency structure :: Proxy LegacyExeDependency -> Structure Source # structureHash' :: Tagged LegacyExeDependency MD5 | |
Structured Library Source # | |
Defined in Distribution.Types.Library | |
Structured LibraryName Source # | |
Defined in Distribution.Types.LibraryName structure :: Proxy LibraryName -> Structure Source # structureHash' :: Tagged LibraryName MD5 | |
Structured LibraryVisibility Source # | |
Defined in Distribution.Types.LibraryVisibility structure :: Proxy LibraryVisibility -> Structure Source # structureHash' :: Tagged LibraryVisibility MD5 | |
Structured Mixin Source # | |
Defined in Distribution.Types.Mixin | |
Structured Module Source # | |
Defined in Distribution.Types.Module | |
Structured ModuleReexport Source # | |
Defined in Distribution.Types.ModuleReexport structure :: Proxy ModuleReexport -> Structure Source # structureHash' :: Tagged ModuleReexport MD5 | |
Structured ModuleRenaming Source # | |
Defined in Distribution.Types.ModuleRenaming structure :: Proxy ModuleRenaming -> Structure Source # structureHash' :: Tagged ModuleRenaming MD5 | |
Structured MungedPackageId Source # | |
Defined in Distribution.Types.MungedPackageId structure :: Proxy MungedPackageId -> Structure Source # structureHash' :: Tagged MungedPackageId MD5 | |
Structured MungedPackageName Source # | |
Defined in Distribution.Types.MungedPackageName structure :: Proxy MungedPackageName -> Structure Source # structureHash' :: Tagged MungedPackageName MD5 | |
Structured PackageDescription Source # | |
Defined in Distribution.Types.PackageDescription structure :: Proxy PackageDescription -> Structure Source # structureHash' :: Tagged PackageDescription MD5 | |
Structured PackageIdentifier Source # | |
Defined in Distribution.Types.PackageId structure :: Proxy PackageIdentifier -> Structure Source # structureHash' :: Tagged PackageIdentifier MD5 | |
Structured PackageName Source # | |
Defined in Distribution.Types.PackageName structure :: Proxy PackageName -> Structure Source # structureHash' :: Tagged PackageName MD5 | |
Structured PackageVersionConstraint Source # | |
Defined in Distribution.Types.PackageVersionConstraint | |
Structured PkgconfigDependency Source # | |
Defined in Distribution.Types.PkgconfigDependency structure :: Proxy PkgconfigDependency -> Structure Source # structureHash' :: Tagged PkgconfigDependency MD5 | |
Structured PkgconfigName Source # | |
Defined in Distribution.Types.PkgconfigName structure :: Proxy PkgconfigName -> Structure Source # structureHash' :: Tagged PkgconfigName MD5 | |
Structured PkgconfigVersion Source # | |
Defined in Distribution.Types.PkgconfigVersion structure :: Proxy PkgconfigVersion -> Structure Source # structureHash' :: Tagged PkgconfigVersion MD5 | |
Structured PkgconfigVersionRange Source # | |
Defined in Distribution.Types.PkgconfigVersionRange structure :: Proxy PkgconfigVersionRange -> Structure Source # structureHash' :: Tagged PkgconfigVersionRange MD5 | |
Structured SetupBuildInfo Source # | |
Defined in Distribution.Types.SetupBuildInfo structure :: Proxy SetupBuildInfo -> Structure Source # structureHash' :: Tagged SetupBuildInfo MD5 | |
Structured KnownRepoType Source # | |
Defined in Distribution.Types.SourceRepo structure :: Proxy KnownRepoType -> Structure Source # structureHash' :: Tagged KnownRepoType MD5 | |
Structured RepoKind Source # | |
Defined in Distribution.Types.SourceRepo | |
Structured RepoType Source # | |
Defined in Distribution.Types.SourceRepo | |
Structured SourceRepo Source # | |
Defined in Distribution.Types.SourceRepo structure :: Proxy SourceRepo -> Structure Source # structureHash' :: Tagged SourceRepo MD5 | |
Structured TestSuite Source # | |
Defined in Distribution.Types.TestSuite | |
Structured TestSuiteInterface Source # | |
Defined in Distribution.Types.TestSuiteInterface structure :: Proxy TestSuiteInterface -> Structure Source # structureHash' :: Tagged TestSuiteInterface MD5 | |
Structured TestType Source # | |
Defined in Distribution.Types.TestType | |
Structured DefUnitId Source # | |
Defined in Distribution.Types.UnitId | |
Structured UnitId Source # | |
Defined in Distribution.Types.UnitId | |
Structured UnqualComponentName Source # | |
Defined in Distribution.Types.UnqualComponentName structure :: Proxy UnqualComponentName -> Structure Source # structureHash' :: Tagged UnqualComponentName MD5 | |
Structured Version Source # | |
Defined in Distribution.Types.Version | |
Structured VersionRange Source # | |
Defined in Distribution.Types.VersionRange.Internal structure :: Proxy VersionRange -> Structure Source # structureHash' :: Tagged VersionRange MD5 | |
Structured ShortText Source # | |
Defined in Distribution.Utils.ShortText | |
Structured Extension Source # | |
Defined in Language.Haskell.Extension | |
Structured KnownExtension Source # | |
Defined in Language.Haskell.Extension structure :: Proxy KnownExtension -> Structure Source # structureHash' :: Tagged KnownExtension MD5 | |
Structured Language Source # | |
Defined in Language.Haskell.Extension | |
Structured ByteString Source # | |
Defined in Distribution.Utils.Structured structure :: Proxy ByteString -> Structure Source # structureHash' :: Tagged ByteString MD5 | |
Structured ByteString Source # | |
Defined in Distribution.Utils.Structured structure :: Proxy ByteString -> Structure Source # structureHash' :: Tagged ByteString MD5 | |
Structured IntSet Source # | |
Defined in Distribution.Utils.Structured | |
Structured Int16 Source # | |
Defined in Distribution.Utils.Structured | |
Structured Int32 Source # | |
Defined in Distribution.Utils.Structured | |
Structured Int64 Source # | |
Defined in Distribution.Utils.Structured | |
Structured Int8 Source # | |
Defined in Distribution.Utils.Structured | |
Structured Word16 Source # | |
Defined in Distribution.Utils.Structured | |
Structured Word32 Source # | |
Defined in Distribution.Utils.Structured | |
Structured Word64 Source # | |
Defined in Distribution.Utils.Structured | |
Structured Word8 Source # | |
Defined in Distribution.Utils.Structured | |
Structured Ordering Source # | |
Defined in Distribution.Utils.Structured | |
Structured Text Source # | |
Defined in Distribution.Utils.Structured | |
Structured Text Source # | |
Defined in Distribution.Utils.Structured | |
Structured Day Source # | |
Defined in Distribution.Utils.Structured | |
Structured DiffTime Source # | |
Defined in Distribution.Utils.Structured | |
Structured NominalDiffTime Source # | |
Defined in Distribution.Utils.Structured structure :: Proxy NominalDiffTime -> Structure Source # structureHash' :: Tagged NominalDiffTime MD5 | |
Structured UTCTime Source # | |
Defined in Distribution.Utils.Structured | |
Structured UniversalTime Source # | |
Defined in Distribution.Utils.Structured structure :: Proxy UniversalTime -> Structure Source # structureHash' :: Tagged UniversalTime MD5 | |
Structured LocalTime Source # | |
Defined in Distribution.Utils.Structured | |
Structured TimeOfDay Source # | |
Defined in Distribution.Utils.Structured | |
Structured TimeZone Source # | |
Defined in Distribution.Utils.Structured | |
Structured Integer Source # | |
Defined in Distribution.Utils.Structured | |
Structured () Source # | |
Defined in Distribution.Utils.Structured | |
Structured Bool Source # | |
Defined in Distribution.Utils.Structured | |
Structured Char Source # | |
Defined in Distribution.Utils.Structured | |
Structured Double Source # | |
Defined in Distribution.Utils.Structured | |
Structured Float Source # | |
Defined in Distribution.Utils.Structured | |
Structured Int Source # | |
Defined in Distribution.Utils.Structured | |
Structured Word Source # | |
Defined in Distribution.Utils.Structured | |
Structured a => Structured (Graph a) Source # | |
Defined in Distribution.Compat.Graph | |
Structured a => Structured (NonEmptySet a) Source # | |
Defined in Distribution.Compat.NonEmptySet structure :: Proxy (NonEmptySet a) -> Structure Source # structureHash' :: Tagged (NonEmptySet a) MD5 | |
Structured a => Structured (Last' a) Source # | |
Defined in Distribution.Compat.Semigroup | |
Structured a => Structured (Option' a) Source # | |
Defined in Distribution.Compat.Semigroup | |
Structured a => Structured (PerCompilerFlavor a) Source # | |
Defined in Distribution.Compiler structure :: Proxy (PerCompilerFlavor a) -> Structure Source # structureHash' :: Tagged (PerCompilerFlavor a) MD5 | |
Structured c => Structured (Condition c) Source # | |
Defined in Distribution.Types.Condition | |
Structured v => Structured (IntMap v) Source # | |
Defined in Distribution.Utils.Structured | |
Structured v => Structured (Seq v) Source # | |
Defined in Distribution.Utils.Structured | |
Structured k => Structured (Set k) Source # | |
Defined in Distribution.Utils.Structured | |
Structured a => Structured (NonEmpty a) Source # | |
Defined in Distribution.Utils.Structured | |
Structured a => Structured (Ratio a) Source # | |
Defined in Distribution.Utils.Structured | |
Structured a => Structured (Maybe a) Source # | |
Defined in Distribution.Utils.Structured | |
Structured a => Structured [a] Source # | |
Defined in Distribution.Utils.Structured | |
(Structured k, Structured v) => Structured (Map k v) Source # | |
Defined in Distribution.Utils.Structured | |
(Structured a, Structured b) => Structured (Either a b) Source # | |
Defined in Distribution.Utils.Structured | |
(Structured a1, Structured a2) => Structured (a1, a2) Source # | |
Defined in Distribution.Utils.Structured | |
(Structured v, Structured c, Structured a) => Structured (CondBranch v c a) Source # | |
Defined in Distribution.Types.CondTree structure :: Proxy (CondBranch v c a) -> Structure Source # structureHash' :: Tagged (CondBranch v c a) MD5 | |
(Structured v, Structured c, Structured a) => Structured (CondTree v c a) Source # | |
Defined in Distribution.Types.CondTree | |
(Typeable allowAbsolute, Typeable from, Typeable to) => Structured (SymbolicPathX allowAbsolute from to) Source # | |
Defined in Distribution.Utils.Path structure :: Proxy (SymbolicPathX allowAbsolute from to) -> Structure Source # structureHash' :: Tagged (SymbolicPathX allowAbsolute from to) MD5 | |
(Structured a1, Structured a2, Structured a3) => Structured (a1, a2, a3) Source # | |
Defined in Distribution.Utils.Structured | |
(Structured a1, Structured a2, Structured a3, Structured a4) => Structured (a1, a2, a3, a4) Source # | |
Defined in Distribution.Utils.Structured | |
(Structured a1, Structured a2, Structured a3, Structured a4, Structured a5) => Structured (a1, a2, a3, a4, a5) Source # | |
Defined in Distribution.Utils.Structured | |
(Structured a1, Structured a2, Structured a3, Structured a4, Structured a5, Structured a6) => Structured (a1, a2, a3, a4, a5, a6) Source # | |
Defined in Distribution.Utils.Structured | |
(Structured a1, Structured a2, Structured a3, Structured a4, Structured a5, Structured a6, Structured a7) => Structured (a1, a2, a3, a4, a5, a6, a7) Source # | |
Defined in Distribution.Utils.Structured |
class Applicative f => Alternative (f :: Type -> Type) where #
Instances
Alternative ParsecParser Source # | |
Defined in Distribution.Parsec empty :: ParsecParser a # (<|>) :: ParsecParser a -> ParsecParser a -> ParsecParser a # some :: ParsecParser a -> ParsecParser [a] # many :: ParsecParser a -> ParsecParser [a] # | |
Alternative Condition Source # | |
Alternative Get Source # | Since: binary-0.7.0.0 |
Alternative Seq Source # | Since: containers-0.5.4 |
Alternative ZipList # | |
Alternative P # | |
Alternative ReadP # | |
Alternative ReadPrec # | |
Alternative IO # | |
Alternative Maybe # | |
Alternative [] # | |
MonadPlus m => Alternative (WrappedMonad m) Source # | Since: base-2.1 |
Defined in Control.Applicative empty :: WrappedMonad m a # (<|>) :: WrappedMonad m a -> WrappedMonad m a -> WrappedMonad m a # some :: WrappedMonad m a -> WrappedMonad m [a] # many :: WrappedMonad m a -> WrappedMonad m [a] # | |
ArrowPlus a => Alternative (ArrowMonad a) # | |
Defined in GHC.Internal.Control.Arrow empty :: ArrowMonad a a0 # (<|>) :: ArrowMonad a a0 -> ArrowMonad a a0 -> ArrowMonad a a0 # some :: ArrowMonad a a0 -> ArrowMonad a [a0] # many :: ArrowMonad a a0 -> ArrowMonad a [a0] # | |
Alternative (Proxy :: Type -> Type) # | |
Alternative (U1 :: Type -> Type) # | |
Alternative f => Alternative (Lift f) Source # | A combination is |
(Functor m, Monad m) => Alternative (MaybeT m) Source # | |
(ArrowZero a, ArrowPlus a) => Alternative (WrappedArrow a b) Source # | Since: base-2.1 |
Defined in Control.Applicative empty :: WrappedArrow a b a0 # (<|>) :: WrappedArrow a b a0 -> WrappedArrow a b a0 -> WrappedArrow a b a0 # some :: WrappedArrow a b a0 -> WrappedArrow a b [a0] # many :: WrappedArrow a b a0 -> WrappedArrow a b [a0] # | |
Alternative m => Alternative (Kleisli m a) # | |
Alternative f => Alternative (Ap f) # | |
Alternative f => Alternative (Alt f) # | |
(Generic1 f, Alternative (Rep1 f)) => Alternative (Generically1 f) # | |
Defined in GHC.Internal.Generics empty :: Generically1 f a # (<|>) :: Generically1 f a -> Generically1 f a -> Generically1 f a # some :: Generically1 f a -> Generically1 f [a] # many :: Generically1 f a -> Generically1 f [a] # | |
Alternative f => Alternative (Rec1 f) # | |
Alternative f => Alternative (Backwards f) Source # | Try alternatives in the same order as |
(Monoid w, Functor m, MonadPlus m) => Alternative (AccumT w m) Source # | |
(Functor m, Monad m, Monoid e) => Alternative (ExceptT e m) Source # | |
Alternative m => Alternative (IdentityT m) Source # | |
Alternative m => Alternative (ReaderT r m) Source # | |
(Functor m, MonadPlus m) => Alternative (SelectT r m) Source # | |
(Functor m, MonadPlus m) => Alternative (StateT s m) Source # | |
(Functor m, MonadPlus m) => Alternative (StateT s m) Source # | |
(Functor m, MonadPlus m) => Alternative (WriterT w m) Source # | |
(Monoid w, Alternative m) => Alternative (WriterT w m) Source # | |
(Monoid w, Alternative m) => Alternative (WriterT w m) Source # | |
Alternative f => Alternative (Reverse f) Source # | Derived instance. |
(Alternative f, Alternative g) => Alternative (Product f g) Source # | Since: base-4.9.0.0 |
(Alternative f, Alternative g) => Alternative (f :*: g) # | |
Alternative (ParsecT s u m) Source # | |
(Alternative f, Applicative g) => Alternative (Compose f g) Source # | Since: base-4.9.0.0 |
(Alternative f, Applicative g) => Alternative (f :.: g) # | |
Alternative f => Alternative (M1 i c f) # | |
(Functor m, MonadPlus m) => Alternative (RWST r w s m) Source # | |
(Monoid w, Functor m, MonadPlus m) => Alternative (RWST r w s m) Source # | |
(Monoid w, Functor m, MonadPlus m) => Alternative (RWST r w s m) Source # | |
class (Alternative m, Monad m) => MonadPlus (m :: Type -> Type) where #
Nothing
Instances
MonadPlus ParsecParser Source # | |
Defined in Distribution.Parsec mzero :: ParsecParser a # mplus :: ParsecParser a -> ParsecParser a -> ParsecParser a # | |
MonadPlus Condition Source # | |
MonadPlus Get Source # | Since: binary-0.7.1.0 |
MonadPlus Seq Source # | |
MonadPlus P # | |
Defined in GHC.Internal.Text.ParserCombinators.ReadP | |
MonadPlus ReadP # | |
MonadPlus ReadPrec # | |
MonadPlus IO # | |
MonadPlus Maybe # | |
MonadPlus [] # | |
Defined in GHC.Internal.Base | |
(ArrowApply a, ArrowPlus a) => MonadPlus (ArrowMonad a) # | |
Defined in GHC.Internal.Control.Arrow mzero :: ArrowMonad a a0 # mplus :: ArrowMonad a a0 -> ArrowMonad a a0 -> ArrowMonad a a0 # | |
MonadPlus (Proxy :: Type -> Type) # | |
MonadPlus (U1 :: Type -> Type) # | |
Monad m => MonadPlus (MaybeT m) Source # | |
MonadPlus m => MonadPlus (Kleisli m a) # | |
MonadPlus f => MonadPlus (Ap f) # | |
MonadPlus f => MonadPlus (Alt f) # | |
MonadPlus f => MonadPlus (Rec1 f) # | |
(Monoid w, Functor m, MonadPlus m) => MonadPlus (AccumT w m) Source # | |
(Monad m, Monoid e) => MonadPlus (ExceptT e m) Source # | |
MonadPlus m => MonadPlus (IdentityT m) Source # | |
MonadPlus m => MonadPlus (ReaderT r m) Source # | |
MonadPlus m => MonadPlus (SelectT r m) Source # | |
MonadPlus m => MonadPlus (StateT s m) Source # | |
MonadPlus m => MonadPlus (StateT s m) Source # | |
(Functor m, MonadPlus m) => MonadPlus (WriterT w m) Source # | |
(Monoid w, MonadPlus m) => MonadPlus (WriterT w m) Source # | |
(Monoid w, MonadPlus m) => MonadPlus (WriterT w m) Source # | |
MonadPlus m => MonadPlus (Reverse m) Source # | Derived instance. |
(MonadPlus f, MonadPlus g) => MonadPlus (Product f g) Source # | Since: base-4.9.0.0 |
(MonadPlus f, MonadPlus g) => MonadPlus (f :*: g) # | |
MonadPlus (ParsecT s u m) Source # | |
MonadPlus f => MonadPlus (M1 i c f) # | |
(Functor m, MonadPlus m) => MonadPlus (RWST r w s m) Source # | |
(Monoid w, MonadPlus m) => MonadPlus (RWST r w s m) Source # | |
(Monoid w, MonadPlus m) => MonadPlus (RWST r w s m) Source # | |
fromString :: String -> a #
Instances
IsString ModuleName Source # | Construct a This is just a convenience function intended for valid module strings. It is
an error if it is used with a string that is not a valid module name. If you
are parsing user input then use |
Defined in Distribution.ModuleName fromString :: String -> ModuleName # | |
IsString AbiHash Source # | Since: Cabal-syntax-2.0.0.2 |
Defined in Distribution.Types.AbiHash fromString :: String -> AbiHash # | |
IsString ComponentId Source # | Since: Cabal-syntax-2.0.0.2 |
Defined in Distribution.Types.ComponentId fromString :: String -> ComponentId # | |
IsString FlagName Source # | Since: Cabal-syntax-2.0.0.2 |
Defined in Distribution.Types.Flag fromString :: String -> FlagName # | |
IsString PackageName Source # | Since: Cabal-syntax-2.0.0.2 |
Defined in Distribution.Types.PackageName fromString :: String -> PackageName # | |
IsString PkgconfigName Source # | Since: Cabal-syntax-2.0.0.2 |
Defined in Distribution.Types.PkgconfigName fromString :: String -> PkgconfigName # | |
IsString UnitId Source # | Since: Cabal-syntax-2.0.0.2 |
Defined in Distribution.Types.UnitId fromString :: String -> UnitId # | |
IsString UnqualComponentName Source # | Since: Cabal-syntax-2.0.0.2 |
Defined in Distribution.Types.UnqualComponentName fromString :: String -> UnqualComponentName # | |
IsString ShortText Source # | |
Defined in Distribution.Utils.ShortText fromString :: String -> ShortText # | |
IsString ByteString Source # | Beware: |
Defined in Data.ByteString.Internal.Type fromString :: String -> ByteString # | |
IsString ByteString Source # | Beware: |
Defined in Data.ByteString.Lazy.Internal fromString :: String -> ByteString # | |
IsString ShortByteString Source # | Beware: |
Defined in Data.ByteString.Short.Internal fromString :: String -> ShortByteString # | |
IsString Doc Source # | |
Defined in Text.PrettyPrint.HughesPJ fromString :: String -> Doc # | |
IsString Builder Source # | Performs replacement on invalid scalar values:
|
Defined in Data.Text.Internal.Builder fromString :: String -> Builder # | |
a ~ Char => IsString (Seq a) Source # | Since: containers-0.5.7 |
Defined in Data.Sequence.Internal fromString :: String -> Seq a # | |
IsString a => IsString (Identity a) # | |
Defined in GHC.Internal.Data.String fromString :: String -> Identity a # | |
IsString (Doc a) Source # | |
Defined in Text.PrettyPrint.Annotated.HughesPJ fromString :: String -> Doc a # | |
a ~ Char => IsString [a] # | |
Defined in GHC.Internal.Data.String fromString :: String -> [a] # | |
IsString a => IsString (Const a b) # | |
Defined in GHC.Internal.Data.String fromString :: String -> Const a b # |
Some types
A Map from keys k
to values a
.
The Semigroup
operation for Map
is union
, which prefers
values from the left operand. If m1
maps a key k
to a value
a1
, and m2
maps the same key to a different value a2
, then
their union m1 <> m2
maps k
to a1
.
Instances
Bifoldable Map Source # | Since: containers-0.6.3.1 |
Eq2 Map Source # | Since: containers-0.5.9 |
Ord2 Map Source # | Since: containers-0.5.9 |
Defined in Data.Map.Internal | |
Show2 Map Source # | Since: containers-0.5.9 |
(Lift k, Lift a) => Lift (Map k a :: Type) | Since: containers-0.6.6 |
Eq k => Eq1 (Map k) Source # | Since: containers-0.5.9 |
Ord k => Ord1 (Map k) Source # | Since: containers-0.5.9 |
Defined in Data.Map.Internal | |
(Ord k, Read k) => Read1 (Map k) Source # | Since: containers-0.5.9 |
Defined in Data.Map.Internal liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (Map k a) Source # liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [Map k a] Source # liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (Map k a) Source # liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [Map k a] Source # | |
Show k => Show1 (Map k) Source # | Since: containers-0.5.9 |
Functor (Map k) Source # | |
Foldable (Map k) Source # | Folds in order of increasing key. |
Defined in Data.Map.Internal fold :: Monoid m => Map k m -> m # foldMap :: Monoid m => (a -> m) -> Map k a -> m # foldMap' :: Monoid m => (a -> m) -> Map k a -> m # foldr :: (a -> b -> b) -> b -> Map k a -> b # foldr' :: (a -> b -> b) -> b -> Map k a -> b # foldl :: (b -> a -> b) -> b -> Map k a -> b # foldl' :: (b -> a -> b) -> b -> Map k a -> b # foldr1 :: (a -> a -> a) -> Map k a -> a # foldl1 :: (a -> a -> a) -> Map k a -> a # elem :: Eq a => a -> Map k a -> Bool # maximum :: Ord a => Map k a -> a # minimum :: Ord a => Map k a -> a # | |
Traversable (Map k) Source # | Traverses in order of increasing key. |
(Structured k, Structured v) => Structured (Map k v) Source # | |
Defined in Distribution.Utils.Structured | |
(Binary k, Binary e) => Binary (Map k e) Source # | |
(NFData k, NFData a) => NFData (Map k a) Source # | |
Defined in Data.Map.Internal | |
Ord k => Monoid (Map k v) Source # | |
Ord k => Semigroup (Map k v) Source # | |
(Data k, Data a, Ord k) => Data (Map k a) Source # | |
Defined in Data.Map.Internal gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Map k a -> c (Map k a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Map k a) # toConstr :: Map k a -> Constr # dataTypeOf :: Map k a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Map k a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Map k a)) # gmapT :: (forall b. Data b => b -> b) -> Map k a -> Map k a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Map k a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Map k a -> r # gmapQ :: (forall d. Data d => d -> u) -> Map k a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Map k a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Map k a -> m (Map k a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Map k a -> m (Map k a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Map k a -> m (Map k a) # | |
Ord k => IsList (Map k v) Source # | Since: containers-0.5.6.2 |
(Ord k, Read k, Read e) => Read (Map k e) Source # | |
(Show k, Show a) => Show (Map k a) Source # | |
(Eq k, Eq a) => Eq (Map k a) Source # | |
(Ord k, Ord v) => Ord (Map k v) Source # | |
type Item (Map k v) Source # | |
Defined in Data.Map.Internal |
A set of values a
.
Instances
Eq1 Set Source # | Since: containers-0.5.9 |
Ord1 Set Source # | Since: containers-0.5.9 |
Defined in Data.Set.Internal | |
Show1 Set Source # | Since: containers-0.5.9 |
Foldable Set Source # | Folds in order of increasing key. |
Defined in Data.Set.Internal fold :: Monoid m => Set m -> m # foldMap :: Monoid m => (a -> m) -> Set a -> m # foldMap' :: Monoid m => (a -> m) -> Set a -> m # foldr :: (a -> b -> b) -> b -> Set a -> b # foldr' :: (a -> b -> b) -> b -> Set a -> b # foldl :: (b -> a -> b) -> b -> Set a -> b # foldl' :: (b -> a -> b) -> b -> Set a -> b # foldr1 :: (a -> a -> a) -> Set a -> a # foldl1 :: (a -> a -> a) -> Set a -> a # elem :: Eq a => a -> Set a -> Bool # maximum :: Ord a => Set a -> a # | |
Lift a => Lift (Set a :: Type) | Since: containers-0.6.6 |
Structured k => Structured (Set k) Source # | |
Defined in Distribution.Utils.Structured | |
Binary a => Binary (Set a) Source # | |
NFData a => NFData (Set a) Source # | |
Defined in Data.Set.Internal | |
Ord a => Monoid (Set a) Source # | |
Ord a => Semigroup (Set a) Source # | Since: containers-0.5.7 |
(Data a, Ord a) => Data (Set a) Source # | |
Defined in Data.Set.Internal gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Set a -> c (Set a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Set a) # dataTypeOf :: Set a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Set a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Set a)) # gmapT :: (forall b. Data b => b -> b) -> Set a -> Set a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Set a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Set a -> r # gmapQ :: (forall d. Data d => d -> u) -> Set a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Set a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Set a -> m (Set a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Set a -> m (Set a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Set a -> m (Set a) # | |
Ord a => IsList (Set a) Source # | Since: containers-0.5.6.2 |
(Read a, Ord a) => Read (Set a) Source # | |
Show a => Show (Set a) Source # | |
Eq a => Eq (Set a) Source # | |
Ord a => Ord (Set a) Source # | |
Newtype (Set a) (Set' sep wrapper a) Source # | |
type Item (Set a) Source # | |
Defined in Data.Set.Internal |
data NonEmptySet a Source #
Since: Cabal-syntax-3.4.0.0
Instances
Foldable NonEmptySet Source # | |
Defined in Distribution.Compat.NonEmptySet fold :: Monoid m => NonEmptySet m -> m # foldMap :: Monoid m => (a -> m) -> NonEmptySet a -> m # foldMap' :: Monoid m => (a -> m) -> NonEmptySet a -> m # foldr :: (a -> b -> b) -> b -> NonEmptySet a -> b # foldr' :: (a -> b -> b) -> b -> NonEmptySet a -> b # foldl :: (b -> a -> b) -> b -> NonEmptySet a -> b # foldl' :: (b -> a -> b) -> b -> NonEmptySet a -> b # foldr1 :: (a -> a -> a) -> NonEmptySet a -> a # foldl1 :: (a -> a -> a) -> NonEmptySet a -> a # toList :: NonEmptySet a -> [a] # null :: NonEmptySet a -> Bool # length :: NonEmptySet a -> Int # elem :: Eq a => a -> NonEmptySet a -> Bool # maximum :: Ord a => NonEmptySet a -> a # minimum :: Ord a => NonEmptySet a -> a # sum :: Num a => NonEmptySet a -> a # product :: Num a => NonEmptySet a -> a # | |
Structured a => Structured (NonEmptySet a) Source # | |
Defined in Distribution.Compat.NonEmptySet structure :: Proxy (NonEmptySet a) -> Structure Source # structureHash' :: Tagged (NonEmptySet a) MD5 | |
Binary a => Binary (NonEmptySet a) Source # | |
Defined in Distribution.Compat.NonEmptySet put :: NonEmptySet a -> Put Source # get :: Get (NonEmptySet a) Source # putList :: [NonEmptySet a] -> Put Source # | |
NFData a => NFData (NonEmptySet a) Source # | |
Defined in Distribution.Compat.NonEmptySet rnf :: NonEmptySet a -> () Source # | |
Ord a => Semigroup (NonEmptySet a) Source # | Note: there aren't |
Defined in Distribution.Compat.NonEmptySet (<>) :: NonEmptySet a -> NonEmptySet a -> NonEmptySet a # sconcat :: NonEmpty (NonEmptySet a) -> NonEmptySet a # stimes :: Integral b => b -> NonEmptySet a -> NonEmptySet a # | |
(Data a, Ord a) => Data (NonEmptySet a) Source # | |
Defined in Distribution.Compat.NonEmptySet gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NonEmptySet a -> c (NonEmptySet a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (NonEmptySet a) # toConstr :: NonEmptySet a -> Constr # dataTypeOf :: NonEmptySet a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (NonEmptySet a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (NonEmptySet a)) # gmapT :: (forall b. Data b => b -> b) -> NonEmptySet a -> NonEmptySet a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NonEmptySet a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NonEmptySet a -> r # gmapQ :: (forall d. Data d => d -> u) -> NonEmptySet a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> NonEmptySet a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> NonEmptySet a -> m (NonEmptySet a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NonEmptySet a -> m (NonEmptySet a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NonEmptySet a -> m (NonEmptySet a) # | |
(Read a, Ord a) => Read (NonEmptySet a) Source # | |
Defined in Distribution.Compat.NonEmptySet readsPrec :: Int -> ReadS (NonEmptySet a) # readList :: ReadS [NonEmptySet a] # readPrec :: ReadPrec (NonEmptySet a) # readListPrec :: ReadPrec [NonEmptySet a] # | |
Show a => Show (NonEmptySet a) Source # | |
Defined in Distribution.Compat.NonEmptySet showsPrec :: Int -> NonEmptySet a -> ShowS # show :: NonEmptySet a -> String # showList :: [NonEmptySet a] -> ShowS # | |
Eq a => Eq (NonEmptySet a) Source # | |
Defined in Distribution.Compat.NonEmptySet (==) :: NonEmptySet a -> NonEmptySet a -> Bool # (/=) :: NonEmptySet a -> NonEmptySet a -> Bool # | |
Ord a => Ord (NonEmptySet a) Source # | |
Defined in Distribution.Compat.NonEmptySet compare :: NonEmptySet a -> NonEmptySet a -> Ordering # (<) :: NonEmptySet a -> NonEmptySet a -> Bool # (<=) :: NonEmptySet a -> NonEmptySet a -> Bool # (>) :: NonEmptySet a -> NonEmptySet a -> Bool # (>=) :: NonEmptySet a -> NonEmptySet a -> Bool # max :: NonEmptySet a -> NonEmptySet a -> NonEmptySet a # min :: NonEmptySet a -> NonEmptySet a -> NonEmptySet a # |
Identity | |
|
Instances
Foldable1 Identity Source # | Since: base-4.18.0.0 | ||||
Defined in Data.Foldable1 fold1 :: Semigroup m => Identity m -> m Source # foldMap1 :: Semigroup m => (a -> m) -> Identity a -> m Source # foldMap1' :: Semigroup m => (a -> m) -> Identity a -> m Source # toNonEmpty :: Identity a -> NonEmpty a Source # maximum :: Ord a => Identity a -> a Source # minimum :: Ord a => Identity a -> a Source # head :: Identity a -> a Source # last :: Identity a -> a Source # foldrMap1 :: (a -> b) -> (a -> b -> b) -> Identity a -> b Source # foldlMap1' :: (a -> b) -> (b -> a -> b) -> Identity a -> b Source # foldlMap1 :: (a -> b) -> (b -> a -> b) -> Identity a -> b Source # foldrMap1' :: (a -> b) -> (a -> b -> b) -> Identity a -> b Source # | |||||
Eq1 Identity Source # | Since: base-4.9.0.0 | ||||
Ord1 Identity Source # | Since: base-4.9.0.0 | ||||
Defined in Data.Functor.Classes | |||||
Read1 Identity Source # | Since: base-4.9.0.0 | ||||
Defined in Data.Functor.Classes liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (Identity a) Source # liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [Identity a] Source # liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (Identity a) Source # liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [Identity a] Source # | |||||
Show1 Identity Source # | Since: base-4.9.0.0 | ||||
NFData1 Identity Source # | Since: deepseq-1.4.3.0 | ||||
Defined in Control.DeepSeq | |||||
Applicative Identity # | |||||
Functor Identity # | |||||
Monad Identity # | |||||
MonadFix Identity # | |||||
Defined in GHC.Internal.Data.Functor.Identity | |||||
Foldable Identity # | |||||
Defined in GHC.Internal.Data.Functor.Identity fold :: Monoid m => Identity m -> m # foldMap :: Monoid m => (a -> m) -> Identity a -> m # foldMap' :: Monoid m => (a -> m) -> Identity a -> m # foldr :: (a -> b -> b) -> b -> Identity a -> b # foldr' :: (a -> b -> b) -> b -> Identity a -> b # foldl :: (b -> a -> b) -> b -> Identity a -> b # foldl' :: (b -> a -> b) -> b -> Identity a -> b # foldr1 :: (a -> a -> a) -> Identity a -> a # foldl1 :: (a -> a -> a) -> Identity a -> a # elem :: Eq a => a -> Identity a -> Bool # maximum :: Ord a => Identity a -> a # minimum :: Ord a => Identity a -> a # | |||||
Traversable Identity # | |||||
Generic1 Identity # | |||||
Defined in GHC.Internal.Data.Functor.Identity
| |||||
Newtype a (Identity a) Source # | |||||
Monoid w => MonadAccum w (AccumT w Identity) Source # | Since: mtl-2.3 | ||||
MonadSelect r (SelectT r Identity) Source # | Since: mtl-2.3 | ||||
Parsec a => Parsec (Identity a) Source # | |||||
Defined in Distribution.Parsec parsec :: CabalParsing m => m (Identity a) Source # | |||||
Pretty a => Pretty (Identity a) Source # | |||||
Defined in Distribution.Pretty | |||||
Binary a => Binary (Identity a) Source # | |||||
NFData a => NFData (Identity a) Source # | Since: deepseq-1.4.0.0 | ||||
Defined in Control.DeepSeq | |||||
Monoid a => Monoid (Identity a) # | |||||
Semigroup a => Semigroup (Identity a) # | |||||
Bits a => Bits (Identity a) # | |||||
Defined in GHC.Internal.Data.Functor.Identity (.&.) :: Identity a -> Identity a -> Identity a # (.|.) :: Identity a -> Identity a -> Identity a # xor :: Identity a -> Identity a -> Identity a # complement :: Identity a -> Identity a # shift :: Identity a -> Int -> Identity a # rotate :: Identity a -> Int -> Identity a # setBit :: Identity a -> Int -> Identity a # clearBit :: Identity a -> Int -> Identity a # complementBit :: Identity a -> Int -> Identity a # testBit :: Identity a -> Int -> Bool # bitSizeMaybe :: Identity a -> Maybe Int # bitSize :: Identity a -> Int # isSigned :: Identity a -> Bool # shiftL :: Identity a -> Int -> Identity a # unsafeShiftL :: Identity a -> Int -> Identity a # shiftR :: Identity a -> Int -> Identity a # unsafeShiftR :: Identity a -> Int -> Identity a # rotateL :: Identity a -> Int -> Identity a # | |||||
FiniteBits a => FiniteBits (Identity a) # | |||||
Defined in GHC.Internal.Data.Functor.Identity finiteBitSize :: Identity a -> Int # countLeadingZeros :: Identity a -> Int # countTrailingZeros :: Identity a -> Int # | |||||
Data a => Data (Identity a) # | |||||
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Identity a -> c (Identity a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Identity a) # toConstr :: Identity a -> Constr # dataTypeOf :: Identity a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Identity a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Identity a)) # gmapT :: (forall b. Data b => b -> b) -> Identity a -> Identity a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Identity a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Identity a -> r # gmapQ :: (forall d. Data d => d -> u) -> Identity a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Identity a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Identity a -> m (Identity a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Identity a -> m (Identity a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Identity a -> m (Identity a) # | |||||
IsString a => IsString (Identity a) # | |||||
Defined in GHC.Internal.Data.String fromString :: String -> Identity a # | |||||
Bounded a => Bounded (Identity a) # | |||||
Enum a => Enum (Identity a) # | |||||
Defined in GHC.Internal.Data.Functor.Identity succ :: Identity a -> Identity a # pred :: Identity a -> Identity a # fromEnum :: Identity a -> Int # enumFrom :: Identity a -> [Identity a] # enumFromThen :: Identity a -> Identity a -> [Identity a] # enumFromTo :: Identity a -> Identity a -> [Identity a] # enumFromThenTo :: Identity a -> Identity a -> Identity a -> [Identity a] # | |||||
Floating a => Floating (Identity a) # | |||||
Defined in GHC.Internal.Data.Functor.Identity exp :: Identity a -> Identity a # log :: Identity a -> Identity a # sqrt :: Identity a -> Identity a # (**) :: Identity a -> Identity a -> Identity a # logBase :: Identity a -> Identity a -> Identity a # sin :: Identity a -> Identity a # cos :: Identity a -> Identity a # tan :: Identity a -> Identity a # asin :: Identity a -> Identity a # acos :: Identity a -> Identity a # atan :: Identity a -> Identity a # sinh :: Identity a -> Identity a # cosh :: Identity a -> Identity a # tanh :: Identity a -> Identity a # asinh :: Identity a -> Identity a # acosh :: Identity a -> Identity a # atanh :: Identity a -> Identity a # log1p :: Identity a -> Identity a # expm1 :: Identity a -> Identity a # | |||||
RealFloat a => RealFloat (Identity a) # | |||||
Defined in GHC.Internal.Data.Functor.Identity floatRadix :: Identity a -> Integer # floatDigits :: Identity a -> Int # floatRange :: Identity a -> (Int, Int) # decodeFloat :: Identity a -> (Integer, Int) # encodeFloat :: Integer -> Int -> Identity a # exponent :: Identity a -> Int # significand :: Identity a -> Identity a # scaleFloat :: Int -> Identity a -> Identity a # isInfinite :: Identity a -> Bool # isDenormalized :: Identity a -> Bool # isNegativeZero :: Identity a -> Bool # | |||||
Storable a => Storable (Identity a) # | |||||
Defined in GHC.Internal.Data.Functor.Identity | |||||
Generic (Identity a) # | |||||
Defined in GHC.Internal.Data.Functor.Identity
| |||||
Ix a => Ix (Identity a) # | |||||
Defined in GHC.Internal.Data.Functor.Identity range :: (Identity a, Identity a) -> [Identity a] # index :: (Identity a, Identity a) -> Identity a -> Int # unsafeIndex :: (Identity a, Identity a) -> Identity a -> Int # inRange :: (Identity a, Identity a) -> Identity a -> Bool # rangeSize :: (Identity a, Identity a) -> Int # unsafeRangeSize :: (Identity a, Identity a) -> Int # | |||||
Num a => Num (Identity a) # | |||||
Defined in GHC.Internal.Data.Functor.Identity | |||||
Read a => Read (Identity a) # | |||||
Fractional a => Fractional (Identity a) # | |||||
Integral a => Integral (Identity a) # | |||||
Defined in GHC.Internal.Data.Functor.Identity quot :: Identity a -> Identity a -> Identity a # rem :: Identity a -> Identity a -> Identity a # div :: Identity a -> Identity a -> Identity a # mod :: Identity a -> Identity a -> Identity a # quotRem :: Identity a -> Identity a -> (Identity a, Identity a) # divMod :: Identity a -> Identity a -> (Identity a, Identity a) # | |||||
Real a => Real (Identity a) # | |||||
Defined in GHC.Internal.Data.Functor.Identity toRational :: Identity a -> Rational # | |||||
RealFrac a => RealFrac (Identity a) # | |||||
Show a => Show (Identity a) # | |||||
Eq a => Eq (Identity a) # | |||||
Ord a => Ord (Identity a) # | |||||
Defined in GHC.Internal.Data.Functor.Identity | |||||
type Rep1 Identity # | |||||
Defined in GHC.Internal.Data.Functor.Identity | |||||
type Rep (Identity a) # | |||||
Defined in GHC.Internal.Data.Functor.Identity |
Instances
Generic1 (Proxy :: k -> Type) # | |
Defined in GHC.Internal.Generics | |
Eq1 (Proxy :: Type -> Type) Source # | Since: base-4.9.0.0 |
Ord1 (Proxy :: Type -> Type) Source # | Since: base-4.9.0.0 |
Defined in Data.Functor.Classes | |
Read1 (Proxy :: Type -> Type) Source # | Since: base-4.9.0.0 |
Defined in Data.Functor.Classes liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (Proxy a) Source # liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [Proxy a] Source # liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (Proxy a) Source # liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [Proxy a] Source # | |
Show1 (Proxy :: Type -> Type) Source # | Since: base-4.9.0.0 |
Contravariant (Proxy :: Type -> Type) Source # | |
NFData1 (Proxy :: Type -> Type) Source # | Since: deepseq-1.4.3.0 |
Defined in Control.DeepSeq | |
Alternative (Proxy :: Type -> Type) # | |
Applicative (Proxy :: Type -> Type) # | |
Functor (Proxy :: Type -> Type) # | |
Monad (Proxy :: Type -> Type) # | |
MonadPlus (Proxy :: Type -> Type) # | |
Foldable (Proxy :: Type -> Type) # | |
Defined in GHC.Internal.Data.Foldable fold :: Monoid m => Proxy m -> m # foldMap :: Monoid m => (a -> m) -> Proxy a -> m # foldMap' :: Monoid m => (a -> m) -> Proxy a -> m # foldr :: (a -> b -> b) -> b -> Proxy a -> b # foldr' :: (a -> b -> b) -> b -> Proxy a -> b # foldl :: (b -> a -> b) -> b -> Proxy a -> b # foldl' :: (b -> a -> b) -> b -> Proxy a -> b # foldr1 :: (a -> a -> a) -> Proxy a -> a # foldl1 :: (a -> a -> a) -> Proxy a -> a # elem :: Eq a => a -> Proxy a -> Bool # maximum :: Ord a => Proxy a -> a # minimum :: Ord a => Proxy a -> a # | |
Traversable (Proxy :: Type -> Type) # | |
NFData (Proxy a) Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
Monoid (Proxy s) # | |
Semigroup (Proxy s) # | |
Data t => Data (Proxy t) # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Proxy t -> c (Proxy t) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Proxy t) # toConstr :: Proxy t -> Constr # dataTypeOf :: Proxy t -> DataType # dataCast1 :: Typeable t0 => (forall d. Data d => c (t0 d)) -> Maybe (c (Proxy t)) # dataCast2 :: Typeable t0 => (forall d e. (Data d, Data e) => c (t0 d e)) -> Maybe (c (Proxy t)) # gmapT :: (forall b. Data b => b -> b) -> Proxy t -> Proxy t # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Proxy t -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Proxy t -> r # gmapQ :: (forall d. Data d => d -> u) -> Proxy t -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Proxy t -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Proxy t -> m (Proxy t) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Proxy t -> m (Proxy t) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Proxy t -> m (Proxy t) # | |
Bounded (Proxy t) # | |
Enum (Proxy s) # | |
Generic (Proxy t) # | |
Defined in GHC.Internal.Generics | |
Ix (Proxy s) # | |
Defined in GHC.Internal.Data.Proxy | |
Read (Proxy t) # | |
Show (Proxy s) # | |
Eq (Proxy s) # | |
Ord (Proxy s) # | |
type Rep1 (Proxy :: k -> Type) # | |
type Rep (Proxy t) # | |
Instances
Generic1 (Const a :: k -> Type) # | |||||
Defined in GHC.Internal.Data.Functor.Const
| |||||
Bifoldable (Const :: Type -> Type -> Type) Source # | Since: base-4.10.0.0 | ||||
Bifoldable1 (Const :: Type -> Type -> Type) Source # | |||||
Bifunctor (Const :: Type -> Type -> Type) Source # | Since: base-4.8.0.0 | ||||
Bitraversable (Const :: Type -> Type -> Type) Source # | Since: base-4.10.0.0 | ||||
Defined in Data.Bitraversable bitraverse :: Applicative f => (a -> f c) -> (b -> f d) -> Const a b -> f (Const c d) Source # | |||||
Eq2 (Const :: Type -> Type -> Type) Source # | Since: base-4.9.0.0 | ||||
Ord2 (Const :: Type -> Type -> Type) Source # | Since: base-4.9.0.0 | ||||
Defined in Data.Functor.Classes | |||||
Read2 (Const :: Type -> Type -> Type) Source # | Since: base-4.9.0.0 | ||||
Defined in Data.Functor.Classes liftReadsPrec2 :: (Int -> ReadS a) -> ReadS [a] -> (Int -> ReadS b) -> ReadS [b] -> Int -> ReadS (Const a b) Source # liftReadList2 :: (Int -> ReadS a) -> ReadS [a] -> (Int -> ReadS b) -> ReadS [b] -> ReadS [Const a b] Source # liftReadPrec2 :: ReadPrec a -> ReadPrec [a] -> ReadPrec b -> ReadPrec [b] -> ReadPrec (Const a b) Source # liftReadListPrec2 :: ReadPrec a -> ReadPrec [a] -> ReadPrec b -> ReadPrec [b] -> ReadPrec [Const a b] Source # | |||||
Show2 (Const :: Type -> Type -> Type) Source # | Since: base-4.9.0.0 | ||||
NFData2 (Const :: Type -> Type -> Type) Source # | Since: deepseq-1.4.3.0 | ||||
Defined in Control.DeepSeq | |||||
Eq a => Eq1 (Const a :: Type -> Type) Source # | Since: base-4.9.0.0 | ||||
Ord a => Ord1 (Const a :: Type -> Type) Source # | Since: base-4.9.0.0 | ||||
Defined in Data.Functor.Classes | |||||
Read a => Read1 (Const a :: Type -> Type) Source # | Since: base-4.9.0.0 | ||||
Defined in Data.Functor.Classes liftReadsPrec :: (Int -> ReadS a0) -> ReadS [a0] -> Int -> ReadS (Const a a0) Source # liftReadList :: (Int -> ReadS a0) -> ReadS [a0] -> ReadS [Const a a0] Source # liftReadPrec :: ReadPrec a0 -> ReadPrec [a0] -> ReadPrec (Const a a0) Source # liftReadListPrec :: ReadPrec a0 -> ReadPrec [a0] -> ReadPrec [Const a a0] Source # | |||||
Show a => Show1 (Const a :: Type -> Type) Source # | Since: base-4.9.0.0 | ||||
Contravariant (Const a :: Type -> Type) Source # | |||||
NFData a => NFData1 (Const a :: Type -> Type) Source # | Since: deepseq-1.4.3.0 | ||||
Defined in Control.DeepSeq | |||||
Monoid m => Applicative (Const m :: Type -> Type) # | |||||
Functor (Const m :: Type -> Type) # | |||||
Foldable (Const m :: Type -> Type) # | |||||
Defined in GHC.Internal.Data.Functor.Const fold :: Monoid m0 => Const m m0 -> m0 # foldMap :: Monoid m0 => (a -> m0) -> Const m a -> m0 # foldMap' :: Monoid m0 => (a -> m0) -> Const m a -> m0 # foldr :: (a -> b -> b) -> b -> Const m a -> b # foldr' :: (a -> b -> b) -> b -> Const m a -> b # foldl :: (b -> a -> b) -> b -> Const m a -> b # foldl' :: (b -> a -> b) -> b -> Const m a -> b # foldr1 :: (a -> a -> a) -> Const m a -> a # foldl1 :: (a -> a -> a) -> Const m a -> a # elem :: Eq a => a -> Const m a -> Bool # maximum :: Ord a => Const m a -> a # minimum :: Ord a => Const m a -> a # | |||||
Traversable (Const m :: Type -> Type) # | |||||
NFData a => NFData (Const a b) Source # | Since: deepseq-1.4.0.0 | ||||
Defined in Control.DeepSeq | |||||
Monoid a => Monoid (Const a b) # | |||||
Semigroup a => Semigroup (Const a b) # | |||||
Bits a => Bits (Const a b) # | |||||
Defined in GHC.Internal.Data.Functor.Const (.&.) :: Const a b -> Const a b -> Const a b # (.|.) :: Const a b -> Const a b -> Const a b # xor :: Const a b -> Const a b -> Const a b # complement :: Const a b -> Const a b # shift :: Const a b -> Int -> Const a b # rotate :: Const a b -> Int -> Const a b # setBit :: Const a b -> Int -> Const a b # clearBit :: Const a b -> Int -> Const a b # complementBit :: Const a b -> Int -> Const a b # testBit :: Const a b -> Int -> Bool # bitSizeMaybe :: Const a b -> Maybe Int # isSigned :: Const a b -> Bool # shiftL :: Const a b -> Int -> Const a b # unsafeShiftL :: Const a b -> Int -> Const a b # shiftR :: Const a b -> Int -> Const a b # unsafeShiftR :: Const a b -> Int -> Const a b # rotateL :: Const a b -> Int -> Const a b # | |||||
FiniteBits a => FiniteBits (Const a b) # | |||||
Defined in GHC.Internal.Data.Functor.Const finiteBitSize :: Const a b -> Int # countLeadingZeros :: Const a b -> Int # countTrailingZeros :: Const a b -> Int # | |||||
(Typeable k, Data a, Typeable b) => Data (Const a b) # | |||||
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> Const a b -> c (Const a b) # gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Const a b) # toConstr :: Const a b -> Constr # dataTypeOf :: Const a b -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Const a b)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Const a b)) # gmapT :: (forall b0. Data b0 => b0 -> b0) -> Const a b -> Const a b # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Const a b -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Const a b -> r # gmapQ :: (forall d. Data d => d -> u) -> Const a b -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Const a b -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Const a b -> m (Const a b) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Const a b -> m (Const a b) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Const a b -> m (Const a b) # | |||||
IsString a => IsString (Const a b) # | |||||
Defined in GHC.Internal.Data.String fromString :: String -> Const a b # | |||||
Bounded a => Bounded (Const a b) # | |||||
Enum a => Enum (Const a b) # | |||||
Defined in GHC.Internal.Data.Functor.Const succ :: Const a b -> Const a b # pred :: Const a b -> Const a b # fromEnum :: Const a b -> Int # enumFrom :: Const a b -> [Const a b] # enumFromThen :: Const a b -> Const a b -> [Const a b] # enumFromTo :: Const a b -> Const a b -> [Const a b] # enumFromThenTo :: Const a b -> Const a b -> Const a b -> [Const a b] # | |||||
Floating a => Floating (Const a b) # | |||||
Defined in GHC.Internal.Data.Functor.Const exp :: Const a b -> Const a b # log :: Const a b -> Const a b # sqrt :: Const a b -> Const a b # (**) :: Const a b -> Const a b -> Const a b # logBase :: Const a b -> Const a b -> Const a b # sin :: Const a b -> Const a b # cos :: Const a b -> Const a b # tan :: Const a b -> Const a b # asin :: Const a b -> Const a b # acos :: Const a b -> Const a b # atan :: Const a b -> Const a b # sinh :: Const a b -> Const a b # cosh :: Const a b -> Const a b # tanh :: Const a b -> Const a b # asinh :: Const a b -> Const a b # acosh :: Const a b -> Const a b # atanh :: Const a b -> Const a b # log1p :: Const a b -> Const a b # expm1 :: Const a b -> Const a b # | |||||
RealFloat a => RealFloat (Const a b) # | |||||
Defined in GHC.Internal.Data.Functor.Const floatRadix :: Const a b -> Integer # floatDigits :: Const a b -> Int # floatRange :: Const a b -> (Int, Int) # decodeFloat :: Const a b -> (Integer, Int) # encodeFloat :: Integer -> Int -> Const a b # exponent :: Const a b -> Int # significand :: Const a b -> Const a b # scaleFloat :: Int -> Const a b -> Const a b # isInfinite :: Const a b -> Bool # isDenormalized :: Const a b -> Bool # isNegativeZero :: Const a b -> Bool # | |||||
Storable a => Storable (Const a b) # | |||||
Defined in GHC.Internal.Data.Functor.Const | |||||
Generic (Const a b) # | |||||
Defined in GHC.Internal.Data.Functor.Const
| |||||
Ix a => Ix (Const a b) # | |||||
Defined in GHC.Internal.Data.Functor.Const range :: (Const a b, Const a b) -> [Const a b] # index :: (Const a b, Const a b) -> Const a b -> Int # unsafeIndex :: (Const a b, Const a b) -> Const a b -> Int # inRange :: (Const a b, Const a b) -> Const a b -> Bool # rangeSize :: (Const a b, Const a b) -> Int # unsafeRangeSize :: (Const a b, Const a b) -> Int # | |||||
Num a => Num (Const a b) # | |||||
Defined in GHC.Internal.Data.Functor.Const | |||||
Read a => Read (Const a b) # | |||||
Fractional a => Fractional (Const a b) # | |||||
Integral a => Integral (Const a b) # | |||||
Defined in GHC.Internal.Data.Functor.Const | |||||
Real a => Real (Const a b) # | |||||
Defined in GHC.Internal.Data.Functor.Const toRational :: Const a b -> Rational # | |||||
RealFrac a => RealFrac (Const a b) # | |||||
Show a => Show (Const a b) # | |||||
Eq a => Eq (Const a b) # | |||||
Ord a => Ord (Const a b) # | |||||
Defined in GHC.Internal.Data.Functor.Const | |||||
type Rep1 (Const a :: k -> Type) # | |||||
Defined in GHC.Internal.Data.Functor.Const | |||||
type Rep (Const a b) # | |||||
Defined in GHC.Internal.Data.Functor.Const |
Instances
Binary Void Source # | Since: binary-0.8.0.0 |
NFData Void Source # | Since: deepseq-1.4.0.0 |
Defined in Control.DeepSeq | |
Semigroup Void # | |
Data Void # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Void -> c Void # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Void # dataTypeOf :: Void -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Void) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Void) # gmapT :: (forall b. Data b => b -> b) -> Void -> Void # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Void -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Void -> r # gmapQ :: (forall d. Data d => d -> u) -> Void -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Void -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Void -> m Void # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Void -> m Void # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Void -> m Void # | |
Exception Void # | |
Defined in GHC.Internal.Exception.Type toException :: Void -> SomeException # fromException :: SomeException -> Maybe Void # displayException :: Void -> String # backtraceDesired :: Void -> Bool # | |
Generic Void # | |
Ix Void # | |
Read Void # | |
Show Void # | |
Eq Void # | |
Ord Void # | |
type Rep Void # | |
Data.Either
partitionEithers :: [Either a b] -> ([a], [b]) #
Data.Maybe
maybeToList :: Maybe a -> [a] #
listToMaybe :: [a] -> Maybe a #
Data.List
isPrefixOf :: Eq a => [a] -> [a] -> Bool #
isSuffixOf :: Eq a => [a] -> [a] -> Bool #
intercalate :: [a] -> [[a]] -> [a] #
intersperse :: a -> [a] -> [a] #
dropWhileEnd :: (a -> Bool) -> [a] -> [a] #
Data.List.NonEmpty
a :| [a] |
Instances
Foldable1 NonEmpty Source # | Since: base-4.18.0.0 | ||||
Defined in Data.Foldable1 fold1 :: Semigroup m => NonEmpty m -> m Source # foldMap1 :: Semigroup m => (a -> m) -> NonEmpty a -> m Source # foldMap1' :: Semigroup m => (a -> m) -> NonEmpty a -> m Source # toNonEmpty :: NonEmpty a -> NonEmpty a Source # maximum :: Ord a => NonEmpty a -> a Source # minimum :: Ord a => NonEmpty a -> a Source # head :: NonEmpty a -> a Source # last :: NonEmpty a -> a Source # foldrMap1 :: (a -> b) -> (a -> b -> b) -> NonEmpty a -> b Source # foldlMap1' :: (a -> b) -> (b -> a -> b) -> NonEmpty a -> b Source # foldlMap1 :: (a -> b) -> (b -> a -> b) -> NonEmpty a -> b Source # foldrMap1' :: (a -> b) -> (a -> b -> b) -> NonEmpty a -> b Source # | |||||
Eq1 NonEmpty Source # | Since: base-4.10.0.0 | ||||
Ord1 NonEmpty Source # | Since: base-4.10.0.0 | ||||
Defined in Data.Functor.Classes | |||||
Read1 NonEmpty Source # | Since: base-4.10.0.0 | ||||
Defined in Data.Functor.Classes liftReadsPrec :: (Int -> ReadS a) -> ReadS [a] -> Int -> ReadS (NonEmpty a) Source # liftReadList :: (Int -> ReadS a) -> ReadS [a] -> ReadS [NonEmpty a] Source # liftReadPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec (NonEmpty a) Source # liftReadListPrec :: ReadPrec a -> ReadPrec [a] -> ReadPrec [NonEmpty a] Source # | |||||
Show1 NonEmpty Source # | Since: base-4.10.0.0 | ||||
NFData1 NonEmpty Source # | Since: deepseq-1.4.3.0 | ||||
Defined in Control.DeepSeq | |||||
Applicative NonEmpty # | |||||
Functor NonEmpty # | |||||
Monad NonEmpty # | |||||
Foldable NonEmpty # | |||||
Defined in GHC.Internal.Data.Foldable fold :: Monoid m => NonEmpty m -> m # foldMap :: Monoid m => (a -> m) -> NonEmpty a -> m # foldMap' :: Monoid m => (a -> m) -> NonEmpty a -> m # foldr :: (a -> b -> b) -> b -> NonEmpty a -> b # foldr' :: (a -> b -> b) -> b -> NonEmpty a -> b # foldl :: (b -> a -> b) -> b -> NonEmpty a -> b # foldl' :: (b -> a -> b) -> b -> NonEmpty a -> b # foldr1 :: (a -> a -> a) -> NonEmpty a -> a # foldl1 :: (a -> a -> a) -> NonEmpty a -> a # elem :: Eq a => a -> NonEmpty a -> Bool # maximum :: Ord a => NonEmpty a -> a # minimum :: Ord a => NonEmpty a -> a # | |||||
Traversable NonEmpty # | |||||
Generic1 NonEmpty # | |||||
Defined in GHC.Internal.Generics
| |||||
Structured a => Structured (NonEmpty a) Source # | |||||
Defined in Distribution.Utils.Structured | |||||
Binary a => Binary (NonEmpty a) Source # | Since: binary-0.8.4.0 | ||||
NFData a => NFData (NonEmpty a) Source # | Since: deepseq-1.4.2.0 | ||||
Defined in Control.DeepSeq | |||||
Semigroup (NonEmpty a) # | |||||
Data a => Data (NonEmpty a) # | |||||
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NonEmpty a -> c (NonEmpty a) # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (NonEmpty a) # toConstr :: NonEmpty a -> Constr # dataTypeOf :: NonEmpty a -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (NonEmpty a)) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (NonEmpty a)) # gmapT :: (forall b. Data b => b -> b) -> NonEmpty a -> NonEmpty a # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NonEmpty a -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NonEmpty a -> r # gmapQ :: (forall d. Data d => d -> u) -> NonEmpty a -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> NonEmpty a -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> NonEmpty a -> m (NonEmpty a) # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NonEmpty a -> m (NonEmpty a) # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NonEmpty a -> m (NonEmpty a) # | |||||
Generic (NonEmpty a) # | |||||
Defined in GHC.Internal.Generics
| |||||
IsList (NonEmpty a) # | |||||
Read a => Read (NonEmpty a) # | |||||
Show a => Show (NonEmpty a) # | |||||
Eq a => Eq (NonEmpty a) # | |||||
Ord a => Ord (NonEmpty a) # | |||||
Newtype (NonEmpty a) (NonEmpty' sep wrapper a) Source # | |||||
type Rep1 NonEmpty # | |||||
Defined in GHC.Internal.Generics type Rep1 NonEmpty = D1 ('MetaData "NonEmpty" "GHC.Internal.Base" "ghc-internal" 'False) (C1 ('MetaCons ":|" ('InfixI 'RightAssociative 5) 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) Par1 :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec1 []))) | |||||
type Rep (NonEmpty a) # | |||||
Defined in GHC.Internal.Generics type Rep (NonEmpty a) = D1 ('MetaData "NonEmpty" "GHC.Internal.Base" "ghc-internal" 'False) (C1 ('MetaCons ":|" ('InfixI 'RightAssociative 5) 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [a]))) | |||||
type Item (NonEmpty a) # | |||||
Defined in GHC.Internal.IsList |
Data.Foldable
class Foldable (t :: Type -> Type) #
Instances
Foldable Graph Source # | |
Defined in Distribution.Compat.Graph fold :: Monoid m => Graph m -> m # foldMap :: Monoid m => (a -> m) -> Graph a -> m # foldMap' :: Monoid m => (a -> m) -> Graph a -> m # foldr :: (a -> b -> b) -> b -> Graph a -> b # foldr' :: (a -> b -> b) -> b -> Graph a -> b # foldl :: (b -> a -> b) -> b -> Graph a -> b # foldl' :: (b -> a -> b) -> b -> Graph a -> b # foldr1 :: (a -> a -> a) -> Graph a -> a # foldl1 :: (a -> a -> a) -> Graph a -> a # elem :: Eq a => a -> Graph a -> Bool # maximum :: Ord a => Graph a -> a # minimum :: Ord a => Graph a -> a # | |
Foldable NonEmptySet Source # | |
Defined in Distribution.Compat.NonEmptySet fold :: Monoid m => NonEmptySet m -> m # foldMap :: Monoid m => (a -> m) -> NonEmptySet a -> m # foldMap' :: Monoid m => (a -> m) -> NonEmptySet a -> m # foldr :: (a -> b -> b) -> b -> NonEmptySet a -> b # foldr' :: (a -> b -> b) -> b -> NonEmptySet a -> b # foldl :: (b -> a -> b) -> b -> NonEmptySet a -> b # foldl' :: (b -> a -> b) -> b -> NonEmptySet a -> b # foldr1 :: (a -> a -> a) -> NonEmptySet a -> a # foldl1 :: (a -> a -> a) -> NonEmptySet a -> a # toList :: NonEmptySet a -> [a] # null :: NonEmptySet a -> Bool # length :: NonEmptySet a -> Int # elem :: Eq a => a -> NonEmptySet a -> Bool # maximum :: Ord a => NonEmptySet a -> a # minimum :: Ord a => NonEmptySet a -> a # sum :: Num a => NonEmptySet a -> a # product :: Num a => NonEmptySet a -> a # | |
Foldable PerCompilerFlavor Source # | |
Defined in Distribution.Compiler fold :: Monoid m => PerCompilerFlavor m -> m # foldMap :: Monoid m => (a -> m) -> PerCompilerFlavor a -> m # foldMap' :: Monoid m => (a -> m) -> PerCompilerFlavor a -> m # foldr :: (a -> b -> b) -> b -> PerCompilerFlavor a -> b # foldr' :: (a -> b -> b) -> b -> PerCompilerFlavor a -> b # foldl :: (b -> a -> b) -> b -> PerCompilerFlavor a -> b # foldl' :: (b -> a -> b) -> b -> PerCompilerFlavor a -> b # foldr1 :: (a -> a -> a) -> PerCompilerFlavor a -> a # foldl1 :: (a -> a -> a) -> PerCompilerFlavor a -> a # toList :: PerCompilerFlavor a -> [a] # null :: PerCompilerFlavor a -> Bool # length :: PerCompilerFlavor a -> Int # elem :: Eq a => a -> PerCompilerFlavor a -> Bool # maximum :: Ord a => PerCompilerFlavor a -> a # minimum :: Ord a => PerCompilerFlavor a -> a # sum :: Num a => PerCompilerFlavor a -> a # product :: Num a => PerCompilerFlavor a -> a # | |
Foldable Field Source # | |
Defined in Distribution.Fields.Field fold :: Monoid m => Field m -> m # foldMap :: Monoid m => (a -> m) -> Field a -> m # foldMap' :: Monoid m => (a -> m) -> Field a -> m # foldr :: (a -> b -> b) -> b -> Field a -> b # foldr' :: (a -> b -> b) -> b -> Field a -> b # foldl :: (b -> a -> b) -> b -> Field a -> b # foldl' :: (b -> a -> b) -> b -> Field a -> b # foldr1 :: (a -> a -> a) -> Field a -> a # foldl1 :: (a -> a -> a) -> Field a -> a # elem :: Eq a => a -> Field a -> Bool # maximum :: Ord a => Field a -> a # minimum :: Ord a => Field a -> a # | |
Foldable FieldLine Source # | |
Defined in Distribution.Fields.Field fold :: Monoid m => FieldLine m -> m # foldMap :: Monoid m => (a -> m) -> FieldLine a -> m # foldMap' :: Monoid m => (a -> m) -> FieldLine a -> m # foldr :: (a -> b -> b) -> b -> FieldLine a -> b # foldr' :: (a -> b -> b) -> b -> FieldLine a -> b # foldl :: (b -> a -> b) -> b -> FieldLine a -> b # foldl' :: (b -> a -> b) -> b -> FieldLine a -> b # foldr1 :: (a -> a -> a) -> FieldLine a -> a # foldl1 :: (a -> a -> a) -> FieldLine a -> a # toList :: FieldLine a -> [a] # length :: FieldLine a -> Int # elem :: Eq a => a -> FieldLine a -> Bool # maximum :: Ord a => FieldLine a -> a # minimum :: Ord a => FieldLine a -> a # | |
Foldable Name Source # | |
Defined in Distribution.Fields.Field fold :: Monoid m => Name m -> m # foldMap :: Monoid m => (a -> m) -> Name a -> m # foldMap' :: Monoid m => (a -> m) -> Name a -> m # foldr :: (a -> b -> b) -> b -> Name a -> b # foldr' :: (a -> b -> b) -> b -> Name a -> b # foldl :: (b -> a -> b) -> b -> Name a -> b # foldl' :: (b -> a -> b) -> b -> Name a -> b # foldr1 :: (a -> a -> a) -> Name a -> a # foldl1 :: (a -> a -> a) -> Name a -> a # elem :: Eq a => a -> Name a -> Bool # maximum :: Ord a => Name a -> a # | |
Foldable SectionArg Source # | |
Defined in Distribution.Fields.Field fold :: Monoid m => SectionArg m -> m # foldMap :: Monoid m => (a -> m) -> SectionArg a -> m # foldMap' :: Monoid m => (a -> m) -> SectionArg a -> m # foldr :: (a -> b -> b) -> b -> SectionArg a -> b # foldr' :: (a -> b -> b) -> b -> SectionArg a -> b # foldl :: (b -> a -> b) -> b -> SectionArg a -> b # foldl' :: (b -> a -> b) -> b -> SectionArg a -> b # foldr1 :: (a -> a -> a) -> SectionArg a -> a # foldl1 :: (a -> a -> a) -> SectionArg a -> a # toList :: SectionArg a -> [a] # null :: SectionArg a -> Bool # length :: SectionArg a -> Int # elem :: Eq a => a -> SectionArg a -> Bool # maximum :: Ord a => SectionArg a -> a # minimum :: Ord a => SectionArg a -> a # sum :: Num a => SectionArg a -> a # product :: Num a => SectionArg a -> a # | |
Foldable PrettyField Source # | |
Defined in Distribution.Fields.Pretty fold :: Monoid m => PrettyField m -> m # foldMap :: Monoid m => (a -> m) -> PrettyField a -> m # foldMap' :: Monoid m => (a -> m) -> PrettyField a -> m # foldr :: (a -> b -> b) -> b -> PrettyField a -> b # foldr' :: (a -> b -> b) -> b -> PrettyField a -> b # foldl :: (b -> a -> b) -> b -> PrettyField a -> b # foldl' :: (b -> a -> b) -> b -> PrettyField a -> b # foldr1 :: (a -> a -> a) -> PrettyField a -> a # foldl1 :: (a -> a -> a) -> PrettyField a -> a # toList :: PrettyField a -> [a] # null :: PrettyField a -> Bool # length :: PrettyField a -> Int # elem :: Eq a => a -> PrettyField a -> Bool # maximum :: Ord a => PrettyField a -> a # minimum :: Ord a => PrettyField a -> a # sum :: Num a => PrettyField a -> a # product :: Num a => PrettyField a -> a # | |
Foldable Condition Source # | |
Defined in Distribution.Types.Condition fold :: Monoid m => Condition m -> m # foldMap :: Monoid m => (a -> m) -> Condition a -> m # foldMap' :: Monoid m => (a -> m) -> Condition a -> m # foldr :: (a -> b -> b) -> b -> Condition a -> b # foldr' :: (a -> b -> b) -> b -> Condition a -> b # foldl :: (b -> a -> b) -> b -> Condition a -> b # foldl' :: (b -> a -> b) -> b -> Condition a -> b # foldr1 :: (a -> a -> a) -> Condition a -> a # foldl1 :: (a -> a -> a) -> Condition a -> a # toList :: Condition a -> [a] # length :: Condition a -> Int # elem :: Eq a => a -> Condition a -> Bool # maximum :: Ord a => Condition a -> a # minimum :: Ord a => Condition a -> a # | |
Foldable VersionRangeF Source # | |
Defined in Distribution.Types.VersionRange.Internal fold :: Monoid m => VersionRangeF m -> m # foldMap :: Monoid m => (a -> m) -> VersionRangeF a -> m # foldMap' :: Monoid m => (a -> m) -> VersionRangeF a -> m # foldr :: (a -> b -> b) -> b -> VersionRangeF a -> b # foldr' :: (a -> b -> b) -> b -> VersionRangeF a -> b # foldl :: (b -> a -> b) -> b -> VersionRangeF a -> b # foldl' :: (b -> a -> b) -> b -> VersionRangeF a -> b # foldr1 :: (a -> a -> a) -> VersionRangeF a -> a # foldl1 :: (a -> a -> a) -> VersionRangeF a -> a # toList :: VersionRangeF a -> [a] # null :: VersionRangeF a -> Bool # length :: VersionRangeF a -> Int # elem :: Eq a => a -> VersionRangeF a -> Bool # maximum :: Ord a => VersionRangeF a -> a # minimum :: Ord a => VersionRangeF a -> a # sum :: Num a => VersionRangeF a -> a # product :: Num a => VersionRangeF a -> a # | |
Foldable Complex Source # | Since: base-4.9.0.0 |
Defined in Data.Complex fold :: Monoid m => Complex m -> m # foldMap :: Monoid m => (a -> m) -> Complex a -> m # foldMap' :: Monoid m => (a -> m) -> Complex a -> m # foldr :: (a -> b -> b) -> b -> Complex a -> b # foldr' :: (a -> b -> b) -> b -> Complex a -> b # foldl :: (b -> a -> b) -> b -> Complex a -> b # foldl' :: (b -> a -> b) -> b -> Complex a -> b # foldr1 :: (a -> a -> a) -> Complex a -> a # foldl1 :: (a -> a -> a) -> Complex a -> a # elem :: Eq a => a -> Complex a -> Bool # maximum :: Ord a => Complex a -> a # minimum :: Ord a => Complex a -> a # | |
Foldable First Source # | Since: base-4.9.0.0 |
Defined in Data.Semigroup fold :: Monoid m => First m -> m # foldMap :: Monoid m => (a -> m) -> First a -> m # foldMap' :: Monoid m => (a -> m) -> First a -> m # foldr :: (a -> b -> b) -> b -> First a -> b # foldr' :: (a -> b -> b) -> b -> First a -> b # foldl :: (b -> a -> b) -> b -> First a -> b # foldl' :: (b -> a -> b) -> b -> First a -> b # foldr1 :: (a -> a -> a) -> First a -> a # foldl1 :: (a -> a -> a) -> First a -> a # elem :: Eq a => a -> First a -> Bool # maximum :: Ord a => First a -> a # minimum :: Ord a => First a -> a # | |
Foldable Last Source # | Since: base-4.9.0.0 |
Defined in Data.Semigroup fold :: Monoid m => Last m -> m # foldMap :: Monoid m => (a -> m) -> Last a -> m # foldMap' :: Monoid m => (a -> m) -> Last a -> m # foldr :: (a -> b -> b) -> b -> Last a -> b # foldr' :: (a -> b -> b) -> b -> Last a -> b # foldl :: (b -> a -> b) -> b -> Last a -> b # foldl' :: (b -> a -> b) -> b -> Last a -> b # foldr1 :: (a -> a -> a) -> Last a -> a # foldl1 :: (a -> a -> a) -> Last a -> a # elem :: Eq a => a -> Last a -> Bool # maximum :: Ord a => Last a -> a # | |
Foldable Max Source # | Since: base-4.9.0.0 |
Defined in Data.Semigroup fold :: Monoid m => Max m -> m # foldMap :: Monoid m => (a -> m) -> Max a -> m # foldMap' :: Monoid m => (a -> m) -> Max a -> m # foldr :: (a -> b -> b) -> b -> Max a -> b # foldr' :: (a -> b -> b) -> b -> Max a -> b # foldl :: (b -> a -> b) -> b -> Max a -> b # foldl' :: (b -> a -> b) -> b -> Max a -> b # foldr1 :: (a -> a -> a) -> Max a -> a # foldl1 :: (a -> a -> a) -> Max a -> a # elem :: Eq a => a -> Max a -> Bool # maximum :: Ord a => Max a -> a # | |
Foldable Min Source # | Since: base-4.9.0.0 |
Defined in Data.Semigroup fold :: Monoid m => Min m -> m # foldMap :: Monoid m => (a -> m) -> Min a -> m # foldMap' :: Monoid m => (a -> m) -> Min a -> m # foldr :: (a -> b -> b) -> b -> Min a -> b # foldr' :: (a -> b -> b) -> b -> Min a -> b # foldl :: (b -> a -> b) -> b -> Min a -> b # foldl' :: (b -> a -> b) -> b -> Min a -> b # foldr1 :: (a -> a -> a) -> Min a -> a # foldl1 :: (a -> a -> a) -> Min a -> a # elem :: Eq a => a -> Min a -> Bool # maximum :: Ord a => Min a -> a # | |
Foldable SCC Source # | Since: containers-0.5.9 |
Defined in Data.Graph fold :: Monoid m => SCC m -> m # foldMap :: Monoid m => (a -> m) -> SCC a -> m # foldMap' :: Monoid m => (a -> m) -> SCC a -> m # foldr :: (a -> b -> b) -> b -> SCC a -> b # foldr' :: (a -> b -> b) -> b -> SCC a -> b # foldl :: (b -> a -> b) -> b -> SCC a -> b # foldl' :: (b -> a -> b) -> b -> SCC a -> b # foldr1 :: (a -> a -> a) -> SCC a -> a # foldl1 :: (a -> a -> a) -> SCC a -> a # elem :: Eq a => a -> SCC a -> Bool # maximum :: Ord a => SCC a -> a # | |
Foldable IntMap Source # | Folds in order of increasing key. |
Defined in Data.IntMap.Internal fold :: Monoid m => IntMap m -> m # foldMap :: Monoid m => (a -> m) -> IntMap a -> m # foldMap' :: Monoid m => (a -> m) -> IntMap a -> m # foldr :: (a -> b -> b) -> b -> IntMap a -> b # foldr' :: (a -> b -> b) -> b -> IntMap a -> b # foldl :: (b -> a -> b) -> b -> IntMap a -> b # foldl' :: (b -> a -> b) -> b -> IntMap a -> b # foldr1 :: (a -> a -> a) -> IntMap a -> a # foldl1 :: (a -> a -> a) -> IntMap a -> a # elem :: Eq a => a -> IntMap a -> Bool # maximum :: Ord a => IntMap a -> a # minimum :: Ord a => IntMap a -> a # | |
Foldable Digit Source # | |
Defined in Data.Sequence.Internal fold :: Monoid m => Digit m -> m # foldMap :: Monoid m => (a -> m) -> Digit a -> m # foldMap' :: Monoid m => (a -> m) -> Digit a -> m # foldr :: (a -> b -> b) -> b -> Digit a -> b # foldr' :: (a -> b -> b) -> b -> Digit a -> b # foldl :: (b -> a -> b) -> b -> Digit a -> b # foldl' :: (b -> a -> b) -> b -> Digit a -> b # foldr1 :: (a -> a -> a) -> Digit a -> a # foldl1 :: (a -> a -> a) -> Digit a -> a # elem :: Eq a => a -> Digit a -> Bool # maximum :: Ord a => Digit a -> a # minimum :: Ord a => Digit a -> a # | |
Foldable Elem Source # | |
Defined in Data.Sequence.Internal fold :: Monoid m => Elem m -> m # foldMap :: Monoid m => (a -> m) -> Elem a -> m # foldMap' :: Monoid m => (a -> m) -> Elem a -> m # foldr :: (a -> b -> b) -> b -> Elem a -> b # foldr' :: (a -> b -> b) -> b -> Elem a -> b # foldl :: (b -> a -> b) -> b -> Elem a -> b # foldl' :: (b -> a -> b) -> b -> Elem a -> b # foldr1 :: (a -> a -> a) -> Elem a -> a # foldl1 :: (a -> a -> a) -> Elem a -> a # elem :: Eq a => a -> Elem a -> Bool # maximum :: Ord a => Elem a -> a # | |
Foldable FingerTree Source # | |
Defined in Data.Sequence.Internal fold :: Monoid m => FingerTree m -> m # foldMap :: Monoid m => (a -> m) -> FingerTree a -> m # foldMap' :: Monoid m => (a -> m) -> FingerTree a -> m # foldr :: (a -> b -> b) -> b -> FingerTree a -> b # foldr' :: (a -> b -> b) -> b -> FingerTree a -> b # foldl :: (b -> a -> b) -> b -> FingerTree a -> b # foldl' :: (b -> a -> b) -> b -> FingerTree a -> b # foldr1 :: (a -> a -> a) -> FingerTree a -> a # foldl1 :: (a -> a -> a) -> FingerTree a -> a # toList :: FingerTree a -> [a] # null :: FingerTree a -> Bool # length :: FingerTree a -> Int # elem :: Eq a => a -> FingerTree a -> Bool # maximum :: Ord a => FingerTree a -> a # minimum :: Ord a => FingerTree a -> a # sum :: Num a => FingerTree a -> a # product :: Num a => FingerTree a -> a # | |
Foldable Node Source # | |
Defined in Data.Sequence.Internal fold :: Monoid m => Node m -> m # foldMap :: Monoid m => (a -> m) -> Node a -> m # foldMap' :: Monoid m => (a -> m) -> Node a -> m # foldr :: (a -> b -> b) -> b -> Node a -> b # foldr' :: (a -> b -> b) -> b -> Node a -> b # foldl :: (b -> a -> b) -> b -> Node a -> b # foldl' :: (b -> a -> b) -> b -> Node a -> b # foldr1 :: (a -> a -> a) -> Node a -> a # foldl1 :: (a -> a -> a) -> Node a -> a # elem :: Eq a => a -> Node a -> Bool # maximum :: Ord a => Node a -> a # | |
Foldable Seq Source # | |
Defined in Data.Sequence.Internal fold :: Monoid m => Seq m -> m # foldMap :: Monoid m => (a -> m) -> Seq a -> m # foldMap' :: Monoid m => (a -> m) -> Seq a -> m # foldr :: (a -> b -> b) -> b -> Seq a -> b # foldr' :: (a -> b -> b) -> b -> Seq a -> b # foldl :: (b -> a -> b) -> b -> Seq a -> b # foldl' :: (b -> a -> b) -> b -> Seq a -> b # foldr1 :: (a -> a -> a) -> Seq a -> a # foldl1 :: (a -> a -> a) -> Seq a -> a # elem :: Eq a => a -> Seq a -> Bool # maximum :: Ord a => Seq a -> a # | |
Foldable ViewL Source # | |
Defined in Data.Sequence.Internal fold :: Monoid m => ViewL m -> m # foldMap :: Monoid m => (a -> m) -> ViewL a -> m # foldMap' :: Monoid m => (a -> m) -> ViewL a -> m # foldr :: (a -> b -> b) -> b -> ViewL a -> b # foldr' :: (a -> b -> b) -> b -> ViewL a -> b # foldl :: (b -> a -> b) -> b -> ViewL a -> b # foldl' :: (b -> a -> b) -> b -> ViewL a -> b # foldr1 :: (a -> a -> a) -> ViewL a -> a # foldl1 :: (a -> a -> a) -> ViewL a -> a # elem :: Eq a => a -> ViewL a -> Bool # maximum :: Ord a => ViewL a -> a # minimum :: Ord a => ViewL a -> a # | |
Foldable ViewR Source # | |
Defined in Data.Sequence.Internal fold :: Monoid m => ViewR m -> m # foldMap :: Monoid m => (a -> m) -> ViewR a -> m # foldMap' :: Monoid m => (a -> m) -> ViewR a -> m # foldr :: (a -> b -> b) -> b -> ViewR a -> b # foldr' :: (a -> b -> b) -> b -> ViewR a -> b # foldl :: (b -> a -> b) -> b -> ViewR a -> b # foldl' :: (b -> a -> b) -> b -> ViewR a -> b # foldr1 :: (a -> a -> a) -> ViewR a -> a # foldl1 :: (a -> a -> a) -> ViewR a -> a # elem :: Eq a => a -> ViewR a -> Bool # maximum :: Ord a => ViewR a -> a # minimum :: Ord a => ViewR a -> a # | |
Foldable Set Source # | Folds in order of increasing key. |
Defined in Data.Set.Internal fold :: Monoid m => Set m -> m # foldMap :: Monoid m => (a -> m) -> Set a -> m # foldMap' :: Monoid m => (a -> m) -> Set a -> m # foldr :: (a -> b -> b) -> b -> Set a -> b # foldr' :: (a -> b -> b) -> b -> Set a -> b # foldl :: (b -> a -> b) -> b -> Set a -> b # foldl' :: (b -> a -> b) -> b -> Set a -> b # foldr1 :: (a -> a -> a) -> Set a -> a # foldl1 :: (a -> a -> a) -> Set a -> a # elem :: Eq a => a -> Set a -> Bool # maximum :: Ord a => Set a -> a # | |
Foldable Tree Source # | Folds in preorder |
Defined in Data.Tree fold :: Monoid m => Tree m -> m # foldMap :: Monoid m => (a -> m) -> Tree a -> m # foldMap' :: Monoid m => (a -> m) -> Tree a -> m # foldr :: (a -> b -> b) -> b -> Tree a -> b # foldr' :: (a -> b -> b) -> b -> Tree a -> b # foldl :: (b -> a -> b) -> b -> Tree a -> b # foldl' :: (b -> a -> b) -> b -> Tree a -> b # foldr1 :: (a -> a -> a) -> Tree a -> a # foldl1 :: (a -> a -> a) -> Tree a -> a # elem :: Eq a => a -> Tree a -> Bool # maximum :: Ord a => Tree a -> a # | |
Foldable NonEmpty # | |
Defined in GHC.Internal.Data.Foldable fold :: Monoid m => NonEmpty m -> m # foldMap :: Monoid m => (a -> m) -> NonEmpty a -> m # foldMap' :: Monoid m => (a -> m) -> NonEmpty a -> m # foldr :: (a -> b -> b) -> b -> NonEmpty a -> b # foldr' :: (a -> b -> b) -> b -> NonEmpty a -> b # foldl :: (b -> a -> b) -> b -> NonEmpty a -> b # foldl' :: (b -> a -> b) -> b -> NonEmpty a -> b # foldr1 :: (a -> a -> a) -> NonEmpty a -> a # foldl1 :: (a -> a -> a) -> NonEmpty a -> a # elem :: Eq a => a -> NonEmpty a -> Bool # maximum :: Ord a => NonEmpty a -> a # minimum :: Ord a => NonEmpty a -> a # | |
Foldable Identity # | |
Defined in GHC.Internal.Data.Functor.Identity fold :: Monoid m => Identity m -> m # foldMap :: Monoid m => (a -> m) -> Identity a -> m # foldMap' :: Monoid m => (a -> m) -> Identity a -> m # foldr :: (a -> b -> b) -> b -> Identity a -> b # foldr' :: (a -> b -> b) -> b -> Identity a -> b # foldl :: (b -> a -> b) -> b -> Identity a -> b # foldl' :: (b -> a -> b) -> b -> Identity a -> b # foldr1 :: (a -> a -> a) -> Identity a -> a # foldl1 :: (a -> a -> a) -> Identity a -> a # elem :: Eq a => a -> Identity a -> Bool # maximum :: Ord a => Identity a -> a # minimum :: Ord a => Identity a -> a # | |
Foldable First # | |
Defined in GHC.Internal.Data.Foldable fold :: Monoid m => First m -> m # foldMap :: Monoid m => (a -> m) -> First a -> m # foldMap' :: Monoid m => (a -> m) -> First a -> m # foldr :: (a -> b -> b) -> b -> First a -> b # foldr' :: (a -> b -> b) -> b -> First a -> b # foldl :: (b -> a -> b) -> b -> First a -> b # foldl' :: (b -> a -> b) -> b -> First a -> b # foldr1 :: (a -> a -> a) -> First a -> a # foldl1 :: (a -> a -> a) -> First a -> a # elem :: Eq a => a -> First a -> Bool # maximum :: Ord a => First a -> a # minimum :: Ord a => First a -> a # | |
Foldable Last # | |
Defined in GHC.Internal.Data.Foldable fold :: Monoid m => Last m -> m # foldMap :: Monoid m => (a -> m) -> Last a -> m # foldMap' :: Monoid m => (a -> m) -> Last a -> m # foldr :: (a -> b -> b) -> b -> Last a -> b # foldr' :: (a -> b -> b) -> b -> Last a -> b # foldl :: (b -> a -> b) -> b -> Last a -> b # foldl' :: (b -> a -> b) -> b -> Last a -> b # foldr1 :: (a -> a -> a) -> Last a -> a # foldl1 :: (a -> a -> a) -> Last a -> a # elem :: Eq a => a -> Last a -> Bool # maximum :: Ord a => Last a -> a # | |
Foldable Down # | |
Defined in GHC.Internal.Data.Foldable fold :: Monoid m => Down m -> m # foldMap :: Monoid m => (a -> m) -> Down a -> m # foldMap' :: Monoid m => (a -> m) -> Down a -> m # foldr :: (a -> b -> b) -> b -> Down a -> b # foldr' :: (a -> b -> b) -> b -> Down a -> b # foldl :: (b -> a -> b) -> b -> Down a -> b # foldl' :: (b -> a -> b) -> b -> Down a -> b # foldr1 :: (a -> a -> a) -> Down a -> a # foldl1 :: (a -> a -> a) -> Down a -> a # elem :: Eq a => a -> Down a -> Bool # maximum :: Ord a => Down a -> a # | |
Foldable Dual # | |
Defined in GHC.Internal.Data.Foldable fold :: Monoid m => Dual m -> m # foldMap :: Monoid m => (a -> m) -> Dual a -> m # foldMap' :: Monoid m => (a -> m) -> Dual a -> m # foldr :: (a -> b -> b) -> b -> Dual a -> b # foldr' :: (a -> b -> b) -> b -> Dual a -> b # foldl :: (b -> a -> b) -> b -> Dual a -> b # foldl' :: (b -> a -> b) -> b -> Dual a -> b # foldr1 :: (a -> a -> a) -> Dual a -> a # foldl1 :: (a -> a -> a) -> Dual a -> a # elem :: Eq a => a -> Dual a -> Bool # maximum :: Ord a => Dual a -> a # | |
Foldable Product # | |
Defined in GHC.Internal.Data.Foldable fold :: Monoid m => Product m -> m # foldMap :: Monoid m => (a -> m) -> Product a -> m # foldMap' :: Monoid m => (a -> m) -> Product a -> m # foldr :: (a -> b -> b) -> b -> Product a -> b # foldr' :: (a -> b -> b) -> b -> Product a -> b # foldl :: (b -> a -> b) -> b -> Product a -> b # foldl' :: (b -> a -> b) -> b -> Product a -> b # foldr1 :: (a -> a -> a) -> Product a -> a # foldl1 :: (a -> a -> a) -> Product a -> a # elem :: Eq a => a -> Product a -> Bool # maximum :: Ord a => Product a -> a # minimum :: Ord a => Product a -> a # | |
Foldable Sum # | |
Defined in GHC.Internal.Data.Foldable fold :: Monoid m => Sum m -> m # foldMap :: Monoid m => (a -> m) -> Sum a -> m # foldMap' :: Monoid m => (a -> m) -> Sum a -> m # foldr :: (a -> b -> b) -> b -> Sum a -> b # foldr' :: (a -> b -> b) -> b -> Sum a -> b # foldl :: (b -> a -> b) -> b -> Sum a -> b # foldl' :: (b -> a -> b) -> b -> Sum a -> b # foldr1 :: (a -> a -> a) -> Sum a -> a # foldl1 :: (a -> a -> a) -> Sum a -> a # elem :: Eq a => a -> Sum a -> Bool # maximum :: Ord a => Sum a -> a # | |
Foldable ZipList # | |
Defined in GHC.Internal.Functor.ZipList fold :: Monoid m => ZipList m -> m # foldMap :: Monoid m => (a -> m) -> ZipList a -> m # foldMap' :: Monoid m => (a -> m) -> ZipList a -> m # foldr :: (a -> b -> b) -> b -> ZipList a -> b # foldr' :: (a -> b -> b) -> b -> ZipList a -> b # foldl :: (b -> a -> b) -> b -> ZipList a -> b # foldl' :: (b -> a -> b) -> b -> ZipList a -> b # foldr1 :: (a -> a -> a) -> ZipList a -> a # foldl1 :: (a -> a -> a) -> ZipList a -> a # elem :: Eq a => a -> ZipList a -> Bool # maximum :: Ord a => ZipList a -> a # minimum :: Ord a => ZipList a -> a # | |
Foldable Par1 # | |
Defined in GHC.Internal.Data.Foldable fold :: Monoid m => Par1 m -> m # foldMap :: Monoid m => (a -> m) -> Par1 a -> m # foldMap' :: Monoid m => (a -> m) -> Par1 a -> m # foldr :: (a -> b -> b) -> b -> Par1 a -> b # foldr' :: (a -> b -> b) -> b -> Par1 a -> b # foldl :: (b -> a -> b) -> b -> Par1 a -> b # foldl' :: (b -> a -> b) -> b -> Par1 a -> b # foldr1 :: (a -> a -> a) -> Par1 a -> a # foldl1 :: (a -> a -> a) -> Par1 a -> a # elem :: Eq a => a -> Par1 a -> Bool # maximum :: Ord a => Par1 a -> a # | |
Foldable TyVarBndr # | |
Defined in GHC.Internal.TH.Syntax fold :: Monoid m => TyVarBndr m -> m # foldMap :: Monoid m => (a -> m) -> TyVarBndr a -> m # foldMap' :: Monoid m => (a -> m) -> TyVarBndr a -> m # foldr :: (a -> b -> b) -> b -> TyVarBndr a -> b # foldr' :: (a -> b -> b) -> b -> TyVarBndr a -> b # foldl :: (b -> a -> b) -> b -> TyVarBndr a -> b # foldl' :: (b -> a -> b) -> b -> TyVarBndr a -> b # foldr1 :: (a -> a -> a) -> TyVarBndr a -> a # foldl1 :: (a -> a -> a) -> TyVarBndr a -> a # toList :: TyVarBndr a -> [a] # length :: TyVarBndr a -> Int # elem :: Eq a => a -> TyVarBndr a -> Bool # maximum :: Ord a => TyVarBndr a -> a # minimum :: Ord a => TyVarBndr a -> a # | |
Foldable Maybe # | |
Defined in GHC.Internal.Data.Foldable fold :: Monoid m => Maybe m -> m # foldMap :: Monoid m => (a -> m) -> Maybe a -> m # foldMap' :: Monoid m => (a -> m) -> Maybe a -> m # foldr :: (a -> b -> b) -> b -> Maybe a -> b # foldr' :: (a -> b -> b) -> b -> Maybe a -> b # foldl :: (b -> a -> b) -> b -> Maybe a -> b # foldl' :: (b -> a -> b) -> b -> Maybe a -> b # foldr1 :: (a -> a -> a) -> Maybe a -> a # foldl1 :: (a -> a -> a) -> Maybe a -> a # elem :: Eq a => a -> Maybe a -> Bool # maximum :: Ord a => Maybe a -> a # minimum :: Ord a => Maybe a -> a # | |
Foldable Solo # | |
Defined in GHC.Internal.Data.Foldable fold :: Monoid m => Solo m -> m # foldMap :: Monoid m => (a -> m) -> Solo a -> m # foldMap' :: Monoid m => (a -> m) -> Solo a -> m # foldr :: (a -> b -> b) -> b -> Solo a -> b # foldr' :: (a -> b -> b) -> b -> Solo a -> b # foldl :: (b -> a -> b) -> b -> Solo a -> b # foldl' :: (b -> a -> b) -> b -> Solo a -> b # foldr1 :: (a -> a -> a) -> Solo a -> a # foldl1 :: (a -> a -> a) -> Solo a -> a # elem :: Eq a => a -> Solo a -> Bool # maximum :: Ord a => Solo a -> a # | |
Foldable [] # | |
Defined in GHC.Internal.Data.Foldable fold :: Monoid m => [m] -> m # foldMap :: Monoid m => (a -> m) -> [a] -> m # foldMap' :: Monoid m => (a -> m) -> [a] -> m # foldr :: (a -> b -> b) -> b -> [a] -> b # foldr' :: (a -> b -> b) -> b -> [a] -> b # foldl :: (b -> a -> b) -> b -> [a] -> b # foldl' :: (b -> a -> b) -> b -> [a] -> b # foldr1 :: (a -> a -> a) -> [a] -> a # foldl1 :: (a -> a -> a) -> [a] -> a # elem :: Eq a => a -> [a] -> Bool # maximum :: Ord a => [a] -> a # | |
Foldable (Arg a) Source # | Since: base-4.9.0.0 |
Defined in Data.Semigroup fold :: Monoid m => Arg a m -> m # foldMap :: Monoid m => (a0 -> m) -> Arg a a0 -> m # foldMap' :: Monoid m => (a0 -> m) -> Arg a a0 -> m # foldr :: (a0 -> b -> b) -> b -> Arg a a0 -> b # foldr' :: (a0 -> b -> b) -> b -> Arg a a0 -> b # foldl :: (b -> a0 -> b) -> b -> Arg a a0 -> b # foldl' :: (b -> a0 -> b) -> b -> Arg a a0 -> b # foldr1 :: (a0 -> a0 -> a0) -> Arg a a0 -> a0 # foldl1 :: (a0 -> a0 -> a0) -> Arg a a0 -> a0 # elem :: Eq a0 => a0 -> Arg a a0 -> Bool # maximum :: Ord a0 => Arg a a0 -> a0 # minimum :: Ord a0 => Arg a a0 -> a0 # | |
Foldable (Map k) Source # | Folds in order of increasing key. |
Defined in Data.Map.Internal fold :: Monoid m => Map k m -> m # foldMap :: Monoid m => (a -> m) -> Map k a -> m # foldMap' :: Monoid m => (a -> m) -> Map k a -> m # foldr :: (a -> b -> b) -> b -> Map k a -> b # foldr' :: (a -> b -> b) -> b -> Map k a -> b # foldl :: (b -> a -> b) -> b -> Map k a -> b # foldl' :: (b -> a -> b) -> b -> Map k a -> b # foldr1 :: (a -> a -> a) -> Map k a -> a # foldl1 :: (a -> a -> a) -> Map k a -> a # elem :: Eq a => a -> Map k a -> Bool # maximum :: Ord a => Map k a -> a # minimum :: Ord a => Map k a -> a # | |
Foldable (Array i) # | |
Defined in GHC.Internal.Data.Foldable fold :: Monoid m => Array i m -> m # foldMap :: Monoid m => (a -> m) -> Array i a -> m # foldMap' :: Monoid m => (a -> m) -> Array i a -> m # foldr :: (a -> b -> b) -> b -> Array i a -> b # foldr' :: (a -> b -> b) -> b -> Array i a -> b # foldl :: (b -> a -> b) -> b -> Array i a -> b # foldl' :: (b -> a -> b) -> b -> Array i a -> b # foldr1 :: (a -> a -> a) -> Array i a -> a # foldl1 :: (a -> a -> a) -> Array i a -> a # elem :: Eq a => a -> Array i a -> Bool # maximum :: Ord a => Array i a -> a # minimum :: Ord a => Array i a -> a # | |
Foldable (Either a) # | |
Defined in GHC.Internal.Data.Foldable fold :: Monoid m => Either a m -> m # foldMap :: Monoid m => (a0 -> m) -> Either a a0 -> m # foldMap' :: Monoid m => (a0 -> m) -> Either a a0 -> m # foldr :: (a0 -> b -> b) -> b -> Either a a0 -> b # foldr' :: (a0 -> b -> b) -> b -> Either a a0 -> b # foldl :: (b -> a0 -> b) -> b -> Either a a0 -> b # foldl' :: (b -> a0 -> b) -> b -> Either a a0 -> b # foldr1 :: (a0 -> a0 -> a0) -> Either a a0 -> a0 # foldl1 :: (a0 -> a0 -> a0) -> Either a a0 -> a0 # toList :: Either a a0 -> [a0] # length :: Either a a0 -> Int # elem :: Eq a0 => a0 -> Either a a0 -> Bool # maximum :: Ord a0 => Either a a0 -> a0 # minimum :: Ord a0 => Either a a0 -> a0 # | |
Foldable (Proxy :: Type -> Type) # | |
Defined in GHC.Internal.Data.Foldable fold :: Monoid m => Proxy m -> m # foldMap :: Monoid m => (a -> m) -> Proxy a -> m # foldMap' :: Monoid m => (a -> m) -> Proxy a -> m # foldr :: (a -> b -> b) -> b -> Proxy a -> b # foldr' :: (a -> b -> b) -> b -> Proxy a -> b # foldl :: (b -> a -> b) -> b -> Proxy a -> b # foldl' :: (b -> a -> b) -> b -> Proxy a -> b # foldr1 :: (a -> a -> a) -> Proxy a -> a # foldl1 :: (a -> a -> a) -> Proxy a -> a # elem :: Eq a => a -> Proxy a -> Bool # maximum :: Ord a => Proxy a -> a # minimum :: Ord a => Proxy a -> a # | |
Foldable (U1 :: Type -> Type) # | |
Defined in GHC.Internal.Data.Foldable fold :: Monoid m => U1 m -> m # foldMap :: Monoid m => (a -> m) -> U1 a -> m # foldMap' :: Monoid m => (a -> m) -> U1 a -> m # foldr :: (a -> b -> b) -> b -> U1 a -> b # foldr' :: (a -> b -> b) -> b -> U1 a -> b # foldl :: (b -> a -> b) -> b -> U1 a -> b # foldl' :: (b -> a -> b) -> b -> U1 a -> b # foldr1 :: (a -> a -> a) -> U1 a -> a # foldl1 :: (a -> a -> a) -> U1 a -> a # elem :: Eq a => a -> U1 a -> Bool # maximum :: Ord a => U1 a -> a # | |
Foldable (UAddr :: Type -> Type) # | |
Defined in GHC.Internal.Data.Foldable fold :: Monoid m => UAddr m -> m # foldMap :: Monoid m => (a -> m) -> UAddr a -> m # foldMap' :: Monoid m => (a -> m) -> UAddr a -> m # foldr :: (a -> b -> b) -> b -> UAddr a -> b # foldr' :: (a -> b -> b) -> b -> UAddr a -> b # foldl :: (b -> a -> b) -> b -> UAddr a -> b # foldl' :: (b -> a -> b) -> b -> UAddr a -> b # foldr1 :: (a -> a -> a) -> UAddr a -> a # foldl1 :: (a -> a -> a) -> UAddr a -> a # elem :: Eq a => a -> UAddr a -> Bool # maximum :: Ord a => UAddr a -> a # minimum :: Ord a => UAddr a -> a # | |
Foldable (UChar :: Type -> Type) # | |
Defined in GHC.Internal.Data.Foldable fold :: Monoid m => UChar m -> m # foldMap :: Monoid m => (a -> m) -> UChar a -> m # foldMap' :: Monoid m => (a -> m) -> UChar a -> m # foldr :: (a -> b -> b) -> b -> UChar a -> b # foldr' :: (a -> b -> b) -> b -> UChar a -> b # foldl :: (b -> a -> b) -> b -> UChar a -> b # foldl' :: (b -> a -> b) -> b -> UChar a -> b # foldr1 :: (a -> a -> a) -> UChar a -> a # foldl1 :: (a -> a -> a) -> UChar a -> a # elem :: Eq a => a -> UChar a -> Bool # maximum :: Ord a => UChar a -> a # minimum :: Ord a => UChar a -> a # | |
Foldable (UDouble :: Type -> Type) # | |
Defined in GHC.Internal.Data.Foldable fold :: Monoid m => UDouble m -> m # foldMap :: Monoid m => (a -> m) -> UDouble a -> m # foldMap' :: Monoid m => (a -> m) -> UDouble a -> m # foldr :: (a -> b -> b) -> b -> UDouble a -> b # foldr' :: (a -> b -> b) -> b -> UDouble a -> b # foldl :: (b -> a -> b) -> b -> UDouble a -> b # foldl' :: (b -> a -> b) -> b -> UDouble a -> b # foldr1 :: (a -> a -> a) -> UDouble a -> a # foldl1 :: (a -> a -> a) -> UDouble a -> a # elem :: Eq a => a -> UDouble a -> Bool # maximum :: Ord a => UDouble a -> a # minimum :: Ord a => UDouble a -> a # | |
Foldable (UFloat :: Type -> Type) # | |
Defined in GHC.Internal.Data.Foldable fold :: Monoid m => UFloat m -> m # foldMap :: Monoid m => (a -> m) -> UFloat a -> m # foldMap' :: Monoid m => (a -> m) -> UFloat a -> m # foldr :: (a -> b -> b) -> b -> UFloat a -> b # foldr' :: (a -> b -> b) -> b -> UFloat a -> b # foldl :: (b -> a -> b) -> b -> UFloat a -> b # foldl' :: (b -> a -> b) -> b -> UFloat a -> b # foldr1 :: (a -> a -> a) -> UFloat a -> a # foldl1 :: (a -> a -> a) -> UFloat a -> a # elem :: Eq a => a -> UFloat a -> Bool # maximum :: Ord a => UFloat a -> a # minimum :: Ord a => UFloat a -> a # | |
Foldable (UInt :: Type -> Type) # | |
Defined in GHC.Internal.Data.Foldable fold :: Monoid m => UInt m -> m # foldMap :: Monoid m => (a -> m) -> UInt a -> m # foldMap' :: Monoid m => (a -> m) -> UInt a -> m # foldr :: (a -> b -> b) -> b -> UInt a -> b # foldr' :: (a -> b -> b) -> b -> UInt a -> b # foldl :: (b -> a -> b) -> b -> UInt a -> b # foldl' :: (b -> a -> b) -> b -> UInt a -> b # foldr1 :: (a -> a -> a) -> UInt a -> a # foldl1 :: (a -> a -> a) -> UInt a -> a # elem :: Eq a => a -> UInt a -> Bool # maximum :: Ord a => UInt a -> a # | |
Foldable (UWord :: Type -> Type) # | |
Defined in GHC.Internal.Data.Foldable fold :: Monoid m => UWord m -> m # foldMap :: Monoid m => (a -> m) -> UWord a -> m # foldMap' :: Monoid m => (a -> m) -> UWord a -> m # foldr :: (a -> b -> b) -> b -> UWord a -> b # foldr' :: (a -> b -> b) -> b -> UWord a -> b # foldl :: (b -> a -> b) -> b -> UWord a -> b # foldl' :: (b -> a -> b) -> b -> UWord a -> b # foldr1 :: (a -> a -> a) -> UWord a -> a # foldl1 :: (a -> a -> a) -> UWord a -> a # elem :: Eq a => a -> UWord a -> Bool # maximum :: Ord a => UWord a -> a # minimum :: Ord a => UWord a -> a # | |
Foldable (V1 :: Type -> Type) # | |
Defined in GHC.Internal.Data.Foldable fold :: Monoid m => V1 m -> m # foldMap :: Monoid m => (a -> m) -> V1 a -> m # foldMap' :: Monoid m => (a -> m) -> V1 a -> m # foldr :: (a -> b -> b) -> b -> V1 a -> b # foldr' :: (a -> b -> b) -> b -> V1 a -> b # foldl :: (b -> a -> b) -> b -> V1 a -> b # foldl' :: (b -> a -> b) -> b -> V1 a -> b # foldr1 :: (a -> a -> a) -> V1 a -> a # foldl1 :: (a -> a -> a) -> V1 a -> a # elem :: Eq a => a -> V1 a -> Bool # maximum :: Ord a => V1 a -> a # | |
Foldable f => Foldable (Lift f) Source # | |
Defined in Control.Applicative.Lift fold :: Monoid m => Lift f m -> m # foldMap :: Monoid m => (a -> m) -> Lift f a -> m # foldMap' :: Monoid m => (a -> m) -> Lift f a -> m # foldr :: (a -> b -> b) -> b -> Lift f a -> b # foldr' :: (a -> b -> b) -> b -> Lift f a -> b # foldl :: (b -> a -> b) -> b -> Lift f a -> b # foldl' :: (b -> a -> b) -> b -> Lift f a -> b # foldr1 :: (a -> a -> a) -> Lift f a -> a # foldl1 :: (a -> a -> a) -> Lift f a -> a # elem :: Eq a => a -> Lift f a -> Bool # maximum :: Ord a => Lift f a -> a # minimum :: Ord a => Lift f a -> a # | |
Foldable f => Foldable (MaybeT f) Source # | |
Defined in Control.Monad.Trans.Maybe fold :: Monoid m => MaybeT f m -> m # foldMap :: Monoid m => (a -> m) -> MaybeT f a -> m # foldMap' :: Monoid m => (a -> m) -> MaybeT f a -> m # foldr :: (a -> b -> b) -> b -> MaybeT f a -> b # foldr' :: (a -> b -> b) -> b -> MaybeT f a -> b # foldl :: (b -> a -> b) -> b -> MaybeT f a -> b # foldl' :: (b -> a -> b) -> b -> MaybeT f a -> b # foldr1 :: (a -> a -> a) -> MaybeT f a -> a # foldl1 :: (a -> a -> a) -> MaybeT f a -> a # elem :: Eq a => a -> MaybeT f a -> Bool # maximum :: Ord a => MaybeT f a -> a # minimum :: Ord a => MaybeT f a -> a # | |
Foldable ((,) a) # | |
Defined in GHC.Internal.Data.Foldable fold :: Monoid m => (a, m) -> m # foldMap :: Monoid m => (a0 -> m) -> (a, a0) -> m # foldMap' :: Monoid m => (a0 -> m) -> (a, a0) -> m # foldr :: (a0 -> b -> b) -> b -> (a, a0) -> b # foldr' :: (a0 -> b -> b) -> b -> (a, a0) -> b # foldl :: (b -> a0 -> b) -> b -> (a, a0) -> b # foldl' :: (b -> a0 -> b) -> b -> (a, a0) -> b # foldr1 :: (a0 -> a0 -> a0) -> (a, a0) -> a0 # foldl1 :: (a0 -> a0 -> a0) -> (a, a0) -> a0 # elem :: Eq a0 => a0 -> (a, a0) -> Bool # maximum :: Ord a0 => (a, a0) -> a0 # minimum :: Ord a0 => (a, a0) -> a0 # | |
Foldable (CondBranch v c) Source # | |
Defined in Distribution.Types.CondTree fold :: Monoid m => CondBranch v c m -> m # foldMap :: Monoid m => (a -> m) -> CondBranch v c a -> m # foldMap' :: Monoid m => (a -> m) -> CondBranch v c a -> m # foldr :: (a -> b -> b) -> b -> CondBranch v c a -> b # foldr' :: (a -> b -> b) -> b -> CondBranch v c a -> b # foldl :: (b -> a -> b) -> b -> CondBranch v c a -> b # foldl' :: (b -> a -> b) -> b -> CondBranch v c a -> b # foldr1 :: (a -> a -> a) -> CondBranch v c a -> a # foldl1 :: (a -> a -> a) -> CondBranch v c a -> a # toList :: CondBranch v c a -> [a] # null :: CondBranch v c a -> Bool # length :: CondBranch v c a -> Int # elem :: Eq a => a -> CondBranch v c a -> Bool # maximum :: Ord a => CondBranch v c a -> a # minimum :: Ord a => CondBranch v c a -> a # sum :: Num a => CondBranch v c a -> a # product :: Num a => CondBranch v c a -> a # | |
Foldable (CondTree v c) Source # | |
Defined in Distribution.Types.CondTree fold :: Monoid m => CondTree v c m -> m # foldMap :: Monoid m => (a -> m) -> CondTree v c a -> m # foldMap' :: Monoid m => (a -> m) -> CondTree v c a -> m # foldr :: (a -> b -> b) -> b -> CondTree v c a -> b # foldr' :: (a -> b -> b) -> b -> CondTree v c a -> b # foldl :: (b -> a -> b) -> b -> CondTree v c a -> b # foldl' :: (b -> a -> b) -> b -> CondTree v c a -> b # foldr1 :: (a -> a -> a) -> CondTree v c a -> a # foldl1 :: (a -> a -> a) -> CondTree v c a -> a # toList :: CondTree v c a -> [a] # null :: CondTree v c a -> Bool # length :: CondTree v c a -> Int # elem :: Eq a => a -> CondTree v c a -> Bool # maximum :: Ord a => CondTree v c a -> a # minimum :: Ord a => CondTree v c a -> a # | |
Foldable (Const m :: Type -> Type) # | |
Defined in GHC.Internal.Data.Functor.Const fold :: Monoid m0 => Const m m0 -> m0 # foldMap :: Monoid m0 => (a -> m0) -> Const m a -> m0 # foldMap' :: Monoid m0 => (a -> m0) -> Const m a -> m0 # foldr :: (a -> b -> b) -> b -> Const m a -> b # foldr' :: (a -> b -> b) -> b -> Const m a -> b # foldl :: (b -> a -> b) -> b -> Const m a -> b # foldl' :: (b -> a -> b) -> b -> Const m a -> b # foldr1 :: (a -> a -> a) -> Const m a -> a # foldl1 :: (a -> a -> a) -> Const m a -> a # elem :: Eq a => a -> Const m a -> Bool # maximum :: Ord a => Const m a -> a # minimum :: Ord a => Const m a -> a # | |
Foldable f => Foldable (Ap f) # | |
Defined in GHC.Internal.Data.Foldable fold :: Monoid m => Ap f m -> m # foldMap :: Monoid m => (a -> m) -> Ap f a -> m # foldMap' :: Monoid m => (a -> m) -> Ap f a -> m # foldr :: (a -> b -> b) -> b -> Ap f a -> b # foldr' :: (a -> b -> b) -> b -> Ap f a -> b # foldl :: (b -> a -> b) -> b -> Ap f a -> b # foldl' :: (b -> a -> b) -> b -> Ap f a -> b # foldr1 :: (a -> a -> a) -> Ap f a -> a # foldl1 :: (a -> a -> a) -> Ap f a -> a # elem :: Eq a => a -> Ap f a -> Bool # maximum :: Ord a => Ap f a -> a # | |
Foldable f => Foldable (Alt f) # | |
Defined in GHC.Internal.Data.Foldable fold :: Monoid m => Alt f m -> m # foldMap :: Monoid m => (a -> m) -> Alt f a -> m # foldMap' :: Monoid m => (a -> m) -> Alt f a -> m # foldr :: (a -> b -> b) -> b -> Alt f a -> b # foldr' :: (a -> b -> b) -> b -> Alt f a -> b # foldl :: (b -> a -> b) -> b -> Alt f a -> b # foldl' :: (b -> a -> b) -> b -> Alt f a -> b # foldr1 :: (a -> a -> a) -> Alt f a -> a # foldl1 :: (a -> a -> a) -> Alt f a -> a # elem :: Eq a => a -> Alt f a -> Bool # maximum :: Ord a => Alt f a -> a # minimum :: Ord a => Alt f a -> a # | |
Foldable f => Foldable (Rec1 f) # | |
Defined in GHC.Internal.Data.Foldable fold :: Monoid m => Rec1 f m -> m # foldMap :: Monoid m => (a -> m) -> Rec1 f a -> m # foldMap' :: Monoid m => (a -> m) -> Rec1 f a -> m # foldr :: (a -> b -> b) -> b -> Rec1 f a -> b # foldr' :: (a -> b -> b) -> b -> Rec1 f a -> b # foldl :: (b -> a -> b) -> b -> Rec1 f a -> b # foldl' :: (b -> a -> b) -> b -> Rec1 f a -> b # foldr1 :: (a -> a -> a) -> Rec1 f a -> a # foldl1 :: (a -> a -> a) -> Rec1 f a -> a # elem :: Eq a => a -> Rec1 f a -> Bool # maximum :: Ord a => Rec1 f a -> a # minimum :: Ord a => Rec1 f a -> a # | |
Foldable f => Foldable (Backwards f) Source # | Derived instance. |
Defined in Control.Applicative.Backwards fold :: Monoid m => Backwards f m -> m # foldMap :: Monoid m => (a -> m) -> Backwards f a -> m # foldMap' :: Monoid m => (a -> m) -> Backwards f a -> m # foldr :: (a -> b -> b) -> b -> Backwards f a -> b # foldr' :: (a -> b -> b) -> b -> Backwards f a -> b # foldl :: (b -> a -> b) -> b -> Backwards f a -> b # foldl' :: (b -> a -> b) -> b -> Backwards f a -> b # foldr1 :: (a -> a -> a) -> Backwards f a -> a # foldl1 :: (a -> a -> a) -> Backwards f a -> a # toList :: Backwards f a -> [a] # null :: Backwards f a -> Bool # length :: Backwards f a -> Int # elem :: Eq a => a -> Backwards f a -> Bool # maximum :: Ord a => Backwards f a -> a # minimum :: Ord a => Backwards f a -> a # | |
Foldable f => Foldable (ExceptT e f) Source # | |
Defined in Control.Monad.Trans.Except fold :: Monoid m => ExceptT e f m -> m # foldMap :: Monoid m => (a -> m) -> ExceptT e f a -> m # foldMap' :: Monoid m => (a -> m) -> ExceptT e f a -> m # foldr :: (a -> b -> b) -> b -> ExceptT e f a -> b # foldr' :: (a -> b -> b) -> b -> ExceptT e f a -> b # foldl :: (b -> a -> b) -> b -> ExceptT e f a -> b # foldl' :: (b -> a -> b) -> b -> ExceptT e f a -> b # foldr1 :: (a -> a -> a) -> ExceptT e f a -> a # foldl1 :: (a -> a -> a) -> ExceptT e f a -> a # toList :: ExceptT e f a -> [a] # null :: ExceptT e f a -> Bool # length :: ExceptT e f a -> Int # elem :: Eq a => a -> ExceptT e f a -> Bool # maximum :: Ord a => ExceptT e f a -> a # minimum :: Ord a => ExceptT e f a -> a # | |
Foldable f => Foldable (IdentityT f) Source # | |
Defined in Control.Monad.Trans.Identity fold :: Monoid m => IdentityT f m -> m # foldMap :: Monoid m => (a -> m) -> IdentityT f a -> m # foldMap' :: Monoid m => (a -> m) -> IdentityT f a -> m # foldr :: (a -> b -> b) -> b -> IdentityT f a -> b # foldr' :: (a -> b -> b) -> b -> IdentityT f a -> b # foldl :: (b -> a -> b) -> b -> IdentityT f a -> b # foldl' :: (b -> a -> b) -> b -> IdentityT f a -> b # foldr1 :: (a -> a -> a) -> IdentityT f a -> a # foldl1 :: (a -> a -> a) -> IdentityT f a -> a # toList :: IdentityT f a -> [a] # null :: IdentityT f a -> Bool # length :: IdentityT f a -> Int # elem :: Eq a => a -> IdentityT f a -> Bool # maximum :: Ord a => IdentityT f a -> a # minimum :: Ord a => IdentityT f a -> a # | |
Foldable f => Foldable (WriterT w f) Source # | |
Defined in Control.Monad.Trans.Writer.Lazy fold :: Monoid m => WriterT w f m -> m # foldMap :: Monoid m => (a -> m) -> WriterT w f a -> m # foldMap' :: Monoid m => (a -> m) -> WriterT w f a -> m # foldr :: (a -> b -> b) -> b -> WriterT w f a -> b # foldr' :: (a -> b -> b) -> b -> WriterT w f a -> b # foldl :: (b -> a -> b) -> b -> WriterT w f a -> b # foldl' :: (b -> a -> b) -> b -> WriterT w f a -> b # foldr1 :: (a -> a -> a) -> WriterT w f a -> a # foldl1 :: (a -> a -> a) -> WriterT w f a -> a # toList :: WriterT w f a -> [a] # null :: WriterT w f a -> Bool # length :: WriterT w f a -> Int # elem :: Eq a => a -> WriterT w f a -> Bool # maximum :: Ord a => WriterT w f a -> a # minimum :: Ord a => WriterT w f a -> a # | |
Foldable f => Foldable (WriterT w f) Source # | |
Defined in Control.Monad.Trans.Writer.Strict fold :: Monoid m => WriterT w f m -> m # foldMap :: Monoid m => (a -> m) -> WriterT w f a -> m # foldMap' :: Monoid m => (a -> m) -> WriterT w f a -> m # foldr :: (a -> b -> b) -> b -> WriterT w f a -> b # foldr' :: (a -> b -> b) -> b -> WriterT w f a -> b # foldl :: (b -> a -> b) -> b -> WriterT w f a -> b # foldl' :: (b -> a -> b) -> b -> WriterT w f a -> b # foldr1 :: (a -> a -> a) -> WriterT w f a -> a # foldl1 :: (a -> a -> a) -> WriterT w f a -> a # toList :: WriterT w f a -> [a] # null :: WriterT w f a -> Bool # length :: WriterT w f a -> Int # elem :: Eq a => a -> WriterT w f a -> Bool # maximum :: Ord a => WriterT w f a -> a # minimum :: Ord a => WriterT w f a -> a # | |
Foldable (Constant a :: Type -> Type) Source # | |
Defined in Data.Functor.Constant fold :: Monoid m => Constant a m -> m # foldMap :: Monoid m => (a0 -> m) -> Constant a a0 -> m # foldMap' :: Monoid m => (a0 -> m) -> Constant a a0 -> m # foldr :: (a0 -> b -> b) -> b -> Constant a a0 -> b # foldr' :: (a0 -> b -> b) -> b -> Constant a a0 -> b # foldl :: (b -> a0 -> b) -> b -> Constant a a0 -> b # foldl' :: (b -> a0 -> b) -> b -> Constant a a0 -> b # foldr1 :: (a0 -> a0 -> a0) -> Constant a a0 -> a0 # foldl1 :: (a0 -> a0 -> a0) -> Constant a a0 -> a0 # toList :: Constant a a0 -> [a0] # null :: Constant a a0 -> Bool # length :: Constant a a0 -> Int # elem :: Eq a0 => a0 -> Constant a a0 -> Bool # maximum :: Ord a0 => Constant a a0 -> a0 # minimum :: Ord a0 => Constant a a0 -> a0 # | |
Foldable f => Foldable (Reverse f) Source # | Fold from right to left. |
Defined in Data.Functor.Reverse fold :: Monoid m => Reverse f m -> m # foldMap :: Monoid m => (a -> m) -> Reverse f a -> m # foldMap' :: Monoid m => (a -> m) -> Reverse f a -> m # foldr :: (a -> b -> b) -> b -> Reverse f a -> b # foldr' :: (a -> b -> b) -> b -> Reverse f a -> b # foldl :: (b -> a -> b) -> b -> Reverse f a -> b # foldl' :: (b -> a -> b) -> b -> Reverse f a -> b # foldr1 :: (a -> a -> a) -> Reverse f a -> a # foldl1 :: (a -> a -> a) -> Reverse f a -> a # toList :: Reverse f a -> [a] # length :: Reverse f a -> Int # elem :: Eq a => a -> Reverse f a -> Bool # maximum :: Ord a => Reverse f a -> a # minimum :: Ord a => Reverse f a -> a # | |
(Foldable f, Foldable g) => Foldable (Product f g) Source # | Since: base-4.9.0.0 |
Defined in Data.Functor.Product fold :: Monoid m => Product f g m -> m # foldMap :: Monoid m => (a -> m) -> Product f g a -> m # foldMap' :: Monoid m => (a -> m) -> Product f g a -> m # foldr :: (a -> b -> b) -> b -> Product f g a -> b # foldr' :: (a -> b -> b) -> b -> Product f g a -> b # foldl :: (b -> a -> b) -> b -> Product f g a -> b # foldl' :: (b -> a -> b) -> b -> Product f g a -> b # foldr1 :: (a -> a -> a) -> Product f g a -> a # foldl1 :: (a -> a -> a) -> Product f g a -> a # toList :: Product f g a -> [a] # null :: Product f g a -> Bool # length :: Product f g a -> Int # elem :: Eq a => a -> Product f g a -> Bool # maximum :: Ord a => Product f g a -> a # minimum :: Ord a => Product f g a -> a # | |
(Foldable f, Foldable g) => Foldable (Sum f g) Source # | Since: base-4.9.0.0 |
Defined in Data.Functor.Sum fold :: Monoid m => Sum f g m -> m # foldMap :: Monoid m => (a -> m) -> Sum f g a -> m # foldMap' :: Monoid m => (a -> m) -> Sum f g a -> m # foldr :: (a -> b -> b) -> b -> Sum f g a -> b # foldr' :: (a -> b -> b) -> b -> Sum f g a -> b # foldl :: (b -> a -> b) -> b -> Sum f g a -> b # foldl' :: (b -> a -> b) -> b -> Sum f g a -> b # foldr1 :: (a -> a -> a) -> Sum f g a -> a # foldl1 :: (a -> a -> a) -> Sum f g a -> a # elem :: Eq a => a -> Sum f g a -> Bool # maximum :: Ord a => Sum f g a -> a # minimum :: Ord a => Sum f g a -> a # | |
(Foldable f, Foldable g) => Foldable (f :*: g) # | |
Defined in GHC.Internal.Data.Foldable fold :: Monoid m => (f :*: g) m -> m # foldMap :: Monoid m => (a -> m) -> (f :*: g) a -> m # foldMap' :: Monoid m => (a -> m) -> (f :*: g) a -> m # foldr :: (a -> b -> b) -> b -> (f :*: g) a -> b # foldr' :: (a -> b -> b) -> b -> (f :*: g) a -> b # foldl :: (b -> a -> b) -> b -> (f :*: g) a -> b # foldl' :: (b -> a -> b) -> b -> (f :*: g) a -> b # foldr1 :: (a -> a -> a) -> (f :*: g) a -> a # foldl1 :: (a -> a -> a) -> (f :*: g) a -> a # toList :: (f :*: g) a -> [a] # length :: (f :*: g) a -> Int # elem :: Eq a => a -> (f :*: g) a -> Bool # maximum :: Ord a => (f :*: g) a -> a # minimum :: Ord a => (f :*: g) a -> a # | |
(Foldable f, Foldable g) => Foldable (f :+: g) # | |
Defined in GHC.Internal.Data.Foldable fold :: Monoid m => (f :+: g) m -> m # foldMap :: Monoid m => (a -> m) -> (f :+: g) a -> m # foldMap' :: Monoid m => (a -> m) -> (f :+: g) a -> m # foldr :: (a -> b -> b) -> b -> (f :+: g) a -> b # foldr' :: (a -> b -> b) -> b -> (f :+: g) a -> b # foldl :: (b -> a -> b) -> b -> (f :+: g) a -> b # foldl' :: (b -> a -> b) -> b -> (f :+: g) a -> b # foldr1 :: (a -> a -> a) -> (f :+: g) a -> a # foldl1 :: (a -> a -> a) -> (f :+: g) a -> a # toList :: (f :+: g) a -> [a] # length :: (f :+: g) a -> Int # elem :: Eq a => a -> (f :+: g) a -> Bool # maximum :: Ord a => (f :+: g) a -> a # minimum :: Ord a => (f :+: g) a -> a # | |
Foldable (K1 i c :: Type -> Type) # | |
Defined in GHC.Internal.Data.Foldable fold :: Monoid m => K1 i c m -> m # foldMap :: Monoid m => (a -> m) -> K1 i c a -> m # foldMap' :: Monoid m => (a -> m) -> K1 i c a -> m # foldr :: (a -> b -> b) -> b -> K1 i c a -> b # foldr' :: (a -> b -> b) -> b -> K1 i c a -> b # foldl :: (b -> a -> b) -> b -> K1 i c a -> b # foldl' :: (b -> a -> b) -> b -> K1 i c a -> b # foldr1 :: (a -> a -> a) -> K1 i c a -> a # foldl1 :: (a -> a -> a) -> K1 i c a -> a # elem :: Eq a => a -> K1 i c a -> Bool # maximum :: Ord a => K1 i c a -> a # minimum :: Ord a => K1 i c a -> a # | |
(Foldable f, Foldable g) => Foldable (Compose f g) Source # | Since: base-4.9.0.0 |
Defined in Data.Functor.Compose fold :: Monoid m => Compose f g m -> m # foldMap :: Monoid m => (a -> m) -> Compose f g a -> m # foldMap' :: Monoid m => (a -> m) -> Compose f g a -> m # foldr :: (a -> b -> b) -> b -> Compose f g a -> b # foldr' :: (a -> b -> b) -> b -> Compose f g a -> b # foldl :: (b -> a -> b) -> b -> Compose f g a -> b # foldl' :: (b -> a -> b) -> b -> Compose f g a -> b # foldr1 :: (a -> a -> a) -> Compose f g a -> a # foldl1 :: (a -> a -> a) -> Compose f g a -> a # toList :: Compose f g a -> [a] # null :: Compose f g a -> Bool # length :: Compose f g a -> Int # elem :: Eq a => a -> Compose f g a -> Bool # maximum :: Ord a => Compose f g a -> a # minimum :: Ord a => Compose f g a -> a # | |
(Foldable f, Foldable g) => Foldable (f :.: g) # | |
Defined in GHC.Internal.Data.Foldable fold :: Monoid m => (f :.: g) m -> m # foldMap :: Monoid m => (a -> m) -> (f :.: g) a -> m # foldMap' :: Monoid m => (a -> m) -> (f :.: g) a -> m # foldr :: (a -> b -> b) -> b -> (f :.: g) a -> b # foldr' :: (a -> b -> b) -> b -> (f :.: g) a -> b # foldl :: (b -> a -> b) -> b -> (f :.: g) a -> b # foldl' :: (b -> a -> b) -> b -> (f :.: g) a -> b # foldr1 :: (a -> a -> a) -> (f :.: g) a -> a # foldl1 :: (a -> a -> a) -> (f :.: g) a -> a # toList :: (f :.: g) a -> [a] # length :: (f :.: g) a -> Int # elem :: Eq a => a -> (f :.: g) a -> Bool # maximum :: Ord a => (f :.: g) a -> a # minimum :: Ord a => (f :.: g) a -> a # | |
Foldable f => Foldable (M1 i c f) # | |
Defined in GHC.Internal.Data.Foldable fold :: Monoid m => M1 i c f m -> m # foldMap :: Monoid m => (a -> m) -> M1 i c f a -> m # foldMap' :: Monoid m => (a -> m) -> M1 i c f a -> m # foldr :: (a -> b -> b) -> b -> M1 i c f a -> b # foldr' :: (a -> b -> b) -> b -> M1 i c f a -> b # foldl :: (b -> a -> b) -> b -> M1 i c f a -> b # foldl' :: (b -> a -> b) -> b -> M1 i c f a -> b # foldr1 :: (a -> a -> a) -> M1 i c f a -> a # foldl1 :: (a -> a -> a) -> M1 i c f a -> a # elem :: Eq a => a -> M1 i c f a -> Bool # maximum :: Ord a => M1 i c f a -> a # minimum :: Ord a => M1 i c f a -> a # |
traverse_ :: (Foldable t, Applicative f) => (a -> f b) -> t a -> f () #
for_ :: (Foldable t, Applicative f) => t a -> (a -> f b) -> f () #
Data.Traversable
class (Functor t, Foldable t) => Traversable (t :: Type -> Type) #
Instances
Traversable PerCompilerFlavor Source # | |
Defined in Distribution.Compiler traverse :: Applicative f => (a -> f b) -> PerCompilerFlavor a -> f (PerCompilerFlavor b) # sequenceA :: Applicative f => PerCompilerFlavor (f a) -> f (PerCompilerFlavor a) # mapM :: Monad m => (a -> m b) -> PerCompilerFlavor a -> m (PerCompilerFlavor b) # sequence :: Monad m => PerCompilerFlavor (m a) -> m (PerCompilerFlavor a) # | |
Traversable Field Source # | |
Traversable FieldLine Source # | |
Defined in Distribution.Fields.Field | |
Traversable Name Source # | |
Traversable SectionArg Source # | |
Defined in Distribution.Fields.Field traverse :: Applicative f => (a -> f b) -> SectionArg a -> f (SectionArg b) # sequenceA :: Applicative f => SectionArg (f a) -> f (SectionArg a) # mapM :: Monad m => (a -> m b) -> SectionArg a -> m (SectionArg b) # sequence :: Monad m => SectionArg (m a) -> m (SectionArg a) # | |
Traversable PrettyField Source # | |
Defined in Distribution.Fields.Pretty traverse :: Applicative f => (a -> f b) -> PrettyField a -> f (PrettyField b) # sequenceA :: Applicative f => PrettyField (f a) -> f (PrettyField a) # mapM :: Monad m => (a -> m b) -> PrettyField a -> m (PrettyField b) # sequence :: Monad m => PrettyField (m a) -> m (PrettyField a) # | |
Traversable Condition Source # | |
Defined in Distribution.Types.Condition | |
Traversable VersionRangeF Source # | |
Defined in Distribution.Types.VersionRange.Internal traverse :: Applicative f => (a -> f b) -> VersionRangeF a -> f (VersionRangeF b) # sequenceA :: Applicative f => VersionRangeF (f a) -> f (VersionRangeF a) # mapM :: Monad m => (a -> m b) -> VersionRangeF a -> m (VersionRangeF b) # sequence :: Monad m => VersionRangeF (m a) -> m (VersionRangeF a) # | |
Traversable Complex Source # | Since: base-4.9.0.0 |
Traversable First Source # | Since: base-4.9.0.0 |
Traversable Last Source # | Since: base-4.9.0.0 |
Traversable Max Source # | Since: base-4.9.0.0 |
Traversable Min Source # | Since: base-4.9.0.0 |
Traversable SCC Source # | Since: containers-0.5.9 |
Traversable IntMap Source # | Traverses in order of increasing key. |
Traversable Digit Source # | |
Traversable Elem Source # | |
Traversable FingerTree Source # | |
Defined in Data.Sequence.Internal traverse :: Applicative f => (a -> f b) -> FingerTree a -> f (FingerTree b) # sequenceA :: Applicative f => FingerTree (f a) -> f (FingerTree a) # mapM :: Monad m => (a -> m b) -> FingerTree a -> m (FingerTree b) # sequence :: Monad m => FingerTree (m a) -> m (FingerTree a) # | |
Traversable Node Source # | |
Traversable Seq Source # | |
Traversable ViewL Source # | |
Traversable ViewR Source # | |
Traversable Tree Source # | |
Traversable NonEmpty # | |
Traversable Identity # | |
Traversable First # | |
Traversable Last # | |
Traversable Down # | |
Traversable Dual # | |
Traversable Product # | |
Traversable Sum # | |
Traversable ZipList # | |
Traversable Par1 # | |
Traversable TyVarBndr # | |
Defined in GHC.Internal.TH.Syntax | |
Traversable Maybe # | |
Traversable Solo # | |
Traversable [] # | |
Defined in GHC.Internal.Data.Traversable | |
Traversable (Arg a) Source # | Since: base-4.9.0.0 |
Traversable (Map k) Source # | Traverses in order of increasing key. |
Ix i => Traversable (Array i) # | |
Traversable (Either a) # | |
Defined in GHC.Internal.Data.Traversable | |
Traversable (Proxy :: Type -> Type) # | |
Traversable (U1 :: Type -> Type) # | |
Traversable (UAddr :: Type -> Type) # | |
Traversable (UChar :: Type -> Type) # | |
Traversable (UDouble :: Type -> Type) # | |
Traversable (UFloat :: Type -> Type) # | |
Traversable (UInt :: Type -> Type) # | |
Traversable (UWord :: Type -> Type) # | |
Traversable (V1 :: Type -> Type) # | |
Traversable f => Traversable (Lift f) Source # | |
Traversable f => Traversable (MaybeT f) Source # | |
Defined in Control.Monad.Trans.Maybe | |
Traversable ((,) a) # | |
Defined in GHC.Internal.Data.Traversable | |
Traversable (CondBranch v c) Source # | |
Defined in Distribution.Types.CondTree traverse :: Applicative f => (a -> f b) -> CondBranch v c a -> f (CondBranch v c b) # sequenceA :: Applicative f => CondBranch v c (f a) -> f (CondBranch v c a) # mapM :: Monad m => (a -> m b) -> CondBranch v c a -> m (CondBranch v c b) # sequence :: Monad m => CondBranch v c (m a) -> m (CondBranch v c a) # | |
Traversable (CondTree v c) Source # | |
Defined in Distribution.Types.CondTree | |
Traversable (Const m :: Type -> Type) # | |
Traversable f => Traversable (Ap f) # | |
Traversable f => Traversable (Alt f) # | |
Traversable f => Traversable (Rec1 f) # | |
Traversable f => Traversable (Backwards f) Source # | Derived instance. |
Defined in Control.Applicative.Backwards | |
Traversable f => Traversable (ExceptT e f) Source # | |
Defined in Control.Monad.Trans.Except | |
Traversable f => Traversable (IdentityT f) Source # | |
Defined in Control.Monad.Trans.Identity | |
Traversable f => Traversable (WriterT w f) Source # | |
Defined in Control.Monad.Trans.Writer.Lazy | |
Traversable f => Traversable (WriterT w f) Source # | |
Defined in Control.Monad.Trans.Writer.Strict | |
Traversable (Constant a :: Type -> Type) Source # | |
Defined in Data.Functor.Constant | |
Traversable f => Traversable (Reverse f) Source # | Traverse from right to left. |
Defined in Data.Functor.Reverse | |
(Traversable f, Traversable g) => Traversable (Product f g) Source # | Since: base-4.9.0.0 |
Defined in Data.Functor.Product | |
(Traversable f, Traversable g) => Traversable (Sum f g) Source # | Since: base-4.9.0.0 |
(Traversable f, Traversable g) => Traversable (f :*: g) # | |
Defined in GHC.Internal.Data.Traversable | |
(Traversable f, Traversable g) => Traversable (f :+: g) # | |
Defined in GHC.Internal.Data.Traversable | |
Traversable (K1 i c :: Type -> Type) # | |
(Traversable f, Traversable g) => Traversable (Compose f g) Source # | Since: base-4.9.0.0 |
Defined in Data.Functor.Compose | |
(Traversable f, Traversable g) => Traversable (f :.: g) # | |
Defined in GHC.Internal.Data.Traversable | |
Traversable f => Traversable (M1 i c f) # | |
Defined in GHC.Internal.Data.Traversable |
traverse :: (Traversable t, Applicative f) => (a -> f b) -> t a -> f (t b) #
sequenceA :: (Traversable t, Applicative f) => t (f a) -> f (t a) #
for :: (Traversable t, Applicative f) => t a -> (a -> f b) -> f (t b) #
Data.Function
Data.Ord
Control.Arrow
Control.Monad
unless :: Applicative f => Bool -> f () -> f () #
when :: Applicative f => Bool -> f () -> f () #
filterM :: Applicative m => (a -> m Bool) -> [a] -> m [a] #
guard :: Alternative f => Bool -> f () #
Control.Exception
throwIO :: (HasCallStack, Exception e) => e -> IO a #
class (Typeable e, Show e) => Exception e where #
Nothing
toException :: e -> SomeException #
fromException :: SomeException -> Maybe e #
displayException :: e -> String #
backtraceDesired :: e -> Bool #
Instances
Exception Timeout Source # | Since: base-4.7.0.0 |
Defined in System.Timeout toException :: Timeout -> SomeException # fromException :: SomeException -> Maybe Timeout # displayException :: Timeout -> String # backtraceDesired :: Timeout -> Bool # | |
Exception SizeOverflowException Source # | |
Exception Void # | |
Defined in GHC.Internal.Exception.Type toException :: Void -> SomeException # fromException :: SomeException -> Maybe Void # displayException :: Void -> String # backtraceDesired :: Void -> Bool # | |
Exception NestedAtomically # | |
Exception NoMatchingContinuationPrompt # | |
Exception NoMethodError # | |
Defined in GHC.Internal.Control.Exception.Base | |
Exception NonTermination # | |
Defined in GHC.Internal.Control.Exception.Base | |
Exception PatternMatchFail # | |
Exception RecConError # | |
Defined in GHC.Internal.Control.Exception.Base toException :: RecConError -> SomeException # fromException :: SomeException -> Maybe RecConError # displayException :: RecConError -> String # backtraceDesired :: RecConError -> Bool # | |
Exception RecSelError # | |
Defined in GHC.Internal.Control.Exception.Base toException :: RecSelError -> SomeException # fromException :: SomeException -> Maybe RecSelError # displayException :: RecSelError -> String # backtraceDesired :: RecSelError -> Bool # | |
Exception RecUpdError # | |
Defined in GHC.Internal.Control.Exception.Base toException :: RecUpdError -> SomeException # fromException :: SomeException -> Maybe RecUpdError # displayException :: RecUpdError -> String # backtraceDesired :: RecUpdError -> Bool # | |
Exception TypeError # | |
Defined in GHC.Internal.Control.Exception.Base toException :: TypeError -> SomeException # fromException :: SomeException -> Maybe TypeError # displayException :: TypeError -> String # backtraceDesired :: TypeError -> Bool # | |
Exception ErrorCall # | |
Defined in GHC.Internal.Exception toException :: ErrorCall -> SomeException # fromException :: SomeException -> Maybe ErrorCall # displayException :: ErrorCall -> String # backtraceDesired :: ErrorCall -> Bool # | |
Exception ArithException # | |
Defined in GHC.Internal.Exception.Type | |
Exception SomeException # | |
Defined in GHC.Internal.Exception.Type | |
Exception AllocationLimitExceeded # | |
Exception ArrayException # | |
Defined in GHC.Internal.IO.Exception | |
Exception AssertionFailed # | |
Defined in GHC.Internal.IO.Exception | |
Exception AsyncException # | |
Defined in GHC.Internal.IO.Exception | |
Exception BlockedIndefinitelyOnMVar # | |
Exception BlockedIndefinitelyOnSTM # | |
Exception CompactionFailed # | |
Defined in GHC.Internal.IO.Exception | |
Exception Deadlock # | |
Defined in GHC.Internal.IO.Exception toException :: Deadlock -> SomeException # fromException :: SomeException -> Maybe Deadlock # displayException :: Deadlock -> String # backtraceDesired :: Deadlock -> Bool # | |
Exception ExitCode # | |
Defined in GHC.Internal.IO.Exception toException :: ExitCode -> SomeException # fromException :: SomeException -> Maybe ExitCode # displayException :: ExitCode -> String # backtraceDesired :: ExitCode -> Bool # | |
Exception FixIOException # | |
Defined in GHC.Internal.IO.Exception | |
Exception IOException # | |
Defined in GHC.Internal.IO.Exception toException :: IOException -> SomeException # fromException :: SomeException -> Maybe IOException # displayException :: IOException -> String # backtraceDesired :: IOException -> Bool # | |
Exception SomeAsyncException # | |
Exception ParseError Source # | Since: parsec-3.1.17.0 |
Defined in Text.Parsec.Error toException :: ParseError -> SomeException # fromException :: SomeException -> Maybe ParseError # displayException :: ParseError -> String # backtraceDesired :: ParseError -> Bool # | |
Exception UnicodeException Source # | |
Defined in Data.Text.Encoding.Error | |
Exception a => Exception (ExceptionWithContext a) # | |
Defined in GHC.Internal.Exception.Type toException :: ExceptionWithContext a -> SomeException # fromException :: SomeException -> Maybe (ExceptionWithContext a) # displayException :: ExceptionWithContext a -> String # backtraceDesired :: ExceptionWithContext a -> Bool # | |
Exception e => Exception (NoBacktrace e) # | |
Defined in GHC.Internal.Exception.Type toException :: NoBacktrace e -> SomeException # fromException :: SomeException -> Maybe (NoBacktrace e) # displayException :: NoBacktrace e -> String # backtraceDesired :: NoBacktrace e -> Bool # |
data IOException #
Instances
Exception IOException # | |
Defined in GHC.Internal.IO.Exception toException :: IOException -> SomeException # fromException :: SomeException -> Maybe IOException # displayException :: IOException -> String # backtraceDesired :: IOException -> Bool # | |
Show IOException # | |
Defined in GHC.Internal.IO.Exception showsPrec :: Int -> IOException -> ShowS # show :: IOException -> String # showList :: [IOException] -> ShowS # | |
Eq IOException # | |
Defined in GHC.Internal.IO.Exception (==) :: IOException -> IOException -> Bool # (/=) :: IOException -> IOException -> Bool # | |
MonadError IOException IO Source # | |
Defined in Control.Monad.Error.Class throwError :: IOException -> IO a Source # catchError :: IO a -> (IOException -> IO a) -> IO a Source # |
data SomeException #
(Exception e, HasExceptionContext) => SomeException e |
Instances
Exception SomeException # | |
Defined in GHC.Internal.Exception.Type | |
Show SomeException # | |
Defined in GHC.Internal.Exception.Type showsPrec :: Int -> SomeException -> ShowS # show :: SomeException -> String # showList :: [SomeException] -> ShowS # |
Control.DeepSeq
deepseq :: NFData a => a -> b -> b infixr 0 Source #
deepseq
: fully evaluates the first argument, before returning the
second.
The name deepseq
is used to illustrate the relationship to seq
:
where seq
is shallow in the sense that it only evaluates the top
level of its argument, deepseq
traverses the entire data structure
evaluating it completely.
deepseq
can be useful for forcing pending exceptions,
eradicating space leaks, or forcing lazy I/O to happen. It is
also useful in conjunction with parallel Strategies (see the
parallel
package).
There is no guarantee about the ordering of evaluation. The
implementation may evaluate the components of the structure in
any order or in parallel. To impose an actual order on
evaluation, use pseq
from Control.Parallel in the
parallel
package.
Since: deepseq-1.1.0.0
force :: NFData a => a -> a Source #
A variant of deepseq
that is useful in some circumstances:
force x = x `deepseq` x
force x
fully evaluates x
, and then returns it. Note that
force x
only performs evaluation when the value of force x
itself is demanded, so essentially it turns shallow evaluation into
deep evaluation.
force
can be conveniently used in combination with ViewPatterns
:
{-# LANGUAGE BangPatterns, ViewPatterns #-} import Control.DeepSeq someFun :: ComplexData -> SomeResult someFun (force -> !arg) = {- 'arg' will be fully evaluated -}
Another useful application is to combine force
with
evaluate
in order to force deep evaluation
relative to other IO
operations:
import Control.Exception (evaluate) import Control.DeepSeq main = do result <- evaluate $ force $ pureComputation {- 'result' will be fully evaluated at this point -} return ()
Finally, here's an exception safe variant of the readFile'
example:
readFile' :: FilePath -> IO String readFile' fn = bracket (openFile fn ReadMode) hClose $ \h -> evaluate . force =<< hGetContents h
Since: deepseq-1.2.0.0
Data.Char
isAlphaNum :: Char -> Bool #
Data.Void
Data.Word & Data.Int
Instances
Structured Word Source # | |||||
Defined in Distribution.Utils.Structured | |||||
PrintfArg Word Source # | Since: base-2.1 | ||||
Defined in Text.Printf formatArg :: Word -> FieldFormatter Source # parseFormat :: Word -> ModifierParser Source # | |||||
Binary Word Source # | |||||
NFData Word Source # | |||||
Defined in Control.DeepSeq | |||||
Bits Word # | |||||
Defined in GHC.Internal.Bits (.&.) :: Word -> Word -> Word # (.|.) :: Word -> Word -> Word # complement :: Word -> Word # shift :: Word -> Int -> Word # rotate :: Word -> Int -> Word # setBit :: Word -> Int -> Word # clearBit :: Word -> Int -> Word # complementBit :: Word -> Int -> Word # testBit :: Word -> Int -> Bool # bitSizeMaybe :: Word -> Maybe Int # shiftL :: Word -> Int -> Word # unsafeShiftL :: Word -> Int -> Word # shiftR :: Word -> Int -> Word # unsafeShiftR :: Word -> Int -> Word # rotateL :: Word -> Int -> Word # | |||||
FiniteBits Word # | |||||
Defined in GHC.Internal.Bits | |||||
Data Word # | |||||
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Word -> c Word # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Word # dataTypeOf :: Word -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Word) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Word) # gmapT :: (forall b. Data b => b -> b) -> Word -> Word # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Word -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Word -> r # gmapQ :: (forall d. Data d => d -> u) -> Word -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Word -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Word -> m Word # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Word -> m Word # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Word -> m Word # | |||||
Bounded Word # | |||||
Enum Word # | |||||
Ix Word # | |||||
Num Word # | |||||
Read Word # | |||||
Integral Word # | |||||
Real Word # | |||||
Defined in GHC.Internal.Real toRational :: Word -> Rational # | |||||
Show Word # | |||||
Eq Word # | |||||
Ord Word # | |||||
IArray UArray Word Source # | |||||
Defined in Data.Array.Base 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 # | |||||
MArray IOUArray Word IO Source # | |||||
Defined in Data.Array.IO.Internals getBounds :: Ix i => IOUArray i Word -> IO (i, i) Source # getNumElements :: Ix i => IOUArray i Word -> IO Int Source # newArray :: Ix i => (i, i) -> Word -> IO (IOUArray i Word) Source # newArray_ :: Ix i => (i, i) -> IO (IOUArray i Word) Source # unsafeNewArray_ :: Ix i => (i, i) -> IO (IOUArray i Word) Source # unsafeRead :: Ix i => IOUArray i Word -> Int -> IO Word Source # unsafeWrite :: Ix i => IOUArray i Word -> Int -> Word -> IO () Source # | |||||
Generic1 (URec Word :: k -> Type) # | |||||
Defined in GHC.Internal.Generics
| |||||
Eq1 (UWord :: Type -> Type) Source # | Since: base-4.21.0.0 | ||||
Ord1 (UWord :: Type -> Type) Source # | Since: base-4.21.0.0 | ||||
Defined in Data.Functor.Classes | |||||
Show1 (UWord :: Type -> Type) Source # | Since: base-4.21.0.0 | ||||
Foldable (UWord :: Type -> Type) # | |||||
Defined in GHC.Internal.Data.Foldable fold :: Monoid m => UWord m -> m # foldMap :: Monoid m => (a -> m) -> UWord a -> m # foldMap' :: Monoid m => (a -> m) -> UWord a -> m # foldr :: (a -> b -> b) -> b -> UWord a -> b # foldr' :: (a -> b -> b) -> b -> UWord a -> b # foldl :: (b -> a -> b) -> b -> UWord a -> b # foldl' :: (b -> a -> b) -> b -> UWord a -> b # foldr1 :: (a -> a -> a) -> UWord a -> a # foldl1 :: (a -> a -> a) -> UWord a -> a # elem :: Eq a => a -> UWord a -> Bool # maximum :: Ord a => UWord a -> a # minimum :: Ord a => UWord a -> a # | |||||
Traversable (UWord :: Type -> Type) # | |||||
MArray (STUArray s) Word (ST s) Source # | |||||
Defined in Data.Array.Base getBounds :: Ix i => STUArray s i Word -> ST s (i, i) Source # getNumElements :: Ix i => STUArray s i Word -> ST s Int Source # newArray :: Ix i => (i, i) -> Word -> ST s (STUArray s i Word) Source # newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Word) Source # unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Word) Source # unsafeRead :: Ix i => STUArray s i Word -> Int -> ST s Word Source # unsafeWrite :: Ix i => STUArray s i Word -> Int -> Word -> ST s () Source # | |||||
Functor (URec Word :: Type -> Type) # | |||||
Generic (URec Word p) # | |||||
Defined in GHC.Internal.Generics
| |||||
Show (URec Word p) # | |||||
Eq (URec Word p) # | |||||
Ord (URec Word p) # | |||||
Defined in GHC.Internal.Generics | |||||
data URec Word (p :: k) # | |||||
type Rep1 (URec Word :: k -> Type) # | |||||
Defined in GHC.Internal.Generics | |||||
type Rep (URec Word p) # | |||||
Defined in GHC.Internal.Generics |
Instances
Structured Word8 Source # | |
Defined in Distribution.Utils.Structured | |
PrintfArg Word8 Source # | Since: base-2.1 |
Defined in Text.Printf formatArg :: Word8 -> FieldFormatter Source # parseFormat :: Word8 -> ModifierParser Source # | |
Binary Word8 Source # | |
NFData Word8 Source # | |
Defined in Control.DeepSeq | |
Bits Word8 # | |
Defined in GHC.Internal.Word (.&.) :: Word8 -> Word8 -> Word8 # (.|.) :: Word8 -> Word8 -> Word8 # xor :: Word8 -> Word8 -> Word8 # complement :: Word8 -> Word8 # shift :: Word8 -> Int -> Word8 # rotate :: Word8 -> Int -> Word8 # setBit :: Word8 -> Int -> Word8 # clearBit :: Word8 -> Int -> Word8 # complementBit :: Word8 -> Int -> Word8 # testBit :: Word8 -> Int -> Bool # bitSizeMaybe :: Word8 -> Maybe Int # shiftL :: Word8 -> Int -> Word8 # unsafeShiftL :: Word8 -> Int -> Word8 # shiftR :: Word8 -> Int -> Word8 # unsafeShiftR :: Word8 -> Int -> Word8 # rotateL :: Word8 -> Int -> Word8 # | |
FiniteBits Word8 # | |
Defined in GHC.Internal.Word finiteBitSize :: Word8 -> Int # countLeadingZeros :: Word8 -> Int # countTrailingZeros :: Word8 -> Int # | |
Data Word8 # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Word8 -> c Word8 # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Word8 # dataTypeOf :: Word8 -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Word8) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Word8) # gmapT :: (forall b. Data b => b -> b) -> Word8 -> Word8 # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Word8 -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Word8 -> r # gmapQ :: (forall d. Data d => d -> u) -> Word8 -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Word8 -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Word8 -> m Word8 # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Word8 -> m Word8 # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Word8 -> m Word8 # | |
Bounded Word8 # | |
Enum Word8 # | |
Ix Word8 # | |
Num Word8 # | |
Read Word8 # | |
Integral Word8 # | |
Real Word8 # | |
Defined in GHC.Internal.Word toRational :: Word8 -> Rational # | |
Show Word8 # | |
Eq Word8 # | |
Ord Word8 # | |
IArray UArray Word8 Source # | |
Defined in Data.Array.Base bounds :: Ix i => UArray i Word8 -> (i, i) Source # numElements :: Ix i => UArray i Word8 -> Int Source # unsafeArray :: Ix i => (i, i) -> [(Int, Word8)] -> UArray i Word8 Source # unsafeAt :: Ix i => UArray i Word8 -> Int -> Word8 Source # unsafeReplace :: Ix i => UArray i Word8 -> [(Int, Word8)] -> UArray i Word8 Source # unsafeAccum :: Ix i => (Word8 -> e' -> Word8) -> UArray i Word8 -> [(Int, e')] -> UArray i Word8 Source # unsafeAccumArray :: Ix i => (Word8 -> e' -> Word8) -> Word8 -> (i, i) -> [(Int, e')] -> UArray i Word8 Source # | |
MArray IOUArray Word8 IO Source # | |
Defined in Data.Array.IO.Internals 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 (STUArray s) Word8 (ST s) Source # | |
Defined in Data.Array.Base getBounds :: Ix i => STUArray s i Word8 -> ST s (i, i) Source # getNumElements :: Ix i => STUArray s i Word8 -> ST s Int Source # newArray :: Ix i => (i, i) -> Word8 -> ST s (STUArray s i Word8) Source # newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Word8) Source # unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Word8) Source # unsafeRead :: Ix i => STUArray s i Word8 -> Int -> ST s Word8 Source # unsafeWrite :: Ix i => STUArray s i Word8 -> Int -> Word8 -> ST s () Source # |
Instances
Structured Word16 Source # | |
Defined in Distribution.Utils.Structured | |
PrintfArg Word16 Source # | Since: base-2.1 |
Defined in Text.Printf formatArg :: Word16 -> FieldFormatter Source # parseFormat :: Word16 -> ModifierParser Source # | |
Binary Word16 Source # | |
NFData Word16 Source # | |
Defined in Control.DeepSeq | |
Bits Word16 # | |
Defined in GHC.Internal.Word (.&.) :: Word16 -> Word16 -> Word16 # (.|.) :: Word16 -> Word16 -> Word16 # xor :: Word16 -> Word16 -> Word16 # complement :: Word16 -> Word16 # shift :: Word16 -> Int -> Word16 # rotate :: Word16 -> Int -> Word16 # setBit :: Word16 -> Int -> Word16 # clearBit :: Word16 -> Int -> Word16 # complementBit :: Word16 -> Int -> Word16 # testBit :: Word16 -> Int -> Bool # bitSizeMaybe :: Word16 -> Maybe Int # shiftL :: Word16 -> Int -> Word16 # unsafeShiftL :: Word16 -> Int -> Word16 # shiftR :: Word16 -> Int -> Word16 # unsafeShiftR :: Word16 -> Int -> Word16 # rotateL :: Word16 -> Int -> Word16 # | |
FiniteBits Word16 # | |
Defined in GHC.Internal.Word finiteBitSize :: Word16 -> Int # countLeadingZeros :: Word16 -> Int # countTrailingZeros :: Word16 -> Int # | |
Data Word16 # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Word16 -> c Word16 # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Word16 # toConstr :: Word16 -> Constr # dataTypeOf :: Word16 -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Word16) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Word16) # gmapT :: (forall b. Data b => b -> b) -> Word16 -> Word16 # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Word16 -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Word16 -> r # gmapQ :: (forall d. Data d => d -> u) -> Word16 -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Word16 -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Word16 -> m Word16 # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Word16 -> m Word16 # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Word16 -> m Word16 # | |
Bounded Word16 # | |
Enum Word16 # | |
Defined in GHC.Internal.Word | |
Ix Word16 # | |
Num Word16 # | |
Read Word16 # | |
Integral Word16 # | |
Real Word16 # | |
Defined in GHC.Internal.Word toRational :: Word16 -> Rational # | |
Show Word16 # | |
Eq Word16 # | |
Ord Word16 # | |
IArray UArray Word16 Source # | |
Defined in Data.Array.Base bounds :: Ix i => UArray i Word16 -> (i, i) Source # numElements :: Ix i => UArray i Word16 -> Int Source # unsafeArray :: Ix i => (i, i) -> [(Int, Word16)] -> UArray i Word16 Source # unsafeAt :: Ix i => UArray i Word16 -> Int -> Word16 Source # unsafeReplace :: Ix i => UArray i Word16 -> [(Int, Word16)] -> UArray i Word16 Source # unsafeAccum :: Ix i => (Word16 -> e' -> Word16) -> UArray i Word16 -> [(Int, e')] -> UArray i Word16 Source # unsafeAccumArray :: Ix i => (Word16 -> e' -> Word16) -> Word16 -> (i, i) -> [(Int, e')] -> UArray i Word16 Source # | |
MArray IOUArray Word16 IO Source # | |
Defined in Data.Array.IO.Internals 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 (STUArray s) Word16 (ST s) Source # | |
Defined in Data.Array.Base getBounds :: Ix i => STUArray s i Word16 -> ST s (i, i) Source # getNumElements :: Ix i => STUArray s i Word16 -> ST s Int Source # newArray :: Ix i => (i, i) -> Word16 -> ST s (STUArray s i Word16) Source # newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Word16) Source # unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Word16) Source # unsafeRead :: Ix i => STUArray s i Word16 -> Int -> ST s Word16 Source # unsafeWrite :: Ix i => STUArray s i Word16 -> Int -> Word16 -> ST s () Source # |
Instances
Structured Word32 Source # | |
Defined in Distribution.Utils.Structured | |
PrintfArg Word32 Source # | Since: base-2.1 |
Defined in Text.Printf formatArg :: Word32 -> FieldFormatter Source # parseFormat :: Word32 -> ModifierParser Source # | |
Binary Word32 Source # | |
NFData Word32 Source # | |
Defined in Control.DeepSeq | |
Bits Word32 # | |
Defined in GHC.Internal.Word (.&.) :: Word32 -> Word32 -> Word32 # (.|.) :: Word32 -> Word32 -> Word32 # xor :: Word32 -> Word32 -> Word32 # complement :: Word32 -> Word32 # shift :: Word32 -> Int -> Word32 # rotate :: Word32 -> Int -> Word32 # setBit :: Word32 -> Int -> Word32 # clearBit :: Word32 -> Int -> Word32 # complementBit :: Word32 -> Int -> Word32 # testBit :: Word32 -> Int -> Bool # bitSizeMaybe :: Word32 -> Maybe Int # shiftL :: Word32 -> Int -> Word32 # unsafeShiftL :: Word32 -> Int -> Word32 # shiftR :: Word32 -> Int -> Word32 # unsafeShiftR :: Word32 -> Int -> Word32 # rotateL :: Word32 -> Int -> Word32 # | |
FiniteBits Word32 # | |
Defined in GHC.Internal.Word finiteBitSize :: Word32 -> Int # countLeadingZeros :: Word32 -> Int # countTrailingZeros :: Word32 -> Int # | |
Data Word32 # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Word32 -> c Word32 # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Word32 # toConstr :: Word32 -> Constr # dataTypeOf :: Word32 -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Word32) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Word32) # gmapT :: (forall b. Data b => b -> b) -> Word32 -> Word32 # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Word32 -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Word32 -> r # gmapQ :: (forall d. Data d => d -> u) -> Word32 -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Word32 -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Word32 -> m Word32 # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Word32 -> m Word32 # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Word32 -> m Word32 # | |
Bounded Word32 # | |
Enum Word32 # | |
Defined in GHC.Internal.Word | |
Ix Word32 # | |
Num Word32 # | |
Read Word32 # | |
Integral Word32 # | |
Real Word32 # | |
Defined in GHC.Internal.Word toRational :: Word32 -> Rational # | |
Show Word32 # | |
Eq Word32 # | |
Ord Word32 # | |
IArray UArray Word32 Source # | |
Defined in Data.Array.Base bounds :: Ix i => UArray i Word32 -> (i, i) Source # numElements :: Ix i => UArray i Word32 -> Int Source # unsafeArray :: Ix i => (i, i) -> [(Int, Word32)] -> UArray i Word32 Source # unsafeAt :: Ix i => UArray i Word32 -> Int -> Word32 Source # unsafeReplace :: Ix i => UArray i Word32 -> [(Int, Word32)] -> UArray i Word32 Source # unsafeAccum :: Ix i => (Word32 -> e' -> Word32) -> UArray i Word32 -> [(Int, e')] -> UArray i Word32 Source # unsafeAccumArray :: Ix i => (Word32 -> e' -> Word32) -> Word32 -> (i, i) -> [(Int, e')] -> UArray i Word32 Source # | |
MArray IOUArray Word32 IO Source # | |
Defined in Data.Array.IO.Internals 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 (STUArray s) Word32 (ST s) Source # | |
Defined in Data.Array.Base getBounds :: Ix i => STUArray s i Word32 -> ST s (i, i) Source # getNumElements :: Ix i => STUArray s i Word32 -> ST s Int Source # newArray :: Ix i => (i, i) -> Word32 -> ST s (STUArray s i Word32) Source # newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Word32) Source # unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Word32) Source # unsafeRead :: Ix i => STUArray s i Word32 -> Int -> ST s Word32 Source # unsafeWrite :: Ix i => STUArray s i Word32 -> Int -> Word32 -> ST s () Source # |
Instances
Structured Word64 Source # | |
Defined in Distribution.Utils.Structured | |
PrintfArg Word64 Source # | Since: base-2.1 |
Defined in Text.Printf formatArg :: Word64 -> FieldFormatter Source # parseFormat :: Word64 -> ModifierParser Source # | |
Binary Word64 Source # | |
NFData Word64 Source # | |
Defined in Control.DeepSeq | |
Bits Word64 # | |
Defined in GHC.Internal.Word (.&.) :: Word64 -> Word64 -> Word64 # (.|.) :: Word64 -> Word64 -> Word64 # xor :: Word64 -> Word64 -> Word64 # complement :: Word64 -> Word64 # shift :: Word64 -> Int -> Word64 # rotate :: Word64 -> Int -> Word64 # setBit :: Word64 -> Int -> Word64 # clearBit :: Word64 -> Int -> Word64 # complementBit :: Word64 -> Int -> Word64 # testBit :: Word64 -> Int -> Bool # bitSizeMaybe :: Word64 -> Maybe Int # shiftL :: Word64 -> Int -> Word64 # unsafeShiftL :: Word64 -> Int -> Word64 # shiftR :: Word64 -> Int -> Word64 # unsafeShiftR :: Word64 -> Int -> Word64 # rotateL :: Word64 -> Int -> Word64 # | |
FiniteBits Word64 # | |
Defined in GHC.Internal.Word finiteBitSize :: Word64 -> Int # countLeadingZeros :: Word64 -> Int # countTrailingZeros :: Word64 -> Int # | |
Data Word64 # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Word64 -> c Word64 # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Word64 # toConstr :: Word64 -> Constr # dataTypeOf :: Word64 -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Word64) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Word64) # gmapT :: (forall b. Data b => b -> b) -> Word64 -> Word64 # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Word64 -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Word64 -> r # gmapQ :: (forall d. Data d => d -> u) -> Word64 -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Word64 -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Word64 -> m Word64 # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Word64 -> m Word64 # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Word64 -> m Word64 # | |
Bounded Word64 # | |
Enum Word64 # | |
Defined in GHC.Internal.Word | |
Ix Word64 # | |
Num Word64 # | |
Read Word64 # | |
Integral Word64 # | |
Real Word64 # | |
Defined in GHC.Internal.Word toRational :: Word64 -> Rational # | |
Show Word64 # | |
Eq Word64 # | |
Ord Word64 # | |
IArray UArray Word64 Source # | |
Defined in Data.Array.Base bounds :: Ix i => UArray i Word64 -> (i, i) Source # numElements :: Ix i => UArray i Word64 -> Int Source # unsafeArray :: Ix i => (i, i) -> [(Int, Word64)] -> UArray i Word64 Source # unsafeAt :: Ix i => UArray i Word64 -> Int -> Word64 Source # unsafeReplace :: Ix i => UArray i Word64 -> [(Int, Word64)] -> UArray i Word64 Source # unsafeAccum :: Ix i => (Word64 -> e' -> Word64) -> UArray i Word64 -> [(Int, e')] -> UArray i Word64 Source # unsafeAccumArray :: Ix i => (Word64 -> e' -> Word64) -> Word64 -> (i, i) -> [(Int, e')] -> UArray i Word64 Source # | |
MArray IOUArray Word64 IO Source # | |
Defined in Data.Array.IO.Internals 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 (STUArray s) Word64 (ST s) Source # | |
Defined in Data.Array.Base getBounds :: Ix i => STUArray s i Word64 -> ST s (i, i) Source # getNumElements :: Ix i => STUArray s i Word64 -> ST s Int Source # newArray :: Ix i => (i, i) -> Word64 -> ST s (STUArray s i Word64) Source # newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Word64) Source # unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Word64) Source # unsafeRead :: Ix i => STUArray s i Word64 -> Int -> ST s Word64 Source # unsafeWrite :: Ix i => STUArray s i Word64 -> Int -> Word64 -> ST s () Source # |
Instances
Structured Int8 Source # | |
Defined in Distribution.Utils.Structured | |
PrintfArg Int8 Source # | Since: base-2.1 |
Defined in Text.Printf formatArg :: Int8 -> FieldFormatter Source # parseFormat :: Int8 -> ModifierParser Source # | |
Binary Int8 Source # | |
NFData Int8 Source # | |
Defined in Control.DeepSeq | |
Bits Int8 # | |
Defined in GHC.Internal.Int (.&.) :: Int8 -> Int8 -> Int8 # (.|.) :: Int8 -> Int8 -> Int8 # complement :: Int8 -> Int8 # shift :: Int8 -> Int -> Int8 # rotate :: Int8 -> Int -> Int8 # setBit :: Int8 -> Int -> Int8 # clearBit :: Int8 -> Int -> Int8 # complementBit :: Int8 -> Int -> Int8 # testBit :: Int8 -> Int -> Bool # bitSizeMaybe :: Int8 -> Maybe Int # shiftL :: Int8 -> Int -> Int8 # unsafeShiftL :: Int8 -> Int -> Int8 # shiftR :: Int8 -> Int -> Int8 # unsafeShiftR :: Int8 -> Int -> Int8 # rotateL :: Int8 -> Int -> Int8 # | |
FiniteBits Int8 # | |
Defined in GHC.Internal.Int | |
Data Int8 # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Int8 -> c Int8 # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Int8 # dataTypeOf :: Int8 -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Int8) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Int8) # gmapT :: (forall b. Data b => b -> b) -> Int8 -> Int8 # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Int8 -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Int8 -> r # gmapQ :: (forall d. Data d => d -> u) -> Int8 -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Int8 -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Int8 -> m Int8 # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Int8 -> m Int8 # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Int8 -> m Int8 # | |
Bounded Int8 # | |
Enum Int8 # | |
Ix Int8 # | |
Num Int8 # | |
Read Int8 # | |
Integral Int8 # | |
Real Int8 # | |
Defined in GHC.Internal.Int toRational :: Int8 -> Rational # | |
Show Int8 # | |
Eq Int8 # | |
Ord Int8 # | |
IArray UArray Int8 Source # | |
Defined in Data.Array.Base bounds :: Ix i => UArray i Int8 -> (i, i) Source # numElements :: Ix i => UArray i Int8 -> Int Source # unsafeArray :: Ix i => (i, i) -> [(Int, Int8)] -> UArray i Int8 Source # unsafeAt :: Ix i => UArray i Int8 -> Int -> Int8 Source # unsafeReplace :: Ix i => UArray i Int8 -> [(Int, Int8)] -> UArray i Int8 Source # unsafeAccum :: Ix i => (Int8 -> e' -> Int8) -> UArray i Int8 -> [(Int, e')] -> UArray i Int8 Source # unsafeAccumArray :: Ix i => (Int8 -> e' -> Int8) -> Int8 -> (i, i) -> [(Int, e')] -> UArray i Int8 Source # | |
MArray IOUArray Int8 IO Source # | |
Defined in Data.Array.IO.Internals 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 (STUArray s) Int8 (ST s) Source # | |
Defined in Data.Array.Base getBounds :: Ix i => STUArray s i Int8 -> ST s (i, i) Source # getNumElements :: Ix i => STUArray s i Int8 -> ST s Int Source # newArray :: Ix i => (i, i) -> Int8 -> ST s (STUArray s i Int8) Source # newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Int8) Source # unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Int8) Source # unsafeRead :: Ix i => STUArray s i Int8 -> Int -> ST s Int8 Source # unsafeWrite :: Ix i => STUArray s i Int8 -> Int -> Int8 -> ST s () Source # |
Instances
Structured Int16 Source # | |
Defined in Distribution.Utils.Structured | |
PrintfArg Int16 Source # | Since: base-2.1 |
Defined in Text.Printf formatArg :: Int16 -> FieldFormatter Source # parseFormat :: Int16 -> ModifierParser Source # | |
Binary Int16 Source # | |
NFData Int16 Source # | |
Defined in Control.DeepSeq | |
Bits Int16 # | |
Defined in GHC.Internal.Int (.&.) :: Int16 -> Int16 -> Int16 # (.|.) :: Int16 -> Int16 -> Int16 # xor :: Int16 -> Int16 -> Int16 # complement :: Int16 -> Int16 # shift :: Int16 -> Int -> Int16 # rotate :: Int16 -> Int -> Int16 # setBit :: Int16 -> Int -> Int16 # clearBit :: Int16 -> Int -> Int16 # complementBit :: Int16 -> Int -> Int16 # testBit :: Int16 -> Int -> Bool # bitSizeMaybe :: Int16 -> Maybe Int # shiftL :: Int16 -> Int -> Int16 # unsafeShiftL :: Int16 -> Int -> Int16 # shiftR :: Int16 -> Int -> Int16 # unsafeShiftR :: Int16 -> Int -> Int16 # rotateL :: Int16 -> Int -> Int16 # | |
FiniteBits Int16 # | |
Defined in GHC.Internal.Int finiteBitSize :: Int16 -> Int # countLeadingZeros :: Int16 -> Int # countTrailingZeros :: Int16 -> Int # | |
Data Int16 # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Int16 -> c Int16 # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Int16 # dataTypeOf :: Int16 -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Int16) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Int16) # gmapT :: (forall b. Data b => b -> b) -> Int16 -> Int16 # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Int16 -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Int16 -> r # gmapQ :: (forall d. Data d => d -> u) -> Int16 -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Int16 -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Int16 -> m Int16 # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Int16 -> m Int16 # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Int16 -> m Int16 # | |
Bounded Int16 # | |
Enum Int16 # | |
Ix Int16 # | |
Num Int16 # | |
Read Int16 # | |
Integral Int16 # | |
Real Int16 # | |
Defined in GHC.Internal.Int toRational :: Int16 -> Rational # | |
Show Int16 # | |
Eq Int16 # | |
Ord Int16 # | |
IArray UArray Int16 Source # | |
Defined in Data.Array.Base bounds :: Ix i => UArray i Int16 -> (i, i) Source # numElements :: Ix i => UArray i Int16 -> Int Source # unsafeArray :: Ix i => (i, i) -> [(Int, Int16)] -> UArray i Int16 Source # unsafeAt :: Ix i => UArray i Int16 -> Int -> Int16 Source # unsafeReplace :: Ix i => UArray i Int16 -> [(Int, Int16)] -> UArray i Int16 Source # unsafeAccum :: Ix i => (Int16 -> e' -> Int16) -> UArray i Int16 -> [(Int, e')] -> UArray i Int16 Source # unsafeAccumArray :: Ix i => (Int16 -> e' -> Int16) -> Int16 -> (i, i) -> [(Int, e')] -> UArray i Int16 Source # | |
MArray IOUArray Int16 IO Source # | |
Defined in Data.Array.IO.Internals 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 (STUArray s) Int16 (ST s) Source # | |
Defined in Data.Array.Base getBounds :: Ix i => STUArray s i Int16 -> ST s (i, i) Source # getNumElements :: Ix i => STUArray s i Int16 -> ST s Int Source # newArray :: Ix i => (i, i) -> Int16 -> ST s (STUArray s i Int16) Source # newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Int16) Source # unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Int16) Source # unsafeRead :: Ix i => STUArray s i Int16 -> Int -> ST s Int16 Source # unsafeWrite :: Ix i => STUArray s i Int16 -> Int -> Int16 -> ST s () Source # |
Instances
Structured Int32 Source # | |
Defined in Distribution.Utils.Structured | |
PrintfArg Int32 Source # | Since: base-2.1 |
Defined in Text.Printf formatArg :: Int32 -> FieldFormatter Source # parseFormat :: Int32 -> ModifierParser Source # | |
Binary Int32 Source # | |
NFData Int32 Source # | |
Defined in Control.DeepSeq | |
Bits Int32 # | |
Defined in GHC.Internal.Int (.&.) :: Int32 -> Int32 -> Int32 # (.|.) :: Int32 -> Int32 -> Int32 # xor :: Int32 -> Int32 -> Int32 # complement :: Int32 -> Int32 # shift :: Int32 -> Int -> Int32 # rotate :: Int32 -> Int -> Int32 # setBit :: Int32 -> Int -> Int32 # clearBit :: Int32 -> Int -> Int32 # complementBit :: Int32 -> Int -> Int32 # testBit :: Int32 -> Int -> Bool # bitSizeMaybe :: Int32 -> Maybe Int # shiftL :: Int32 -> Int -> Int32 # unsafeShiftL :: Int32 -> Int -> Int32 # shiftR :: Int32 -> Int -> Int32 # unsafeShiftR :: Int32 -> Int -> Int32 # rotateL :: Int32 -> Int -> Int32 # | |
FiniteBits Int32 # | |
Defined in GHC.Internal.Int finiteBitSize :: Int32 -> Int # countLeadingZeros :: Int32 -> Int # countTrailingZeros :: Int32 -> Int # | |
Data Int32 # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Int32 -> c Int32 # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Int32 # dataTypeOf :: Int32 -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Int32) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Int32) # gmapT :: (forall b. Data b => b -> b) -> Int32 -> Int32 # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Int32 -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Int32 -> r # gmapQ :: (forall d. Data d => d -> u) -> Int32 -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Int32 -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Int32 -> m Int32 # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Int32 -> m Int32 # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Int32 -> m Int32 # | |
Bounded Int32 # | |
Enum Int32 # | |
Ix Int32 # | |
Num Int32 # | |
Read Int32 # | |
Integral Int32 # | |
Real Int32 # | |
Defined in GHC.Internal.Int toRational :: Int32 -> Rational # | |
Show Int32 # | |
Eq Int32 # | |
Ord Int32 # | |
IArray UArray Int32 Source # | |
Defined in Data.Array.Base bounds :: Ix i => UArray i Int32 -> (i, i) Source # numElements :: Ix i => UArray i Int32 -> Int Source # unsafeArray :: Ix i => (i, i) -> [(Int, Int32)] -> UArray i Int32 Source # unsafeAt :: Ix i => UArray i Int32 -> Int -> Int32 Source # unsafeReplace :: Ix i => UArray i Int32 -> [(Int, Int32)] -> UArray i Int32 Source # unsafeAccum :: Ix i => (Int32 -> e' -> Int32) -> UArray i Int32 -> [(Int, e')] -> UArray i Int32 Source # unsafeAccumArray :: Ix i => (Int32 -> e' -> Int32) -> Int32 -> (i, i) -> [(Int, e')] -> UArray i Int32 Source # | |
MArray IOUArray Int32 IO Source # | |
Defined in Data.Array.IO.Internals 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 (STUArray s) Int32 (ST s) Source # | |
Defined in Data.Array.Base getBounds :: Ix i => STUArray s i Int32 -> ST s (i, i) Source # getNumElements :: Ix i => STUArray s i Int32 -> ST s Int Source # newArray :: Ix i => (i, i) -> Int32 -> ST s (STUArray s i Int32) Source # newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Int32) Source # unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Int32) Source # unsafeRead :: Ix i => STUArray s i Int32 -> Int -> ST s Int32 Source # unsafeWrite :: Ix i => STUArray s i Int32 -> Int -> Int32 -> ST s () Source # |
Instances
Structured Int64 Source # | |
Defined in Distribution.Utils.Structured | |
PrintfArg Int64 Source # | Since: base-2.1 |
Defined in Text.Printf formatArg :: Int64 -> FieldFormatter Source # parseFormat :: Int64 -> ModifierParser Source # | |
Binary Int64 Source # | |
NFData Int64 Source # | |
Defined in Control.DeepSeq | |
Bits Int64 # | |
Defined in GHC.Internal.Int (.&.) :: Int64 -> Int64 -> Int64 # (.|.) :: Int64 -> Int64 -> Int64 # xor :: Int64 -> Int64 -> Int64 # complement :: Int64 -> Int64 # shift :: Int64 -> Int -> Int64 # rotate :: Int64 -> Int -> Int64 # setBit :: Int64 -> Int -> Int64 # clearBit :: Int64 -> Int -> Int64 # complementBit :: Int64 -> Int -> Int64 # testBit :: Int64 -> Int -> Bool # bitSizeMaybe :: Int64 -> Maybe Int # shiftL :: Int64 -> Int -> Int64 # unsafeShiftL :: Int64 -> Int -> Int64 # shiftR :: Int64 -> Int -> Int64 # unsafeShiftR :: Int64 -> Int -> Int64 # rotateL :: Int64 -> Int -> Int64 # | |
FiniteBits Int64 # | |
Defined in GHC.Internal.Int finiteBitSize :: Int64 -> Int # countLeadingZeros :: Int64 -> Int # countTrailingZeros :: Int64 -> Int # | |
Data Int64 # | |
Defined in GHC.Internal.Data.Data gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Int64 -> c Int64 # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Int64 # dataTypeOf :: Int64 -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Int64) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Int64) # gmapT :: (forall b. Data b => b -> b) -> Int64 -> Int64 # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Int64 -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Int64 -> r # gmapQ :: (forall d. Data d => d -> u) -> Int64 -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Int64 -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Int64 -> m Int64 # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Int64 -> m Int64 # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Int64 -> m Int64 # | |
Bounded Int64 # | |
Enum Int64 # | |
Ix Int64 # | |
Num Int64 # | |
Read Int64 # | |
Integral Int64 # | |
Real Int64 # | |
Defined in GHC.Internal.Int toRational :: Int64 -> Rational # | |
Show Int64 # | |
Eq Int64 # | |
Ord Int64 # | |
IArray UArray Int64 Source # | |
Defined in Data.Array.Base bounds :: Ix i => UArray i Int64 -> (i, i) Source # numElements :: Ix i => UArray i Int64 -> Int Source # unsafeArray :: Ix i => (i, i) -> [(Int, Int64)] -> UArray i Int64 Source # unsafeAt :: Ix i => UArray i Int64 -> Int -> Int64 Source # unsafeReplace :: Ix i => UArray i Int64 -> [(Int, Int64)] -> UArray i Int64 Source # unsafeAccum :: Ix i => (Int64 -> e' -> Int64) -> UArray i Int64 -> [(Int, e')] -> UArray i Int64 Source # unsafeAccumArray :: Ix i => (Int64 -> e' -> Int64) -> Int64 -> (i, i) -> [(Int, e')] -> UArray i Int64 Source # | |
MArray IOUArray Int64 IO Source # | |
Defined in Data.Array.IO.Internals 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 (STUArray s) Int64 (ST s) Source # | |
Defined in Data.Array.Base getBounds :: Ix i => STUArray s i Int64 -> ST s (i, i) Source # getNumElements :: Ix i => STUArray s i Int64 -> ST s Int Source # newArray :: Ix i => (i, i) -> Int64 -> ST s (STUArray s i Int64) Source # newArray_ :: Ix i => (i, i) -> ST s (STUArray s i Int64) Source # unsafeNewArray_ :: Ix i => (i, i) -> ST s (STUArray s i Int64) Source # unsafeRead :: Ix i => STUArray s i Int64 -> Int -> ST s Int64 Source # unsafeWrite :: Ix i => STUArray s i Int64 -> Int -> Int64 -> ST s () Source # |
Text.PrettyPrint
System.Exit
Instances
NFData ExitCode Source # | Since: deepseq-1.4.2.0 | ||||
Defined in Control.DeepSeq | |||||
Exception ExitCode # | |||||
Defined in GHC.Internal.IO.Exception toException :: ExitCode -> SomeException # fromException :: SomeException -> Maybe ExitCode # displayException :: ExitCode -> String # backtraceDesired :: ExitCode -> Bool # | |||||
Generic ExitCode # | |||||
Defined in GHC.Internal.IO.Exception
| |||||
Read ExitCode # | |||||
Show ExitCode # | |||||
Eq ExitCode # | |||||
Ord ExitCode # | |||||
Defined in GHC.Internal.IO.Exception | |||||
type Rep ExitCode # | |||||
Defined in GHC.Internal.IO.Exception type Rep ExitCode = D1 ('MetaData "ExitCode" "GHC.Internal.IO.Exception" "ghc-internal" 'False) (C1 ('MetaCons "ExitSuccess" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ExitFailure" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int))) |
exitSuccess :: IO a #
exitFailure :: IO a #
Text.Read
Debug.Trace (as deprecated functions)
traceShowId :: Show a => a -> a Source #
Deprecated: Don't leave me in the code
traceM :: Applicative f => String -> f () Source #
Deprecated: Don't leave me in the code
traceShowM :: (Show a, Applicative f) => a -> f () Source #
Deprecated: Don't leave me in the code